| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
ADP.Fusion.Core.Term.Chr
Description
TODO Rename Chr to Vtx, a vertex parser is a generalization of
a char parser. But this is only semantics, so not super important to do
now.
Documentation
A generic Character parser that reads a single character but allows passing additional information.
Chr expects a function to retrieve r at index position, followed by
the actual generic vector with data.
Instances
| (TermStream m (Z :. pos) (TermSymbol M (Chr r x)) (Elm (Term1 (Elm ls (PointL i))) (Z :. PointL i)) (Z :. PointL i), posLeft ~ LeftPosTy pos (Chr r x) (PointL i), TermStaticVar pos (Chr r x) (PointL i), MkStream m posLeft ls (PointL i)) => MkStream m (pos :: Type) (ls :!: Chr r x) (PointL i) Source # | First try in getting this right with a TODO use TODO it might even be possible to auto-generate this code via TH. |
| (TermStream m (Z :. pos) (TermSymbol M (Chr r x)) (Elm (Term1 (Elm ls (PointR i))) (Z :. PointR i)) (Z :. PointR i), posLeft ~ LeftPosTy pos (Chr r x) (PointR i), TermStaticVar pos (Chr r x) (PointR i), MkStream m posLeft ls (PointR i)) => MkStream m (pos :: Type) (ls :!: Chr r x) (PointR i) Source # | |
| TermStreamContext m ps ts s x0 i0 is (PointL O) => TermStream m (ps :. OStatic d :: Type) (TermSymbol ts (Chr r x)) s (is :. PointL O) Source # | |
| TermStreamContext m ps ts s x0 i0 is (PointL I) => TermStream m (ps :. IStatic d :: Type) (TermSymbol ts (Chr r x)) s (is :. PointL I) Source # | |
| TermStreamContext m ps ts s x0 i0 is (PointR I) => TermStream m (ps :. IVariable d :: Type) (TermSymbol ts (Chr r x)) s (is :. PointR I) Source # | |
| TermStreamContext m ps ts s x0 i0 is (PointR I) => TermStream m (ps :. IStatic d :: Type) (TermSymbol ts (Chr r x)) s (is :. PointR I) Source # | |
| TermStaticVar (IVariable d :: Type) (Chr r x) (PointR I) Source # | |
| TermStaticVar (IStatic d :: Type) (Chr r x) (PointL I) Source # | |
| TermStaticVar (IStatic d :: Type) (Chr r x) (PointR I) Source # | |
| TermStaticVar (OStatic d :: Type) (Chr r x) (PointL O) Source # | |
| (Show i, Show (RunningIndex i), Show r, Show (Elm ls i)) => Show (Elm (ls :!: Chr r x) i) Source # | |
| Build (Chr r x) Source # | |
| Element ls i => Element (ls :!: Chr r x) i Source # | |
| type Stack (Chr r x) Source # | |
| data Elm (ls :!: Chr r x) i Source # | |
Defined in ADP.Fusion.Core.Term.Chr | |
| type Arg (ls :!: Chr r x) Source # | |
| type TermArg (Chr r x) Source # | |
Defined in ADP.Fusion.Core.Term.Chr | |
| type LeftPosTy (IVariable d) (Chr r x) (PointR I) Source # | |
| type LeftPosTy (IStatic d) (Chr r x) (PointR I) Source # | |
| type LeftPosTy (IStatic d) (Chr r x) (PointL I) Source # | |
| type LeftPosTy (OStatic d) (Chr r x) (PointL O) Source # | |