Cabal-2.2.0.0: A framework for packaging Haskell software

Safe HaskellNone
LanguageHaskell2010

Distribution.CabalSpecVersion

Synopsis

Documentation

data CabalSpecVersion Source #

Different Cabal-the-spec versions.

We branch based on this at least in the parser.

Instances

Bounded CabalSpecVersion Source # 
Enum CabalSpecVersion Source # 
Eq CabalSpecVersion Source # 
Data CabalSpecVersion Source # 

Methods

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

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

toConstr :: CabalSpecVersion -> Constr #

dataTypeOf :: CabalSpecVersion -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CabalSpecVersion Source # 
Read CabalSpecVersion Source # 
Show CabalSpecVersion Source # 
Generic CabalSpecVersion Source # 
type Rep CabalSpecVersion Source # 
type Rep CabalSpecVersion = D1 * (MetaData "CabalSpecVersion" "Distribution.CabalSpecVersion" "Cabal-2.2.0.0-LjrPiS3OoG894mMpepVd4F" False) ((:+:) * ((:+:) * (C1 * (MetaCons "CabalSpecOld" PrefixI False) (U1 *)) (C1 * (MetaCons "CabalSpecV1_22" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "CabalSpecV1_24" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "CabalSpecV2_0" PrefixI False) (U1 *)) (C1 * (MetaCons "CabalSpecV2_2" PrefixI False) (U1 *)))))

data CabalFeature Source #

Constructors

Elif 
CommonStanzas 

Instances

Bounded CabalFeature Source # 
Enum CabalFeature Source # 
Eq CabalFeature Source # 
Data CabalFeature Source # 

Methods

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

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

toConstr :: CabalFeature -> Constr #

dataTypeOf :: CabalFeature -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CabalFeature Source # 
Read CabalFeature Source # 
Show CabalFeature Source # 
Generic CabalFeature Source # 

Associated Types

type Rep CabalFeature :: * -> * #

type Rep CabalFeature Source # 
type Rep CabalFeature = D1 * (MetaData "CabalFeature" "Distribution.CabalSpecVersion" "Cabal-2.2.0.0-LjrPiS3OoG894mMpepVd4F" False) ((:+:) * (C1 * (MetaCons "Elif" PrefixI False) (U1 *)) (C1 * (MetaCons "CommonStanzas" PrefixI False) (U1 *)))

data HasElif Source #

Constructors

HasElif 
NoElif