ADPfusionSet-0.0.0.2: Dynamic programming for Set data structures.

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.Term.Singleton.Type

Description

Type definition for singleton terminal symbols.

Synopsis

Documentation

data Singleton Source #

A singleton vertex is successfully parsed only if no other vertex is active yet. In particular, this allows us to insert "starting" points into graphs that mostly deal with edges. As a parsing symbol, it provides an Int which is the node index.

Constructors

Singleton 

Instances

Build Singleton Source # 

Associated Types

type Stack Singleton :: * #

(Show i, Show (RunningIndex i), Show (Elm ls i)) => Show (Elm ((:!:) ls Singleton) i) Source # 

Methods

showsPrec :: Int -> Elm (ls :!: Singleton) i -> ShowS #

show :: Elm (ls :!: Singleton) i -> String #

showList :: [Elm (ls :!: Singleton) i] -> ShowS #

Element ls i => Element ((:!:) ls Singleton) i Source # 

Associated Types

data Elm ((:!:) ls Singleton) i :: * #

type RecElm ((:!:) ls Singleton) i :: * #

type Arg ((:!:) ls Singleton) :: * #

Methods

getArg :: Elm (ls :!: Singleton) i -> Arg (ls :!: Singleton) #

getIdx :: Elm (ls :!: Singleton) i -> RunningIndex i #

getElm :: Elm (ls :!: Singleton) i -> RecElm (ls :!: Singleton) i #

type TermArg Singleton Source # 
type Stack Singleton Source # 
type Arg ((:!:) ls Singleton) Source # 
type Arg ((:!:) ls Singleton) = (:.) (Arg ls) ((:.) Int To)
data Elm ((:!:) ls Singleton) Source #