[commit: ghc] wip/T9858-typeable-spj: Comments and white space (7078a11)

git at git.haskell.org git at git.haskell.org
Thu Mar 26 12:41:06 UTC 2015


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

On branch  : wip/T9858-typeable-spj
Link       : http://ghc.haskell.org/trac/ghc/changeset/7078a11f50e3af9139dd5ceef032e89047677833/ghc

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

commit 7078a11f50e3af9139dd5ceef032e89047677833
Author: Simon Peyton Jones <simonpj at microsoft.com>
Date:   Fri Mar 20 12:36:22 2015 +0000

    Comments and white space


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

7078a11f50e3af9139dd5ceef032e89047677833
 compiler/basicTypes/Id.hs   | 7 +++----
 compiler/coreSyn/MkCore.hs  | 1 +
 compiler/iface/LoadIface.hs | 3 ++-
 3 files changed, 6 insertions(+), 5 deletions(-)

diff --git a/compiler/basicTypes/Id.hs b/compiler/basicTypes/Id.hs
index 2a97445..ea2ef49 100644
--- a/compiler/basicTypes/Id.hs
+++ b/compiler/basicTypes/Id.hs
@@ -307,9 +307,8 @@ mkTemplateLocals = mkTemplateLocalsNum 1
 mkTemplateLocalsNum :: Int -> [Type] -> [Id]
 mkTemplateLocalsNum n tys = zipWith mkTemplateLocal [n..] tys
 
-{-
-Note [Exported LocalIds]
-~~~~~~~~~~~~~~~~~~~~~~~~
+{- Note [Exported LocalIds]
+~~~~~~~~~~~~~~~~~~~~~~~~~~~
 We use mkExportedLocalId for things like
  - Dictionary functions (DFunId)
  - Wrapper and matcher Ids for pattern synonyms
@@ -323,7 +322,7 @@ code by the occurrence analyser.  (But "exported" here does not mean
 "brought into lexical scope by an import declaration". Indeed these
 things are always internal Ids that the user never sees.)
 
-It's very important that they are *LocalIds*, not GlobalIs, for lots
+It's very important that they are *LocalIds*, not GlobalIds, for lots
 of reasons:
 
  * We want to treat them as free variables for the purpose of
diff --git a/compiler/coreSyn/MkCore.hs b/compiler/coreSyn/MkCore.hs
index 6905641..915188a 100644
--- a/compiler/coreSyn/MkCore.hs
+++ b/compiler/coreSyn/MkCore.hs
@@ -274,6 +274,7 @@ mkCharExpr c = mkConApp charDataCon [mkCharLit c]
 
 -- | Create a 'CoreExpr' which will evaluate to the given @String@
 mkStringExpr   :: MonadThings m => String     -> m CoreExpr  -- Result :: String
+
 -- | Create a 'CoreExpr' which will evaluate to a string morally equivalent to the given @FastString@
 mkStringExprFS :: MonadThings m => FastString -> m CoreExpr  -- Result :: String
 
diff --git a/compiler/iface/LoadIface.hs b/compiler/iface/LoadIface.hs
index 169e929..b1d7556 100644
--- a/compiler/iface/LoadIface.hs
+++ b/compiler/iface/LoadIface.hs
@@ -190,6 +190,7 @@ checkWiredInTyCon tc
   = return ()
   | otherwise
   = do  { mod <- getModule
+        ; traceIf (text "checkWiredInTyCon" <+> ppr tc_name $$ ppr mod)
         ; ASSERT( isExternalName tc_name )
           when (mod /= nameModule tc_name)
                (initIfaceTcRn (loadWiredInHomeIface tc_name))
@@ -354,7 +355,7 @@ loadInterfaceForModule doc m
 
 -- | An 'IfM' function to load the home interface for a wired-in thing,
 -- so that we're sure that we see its instance declarations and rules
--- See Note [Loading instances for wired-in things] in TcIface
+-- See Note [Loading instances for wired-in things]
 loadWiredInHomeIface :: Name -> IfM lcl ()
 loadWiredInHomeIface name
   = ASSERT( isWiredInName name )



More information about the ghc-commits mailing list