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

Safe HaskellNone
LanguageHaskell2010

ADP.Fusion.PointL.Core

Contents

Synopsis

    Contexts, and running indices.

    Inside

    Single-tape

    Multi-tape

    Outside

    Single-tape

    Multi-tape

    Complemented

    Single-tape

    Multi-tape

    Table index modification

    Orphan instances

    MinSize minSize => TableStaticVar (pos :: k) minSize u (PointL C) Source # 
    Instance details

    Methods

    tableStreamIndex :: Proxy pos -> minSize -> LimitType u -> PointL C -> PointL C Source #

    MinSize minSize => TableStaticVar (pos :: k) minSize u (PointL O) Source # 
    Instance details

    Methods

    tableStreamIndex :: Proxy pos -> minSize -> LimitType u -> PointL O -> PointL O Source #

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

    Methods

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

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

    Associated Types

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

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

    Associated Types

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

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

    Associated Types

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

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

    Methods

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

    Monad m => MkStream m Complement S (PointL C) Source # 
    Instance details

    (Monad m, MkStream m ps S is) => MkStream m (ps :. Complement :: Type) S (is :. PointL C) Source # 
    Instance details

    Methods

    mkStream :: Proxy (ps :. Complement) -> S -> Int# -> LimitType (is :. PointL C) -> (is :. PointL C) -> Stream m (Elm S (is :. PointL C)) Source #

    (Monad m, MkStream m ps S is, KnownNat d) => MkStream m (ps :. OFirstLeft d :: Type) S (is :. PointL O) Source # 
    Instance details

    Methods

    mkStream :: Proxy (ps :. OFirstLeft d) -> S -> Int# -> LimitType (is :. PointL O) -> (is :. PointL O) -> Stream m (Elm S (is :. PointL O)) Source #

    (Monad m, MkStream m ps S is, KnownNat d) => MkStream m (ps :. OStatic d :: Type) S (is :. PointL O) Source # 
    Instance details

    Methods

    mkStream :: Proxy (ps :. OStatic d) -> S -> Int# -> LimitType (is :. PointL O) -> (is :. PointL O) -> Stream m (Elm S (is :. PointL O)) Source #

    (Monad m, KnownNat d) => MkStream m (OFirstLeft d :: Type) S (PointL O) Source # 
    Instance details

    Methods

    mkStream :: Proxy (OFirstLeft d) -> S -> Int# -> LimitType (PointL O) -> PointL O -> Stream m (Elm S (PointL O)) Source #

    (Monad m, KnownNat d) => MkStream m (OStatic d :: Type) S (PointL O) Source # 
    Instance details

    Methods

    mkStream :: Proxy (OStatic d) -> S -> Int# -> LimitType (PointL O) -> PointL O -> Stream m (Elm S (PointL O)) Source #

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

    Methods

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

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

    Methods

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

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

    Methods

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

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

    Methods

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