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

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.PointR.Term.MultiChr

Contents

Orphan instances

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

Methods

mkStream :: Proxy pos -> (ls :!: MultiChr c v x) -> Int# -> LimitType (PointR i) -> PointR i -> Stream m (Elm (ls :!: MultiChr c v x) (PointR i)) Source #

(TermStreamContext m ps ts s x0 i0 is (PointR I), KnownNat c) => TermStream m (ps :. IVariable d :: Type) (TermSymbol ts (MultiChr c v x)) s (is :. PointR I) Source # 
Instance details

Methods

termStream :: Proxy (ps :. IVariable d) -> TermSymbol ts (MultiChr c v x) -> LimitType (is :. PointR I) -> (is :. PointR I) -> Stream m (TermState s Z Z) -> Stream m (TermState s (is :. PointR I) (TermArg (TermSymbol ts (MultiChr c v x)))) Source #

(TermStreamContext m ps ts s x0 i0 is (PointR I), KnownNat c) => TermStream m (ps :. IStatic d :: Type) (TermSymbol ts (MultiChr c v x)) s (is :. PointR I) Source # 
Instance details

Methods

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

KnownNat c => TermStaticVar (IVariable d :: Type) (MultiChr c v x) (PointR I) Source # 
Instance details

KnownNat c => TermStaticVar (IStatic d :: Type) (MultiChr c v x) (PointR I) Source # 
Instance details