ADPfusion-0.5.1.0: 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

(Show i, Show (RunningIndex i), Show (v x), Show (Elm ls i)) => Show (Elm ((:!:) ls (Strng v x)) i) Source 
Build (Strng v x) Source 
Element ls i => Element ((:!:) ls (Strng v x)) i Source 
type Stack (Strng v x) = (:!:) S (Strng v x) 
data Elm ((:!:) ls (Strng v x)) = ElmStrng !(v x) !(RunningIndex i) !(Elm ls i) Source 
type Arg ((:!:) ls (Strng v x)) = (:.) (Arg ls) (v x) Source 
type TermArg (Strng v x) = v x Source 

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