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

Distribution.Types.BenchmarkInterface

Synopsis

Documentation

data BenchmarkInterface Source #

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

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

Constructors

BenchmarkExeV10 Version FilePath

Benchmark interface "exitcode-stdio-1.0". The benchmark 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.

BenchmarkUnsupported BenchmarkType

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

Instances

Instances details
Eq BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Data BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

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

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

toConstr :: BenchmarkInterface -> Constr Source #

dataTypeOf :: BenchmarkInterface -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Read BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Show BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Generic BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Associated Types

type Rep BenchmarkInterface :: Type -> Type Source #

Semigroup BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Monoid BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Binary BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

NFData BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

rnf :: BenchmarkInterface -> () Source #

Structured BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface

type Rep BenchmarkInterface # 
Instance details

Defined in Distribution.Types.BenchmarkInterface