Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
HaScalaM.Classes.Base
Documentation
class Tree t => Ctor t Source #
Instances
ParamClauseT m n p t' t pc => Ctor (SmCtorPrimary m n p t' t pc :: Type) Source # | |
Defined in HaScalaM.Instances.Tilde | |
(ParamClauseT m n p t' t pc, Init m n t' t ac i, Stat s) => Ctor (SmCtorSecondaryS m n p t' t pc ac i s :: Type) Source # | |
Defined in HaScalaM.Instances |
class (SyntaxValuesClauses v pc, WithBody t f) => Function v pc t f where Source #
Methods
paramClause :: f -> pc Source #
Instances
class (Name n, Tree t) => Member n t where Source #
Instances
NameT' n => Member n (SmVarT' n) Source # | |
Defined in HaScalaM.Instances.Type | |
NameT tn => Member tn (SmVarP tn) Source # | |
Defined in HaScalaM.Instances.Pat | |
Stat s => Member SmNameT (SmPkgS SmRef s) Source # | |
(Name n, Type' t') => Member n (SmSelf n t') Source # | |
Defined in HaScalaM.Instances.Tilde | |
(Mod m, Name n, Type' t', Term t) => Member n (SmParamT m n t' t) Source # | |
Defined in HaScalaM.Instances.Term | |
(Mod m, Name n, Bounds' t' b') => Member n (SmParamT' m n t' b') Source # | |
Defined in HaScalaM.Instances.Type | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Member t'n (SmType'S m n t'n p' t' b' pc') Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Member t'n (SmTypeS m n t'n p' t' b' pc') Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Member t'n (SmType'Def m n t'n p' t' b' pc') Source # | |
Defined in HaScalaM.Instances.Type Methods name :: SmType'Def m n t'n p' t' b' pc' -> t'n Source # | |
(NameT tn, Template m n t' t ac i p s e) => Member tn (SmObjectS m n tn p t' t ac i s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Member tn (SmDef'S m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Member tn (SmDefS m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Member tn (SmGiven'S m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Member tn (SmMacroS m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT tn, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Init m n t' t ac i) => Member tn (SmEnumCaseS m n tn p p' t' b' t pc pc' c ac i) Source # | |
Defined in HaScalaM.Instances.Stat.Defn Methods name :: SmEnumCaseS m n tn p p' t' b' t pc pc' c ac i -> tn Source # | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Template m n t' t ac i f s e) => Member t'n (SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Template m n t' t ac i f s e) => Member t'n (SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Template m n t' t ac i f s e) => Member t'n (SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn |
class (Tree v, Tree t) => SyntaxValuesClauses v t where Source #
Instances
class SyntaxValuesClauses v t => ArgClause v t Source #
Instances
Pat p => ArgClause p (SmArgClauseP p) Source # | |
Defined in HaScalaM.Instances.Pat | |
Type' t' => ArgClause t' (SmArgClauseT' t') Source # | |
Defined in HaScalaM.Instances.Type | |
(t ~ SmTerm, ArgsType m, Term t) => ArgClause t (SmArgClauseT m t) Source # | |
Defined in HaScalaM.Instances.Term |
class (Tree f, ArgClause v t, Tree y) => Apply f v t y where Source #
Instances
ArgClauseT' t' ac' => Apply t' t' ac' (SmApplyT' t' ac') Source # | |
(Term t, Pat p, ArgClauseP p ac) => Apply t p ac (SmExtractP t p ac) Source # | |
Defined in HaScalaM.Instances.Pat | |
ArgClauseT m t ac => Apply t t ac (SmApplyT m t ac) Source # | |
(Term t, ArgClauseT' t' ac') => Apply t t' ac' (SmApplyType'T t t' ac') Source # | |
Defined in HaScalaM.Instances.Term Methods fun :: SmApplyType'T t t' ac' -> t Source # argClause :: SmApplyType'T t t' ac' -> ac' Source # |
class (Tree l, Name n, Tree a, Tree x) => Infix l n a x where Source #
Instances
(NameT' t'n, Type' t') => Infix t' t'n t' (SmApplyInfixT' t'n t') Source # | |
Defined in HaScalaM.Instances.Type Methods lhs :: SmApplyInfixT' t'n t' -> t' Source # op :: SmApplyInfixT' t'n t' -> t'n Source # arg :: SmApplyInfixT' t'n t' -> t' Source # | |
(NameT tn, Pat p, ArgClauseP p ac) => Infix p tn ac (SmExtractInfixP tn p ac) Source # | |
Defined in HaScalaM.Instances.Pat Methods lhs :: SmExtractInfixP tn p ac -> p Source # op :: SmExtractInfixP tn p ac -> tn Source # arg :: SmExtractInfixP tn p ac -> ac Source # | |
(NameT tn, ArgClauseT' t' ac', ArgClauseT m t ac) => Infix t tn ac (SmApplyInfixT m tn t t' ac' ac) Source # | |
Defined in HaScalaM.Instances.Term Methods lhs :: SmApplyInfixT m tn t t' ac' ac -> t Source # op :: SmApplyInfixT m tn t t' ac' ac -> tn Source # arg :: SmApplyInfixT m tn t t' ac' ac -> ac Source # |
class Mod m => ArgsType m Source #
Instances
ArgsType SmMod Source # | |
Defined in HaScalaM.Instances.Tilde |
class Mod m => ParamsType m Source #
Instances
ParamsType SmMod Source # | |
Defined in HaScalaM.Instances.Tilde |
class Mod m => Variant m Source #
Instances
Variant SmMod Source # | |
Defined in HaScalaM.Instances.Tilde |
class (Mod m, Name n, Member n p) => Param m n p where Source #
class (Param m n p, SyntaxValuesClauses p pc) => ParamClause m n p pc Source #
Instances
(p ~ SmParamT m n t' t, ParamsType m, ParamT m n p t' t) => ParamClause m n p (SmParamClauseT m n p t' t) Source # | |
Defined in HaScalaM.Instances.Term | |
(p' ~ SmParamT' m n t' b', Mod m, Name n, Bounds' t' b') => ParamClause m n p' (SmParamClauseT' m n p' t' b') Source # | |
Defined in HaScalaM.Instances.Type |
Instances
class (Tree t, Tree w) => WithBody t w where Source #
Instances
class (CaseTree t b ct, WithExprs ct w) => WithCases t b ct w where Source #
Minimal complete definition
Nothing
Instances
Type'Case t' ct => WithCases t' t' ct (SmMatchT' t' ct) Source # | |
Defined in HaScalaM.Instances.Type | |
(Pat p, Term t, Case p t ct) => WithCases p t ct (SmPartialFunctionT p t ct) Source # | |
Defined in HaScalaM.Instances.Term Methods cases :: SmPartialFunctionT p t ct -> [ct] Source # | |
Case p t ct => WithCases p t ct (SmTryT p t ct) Source # | |
Defined in HaScalaM.Instances.Term |
class (Tree e, Tree w) => WithExprs e w where Source #
Instances
class (Mod m, Tree w) => WithMods m w where Source #
Instances
(Mod m, NameT tn) => WithMods m (SmRepeatedEnumCase m tn) Source # | |
Defined in HaScalaM.Instances.Stat.Defn Methods mods :: SmRepeatedEnumCase m tn -> [m] Source # | |
(Mod m, Term t) => WithMods m (SmIfT m t) Source # | |
Defined in HaScalaM.Instances.Term | |
(Mod m, Pat p, Type' t') => WithMods m (SmVal'S m p t') Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(Mod m, Pat p, Type' t') => WithMods m (SmVar'S m p t') Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(Mod m, Pat p, Type' t', Term t) => WithMods m (SmValS m p t' t) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(Mod m, Pat p, Type' t', Term t) => WithMods m (SmVarS m p t' t) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithMods m (SmType'S m n t'n p' t' b' pc') Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithMods m (SmTypeS m n t'n p' t' b' pc') Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithMods m (SmType'Def m n t'n p' t' b' pc') Source # | |
Defined in HaScalaM.Instances.Type Methods mods :: SmType'Def m n t'n p' t' b' pc' -> [m] Source # | |
(ParamClauseT m n p t' t pc, Init m n t' t ac i, Stat s) => WithMods m (SmCtorSecondaryS m n p t' t pc ac i s) Source # | |
Defined in HaScalaM.Instances Methods mods :: SmCtorSecondaryS m n p t' t pc ac i s -> [m] Source # | |
ParamClauseGroup m n p p' t' b' t pc pc' g => WithMods m (SmGivenAliasS m n p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Defn Methods mods :: SmGivenAliasS m n p p' t' b' t pc pc' g -> [m] Source # | |
(NameT tn, Template m n t' t ac i p s e) => WithMods m (SmObjectS m n tn p t' t ac i s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT tn, Template m n t' t ac i p s e) => WithMods m (SmPkgObjectS m n p tn t' t ac i s e) Source # | |
Defined in HaScalaM.Instances.Stat Methods mods :: SmPkgObjectS m n p tn t' t ac i s e -> [m] Source # | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => WithMods m (SmDef'S m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => WithMods m (SmDefS m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => WithMods m (SmGiven'S m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Decl | |
(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => WithMods m (SmMacroS m n tn p p' t' b' t pc pc' g) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT tn, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Init m n t' t ac i) => WithMods m (SmEnumCaseS m n tn p p' t' b' t pc pc' c ac i) Source # | |
Defined in HaScalaM.Instances.Stat.Defn Methods mods :: SmEnumCaseS m n tn p p' t' b' t pc pc' c ac i -> [m] Source # | |
(ParamClauseGroup m n p p' t' b' t pc pc' g, Template m n t' t ac i f s e) => WithMods m (SmGivenS m n p p' t' b' t pc pc' ac i f s e g) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Template m n t' t ac i f s e) => WithMods m (SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Template m n t' t ac i f s e) => WithMods m (SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn | |
(NameT' t'n, ParamClauseT' m n p' t' b' pc', Primary m n p t' t pc c, Template m n t' t ac i f s e) => WithMods m (SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # | |
Defined in HaScalaM.Instances.Stat.Defn |