[commit: ghc] master: [ci skip] typecheck: detabify/dewhitespace TcInstDecls (7567ad3)
git at git.haskell.org
git at git.haskell.org
Fri Sep 26 04:07:37 UTC 2014
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/7567ad3cd0fc7e4ac2e6068a9067219d3fbd0399/ghc
>---------------------------------------------------------------
commit 7567ad3cd0fc7e4ac2e6068a9067219d3fbd0399
Author: Austin Seipp <austin at well-typed.com>
Date: Thu Sep 25 23:05:20 2014 -0500
[ci skip] typecheck: detabify/dewhitespace TcInstDecls
Signed-off-by: Austin Seipp <austin at well-typed.com>
>---------------------------------------------------------------
7567ad3cd0fc7e4ac2e6068a9067219d3fbd0399
compiler/typecheck/TcInstDcls.lhs | 22 ++++++++--------------
1 file changed, 8 insertions(+), 14 deletions(-)
diff --git a/compiler/typecheck/TcInstDcls.lhs b/compiler/typecheck/TcInstDcls.lhs
index f559dda..70553ff 100644
--- a/compiler/typecheck/TcInstDcls.lhs
+++ b/compiler/typecheck/TcInstDcls.lhs
@@ -7,12 +7,6 @@ TcInstDecls: Typechecking instance declarations
\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 TcInstDcls ( tcInstDecls1, tcInstDecls2 ) where
@@ -558,8 +552,8 @@ tcClsInstDecl (L loc (ClsInstDecl { cid_poly_ty = poly_ty, cid_binds = binds
do defaultOverlapFlag <- getOverlapFlag
return $ setOverlapModeMaybe defaultOverlapFlag overlap_mode
; (subst, tyvars') <- tcInstSkolTyVars tyvars
- ; let dfun = mkDictFunId dfun_name tyvars theta clas inst_tys
- ispec = mkLocalInstance dfun overlap_flag tyvars' clas (substTys subst inst_tys)
+ ; let dfun = mkDictFunId dfun_name tyvars theta clas inst_tys
+ ispec = mkLocalInstance dfun overlap_flag tyvars' clas (substTys subst inst_tys)
-- Be sure to freshen those type variables,
-- so they are sure not to appear in any lookup
inst_info = InstInfo { iSpec = ispec
@@ -1355,13 +1349,13 @@ tcInstanceMethods dfun_id clas tyvars dfun_ev_vars inst_tys
mkGenericDefMethBind :: Class -> [Type] -> Id -> Name -> TcM (LHsBind Name)
mkGenericDefMethBind clas inst_tys sel_id dm_name
- = -- A generic default method
- -- If the method is defined generically, we only have to call the
+ = -- A generic default method
+ -- If the method is defined generically, we only have to call the
-- dm_name.
- do { dflags <- getDynFlags
- ; liftIO (dumpIfSet_dyn dflags Opt_D_dump_deriv "Filling in method body"
- (vcat [ppr clas <+> ppr inst_tys,
- nest 2 (ppr sel_id <+> equals <+> ppr rhs)]))
+ do { dflags <- getDynFlags
+ ; liftIO (dumpIfSet_dyn dflags Opt_D_dump_deriv "Filling in method body"
+ (vcat [ppr clas <+> ppr inst_tys,
+ nest 2 (ppr sel_id <+> equals <+> ppr rhs)]))
; return (noLoc $ mkTopFunBind Generated (noLoc (idName sel_id))
[mkSimpleMatch [] rhs]) }
More information about the ghc-commits
mailing list