-- .$Header: c:/Source/Haskell/Type/Data/Type/Test/RCS/Nat.hs,v 1.1 2011/03/05 00:35:40 dosuser Exp dosuser $ module Data.Type.Test.Nat where import Data.Type.Nat import Test.HUnit bindTo = (=<<) t0 :: Test t0 = "fromNat zero" ~: 0 ~=? fromNat zero t1 :: Test t1 = "fromNat one" ~: 1 ~=? fromNat one t2 :: Test t2 = "fromNat two" ~: 2 ~=? fromNat two t3 :: Test t3 = "fromNat three" ~: 3 ~=? fromNat three runTest :: IO () runTest = bindTo print . runTestTT $ test [t0, t1, t2, t3] -- vim: expandtab:tabstop=4:shiftwidth=4