Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data BuildType
- knownBuildTypes :: [BuildType]
Documentation
The type of build system used by this package.
Simple | calls |
Configure | calls |
Make | calls |
Custom | uses user-supplied |
UnknownBuildType String | a package that uses an unknown build type cannot actually be built. Doing it this way rather than just giving a parse error means we get better error messages and allows you to inspect the rest of the package description. |
Instances
Eq BuildType Source # | |
Data BuildType Source # | |
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildType -> c BuildType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildType # toConstr :: BuildType -> Constr # dataTypeOf :: BuildType -> DataType # dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c BuildType) # dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildType) # gmapT :: (forall b. Data b => b -> b) -> BuildType -> BuildType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildType -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildType -> r # gmapQ :: (forall d. Data d => d -> u) -> BuildType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType # | |
Read BuildType Source # | |
Show BuildType Source # | |
Generic BuildType Source # | |
Binary BuildType Source # | |
Text BuildType Source # | |
type Rep BuildType Source # | |
type Rep BuildType = D1 * (MetaData "BuildType" "Distribution.Types.BuildType" "Cabal-2.0.0.2-ArD10404PgFe4UBxSAxnL" False) ((:+:) * ((:+:) * (C1 * (MetaCons "Simple" PrefixI False) (U1 *)) (C1 * (MetaCons "Configure" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "Make" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "Custom" PrefixI False) (U1 *)) (C1 * (MetaCons "UnknownBuildType" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String)))))) |
knownBuildTypes :: [BuildType] Source #