Repository : ssh://darcs.haskell.org//srv/darcs/ghc On branch : master
http://hackage.haskell.org/trac/ghc/changeset/a327c140fd932302e5bb2252ef127c7027874bc0 >--------------------------------------------------------------- commit a327c140fd932302e5bb2252ef127c7027874bc0 Author: Ian Lynagh <[email protected]> Date: Tue Oct 9 22:27:26 2012 +0100 Whitespace only in simplCore/SimplMonad.lhs >--------------------------------------------------------------- compiler/simplCore/SimplMonad.lhs | 77 +++++++++++++++++-------------------- 1 files changed, 35 insertions(+), 42 deletions(-) diff --git a/compiler/simplCore/SimplMonad.lhs b/compiler/simplCore/SimplMonad.lhs index 9d98569..50d133f 100644 --- a/compiler/simplCore/SimplMonad.lhs +++ b/compiler/simplCore/SimplMonad.lhs @@ -4,32 +4,25 @@ \section[SimplMonad]{The simplifier Monad} \begin{code} -{-# OPTIONS -fno-warn-tabs #-} --- The above warning supression flag is a temporary kludge. --- While working on this module you are encouraged to remove it and --- detab the module (please do the detabbing in a separate patch). See --- http://hackage.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#TabsvsSpaces --- for details - module SimplMonad ( - -- The monad - SimplM, - initSmpl, - getSimplRules, getFamEnvs, + -- The monad + SimplM, + initSmpl, + getSimplRules, getFamEnvs, -- Unique supply MonadUnique(..), newId, - -- Counting - SimplCount, tick, freeTick, checkedTick, - getSimplCount, zeroSimplCount, pprSimplCount, + -- Counting + SimplCount, tick, freeTick, checkedTick, + getSimplCount, zeroSimplCount, pprSimplCount, plusSimplCount, isZeroSimplCount ) where -import Id ( Id, mkSysLocal ) +import Id ( Id, mkSysLocal ) import Type ( Type ) -import FamInstEnv ( FamInstEnv ) -import Rules ( RuleBase ) +import FamInstEnv ( FamInstEnv ) +import Rules ( RuleBase ) import UniqSupply import DynFlags import CoreMonad @@ -39,9 +32,9 @@ import MonadUtils \end{code} %************************************************************************ -%* * +%* * \subsection{Monad plumbing} -%* * +%* * %************************************************************************ For the simplifier monad, we want to {\em thread} a unique supply and a counter. @@ -49,35 +42,35 @@ For the simplifier monad, we want to {\em thread} a unique supply and a counter. \begin{code} newtype SimplM result - = SM { unSM :: SimplTopEnv -- Envt that does not change much - -> UniqSupply -- We thread the unique supply because - -- constantly splitting it is rather expensive - -> SimplCount - -> IO (result, UniqSupply, SimplCount)} + = SM { unSM :: SimplTopEnv -- Envt that does not change much + -> UniqSupply -- We thread the unique supply because + -- constantly splitting it is rather expensive + -> SimplCount + -> IO (result, UniqSupply, SimplCount)} -- we only need IO here for dump output data SimplTopEnv - = STE { st_flags :: DynFlags - , st_max_ticks :: Int -- Max #ticks in this simplifier run - -- Zero means infinity! - , st_rules :: RuleBase - , st_fams :: (FamInstEnv, FamInstEnv) } + = STE { st_flags :: DynFlags + , st_max_ticks :: Int -- Max #ticks in this simplifier run + -- Zero means infinity! + , st_rules :: RuleBase + , st_fams :: (FamInstEnv, FamInstEnv) } \end{code} \begin{code} initSmpl :: DynFlags -> RuleBase -> (FamInstEnv, FamInstEnv) - -> UniqSupply -- No init count; set to 0 - -> Int -- Size of the bindings, used to limit + -> UniqSupply -- No init count; set to 0 + -> Int -- Size of the bindings, used to limit -- the number of ticks we allow - -> SimplM a - -> IO (a, SimplCount) + -> SimplM a + -> IO (a, SimplCount) initSmpl dflags rules fam_envs us size m = do (result, _, count) <- unSM m env us (zeroSimplCount dflags) return (result, count) where env = STE { st_flags = dflags, st_rules = rules - , st_max_ticks = computeMaxTicks dflags size + , st_max_ticks = computeMaxTicks dflags size , st_fams = fam_envs } computeMaxTicks :: DynFlags -> Int -> Int @@ -94,10 +87,10 @@ computeMaxTicks dflags size tick_factor = simplTickFactor dflags base_size = 100 magic_multiplier = 40 - -- MAGIC NUMBER, multiplies the simplTickFactor - -- We can afford to be generous; this is really - -- just checking for loops, and shouldn't usually fire - -- A figure of 20 was too small: see Trac #553 + -- MAGIC NUMBER, multiplies the simplTickFactor + -- We can afford to be generous; this is really + -- just checking for loops, and shouldn't usually fire + -- A figure of 20 was too small: see Trac #553 {-# INLINE thenSmpl #-} {-# INLINE thenSmpl_ #-} @@ -132,9 +125,9 @@ thenSmpl_ m k %************************************************************************ -%* * +%* * \subsection{The unique supply} -%* * +%* * %************************************************************************ \begin{code} @@ -172,9 +165,9 @@ newId fs ty = do uniq <- getUniqueM %************************************************************************ -%* * +%* * \subsection{Counting up what we've done} -%* * +%* * %************************************************************************ \begin{code} _______________________________________________ Cvs-ghc mailing list [email protected] http://www.haskell.org/mailman/listinfo/cvs-ghc
