Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Types.Procedure
Documentation
Constructors
ArgValues | |
Fields
|
data Assignable c Source #
Constructors
CreateVariable [c] ValueType VariableName | |
ExistingVariable (InputValue c) |
Instances
Show c => Show (Assignable c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> Assignable c -> ShowS # show :: Assignable c -> String # showList :: [Assignable c] -> ShowS # | |
ParseFromSource (Assignable SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data ExecutableProcedure c Source #
Constructors
ExecutableProcedure | |
Fields
|
Instances
Show c => Show (ExecutableProcedure c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> ExecutableProcedure c -> ShowS # show :: ExecutableProcedure c -> String # showList :: [ExecutableProcedure c] -> ShowS # | |
ParseFromSource (ExecutableProcedure SourcePos) Source # | |
Defined in Parser.Procedure Methods sourceParser :: Parser (ExecutableProcedure SourcePos) Source # |
data Expression c Source #
Constructors
Expression [c] (ExpressionStart c) [ValueOperation c] | |
Literal (ValueLiteral c) | |
UnaryExpression [c] (Operator c) (Expression c) | |
InfixExpression [c] (Expression c) (Operator c) (Expression c) | |
InitializeValue [c] TypeInstance (Positional GeneralInstance) (Positional (Expression c)) |
Instances
Show c => Show (Expression c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> Expression c -> ShowS # show :: Expression c -> String # showList :: [Expression c] -> ShowS # | |
ParseFromSource (Expression SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data ExpressionStart c Source #
Constructors
NamedVariable (OutputValue c) | |
NamedMacro [c] String | |
CategoryCall [c] CategoryName (FunctionCall c) | |
TypeCall [c] TypeInstanceOrParam (FunctionCall c) | |
UnqualifiedCall [c] (FunctionCall c) | |
BuiltinCall [c] (FunctionCall c) | |
ParensExpression [c] (Expression c) | |
InlineAssignment [c] VariableName (Expression c) |
Instances
Show c => Show (ExpressionStart c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> ExpressionStart c -> ShowS # show :: ExpressionStart c -> String # showList :: [ExpressionStart c] -> ShowS # | |
ParseFromSource (ExpressionStart SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data FunctionCall c Source #
Constructors
FunctionCall [c] FunctionName (Positional (InstanceOrInferred c)) (Positional (Expression c)) |
Instances
Show c => Show (FunctionCall c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> FunctionCall c -> ShowS # show :: FunctionCall c -> String # showList :: [FunctionCall c] -> ShowS # |
data FunctionQualifier c Source #
Constructors
CategoryFunction [c] CategoryName | |
TypeFunction [c] TypeInstanceOrParam | |
ValueFunction [c] (Expression c) | |
UnqualifiedFunction |
Instances
Show c => Show (FunctionQualifier c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> FunctionQualifier c -> ShowS # show :: FunctionQualifier c -> String # showList :: [FunctionQualifier c] -> ShowS # | |
ParseFromSource (FunctionQualifier SourcePos) Source # | |
Defined in Parser.Procedure Methods sourceParser :: Parser (FunctionQualifier SourcePos) Source # |
data FunctionSpec c Source #
Constructors
FunctionSpec [c] (FunctionQualifier c) FunctionName (Positional (InstanceOrInferred c)) |
Instances
Show c => Show (FunctionSpec c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> FunctionSpec c -> ShowS # show :: FunctionSpec c -> String # showList :: [FunctionSpec c] -> ShowS # | |
ParseFromSource (FunctionSpec SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data IfElifElse c Source #
Constructors
IfStatement [c] (Expression c) (Procedure c) (IfElifElse c) | |
ElseStatement [c] (Procedure c) | |
TerminateConditional |
Instances
Show c => Show (IfElifElse c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> IfElifElse c -> ShowS # show :: IfElifElse c -> String # showList :: [IfElifElse c] -> ShowS # | |
ParseFromSource (IfElifElse SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data InputValue c Source #
Constructors
InputValue | |
Fields
| |
DiscardInput | |
Fields
|
Instances
Show c => Show (InputValue c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> InputValue c -> ShowS # show :: InputValue c -> String # showList :: [InputValue c] -> ShowS # | |
ParseFromSource (InputValue SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data InstanceOrInferred c Source #
Constructors
AssignedInstance [c] GeneralInstance | |
InferredInstance [c] |
Instances
Show c => Show (InstanceOrInferred c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> InstanceOrInferred c -> ShowS # show :: InstanceOrInferred c -> String # showList :: [InstanceOrInferred c] -> ShowS # | |
ParseFromSource (InstanceOrInferred SourcePos) Source # | |
Defined in Parser.Procedure Methods sourceParser :: Parser (InstanceOrInferred SourcePos) Source # |
Constructors
NamedOperator String | |
FunctionOperator [c] (FunctionSpec c) |
data OutputValue c Source #
Constructors
OutputValue | |
Fields
|
Instances
Show c => Show (OutputValue c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> OutputValue c -> ShowS # show :: OutputValue c -> String # showList :: [OutputValue c] -> ShowS # | |
ParseFromSource (OutputValue SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data ReturnValues c Source #
Constructors
NamedReturns | |
Fields
| |
UnnamedReturns | |
Fields
|
Instances
Show c => Show (ReturnValues c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> ReturnValues c -> ShowS # show :: ReturnValues c -> String # showList :: [ReturnValues c] -> ShowS # | |
ParseFromSource (ReturnValues SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data ScopedBlock c Source #
Constructors
ScopedBlock [c] (Procedure c) (Maybe (Procedure c)) (Statement c) |
Instances
Show c => Show (ScopedBlock c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> ScopedBlock c -> ShowS # show :: ScopedBlock c -> String # showList :: [ScopedBlock c] -> ShowS # | |
ParseFromSource (ScopedBlock SourcePos) Source # | |
Defined in Parser.Procedure Methods |
Constructors
EmptyReturn [c] | |
ExplicitReturn [c] (Positional (Expression c)) | |
LoopBreak [c] | |
LoopContinue [c] | |
FailCall [c] (Expression c) | |
IgnoreValues [c] (Expression c) | |
Assignment [c] (Positional (Assignable c)) (Expression c) | |
NoValueExpression [c] (VoidExpression c) |
data ValueLiteral c Source #
Constructors
StringLiteral [c] String | |
CharLiteral [c] Char | |
IntegerLiteral [c] Bool Integer | |
DecimalLiteral [c] Integer Integer | |
BoolLiteral [c] Bool | |
EmptyLiteral [c] |
Instances
Show c => Show (ValueLiteral c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> ValueLiteral c -> ShowS # show :: ValueLiteral c -> String # showList :: [ValueLiteral c] -> ShowS # | |
ParseFromSource (ValueLiteral SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data ValueOperation c Source #
Constructors
ConvertedCall [c] TypeInstance (FunctionCall c) | |
ValueCall [c] (FunctionCall c) |
Instances
Show c => Show (ValueOperation c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> ValueOperation c -> ShowS # show :: ValueOperation c -> String # showList :: [ValueOperation c] -> ShowS # | |
ParseFromSource (ValueOperation SourcePos) Source # | |
Defined in Parser.Procedure Methods |
data VariableName Source #
Constructors
VariableName | |
Instances
Eq VariableName Source # | |
Defined in Types.Procedure | |
Ord VariableName Source # | |
Defined in Types.Procedure Methods compare :: VariableName -> VariableName -> Ordering # (<) :: VariableName -> VariableName -> Bool # (<=) :: VariableName -> VariableName -> Bool # (>) :: VariableName -> VariableName -> Bool # (>=) :: VariableName -> VariableName -> Bool # max :: VariableName -> VariableName -> VariableName # min :: VariableName -> VariableName -> VariableName # | |
Show VariableName Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> VariableName -> ShowS # show :: VariableName -> String # showList :: [VariableName] -> ShowS # | |
ParseFromSource VariableName Source # | |
Defined in Parser.Procedure Methods |
data VoidExpression c Source #
Constructors
Conditional (IfElifElse c) | |
Loop (WhileLoop c) | |
WithScope (ScopedBlock c) | |
Unconditional (Procedure c) | |
LineComment String |
Instances
Show c => Show (VoidExpression c) Source # | |
Defined in Types.Procedure Methods showsPrec :: Int -> VoidExpression c -> ShowS # show :: VoidExpression c -> String # showList :: [VoidExpression c] -> ShowS # | |
ParseFromSource (VoidExpression SourcePos) Source # | |
Defined in Parser.Procedure Methods |
Constructors
WhileLoop [c] (Expression c) (Procedure c) (Maybe (Procedure c)) |
assignableName :: Assignable c -> VariableName Source #
getExpressionContext :: Expression c -> [c] Source #
getStatementContext :: Statement c -> [c] Source #
isDiscardedInput :: InputValue c -> Bool Source #
isUnnamedReturns :: ReturnValues c -> Bool Source #