diff --git a/Test.hs b/Test.hs
index 27e2bee5cc85e2de14dd92c6b91c0111fabc22a7..855e73ca339f206ee39414a33c9d627b721a9799 100644
--- a/Test.hs
+++ b/Test.hs
@@ -1,6 +1,11 @@
 module Main where
 import Test.Framework
 import Test.Tests
+import Foreign.C.Types
 
 main :: IO ()
-main = defaultMain tests
+main = do
+  if (toRational (1000000000000 :: CTime)) /= (1000000000000 :: Rational)
+    then putStrLn "WARNING: Some tests will incorrectly fail due to a 32-bit time_t C type."
+    else return ()
+  defaultMain tests