Skip to content
Snippets Groups Projects
Commit 46ce7671 authored by blackredtree's avatar blackredtree
Browse files

added Test.Tests and Test.TestUtil modules

Ignore-this: d5fe357080d6ed4f83e2272ad789bbb3

darcs-hash:20120920224104-08fed-3afdeb091b1fab883b255c1be18af368c103dd2c
parent b317b992
No related branches found
No related tags found
No related merge requests found
module Test.TestUtil
( SimpleTest(..)
, IO_SimpleTest(..)
, diff
, module Distribution.TestSuite )
where
import Distribution.TestSuite
import System.Cmd
import System.Exit
--
data SimpleTest = SimpleTest String Result
instance TestOptions SimpleTest where
name (SimpleTest s _) = s
options = const []
defaultOptions _ = return $ Options []
check _ _ = []
instance PureTestable SimpleTest where
run (SimpleTest _ r) _ = r
--
data IO_SimpleTest = IO_SimpleTest String (IO Result)
instance TestOptions IO_SimpleTest where
name (IO_SimpleTest s _) = s
options = const []
defaultOptions _ = return $ Options []
check _ _ = []
instance ImpureTestable IO_SimpleTest where
runM (IO_SimpleTest _ r) _ = r
--
diff :: String -> String -> Result
diff s t
= if s == t then Pass else Fail ""
module Test.Tests where
import Distribution.TestSuite
import Test.AddDays
import Test.ClipDates
import Test.ConvertBack
import Test.LongWeekYears
import Test.TestCalendars
import Test.TestEaster
import Test.TestFormat
import Test.TestMonthDay
import Test.TestParseDAT
import Test.TestTime
tests :: [Test]
tests = [ addDaysTest
, clipDates
, convertBack
, longWeekYears
, testCalendars
, testEaster
, testFormat
, testMonthDay
, testParseDAT
, testTime ]
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment