Automatic test discovery and runner for the tasty framework.
There's 4 simple steps:
- Create a test driver file in the test directory
- Mark the driver file as the
main-is
in the test suite - Mark tests with the correct prefixes
- Customise test discovery as needed
Check out the example project to get moving quickly.
You can name this file anything you want but it must contain the correct preprocessor definition for tasty-discover to run and also, to detect the configuration. It should be in the top level of the test directory.
For example (in test/Driver.hs
):
{-# OPTIONS_GHC -F -pgmF tasty-discover #-}
In order for Cabal/Stack to know where the tests are, you'll need to configure the main-is option of your test-suite to point to the driver file. In the following example, the test driver file is called Driver.hs:
test-suite test
main-is: Driver.hs
hs-source-dirs: test
build-depends: base
If you use hpack, that might look like:
tests:
test:
main: "Driver.hs"
source-dirs: "test"
dependencies:
- "base"
Create test modules and correctly prefix the tests with the name that corresponds to the testing library you wish to run the test with:
- prop_: QuickCheck properties.
- scprop_: SmallCheck properties.
- hprop_: Hedgehog properties.
- unit_: HUnit test cases.
- spec_: Hspec specifications.
- test_: Tasty TestTrees.
Here's an example test module:
{-# LANGUAGE ScopedTypeVariables #-}
module ExampleTest where
import Data.List
import Test.Tasty
import Test.Tasty.HUnit
import Test.Tasty.Hspec
import Test.Tasty.QuickCheck
-- HUnit test case
unit_listCompare :: IO ()
unit_listCompare = [1, 2, 3] `compare` [1,2] @?= GT
-- QuickCheck property
prop_additionCommutative :: Int -> Int -> Bool
prop_additionCommutative a b = a + b == b + a
-- SmallSheck property
scprop_sortReverse :: [Int] -> Bool
scprop_sortReverse list = sort list == sort (reverse list)
-- Hspec specification
spec_prelude :: Spec
spec_prelude = do
describe "Prelude.head" $ do
it "returns the first element of a list" $ do
head [23 ..] `shouldBe` (23 :: Int)
-- Tasty TestTree
test_multiplication :: [TestTree]
test_multiplication = [testProperty "One is identity" $ \(a :: Int) -> a * 1 == a]
-- Tasty IO TestTree
test_generateTree :: IO TestTree
test_generateTree = do
input <- pure "Some input"
pure $ testCase input $ pure ()
-- Tasty IO [TestTree]
test_generateTrees :: IO [TestTree]
test_generateTrees = do
inputs <- pure ["First input", "Second input"]
pure $ map (\s -> testCase s $ pure ()) inputs
You configure tasty-discover by passing options to the test driver file.
Example: {-# OPTIONS_GHC -F -pgmF tasty-discover -optF --debug #-}
- --debug: Output the contents of the generated module while testing.
- --tree-display: Display the test output results hierarchically.
Example: {-# OPTIONS_GHC -F -pgmF tasty-discover -optF --modules="*CustomTest.hs" #-}
- --modules: Which test modules to discover (with glob pattern).
- --ignores: Which test modules to ignore (with glob pattern).
- --generated-module: The name of the generated test module.
- --ingredient: Tasty ingredients to add to your test runner.
It is also possible to override tasty arguments with -optF
:
{-# OPTIONS_GHC -F -pgmF tasty-discover -optF --hide-successes #-}
See the testing for this package for a fully configured example.
Please see the CHANGELOG.md for the latest changes.
If a breaking change is implemented, you'll see a major version increase, an entry in the change log and a compile time error with a deprecation warning and clear instructions on how to upgrade. Please do complain if we're doing this too much.
All contributions welcome!
If you're interested in helping maintain this package, please let @lwm know!
Thanks to hspec-discover and tasty-auto for making this possible.