| Copyright | (C) 2013 Richard Eisenberg |
|---|---|
| License | BSD-style (see LICENSE) |
| Maintainer | Richard Eisenberg (rae@cs.brynmawr.edu) |
| Stability | experimental |
| Portability | non-portable |
| Safe Haskell | None |
| Language | Haskell2010 |
Data.Singletons.TypeRepStar
Contents
Description
This module defines singleton instances making TypeRep the singleton for
the kind *. The definitions don't fully line up with what is expected
within the singletons library, so expect unusual results!
Synopsis
- data family Sing (a :: k)
- data SomeTypeRepStar where
- SomeTypeRepStar :: forall (a :: *). !(TypeRep a) -> SomeTypeRepStar
Documentation
data family Sing (a :: k) Source #
The singleton kind-indexed data family.
Instances
Here is the definition of the singleton for *:
newtype instance Sing :: Type -> Type where STypeRep :: TypeRep a -> Sing a
Instances for SingI, SingKind, SEq, SDecide, and TestCoercion are
also supplied.
data SomeTypeRepStar where Source #
A variant of SomeTypeRep whose underlying TypeRep is restricted to
kind *.
Constructors
| SomeTypeRepStar :: forall (a :: *). !(TypeRep a) -> SomeTypeRepStar |
Instances
| Eq SomeTypeRepStar Source # | |
Defined in Data.Singletons.TypeRepStar Methods (==) :: SomeTypeRepStar -> SomeTypeRepStar -> Bool # (/=) :: SomeTypeRepStar -> SomeTypeRepStar -> Bool # | |
| Ord SomeTypeRepStar Source # | |
Defined in Data.Singletons.TypeRepStar Methods compare :: SomeTypeRepStar -> SomeTypeRepStar -> Ordering # (<) :: SomeTypeRepStar -> SomeTypeRepStar -> Bool # (<=) :: SomeTypeRepStar -> SomeTypeRepStar -> Bool # (>) :: SomeTypeRepStar -> SomeTypeRepStar -> Bool # (>=) :: SomeTypeRepStar -> SomeTypeRepStar -> Bool # max :: SomeTypeRepStar -> SomeTypeRepStar -> SomeTypeRepStar # min :: SomeTypeRepStar -> SomeTypeRepStar -> SomeTypeRepStar # | |
| Show SomeTypeRepStar Source # | |
Defined in Data.Singletons.TypeRepStar Methods showsPrec :: Int -> SomeTypeRepStar -> ShowS # show :: SomeTypeRepStar -> String # showList :: [SomeTypeRepStar] -> ShowS # | |