| Safe Haskell | None |
|---|
Language.Eiffel.Syntax
Documentation
type ClasBody exp = AbsClas (RoutineBody exp) expSource
type ClasInterface = AbsClas EmptyBody ExprSource
type ClasI exp = AbsClas (RoutineBody exp) expSource
Constructors
| AbsClas | |
Fields
| |
data FeatureMap body exp Source
Constructors
| FeatureMap | |
Fields
| |
Instances
| (Eq body, Eq exp) => Eq (FeatureMap body exp) | |
| (Show body, Show exp) => Show (FeatureMap body exp) | |
| (Binary body_1627432066, Binary exp_1627432067) => Binary (FeatureMap body_1627432066 exp_1627432067) | |
| (NFData body_1627432066, NFData exp_1627432067) => NFData (FeatureMap body_1627432066 exp_1627432067) |
data ExportedFeature feat Source
Constructors
| ExportedFeature | |
Fields
| |
Instances
| Eq feat => Eq (ExportedFeature feat) | |
| Ord feat => Ord (ExportedFeature feat) | |
| Show feat => Show (ExportedFeature feat) | |
| Binary feat_1627431960 => Binary (ExportedFeature feat_1627431960) | |
| NFData feat_1627431960 => NFData (ExportedFeature feat_1627431960) |
data SomeFeature body exp Source
Constructors
| SomeRoutine (AbsRoutine body exp) | |
| SomeAttr (Attribute exp) | |
| SomeConst (Constant exp) |
Instances
| (Eq body, Eq exp) => Eq (SomeFeature body exp) | |
| (Ord body, Ord exp) => Ord (SomeFeature body exp) | |
| (Show body, Show exp) => Show (SomeFeature body exp) | |
| (Binary body_1627431958, Binary exp_1627431959) => Binary (SomeFeature body_1627431958 exp_1627431959) | |
| (NFData body_1627431958, NFData exp_1627431959) => NFData (SomeFeature body_1627431958 exp_1627431959) | |
| Feature (SomeFeature body expr) expr |
data InheritClause Source
Constructors
| InheritClause | |
Fields
| |
data RenameClause Source
Constructors
| Rename | |
Fields
| |
data ExportClause Source
Constructors
| Export | |
Fields
| |
Constructors
| Generic | |
Fields
| |
data CreateClause Source
Constructors
| CreateClause | |
Fields
| |
data ConvertClause Source
data FeatureClause body exp Source
Constructors
| FeatureClause | |
Fields
| |
Instances
| (Eq body, Eq exp) => Eq (FeatureClause body exp) | |
| (Show body, Show exp) => Show (FeatureClause body exp) | |
| (Binary body_1627431956, Binary exp_1627431957) => Binary (FeatureClause body_1627431956 exp_1627431957) | |
| (NFData body_1627431956, NFData exp_1627431957) => NFData (FeatureClause body_1627431956 exp_1627431957) |
type RoutineI = AbsRoutine EmptyBody ExprSource
type RoutineWithBody exp = AbsRoutine (RoutineBody exp) expSource
type Routine = RoutineWithBody ExprSource
Constructors
| EmptyBody |
Constructors
| Contract | |
Fields
| |
data AbsRoutine body exp Source
Constructors
| AbsRoutine | |
Fields
| |
Instances
| (Eq body, Eq exp) => Eq (AbsRoutine body exp) | |
| (Ord body, Ord exp) => Ord (AbsRoutine body exp) | |
| (Show body, Show exp) => Show (AbsRoutine body exp) | |
| (Binary body_1627431952, Binary exp_1627431953) => Binary (AbsRoutine body_1627431952 exp_1627431953) | |
| (NFData body_1627431952, NFData exp_1627431953) => NFData (AbsRoutine body_1627431952 exp_1627431953) | |
| Feature (AbsRoutine body expr) expr | |
| ClassFeature (AbsRoutine body expr) body expr |
data RoutineBody exp Source
Constructors
| RoutineDefer | |
| RoutineExternal Text (Maybe Text) | |
| RoutineBody | |
Fields
| |
Instances
| Eq exp => Eq (RoutineBody exp) | |
| Ord exp => Ord (RoutineBody exp) | |
| Show exp => Show (RoutineBody exp) | |
| NFData exp_1627431951 => NFData (RoutineBody exp_1627431951) |
Constructors
| Attribute | |
Constructors
commaSepShow :: Show a => [a] -> [Char]Source
type Stmt = PosAbsStmt ExprSource
type PosAbsStmt a = Pos (AbsStmt a)Source
Constructors
| Assign a a | |
| AssignAttempt a a | |
| If a (PosAbsStmt a) [ElseIfPart a] (Maybe (PosAbsStmt a)) | |
| Malloc ClassName | |
| Create (Maybe Typ) a Text [a] | |
| Across a Text (PosAbsStmt a) | |
| Loop (PosAbsStmt a) [Clause a] a (PosAbsStmt a) (Maybe a) | |
| CallStmt a | |
| Retry | |
| Inspect a [([a], PosAbsStmt a)] (Maybe (PosAbsStmt a)) | |
| Check [Clause a] | |
| CheckBlock [Clause a] (PosAbsStmt a) | |
| Block [PosAbsStmt a] | |
| Debug Text (PosAbsStmt a) | |
| Print a | |
| PrintD a | |
| BuiltIn |
data ElseIfPart a Source
Constructors
| ElseIfPart a (PosAbsStmt a) |
Instances
| Eq a => Eq (ElseIfPart a) | |
| Ord a => Ord (ElseIfPart a) | |
| Show a => Show (ElseIfPart a) | |
| Binary a_1627431946 => Binary (ElseIfPart a_1627431946) | |
| NFData a_1627431946 => NFData (ElseIfPart a_1627431946) |
showDefault :: Show a => Maybe a -> [Char]Source
Constructors
| SubTop Proc | |
| CreateLessThan Proc Proc |
Constructors
| Clause | |
Fields
| |
Constructors
| Note | |
Fields
| |
exportFeat :: forall feat feat. Lens (ExportedFeature feat) (ExportedFeature feat) feat featSource
exportClass :: forall feat. Lens' (ExportedFeature feat) (Set Text)Source
fmRoutines :: forall body exp body. Lens (FeatureMap body exp) (FeatureMap body exp) (Map Text (ExportedFeature (AbsRoutine body exp))) (Map Text (ExportedFeature (AbsRoutine body exp)))Source
fmConsts :: forall body exp. Lens' (FeatureMap body exp) (Map Text (ExportedFeature (Constant exp)))Source
fmAttrs :: forall body exp. Lens' (FeatureMap body exp) (Map Text (ExportedFeature (Attribute exp)))Source