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

HaScalaM.Instances.Type

Orphan instances

Tree SmType' Source # 
Instance details

Type' SmType' Source # 
Instance details

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

Methods

bounds' :: SmType'Def m n t'n p' t' b' pc' -> b' Source #

(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

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

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

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'Def m n t'n p' t' b' pc') Source # 
Instance details

Methods

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

(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

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

Methods

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

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

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

Methods

lhs :: SmApplyInfixT' t'n t' -> t' Source #

op :: SmApplyInfixT' t'n t' -> t'n Source #

arg :: SmApplyInfixT' t'n t' -> t' Source #

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

Methods

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

(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

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

Methods

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

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

Methods

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

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

Methods

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

(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

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 #

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

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

Methods

name :: SmVarT' n -> n Source #

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

Methods

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

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

Methods

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

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

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

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

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

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

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

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

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

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

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

Methods

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

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

Methods

body :: SmMacroT' t -> t Source #

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

Methods

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

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

Methods

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

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

Methods

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

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

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

Methods

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

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

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

Methods

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

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

Methods

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

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

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

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

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

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

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

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

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

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

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

Methods

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

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

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

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

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

Methods

body :: SmLambdaT' m n p' t' b' pc' -> t' 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

Methods

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

(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

(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

Methods

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

(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