{-# LANGUAGE CPP, ScopedTypeVariables, DeriveDataTypeable #-}
module Test.Tasty.CmdLine
( optionParser
, suiteOptions
, suiteOptionParser
, defaultMainWithIngredients
) where
import Options.Applicative
import Data.Monoid ((<>))
import Data.Proxy
import Data.Foldable (foldMap)
import Prelude
import System.Exit
import System.IO
#define INSTALL_HANDLERS defined UNIX && MIN_VERSION_base(4,6,0)
#if INSTALL_HANDLERS
import Control.Concurrent (mkWeakThreadId, myThreadId)
import Control.Exception (Exception(..), throwTo)
import Control.Monad (forM_)
import Data.Typeable (Typeable)
import System.Posix.Signals
import System.Mem.Weak (deRefWeak)
#endif
#if !MIN_VERSION_base(4,9,0)
import Data.Monoid
#endif
import Test.Tasty.Core
import Test.Tasty.Ingredients
import Test.Tasty.Options
import Test.Tasty.Options.Env
import Test.Tasty.Runners.Reducers
optionParser :: [OptionDescription] -> Parser OptionSet
optionParser = getApp . foldMap toSet where
toSet :: OptionDescription -> Ap Parser OptionSet
toSet (Option (Proxy :: Proxy v)) = Ap $
(singleOption <$> (optionCLParser :: Parser v)) <|> pure mempty
suiteOptionParser :: [Ingredient] -> TestTree -> Parser OptionSet
suiteOptionParser ins tree = optionParser $ suiteOptions ins tree
defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO ()
defaultMainWithIngredients ins testTree = do
installSignalHandlers
cmdlineOpts <- execParser $
info (helper <*> suiteOptionParser ins testTree)
( fullDesc <>
header "Mmm... tasty test suite"
)
envOpts <- suiteEnvOptions ins testTree
let opts = envOpts <> cmdlineOpts
case tryIngredients ins opts testTree of
Nothing -> do
hPutStrLn stderr
"No ingredients agreed to run. Something is wrong either with your ingredient set or the options."
exitFailure
Just act -> do
ok <- act
if ok then exitSuccess else exitFailure
installSignalHandlers :: IO ()
installSignalHandlers = do
#if INSTALL_HANDLERS
main_thread_id <- myThreadId
weak_tid <- mkWeakThreadId main_thread_id
forM_ [ sigABRT, sigBUS, sigFPE, sigHUP, sigILL, sigQUIT, sigSEGV,
sigSYS, sigTERM, sigUSR1, sigUSR2, sigXCPU, sigXFSZ ] $ \sig ->
installHandler sig (Catch $ send_exception weak_tid sig) Nothing
where
send_exception weak_tid sig = do
m <- deRefWeak weak_tid
case m of
Nothing -> return ()
Just tid -> throwTo tid (toException $ SignalException sig)
newtype SignalException = SignalException Signal
deriving (Show, Typeable)
instance Exception SignalException
#else
return ()
#endif