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