Safe Haskell | None |
---|---|
Language | Haskell2010 |
Data.Dependent.Map.Class
Documentation
Constructors
Apply (f a) |
Instances
EqForall f => Eq (Apply f a) Source # | |
OrdForall f => Ord (Apply f a) Source # | |
ApplyUniversally f PrimUnlifted => PrimUnlifted (Apply f a) Source # | |
Defined in Data.Dependent.Map.Class | |
PrimForall f => Prim (Apply f a) Source # | |
Defined in Data.Dependent.Map.Class Methods sizeOf# :: Apply f a -> Int# # alignment# :: Apply f a -> Int# # indexByteArray# :: ByteArray# -> Int# -> Apply f a # readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (#State# s, Apply f a#) # writeByteArray# :: MutableByteArray# s -> Int# -> Apply f a -> State# s -> State# s # setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Apply f a -> State# s -> State# s # indexOffAddr# :: Addr# -> Int# -> Apply f a # readOffAddr# :: Addr# -> Int# -> State# s -> (#State# s, Apply f a#) # writeOffAddr# :: Addr# -> Int# -> Apply f a -> State# s -> State# s # setOffAddr# :: Addr# -> Int# -> Int# -> Apply f a -> State# s -> State# s # |
class Universally (f :: k -> Type) (x :: Type -> Constraint) where Source #
Instances
ApplyUniversally f PrimUnlifted => Universally (f :: k -> Type) PrimUnlifted Source # | |
Defined in Data.Dependent.Map.Class Methods universally :: Proxy f -> Proxy PrimUnlifted -> Proxy a -> (PrimUnlifted (Apply f a) -> y) -> y Source # | |
Universally (f :: k -> Type) Always Source # | |
Defined in Data.Dependent.Map.Class |
class ApplyUniversally (f :: k -> Type) (x :: Type -> Constraint) where Source #
Methods
applyUniversallyLifted :: forall a y. Proxy f -> Proxy x -> Proxy a -> (x (f a) => y) -> y Source #
applyUniversallyUnlifted :: forall a (y :: TYPE UnliftedRep). Proxy f -> Proxy x -> Proxy a -> (x (f a) => y) -> y Source #