Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
Hix.Options
Documentation
data PreprocOptions Source #
Constructors
PreprocOptions | |
Instances
data PackageSpec Source #
Constructors
PackageSpec | |
Instances
Generic PackageSpec Source # | |
Defined in Hix.Options Associated Types type Rep PackageSpec :: Type -> Type # | |
Show PackageSpec Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> PackageSpec -> ShowS # show :: PackageSpec -> String # showList :: [PackageSpec] -> ShowS # | |
Eq PackageSpec Source # | |
Defined in Hix.Options | |
type Rep PackageSpec Source # | |
Defined in Hix.Options type Rep PackageSpec = D1 ('MetaData "PackageSpec" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "PackageSpec" 'PrefixI 'True) (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Just "dir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SomeBase Dir))))) |
data ComponentSpec Source #
Constructors
ComponentSpec | |
Fields
|
Instances
Generic ComponentSpec Source # | |
Defined in Hix.Options Associated Types type Rep ComponentSpec :: Type -> Type # | |
Show ComponentSpec Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> ComponentSpec -> ShowS # show :: ComponentSpec -> String # showList :: [ComponentSpec] -> ShowS # | |
Eq ComponentSpec Source # | |
Defined in Hix.Options Methods (==) :: ComponentSpec -> ComponentSpec -> Bool # (/=) :: ComponentSpec -> ComponentSpec -> Bool # | |
type Rep ComponentSpec Source # | |
Defined in Hix.Options type Rep ComponentSpec = D1 ('MetaData "ComponentSpec" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "ComponentSpec" 'PrefixI 'True) (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: S1 ('MetaSel ('Just "dir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceDir)))) |
data ComponentCoords Source #
Constructors
ComponentCoords | |
Fields |
Instances
data TargetSpec Source #
Constructors
TargetForFile (Path Abs File) | |
TargetForComponent ComponentCoords |
Instances
Generic TargetSpec Source # | |
Defined in Hix.Options Associated Types type Rep TargetSpec :: Type -> Type # | |
Show TargetSpec Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> TargetSpec -> ShowS # show :: TargetSpec -> String # showList :: [TargetSpec] -> ShowS # | |
Eq TargetSpec Source # | |
Defined in Hix.Options | |
type Rep TargetSpec Source # | |
Defined in Hix.Options type Rep TargetSpec = D1 ('MetaData "TargetSpec" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "TargetForFile" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Abs File))) :+: C1 ('MetaCons "TargetForComponent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentCoords))) |
data TestOptions Source #
Constructors
TestOptions | |
Fields
|
Instances
Generic TestOptions Source # | |
Defined in Hix.Options Associated Types type Rep TestOptions :: Type -> Type # | |
Show TestOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> TestOptions -> ShowS # show :: TestOptions -> String # showList :: [TestOptions] -> ShowS # | |
Eq TestOptions Source # | |
Defined in Hix.Options | |
type Rep TestOptions Source # | |
Defined in Hix.Options type Rep TestOptions = D1 ('MetaData "TestOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "TestOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "mod") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName) :*: (S1 ('MetaSel ('Just "test") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "runner") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RunnerName))))) |
data EnvRunnerOptions Source #
Constructors
EnvRunnerOptions | |
Fields |
Instances
Generic EnvRunnerOptions Source # | |
Defined in Hix.Options Associated Types type Rep EnvRunnerOptions :: Type -> Type # Methods from :: EnvRunnerOptions -> Rep EnvRunnerOptions x # to :: Rep EnvRunnerOptions x -> EnvRunnerOptions # | |
Show EnvRunnerOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> EnvRunnerOptions -> ShowS # show :: EnvRunnerOptions -> String # showList :: [EnvRunnerOptions] -> ShowS # | |
type Rep EnvRunnerOptions Source # | |
Defined in Hix.Options type Rep EnvRunnerOptions = D1 ('MetaData "EnvRunnerOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "EnvRunnerOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either EnvConfig JsonConfig)) :*: S1 ('MetaSel ('Just "component") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe TargetSpec)))) |
data GhciOptions Source #
Constructors
GhciOptions | |
Fields |
Instances
Generic GhciOptions Source # | |
Defined in Hix.Options Associated Types type Rep GhciOptions :: Type -> Type # | |
Show GhciOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> GhciOptions -> ShowS # show :: GhciOptions -> String # showList :: [GhciOptions] -> ShowS # | |
type Rep GhciOptions Source # | |
Defined in Hix.Options type Rep GhciOptions = D1 ('MetaData "GhciOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "GhciOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either GhciConfig JsonConfig)) :*: (S1 ('MetaSel ('Just "component") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TargetSpec) :*: S1 ('MetaSel ('Just "test") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TestOptions)))) |
data NewOptions Source #
Constructors
NewOptions | |
Fields |
Instances
Generic NewOptions Source # | |
Defined in Hix.Options Associated Types type Rep NewOptions :: Type -> Type # | |
Show NewOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> NewOptions -> ShowS # show :: NewOptions -> String # showList :: [NewOptions] -> ShowS # | |
Eq NewOptions Source # | |
Defined in Hix.Options | |
type Rep NewOptions Source # | |
Defined in Hix.Options type Rep NewOptions = D1 ('MetaData "NewOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "NewOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NewProjectConfig))) |
data BootstrapOptions Source #
Constructors
BootstrapOptions | |
Fields |
Instances
Generic BootstrapOptions Source # | |
Defined in Hix.Options Associated Types type Rep BootstrapOptions :: Type -> Type # Methods from :: BootstrapOptions -> Rep BootstrapOptions x # to :: Rep BootstrapOptions x -> BootstrapOptions # | |
Show BootstrapOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> BootstrapOptions -> ShowS # show :: BootstrapOptions -> String # showList :: [BootstrapOptions] -> ShowS # | |
Eq BootstrapOptions Source # | |
Defined in Hix.Options Methods (==) :: BootstrapOptions -> BootstrapOptions -> Bool # (/=) :: BootstrapOptions -> BootstrapOptions -> Bool # | |
type Rep BootstrapOptions Source # | |
Defined in Hix.Options type Rep BootstrapOptions = D1 ('MetaData "BootstrapOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "BootstrapOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BootstrapProjectConfig))) |
data EnvRunnerCommandOptions Source #
Constructors
EnvRunnerCommandOptions | |
Fields |
Instances
Generic EnvRunnerCommandOptions Source # | |
Defined in Hix.Options Associated Types type Rep EnvRunnerCommandOptions :: Type -> Type # Methods from :: EnvRunnerCommandOptions -> Rep EnvRunnerCommandOptions x # to :: Rep EnvRunnerCommandOptions x -> EnvRunnerCommandOptions # | |
Show EnvRunnerCommandOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> EnvRunnerCommandOptions -> ShowS # show :: EnvRunnerCommandOptions -> String # showList :: [EnvRunnerCommandOptions] -> ShowS # | |
type Rep EnvRunnerCommandOptions Source # | |
Defined in Hix.Options type Rep EnvRunnerCommandOptions = D1 ('MetaData "EnvRunnerCommandOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "EnvRunnerCommandOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "options") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EnvRunnerOptions) :*: S1 ('MetaSel ('Just "test") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TestOptions))) |
data GlobalOptions Source #
Constructors
GlobalOptions | |
Instances
Generic GlobalOptions Source # | |
Defined in Hix.Options Associated Types type Rep GlobalOptions :: Type -> Type # | |
Show GlobalOptions Source # | |
Defined in Hix.Options Methods showsPrec :: Int -> GlobalOptions -> ShowS # show :: GlobalOptions -> String # showList :: [GlobalOptions] -> ShowS # | |
Default GlobalOptions Source # | |
Defined in Hix.Options Methods def :: GlobalOptions # | |
Eq GlobalOptions Source # | |
Defined in Hix.Options Methods (==) :: GlobalOptions -> GlobalOptions -> Bool # (/=) :: GlobalOptions -> GlobalOptions -> Bool # | |
type Rep GlobalOptions Source # | |
Defined in Hix.Options type Rep GlobalOptions = D1 ('MetaData "GlobalOptions" "Hix.Options" "hix-0.4.2-72Zy03fjb49A5gBp9RPuGO" 'False) (C1 ('MetaCons "GlobalOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "verbose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))) |
Constructors
Options | |
Fields
|
runnerParser :: Parser (Maybe RunnerName) Source #