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

[ bsd3, library, testing ] [ Propose Tags ]

This package provides a function that converts exisiting HUnit tests to a TestTree that can be used with tasty testing framework. Code is adapted from test-framework-hunit package authored by Max Bolingbroke.


[Skip to Readme]

Modules

[Index]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 1.0, 1.1
Dependencies base (<5), HUnit, tasty, tasty-hunit [details]
License BSD-3-Clause
Author Jan Stolarek
Maintainer jan.stolarek@p.lodz.pl
Category Testing
Home page https://github.com/jstolarek/tasty-hunit-adapter
Bug tracker https://github.com/jstolarek/tasty-hunit-adapter/issues
Source repo head: git clone git://github.com/jstolarek/tasty-hunit-adapter.git
Uploaded by JanStolarek at 2015-10-17T18:43:16Z
Distributions NixOS:1.1
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 1855 total (13 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2015-10-17 [all 1 reports]

Readme for tasty-hunit-adapter-1.1

[back to package description]

tasty-hunit-adapter

This package provides a function that converts exisiting [HUnit] (http://hackage.haskell.org/package/HUnit) tests to TestTree that can be used by tasty testing framework. Code is adapted from [test-framework-hunit] (http://hackage.haskell.org/package/test-framework-hunit) package authored by Max Bolingbroke.

You can download latest stable release from Hackage

Example

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)