| Stability | experimental |
|---|---|
| Maintainer | conal@conal.net |
| Safe Haskell | None |
Data.Ty
Description
Typed typerefs
- class Typeable 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
class Typeable a
The class Typeable allows a concrete representation of a type to
be calculated.
Instances
| Typeable Bool | |
| Typeable Char | |
| Typeable Double | |
| Typeable Float | |
| Typeable Int | |
| Typeable Int8 | |
| Typeable Int16 | |
| Typeable Int32 | |
| Typeable Int64 | |
| Typeable Integer | |
| Typeable Ordering | |
| Typeable RealWorld | |
| Typeable Word | |
| Typeable Word8 | |
| Typeable Word16 | |
| Typeable Word32 | |
| Typeable Word64 | |
| Typeable () | |
| Typeable TypeRep | |
| Typeable TyCon | |
| (Typeable1 s, Typeable a) => Typeable (s a) | One Typeable instance for all Typeable1 instances |
module Data.IsTy
tyOf1 :: forall f a. Typeable a => f a -> Ty aSource
The Ty of a value from a constructor application
tyOf2 :: forall g f a. Typeable a => g (f a) -> Ty aSource
The Ty of a value from a nested constructor application