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

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.PointR.Core

Contents

Synopsis

    Contexts, and running indices.

    Inside

    Single-tape

    Multi-tape

    Outside

    Single-tape

    Complemented

    Single-tape

    Multi-tape

    Table index modification

    Orphan instances

    MinSize minSize => TableStaticVar (pos :: k) minSize u (PointR I) Source # 
    Instance details

    Methods

    tableStreamIndex :: Proxy pos -> minSize -> LimitType u -> PointR I -> PointR I Source #

    Generic (RunningIndex (PointR I)) Source # 
    Instance details

    Associated Types

    type Rep (RunningIndex (PointR I)) :: Type -> Type #

    Generic (RunningIndex (PointR O)) Source # 
    Instance details

    Associated Types

    type Rep (RunningIndex (PointR O)) :: Type -> Type #

    Generic (RunningIndex (PointR C)) Source # 
    Instance details

    Associated Types

    type Rep (RunningIndex (PointR C)) :: Type -> Type #

    NFData (RunningIndex (PointR I)) Source # 
    Instance details

    Methods

    rnf :: RunningIndex (PointR I) -> () #

    (Monad m, MkStream m ps S is, KnownNat d) => MkStream m (ps :. IVariable d :: Type) S (is :. PointR I) Source # 
    Instance details

    Methods

    mkStream :: Proxy (ps :. IVariable d) -> S -> Int# -> LimitType (is :. PointR I) -> (is :. PointR I) -> Stream m (Elm S (is :. PointR I)) Source #

    (Monad m, MkStream m ps S is, KnownNat d) => MkStream m (ps :. IStatic d :: Type) S (is :. PointR I) Source # 
    Instance details

    Methods

    mkStream :: Proxy (ps :. IStatic d) -> S -> Int# -> LimitType (is :. PointR I) -> (is :. PointR I) -> Stream m (Elm S (is :. PointR I)) Source #

    (Monad m, KnownNat d) => MkStream m (IVariable d :: Type) S (PointR I) Source # 
    Instance details

    Methods

    mkStream :: Proxy (IVariable d) -> S -> Int# -> LimitType (PointR I) -> PointR I -> Stream m (Elm S (PointR I)) Source #

    (Monad m, KnownNat d) => MkStream m (IStatic d :: Type) S (PointR I) Source # 
    Instance details

    Methods

    mkStream :: Proxy (IStatic d) -> S -> Int# -> LimitType (PointR I) -> PointR I -> Stream m (Elm S (PointR I)) Source #