Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data ITerm a v e = ITerm {}
- iVal :: forall a v e. Lens' (ITerm a v e) ((#) e (ITerm a v))
- iRes :: forall a v e. Lens' (ITerm a v e) (Tree (InferOf (GetKnot e)) v)
- iAnn :: forall a v e. Lens' (ITerm a v e) a
- class ITermVarsConstraint c e where
- iTermVarsConstraintCtx :: Proxy c -> Proxy e -> Dict (ITermVarsConstraintContext c e)
- iAnnotations :: forall e a b v. RTraversable e => Traversal (Tree (ITerm a v) e) (Tree (ITerm b v) e) a b
- iTermToAnn :: forall a v e r. Recursively KFunctor e => (forall n. KRecWitness e n -> a -> Tree (InferOf n) v -> r) -> Tree (ITerm a v) e -> Tree (Ann r) e
Documentation
Instances
class ITermVarsConstraint c e where Source #
Nothing
iTermVarsConstraintCtx :: Proxy c -> Proxy e -> Dict (ITermVarsConstraintContext c e) Source #
iTermVarsConstraintCtx :: ITermVarsConstraintContext c e => Proxy c -> Proxy e -> Dict (ITermVarsConstraintContext c e) Source #
Instances
(RNodes t, c t, Recursive c, ITermVarsConstraint c t) => ITermVarsConstraint c (Scheme v t) Source # | |
Defined in AST.Term.Scheme | |
Recursive (ITermVarsConstraint c) Source # | |
Defined in AST.Infer.Term recurse :: (KNodes k, ITermVarsConstraint c k) => Proxy (ITermVarsConstraint c k) -> Dict (KNodesConstraint k (ITermVarsConstraint c)) Source # |
iAnnotations :: forall e a b v. RTraversable e => Traversal (Tree (ITerm a v) e) (Tree (ITerm b v) e) a b Source #
A Traversal
from an inferred term to the node annotations (not the inference results)
iTermToAnn :: forall a v e r. Recursively KFunctor e => (forall n. KRecWitness e n -> a -> Tree (InferOf n) v -> r) -> Tree (ITerm a v) e -> Tree (Ann r) e Source #