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

Distribution.Types.BuildType

Synopsis

Documentation

data BuildType Source #

The type of build system used by this package.

Constructors

Simple

calls Distribution.Simple.defaultMain

Configure

calls Distribution.Simple.defaultMainWithHooks defaultUserHooks, which invokes configure to generate additional build information used by later phases.

Make

calls Distribution.Make.defaultMain

Custom

uses user-supplied Setup.hs or Setup.lhs (default)

Instances

Instances details
Eq BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Data BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Methods

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

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

toConstr :: BuildType -> Constr Source #

dataTypeOf :: BuildType -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Read BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Show BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Generic BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Associated Types

type Rep BuildType :: Type -> Type Source #

Binary BuildType # 
Instance details

Defined in Distribution.Types.BuildType

NFData BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Methods

rnf :: BuildType -> () Source #

Structured BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Pretty BuildType # 
Instance details

Defined in Distribution.Types.BuildType

Parsec BuildType # 
Instance details

Defined in Distribution.Types.BuildType

type Rep BuildType # 
Instance details

Defined in Distribution.Types.BuildType

type Rep BuildType = D1 ('MetaData "BuildType" "Distribution.Types.BuildType" "Cabal-3.2.1.0" 'False) ((C1 ('MetaCons "Simple" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Configure" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Make" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Custom" 'PrefixI 'False) (U1 :: Type -> Type)))