ADPfusionSet-0.0.0.1: Dynamic programming for Set data structures.

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.Term.EdgeWithSet.Type

Description

TODO merge with Edge and handle via phantom typing?

Synopsis

Documentation

data EdgeWithSet Source #

An edge in a graph. As a parsing symbol, it will provide (From:.To) pairs.

Constructors

EdgeWithSet 

Instances

Build EdgeWithSet Source # 

Associated Types

type Stack EdgeWithSet :: * #

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

Methods

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

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

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

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

Associated Types

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

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

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

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