tasty-hunit-adapter-1.1: Use existing HUnit tests with tasty

Safe HaskellNone
LanguageHaskell2010

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)

Synopsis

Documentation

hUnitTestToTestTree :: Test -> [TestTree] Source

Convert existing HUnit test to a TestTree list that can be used with tasty.