[commit: ghc] master: [ci skip] iface: detabify/dewhitespace IfaceSyn (c315702)

git at git.haskell.org git at git.haskell.org
Fri Sep 26 04:07:32 UTC 2014


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

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

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

commit c315702fb164346b198298dfcc06aeb350e9cc43
Author: Austin Seipp <austin at well-typed.com>
Date:   Thu Sep 25 23:03:53 2014 -0500

    [ci skip] iface: detabify/dewhitespace IfaceSyn
    
    Signed-off-by: Austin Seipp <austin at well-typed.com>


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

c315702fb164346b198298dfcc06aeb350e9cc43
 compiler/iface/IfaceSyn.lhs | 42 ++++++++++++++++++------------------------
 1 file changed, 18 insertions(+), 24 deletions(-)

diff --git a/compiler/iface/IfaceSyn.lhs b/compiler/iface/IfaceSyn.lhs
index 6fec398..e45fac2 100644
--- a/compiler/iface/IfaceSyn.lhs
+++ b/compiler/iface/IfaceSyn.lhs
@@ -5,12 +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 IfaceSyn (
         module IfaceType,
@@ -113,16 +107,16 @@ data IfaceDecl
                 ifSynKind :: IfaceKind,         -- Kind of the *rhs* (not of the tycon)
                 ifSynRhs  :: IfaceSynTyConRhs }
 
-  | IfaceClass { ifCtxt    :: IfaceContext,          	-- Context...
-                 ifName    :: IfaceTopBndr,          	-- Name of the class TyCon
-                 ifTyVars  :: [IfaceTvBndr],         	-- Type variables
-                 ifRoles   :: [Role],                	-- Roles
-                 ifFDs     :: [FunDep FastString],   	-- Functional dependencies
+  | IfaceClass { ifCtxt    :: IfaceContext,             -- Context...
+                 ifName    :: IfaceTopBndr,             -- Name of the class TyCon
+                 ifTyVars  :: [IfaceTvBndr],            -- Type variables
+                 ifRoles   :: [Role],                   -- Roles
+                 ifFDs     :: [FunDep FastString],      -- Functional dependencies
                  ifATs     :: [IfaceAT],                -- Associated type families
                  ifSigs    :: [IfaceClassOp],           -- Method signatures
                  ifMinDef  :: BooleanFormula IfLclName, -- Minimal complete definition
-                 ifRec     :: RecFlag           	-- Is newtype/datatype associated
-                                                	--   with the class recursive?
+                 ifRec     :: RecFlag                   -- Is newtype/datatype associated
+                                                        --   with the class recursive?
     }
 
   | IfaceAxiom { ifName       :: IfaceTopBndr,        -- Axiom name
@@ -491,12 +485,12 @@ data IfaceExpr
   | IfaceExt    IfExtName
   | IfaceType   IfaceType
   | IfaceCo     IfaceCoercion
-  | IfaceTuple 	TupleSort [IfaceExpr]	-- Saturated; type arguments omitted
-  | IfaceLam 	IfaceBndr IfaceExpr
-  | IfaceApp 	IfaceExpr IfaceExpr
-  | IfaceCase	IfaceExpr IfLclName [IfaceAlt]
+  | IfaceTuple  TupleSort [IfaceExpr]   -- Saturated; type arguments omitted
+  | IfaceLam    IfaceBndr IfaceExpr
+  | IfaceApp    IfaceExpr IfaceExpr
+  | IfaceCase   IfaceExpr IfLclName [IfaceAlt]
   | IfaceECase  IfaceExpr IfaceType     -- See Note [Empty case alternatives]
-  | IfaceLet	IfaceBinding  IfaceExpr
+  | IfaceLet    IfaceBinding  IfaceExpr
   | IfaceCast   IfaceExpr IfaceCoercion
   | IfaceLit    Literal
   | IfaceFCall  ForeignCall IfaceType
@@ -1008,15 +1002,15 @@ pprIfaceExpr add_par (IfaceECase scrut ty)
 
 pprIfaceExpr add_par (IfaceCase scrut bndr [(con, bs, rhs)])
   = add_par (sep [ptext (sLit "case")
-			<+> pprIfaceExpr noParens scrut <+> ptext (sLit "of") 
-			<+> ppr bndr <+> char '{' <+> ppr_con_bs con bs <+> arrow,
-  		  pprIfaceExpr noParens rhs <+> char '}'])
+                        <+> pprIfaceExpr noParens scrut <+> ptext (sLit "of")
+                        <+> ppr bndr <+> char '{' <+> ppr_con_bs con bs <+> arrow,
+                  pprIfaceExpr noParens rhs <+> char '}'])
 
 pprIfaceExpr add_par (IfaceCase scrut bndr alts)
   = add_par (sep [ptext (sLit "case")
-		 	<+> pprIfaceExpr noParens scrut <+> ptext (sLit "of") 
-			<+> ppr bndr <+> char '{',
-  		  nest 2 (sep (map ppr_alt alts)) <+> char '}'])
+                        <+> pprIfaceExpr noParens scrut <+> ptext (sLit "of")
+                        <+> ppr bndr <+> char '{',
+                  nest 2 (sep (map ppr_alt alts)) <+> char '}'])
 
 pprIfaceExpr _       (IfaceCast expr co)
   = sep [pprParendIfaceExpr expr,



More information about the ghc-commits mailing list