[commit: ghc] master: Typos in comments (ed4cf03)

git at git.haskell.org git at git.haskell.org
Fri Dec 16 13:01:45 UTC 2016


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

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

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

commit ed4cf039092a8cc5bea78dedb845f8e2db3f49b8
Author: Gabor Greif <ggreif at gmail.com>
Date:   Fri Dec 16 14:00:15 2016 +0100

    Typos in comments


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

ed4cf039092a8cc5bea78dedb845f8e2db3f49b8
 compiler/coreSyn/CoreUtils.hs        | 2 +-
 compiler/llvmGen/LlvmCodeGen/Regs.hs | 2 +-
 compiler/main/GhcMake.hs             | 2 +-
 compiler/simplCore/CallArity.hs      | 2 +-
 compiler/simplCore/SetLevels.hs      | 2 +-
 compiler/specialise/Rules.hs         | 2 +-
 compiler/typecheck/TcGenFunctor.hs   | 2 +-
 compiler/utils/BooleanFormula.hs     | 2 +-
 compiler/vectorise/Vectorise/Vect.hs | 2 +-
 9 files changed, 9 insertions(+), 9 deletions(-)

diff --git a/compiler/coreSyn/CoreUtils.hs b/compiler/coreSyn/CoreUtils.hs
index ef1555f..c611e0b 100644
--- a/compiler/coreSyn/CoreUtils.hs
+++ b/compiler/coreSyn/CoreUtils.hs
@@ -357,7 +357,7 @@ stripTicksTop p = go []
         go ts other            = (reverse ts, other)
 
 -- | Strip ticks satisfying a predicate from top of an expression,
--- returning the remaining expresion
+-- returning the remaining expression
 stripTicksTopE :: (Tickish Id -> Bool) -> Expr b -> Expr b
 stripTicksTopE p = go
   where go (Tick t e) | p t = go e
diff --git a/compiler/llvmGen/LlvmCodeGen/Regs.hs b/compiler/llvmGen/LlvmCodeGen/Regs.hs
index 1ee9fc1..186eda3 100644
--- a/compiler/llvmGen/LlvmCodeGen/Regs.hs
+++ b/compiler/llvmGen/LlvmCodeGen/Regs.hs
@@ -102,7 +102,7 @@ stgTBAA
     , (heapN,  fsLit "heap",  Just topN)
     , (rxN,    fsLit "rx",    Just heapN)
     , (baseN,  fsLit "base",  Just topN)
-    -- FIX: Not 100% sure if this heirarchy is complete.  I think the big thing
+    -- FIX: Not 100% sure if this hierarchy is complete.  I think the big thing
     -- is Sp is never aliased, so might want to change the hierarchy to have Sp
     -- on its own branch that is never aliased (e.g never use top as a TBAA
     -- node).
diff --git a/compiler/main/GhcMake.hs b/compiler/main/GhcMake.hs
index aa50c3a..6b103c9 100644
--- a/compiler/main/GhcMake.hs
+++ b/compiler/main/GhcMake.hs
@@ -479,7 +479,7 @@ guessOutputFile = modifySession $ \env ->
 
         name_exe = do
 #if defined(mingw32_HOST_OS)
-          -- we must add the .exe extention unconditionally here, otherwise
+          -- we must add the .exe extension unconditionally here, otherwise
           -- when name has an extension of its own, the .exe extension will
           -- not be added by DriverPipeline.exeFileName.  See #2248
           name' <- fmap (<.> "exe") name
diff --git a/compiler/simplCore/CallArity.hs b/compiler/simplCore/CallArity.hs
index 0186c67..a93fe1f 100644
--- a/compiler/simplCore/CallArity.hs
+++ b/compiler/simplCore/CallArity.hs
@@ -468,7 +468,7 @@ callArityAnal arity int (Lam v e)
   where
     (ae, e') = callArityAnal (arity - 1) (int `delVarSet` v) e
 
--- Application. Increase arity for the called expresion, nothing to know about
+-- Application. Increase arity for the called expression, nothing to know about
 -- the second
 callArityAnal arity int (App e (Type t))
     = second (\e -> App e (Type t)) $ callArityAnal arity int e
diff --git a/compiler/simplCore/SetLevels.hs b/compiler/simplCore/SetLevels.hs
index dc36a6c..ef98e7b 100644
--- a/compiler/simplCore/SetLevels.hs
+++ b/compiler/simplCore/SetLevels.hs
@@ -1033,7 +1033,7 @@ lookupVar le v = case lookupVarEnv (le_env le) v of
                     _              -> Var v
 
 abstractVars :: Level -> LevelEnv -> DVarSet -> [OutVar]
-        -- Find the variables in fvs, free vars of the target expresion,
+        -- Find the variables in fvs, free vars of the target expression,
         -- whose level is greater than the destination level
         -- These are the ones we are going to abstract out
         --
diff --git a/compiler/specialise/Rules.hs b/compiler/specialise/Rules.hs
index 7909bdc..42cb13e 100644
--- a/compiler/specialise/Rules.hs
+++ b/compiler/specialise/Rules.hs
@@ -703,7 +703,7 @@ match _ _ e at Tick{} _
 -- Consider matching
 --      \x->f      against    \f->f
 -- When we meet the lambdas we must remember to rename f to f' in the
--- second expresion.  The RnEnv2 does that.
+-- second expression.  The RnEnv2 does that.
 --
 -- Consider matching
 --      forall a. \b->b    against   \a->3
diff --git a/compiler/typecheck/TcGenFunctor.hs b/compiler/typecheck/TcGenFunctor.hs
index 1f0df61..5679f9f 100644
--- a/compiler/typecheck/TcGenFunctor.hs
+++ b/compiler/typecheck/TcGenFunctor.hs
@@ -727,7 +727,7 @@ Deriving Functor, Foldable, and Traversable all require generating expressions
 which perform an operation on each argument of a data constructor depending
 on the argument's type. In particular, a generated operation can be different
 depending on whether the type mentions the last type variable of the datatype
-(e.g., if you have data T a = MkT a Int, then a generated foldr expresion would
+(e.g., if you have data T a = MkT a Int, then a generated foldr expression would
 fold over the first argument of MkT, but not the second).
 
 This pattern is abstracted with the FFoldType datatype, which provides hooks
diff --git a/compiler/utils/BooleanFormula.hs b/compiler/utils/BooleanFormula.hs
index 13f6e21..1509321 100644
--- a/compiler/utils/BooleanFormula.hs
+++ b/compiler/utils/BooleanFormula.hs
@@ -86,7 +86,7 @@ The smart constructors (`mkAnd` and `mkOr`) do some attempt to simplify expressi
     Implemented by mkAnd' / mkOr'
  3. Conjunction with false, disjunction with true is simplified, i.e.
      `mkAnd [mkFalse,x]` becomes `mkFalse`.
- 4. Common subexpresion elimination:
+ 4. Common subexpression elimination:
      `mkAnd [x,x,y]` is reduced to just `mkAnd [x,y]`.
 
 This simplification is not exhaustive, in the sense that it will not produce
diff --git a/compiler/vectorise/Vectorise/Vect.hs b/compiler/vectorise/Vectorise/Vect.hs
index fac1ab4..436c78e 100644
--- a/compiler/vectorise/Vectorise/Vect.hs
+++ b/compiler/vectorise/Vectorise/Vect.hs
@@ -84,7 +84,7 @@ vRec vs es = (Rec (zip vvs ves), Rec (zip lvs les))
     (vvs, lvs) = unzip vs
     (ves, les) = unzip es
 
--- |Make a vectorised let expresion.
+-- |Make a vectorised let expression.
 --
 vLet :: VBind -> VExpr -> VExpr
 vLet = zipWithVect Let



More information about the ghc-commits mailing list