2015-10-08 23:59:08 +03:00
|
|
|
{-# LANGUAGE DeriveDataTypeable #-}
|
|
|
|
{-# LANGUAGE GADTs #-}
|
|
|
|
{-# LANGUAGE RankNTypes #-}
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | This module allows using Deja Fu predicates with Tasty to test
|
|
|
|
-- the behaviour of concurrent systems.
|
|
|
|
module Test.Tasty.DejaFu
|
|
|
|
( -- * Testing
|
|
|
|
testAuto
|
|
|
|
, testDejafu
|
|
|
|
, testDejafus
|
|
|
|
, testAutoIO
|
|
|
|
, testDejafuIO
|
|
|
|
, testDejafusIO
|
|
|
|
|
2015-11-03 22:20:47 +03:00
|
|
|
-- * Testing under Alternative Memory Models
|
2015-10-08 23:50:52 +03:00
|
|
|
, MemType(..)
|
|
|
|
, testAuto'
|
|
|
|
, testAutoIO'
|
|
|
|
, testDejafu'
|
|
|
|
, testDejafus'
|
|
|
|
, testDejafuIO'
|
|
|
|
, testDejafusIO'
|
|
|
|
) where
|
|
|
|
|
2016-02-09 21:37:50 +03:00
|
|
|
import Data.List (intercalate, intersperse)
|
2015-10-08 23:50:52 +03:00
|
|
|
import Data.Typeable (Typeable)
|
|
|
|
import Test.DejaFu
|
2016-04-03 07:48:53 +03:00
|
|
|
import Test.DejaFu.Deterministic (ConcST, ConcIO, Trace, ThreadId, ThreadAction, Lookahead, showFail, showTrace)
|
2015-11-19 16:57:14 +03:00
|
|
|
import Test.DejaFu.SCT (sctBound, sctBoundIO)
|
2015-10-08 23:50:52 +03:00
|
|
|
import Test.Tasty (TestName, TestTree, testGroup)
|
|
|
|
import Test.Tasty.Providers (IsTest(..), singleTest, testPassed, testFailed)
|
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Automated testing
|
|
|
|
|
|
|
|
-- | Automatically test a computation. In particular, look for
|
|
|
|
-- deadlocks, uncaught exceptions, and multiple return values.
|
|
|
|
--
|
|
|
|
-- This uses the 'Conc' monad for testing, which is an instance of
|
|
|
|
-- 'MonadConc'. If you need to test something which also uses
|
|
|
|
-- 'MonadIO', use 'testAutoIO'.
|
|
|
|
testAuto :: (Eq a, Show a)
|
2015-11-07 21:07:10 +03:00
|
|
|
=> (forall t. ConcST t a)
|
2015-10-08 23:50:52 +03:00
|
|
|
-- ^ The computation to test
|
|
|
|
-> TestTree
|
2015-11-17 22:29:35 +03:00
|
|
|
testAuto = testAuto' defaultMemType
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testAuto' which tests a computation under a given
|
|
|
|
-- memory model.
|
|
|
|
testAuto' :: (Eq a, Show a)
|
|
|
|
=> MemType
|
|
|
|
-- ^ The memory model to use for non-synchronised @CRef@ operations.
|
2015-11-07 21:07:10 +03:00
|
|
|
-> (forall t. ConcST t a)
|
2015-10-08 23:50:52 +03:00
|
|
|
-- ^ The computation to test
|
|
|
|
-> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testAuto' memtype conc = testDejafus' memtype defaultBounds conc autocheckCases
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testAuto' for computations which do 'IO'.
|
2015-11-07 20:19:40 +03:00
|
|
|
testAutoIO :: (Eq a, Show a) => ConcIO a -> TestTree
|
2015-11-17 22:29:35 +03:00
|
|
|
testAutoIO = testAutoIO' defaultMemType
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testAuto'' for computations which do 'IO'.
|
2015-11-07 20:19:40 +03:00
|
|
|
testAutoIO' :: (Eq a, Show a) => MemType -> ConcIO a -> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testAutoIO' memtype concio = testDejafusIO' memtype defaultBounds concio autocheckCases
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Predicates for the various autocheck functions.
|
|
|
|
autocheckCases :: Eq a => [(TestName, Predicate a)]
|
|
|
|
autocheckCases =
|
2015-11-12 17:55:54 +03:00
|
|
|
[("Never Deadlocks", representative deadlocksNever)
|
|
|
|
, ("No Exceptions", representative exceptionsNever)
|
2015-10-08 23:50:52 +03:00
|
|
|
, ("Consistent Result", alwaysSame)
|
|
|
|
]
|
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Manual testing
|
|
|
|
|
|
|
|
-- | Check that a predicate holds.
|
2015-10-25 20:05:40 +03:00
|
|
|
testDejafu :: Show a
|
2015-11-07 21:07:10 +03:00
|
|
|
=> (forall t. ConcST t a)
|
2015-10-08 23:50:52 +03:00
|
|
|
-- ^ The computation to test
|
|
|
|
-> TestName
|
|
|
|
-- ^ The name of the test.
|
|
|
|
-> Predicate a
|
|
|
|
-- ^ The predicate to check
|
|
|
|
-> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafu = testDejafu' defaultMemType defaultBounds
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testDejafu' which takes a memory model and
|
|
|
|
-- pre-emption bound.
|
2015-10-25 20:05:40 +03:00
|
|
|
testDejafu' :: Show a
|
2015-10-08 23:50:52 +03:00
|
|
|
=> MemType
|
|
|
|
-- ^ The memory model to use for non-synchronised @CRef@ operations.
|
2015-11-19 16:57:14 +03:00
|
|
|
-> Bounds
|
|
|
|
-- ^ The schedule bounds.
|
2015-11-07 21:07:10 +03:00
|
|
|
-> (forall t. ConcST t a)
|
2015-10-08 23:50:52 +03:00
|
|
|
-- ^ The computation to test
|
|
|
|
-> TestName
|
|
|
|
-- ^ The name of the test.
|
|
|
|
-> Predicate a
|
|
|
|
-- ^ The predicate to check
|
|
|
|
-> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafu' memtype cb conc name p = testDejafus' memtype cb conc [(name, p)]
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testDejafu' which takes a collection of predicates to
|
|
|
|
-- test. This will share work between the predicates, rather than
|
|
|
|
-- running the concurrent computation many times for each predicate.
|
2015-10-25 20:05:40 +03:00
|
|
|
testDejafus :: Show a
|
2015-11-07 21:07:10 +03:00
|
|
|
=> (forall t. ConcST t a)
|
2015-10-08 23:50:52 +03:00
|
|
|
-- ^ The computation to test
|
|
|
|
-> [(TestName, Predicate a)]
|
|
|
|
-- ^ The list of predicates (with names) to check
|
|
|
|
-> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafus = testDejafus' defaultMemType defaultBounds
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testDejafus' which takes a memory model and pre-emption
|
|
|
|
-- bound.
|
2015-10-25 20:05:40 +03:00
|
|
|
testDejafus' :: Show a
|
2015-10-08 23:50:52 +03:00
|
|
|
=> MemType
|
|
|
|
-- ^ The memory model to use for non-synchronised @CRef@ operations.
|
2015-11-19 16:57:14 +03:00
|
|
|
-> Bounds
|
|
|
|
-- ^ The schedule bounds.
|
2015-11-07 21:07:10 +03:00
|
|
|
-> (forall t. ConcST t a)
|
2015-10-08 23:50:52 +03:00
|
|
|
-- ^ The computation to test
|
|
|
|
-> [(TestName, Predicate a)]
|
|
|
|
-- ^ The list of predicates (with names) to check
|
|
|
|
-> TestTree
|
|
|
|
testDejafus' = test
|
|
|
|
|
|
|
|
-- | Variant of 'testDejafu' for computations which do 'IO'.
|
2015-11-07 20:19:40 +03:00
|
|
|
testDejafuIO :: Show a => ConcIO a -> TestName -> Predicate a -> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafuIO = testDejafuIO' defaultMemType defaultBounds
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testDejafu'' for computations which do 'IO'.
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafuIO' :: Show a => MemType -> Bounds -> ConcIO a -> TestName -> Predicate a -> TestTree
|
|
|
|
testDejafuIO' memtype cb concio name p = testDejafusIO' memtype cb concio [(name, p)]
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'testDejafus' for computations which do 'IO'.
|
2015-11-07 20:19:40 +03:00
|
|
|
testDejafusIO :: Show a => ConcIO a -> [(TestName, Predicate a)] -> TestTree
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafusIO = testDejafusIO' defaultMemType defaultBounds
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Variant of 'dejafus'' for computations which do 'IO'.
|
2015-11-19 16:57:14 +03:00
|
|
|
testDejafusIO' :: Show a => MemType -> Bounds -> ConcIO a -> [(TestName, Predicate a)] -> TestTree
|
2015-10-08 23:50:52 +03:00
|
|
|
testDejafusIO' = testio
|
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Tasty integration
|
|
|
|
|
|
|
|
data ConcTest where
|
2016-04-03 07:48:53 +03:00
|
|
|
ConcTest :: Show a => [(Either Failure a, Trace ThreadId ThreadAction Lookahead)] -> Predicate a -> ConcTest
|
2015-10-08 23:50:52 +03:00
|
|
|
deriving Typeable
|
|
|
|
|
|
|
|
data ConcIOTest where
|
2016-04-03 07:48:53 +03:00
|
|
|
ConcIOTest :: Show a => IO [(Either Failure a, Trace ThreadId ThreadAction Lookahead)] -> Predicate a -> ConcIOTest
|
2015-10-08 23:50:52 +03:00
|
|
|
deriving Typeable
|
|
|
|
|
|
|
|
instance IsTest ConcTest where
|
|
|
|
testOptions = return []
|
|
|
|
|
|
|
|
run _ (ConcTest traces p) _ =
|
|
|
|
let err = showErr $ p traces
|
|
|
|
in return $ if null err then testPassed "" else testFailed err
|
|
|
|
|
|
|
|
instance IsTest ConcIOTest where
|
|
|
|
testOptions = return []
|
|
|
|
|
|
|
|
run _ (ConcIOTest iotraces p) _ = do
|
|
|
|
traces <- iotraces
|
|
|
|
let err = showErr $ p traces
|
|
|
|
return $ if null err then testPassed "" else testFailed err
|
|
|
|
|
|
|
|
-- | Produce a Tasty 'TestTree' from a Deja Fu test.
|
2015-11-19 16:57:14 +03:00
|
|
|
test :: Show a => MemType -> Bounds -> (forall t. ConcST t a) -> [(TestName, Predicate a)] -> TestTree
|
|
|
|
test memtype cb conc tests = case map toTest tests of
|
2015-10-08 23:50:52 +03:00
|
|
|
[t] -> t
|
|
|
|
ts -> testGroup "Deja Fu Tests" ts
|
|
|
|
|
|
|
|
where
|
|
|
|
toTest (name, p) = singleTest name $ ConcTest traces p
|
|
|
|
|
2015-11-19 16:57:14 +03:00
|
|
|
traces = sctBound memtype cb conc
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Produce a Tasty 'Test' from an IO-using Deja Fu test.
|
2015-11-19 16:57:14 +03:00
|
|
|
testio :: Show a => MemType -> Bounds -> ConcIO a -> [(TestName, Predicate a)] -> TestTree
|
|
|
|
testio memtype cb concio tests = case map toTest tests of
|
2015-10-08 23:50:52 +03:00
|
|
|
[t] -> t
|
|
|
|
ts -> testGroup "Deja Fu Tests" ts
|
|
|
|
|
|
|
|
where
|
|
|
|
toTest (name, p) = singleTest name $ ConcIOTest traces p
|
|
|
|
|
|
|
|
-- As with HUnit, constructing a test is side-effect free, so
|
|
|
|
-- sharing of traces can't happen here.
|
2015-11-19 16:57:14 +03:00
|
|
|
traces = sctBoundIO memtype cb concio
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
-- | Convert a test result into an error message on failure (empty
|
|
|
|
-- string on success).
|
|
|
|
showErr :: Show a => Result a -> String
|
|
|
|
showErr res
|
|
|
|
| _pass res = ""
|
2015-10-27 18:39:52 +03:00
|
|
|
| otherwise = "Failed after " ++ show (_casesChecked res) ++ " cases:\n" ++ msg ++ unlines failures ++ rest where
|
|
|
|
|
|
|
|
msg = if null (_failureMsg res) then "" else _failureMsg res ++ "\n"
|
2015-10-08 23:50:52 +03:00
|
|
|
|
2016-02-09 21:37:50 +03:00
|
|
|
failures = intersperse "" . map (\(r, t) -> indent $ either showFail show r ++ " " ++ showTrace t) . take 5 $ _failures res
|
2015-10-08 23:50:52 +03:00
|
|
|
|
|
|
|
rest = if moreThan (_failures res) 5 then "\n\t..." else ""
|
|
|
|
|
|
|
|
-- | Check if a list has more than some number of elements.
|
|
|
|
moreThan :: [a] -> Int -> Bool
|
|
|
|
moreThan [] n = n < 0
|
|
|
|
moreThan _ 0 = True
|
|
|
|
moreThan (_:xs) n = moreThan xs (n-1)
|
|
|
|
|
2016-02-09 21:37:50 +03:00
|
|
|
-- | Indent every line of a string.
|
|
|
|
indent :: String -> String
|
|
|
|
indent = intercalate "\n" . map ('\t':) . lines
|