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

HaScalaM.Classes.Type

Documentation

class (Type' t', CaseTree t' t' ct) => Type'Case t' ct Source #

Instances

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

Defined in HaScalaM.Instances.Type

data FuncParamClause' t' where Source #

Constructors

FuncParamClause' 

Fields

Instances

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

Defined in HaScalaM.Instances.Type

Methods

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

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

Defined in HaScalaM.Instances.Type

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

t' ~ SmType' => Show (FuncParamClause' t') Source # 
Instance details

Defined in HaScalaM.Instances.Show

class (Type' t', Function t' (FuncParamClause' t') t' f) => FunctionT' t' f where Source #

Methods

res :: f -> t' Source #

Instances

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

Defined in HaScalaM.Instances.Type

Methods

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

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

Defined in HaScalaM.Instances.Type

Methods

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

class (NameT' n', Member n' t') => MemberT' n' t' Source #

Instances

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

Defined in HaScalaM.Instances.Type

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

Defined in HaScalaM.Instances.Stat.Decl

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

Defined in HaScalaM.Instances.Stat.Defn

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

Defined in HaScalaM.Instances.Type

(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) => MemberT' 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

(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) => MemberT' 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

(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) => MemberT' 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

class Name n' => NameT' n' Source #

Instances

Instances details
NameT' SmNameT' Source # 
Instance details

Defined in HaScalaM.Instances.Ref

class (WithT'ParamClause m n p' t' b' pc' p', Bounds' t' b') => ParamT' m n p' t' b' pc' where Source #

Methods

tbounds' :: p' -> b' Source #

vbounds' :: p' -> [t'] Source #

cbounds' :: p' -> [t'] Source #

Instances

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

Defined in HaScalaM.Instances.Type

Methods

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

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

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

class (ParamT' m n p' t' b' pc', ParamClause m n p' pc') => ParamClauseT' m n p' t' b' pc' Source #

Instances

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

Defined in HaScalaM.Instances.Type

class (Type' t', ArgClause t' t) => ArgClauseT' t' t Source #

Instances

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

Defined in HaScalaM.Instances.Type

class Tree t' => Type' t' Source #

Instances

Instances details
Type' SmType' Source # 
Instance details

Defined in HaScalaM.Instances.Type

class (Type' t', Tree b') => Bounds' t' b' where Source #

Methods

lo :: b' -> Maybe t' Source #

hi :: b' -> Maybe t' Source #

Instances

Instances details
Type' t' => Bounds' t' (SmBounds' t') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

lo :: SmBounds' t' -> Maybe t' Source #

hi :: SmBounds' t' -> Maybe t' Source #

class (Type' t', Tree w) => WithDeclTpe t' w where Source #

Methods

decltpe :: w -> t' Source #

Instances

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

Defined in HaScalaM.Instances.Stat.Decl

Methods

decltpe :: SmVal'S m p t' -> t' Source #

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

Defined in HaScalaM.Instances.Stat.Decl

Methods

decltpe :: SmVar'S m p t' -> t' Source #

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

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

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

Defined in HaScalaM.Instances.Stat.Decl

Methods

decltpe :: SmDef'S 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) => WithDeclTpe t' (SmGiven'S m n tn p p' t' b' t pc pc' g) Source # 
Instance details

Defined in HaScalaM.Instances.Stat.Decl

Methods

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

class (Type' t', Tree w) => WithDeclTpeOpt t' w where Source #

Methods

decltpe' :: w -> Maybe t' Source #

Instances

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

Defined in HaScalaM.Instances.Tilde

Methods

decltpe' :: SmSelf n t' -> Maybe t' Source #

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

decltpe' :: SmValS m p t' t -> Maybe t' Source #

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

decltpe' :: SmVarS m p t' t -> Maybe t' Source #

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

Defined in HaScalaM.Instances.Term

Methods

decltpe' :: SmParamT m n t' t -> Maybe t' Source #

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

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

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

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

class (ParamClauseT' m n p' t' b' pc', Tree w) => WithT'ParamClause m n p' t' b' pc' w where Source #

Methods

t'paramClause :: w -> pc' Source #

Instances

Instances details
(p' ~ SmParamT' m n t' b', pc' ~ SmParamClauseT' m n p' t' b', Mod m, Name n, Bounds' t' b', ParamT' m n p' t' b' pc', ParamClauseT' m n p' t' b' pc') => WithT'ParamClause m n p' t' b' pc' (SmParamT' m n t' b') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

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

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

Defined in HaScalaM.Instances.Type

Methods

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

ParamClauseT' m n p' t' b' pc' => WithT'ParamClause m n p' t' b' pc' (SmPolyFunctionT' m n p' t' b' pc') Source # 
Instance details

Defined in HaScalaM.Instances.Type

Methods

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

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

Defined in HaScalaM.Instances.Stat.Decl

Methods

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

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

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

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

Defined in HaScalaM.Instances.Term

Methods

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

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

Defined in HaScalaM.Instances.Type

Methods

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

Defined in HaScalaM.Instances.Stat.Defn

Methods

t'paramClause :: SmEnumCaseS m n tn p p' t' b' t pc pc' c ac i -> pc' 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) => WithT'ParamClause m n p' t' b' pc' (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

t'paramClause :: SmClassS m n t'n p p' t' b' t pc pc' c ac i f s e -> pc' 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) => WithT'ParamClause m n p' t' b' pc' (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

t'paramClause :: SmEnumS m n t'n p p' t' b' t pc pc' c ac i f s e -> pc' 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) => WithT'ParamClause m n p' t' b' pc' (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

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