[commit: ghc] master: Spelling in comments only [ci skip] (08a6fc6)

git at git.haskell.org git at git.haskell.org
Tue Mar 28 10:26:19 UTC 2017


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

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

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

commit 08a6fc69ce1617bb997cb02584a961ac29a266eb
Author: Gabor Greif <ggreif at gmail.com>
Date:   Tue Mar 28 11:59:48 2017 +0200

    Spelling in comments only [ci skip]


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

08a6fc69ce1617bb997cb02584a961ac29a266eb
 compiler/cmm/CmmImplementSwitchPlans.hs | 2 +-
 compiler/coreSyn/CoreLint.hs            | 2 +-
 compiler/ghci/ByteCodeGen.hs            | 2 +-
 compiler/prelude/TysPrim.hs             | 2 +-
 compiler/prelude/primops.txt.pp         | 2 +-
 compiler/simplCore/Simplify.hs          | 2 +-
 ghc/GHCi/UI.hs                          | 2 +-
 rts/linker/Elf.c                        | 2 +-
 rts/linker/MachO.c                      | 8 ++++----
 rts/linker/MachOTypes.h                 | 4 ++--
 10 files changed, 14 insertions(+), 14 deletions(-)

diff --git a/compiler/cmm/CmmImplementSwitchPlans.hs b/compiler/cmm/CmmImplementSwitchPlans.hs
index 225c77e..d378c66 100644
--- a/compiler/cmm/CmmImplementSwitchPlans.hs
+++ b/compiler/cmm/CmmImplementSwitchPlans.hs
@@ -21,7 +21,7 @@ import DynFlags
 -- CmmSwitch and returned as a SwitchPlan; here is just the implementation in
 -- terms of Cmm code. See Note [Cmm Switches, the general plan] in CmmSwitch.
 --
--- This division into different modules is both to clearly separte concerns,
+-- This division into different modules is both to clearly separate concerns,
 -- but also because createSwitchPlan needs access to the constructors of
 -- SwitchTargets, a data type exported abstractly by CmmSwitch.
 --
diff --git a/compiler/coreSyn/CoreLint.hs b/compiler/coreSyn/CoreLint.hs
index b97f97e..089a225 100644
--- a/compiler/coreSyn/CoreLint.hs
+++ b/compiler/coreSyn/CoreLint.hs
@@ -2198,7 +2198,7 @@ mkScrutMsg var var_ty scrut_ty subst
 
 mkNonDefltMsg, mkNonIncreasingAltsMsg :: CoreExpr -> MsgDoc
 mkNonDefltMsg e
-  = hang (text "Case expression with DEFAULT not at the beginnning") 4 (ppr e)
+  = hang (text "Case expression with DEFAULT not at the beginning") 4 (ppr e)
 mkNonIncreasingAltsMsg e
   = hang (text "Case expression with badly-ordered alternatives") 4 (ppr e)
 
diff --git a/compiler/ghci/ByteCodeGen.hs b/compiler/ghci/ByteCodeGen.hs
index 5484288..0033df1 100644
--- a/compiler/ghci/ByteCodeGen.hs
+++ b/compiler/ghci/ByteCodeGen.hs
@@ -139,7 +139,7 @@ Note [generating code for top-level string literal bindings]
 Here is a summary on how the byte code generator deals with top-level string
 literals:
 
-1. Top-level string literal bindings are spearted from the rest of the module.
+1. Top-level string literal bindings are separated from the rest of the module.
 
 2. The strings are allocated via iservCmd, in allocateTopStrings
 
diff --git a/compiler/prelude/TysPrim.hs b/compiler/prelude/TysPrim.hs
index cdc25e0..0732b56 100644
--- a/compiler/prelude/TysPrim.hs
+++ b/compiler/prelude/TysPrim.hs
@@ -235,7 +235,7 @@ mkTemplateTyVarsFrom :: Int -> [Kind] -> [TyVar]
 -- b  with unique (mkAlphaTyVarUnique n+1)
 -- ... etc
 -- Typically called as
---   mkTemplateTyVarsFrom (legth kv_bndrs) kinds
+--   mkTemplateTyVarsFrom (length kv_bndrs) kinds
 -- where kv_bndrs are the kind-level binders of a TyCon
 mkTemplateTyVarsFrom n kinds
   = [ mkTyVar name kind
diff --git a/compiler/prelude/primops.txt.pp b/compiler/prelude/primops.txt.pp
index a313920..41a725f 100644
--- a/compiler/prelude/primops.txt.pp
+++ b/compiler/prelude/primops.txt.pp
@@ -200,7 +200,7 @@ primop   IntMulMayOfloOp  "mulIntMayOflo#"
    {Return non-zero if there is any possibility that the upper word of a
     signed integer multiply might contain useful information.  Return
     zero only if you are completely sure that no overflow can occur.
-    On a 32-bit platform, the recommmended implementation is to do a
+    On a 32-bit platform, the recommended implementation is to do a
     32 x 32 -> 64 signed multiply, and subtract result[63:32] from
     (result[31] >>signed 31).  If this is zero, meaning that the
     upper word is merely a sign extension of the lower one, no
diff --git a/compiler/simplCore/Simplify.hs b/compiler/simplCore/Simplify.hs
index e78714d..1b89f3e 100644
--- a/compiler/simplCore/Simplify.hs
+++ b/compiler/simplCore/Simplify.hs
@@ -485,7 +485,7 @@ completeNonRecX top_lvl env is_strict old_bndr new_bndr new_rhs
 {-
 {- No, no, no!  Do not try preInlineUnconditionally in completeNonRecX
    Doing so risks exponential behaviour, because new_rhs has been simplified once already
-   In the cases described by the folowing commment, postInlineUnconditionally will
+   In the cases described by the following comment, postInlineUnconditionally will
    catch many of the relevant cases.
         -- This happens; for example, the case_bndr during case of
         -- known constructor:  case (a,b) of x { (p,q) -> ... }
diff --git a/ghc/GHCi/UI.hs b/ghc/GHCi/UI.hs
index b2b54d3..f684bf7 100644
--- a/ghc/GHCi/UI.hs
+++ b/ghc/GHCi/UI.hs
@@ -920,7 +920,7 @@ runCommands' eh sourceErrorHandler gCmd = gmask $ \unmask -> do
 -- A result of Nothing means there was no more input to process.
 -- Otherwise the result is Just b where b is True if the command succeeded;
 -- this is relevant only to ghc -e, which will exit with status 1
--- if the commmand was unsuccessful. GHCi will continue in either case.
+-- if the command was unsuccessful. GHCi will continue in either case.
 runOneCommand :: (SomeException -> GHCi Bool) -> InputT GHCi (Maybe String)
             -> InputT GHCi (Maybe Bool)
 runOneCommand eh gCmd = do
diff --git a/rts/linker/Elf.c b/rts/linker/Elf.c
index e8f6aab..2ce4d3d 100644
--- a/rts/linker/Elf.c
+++ b/rts/linker/Elf.c
@@ -375,7 +375,7 @@ ocVerifyImage_ELF ( ObjectCode* oc )
    if (ehdr->e_ident[EI_DATA] == ELFDATA2MSB) {
        IF_DEBUG(linker,debugBelch( "Is big-endian\n" ));
    } else {
-       errorBelch("%s: unknown endiannness", oc->fileName);
+       errorBelch("%s: unknown endianness", oc->fileName);
        return 0;
    }
 
diff --git a/rts/linker/MachO.c b/rts/linker/MachO.c
index 9fc3c5b..16b712a 100644
--- a/rts/linker/MachO.c
+++ b/rts/linker/MachO.c
@@ -618,7 +618,7 @@ relocateSection_aarch64(ObjectCode * oc, Section * section)
         return 1;
     /* at this point, we have:
      *
-     * - loaded the sections (potentially into non-continuous memory),
+     * - loaded the sections (potentially into non-contiguous memory),
      *   (in ocGetNames_MachO)
      * - registered exported sybmols
      *   (in ocGetNames_MachO)
@@ -628,7 +628,7 @@ relocateSection_aarch64(ObjectCode * oc, Section * section)
      * - All oc->symbols however should now point at the right place.
      */
 
-    /* we need to care about the explicity addend */
+    /* we need to care about the explicit addend */
     int64_t explicit_addend = 0;
     size_t  nreloc = section->info->macho_section->nreloc;
 
@@ -986,7 +986,7 @@ relocateSection(
                 thing -= value;
                 break;
             default:
-                barf("unkown relocation");
+                barf("unknown relocation");
         }
 
         switch(reloc->r_length)
@@ -1687,7 +1687,7 @@ ocGetNames_MachO(ObjectCode* oc)
      * - EXT and UNDF
      * - EXT and not in the same section.
      *
-     * As sections are not necessarily continuous and can live
+     * As sections are not necessarily contiguous and can live
      * anywhere in the addressable space. This obviously makes
      * sense.  However it took me a while to figure this out.
      */
diff --git a/rts/linker/MachOTypes.h b/rts/linker/MachOTypes.h
index 31bfdb4..f78bfca 100644
--- a/rts/linker/MachOTypes.h
+++ b/rts/linker/MachOTypes.h
@@ -30,7 +30,7 @@ typedef struct scattered_relocation_info MachOScatteredRelocationInfo;
 /* Dealing with nlist symbol entries can become
  * painful.  We'll have our own Symbol struct that
  * mirrors the symbol from the nlist and can carry
- * some more infomration (like addr).
+ * some more information (like addr).
  */
 typedef struct _MachOSymbol {
     SymbolName * name;  /* the name of the symbol. */
@@ -101,7 +101,7 @@ typedef struct _ObjectCodeFormatInfo {
  *
  * These are very similar to the SymbolExtras
  * below.  However the SymbolExtras are allocated
- * per ObejctCode and not per Section.
+ * per ObjectCode and not per Section.
  *
  * TODO: Merge SymbolExtras and Stubs.
  */



More information about the ghc-commits mailing list