| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Test.Tasty.HUnit.Adapter
Description
Provides a function that converts exisiting HUnit tests to a TestTree list that can be used with tasty testing framework. Example usage:
module Main where
import Test.HUnit ( (~:), (@=?) )
import Test.Tasty ( defaultMain, testGroup )
import Test.Tasty.HUnit.Adapter ( hUnitTestToTestTree )
main :: IO ()
main = defaultMain $ testGroup "Migrated from HUnit" $
hUnitTestToTestTree ("HUnit test" ~: 2 + 2 @=? 4)- hUnitTestToTestTree :: Test -> [TestTree]
Documentation
hUnitTestToTestTree :: Test -> [TestTree] Source
Convert existing HUnit test to a TestTree list that can be used with tasty.