[commit: ghc] wip/tc/typeable-with-kinds: Delete commented out code. (af2b2d6)

git at git.haskell.org git at git.haskell.org
Sat Mar 7 16:43:36 UTC 2015


Repository : ssh://git@git.haskell.org/ghc

On branch  : wip/tc/typeable-with-kinds
Link       : http://ghc.haskell.org/trac/ghc/changeset/af2b2d6f31b1fa724bec73041abd38cd9df5ff1e/ghc

>---------------------------------------------------------------

commit af2b2d6f31b1fa724bec73041abd38cd9df5ff1e
Author: Iavor S. Diatchki <diatchki at galois.com>
Date:   Wed Feb 11 14:54:39 2015 -0800

    Delete commented out code.


>---------------------------------------------------------------

af2b2d6f31b1fa724bec73041abd38cd9df5ff1e
 compiler/typecheck/TcGenDeriv.hs | 38 --------------------------------------
 1 file changed, 38 deletions(-)

diff --git a/compiler/typecheck/TcGenDeriv.hs b/compiler/typecheck/TcGenDeriv.hs
index c6296d6..7802a22 100644
--- a/compiler/typecheck/TcGenDeriv.hs
+++ b/compiler/typecheck/TcGenDeriv.hs
@@ -1246,44 +1246,6 @@ getPrecedence get_fixity nm
           --     into account for either Read or Show; hence we
           --     ignore associativity here
 
-{- XXX
-genTypeableTyConRep :: DynFlags -> SrcSpan -> TyCon ->
-                                (LHsBind RdrName, LSig RdrName)
-genTypeableTyConRep dflags loc tycon =
-      ( mk_easy_FunBind loc rep_name [] tycon_rep
-      , L loc (TypeSig [L loc rep_name] sig_ty PlaceHolder)
-      )
-  where
-    rep_name   = mk_tc_deriv_name tycon (mkTyConRepOcc suf)
-    suf        = if isPromotedTyCon tycon then Just "k" else
-                 if isPromotedDataCon tycon then Just "c" else Nothing
-
-    sig_ty     = nlHsTyVar typeable_TyCon_RDR
-
-    tycon_name = tyConName tycon
-    modl       = nameModule tycon_name
-    pkg        = modulePackageKey modl
-
-    modl_fs    = moduleNameFS (moduleName modl)
-    pkg_fs     = packageKeyFS pkg
-    name_fs    = occNameFS (nameOccName tycon_name)
-
-    tycon_rep = nlHsApps mkTyCon_RDR
-                    (map nlHsLit [int64 high,
-                                  int64 low,
-                                  HsString "" pkg_fs,
-                                  HsString "" modl_fs,
-                                  HsString "" name_fs])
-
-    hashThis = unwords $ map unpackFS [pkg_fs, modl_fs, name_fs]
-    Fingerprint high low = fingerprintString hashThis
-
-    int64
-      | wORD_SIZE dflags == 4 = HsWord64Prim "" . fromIntegral
-      | otherwise             = HsWordPrim "" . fromIntegral
--}
-
-
 {-
 ************************************************************************
 *                                                                      *



More information about the ghc-commits mailing list