[commit: ghc] master: main: detabify/unwhitespace PprTyThing (3ccc80c)

git at git.haskell.org git at git.haskell.org
Sun Jul 20 21:56:58 UTC 2014


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

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/3ccc80cb2ed2c79243dbc9a1f981aac87163d060/ghc

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

commit 3ccc80cb2ed2c79243dbc9a1f981aac87163d060
Author: Austin Seipp <austin at well-typed.com>
Date:   Fri Jul 18 22:13:39 2014 -0500

    main: detabify/unwhitespace PprTyThing
    
    Signed-off-by: Austin Seipp <austin at well-typed.com>


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

3ccc80cb2ed2c79243dbc9a1f981aac87163d060
 compiler/main/PprTyThing.hs | 23 ++++++++---------------
 1 file changed, 8 insertions(+), 15 deletions(-)

diff --git a/compiler/main/PprTyThing.hs b/compiler/main/PprTyThing.hs
index d993ab8..eed4671 100644
--- a/compiler/main/PprTyThing.hs
+++ b/compiler/main/PprTyThing.hs
@@ -7,19 +7,12 @@
 -----------------------------------------------------------------------------
 
 {-# LANGUAGE CPP #-}
-{-# OPTIONS_GHC -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://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#TabsvsSpaces
--- for details
-
 module PprTyThing (
-	pprTyThing,
-	pprTyThingInContext,
-	pprTyThingLoc,
-	pprTyThingInContextLoc,
-	pprTyThingHdr,
+        pprTyThing,
+        pprTyThingInContext,
+        pprTyThingLoc,
+        pprTyThingInContextLoc,
+        pprTyThingHdr,
         pprTypeForUser,
         pprFamInst
   ) where
@@ -159,9 +152,9 @@ pprTypeForUser :: Type -> SDoc
 -- b) Swizzle the foralls to the top, so that without
 --    -fprint-explicit-foralls we'll suppress all the foralls
 -- Prime example: a class op might have type
---	forall a. C a => forall b. Ord b => stuff
+--      forall a. C a => forall b. Ord b => stuff
 -- Then we want to display
---	(C a, Ord b) => stuff
+--      (C a, Ord b) => stuff
 pprTypeForUser ty
   = pprSigmaType (mkSigmaTy tvs ctxt tau)
   where
@@ -175,6 +168,6 @@ pprTypeForUser ty
 showWithLoc :: SDoc -> SDoc -> SDoc
 showWithLoc loc doc
     = hang doc 2 (char '\t' <> comment <+> loc)
-		-- The tab tries to make them line up a bit
+                -- The tab tries to make them line up a bit
   where
     comment = ptext (sLit "--")



More information about the ghc-commits mailing list