[commit: nofib] master: De-tab CmdLine.hs (dfa9f91)

git at git.haskell.org git at git.haskell.org
Thu Apr 28 10:58:25 UTC 2016


Repository : ssh://git@git.haskell.org/nofib

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/dfa9f9158943d2c441add8ccd4309c1b93fb347a/nofib

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

commit dfa9f9158943d2c441add8ccd4309c1b93fb347a
Author: Joachim Breitner <mail at joachim-breitner.de>
Date:   Thu Apr 28 13:01:27 2016 +0200

    De-tab CmdLine.hs


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

dfa9f9158943d2c441add8ccd4309c1b93fb347a
 nofib-analyse/CmdLine.hs | 30 +++++++++++++++---------------
 1 file changed, 15 insertions(+), 15 deletions(-)

diff --git a/nofib-analyse/CmdLine.hs b/nofib-analyse/CmdLine.hs
index d65d6ac..415ce4b 100644
--- a/nofib-analyse/CmdLine.hs
+++ b/nofib-analyse/CmdLine.hs
@@ -13,8 +13,8 @@ module CmdLine
     where
 
 import System.Console.GetOpt
-import System.Environment	( getArgs )
-import System.IO.Unsafe		( unsafePerformIO )
+import System.Environment       ( getArgs )
+import System.IO.Unsafe         ( unsafePerformIO )
 
 -----------------------------------------------------------------------------
 -- Command line arguments
@@ -31,8 +31,8 @@ default_tooquick_threshold, tooquick_threshold :: Float
 default_tooquick_threshold = 0.2 {- secs -}
 tooquick_threshold
  = case [ i | OptIgnoreSmallTimes i <- flags ] of
-	[] -> default_tooquick_threshold
-	(i:_) -> i
+        [] -> default_tooquick_threshold
+        (i:_) -> i
 
 devs, nodevs :: Bool
 devs   = OptDeviations   `elem` flags
@@ -69,29 +69,29 @@ usage = usageInfo usageHeader argInfo
 argInfo :: [ OptDescr CLIFlags ]
 argInfo =
   [ Option ['?'] ["help"]    (NoArg OptHelp)
-	"Display this message"
+        "Display this message"
   , Option ['a'] ["ascii"]   (NoArg OptASCIIOutput)
-	"Produce ASCII output (default)"
+        "Produce ASCII output (default)"
   , Option ['i'] ["ignore"]  (ReqArg (OptIgnoreSmallTimes . read) "secs")
-	"Ignore runtimes smaller than <secs>"
+        "Ignore runtimes smaller than <secs>"
   , Option ['d'] ["deviations"] (NoArg OptDeviations)
-	"Display deviations (default)"
+        "Display deviations (default)"
   , Option ['l'] ["latex"]    (OptArg OptLaTeXOutput "TABLE")
-	"Produce LaTeX output"
+        "Produce LaTeX output"
   , Option [] ["columns"] (ReqArg OptColumns "COLUMNS")
-	"Specify columns for summary table (comma separates)"
+        "Specify columns for summary table (comma separates)"
   , Option [] ["rows"] (ReqArg OptRows "ROWS")
-	"Specify rows for summary table (comma separates)"
+        "Specify rows for summary table (comma separates)"
   , Option [] ["csv"] (ReqArg OptCSV "TABLE")
-	"Output a single table in CSV format"
+        "Output a single table in CSV format"
   , Option [] ["normalise"] (ReqArg OptNormalise "percent|ratio|none")
-	"normalise to the baseline"
+        "normalise to the baseline"
   , Option [] ["stddev"] (NoArg OptStdDev)
         "include standard deviations in CSV output"
   , Option ['n'] ["nodeviations"] (NoArg OptNoDeviations)
-	"Hide deviations"
+        "Hide deviations"
   , Option ['t'] ["title"] (ReqArg OptTitle "title")
-	"Specify report title"
+        "Specify report title"
   , Option ['b'] ["include-baseline"] (NoArg OptShowBaseline)
         "Include the baseline column (LaTeX)"
   ]



More information about the ghc-commits mailing list