[commit: packages/binary] master: Specify IEEE-754 in the haddocks for the new Float/Double functions. (15649b6)

git at git.haskell.org git at git.haskell.org
Sat Feb 4 21:17:56 UTC 2017


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

On branch  : master
Link       : http://git.haskell.org/packages/binary.git/commitdiff/15649b6e28e573e157beeeb4abfeddc11b824317

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

commit 15649b6e28e573e157beeeb4abfeddc11b824317
Author: Lennart Kolmodin <kolmodin at gmail.com>
Date:   Wed Jun 1 22:15:14 2016 +0200

    Specify IEEE-754 in the haddocks for the new Float/Double functions.


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

15649b6e28e573e157beeeb4abfeddc11b824317
 src/Data/Binary/Get.hs | 12 ++++++------
 src/Data/Binary/Put.hs | 12 ++++++------
 2 files changed, 12 insertions(+), 12 deletions(-)

diff --git a/src/Data/Binary/Get.hs b/src/Data/Binary/Get.hs
index a5282d6..dcabf72 100644
--- a/src/Data/Binary/Get.hs
+++ b/src/Data/Binary/Get.hs
@@ -622,32 +622,32 @@ getInt64host = getPtr  (sizeOf (undefined :: Int64))
 ------------------------------------------------------------------------
 -- Double/Float reads
 
--- | Read a 'Float' in big endian format.
+-- | Read a 'Float' in big endian IEEE-754 format.
 getFloatbe :: Get Float
 getFloatbe = wordToFloat <$> getWord32be
 {-# INLINE getFloatbe #-}
 
--- | Read a 'Float' in little endian format.
+-- | Read a 'Float' in little endian IEEE-754 format.
 getFloatle :: Get Float
 getFloatle = wordToFloat <$> getWord32le
 {-# INLINE getFloatle #-}
 
--- | Read a 'Float' in native host order and host endianess.
+-- | Read a 'Float' in IEEE-754 format and host endian.
 getFloathost :: Get Float
 getFloathost = wordToFloat <$> getWord32host
 {-# INLINE getFloathost #-}
 
--- | Read a 'Double' in big endian format.
+-- | Read a 'Double' in big endian IEEE-754 format.
 getDoublebe :: Get Double
 getDoublebe = wordToDouble <$> getWord64be
 {-# INLINE getDoublebe #-}
 
--- | Read a 'Double' in little endian format.
+-- | Read a 'Double' in little endian IEEE-754 format.
 getDoublele :: Get Double
 getDoublele = wordToDouble <$> getWord64le
 {-# INLINE getDoublele #-}
 
--- | Read a 'Double' in native host order and host endianess.
+-- | Read a 'Double' in IEEE-754 format and host endian.
 getDoublehost :: Get Double
 getDoublehost = wordToDouble <$> getWord64host
 {-# INLINE getDoublehost #-}
diff --git a/src/Data/Binary/Put.hs b/src/Data/Binary/Put.hs
index de18ab0..32fb618 100644
--- a/src/Data/Binary/Put.hs
+++ b/src/Data/Binary/Put.hs
@@ -357,32 +357,32 @@ putInt64host       = tell . B.putInt64host
 ------------------------------------------------------------------------
 -- Floats/Doubles
 
--- | Write a 'Float' in big endian format.
+-- | Write a 'Float' in big endian IEEE-754 format.
 putFloatbe :: Float -> Put
 putFloatbe = putWord32be . floatToWord
 {-# INLINE putFloatbe #-}
 
--- | Write a 'Float' in little endian format.
+-- | Write a 'Float' in little endian IEEE-754 format.
 putFloatle :: Float -> Put
 putFloatle = putWord32le . floatToWord
 {-# INLINE putFloatle #-}
 
--- | Write a 'Float' in native host order and host endianness.
+-- | Write a 'Float' in native in IEEE-754 format and host endian.
 putFloathost :: Float -> Put
 putFloathost = putWord32host . floatToWord
 {-# INLINE putFloathost #-}
 
--- | Write a 'Double' in big endian format.
+-- | Write a 'Double' in big endian IEEE-754 format.
 putDoublebe :: Double -> Put
 putDoublebe = putWord64be . doubleToWord
 {-# INLINE putDoublebe #-}
 
--- | Write a 'Double' in little endian format.
+-- | Write a 'Double' in little endian IEEE-754 format.
 putDoublele :: Double -> Put
 putDoublele = putWord64le . doubleToWord
 {-# INLINE putDoublele #-}
 
--- | Write a 'Double' in native host order and host endianness.
+-- | Write a 'Double' in native in IEEE-754 format and host endian.
 putDoublehost :: Double -> Put
 putDoublehost = putWord64host . doubleToWord
 {-# INLINE putDoublehost #-}



More information about the ghc-commits mailing list