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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/565f97b296c52dffeaeb696f99df7ad0d03b7040

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

commit 565f97b296c52dffeaeb696f99df7ad0d03b7040
Author: David Terei <[email protected]>
Date:   Tue Dec 13 16:39:03 2011 -0800

    Tabs -> Spaces

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

 ghc/GhciMonad.hs |   58 ++++++++++++++++++++++++-----------------------------
 1 files changed, 26 insertions(+), 32 deletions(-)

diff --git a/ghc/GhciMonad.hs b/ghc/GhciMonad.hs
index 41b9c72..be9a9f6 100644
--- a/ghc/GhciMonad.hs
+++ b/ghc/GhciMonad.hs
@@ -1,13 +1,6 @@
 {-# OPTIONS_GHC -fno-cse -fno-warn-orphans #-}
 -- -fno-cse is needed for GLOBAL_VAR's to behave properly
 
-{-# 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#TabsvsSp
--- for details
-
 -----------------------------------------------------------------------------
 --
 -- Monadery code used in InteractiveUI
@@ -57,12 +50,12 @@ type Command = (String, String -> InputT GHCi Bool, 
CompletionFunc GHCi)
 
 data GHCiState = GHCiState
      { 
-       progname       :: String,
-       args           :: [String],
+        progname       :: String,
+        args           :: [String],
         prompt         :: String,
-       editor         :: String,
+        editor         :: String,
         stop           :: String,
-       options        :: [GHCiOption],
+        options        :: [GHCiOption],
         line_number    :: !Int,         -- input line
         break_ctr      :: !Int,
         breaks         :: ![(Int, BreakLocation)],
@@ -98,11 +91,11 @@ data GHCiState = GHCiState
 type TickArray = Array Int [(BreakIndex,SrcSpan)]
 
 data GHCiOption 
-       = ShowTiming            -- show time/allocs after evaluation
-       | ShowType              -- show the type of expressions
-       | RevertCAFs            -- revert CAFs after every evaluation
+        = ShowTiming            -- show time/allocs after evaluation
+        | ShowType              -- show the type of expressions
+        | RevertCAFs            -- revert CAFs after every evaluation
         | Multiline             -- use multiline commands
-       deriving Eq
+        deriving Eq
 
 data BreakLocation
    = BreakLocation
@@ -294,26 +287,26 @@ timeIt :: InputT GHCi a -> InputT GHCi a
 timeIt action
   = do b <- lift $ isOptionSet ShowTiming
        if not b 
-         then action 
-         else do allocs1 <- liftIO $ getAllocations
-                 time1   <- liftIO $ getCPUTime
-                 a <- action
-                 allocs2 <- liftIO $ getAllocations
-                 time2   <- liftIO $ getCPUTime
-                 liftIO $ printTimes (fromIntegral (allocs2 - allocs1)) 
-                                 (time2 - time1)
-                 return a
+          then action
+          else do allocs1 <- liftIO $ getAllocations
+                  time1   <- liftIO $ getCPUTime
+                  a <- action
+                  allocs2 <- liftIO $ getAllocations
+                  time2   <- liftIO $ getCPUTime
+                  liftIO $ printTimes (fromIntegral (allocs2 - allocs1))
+                                  (time2 - time1)
+                  return a
 
 foreign import ccall unsafe "getAllocations" getAllocations :: IO Int64
-       -- defined in ghc/rts/Stats.c
+        -- defined in ghc/rts/Stats.c
 
 printTimes :: Integer -> Integer -> IO ()
 printTimes allocs psecs
    = do let secs = (fromIntegral psecs / (10^(12::Integer))) :: Float
-           secs_str = showFFloat (Just 2) secs
-       putStrLn (showSDoc (
-                parens (text (secs_str "") <+> text "secs" <> comma <+> 
-                        text (show allocs) <+> text "bytes")))
+            secs_str = showFFloat (Just 2) secs
+        putStrLn (showSDoc (
+                 parens (text (secs_str "") <+> text "secs" <> comma <+>
+                         text (show allocs) <+> text "bytes")))
 
 -----------------------------------------------------------------------------
 -- reverting CAFs
@@ -323,11 +316,11 @@ revertCAFs = do
   liftIO rts_revertCAFs
   s <- getGHCiState
   when (not (ghc_e s)) $ liftIO turnOffBuffering
-       -- Have to turn off buffering again, because we just 
-       -- reverted stdout, stderr & stdin to their defaults.
+        -- Have to turn off buffering again, because we just
+        -- reverted stdout, stderr & stdin to their defaults.
 
 foreign import ccall "revertCAFs" rts_revertCAFs  :: IO ()  
-       -- Make it "safe", just in case
+        -- Make it "safe", just in case
 
 -----------------------------------------------------------------------------
 -- To flush buffers for the *interpreted* computation we need
@@ -383,3 +376,4 @@ getHandle :: IORef (Ptr ()) -> IO Handle
 getHandle ref = do
   (Ptr addr) <- readIORef ref
   case addrToAny# addr of (# hval #) -> return (unsafeCoerce# hval)
+



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

Reply via email to