Movatterモバイル変換


[0]ホーム

URL:


------------------------------------------------------------------------------- |-- Module      :  Type.Reflection.Unsafe-- Copyright   :  (c) The University of Glasgow, CWI 2001--2015-- License     :  BSD-style (see the file libraries/base/LICENSE)---- The representations of the types 'TyCon' and 'TypeRep', and the function-- 'mkTyCon' which is used by derived instances of 'Typeable' to construct-- 'TyCon's.---- Be warned, these functions can be used to construct ill-kinded-- type representations.-------------------------------------------------------------------------------{-# LANGUAGE PolyKinds, DataKinds, ScopedTypeVariables #-}moduleType.Reflection.Unsafe(-- * Type representationsTypeRep,mkTrApp,mkTyCon,typeRepFingerprint,someTypeRepFingerprint-- * Kind representations,KindRep(..),TypeLitSort(..)-- * Type constructors,TyCon,mkTrCon,tyConKindRep,tyConKindArgs,tyConFingerprint)whereimportData.Typeable.Internalhiding(mkTrApp)importqualifiedData.Typeable.InternalasTI-- | Construct a representation for a type application.mkTrApp::forallk1k2(a::k1->k2)(b::k1).TypeRep(a::k1->k2)->TypeRep(b::k1)->TypeRep(ab)mkTrApp=TI.mkTrAppChecked

[8]ページ先頭

©2009-2025 Movatter.jp