[commit: ghc] master: Typos in comments [ci skip] (577f3da)

git at git.haskell.org git at git.haskell.org
Wed Apr 5 15:24:26 UTC 2017


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

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

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

commit 577f3da7b81920c427c394871c86a523627e14e9
Author: Gabor Greif <ggreif at gmail.com>
Date:   Tue Apr 4 10:49:51 2017 +0200

    Typos in comments [ci skip]


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

577f3da7b81920c427c394871c86a523627e14e9
 compiler/hsSyn/HsExpr.hs                              | 2 +-
 compiler/llvmGen/LlvmCodeGen/CodeGen.hs               | 2 +-
 compiler/nativeGen/RegAlloc/Graph/SpillCost.hs        | 2 +-
 compiler/specialise/SpecConstr.hs                     | 2 +-
 compiler/typecheck/TcRnDriver.hs                      | 2 +-
 compiler/utils/Util.hs                                | 2 +-
 libraries/template-haskell/Language/Haskell/TH/Ppr.hs | 2 +-
 rts/STM.c                                             | 4 ++--
 testsuite/tests/deSugar/should_run/dsrun002.hs        | 2 +-
 9 files changed, 10 insertions(+), 10 deletions(-)

diff --git a/compiler/hsSyn/HsExpr.hs b/compiler/hsSyn/HsExpr.hs
index f627056..f3cc3d0 100644
--- a/compiler/hsSyn/HsExpr.hs
+++ b/compiler/hsSyn/HsExpr.hs
@@ -1612,7 +1612,7 @@ type GuardLStmt id = LStmt id (LHsExpr id)
 -- | Guard Statement
 type GuardStmt  id = Stmt  id (LHsExpr id)
 
--- | Ghci Located Statemnt
+-- | Ghci Located Statement
 type GhciLStmt  id = LStmt id (LHsExpr id)
 
 -- | Ghci Statement
diff --git a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
index 40c5498..f1383c6 100644
--- a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
+++ b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
@@ -62,7 +62,7 @@ genLlvmProc _ = panic "genLlvmProc: case that shouldn't reach here!"
 --
 
 -- | Generate code for a list of blocks that make up a complete
--- procedure. The first block in the list is exepected to be the entry
+-- procedure. The first block in the list is expected to be the entry
 -- point and will get the prologue.
 basicBlocksCodeGen :: LiveGlobalRegs -> [CmmBlock]
                       -> LlvmM ([LlvmBasicBlock], [LlvmCmmDecl])
diff --git a/compiler/nativeGen/RegAlloc/Graph/SpillCost.hs b/compiler/nativeGen/RegAlloc/Graph/SpillCost.hs
index 0817b39..82976c0 100644
--- a/compiler/nativeGen/RegAlloc/Graph/SpillCost.hs
+++ b/compiler/nativeGen/RegAlloc/Graph/SpillCost.hs
@@ -165,7 +165,7 @@ chooseSpill info graph
 --   cost =     sum         loadCost * freq (u)  +    sum        storeCost * freq (d)
 --          u <- uses (v)                         d <- defs (v)
 --
---   There are no loops in our code at the momemnt, so we can set the freq's to 1.
+--   There are no loops in our code at the moment, so we can set the freq's to 1.
 --
 --  If we don't have live range splitting then Chaitins function performs badly
 --  if we have lots of nested live ranges and very few registers.
diff --git a/compiler/specialise/SpecConstr.hs b/compiler/specialise/SpecConstr.hs
index 7162841..cd5a90c 100644
--- a/compiler/specialise/SpecConstr.hs
+++ b/compiler/specialise/SpecConstr.hs
@@ -1749,7 +1749,7 @@ the passed-in RuleInfo, unless there are no calls at all to the function.
 The caller can, indeed must, assume this.  He should not combine in rhs_usg
 himself, or he'll get rhs_usg twice -- and that can lead to an exponential
 blowup of duplicates in the CallEnv.  This is what gave rise to the massive
-performace loss in Trac #8852.
+performance loss in Trac #8852.
 
 Note [Specialise original body]
 ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
diff --git a/compiler/typecheck/TcRnDriver.hs b/compiler/typecheck/TcRnDriver.hs
index b02fdf5..45df4ac 100644
--- a/compiler/typecheck/TcRnDriver.hs
+++ b/compiler/typecheck/TcRnDriver.hs
@@ -2012,7 +2012,7 @@ tcUserStmt (L loc (BodyStmt expr _ _ _))
                        ; when (isUnitTy $ it_ty) failM
                        ; return stuff },
 
-                        -- Plan B; a naked bind statment
+                        -- Plan B; a naked bind statement
                     tcGhciStmts [bind_stmt],
 
                         -- Plan C; check that the let-binding is typeable all by itself.
diff --git a/compiler/utils/Util.hs b/compiler/utils/Util.hs
index db6666c..1c519eb 100644
--- a/compiler/utils/Util.hs
+++ b/compiler/utils/Util.hs
@@ -309,7 +309,7 @@ splitEithers (e : es) = case e of
     where (xs,ys) = splitEithers es
 
 chkAppend :: [a] -> [a] -> [a]
--- Checks for the second arguemnt being empty
+-- Checks for the second argument being empty
 -- Used in situations where that situation is common
 chkAppend xs ys
   | null ys   = xs
diff --git a/libraries/template-haskell/Language/Haskell/TH/Ppr.hs b/libraries/template-haskell/Language/Haskell/TH/Ppr.hs
index 78c6080..a851a22 100644
--- a/libraries/template-haskell/Language/Haskell/TH/Ppr.hs
+++ b/libraries/template-haskell/Language/Haskell/TH/Ppr.hs
@@ -150,7 +150,7 @@ pprExp i (LamCaseE ms) = parensIf (i > noPrec)
 pprExp _ (TupE es) = parens (commaSep es)
 pprExp _ (UnboxedTupE es) = hashParens (commaSep es)
 pprExp _ (UnboxedSumE e alt arity) = unboxedSumBars (ppr e) alt arity
--- Nesting in Cond is to avoid potential problems in do statments
+-- Nesting in Cond is to avoid potential problems in do statements
 pprExp i (CondE guard true false)
  = parensIf (i > noPrec) $ sep [text "if"   <+> ppr guard,
                        nest 1 $ text "then" <+> ppr true,
diff --git a/rts/STM.c b/rts/STM.c
index 0e09d7d..f845b11 100644
--- a/rts/STM.c
+++ b/rts/STM.c
@@ -1395,7 +1395,7 @@ StgBool stmCommitTransaction(Capability *cap, StgTRecHeader *trec) {
     }
 
     if (result) {
-      // We now know that all of the read-only locations held their exepcted values
+      // We now know that all of the read-only locations held their expected values
       // at the end of the call to validate_and_acquire_ownership.  This forms the
       // linearization point of the commit.
 
@@ -1472,7 +1472,7 @@ StgBool stmCommitNestedTransaction(Capability *cap, StgTRecHeader *trec) {
       result = check_read_only(trec);
     }
     if (result) {
-      // We now know that all of the read-only locations held their exepcted values
+      // We now know that all of the read-only locations held their expected values
       // at the end of the call to validate_and_acquire_ownership.  This forms the
       // linearization point of the commit.
 
diff --git a/testsuite/tests/deSugar/should_run/dsrun002.hs b/testsuite/tests/deSugar/should_run/dsrun002.hs
index 09dc52d..169a0c1 100644
--- a/testsuite/tests/deSugar/should_run/dsrun002.hs
+++ b/testsuite/tests/deSugar/should_run/dsrun002.hs
@@ -1,4 +1,4 @@
-{- Tests let-expressions in do-statments -}
+{- Tests let-expressions in do-statements -}
 
 module Main( main ) where
 



More information about the ghc-commits mailing list