Safe Haskell | None |
---|---|
Language | Haskell2010 |
SuperUserSpark.Compiler.Types
Documentation
data CompileAssignment Source #
Constructors
CompileAssignment | |
Instances
data StrongCardFileReference Source #
Constructors
StrongCardFileReference (Path Abs File) (Maybe CardNameReference) |
Instances
data StrongCardReference Source #
Instances
data CompileSettings Source #
Constructors
CompileSettings | |
Instances
type RawDeployment = Deployment FilePath Source #
data Deployment a Source #
Constructors
Deployment | |
Fields |
Instances
data DeploymentDirections a Source #
Constructors
Directions | |
Fields
|
Instances
type CompilerPrefix = [PrefixPart] Source #
data PrefixPart Source #
Instances
Eq PrefixPart Source # | |
Defined in SuperUserSpark.Compiler.Types | |
Show PrefixPart Source # | |
Defined in SuperUserSpark.Compiler.Types Methods showsPrec :: Int -> PrefixPart -> ShowS # show :: PrefixPart -> String # showList :: [PrefixPart] -> ShowS # | |
Generic PrefixPart Source # | |
Defined in SuperUserSpark.Compiler.Types Associated Types type Rep PrefixPart :: * -> * # | |
Validity PrefixPart Source # | |
Defined in SuperUserSpark.Compiler.Types Methods validate :: PrefixPart -> Validation # | |
type Rep PrefixPart Source # | |
Defined in SuperUserSpark.Compiler.Types type Rep PrefixPart = D1 (MetaData "PrefixPart" "SuperUserSpark.Compiler.Types" "super-user-spark-0.4.0.1-P7s2QbrTII5c6XXsq6MCt" False) (C1 (MetaCons "Literal" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: C1 (MetaCons "Alts" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String]))) |
data CompilerState Source #
Constructors
CompilerState | |
Instances
type ImpureCompiler = ExceptT CompileError (ReaderT CompileSettings IO) Source #
type InternalCompiler = StateT CompilerState (WriterT ([RawDeployment], [CardReference]) PureCompiler) Source #
data CompileError Source #
Constructors
CompileParseError ParseError | |
PreCompileErrors [PreCompileError] | |
DuringCompilationError String |