[commit: packages/binary] master: Fix documentation (03332c4)

git at git.haskell.org git at git.haskell.org
Tue Feb 2 21:04:26 UTC 2016


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

On branch  : master
Link       : http://git.haskell.org/packages/binary.git/commitdiff/03332c4784cda1ce5015092c8b13fab5dbd22e89

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

commit 03332c4784cda1ce5015092c8b13fab5dbd22e89
Author: Alexey Khudyakov <alexey.skladnoy at gmail.com>
Date:   Thu Nov 12 13:40:58 2015 +0300

    Fix documentation


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

03332c4784cda1ce5015092c8b13fab5dbd22e89
 src/Data/Binary/Get.hs | 18 +++++++++---------
 src/Data/Binary/Put.hs | 18 +++++++++---------
 2 files changed, 18 insertions(+), 18 deletions(-)

diff --git a/src/Data/Binary/Get.hs b/src/Data/Binary/Get.hs
index df817cc..438fd13 100644
--- a/src/Data/Binary/Get.hs
+++ b/src/Data/Binary/Get.hs
@@ -446,7 +446,7 @@ getWord8 :: Get Word8
 getWord8 = readN 1 B.unsafeHead
 {-# INLINE getWord8 #-}
 
--- | Read Int8 from the monad state
+-- | Read an Int8 from the monad state
 getInt8 :: Get Int8
 getInt8 = fromIntegral <$> getWord8
 {-# INLINE getInt8 #-}
@@ -546,33 +546,33 @@ word64le = \s ->
 {-# INLINE word64le #-}
 
 
--- | Read a Int16 in big endian format
+-- | Read an Int16 in big endian format
 getInt16be :: Get Int16
 getInt16be = fromIntegral <$> getWord16be
 {-# INLINE getInt16be #-}
 
--- | Read a Int16 in big endian format
+-- | Read an Int32 in big endian format
 getInt32be :: Get Int32
 getInt32be =  fromIntegral <$> getWord32be
 {-# INLINE getInt32be #-}
 
--- | Read a Int16 in big endian format
+-- | Read an Int64 in big endian format
 getInt64be :: Get Int64
 getInt64be = fromIntegral <$> getWord64be
 {-# INLINE getInt64be #-}
 
 
--- | Read a Int16 in little endian format
+-- | Read an Int16 in little endian format
 getInt16le :: Get Int16
 getInt16le = fromIntegral <$> getWord16le
 {-# INLINE getInt16le #-}
 
--- | Read a Int32 in little endian format
+-- | Read an Int32 in little endian format
 getInt32le :: Get Int32
 getInt32le =  fromIntegral <$> getWord32le
 {-# INLINE getInt32le #-}
 
--- | Read a Int64 in little endian format
+-- | Read an Int64 in little endian format
 getInt64le :: Get Int64
 getInt64le = fromIntegral <$> getWord64le
 {-# INLINE getInt64le #-}
@@ -614,12 +614,12 @@ getInt16host :: Get Int16
 getInt16host = getPtr (sizeOf (undefined :: Int16))
 {-# INLINE getInt16host #-}
 
--- | /O(1)./ Read a Int32 in native host order and host endianness.
+-- | /O(1)./ Read an Int32 in native host order and host endianness.
 getInt32host :: Get Int32
 getInt32host = getPtr  (sizeOf (undefined :: Int32))
 {-# INLINE getInt32host #-}
 
--- | /O(1)./ Read a Int64 in native host order and host endianess.
+-- | /O(1)./ Read an Int64 in native host order and host endianess.
 getInt64host   :: Get Int64
 getInt64host = getPtr  (sizeOf (undefined :: Int64))
 {-# INLINE getInt64host #-}
diff --git a/src/Data/Binary/Put.hs b/src/Data/Binary/Put.hs
index c522940..7fd5986 100644
--- a/src/Data/Binary/Put.hs
+++ b/src/Data/Binary/Put.hs
@@ -201,32 +201,32 @@ putWord64le         :: Word64 -> Put
 putWord64le         = tell . B.putWord64le
 {-# INLINE putWord64le #-}
 
--- | Write a Int16 in big endian format
+-- | Write an Int16 in big endian format
 putInt16be         :: Int16 -> Put
 putInt16be         = tell . B.putInt16be
 {-# INLINE putInt16be #-}
 
--- | Write a Int16 in little endian format
+-- | Write an Int16 in little endian format
 putInt16le         :: Int16 -> Put
 putInt16le         = tell . B.putInt16le
 {-# INLINE putInt16le #-}
 
--- | Write a Int32 in big endian format
+-- | Write an Int32 in big endian format
 putInt32be         :: Int32 -> Put
 putInt32be         = tell . B.putInt32be
 {-# INLINE putInt32be #-}
 
--- | Write a Int32 in little endian format
+-- | Write an Int32 in little endian format
 putInt32le         :: Int32 -> Put
 putInt32le         = tell . B.putInt32le
 {-# INLINE putInt32le #-}
 
--- | Write a Int64 in big endian format
+-- | Write an Int64 in big endian format
 putInt64be         :: Int64 -> Put
 putInt64be         = tell . B.putInt64be
 {-# INLINE putInt64be #-}
 
--- | Write a Int64 in little endian format
+-- | Write an Int64 in little endian format
 putInt64le         :: Int64 -> Put
 putInt64le         = tell . B.putInt64le
 {-# INLINE putInt64le #-}
@@ -273,19 +273,19 @@ putInthost         :: Int -> Put
 putInthost         = tell . B.putInthost
 {-# INLINE putInthost #-}
 
--- | /O(1)./ Write a Int16 in native host order and host endianness.
+-- | /O(1)./ Write an Int16 in native host order and host endianness.
 -- For portability issues see @putInthost at .
 putInt16host       :: Int16 -> Put
 putInt16host       = tell . B.putInt16host
 {-# INLINE putInt16host #-}
 
--- | /O(1)./ Write a Int32 in native host order and host endianness.
+-- | /O(1)./ Write an Int32 in native host order and host endianness.
 -- For portability issues see @putInthost at .
 putInt32host       :: Int32 -> Put
 putInt32host       = tell . B.putInt32host
 {-# INLINE putInt32host #-}
 
--- | /O(1)./ Write a Int64 in native host order
+-- | /O(1)./ Write an Int64 in native host order
 -- On a 32 bit machine we write two host order Int32s, in big endian form.
 -- For portability issues see @putInthost at .
 putInt64host       :: Int64 -> Put



More information about the ghc-commits mailing list