| Safe Haskell | Safe |
|---|---|
| Language | Haskell2010 |
Ivory.Language.Proxy
- data Proxy k t :: forall k. k -> * = Proxy
- type SProxy a = Proxy (a :: *)
- type ANat n = KnownNat n
- type NatType n = Proxy n
- aNat :: KnownNat n => Proxy n
- fromTypeNat :: KnownNat i => proxy (i :: Nat) -> Integer
- type ASymbol s = KnownSymbol s
- type SymbolType s = Proxy s
- aSymbol :: KnownSymbol s => Proxy s
- fromTypeSym :: KnownSymbol sym => proxy (sym :: Symbol) -> String
Proxy
data Proxy k t :: forall k. k -> * #
A concrete, poly-kinded proxy type
Constructors
| Proxy |
Instances
| Monad (Proxy *) | |
| Functor (Proxy *) | |
| Applicative (Proxy *) | |
| Foldable (Proxy *) | |
| Traversable (Proxy *) | |
| Generic1 (Proxy *) | |
| Alternative (Proxy *) | |
| MonadPlus (Proxy *) | |
| Bounded (Proxy k s) | |
| Enum (Proxy k s) | |
| Eq (Proxy k s) | |
| Ord (Proxy k s) | |
| Read (Proxy k s) | |
| Show (Proxy k s) | |
| Ix (Proxy k s) | |
| Generic (Proxy k t) | |
| Semigroup (Proxy k s) | |
| Monoid (Proxy k s) | |
| type Rep1 (Proxy *) | |
| type Rep (Proxy k t) | |
Nat
fromTypeNat :: KnownNat i => proxy (i :: Nat) -> Integer Source #
The integer associated with a type-nat.
Symbol
type ASymbol s = KnownSymbol s Source #
type SymbolType s = Proxy s Source #
aSymbol :: KnownSymbol s => Proxy s Source #
fromTypeSym :: KnownSymbol sym => proxy (sym :: Symbol) -> String Source #
The string associated with a type-symbol.