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

On branch  : master

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

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

commit cde720262463d96b57c14b9974757c129d0a3a7f
Author: Johan Tibell <[email protected]>
Date:   Tue Nov 22 10:33:50 2011 -0800

    -Wall police

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

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

diff --git a/Data/IntSet.hs b/Data/IntSet.hs
index 61b7e84..e3dfa98 100644
--- a/Data/IntSet.hs
+++ b/Data/IntSet.hs
@@ -1318,7 +1318,7 @@ foldr'Bits prefix f z bm = let lb = lowestBitSet bm
     Derrick Lehmer and published in 1964 in a book edited by Beckenbach.)"
 ----------------------------------------------------------------------}
 bitcount :: Int -> Word -> Int
-bitcount a x = go a x
+bitcount a0 x0 = go a0 x0
   where go a 0 = a
         go a x = go (a + 1) (x .&. (x-1))
 {-# INLINE bitcount #-}



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

Reply via email to