syntax-tree-0.1.0.0: Typed ASTs

Safe HaskellNone
LanguageHaskell2010

AST.Class.Infer.Infer1

Description

Infer for indexed AST types (such as Scope)

Documentation

class HasTypeOf1 t where Source #

Associated Types

type TypeOf1 t :: Knot -> Type Source #

Methods

typeAst :: Proxy (t k) -> Dict (TypeOf (t k) ~ TypeOf1 t) Source #

class HasInferOf1 t where Source #

Associated Types

type InferOf1 t :: Knot -> Type Source #

type InferOf1IndexConstraint t :: Type -> Constraint Source #

Methods

hasInferOf1 :: Proxy (t k) -> Dict (InferOf (t k) ~ InferOf1 t) Source #

Instances
HasTypeOf1 t => HasInferOf1 (Scope t) Source # 
Instance details

Defined in AST.Term.NamelessScope

Associated Types

type InferOf1 (Scope t) :: Knot -> Type Source #

type InferOf1IndexConstraint (Scope t) :: Type -> Constraint Source #

Methods

hasInferOf1 :: Proxy (Scope t k) -> Dict (InferOf (Scope t k) ~ InferOf1 (Scope t)) Source #

class HasInferOf1 t => Infer1 m t where Source #