recursion-schemes-ix-0.1.0.0: Recursion schemes over indexed Functors
Safe HaskellNone
LanguageHaskell2010

Data.IFunctor.IIdentity

Documentation

data IIdentity f ix Source #

Constructors

IIdentity 

Fields

Instances

Instances details
IFunctor (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

imap :: forall (a :: k0 -> Type) (b :: k0 -> Type). (a ~~> b) -> IIdentity a ~~> IIdentity b Source #

IOrd (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

icompare :: forall (ix :: k0) a. SingI ix => (forall (ix :: k1). SingI ix => a ix -> a ix -> Ordering) -> IIdentity a ix -> IIdentity a ix -> Ordering Source #

IEq (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

ieq :: forall (ix :: k0) a. SingI ix => (forall (ix :: k1). SingI ix => a ix -> a ix -> Bool) -> IIdentity a ix -> IIdentity a ix -> Bool Source #

IRead (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

ireadPrec :: forall (ix :: k0) a. SingI ix => (forall (ix :: k1). SingI ix => ReadPrec (a ix)) -> ReadPrec (IIdentity a ix) Source #

ireadsPrec :: forall (ix :: k0) a. SingI ix => (forall (ix :: k1). SingI ix => Int -> ReadS (a ix)) -> Int -> ReadS (IIdentity a ix) Source #

IShow (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

ishowsPrec :: forall (ix :: k0) a. SingI ix => (forall (ix :: k1). SingI ix => Int -> a ix -> ShowS) -> Int -> IIdentity a ix -> ShowS Source #

ishow :: forall (ix :: k0) a. SingI ix => (forall (ix :: k1). SingI ix => Int -> a ix -> ShowS) -> IIdentity a ix -> String Source #

ITraversable (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

itraverse :: forall m (ix :: k0) a b. (Applicative m, SingI ix) => (forall (ix :: k1). SingI ix => a ix -> m (b ix)) -> IIdentity a ix -> m (IIdentity b ix) Source #

IComonad (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

iextract :: forall (a :: k0 -> Type). IIdentity a ~~> a Source #

iduplicate :: forall (a :: k0 -> Type). IIdentity a ~~> IIdentity (IIdentity a) Source #

iextend :: forall (a :: k0 -> Type) (b :: k0 -> Type). (IIdentity a ~~> b) -> IIdentity a ~~> IIdentity b Source #

IMonad (IIdentity :: (k -> Type) -> k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

ipure :: forall (a :: k0 -> Type). a ~~> IIdentity a Source #

ijoin :: forall (a :: k0 -> Type). IIdentity (IIdentity a) ~~> IIdentity a Source #

ibind :: forall (a :: k0 -> Type) (b :: k0 -> Type). (a ~~> IIdentity b) -> IIdentity a ~~> IIdentity b Source #

Generic1 (IIdentity f :: k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Associated Types

type Rep1 (IIdentity f) :: k -> Type #

Methods

from1 :: forall (a :: k0). IIdentity f a -> Rep1 (IIdentity f) a #

to1 :: forall (a :: k0). Rep1 (IIdentity f) a -> IIdentity f a #

(IEq2 f, SingI ix) => Eq (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

(==) :: IIdentity f ix -> IIdentity f ix -> Bool #

(/=) :: IIdentity f ix -> IIdentity f ix -> Bool #

(Typeable ix, Typeable f, Typeable k, Data (f ix)) => Data (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IIdentity f ix -> c (IIdentity f ix) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IIdentity f ix) #

toConstr :: IIdentity f ix -> Constr #

dataTypeOf :: IIdentity f ix -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IIdentity f ix)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IIdentity f ix)) #

gmapT :: (forall b. Data b => b -> b) -> IIdentity f ix -> IIdentity f ix #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IIdentity f ix -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IIdentity f ix -> r #

gmapQ :: (forall d. Data d => d -> u) -> IIdentity f ix -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IIdentity f ix -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IIdentity f ix -> m (IIdentity f ix) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IIdentity f ix -> m (IIdentity f ix) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IIdentity f ix -> m (IIdentity f ix) #

(IOrd2 f, SingI ix) => Ord (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

compare :: IIdentity f ix -> IIdentity f ix -> Ordering #

(<) :: IIdentity f ix -> IIdentity f ix -> Bool #

(<=) :: IIdentity f ix -> IIdentity f ix -> Bool #

(>) :: IIdentity f ix -> IIdentity f ix -> Bool #

(>=) :: IIdentity f ix -> IIdentity f ix -> Bool #

max :: IIdentity f ix -> IIdentity f ix -> IIdentity f ix #

min :: IIdentity f ix -> IIdentity f ix -> IIdentity f ix #

(IRead2 f, SingI ix) => Read (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

(IShow2 f, SingI ix) => Show (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Methods

showsPrec :: Int -> IIdentity f ix -> ShowS #

show :: IIdentity f ix -> String #

showList :: [IIdentity f ix] -> ShowS #

Generic (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

Associated Types

type Rep (IIdentity f ix) :: Type -> Type #

Methods

from :: IIdentity f ix -> Rep (IIdentity f ix) x #

to :: Rep (IIdentity f ix) x -> IIdentity f ix #

type Rep1 (IIdentity f :: k -> Type) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

type Rep1 (IIdentity f :: k -> Type) = D1 ('MetaData "IIdentity" "Data.IFunctor.IIdentity" "recursion-schemes-ix-0.1.0.0-inplace" 'False) (C1 ('MetaCons "IIdentity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 f)))
type Rep (IIdentity f ix) Source # 
Instance details

Defined in Data.IFunctor.IIdentity

type Rep (IIdentity f ix) = D1 ('MetaData "IIdentity" "Data.IFunctor.IIdentity" "recursion-schemes-ix-0.1.0.0-inplace" 'False) (C1 ('MetaCons "IIdentity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f ix))))