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

git at git.haskell.org git at git.haskell.org
Tue Nov 29 15:37:38 UTC 2016


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

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

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

commit e755930d7f1e5f2b6161cf61aae267ed3094bfe6
Author: Gabor Greif <ggreif at gmail.com>
Date:   Tue Nov 29 16:18:07 2016 +0100

    Typos in comments


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

e755930d7f1e5f2b6161cf61aae267ed3094bfe6
 compiler/coreSyn/CoreLint.hs   | 2 +-
 compiler/deSugar/DsMeta.hs     | 4 ++--
 compiler/iface/BuildTyCl.hs    | 2 +-
 compiler/iface/TcIface.hs      | 2 +-
 compiler/main/TidyPgm.hs       | 2 +-
 compiler/typecheck/TcHsSyn.hs  | 2 +-
 compiler/typecheck/TcHsType.hs | 2 +-
 7 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/compiler/coreSyn/CoreLint.hs b/compiler/coreSyn/CoreLint.hs
index 314bf3e..50c1ac1 100644
--- a/compiler/coreSyn/CoreLint.hs
+++ b/compiler/coreSyn/CoreLint.hs
@@ -1832,7 +1832,7 @@ lintInScope loc_msg var =
 ensureEqTys :: OutType -> OutType -> MsgDoc -> LintM ()
 -- check ty2 is subtype of ty1 (ie, has same structure but usage
 -- annotations need only be consistent, not equal)
--- Assumes ty1,ty2 are have alrady had the substitution applied
+-- Assumes ty1,ty2 are have already had the substitution applied
 ensureEqTys ty1 ty2 msg = lintL (ty1 `eqType` ty2) msg
 
 lintRole :: Outputable thing
diff --git a/compiler/deSugar/DsMeta.hs b/compiler/deSugar/DsMeta.hs
index 6b40a04..556fbf9 100644
--- a/compiler/deSugar/DsMeta.hs
+++ b/compiler/deSugar/DsMeta.hs
@@ -1392,7 +1392,7 @@ repBinds (HsValBinds decs)
         ; return (ss, core_list) }
 
 rep_val_binds :: HsValBinds Name -> DsM [(SrcSpan, Core TH.DecQ)]
--- Assumes: all the binders of the binding are alrady in the meta-env
+-- Assumes: all the binders of the binding are already in the meta-env
 rep_val_binds (ValBindsOut binds sigs)
  = do { core1 <- rep_binds' (unionManyBags (map snd binds))
       ; core2 <- rep_sigs' sigs
@@ -1408,7 +1408,7 @@ rep_binds' :: LHsBinds Name -> DsM [(SrcSpan, Core TH.DecQ)]
 rep_binds' = mapM rep_bind . bagToList
 
 rep_bind :: LHsBind Name -> DsM (SrcSpan, Core TH.DecQ)
--- Assumes: all the binders of the binding are alrady in the meta-env
+-- Assumes: all the binders of the binding are already in the meta-env
 
 -- Note GHC treats declarations of a variable (not a pattern)
 -- e.g.  x = g 5 as a Fun MonoBinds. This is indicated by a single match
diff --git a/compiler/iface/BuildTyCl.hs b/compiler/iface/BuildTyCl.hs
index 2617f32..0337abc 100644
--- a/compiler/iface/BuildTyCl.hs
+++ b/compiler/iface/BuildTyCl.hs
@@ -431,7 +431,7 @@ newImplicitBinder :: Name                       -- Base name
                   -> TcRnIf m n Name            -- Implicit name
 -- Called in BuildTyCl to allocate the implicit binders of type/class decls
 -- For source type/class decls, this is the first occurrence
--- For iface ones, the LoadIface has alrady allocated a suitable name in the cache
+-- For iface ones, the LoadIface has already allocated a suitable name in the cache
 newImplicitBinder base_name mk_sys_occ
   = newImplicitBinderLoc base_name mk_sys_occ (nameSrcSpan base_name)
 
diff --git a/compiler/iface/TcIface.hs b/compiler/iface/TcIface.hs
index 1b0fdf8..6baffed 100644
--- a/compiler/iface/TcIface.hs
+++ b/compiler/iface/TcIface.hs
@@ -743,7 +743,7 @@ tcIfaceDataCons tycon_name tycon tc_tybinders if_cons
                          ifConStricts = if_stricts,
                          ifConSrcStricts = if_src_stricts})
      = -- Universally-quantified tyvars are shared with
-       -- parent TyCon, and are alrady in scope
+       -- parent TyCon, and are already in scope
        bindIfaceForAllBndrs ex_bndrs    $ \ ex_tv_bndrs -> do
         { traceIf (text "Start interface-file tc_con_decl" <+> ppr dc_name)
 
diff --git a/compiler/main/TidyPgm.hs b/compiler/main/TidyPgm.hs
index e59a389..9f2723c 100644
--- a/compiler/main/TidyPgm.hs
+++ b/compiler/main/TidyPgm.hs
@@ -954,7 +954,7 @@ findExternalRules omit_prags binds imp_id_rules unfold_env
         -- local binder (on LHS or RHS) that we have now discarded.
         -- (NB: ruleFreeVars only includes LocalIds)
         --
-        -- LHS: we have alrady filtered out rules that mention internal Ids
+        -- LHS: we have already filtered out rules that mention internal Ids
         --     on LHS but that isn't enough because we might have by now
         --     discarded a binding with an external Id. (How?
         --     chooseExternalIds is a bit conservative.)
diff --git a/compiler/typecheck/TcHsSyn.hs b/compiler/typecheck/TcHsSyn.hs
index ebdc617..3926532 100644
--- a/compiler/typecheck/TcHsSyn.hs
+++ b/compiler/typecheck/TcHsSyn.hs
@@ -190,7 +190,7 @@ type UnboundTyVarZonker = TcTyVar -> TcM Type
         -- The TcTyVar is
         --     (a) a MetaTv
         --     (b) Flexi and
-        --     (c) its kind is alrady zonked
+        --     (c) its kind is already zonked
         -- Note [Zonking the LHS of a RULE]
 
 -- | A ZonkEnv carries around several bits.
diff --git a/compiler/typecheck/TcHsType.hs b/compiler/typecheck/TcHsType.hs
index da1eeee..96d598e 100644
--- a/compiler/typecheck/TcHsType.hs
+++ b/compiler/typecheck/TcHsType.hs
@@ -175,7 +175,7 @@ pprSigCtxt ctxt hs_ty
 tcHsSigWcType :: UserTypeCtxt -> LHsSigWcType Name -> TcM Type
 -- This one is used when we have a LHsSigWcType, but in
 -- a place where wildards aren't allowed. The renamer has
--- alrady checked this, so we can simply ignore it.
+-- already checked this, so we can simply ignore it.
 tcHsSigWcType ctxt sig_ty = tcHsSigType ctxt (dropWildCards sig_ty)
 
 kcHsSigType :: [Located Name] -> LHsSigType Name -> TcM ()



More information about the ghc-commits mailing list