HUnit-1.2.0.0: A unit testing framework for HaskellSource codeContentsIndex
Test.HUnit.Base
Documentation
type Assertion = IO ()Source
assertFailure :: String -> AssertionSource
assertString :: String -> AssertionSource
assertBool :: String -> Bool -> AssertionSource
assertEqual :: (Eq a, Show a) => String -> a -> a -> AssertionSource
class Assertable t whereSource
Methods
assert :: t -> AssertionSource
show/hide Instances
class ListAssertable t whereSource
Methods
listAssert :: [t] -> AssertionSource
show/hide Instances
type AssertionPredicate = IO BoolSource
class AssertionPredicable t whereSource
Methods
assertionPredicate :: t -> AssertionPredicateSource
show/hide Instances
(@?) :: AssertionPredicable t => t -> String -> AssertionSource
(@=?) :: (Eq a, Show a) => a -> a -> AssertionSource
(@?=) :: (Eq a, Show a) => a -> a -> AssertionSource
data Test Source
Constructors
TestCase Assertion
TestList [Test]
TestLabel String Test
show/hide Instances
data Node Source
Constructors
ListItem Int
Label String
show/hide Instances
type Path = [Node]Source
testCaseCount :: Test -> IntSource
class Testable t whereSource
Methods
test :: t -> TestSource
show/hide Instances
(~?) :: AssertionPredicable t => t -> String -> TestSource
(~=?) :: (Eq a, Show a) => a -> a -> TestSource
(~?=) :: (Eq a, Show a) => a -> a -> TestSource
(~:) :: Testable t => String -> t -> TestSource
data Counts Source
Constructors
Counts
cases, tried, errors, failures :: Int
show/hide Instances
data State Source
Constructors
State
path :: Path
counts :: Counts
show/hide Instances
type ReportStart us = State -> us -> IO usSource
type ReportProblem us = String -> State -> us -> IO usSource
testCasePaths :: Test -> [Path]Source
performTest :: ReportStart us -> ReportProblem us -> ReportProblem us -> us -> Test -> IO (Counts, us)Source
Produced by Haddock version 0.8