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

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.Term.Strng.Type

Synopsis

Documentation

data Strng v x where Source

Strng terminals return "strings", i.e. vectors of Chrs. They allow the user to specify [ 0 .. ] atoms to be parsed at once. It is possible to both, limit the minimal and maximal number.

NOTE gadt comments are not parsed by haddock?

Constructors

Strng :: Vector v x => !(Int -> Int -> v x -> v x) -> !Int -> !Int -> !(v x) -> Strng v x 

Instances

(Monad m, Element ls PointL, MkStream m ls PointL) => MkStream m ((:!:) ls (Strng v x)) PointL 
(Monad m, TerminalStream m a is) => TerminalStream m (TermSymbol a (Strng v x)) ((:.) is PointL) 
(Show i, Show (v x), Show (Elm ls i)) => Show (Elm ((:!:) ls (Strng v x)) i) 
Build (Strng v x) 
Element ls i => Element ((:!:) ls (Strng v x)) i 
TermStaticVar (Strng v x) PointL 
type Stack (Strng v x) = (:!:) S (Strng v x) 
data Elm ((:!:) ls (Strng v x)) = ElmStrng !(v x) !i !i !(Elm ls i) 
type Arg ((:!:) ls (Strng v x)) = (:.) (Arg ls) (v x) 
type TermArg (TermSymbol a (Strng v x)) = (:.) (TermArg a) (v x) 

manyS :: Vector v x => v x -> Strng v x Source

someS :: Vector v x => v x -> Strng v x Source

strng :: Vector v x => Int -> Int -> v x -> Strng v x Source