[commit: ghc] master: Catch some popular typos in comments (2a182ab)
git at git.haskell.org
git
Tue Oct 8 21:52:34 UTC 2013
Repository : ssh://git at git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/2a182ab89532596fdcfaedcafca1bfd3ba8d2b8e/ghc
>---------------------------------------------------------------
commit 2a182ab89532596fdcfaedcafca1bfd3ba8d2b8e
Author: Gabor Greif <ggreif at gmail.com>
Date: Tue Oct 8 23:46:23 2013 +0200
Catch some popular typos in comments
>---------------------------------------------------------------
2a182ab89532596fdcfaedcafca1bfd3ba8d2b8e
compiler/coreSyn/CoreArity.lhs | 4 ++--
compiler/coreSyn/CoreSubst.lhs | 2 +-
compiler/simplCore/CoreMonad.lhs | 2 +-
compiler/typecheck/TcRnTypes.lhs | 2 +-
compiler/typecheck/TcValidity.lhs | 4 ++--
5 files changed, 7 insertions(+), 7 deletions(-)
diff --git a/compiler/coreSyn/CoreArity.lhs b/compiler/coreSyn/CoreArity.lhs
index 62f9b7e..9c0fd17 100644
--- a/compiler/coreSyn/CoreArity.lhs
+++ b/compiler/coreSyn/CoreArity.lhs
@@ -3,7 +3,7 @@
% (c) The GRASP/AQUA Project, Glasgow University, 1992-1998
%
- Arity and ete expansion
+ Arity and eta expansion
\begin{code}
{-# OPTIONS -fno-warn-tabs #-}
@@ -178,7 +178,7 @@ in exprArity. That is a less local change, so I'm going to leave it for today!
Note [Newtype classes and eta expansion]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
- NB: this nasty special case is no longer required, becuase
+ NB: this nasty special case is no longer required, because
for newtype classes we don't use the class-op rule mechanism
at all. See Note [Single-method classes] in TcInstDcls. SLPJ May 2013
diff --git a/compiler/coreSyn/CoreSubst.lhs b/compiler/coreSyn/CoreSubst.lhs
index fa397bc..3b39320 100644
--- a/compiler/coreSyn/CoreSubst.lhs
+++ b/compiler/coreSyn/CoreSubst.lhs
@@ -289,7 +289,7 @@ delBndr (Subst in_scope ids tvs cvs) v
delBndrs :: Subst -> [Var] -> Subst
delBndrs (Subst in_scope ids tvs cvs) vs
= Subst in_scope (delVarEnvList ids vs) (delVarEnvList tvs vs) (delVarEnvList cvs vs)
- -- Easist thing is just delete all from all!
+ -- Easiest thing is just delete all from all!
-- | Simultaneously substitute for a bunch of variables
-- No left-right shadowing
diff --git a/compiler/simplCore/CoreMonad.lhs b/compiler/simplCore/CoreMonad.lhs
index 6d49d38..a3f8e3b 100644
--- a/compiler/simplCore/CoreMonad.lhs
+++ b/compiler/simplCore/CoreMonad.lhs
@@ -271,7 +271,7 @@ interactiveInScope hsc_env
vars = typeEnvIds te
tyvars = varSetElems $ tyThingsTyVars $ typeEnvElts $ te
-- Why the type variables? How can the top level envt have free tyvars?
- -- I think it's becuase of the GHCi debugger, which can bind variables
+ -- I think it's because of the GHCi debugger, which can bind variables
-- f :: [t] -> [t]
-- where t is a RuntimeUnk (see TcType)
\end{code}
diff --git a/compiler/typecheck/TcRnTypes.lhs b/compiler/typecheck/TcRnTypes.lhs
index d3308b9..e08da5a 100644
--- a/compiler/typecheck/TcRnTypes.lhs
+++ b/compiler/typecheck/TcRnTypes.lhs
@@ -964,7 +964,7 @@ Note [Kind orientation for CTyEqCan]
Given an equality (t:* ~ s:Open), we absolutely want to re-orient it.
We can't solve it by updating t:=s, ragardless of how touchable 't' is,
because the kinds don't work. Indeed we don't want to leave it with
-the orientation (t ~ s), becuase if that gets into the inert set we'll
+the orientation (t ~ s), because if that gets into the inert set we'll
start replacing t's by s's, and that too is the wrong way round.
Hence in a CTyEqCan, (t:k1 ~ xi:k2) we require that k2 is a subkind of k1.
diff --git a/compiler/typecheck/TcValidity.lhs b/compiler/typecheck/TcValidity.lhs
index 1e0b000..f32369e 100644
--- a/compiler/typecheck/TcValidity.lhs
+++ b/compiler/typecheck/TcValidity.lhs
@@ -968,7 +968,7 @@ Note that
c) There are several type instance decls for T in the instance
All this is fine. Of course, you can't give any *more* instances
-for (T ty Int) elsewhere, becuase it's an *associated* type.
+for (T ty Int) elsewhere, because it's an *associated* type.
Note [Checking consistent instantiation]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
@@ -1053,7 +1053,7 @@ checkConsistentFamInst (Just (clas, mini_env)) fam_tc at_tvs at_tys
= case tcMatchTyX at_tv_set subst at_ty inst_ty of
Just subst | all_distinct subst -> return subst
_ -> failWithTc $ wrongATArgErr at_ty inst_ty
- -- No need to instantiate here, becuase the axiom
+ -- No need to instantiate here, because the axiom
-- uses the same type variables as the assocated class
| otherwise
= return subst -- Allow non-type-variable instantiation
More information about the ghc-commits
mailing list