[commit: ghc] master: prelude: detabify/unwhitespace PrelInfo (b5b1a2d)

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


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

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

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

commit b5b1a2dbd9f6f8057317ba36a65416a6d3daf475
Author: Austin Seipp <austin at well-typed.com>
Date:   Fri Jul 18 22:21:28 2014 -0500

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


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

b5b1a2dbd9f6f8057317ba36a65416a6d3daf475
 compiler/prelude/PrelInfo.lhs | 47 ++++++++++++++++++-------------------------
 1 file changed, 20 insertions(+), 27 deletions(-)

diff --git a/compiler/prelude/PrelInfo.lhs b/compiler/prelude/PrelInfo.lhs
index 829b5e3..eaefff2 100644
--- a/compiler/prelude/PrelInfo.lhs
+++ b/compiler/prelude/PrelInfo.lhs
@@ -5,13 +5,6 @@
 
 \begin{code}
 {-# 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 PrelInfo (
         wiredInIds, ghcPrimIds,
         primOpRules, builtinRules,
@@ -49,9 +42,9 @@ import Data.Array
 \end{code}
 
 %************************************************************************
-%*									*
+%*                                                                      *
 \subsection[builtinNameInfo]{Lookup built-in names}
-%*									*
+%*                                                                      *
 %************************************************************************
 
 Notes about wired in things
@@ -60,7 +53,7 @@ Notes about wired in things
   They are global values in GHC, (e.g.  listTyCon :: TyCon).
 
 * A wired in Name contains the thing itself inside the Name:
-	see Name.wiredInNameTyThing_maybe
+        see Name.wiredInNameTyThing_maybe
   (E.g. listTyConName contains listTyCon.
 
 * The name cache is initialised with (the names of) all wired-in things
@@ -80,15 +73,15 @@ wiredInThings :: [TyThing]
 -- get a Name with the correct known key (See Note [Known-key names])
 wiredInThings
   = concat
-    [		-- Wired in TyCons and their implicit Ids
-	  tycon_things
-	, concatMap implicitTyThings tycon_things
+    [           -- Wired in TyCons and their implicit Ids
+          tycon_things
+        , concatMap implicitTyThings tycon_things
 
-		-- Wired in Ids
-	, map AnId wiredInIds
+                -- Wired in Ids
+        , map AnId wiredInIds
 
-		-- PrimOps
-	, map (AnId . primOpId) allThePrimOps
+                -- PrimOps
+        , map (AnId . primOpId) allThePrimOps
     ]
   where
     tycon_things = map ATyCon ([funTyCon] ++ primTyCons ++ wiredInTyCons
@@ -100,16 +93,16 @@ sense of them in interface pragmas. It's cool, though they all have
 "non-standard" names, so they won't get past the parser in user code.
 
 %************************************************************************
-%*									*
-		PrimOpIds
-%*									*
+%*                                                                      *
+                PrimOpIds
+%*                                                                      *
 %************************************************************************
 
 \begin{code}
 primOpIds :: Array Int Id
 -- A cache of the PrimOp Ids, indexed by PrimOp tag
 primOpIds = array (1,maxPrimOpTag) [ (primOpTag op, mkPrimOpId op)
-				   | op <- allThePrimOps ]
+                                   | op <- allThePrimOps ]
 
 primOpId :: PrimOp -> Id
 primOpId op = primOpIds ! primOpTag op
@@ -117,9 +110,9 @@ primOpId op = primOpIds ! primOpTag op
 
 
 %************************************************************************
-%*									*
+%*                                                                      *
 \subsection{Export lists for pseudo-modules (GHC.Prim)}
-%*									*
+%*                                                                      *
 %************************************************************************
 
 GHC.Prim "exports" all the primops and primitive types, some
@@ -137,9 +130,9 @@ ghcPrimExports
 
 
 %************************************************************************
-%*									*
+%*                                                                      *
 \subsection{Built-in keys}
-%*									*
+%*                                                                      *
 %************************************************************************
 
 ToDo: make it do the ``like'' part properly (as in 0.26 and before).
@@ -152,9 +145,9 @@ maybeIntLikeCon  con = con `hasKey` intDataConKey
 
 
 %************************************************************************
-%*									*
+%*                                                                      *
 \subsection{Class predicates}
-%*									*
+%*                                                                      *
 %************************************************************************
 
 \begin{code}



More information about the ghc-commits mailing list