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

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.Term.PeekIndex.Type

Documentation

data PeekIndex i Source #

Constructors

PeekIndex 

Instances

Build (PeekIndex i) Source # 

Associated Types

type Stack (PeekIndex i) :: * Source #

Methods

build :: PeekIndex i -> Stack (PeekIndex i) Source #

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

Methods

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

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

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

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

Associated Types

data Elm ((:!:) ls (PeekIndex i)) i :: * Source #

type RecElm ((:!:) ls (PeekIndex i)) i :: * Source #

type Arg ((:!:) ls (PeekIndex i)) :: * Source #

Methods

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

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

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

type Stack (PeekIndex i) Source # 
type TermArg (PeekIndex i) Source # 
type Arg ((:!:) ls (PeekIndex i)) Source # 
type Arg ((:!:) ls (PeekIndex i)) = (:.) (Arg ls) i
data Elm ((:!:) ls (PeekIndex i)) i Source # 
data Elm ((:!:) ls (PeekIndex i)) i = ElmPeekIndex !i !(RunningIndex i) !(Elm ls i)