Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
Documentation
Instances
Generic ExprAttr Source # | |
Show ExprAttr Source # | |
Eq ExprAttr Source # | |
type Rep ExprAttr Source # | |
Defined in Hix.Bootstrap type Rep ExprAttr = D1 ('MetaData "ExprAttr" "Hix.Bootstrap" "hix-0.6.1-FehBjbuHf2y2ubHG97UkG2" 'False) (C1 ('MetaCons "ExprAttr" 'PrefixI 'True) (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expr)) :+: C1 ('MetaCons "ExprAttrNil" 'PrefixI 'False) (U1 :: Type -> Type)) |
Instances
exprStrings :: [Text] -> Expr Source #
Instances
Generic CabalInfo Source # | |
Show CabalInfo Source # | |
Eq CabalInfo Source # | |
type Rep CabalInfo Source # | |
Defined in Hix.Bootstrap type Rep CabalInfo = D1 ('MetaData "CabalInfo" "Hix.Bootstrap" "hix-0.6.1-FehBjbuHf2y2ubHG97UkG2" 'False) (C1 ('MetaCons "CabalInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "path") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Rel Dir)) :*: S1 ('MetaSel ('Just "info") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GenericPackageDescription))) |
data ComponentType Source #
Instances
data PreludeWithVersion Source #
Instances
data HixComponent Source #
Instances
data HixPackage Source #
HixPackage | |
|
Instances
renderRootExpr :: Expr -> Text Source #
class RenderCabalOption a where Source #
renderCabalOption :: a -> Text Source #
Instances
RenderCabalOption ShortText Source # | |
Defined in Hix.Bootstrap renderCabalOption :: ShortText -> Text Source # | |
RenderCabalOption String Source # | |
Defined in Hix.Bootstrap renderCabalOption :: String -> Text Source # | |
Pretty a => RenderCabalOption a Source # | |
Defined in Hix.Bootstrap renderCabalOption :: a -> Text Source # |
multiOrSingle :: forall a e. RenderCabalOption a => Text -> (e -> [a]) -> e -> ExprAttr Source #
metaPackageKeys :: PackageDescription -> [ExprAttr] Source #
ghcFlavour :: PerCompilerFlavor a -> a Source #
notDefaultGhcOption :: String -> Bool Source #
knownComponentKeys :: Maybe Prelude -> BuildInfo -> (Maybe PreludeWithVersion, [ExprAttr]) Source #
notBase :: Dependency -> Bool Source #
convertLibrary :: Library -> HixComponent Source #
convert :: CabalInfo -> HixPackage Source #
flakePackage :: HixPackage -> ExprAttr Source #
mainPackage :: [HixPackage] -> ExprAttr Source #
flake :: BootstrapProjectConfig -> [HixPackage] -> Expr Source #
bootstrapProject :: BootstrapProjectConfig -> M () Source #