[commit: ghc] master: Comments only, mostly typos (ab0743f)

git at git.haskell.org git at git.haskell.org
Fri Apr 3 16:53:14 UTC 2015


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

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

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

commit ab0743f84aabc2b4f5681c09a3e11cb219d114e4
Author: Thomas Miedema <thomasmiedema at gmail.com>
Date:   Fri Apr 3 17:58:53 2015 +0200

    Comments only, mostly typos
    
    [skip ci]


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

ab0743f84aabc2b4f5681c09a3e11cb219d114e4
 compiler/hsSyn/HsExpr.hs         | 2 +-
 compiler/main/GhcMake.hs         | 2 +-
 compiler/simplCore/SimplMonad.hs | 2 +-
 compiler/types/TypeRep.hs        | 6 +++---
 ghc.mk                           | 6 +++---
 testsuite/tests/th/all.T         | 2 +-
 utils/ghc-pkg/Main.hs            | 4 +++-
 7 files changed, 13 insertions(+), 11 deletions(-)

diff --git a/compiler/hsSyn/HsExpr.hs b/compiler/hsSyn/HsExpr.hs
index 5c5e8e4..efefd17 100644
--- a/compiler/hsSyn/HsExpr.hs
+++ b/compiler/hsSyn/HsExpr.hs
@@ -772,7 +772,7 @@ However, some code is internally generated, and in some places
 parens are absolutely required; so for these places we use
 pprParendExpr (but don't print double parens of course).
 
-For operator applications we don't add parens, because the oprerator
+For operator applications we don't add parens, because the operator
 fixities should do the job, except in debug mode (-dppr-debug) so we
 can see the structure of the parse tree.
 -}
diff --git a/compiler/main/GhcMake.hs b/compiler/main/GhcMake.hs
index f9e61a5..818bb73 100644
--- a/compiler/main/GhcMake.hs
+++ b/compiler/main/GhcMake.hs
@@ -97,7 +97,7 @@ label_self thread_name = do
 --
 -- Note that each 'ModSummary' in the module graph caches its 'DynFlags'.
 -- These 'DynFlags' are determined by the /current/ session 'DynFlags' and the
--- @OPTIONS@ and @LANGUAGE@ pragmas of the parsed module.  Thus if you want to
+-- @OPTIONS@ and @LANGUAGE@ pragmas of the parsed module.  Thus if you want
 -- changes to the 'DynFlags' to take effect you need to call this function
 -- again.
 --
diff --git a/compiler/simplCore/SimplMonad.hs b/compiler/simplCore/SimplMonad.hs
index 7eb6a54..bd60a79 100644
--- a/compiler/simplCore/SimplMonad.hs
+++ b/compiler/simplCore/SimplMonad.hs
@@ -91,7 +91,7 @@ computeMaxTicks dflags size
         -- MAGIC NUMBER, multiplies the simplTickFactor
         -- We can afford to be generous; this is really
         -- just checking for loops, and shouldn't usually fire
-        -- A figure of 20 was too small: see Trac #553
+        -- A figure of 20 was too small: see Trac #5539.
 
 {-# INLINE thenSmpl #-}
 {-# INLINE thenSmpl_ #-}
diff --git a/compiler/types/TypeRep.hs b/compiler/types/TypeRep.hs
index c78c9c5..3e46de3 100644
--- a/compiler/types/TypeRep.hs
+++ b/compiler/types/TypeRep.hs
@@ -98,7 +98,7 @@ import qualified Data.Data        as Data hiding ( TyCon )
 data Type
   = TyVarTy Var -- ^ Vanilla type or kind variable (*never* a coercion variable)
 
-  | AppTy         -- See Note [AppTy invariant]
+  | AppTy         -- See Note [AppTy rep]
         Type
         Type            -- ^ Type application to something other than a 'TyCon'. Parameters:
                         --
@@ -107,10 +107,10 @@ data Type
                         --
                         --  2) Argument type
 
-  | TyConApp      -- See Note [AppTy invariant]
+  | TyConApp      -- See Note [AppTy rep]
         TyCon
         [KindOrType]    -- ^ Application of a 'TyCon', including newtypes /and/ synonyms.
-                        -- Invariant: saturated appliations of 'FunTyCon' must
+                        -- Invariant: saturated applications of 'FunTyCon' must
                         -- use 'FunTy' and saturated synonyms must use their own
                         -- constructors. However, /unsaturated/ 'FunTyCon's
                         -- do appear as 'TyConApp's.
diff --git a/ghc.mk b/ghc.mk
index 3638a1b..b9bba13 100644
--- a/ghc.mk
+++ b/ghc.mk
@@ -49,18 +49,18 @@
 #           o Build utils/ghc-pkg
 #           o Build utils/hsc2hs
 #     * For each package:
-#	    o configure, generate package-data.mk and inplace-pkg-info
+#	    o configure, generate package-data.mk and inplace-pkg-config
 #           o register each package into inplace/lib/package.conf
 #     * build libffi (if not disabled by --with-system-libffi)
 #     * With bootstrapping compiler:
 #	    o Build libraries/{filepath,hpc,Cabal}
 #           o Build compiler (stage 1)
-#     * With stage 1:
+#     * With stage 1 compiler:
 #           o Build libraries/*
 #	    o Build rts
 #           o Build utils/* (except haddock)
 #           o Build compiler (stage 2)
-#     * With stage 2:
+#     * With stage 2 compiler:
 #           o Build utils/haddock
 #           o Build compiler (stage 3) (optional)
 #     * With haddock:
diff --git a/testsuite/tests/th/all.T b/testsuite/tests/th/all.T
index 5b566cb..3bc7386 100644
--- a/testsuite/tests/th/all.T
+++ b/testsuite/tests/th/all.T
@@ -1,6 +1,6 @@
 
 # This test needs to come before the setTestOpts calls below, as we want
-# to run it if !compiler_profiled
+# to run it if compiler_profiled.
 test('T4255', unless(compiler_profiled(), skip), compile_fail, ['-v0'])
 
 def f(name, opts):
diff --git a/utils/ghc-pkg/Main.hs b/utils/ghc-pkg/Main.hs
index bf9de0f..1389723 100644
--- a/utils/ghc-pkg/Main.hs
+++ b/utils/ghc-pkg/Main.hs
@@ -325,7 +325,7 @@ data PackageArg
     -- match a single entry in the package database.
     | IPId InstalledPackageId
     -- | A glob against the package name.  The first string is the literal
-    -- glob, the second is a function which returns @True@ if the the argument
+    -- glob, the second is a function which returns @True@ if the argument
     -- matches.
     | Substring String (String->Bool)
 
@@ -2023,5 +2023,7 @@ removeFileSafe fn =
   removeFile fn `catchIO` \ e ->
     when (not $ isDoesNotExistError e) $ ioError e
 
+-- | Turn a path relative to the current directory into a (normalised)
+-- absolute path.
 absolutePath :: FilePath -> IO FilePath
 absolutePath path = return . normalise . (</> path) =<< getCurrentDirectory



More information about the ghc-commits mailing list