{-# LANGUAGE NoImplicitPrelude #-}

-- : dep tasty
-- : dep tasty-hunit
-- : dep tasty-quickcheck
module Biz.Test
  ( Tree,
    group,
    unit,
    prop,
    (@=?),
  )
where

import qualified Test.Tasty as Tasty
import Test.Tasty.HUnit ((@=?))
import qualified Test.Tasty.HUnit as HUnit
import qualified Test.Tasty.QuickCheck as QuickCheck

type Tree = Tasty.TestTree

group :: Tasty.TestName -> [Tasty.TestTree] -> Tasty.TestTree
group = Tasty.testGroup

unit :: Tasty.TestName -> HUnit.Assertion -> Tasty.TestTree
unit = HUnit.testCase

prop :: QuickCheck.Testable a => Tasty.TestName -> a -> Tasty.TestTree
prop = QuickCheck.testProperty