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

On branch  : master

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

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

commit b243d30b9cf5c78624f743f69e072a5dd46d9065
Merge: cd51b9c... 4f83f54...
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Mon Oct 22 09:11:17 2012 +0100

    Merge branch 'master' of http://darcs.haskell.org/ghc

 compiler/hsSyn/HsExpr.lhs        |  123 +++++++--------
 compiler/prelude/PrelRules.lhs   |   65 ++++++--
 compiler/simplCore/OccurAnal.lhs |  333 +++++++++++++++++++-------------------
 mk/build.mk.sample               |    4 +
 mk/config.mk.in                  |    3 +
 mk/ways.mk                       |    8 +-
 6 files changed, 289 insertions(+), 247 deletions(-)

diff --cc compiler/simplCore/OccurAnal.lhs
index 692b971,4705f6b..d75a224
--- a/compiler/simplCore/OccurAnal.lhs
+++ b/compiler/simplCore/OccurAnal.lhs
@@@ -436,12 -429,12 +429,12 @@@ We are in an infinite loop
  
  A more elaborate example (that I actually saw in practice when I went to
  mark GHC.List.filter as INLINABLE) is as follows. Say I have this module:
 -  {-# LANGUAGE Rank2Types #-}
 +  {-# LANGUAGE RankNTypes #-}
    module GHCList where
-   
+ 
    import Prelude hiding (filter)
    import GHC.Base (build)
-   
+ 
    {-# INLINABLE filter #-}
    filter :: (a -> Bool) -> [a] -> [a]
    filter p [] = []



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

Reply via email to