[commit: ghc] wip/ttypeable: More serialization (b7887c2)

git at git.haskell.org git at git.haskell.org
Fri Jul 8 14:31:01 UTC 2016


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

On branch  : wip/ttypeable
Link       : http://ghc.haskell.org/trac/ghc/changeset/b7887c255e7c39b7fdda478d0827bdf48221d3ce/ghc

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

commit b7887c255e7c39b7fdda478d0827bdf48221d3ce
Author: Ben Gamari <ben at smart-cactus.org>
Date:   Wed Mar 16 10:33:37 2016 +0100

    More serialization


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

b7887c255e7c39b7fdda478d0827bdf48221d3ce
 compiler/utils/Binary.hs         | 14 +++++++++-----
 libraries/base/Data/Typeable.hs  | 20 +++++++++++++-------
 libraries/ghci/GHCi/TH/Binary.hs | 13 ++++++++-----
 3 files changed, 30 insertions(+), 17 deletions(-)

diff --git a/compiler/utils/Binary.hs b/compiler/utils/Binary.hs
index 328b4a9..52bc33f 100644
--- a/compiler/utils/Binary.hs
+++ b/compiler/utils/Binary.hs
@@ -587,12 +587,13 @@ putTypeRep bh (TRApp f x) = do
     put_ bh (1 :: Word8)
     putTypeRep bh f
     putTypeRep bh x
+putTypeRep _ _ = fail "putTypeRep: Impossible"
 
 getTypeRepX :: BinHandle -> IO TypeRepX
 getTypeRepX bh = do
     tag <- get bh :: IO Word8
     case tag of
-        0 -> do con <- get bh
+        0 -> do con <- get bh :: IO TyCon
                 TypeRepX rep_k <- getTypeRepX bh
                 case rep_k `eqTypeRep` (typeRep :: TypeRep Type) of
                     Just HRefl -> pure $ TypeRepX $ mkTrCon con rep_k
@@ -602,10 +603,13 @@ getTypeRepX bh = do
                 TypeRepX x <- getTypeRepX bh
                 case typeRepKind f of
                     TRFun arg _ ->
-                        case arg `eqTypeRep` x of
-                            Just HRefl ->
-                                pure $ TypeRepX $ mkTrApp f x
-                            _ -> fail "getTypeRepX: Kind mismatch"
+                        case (typeRep :: TypeRep Type) `eqTypeRep` arg of
+                            Just HRefl ->  -- FIXME: Generalize (->)
+                                case x `eqTypeRep` arg of
+                                    Just HRefl ->
+                                        pure $ TypeRepX $ mkTrApp f x
+                                    _ -> fail "getTypeRepX: Kind mismatch"
+                            Nothing -> fail "getTypeRepX: Arrow of non-Type argument"
                     _ -> fail "getTypeRepX: Applied non-arrow type"
         _ -> fail "Binary: Invalid TypeRepX"
 
diff --git a/libraries/base/Data/Typeable.hs b/libraries/base/Data/Typeable.hs
index 7718cf3..21f93d2 100644
--- a/libraries/base/Data/Typeable.hs
+++ b/libraries/base/Data/Typeable.hs
@@ -154,13 +154,19 @@ typeRepTyCon = I.typeRepXTyCon
 -- represents a function of type @t -> u@ and the second argument represents a
 -- function of type @t at . Otherwise, returns @Nothing at .
 funResultTy :: TypeRep -> TypeRep -> Maybe TypeRep
-funResultTy (I.TypeRepX f) (I.TypeRepX x)
-  | Just HRefl <- (I.typeRep :: I.TypeRep Type) `I.eqTypeRep` I.typeRepKind f
-  , I.TRFun arg res <- f
-  , Just HRefl <- arg `I.eqTypeRep` x
-  = Just (I.TypeRepX res)
-  | otherwise
-  = Nothing
+{-
+funResultTy (I.TypeRepX f) (I.TypeRepX x) =
+    case (I.typeRep :: I.TypeRep Type) `I.eqTypeRep` I.typeRepKind f of
+        Just HRefl ->
+            case f of
+                I.TRFun arg res ->
+                    case arg `I.eqTypeRep` x of
+                        Just HRefl -> Just (I.TypeRepX res)
+                        Nothing    -> Nothing
+                _ -> Nothing
+        Nothing -> Nothing
+-}
+funResultTy _ _ = Nothing
 
 -- | Force a 'TypeRep' to normal form.
 rnfTypeRep :: TypeRep -> ()
diff --git a/libraries/ghci/GHCi/TH/Binary.hs b/libraries/ghci/GHCi/TH/Binary.hs
index 7ecc746..8d297a1 100644
--- a/libraries/ghci/GHCi/TH/Binary.hs
+++ b/libraries/ghci/GHCi/TH/Binary.hs
@@ -11,7 +11,6 @@ module GHCi.TH.Binary () where
 import Data.Binary
 import qualified Data.ByteString as B
 #if MIN_VERSION_base(4,9,0)
-import Control.Monad (when)
 import Type.Reflection
 import Type.Reflection.Unsafe
 import Data.Kind (Type)
@@ -91,6 +90,7 @@ putTypeRep (TRApp f x) = do
     put (1 :: Word8)
     putTypeRep f
     putTypeRep x
+putTypeRep _ = fail "putTypeRep: Impossible"
 
 getTypeRepX :: Get TypeRepX
 getTypeRepX = do
@@ -106,10 +106,13 @@ getTypeRepX = do
                 TypeRepX x <- getTypeRepX
                 case typeRepKind f of
                     TRFun arg _ ->
-                        case arg `eqTypeRep` x of
-                            Just HRefl ->
-                                pure $ TypeRepX $ mkTrApp f x
-                            _ -> fail "getTypeRepX: Kind mismatch"
+                        case (typeRep :: TypeRep Type) `eqTypeRep` arg of
+                            Just HRefl -> -- FIXME: Generalize (->)
+                                case arg `eqTypeRep` x of
+                                    Just HRefl ->
+                                        pure $ TypeRepX $ mkTrApp f x
+                                    _ -> fail "getTypeRepX: Kind mismatch"
+                            _ -> fail "getTypeRepX: Arrow of non-Type argument"
                     _ -> fail "getTypeRepX: Applied non-arrow type"
         _ -> fail "getTypeRepX: Invalid TypeRepX"
 



More information about the ghc-commits mailing list