[commit: ghc] master: More typos in comments [skip ci] (b990f65)
git at git.haskell.org
git at git.haskell.org
Wed Feb 8 08:39:40 UTC 2017
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/b990f656091cb6c960fb21f05791acf38a19abc1/ghc
>---------------------------------------------------------------
commit b990f656091cb6c960fb21f05791acf38a19abc1
Author: Gabor Greif <ggreif at gmail.com>
Date: Tue Feb 7 11:55:16 2017 +0100
More typos in comments [skip ci]
>---------------------------------------------------------------
b990f656091cb6c960fb21f05791acf38a19abc1
compiler/coreSyn/CorePrep.hs | 2 +-
compiler/coreSyn/CoreUnfold.hs | 8 ++++----
compiler/deSugar/DsMeta.hs | 2 +-
compiler/deSugar/DsMonad.hs | 2 +-
compiler/main/HscTypes.hs | 2 +-
compiler/main/TidyPgm.hs | 2 +-
compiler/simplCore/OccurAnal.hs | 4 ++--
compiler/typecheck/TcInteract.hs | 2 +-
compiler/typecheck/TcRnTypes.hs | 2 +-
9 files changed, 13 insertions(+), 13 deletions(-)
diff --git a/compiler/coreSyn/CorePrep.hs b/compiler/coreSyn/CorePrep.hs
index ce6eba2..db0e996 100644
--- a/compiler/coreSyn/CorePrep.hs
+++ b/compiler/coreSyn/CorePrep.hs
@@ -451,7 +451,7 @@ cpeBind top_lvl env (Rec pairs)
where
(bndrs, rhss) = unzip pairs
- -- Flatten all the floats, and the currrent
+ -- Flatten all the floats, and the current
-- group into a single giant Rec
add_float (FloatLet (NonRec b r)) prs2 = (b,r) : prs2
add_float (FloatLet (Rec prs1)) prs2 = prs1 ++ prs2
diff --git a/compiler/coreSyn/CoreUnfold.hs b/compiler/coreSyn/CoreUnfold.hs
index c69357b..71c5f0f 100644
--- a/compiler/coreSyn/CoreUnfold.hs
+++ b/compiler/coreSyn/CoreUnfold.hs
@@ -98,7 +98,7 @@ mkDFunUnfolding bndrs con ops
= DFunUnfolding { df_bndrs = bndrs
, df_con = con
, df_args = map occurAnalyseExpr ops }
- -- See Note [Occurrrence analysis of unfoldings]
+ -- See Note [Occurrence analysis of unfoldings]
mkWwInlineRule :: CoreExpr -> Arity -> Unfolding
mkWwInlineRule expr arity
@@ -238,7 +238,7 @@ mkCoreUnfolding :: UnfoldingSource -> Bool -> CoreExpr
-- Occurrence-analyses the expression before capturing it
mkCoreUnfolding src top_lvl expr guidance
= CoreUnfolding { uf_tmpl = occurAnalyseExpr expr,
- -- See Note [Occurrrence analysis of unfoldings]
+ -- See Note [Occurrence analysis of unfoldings]
uf_src = src,
uf_is_top = top_lvl,
uf_is_value = exprIsHNF expr,
@@ -257,7 +257,7 @@ mkUnfolding :: DynFlags -> UnfoldingSource
-- Occurrence-analyses the expression before capturing it
mkUnfolding dflags src is_top_lvl is_bottoming expr
= CoreUnfolding { uf_tmpl = occurAnalyseExpr expr,
- -- See Note [Occurrrence analysis of unfoldings]
+ -- See Note [Occurrence analysis of unfoldings]
uf_src = src,
uf_is_top = is_top_lvl,
uf_is_value = exprIsHNF expr,
@@ -646,7 +646,7 @@ sizeExpr dflags bOMB_OUT_SIZE top_args expr
--
-- IMPORATANT: *do* charge 1 for the alternative, else we
-- find that giant case nests are treated as practically free
- -- A good example is Foreign.C.Error.errrnoToIOError
+ -- A good example is Foreign.C.Error.errnoToIOError
------------
-- Cost to allocate binding with given binder
diff --git a/compiler/deSugar/DsMeta.hs b/compiler/deSugar/DsMeta.hs
index 1ec70c7..f8572cb 100644
--- a/compiler/deSugar/DsMeta.hs
+++ b/compiler/deSugar/DsMeta.hs
@@ -1428,7 +1428,7 @@ repBinds b@(HsIPBinds _) = notHandled "Implicit parameters" (ppr b)
repBinds (HsValBinds decs)
= do { let { bndrs = hsSigTvBinders decs ++ collectHsValBinders decs }
- -- No need to worrry about detailed scopes within
+ -- No need to worry about detailed scopes within
-- the binding group, because we are talking Names
-- here, so we can safely treat it as a mutually
-- recursive group
diff --git a/compiler/deSugar/DsMonad.hs b/compiler/deSugar/DsMonad.hs
index f9533e3..4f68100 100644
--- a/compiler/deSugar/DsMonad.hs
+++ b/compiler/deSugar/DsMonad.hs
@@ -253,7 +253,7 @@ initDsTc thing_inside
initTcDsForSolver :: TcM a -> DsM (Messages, Maybe a)
-- Spin up a TcM context so that we can run the constraint solver
-- Returns any error messages generated by the constraint solver
--- and (Just res) if no error happened; Nothing if an errror happened
+-- and (Just res) if no error happened; Nothing if an error happened
--
-- Simon says: I'm not very happy about this. We spin up a complete TcM monad
-- only to immediately refine it to a TcS monad.
diff --git a/compiler/main/HscTypes.hs b/compiler/main/HscTypes.hs
index d476faf..581912d 100644
--- a/compiler/main/HscTypes.hs
+++ b/compiler/main/HscTypes.hs
@@ -1591,7 +1591,7 @@ extendInteractiveContext ictxt new_tythings new_cls_insts new_fam_insts defaults
}
where
- -- Discard old instances that have been fully overrridden
+ -- Discard old instances that have been fully overridden
-- See Note [Override identical instances in GHCi]
(cls_insts, fam_insts) = ic_instances ictxt
old_cls_insts = filterOut (\i -> any (identicalClsInstHead i) new_cls_insts) cls_insts
diff --git a/compiler/main/TidyPgm.hs b/compiler/main/TidyPgm.hs
index 0c8f491..2e603a6 100644
--- a/compiler/main/TidyPgm.hs
+++ b/compiler/main/TidyPgm.hs
@@ -691,7 +691,7 @@ chooseExternalIds hsc_env mod omit_prags expose_all binds implicit_binds imp_id_
init_occ_env = initTidyOccEnv avoids
- search :: [(Id,Id)] -- The work-list: (external id, referrring id)
+ search :: [(Id,Id)] -- The work-list: (external id, referring id)
-- Make a tidy, external Name for the external id,
-- add it to the UnfoldEnv, and do the same for the
-- transitive closure of Ids it refers to
diff --git a/compiler/simplCore/OccurAnal.hs b/compiler/simplCore/OccurAnal.hs
index 80eca71..96107fe 100644
--- a/compiler/simplCore/OccurAnal.hs
+++ b/compiler/simplCore/OccurAnal.hs
@@ -1472,7 +1472,7 @@ chooses a loop breaker. Suppose in iteration 1 it choose g as the loop
breaker. That means it is free to inline f.
Suppose that GHC decides to inline f in the branches of the case, but
-(for some reason; eg it is not satureated) in the rhs of g. So we get
+(for some reason; eg it is not saturated) in the rhs of g. So we get
let rec { f = ...g...g...
; g = ...f...f... }
@@ -1900,7 +1900,7 @@ zapDetailsIf False uds = uds
{-
Note [Use one-shot information]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
-The occurrrence analyser propagates one-shot-lambda information in two
+The occurrence analyser propagates one-shot-lambda information in two
situations:
* Applications: eg build (\c n -> blah)
diff --git a/compiler/typecheck/TcInteract.hs b/compiler/typecheck/TcInteract.hs
index 13fc0b0..e8ac6e9 100644
--- a/compiler/typecheck/TcInteract.hs
+++ b/compiler/typecheck/TcInteract.hs
@@ -615,7 +615,7 @@ we keep? More subtle than you might think!
IRReplace, to avoid unnecessary munging of the inert set.
Doing the depth-check for implicit parameters, rather than making the work item
-always overrride, is important. Consider
+always override, is important. Consider
data T a where { T1 :: (?x::Int) => T Int; T2 :: T a }
diff --git a/compiler/typecheck/TcRnTypes.hs b/compiler/typecheck/TcRnTypes.hs
index 9e3ed5b..782a992 100644
--- a/compiler/typecheck/TcRnTypes.hs
+++ b/compiler/typecheck/TcRnTypes.hs
@@ -857,7 +857,7 @@ type TcIdBinderStack = [TcIdBinder]
data TcIdBinder
= TcIdBndr
TcId
- TopLevelFlag -- Tells whether the bindind is syntactically top-level
+ TopLevelFlag -- Tells whether the binding is syntactically top-level
-- (The monomorphic Ids for a recursive group count
-- as not-top-level for this purpose.)
| TcIdBndr_ExpType -- Variant that allows the type to be specified as
More information about the ghc-commits
mailing list