Cabal-3.4.0.0: A framework for packaging Haskell software
Safe HaskellNone
LanguageHaskell2010

Distribution.Types.TestSuiteInterface

Synopsis

Documentation

data TestSuiteInterface Source #

The test suite interfaces that are currently defined. Each test suite must specify which interface it supports.

More interfaces may be defined in future, either new revisions or totally new interfaces.

Constructors

TestSuiteExeV10 Version FilePath

Test interface "exitcode-stdio-1.0". The test-suite takes the form of an executable. It returns a zero exit code for success, non-zero for failure. The stdout and stderr channels may be logged. It takes no command line parameters and nothing on stdin.

TestSuiteLibV09 Version ModuleName

Test interface "detailed-0.9". The test-suite takes the form of a library containing a designated module that exports "tests :: [Test]".

TestSuiteUnsupported TestType

A test suite that does not conform to one of the above interfaces for the given reason (e.g. unknown test type).

Instances

Instances details
Eq TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Data TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestSuiteInterface -> c TestSuiteInterface #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestSuiteInterface #

toConstr :: TestSuiteInterface -> Constr #

dataTypeOf :: TestSuiteInterface -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestSuiteInterface) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestSuiteInterface) #

gmapT :: (forall b. Data b => b -> b) -> TestSuiteInterface -> TestSuiteInterface #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestSuiteInterface -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestSuiteInterface -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestSuiteInterface -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestSuiteInterface -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface #

Read TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Show TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Generic TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Associated Types

type Rep TestSuiteInterface :: Type -> Type #

Semigroup TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Monoid TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Binary TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

NFData TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

rnf :: TestSuiteInterface -> () #

Structured TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

type Rep TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface