hascalam-0.1.1.2: Haskell to and from Scalameta
Safe HaskellSafe-Inferred
LanguageGHC2021

HaScalaM.Classes.Base

Documentation

class (Tree t, WithBody b ct) => CaseTree t b ct where Source #

Methods

pat :: ct -> t Source #

Instances

Instances details
Type' t' => CaseTree t' t' (SmType'CaseCT t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

pat :: SmType'CaseCT t' -> t' Source #

(Pat p, Term t) => CaseTree p t (SmCaseCT p t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

pat :: SmCaseCT p t -> p Source #

class Tree t => Ctor t Source #

Instances

Instances details
ParamClauseT m n p t' t pc => Ctor (SmCtorPrimary m n p t' t pc :: Type) Source # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances

class (SyntaxValuesClauses v pc, WithBody t f) => Function v pc t f where Source #

Methods

paramClause :: f -> pc Source #

Instances

Instances details
ParamClauseT m n p t' t pc => Function p pc t (SmContextFunctionT m n p t' t pc) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

paramClause :: SmContextFunctionT m n p t' t pc -> pc Source #

ParamClauseT m n p t' t pc => Function p pc t (SmFunctionT m n p t' t pc) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

paramClause :: SmFunctionT m n p t' t pc -> pc Source #

ParamClauseT' m n p' t' b' pc' => Function p' pc' t' (SmLambdaT' m n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

paramClause :: SmLambdaT' m n p' t' b' pc' -> pc' Source #

(ParamClauseT' m n p' t' b' pc', Term t) => Function p' pc' t (SmPolyFunctionT m n p' t' b' pc' t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

paramClause :: SmPolyFunctionT m n p' t' b' pc' t -> pc' Source #

Type' t' => Function t' (FuncParamClause' t') t' (SmContextFunctionT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type' t' => Function t' (FuncParamClause' t') t' (SmFunctionT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

class (Name n, Tree t) => Member n t where Source #

Methods

name :: t -> n Source #

Instances

Instances details
NameT' n => Member n (SmVarT' n) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

name :: SmVarT' n -> n Source #

NameT tn => Member tn (SmVarP tn) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Methods

name :: SmVarP tn -> tn Source #

Stat s => Member SmNameT (SmPkgS SmRef s) Source # 
Instance details

Defined in HaScalaM.Instances.Stat

Methods

name :: SmPkgS SmRef s -> SmNameT Source #

(Name n, Type' t') => Member n (SmSelf n t') Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

Methods

name :: SmSelf n t' -> n Source #

(Mod m, Name n, Type' t', Term t) => Member n (SmParamT m n t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

name :: SmParamT m n t' t -> n Source #

(Mod m, Name n, Bounds' t' b') => Member n (SmParamT' m n t' b') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

name :: SmParamT' m n t' b' -> n Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Member t'n (SmType'S m n t'n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

name :: SmType'S m n t'n p' t' b' pc' -> t'n Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Member t'n (SmTypeS m n t'n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmTypeS m n t'n p' t' b' pc' -> t'n Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Member t'n (SmType'Def m n t'n p' t' b' pc') Source # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmObjectS m n tn p t' t ac i s e -> tn Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

name :: SmDef'S m n tn p p' t' b' t pc pc' g -> tn Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmDefS m n tn p p' t' b' t pc pc' g -> tn Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

name :: SmGiven'S m n tn p p' t' b' t pc pc' g -> tn Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmMacroS m n tn p p' t' b' t pc pc' g -> tn Source #

(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 # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e -> t'n 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 (SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e -> t'n 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 (SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

name :: SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e -> t'n Source #

class (Tree v, Tree t) => SyntaxValuesClauses v t where Source #

Methods

values :: t -> [v] Source #

Instances

Instances details
Pat p => SyntaxValuesClauses p (SmArgClauseP p) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Methods

values :: SmArgClauseP p -> [p] Source #

Type' t' => SyntaxValuesClauses t' (FuncParamClause' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

values :: FuncParamClause' t' -> [t'] Source #

Type' t' => SyntaxValuesClauses t' (SmArgClauseT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

values :: SmArgClauseT' t' -> [t'] Source #

(t ~ SmTerm, ArgsType m, Term t) => SyntaxValuesClauses t (SmArgClauseT m t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

values :: SmArgClauseT m t -> [t] Source #

(p ~ SmParamT m n t' t, ParamsType m, ParamT m n p t' t) => SyntaxValuesClauses p (SmParamClauseT m n p t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

values :: SmParamClauseT m n p t' t -> [p] Source #

(p' ~ SmParamT' m n t' b', Mod m, Name n, Bounds' t' b') => SyntaxValuesClauses p' (SmParamClauseT' m n p' t' b') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

values :: SmParamClauseT' m n p' t' b' -> [p'] Source #

class SyntaxValuesClauses v t => ArgClause v t Source #

Instances

Instances details
Pat p => ArgClause p (SmArgClauseP p) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Type' t' => ArgClause t' (SmArgClauseT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

(t ~ SmTerm, ArgsType m, Term t) => ArgClause t (SmArgClauseT m t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

class (Tree f, ArgClause v t, Tree y) => Apply f v t y where Source #

Methods

fun :: y -> f Source #

argClause :: y -> t Source #

Instances

Instances details
ArgClauseT' t' ac' => Apply t' t' ac' (SmApplyT' t' ac') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

fun :: SmApplyT' t' ac' -> t' Source #

argClause :: SmApplyT' t' ac' -> ac' Source #

(Term t, Pat p, ArgClauseP p ac) => Apply t p ac (SmExtractP t p ac) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Methods

fun :: SmExtractP t p ac -> t Source #

argClause :: SmExtractP t p ac -> ac Source #

ArgClauseT m t ac => Apply t t ac (SmApplyT m t ac) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

fun :: SmApplyT m t ac -> t Source #

argClause :: SmApplyT m t ac -> ac Source #

(Term t, ArgClauseT' t' ac') => Apply t t' ac' (SmApplyType'T t t' ac') Source # 
Instance details

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 #

Methods

lhs :: x -> l Source #

op :: x -> n Source #

arg :: x -> a Source #

Instances

Instances details
(NameT' t'n, Type' t') => Infix t' t'n t' (SmApplyInfixT' t'n t') Source # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 (Tree v, Tree t) => Tuple v t where Source #

Methods

args :: t -> [v] Source #

Instances

Instances details
Pat p => Tuple p (SmTupleP p) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Methods

args :: SmTupleP p -> [p] Source #

Term t => Tuple t (SmTupleT t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

args :: SmTupleT t -> [t] Source #

Type' t' => Tuple t' (SmTupleT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

args :: SmTupleT' t' -> [t'] Source #

class Tree m => Mod m Source #

Instances

Instances details
Mod SmMod Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

class Mod m => ArgsType m Source #

Instances

Instances details
ArgsType SmMod Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

class Mod m => ParamsType m Source #

Instances

Instances details
ParamsType SmMod Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

class Mod m => Variant m Source #

Instances

Instances details
Variant SmMod Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

class Tree n => Name n where Source #

Methods

value :: n -> String Source #

Instances

Instances details
Name SmName Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Methods

value :: SmName -> String Source #

Name SmNameT Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Methods

value :: SmNameT -> String Source #

Name SmNameT' Source # 
Instance details

Defined in HaScalaM.Instances.Ref

class (Mod m, Name n, Member n p) => Param m n p where Source #

Methods

mods' :: p -> [m] Source #

Instances

Instances details
(Mod m, Name n, Type' t', Term t) => Param m n (SmParamT m n t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

mods' :: SmParamT m n t' t -> [m] Source #

(Mod m, Name n, Bounds' t' b') => Param m n (SmParamT' m n t' b') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

mods' :: SmParamT' m n t' b' -> [m] Source #

class (Param m n p, SyntaxValuesClauses p pc) => ParamClause m n p pc Source #

Instances

Instances details
(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 # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Type

class Tree t => Ref t Source #

Instances

Instances details
Ref SmRef_ Source # 
Instance details

Defined in HaScalaM.Instances.Ref

class Tree s => Stat s Source #

Instances

Instances details
Stat SmStat Source # 
Instance details

Defined in HaScalaM.Instances.Stat

class Tree t Source #

Instances

Instances details
Tree SmLit Source # 
Instance details

Defined in HaScalaM.Instances.Base

Tree SmModM Source # 
Instance details

Defined in HaScalaM.Instances.Base

Tree SmEnumerator Source # 
Instance details

Defined in HaScalaM.Instances.Enums

Tree SmImportee Source # 
Instance details

Defined in HaScalaM.Instances.Stat

Tree SmMod Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

Tree SmName Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Tree SmNameT Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Tree SmNameT' Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Tree SmPat Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Tree SmPatP Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Tree SmRef Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Tree SmRef' Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Tree SmRef_ Source # 
Instance details

Defined in HaScalaM.Instances.Ref

Tree SmStat Source # 
Instance details

Defined in HaScalaM.Instances.Stat

Tree SmTerm Source # 
Instance details

Defined in HaScalaM.Instances.Term

Tree SmType' Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type' t' => Tree (FuncParamClause' t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Ref r => Tree (SmAccessM r :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Base

Term c => Tree (SmGuardE c :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

Term t => Tree (SmMacroP t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Pat p => Tree (SmTupleP p :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

NameT tn => Tree (SmVarP tn :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Term t => Tree (SmAssignT t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Stat s => Tree (SmBlockT s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Term t => Tree (SmDoT t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Term t => Tree (SmTupleT t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Term t => Tree (SmWhileT t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Pat p => Tree (SmArgClauseP p :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Type' t' => Tree (SmArgClauseT' t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type' t' => Tree (SmBounds' t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Stat s => Tree (SmSource s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

Type' t' => Tree (SmType'CaseCT t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type' t' => Tree (SmContextFunctionT' t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type' t' => Tree (SmFunctionT' t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Term t => Tree (SmMacroT' t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type' t' => Tree (SmTupleT' t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

NameT' n => Tree (SmVarT' n :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(Pat p, Term b) => Tree (SmCaseGeneratorE p b :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

(Pat p, Term b) => Tree (SmGeneratorE p b :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

(Pat p, Term b) => Tree (SmValE p b :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

Stat s => Tree (SmPkgS SmRef s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat

(Mod m, NameT tn) => Tree (SmRepeatedEnumCase m tn :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(Enumerator e, Term t) => Tree (SmForT e t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Enumerator e, Term t) => Tree (SmForYieldT e t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Mod m, Term t) => Tree (SmIfT m t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(ArgsType m, Term t) => Tree (SmArgClauseT m t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Pat p, Term t) => Tree (SmCaseCT p t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(RefT r, Importee i) => Tree (SmImporter r i :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat

(Name n, Type' t') => Tree (SmSelf n t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

(NameT' t'n, Type' t') => Tree (SmApplyInfixT' t'n t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

ArgClauseT' t' ac' => Tree (SmApplyT' t' ac' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(Type' t', Stat s) => Tree (SmExistentialT' t' s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Type'Case t' ct => Tree (SmMatchT' t' ct :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(Type' t', Stat s) => Tree (SmRefineT' t' s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(NameT tn, Pat p, ArgClauseP p ac) => Tree (SmExtractInfixP tn p ac :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

(Term t, Pat p, ArgClauseP p ac) => Tree (SmExtractP t p ac :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Importer r i t => Tree (SmImportExportStatS r i t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat

(Mod m, Pat p, Type' t') => Tree (SmVal'S m p t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

(Mod m, Pat p, Type' t') => Tree (SmVar'S m p t' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

ArgClauseT m t ac => Tree (SmApplyT m t ac :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Term t, ArgClauseT' t' ac') => Tree (SmApplyType'T t t' ac' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Pat p, Term t, Case p t ct) => Tree (SmMatchT p t ct :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Pat p, Term t, Case p t ct) => Tree (SmPartialFunctionT p t ct :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Case p t ct => Tree (SmTryT p t ct :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Mod m, Pat p, Type' t', Term t) => Tree (SmValS m p t' t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(Mod m, Pat p, Type' t', Term t) => Tree (SmVarS m p t' t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(Mod m, Name n, Type' t', Term t) => Tree (SmParamT m n t' t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Mod m, Name n, Bounds' t' b') => Tree (SmParamT' m n t' b' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(Name n, Type' t', ArgClauseT m t ac) => Tree (SmInit m n t' t ac :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Base

(p ~ SmParamT m n t' t, ParamsType m, ParamT m n p t' t) => Tree (SmParamClauseT m n p t' t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(Mod m, Name n, Bounds' t' b') => Tree (SmParamClauseT' m n p' t' b' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Init m n t' t ac i => Tree (SmAnnotM m n t' t ac i :: Type) Source # 
Instance details

Defined in HaScalaM.Instances

(NameT tn, ArgClauseT' t' ac', ArgClauseT m t ac) => Tree (SmApplyInfixT m tn t t' ac' ac :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

ParamClauseT m n p t' t pc => Tree (SmContextFunctionT m n p t' t pc :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

ParamClauseT m n p t' t pc => Tree (SmFunctionT m n p t' t pc :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

ParamClauseT m n p t' t pc => Tree (SmCtorPrimary m n p t' t pc :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

ParamClauseT' m n p' t' b' pc' => Tree (SmLambdaT' m n p' t' b' pc' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

ParamClauseT' m n p' t' b' pc' => Tree (SmPolyFunctionT' m n p' t' b' pc' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Tree (SmType'S m n t'n p' t' b' pc' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Tree (SmTypeS m n t'n p' t' b' pc' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(ParamClauseT' m n p' t' b' pc', Term t) => Tree (SmPolyFunctionT m n p' t' b' pc' t :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => Tree (SmType'Def m n t'n p' t' b' pc' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Type

(Init m n t' t ac i, Stat s, Self n t' p) => Tree (SmTemplate m n t' t ac i p s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

(ParamClauseT m n p t' t pc, Init m n t' t ac i, Stat s) => Tree (SmCtorSecondaryS m n p t' t pc ac i s :: Type) Source # 
Instance details

Defined in HaScalaM.Instances

Template m n t' t ac i p s e => Tree (SmNewAnonymousT m n t' t ac i p s e :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Term

(ParamClauseT' m n p' t' b' pc', ParamClauseT m n p t' t pc) => Tree (SmParamClauseGroup m n p p' t' b' t pc pc' :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

ParamClauseGroup m n p p' t' b' t pc pc' g => Tree (SmGivenAliasS m n p p' t' b' t pc pc' g :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(NameT tn, Template m n t' t ac i p s e) => Tree (SmObjectS m n tn p t' t ac i s e :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(NameT tn, Template m n t' t ac i p s e) => Tree (SmPkgObjectS m n p tn t' t ac i s e :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat

(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Tree (SmDef'S m n tn p p' t' b' t pc pc' g :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Tree (SmDefS m n tn p p' t' b' t pc pc' g :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(ParamClauseGroup m n p p' t' b' t pc pc' g, Stat s) => Tree (SmExtensionGroupS m n p p' t' b' t pc pc' s g :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Tree (SmGiven'S m n tn p p' t' b' t pc pc' g :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => Tree (SmMacroS m n tn p p' t' b' t pc pc' g :: Type) Source # 
Instance details

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) => Tree (SmEnumCaseS m n tn p p' t' b' t pc pc' c ac i :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

(ParamClauseGroup m n p p' t' b' t pc pc' g, Template m n t' t ac i f s e) => Tree (SmGivenS m n p p' t' b' t pc pc' ac i f s e g :: Type) Source # 
Instance details

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) => Tree (SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e :: Type) Source # 
Instance details

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) => Tree (SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e :: Type) Source # 
Instance details

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) => Tree (SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e :: Type) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

class (Tree t, Tree w) => WithBody t w where Source #

Methods

body :: w -> t Source #

Instances

Instances details
Term t => WithBody t (SmMacroP t) Source # 
Instance details

Defined in HaScalaM.Instances.Pat

Methods

body :: SmMacroP t -> t Source #

Term t => WithBody t (SmAssignT t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmAssignT t -> t Source #

Term t => WithBody t (SmDoT t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmDoT t -> t Source #

Term t => WithBody t (SmWhileT t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmWhileT t -> t Source #

Term t => WithBody t (SmMacroT' t) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

body :: SmMacroT' t -> t Source #

Type' t' => WithBody t' (SmType'CaseCT t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

body :: SmType'CaseCT t' -> t' Source #

Type' t' => WithBody t' (SmContextFunctionT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

body :: SmContextFunctionT' t' -> t' Source #

Type' t' => WithBody t' (SmFunctionT' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

body :: SmFunctionT' t' -> t' Source #

(Pat p, Term b) => WithBody b (SmCaseGeneratorE p b) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

Methods

body :: SmCaseGeneratorE p b -> b Source #

(Pat p, Term b) => WithBody b (SmGeneratorE p b) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

Methods

body :: SmGeneratorE p b -> b Source #

(Pat p, Term b) => WithBody b (SmValE p b) Source # 
Instance details

Defined in HaScalaM.Instances.Enums

Methods

body :: SmValE p b -> b Source #

(Enumerator e, Term t) => WithBody t (SmForT e t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmForT e t -> t Source #

(Enumerator e, Term t) => WithBody t (SmForYieldT e t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmForYieldT e t -> t Source #

(Pat p, Term t) => WithBody t (SmCaseCT p t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmCaseCT p t -> t Source #

(Mod m, Pat p, Type' t', Term t) => WithBody t (SmValS m p t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmValS m p t' t -> t Source #

(Mod m, Pat p, Type' t', Term t) => WithBody t (SmVarS m p t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmVarS m p t' t -> t Source #

ParamClauseT m n p t' t pc => WithBody t (SmContextFunctionT m n p t' t pc) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmContextFunctionT m n p t' t pc -> t Source #

ParamClauseT m n p t' t pc => WithBody t (SmFunctionT m n p t' t pc) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmFunctionT m n p t' t pc -> t Source #

ParamClauseT' m n p' t' b' pc' => WithBody t' (SmLambdaT' m n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

body :: SmLambdaT' m n p' t' b' pc' -> t' Source #

(ParamClauseT' m n p' t' b' pc', Term t) => WithBody t (SmPolyFunctionT m n p' t' b' pc' t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

body :: SmPolyFunctionT m n p' t' b' pc' t -> t Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithBody t' (SmTypeS m n t'n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmTypeS m n t'n p' t' b' pc' -> t' Source #

ParamClauseGroup m n p p' t' b' t pc pc' g => WithBody t (SmGivenAliasS m n p p' t' b' t pc pc' g) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmGivenAliasS m n p p' t' b' t pc pc' g -> t Source #

(ParamClauseGroup m n p p' t' b' t pc pc' g, Stat s) => WithBody s (SmExtensionGroupS m n p p' t' b' t pc pc' s g) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmExtensionGroupS m n p p' t' b' t pc pc' s g -> s Source #

(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => WithBody t (SmDefS m n tn p p' t' b' t pc pc' g) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmDefS m n tn p p' t' b' t pc pc' g -> t Source #

(NameT tn, ParamClauseGroup m n p p' t' b' t pc pc' g) => WithBody t (SmMacroS m n tn p p' t' b' t pc pc' g) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

body :: SmMacroS m n tn p p' t' b' t pc pc' g -> t Source #

class (CaseTree t b ct, WithExprs ct w) => WithCases t b ct w where Source #

Minimal complete definition

Nothing

Methods

cases :: w -> [ct] Source #

Instances

Instances details
Type'Case t' ct => WithCases t' t' ct (SmMatchT' t' ct) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

cases :: SmMatchT' t' ct -> [ct] Source #

(Pat p, Term t, Case p t ct) => WithCases p t ct (SmPartialFunctionT p t ct) Source # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

cases :: SmTryT p t ct -> [ct] Source #

class (Tree e, Tree w) => WithExprs e w where Source #

Methods

exprs :: w -> [e] Source #

Instances

Instances details
Stat s => WithExprs s (SmBlockT s) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

exprs :: SmBlockT s -> [s] Source #

Stat s => WithExprs s (SmSource s) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

Methods

exprs :: SmSource s -> [s] Source #

(Tree ct, Type'Case t' ct) => WithExprs ct (SmMatchT' t' ct) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

exprs :: SmMatchT' t' ct -> [ct] Source #

(Enumerator e, Term t) => WithExprs e (SmForT e t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

exprs :: SmForT e t -> [e] Source #

(Enumerator e, Term t) => WithExprs e (SmForYieldT e t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

exprs :: SmForYieldT e t -> [e] Source #

Stat s => WithExprs s (SmPkgS SmRef s) Source # 
Instance details

Defined in HaScalaM.Instances.Stat

Methods

exprs :: SmPkgS SmRef s -> [s] Source #

(Type' t', Stat s) => WithExprs s (SmExistentialT' t' s) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

exprs :: SmExistentialT' t' s -> [s] Source #

(Type' t', Stat s) => WithExprs s (SmRefineT' t' s) Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

exprs :: SmRefineT' t' s -> [s] Source #

(Pat p, Term t, Case p t ct) => WithExprs ct (SmMatchT p t ct) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

exprs :: SmMatchT p t ct -> [ct] Source #

(Pat p, Term t, Case p t ct) => WithExprs ct (SmPartialFunctionT p t ct) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

exprs :: SmPartialFunctionT p t ct -> [ct] Source #

Case p t ct => WithExprs ct (SmTryT p t ct) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

exprs :: SmTryT p t ct -> [ct] Source #

(Init m n t' t ac i, Stat s, Self n t' p) => WithExprs s (SmTemplate m n t' t ac i p s) Source # 
Instance details

Defined in HaScalaM.Instances.Tilde

Methods

exprs :: SmTemplate m n t' t ac i p s -> [s] Source #

(ParamClauseT m n p t' t pc, Init m n t' t ac i, Stat s) => WithExprs s (SmCtorSecondaryS m n p t' t pc ac i s) Source # 
Instance details

Defined in HaScalaM.Instances

Methods

exprs :: SmCtorSecondaryS m n p t' t pc ac i s -> [s] Source #

class (Mod m, Tree w) => WithMods m w where Source #

Methods

mods :: w -> [m] Source #

Instances

Instances details
(Mod m, NameT tn) => WithMods m (SmRepeatedEnumCase m tn) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmRepeatedEnumCase m tn -> [m] Source #

(Mod m, Term t) => WithMods m (SmIfT m t) Source # 
Instance details

Defined in HaScalaM.Instances.Term

Methods

mods :: SmIfT m t -> [m] Source #

(Mod m, Pat p, Type' t') => WithMods m (SmVal'S m p t') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

mods :: SmVal'S m p t' -> [m] Source #

(Mod m, Pat p, Type' t') => WithMods m (SmVar'S m p t') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

mods :: SmVar'S m p t' -> [m] Source #

(Mod m, Pat p, Type' t', Term t) => WithMods m (SmValS m p t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmValS m p t' t -> [m] Source #

(Mod m, Pat p, Type' t', Term t) => WithMods m (SmVarS m p t' t) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmVarS m p t' t -> [m] Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithMods m (SmType'S m n t'n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

mods :: SmType'S m n t'n p' t' b' pc' -> [m] Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithMods m (SmTypeS m n t'n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmTypeS m n t'n p' t' b' pc' -> [m] Source #

(NameT' t'n, ParamClauseT' m n p' t' b' pc') => WithMods m (SmType'Def m n t'n p' t' b' pc') Source # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmObjectS m n tn p t' t ac i s e -> [m] Source #

(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 # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

mods :: SmDef'S m n tn p p' t' b' t pc pc' g -> [m] Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmDefS m n tn p p' t' b' t pc pc' g -> [m] Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

mods :: SmGiven'S m n tn p p' t' b' t pc pc' g -> [m] Source #

(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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmMacroS m n tn p p' t' b' t pc pc' g -> [m] Source #

(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 # 
Instance details

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 # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmGivenS m n p p' t' b' t pc pc' ac i f s e g -> [m] 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) => WithMods m (SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e -> [m] 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) => WithMods m (SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e -> [m] 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) => WithMods m (SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Defn

Methods

mods :: SmTraitS m n t'n p p' t' b' t pc pc' c ac i f s e -> [m] Source #

class (Ref r, Tree w) => WithWithin r w where Source #

Methods

within :: w -> r Source #

Instances

Instances details
Ref r => WithWithin r (SmAccessM r) Source # 
Instance details

Defined in HaScalaM.Instances.Base

Methods

within :: SmAccessM r -> r Source #