| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Inj.Base
Contents
Description
Inj instances for types from base.
Orphan instances
| Real p => Inj p Double Source # | Injective only if the number is representable as |
| Real p => Inj p Float Source # | Injective only if the number is representable as |
| Integral p => Inj p WordPtr Source # | |
| Integral p => Inj p IntPtr Source # | |
| Integral p => Inj p Word64 Source # | |
| Integral p => Inj p Word32 Source # | |
| Integral p => Inj p Word16 Source # | |
| Integral p => Inj p Word8 Source # | |
| Integral p => Inj p Word Source # | |
| Integral p => Inj p Int64 Source # | |
| Integral p => Inj p Int32 Source # | |
| Integral p => Inj p Int16 Source # | |
| Integral p => Inj p Int8 Source # | |
| Integral p => Inj p Int Source # | |
| Integral p => Inj p Natural Source # | Throws |
| Integral p => Inj p Integer Source # | |
| p ~ Ordering => Inj p Ordering Source # | |
| p ~ Bool => Inj p Bool Source # | |
| p ~ () => Inj p () Source # | |
| Inj p a => Inj p (Par1 a) Source # | |
| Inj p a => Inj p (Min a) Source # | |
| Inj p a => Inj p (Max a) Source # | |
| Inj p a => Inj p (First a) Source # | |
| Inj p a => Inj p (Last a) Source # | |
| Inj p a => Inj p (First a) Source # | |
| Inj p a => Inj p (Last a) Source # | |
| Inj p a => Inj p (Dual a) Source # | |
| Inj p a => Inj p (Sum a) Source # | |
| Inj p a => Inj p (Product a) Source # | |
| Inj p a => Inj p (Down a) Source # | |
| Inj p a => Inj p (ReadPrec a) Source # | |
| Inj p a => Inj p (ReadP a) Source # | |
| (Num a, Inj p a) => Inj p (Complex a) Source # | |
| (HasResolution res, Real p) => Inj p (Fixed res) Source # | Throws |
| (Inj Integer a, Real p) => Inj p (Ratio a) Source # | |
| InjOption (DecideOption p) p a => Inj p (Option a) Source # | |
| InjZipList (DecideZipList p) p a => Inj p (ZipList a) Source # | |
| InjIdentity (DecideIdentity p) p a => Inj p (Identity a) Source # | |
| InjSTM (DecideSTM p) p a => Inj p (STM a) Source # | |
| InjIO (DecideIO p) p a => Inj p (IO a) Source # | |
| InjNonEmpty (DecideNonEmpty p) p a => Inj p (NonEmpty a) Source # | |
| InjList (DecideList p) p a => Inj p [a] Source # | |
| InjMaybe (DecideMaybe p) p a => Inj p (Maybe a) Source # | |
| (t ~ Either pa pb, Inj pa a, Inj pb b) => Inj t (Either a b) Source # | |
| (t ~ (pa, pb), Inj pa a, Inj pb b) => Inj t (a, b) Source # | |
| InjFn (DecideFn p) p r a => Inj p (r -> a) Source # | |
| InjST (DecideST p) p s a => Inj p (ST s a) Source # | |
| p ~ Proxy t' => Inj p (Proxy t) Source # | |
| Inj p (f a) => Inj p (Rec1 f a) Source # | |
| (t ~ Const pa pb, Inj pa a) => Inj t (Const a b) Source # | |
| (t ~ (pa, pb, pc), Inj pa a, Inj pb b, Inj pc c) => Inj t (a, b, c) Source # | |
| Inj p a => Inj p (K1 i a x) Source # | |
| (t ~ (pa, pb, pc, pd), Inj pa a, Inj pb b, Inj pc c, Inj pd d) => Inj t (a, b, c, d) Source # | |
| Inj p (f (g a)) => Inj p ((f :.: g) a) Source # | |
| Inj p (f a) => Inj p (M1 i c f a) Source # | |
| Inj p (f (g a)) => Inj p (Compose f g a) Source # | |