{-# LANGUAGE PolyKinds, DataKinds, ScopedTypeVariables, Unsafe #-}
module Type.Reflection.Unsafe (
TypeRep, mkTrApp, mkTyCon, typeRepFingerprint, someTypeRepFingerprint
, KindRep(..), TypeLitSort(..)
, TyCon, mkTrCon, tyConKindRep, tyConKindArgs, tyConFingerprint
) where
import Data.Typeable.Internal hiding (mkTrApp)
import qualified Data.Typeable.Internal as TI
mkTrApp :: forall k1 k2 (a :: k1 -> k2) (b :: k1).
TypeRep (a :: k1 -> k2)
-> TypeRep (b :: k1)
-> TypeRep (a b)
mkTrApp :: forall k1 k2 (a :: k1 -> k2) (b :: k1).
TypeRep a -> TypeRep b -> TypeRep (a b)
mkTrApp = TypeRep a -> TypeRep b -> TypeRep (a b)
forall k1 k2 (a :: k1 -> k2) (b :: k1).
TypeRep a -> TypeRep b -> TypeRep (a b)
TI.mkTrAppChecked