ADPfusion-0.6.0.0: Efficient, high-level dynamic programming.

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.PointR.Term.Deletion

Contents

Orphan instances

(TermStream m (Z :. pos) (TermSymbol M Deletion) (Elm (Term1 (Elm ls (PointR i))) (Z :. PointR i)) (Z :. PointR i), posLeft ~ LeftPosTy pos Deletion (PointR i), TermStaticVar pos Deletion (PointR i), MkStream m posLeft ls (PointR i)) => MkStream m (pos :: Type) (ls :!: Deletion) (PointR i) Source # 
Instance details

Methods

mkStream :: Proxy pos -> (ls :!: Deletion) -> Int# -> LimitType (PointR i) -> PointR i -> Stream m (Elm (ls :!: Deletion) (PointR i)) Source #

TermStreamContext m ps ts s x0 i0 is (PointR I) => TermStream m (ps :. IVariable d :: Type) (TermSymbol ts Deletion) s (is :. PointR I) Source # 
Instance details

TermStreamContext m ps ts s x0 i0 is (PointR I) => TermStream m (ps :. IStatic d :: Type) (TermSymbol ts Deletion) s (is :. PointR I) Source # 
Instance details

Methods

termStream :: Proxy (ps :. IStatic d) -> TermSymbol ts Deletion -> LimitType (is :. PointR I) -> (is :. PointR I) -> Stream m (TermState s Z Z) -> Stream m (TermState s (is :. PointR I) (TermArg (TermSymbol ts Deletion))) Source #

TermStaticVar (IVariable d :: Type) Deletion (PointR I) Source # 
Instance details

TermStaticVar (IStatic d :: Type) Deletion (PointR I) Source # 
Instance details