Cabal-syntax-3.11.0.0: A library for working with .cabal files
Safe HaskellNone
LanguageHaskell2010

Distribution.Types.TestSuiteInterface

Synopsis

Documentation

data TestSuiteInterface Source #

The test suite interfaces that are currently defined.

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. Test tooling may pass command line arguments and/or connect the stdin channel to the test.

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
Structured 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 -> () Source #

Monoid TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Semigroup 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 #

Generic TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Read TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Show TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Eq TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Ord TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface

type Rep TestSuiteInterface Source # 
Instance details

Defined in Distribution.Types.TestSuiteInterface