Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Data.Typeable.Extra
Description
Deprecated: Use Data.Typeable directly
This module extends Data.Typeable with extra functions available in later GHC versions. The package also exports the existing Data.Typeable functions.
Currently this module has no functionality beyond Data.Typeable.
Documentation
Instances
NFData TyCon | |
Defined in Control.DeepSeq | |
Show TyCon | |
Eq TyCon | |
Ord TyCon | |
Constructors
Proxy |
Instances
Generic1 (Proxy :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
MonadZip (Proxy :: Type -> Type) | |||||
Eq1 (Proxy :: Type -> Type) | |||||
Defined in Data.Functor.Classes | |||||
Ord1 (Proxy :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftCompare :: (a -> b -> Ordering) -> Proxy a -> Proxy b -> Ordering | |||||
Read1 (Proxy :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Proxy a) liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Proxy a] liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Proxy a) liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Proxy a] | |||||
Show1 (Proxy :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Proxy a -> ShowS liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Proxy a] -> ShowS | |||||
Contravariant (Proxy :: Type -> Type) | |||||
NFData1 (Proxy :: Type -> Type) | |||||
Defined in Control.DeepSeq | |||||
Alternative (Proxy :: Type -> Type) | |||||
Applicative (Proxy :: Type -> Type) | |||||
Functor (Proxy :: Type -> Type) | |||||
Monad (Proxy :: Type -> Type) | |||||
MonadPlus (Proxy :: Type -> Type) | |||||
Foldable (Proxy :: Type -> Type) | |||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => Proxy m -> m # foldMap :: Monoid m => (a -> m) -> Proxy a -> m # foldMap' :: Monoid m => (a -> m) -> Proxy a -> m # foldr :: (a -> b -> b) -> b -> Proxy a -> b # foldr' :: (a -> b -> b) -> b -> Proxy a -> b # foldl :: (b -> a -> b) -> b -> Proxy a -> b # foldl' :: (b -> a -> b) -> b -> Proxy a -> b # foldr1 :: (a -> a -> a) -> Proxy a -> a # foldl1 :: (a -> a -> a) -> Proxy a -> a # elem :: Eq a => a -> Proxy a -> Bool # maximum :: Ord a => Proxy a -> a # minimum :: Ord a => Proxy a -> a # | |||||
Traversable (Proxy :: Type -> Type) | |||||
NFData (Proxy a) | |||||
Defined in Control.DeepSeq | |||||
Monoid (Proxy s) | |||||
Semigroup (Proxy s) | |||||
Bounded (Proxy t) | |||||
Defined in GHC.Internal.Data.Proxy | |||||
Enum (Proxy s) | |||||
Defined in GHC.Internal.Data.Proxy | |||||
Generic (Proxy t) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Ix (Proxy s) | |||||
Defined in GHC.Internal.Data.Proxy | |||||
Read (Proxy t) | |||||
Show (Proxy s) | |||||
Eq (Proxy s) | |||||
Ord (Proxy s) | |||||
type Rep1 (Proxy :: k -> Type) | |||||
Defined in GHC.Internal.Generics type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "GHC.Internal.Data.Proxy" "ghc-internal" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type)) | |||||
type Rep (Proxy t) | |||||
Defined in GHC.Internal.Generics type Rep (Proxy t) = D1 ('MetaData "Proxy" "GHC.Internal.Data.Proxy" "ghc-internal" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type)) |
decT :: forall {k} (a :: k) (b :: k). (Typeable a, Typeable b) => Either ((a :~: b) -> Void) (a :~: b) #
funResultTy :: TypeRep -> TypeRep -> Maybe TypeRep #
gcast1 :: forall {k1} {k2} c (t :: k2 -> k1) (t' :: k2 -> k1) (a :: k2). (Typeable t, Typeable t') => c (t a) -> Maybe (c (t' a)) #
gcast2 :: forall {k1} {k2} {k3} c (t :: k2 -> k3 -> k1) (t' :: k2 -> k3 -> k1) (a :: k2) (b :: k3). (Typeable t, Typeable t') => c (t a b) -> Maybe (c (t' a b)) #
hdecT :: forall {k1} {k2} (a :: k1) (b :: k2). (Typeable a, Typeable b) => Either ((a :~~: b) -> Void) (a :~~: b) #
rnfTypeRep :: TypeRep -> () #
showsTypeRep :: TypeRep -> ShowS #
splitTyConApp :: TypeRep -> (TyCon, [TypeRep]) #
typeRepArgs :: TypeRep -> [TypeRep] #
typeRepFingerprint :: TypeRep -> Fingerprint #
typeRepTyCon :: TypeRep -> TyCon #
trLiftedRep :: TypeRep LiftedRep #
tyConFingerprint :: TyCon -> Fingerprint #
tyConModule :: TyCon -> String #
tyConPackage :: TyCon -> String #
data (a :: k) :~: (b :: k) where #
Instances
TestEquality ((:~:) a :: k -> Type) | |
Defined in GHC.Internal.Data.Type.Equality Methods testEquality :: forall (a0 :: k) (b :: k). (a :~: a0) -> (a :~: b) -> Maybe (a0 :~: b) | |
NFData2 ((:~:) :: Type -> Type -> Type) | |
Defined in Control.DeepSeq | |
NFData1 ((:~:) a) | |
Defined in Control.DeepSeq | |
NFData (a :~: b) | |
Defined in Control.DeepSeq | |
a ~ b => Bounded (a :~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
a ~ b => Enum (a :~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
a ~ b => Read (a :~: b) | |
Show (a :~: b) | |
Eq (a :~: b) | |
Ord (a :~: b) | |
Defined in GHC.Internal.Data.Type.Equality |
data (a :: k1) :~~: (b :: k2) where #
Instances
TestEquality ((:~~:) a :: k -> Type) | |
Defined in GHC.Internal.Data.Type.Equality Methods testEquality :: forall (a0 :: k) (b :: k). (a :~~: a0) -> (a :~~: b) -> Maybe (a0 :~: b) | |
NFData2 ((:~~:) :: Type -> Type -> Type) | |
Defined in Control.DeepSeq | |
NFData1 ((:~~:) a :: Type -> Type) | |
Defined in Control.DeepSeq | |
NFData (a :~~: b) | |
Defined in Control.DeepSeq | |
a ~~ b => Bounded (a :~~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
a ~~ b => Enum (a :~~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
a ~~ b => Read (a :~~: b) | |
Show (a :~~: b) | |
Eq (a :~~: b) | |
Ord (a :~~: b) | |
Defined in GHC.Internal.Data.Type.Equality |