Repository : ssh://darcs.haskell.org//srv/darcs/packages/primitive

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/d03de54d4d0b4804b28a4fe86a0706455dfc26b8

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

commit d03de54d4d0b4804b28a4fe86a0706455dfc26b8
Author: ulf.norell <[email protected]>
Date:   Tue Aug 30 14:45:18 2011 +0000

    fixed argument order to fillByteArray to comply with documentation

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

 Data/Primitive/ByteArray.hs |    2 +-
 1 files changed, 1 insertions(+), 1 deletions(-)

diff --git a/Data/Primitive/ByteArray.hs b/Data/Primitive/ByteArray.hs
index c884ee2..a7ba137 100644
--- a/Data/Primitive/ByteArray.hs
+++ b/Data/Primitive/ByteArray.hs
@@ -212,7 +212,7 @@ fillByteArray
                  -> Word8               -- ^ value to fill with
                  -> m ()
 {-# INLINE fillByteArray #-}
-fillByteArray (MutableByteArray dst#) doff c sz
+fillByteArray (MutableByteArray dst#) doff sz c
   = unsafePrimToPrim
   $ memset_mba dst# (fromIntegral doff) (fromIntegral c) (fromIntegral sz)
 



_______________________________________________
Cvs-libraries mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-libraries

Reply via email to