stack-1.9.1.1: The Haskell Tool Stack

Safe HaskellNone
LanguageHaskell2010

Stack.Types.Compiler

Synopsis

Documentation

data CVType Source #

Whether the compiler version given is the wanted version (what the stack.yaml file, snapshot file, or --resolver argument request), or the actual installed GHC. Depending on the matching requirements, these values could be different.

Constructors

CVWanted 
CVActual 

data CompilerVersion (cvType :: CVType) Source #

Specifies a compiler and its version number(s).

Note that despite having this datatype, stack isn't in a hurry to support compilers other than GHC.

Instances
Eq (CompilerVersion cvType) Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

(==) :: CompilerVersion cvType -> CompilerVersion cvType -> Bool #

(/=) :: CompilerVersion cvType -> CompilerVersion cvType -> Bool #

Typeable cvType => Data (CompilerVersion cvType) Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

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

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

toConstr :: CompilerVersion cvType -> Constr #

dataTypeOf :: CompilerVersion cvType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord (CompilerVersion cvType) Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

compare :: CompilerVersion cvType -> CompilerVersion cvType -> Ordering #

(<) :: CompilerVersion cvType -> CompilerVersion cvType -> Bool #

(<=) :: CompilerVersion cvType -> CompilerVersion cvType -> Bool #

(>) :: CompilerVersion cvType -> CompilerVersion cvType -> Bool #

(>=) :: CompilerVersion cvType -> CompilerVersion cvType -> Bool #

max :: CompilerVersion cvType -> CompilerVersion cvType -> CompilerVersion cvType #

min :: CompilerVersion cvType -> CompilerVersion cvType -> CompilerVersion cvType #

Show (CompilerVersion cvType) Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

showsPrec :: Int -> CompilerVersion cvType -> ShowS #

show :: CompilerVersion cvType -> String #

showList :: [CompilerVersion cvType] -> ShowS #

Generic (CompilerVersion cvType) Source # 
Instance details

Defined in Stack.Types.Compiler

Associated Types

type Rep (CompilerVersion cvType) :: Type -> Type #

Methods

from :: CompilerVersion cvType -> Rep (CompilerVersion cvType) x #

to :: Rep (CompilerVersion cvType) x -> CompilerVersion cvType #

NFData (CompilerVersion a) Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

rnf :: CompilerVersion a -> () #

ToJSON (CompilerVersion a) Source # 
Instance details

Defined in Stack.Types.Compiler

FromJSON (CompilerVersion a) Source # 
Instance details

Defined in Stack.Types.Compiler

FromJSONKey (CompilerVersion a) Source # 
Instance details

Defined in Stack.Types.Compiler

Display (CompilerVersion a) Source # 
Instance details

Defined in Stack.Types.Compiler

Store (CompilerVersion a) Source # 
Instance details

Defined in Stack.Types.Compiler

type Rep (CompilerVersion cvType) Source # 
Instance details

Defined in Stack.Types.Compiler

type Rep (CompilerVersion cvType) = D1 (MetaData "CompilerVersion" "Stack.Types.Compiler" "stack-1.9.1.1-6jz2L6XfBym9jbCxt3ojTR" False) (C1 (MetaCons "GhcVersion" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) SourceUnpack SourceStrict DecidedStrict) (Rec0 Version)) :+: C1 (MetaCons "GhcjsVersion" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) SourceUnpack SourceStrict DecidedStrict) (Rec0 Version) :*: S1 (MetaSel (Nothing :: Maybe Symbol) SourceUnpack SourceStrict DecidedStrict) (Rec0 Version)))