stack-2.15.3: The Haskell Tool Stack
Safe HaskellSafe-Inferred
LanguageGHC2021

Stack.Types.ConfigureOpts

Synopsis

Documentation

data ConfigureOpts Source #

Configure options to be sent to Setup.hs configure.

Constructors

ConfigureOpts 

Fields

  • pathRelated :: ![String]

    Options related to various paths. We separate these out since they do not have an effect on the contents of the compiled binary for checking if we can use an existing precompiled cache.

  • nonPathRelated :: ![String]

    Options other than path-related options.

Instances

Instances details
Data ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Methods

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

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

toConstr :: ConfigureOpts -> Constr #

dataTypeOf :: ConfigureOpts -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Associated Types

type Rep ConfigureOpts :: Type -> Type #

Show ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

NFData ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Methods

rnf :: ConfigureOpts -> () #

Eq ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

type Rep ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

type Rep ConfigureOpts = D1 ('MetaData "ConfigureOpts" "Stack.Types.ConfigureOpts" "stack-2.15.3-IiMra1A9vP4fPzeIsQ44c" 'False) (C1 ('MetaCons "ConfigureOpts" 'PrefixI 'True) (S1 ('MetaSel ('Just "pathRelated") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String]) :*: S1 ('MetaSel ('Just "nonPathRelated") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String])))

data BaseConfigOpts Source #

Basic information used to calculate what the configure options are

Instances

Instances details
Show BaseConfigOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

configureOpts Source #

Arguments

:: EnvConfig 
-> BaseConfigOpts 
-> Map PackageIdentifier GhcPkgId

dependencies

-> Bool

local non-extra-dep?

-> IsMutable 
-> Package 
-> ConfigureOpts 

Render a BaseConfigOpts to an actual list of options

configureOptsNonPathRelated Source #

Arguments

:: EnvConfig 
-> BaseConfigOpts 
-> Map PackageIdentifier GhcPkgId

Dependencies.

-> Bool

Is this a local, non-extra-dep?

-> Package 
-> [String] 

Same as configureOpts, but does not include directory path options