Safe Haskell | None |
---|---|
Language | Haskell2010 |
- insert :: forall t x proxy. Typeable t => Item x t -> TypeMap x -> TypeMap x
- lookup :: forall t x proxy. Typeable t => TypeMap x -> Maybe (Item x t)
- map :: forall x y. (forall t. Typeable t => Item x t -> Item y t) -> TypeMap x -> TypeMap y
- traverse :: forall f x y. Applicative f => (forall t. Typeable t => Item x t -> f (Item y t)) -> TypeMap x -> f (TypeMap y)
- newtype Typed_ x t = Typed_ (Typed x t)
- newtype WithTypeable x = WithTypeable (forall t. Typeable t => Typed_ x t)
- withTypeable :: WithTypeable x -> (Proxy# t -> TypeRep) -> UnTyped x
- withTypeRep :: forall x. (forall t. Typeable t => Typed_ x t) -> TypeRep -> UnTyped x
Documentation
insert :: forall t x proxy. Typeable t => Item x t -> TypeMap x -> TypeMap x Source #
Insert an element indexed by type t
.
lookup :: forall t x proxy. Typeable t => TypeMap x -> Maybe (Item x t) Source #
Lookup an element indexed by type t
.
map :: forall x y. (forall t. Typeable t => Item x t -> Item y t) -> TypeMap x -> TypeMap y Source #
traverse :: forall f x y. Applicative f => (forall t. Typeable t => Item x t -> f (Item y t)) -> TypeMap x -> f (TypeMap y) Source #
Unsafe internals
newtype WithTypeable x Source #
WithTypeable (forall t. Typeable t => Typed_ x t) |
withTypeable :: WithTypeable x -> (Proxy# t -> TypeRep) -> UnTyped x Source #