[commit: packages/binary] master: Fix comments. (6e1cb3b)

git at git.haskell.org git at git.haskell.org
Thu Apr 6 22:29:26 UTC 2017


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

On branch  : master
Link       : http://git.haskell.org/packages/binary.git/commitdiff/6e1cb3b10b344e82742d866605fbe33b0d55a172

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

commit 6e1cb3b10b344e82742d866605fbe33b0d55a172
Author: Lennart Kolmodin <kolmodin at google.com>
Date:   Sun Apr 2 18:47:27 2017 +0200

    Fix comments.


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

6e1cb3b10b344e82742d866605fbe33b0d55a172
 src/Data/Binary/Class.hs | 12 ++++++------
 1 file changed, 6 insertions(+), 6 deletions(-)

diff --git a/src/Data/Binary/Class.hs b/src/Data/Binary/Class.hs
index 03396ba..4d1c436 100644
--- a/src/Data/Binary/Class.hs
+++ b/src/Data/Binary/Class.hs
@@ -849,17 +849,17 @@ instance Binary a => Binary (NE.NonEmpty a) where
 -- * 'SomeTypeRep' (also known as 'Data.Typeable.TypeRep')
 --
 
--- | @since 0.9.0.0. See #typeable-instances#
+-- | @since 0.8.5.0. See #typeable-instances#
 instance Binary VecCount where
     put = putWord8 . fromIntegral . fromEnum
     get = toEnum . fromIntegral <$> getWord8
 
--- | @since 0.9.0.0. See #typeable-instances#
+-- | @since 0.8.5.0. See #typeable-instances#
 instance Binary VecElem where
     put = putWord8 . fromIntegral . fromEnum
     get = toEnum . fromIntegral <$> getWord8
 
--- | @since 0.9.0.0. See #typeable-instances#
+-- | @since 0.8.5.0. See #typeable-instances#
 instance Binary RuntimeRep where
     put (VecRep a b)    = putWord8 0 >> put a >> put b
     put (TupleRep reps) = putWord8 1 >> put reps
@@ -891,7 +891,7 @@ instance Binary RuntimeRep where
           11 -> pure DoubleRep
           _  -> fail "GHCi.TH.Binary.putRuntimeRep: invalid tag"
 
--- | @since 0.9.0.0. See #typeable-instances#
+-- | @since 0.8.5.0. See #typeable-instances#
 instance Binary TyCon where
     put tc = do
         put (tyConPackage tc)
@@ -901,7 +901,7 @@ instance Binary TyCon where
         put (tyConKindRep tc)
     get = mkTyCon <$> get <*> get <*> get <*> get <*> get
 
--- | @since 0.9.0.0. See #typeable-instances#
+-- | @since 0.8.5.0. See #typeable-instances#
 instance Binary KindRep where
     put (KindRepTyConApp tc k) = putWord8 0 >> put tc >> put k
     put (KindRepVar bndr) = putWord8 1 >> put bndr
@@ -921,7 +921,7 @@ instance Binary KindRep where
           5 -> KindRepTypeLit <$> get <*> get
           _ -> fail "GHCi.TH.Binary.putKindRep: invalid tag"
 
--- | @since 0.9.0.0. See #typeable-instances#
+-- | @since 0.8.5.0. See #typeable-instances#
 instance Binary TypeLitSort where
     put TypeLitSymbol = putWord8 0
     put TypeLitNat = putWord8 1



More information about the ghc-commits mailing list