[commit: ghc] wip/generalized-arrow: Fix a few TTypeRep references (f508c88)
git at git.haskell.org
git at git.haskell.org
Mon Mar 21 17:11:03 UTC 2016
Repository : ssh://git@git.haskell.org/ghc
On branch : wip/generalized-arrow
Link : http://ghc.haskell.org/trac/ghc/changeset/f508c8821c4997a8dda2460c07a23e8c5efc9504/ghc
>---------------------------------------------------------------
commit f508c8821c4997a8dda2460c07a23e8c5efc9504
Author: Ben Gamari <ben at smart-cactus.org>
Date: Wed Mar 16 11:51:00 2016 +0100
Fix a few TTypeRep references
>---------------------------------------------------------------
f508c8821c4997a8dda2460c07a23e8c5efc9504
compiler/deSugar/DsBinds.hs | 12 ++++++------
1 file changed, 6 insertions(+), 6 deletions(-)
diff --git a/compiler/deSugar/DsBinds.hs b/compiler/deSugar/DsBinds.hs
index 2943b2b..a41bb27 100644
--- a/compiler/deSugar/DsBinds.hs
+++ b/compiler/deSugar/DsBinds.hs
@@ -1119,10 +1119,10 @@ type TypeRepExpr = CoreExpr
ds_ev_typeable :: Type -> EvTypeable -> DsM CoreExpr
ds_ev_typeable ty (EvTypeableTyCon tc kind_ev)
= do { mkTrCon <- dsLookupGlobalId mkTrConName
- -- mkTrCon :: forall k (a :: k). TyCon -> TTypeRep k -> TTypeRep a
+ -- mkTrCon :: forall k (a :: k). TyCon -> TypeRep k -> TypeRep a
; tc_rep <- tyConRep tc -- :: TyCon
- ; kind_rep <- getRep kind_ev (typeKind ty) -- :: TTypeRep k
+ ; kind_rep <- getRep kind_ev (typeKind ty) -- :: TypeRep k
-- Note that we use the kind of the type, not the TyCon from which it is
-- constructed since the latter may be kind polymorphic whereas the
@@ -1153,8 +1153,8 @@ ds_ev_typeable ty (EvTypeableTyLit ev)
ty_kind = typeKind ty
-- tr_fun is the Name of
- -- typeNatTypeRep :: KnownNat a => Proxy# a -> TTypeRep a
- -- of typeSymbolTypeRep :: KnownSymbol a => Proxy# a -> TTypeRep a
+ -- typeNatTypeRep :: KnownNat a => Proxy# a -> TypeRep a
+ -- of typeSymbolTypeRep :: KnownSymbol a => Proxy# a -> TypeRep a
tr_fun | ty_kind `eqType` typeNatKind = typeNatTypeRepName
| ty_kind `eqType` typeSymbolKind = typeSymbolTypeRepName
| otherwise = panic "dsEvTypeable: unknown type lit kind"
@@ -1168,10 +1168,10 @@ ds_ev_typeable ty ev
getRep :: EvTerm -- ^ EvTerm for @Typeable ty@
-> Type -- ^ The type @ty@
- -> DsM TypeRepExpr -- ^ Return @CoreExpr :: TTypeRep ty@
+ -> DsM TypeRepExpr -- ^ Return @CoreExpr :: TypeRep ty@
-- namely @typeRep# dict@
-- Remember that
--- typeRep# :: forall k (a::k). Typeable k a -> TTypeRep a
+-- typeRep# :: forall k (a::k). Typeable k a -> TypeRep a
getRep ev ty
= do { typeable_expr <- dsEvTerm ev
; typeRepId <- dsLookupGlobalId typeRepIdName
More information about the ghc-commits
mailing list