| Copyright | (c) Conal Elliott 2009 |
|---|---|
| License | BSD3 |
| Maintainer | conal@conal.net |
| Stability | experimental |
| Safe Haskell | None |
| Language | Haskell98 |
Data.Ty
Description
Typed typerefs
- class Typeable k a
- module Data.IsTy
- data Ty a
- tyRep :: Ty a -> TypeRep
- ty :: Typeable a => Ty a
- tyOf :: Typeable a => a -> Ty a
- tyOf1 :: forall f a. Typeable a => f a -> Ty a
- tyOf2 :: forall g f a. Typeable a => g (f a) -> Ty a
- (=:=) :: forall a b. (Typeable a, Typeable b, Eq a) => a -> b -> Maybe (a :=: b)
- data AsPairTy :: * -> * where
- asPairTy :: Ty t -> Maybe (AsPairTy t)
Documentation
The class Typeable allows a concrete representation of a type to
be calculated.
Minimal complete definition
module Data.IsTy
Phantom type wrapper around a TypeRep
tyOf1 :: forall f a. Typeable a => f a -> Ty a Source #
The Ty of a value from a constructor application
tyOf2 :: forall g f a. Typeable a => g (f a) -> Ty a Source #
The Ty of a value from a nested constructor application