Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : 

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

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

commit c5eac68f8da61170f3b8f167d3ff5d5b938b14d3
Author: Max Bolingbroke <batterseapo...@hotmail.com>
Date:   Mon Jan 16 16:15:16 2012 +0000

    Fix SAT

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

 compiler/supercompile/Supercompile/Utilities.hs |    4 ++--
 1 files changed, 2 insertions(+), 2 deletions(-)

diff --git a/compiler/supercompile/Supercompile/Utilities.hs 
b/compiler/supercompile/Supercompile/Utilities.hs
index fedfce9..dfa1022 100644
--- a/compiler/supercompile/Supercompile/Utilities.hs
+++ b/compiler/supercompile/Supercompile/Utilities.hs
@@ -542,7 +542,7 @@ zipWithEqualM :: Monad m => (a -> b -> m c) -> [a] -> [b] 
-> m [c]
 zipWithEqualM f = go
   where
     go []     []     = return []
-    go (x:xs) (y:ys) = liftM2 (:) (f x y) (zipWithEqualM f xs ys)
+    go (x:xs) (y:ys) = liftM2 (:) (f x y) (go xs ys)
     go _ _ = fail "zipWithEqualM"
 
 {-# INLINE foldZipEqualM #-}
@@ -550,7 +550,7 @@ foldZipEqualM :: Monad m => (a -> b -> c -> m a) -> a -> 
[b] -> [c] -> m a
 foldZipEqualM f = go
   where
    go acc []     []     = return acc
-   go acc (x:xs) (y:ys) = f acc x y >>= \acc' -> foldZipEqualM f acc' xs ys
+   go acc (x:xs) (y:ys) = f acc x y >>= \acc' -> go acc' xs ys
    go _ _ _ = fail "foldZipEqualM"
 
 



_______________________________________________
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to