diff --git a/compiler/basicTypes/BasicTypes.lhs b/compiler/basicTypes/BasicTypes.lhs index cb90fc9979dad595397de4a815803858528a4dfb..9a92b003bc38e605a082385707512bab6f0895f3 100644 --- a/compiler/basicTypes/BasicTypes.lhs +++ b/compiler/basicTypes/BasicTypes.lhs @@ -566,7 +566,7 @@ defn of OccInfo here, safely at the bottom \begin{code} -- | Identifier occurrence information data OccInfo - = NoOccInfo -- ^ There are many occurrences, or unknown occurences + = NoOccInfo -- ^ There are many occurrences, or unknown occurrences | IAmDead -- ^ Marks unused variables. Sometimes useful for -- lambda and case-bound variables. diff --git a/compiler/cmm/CmmContFlowOpt.hs b/compiler/cmm/CmmContFlowOpt.hs index baef09fc00946068e880406498964f9edc9b5520..52b95a93ccfbaecf18b0800c86f2f775d1a526db 100644 --- a/compiler/cmm/CmmContFlowOpt.hs +++ b/compiler/cmm/CmmContFlowOpt.hs @@ -246,7 +246,7 @@ blockConcat splitting_procs g@CmmGraph { g_entry = entry_id } -- (3) increase number of predecessors of dest by 1 -- (4) decrease number of predecessors of b' by 1 -- - -- Later we will use replaceLabels to substitute all occurences of b' + -- Later we will use replaceLabels to substitute all occurrences of b' -- with dest. | splitting_procs , Just b' <- callContinuation_maybe last diff --git a/compiler/coreSyn/CoreLint.lhs b/compiler/coreSyn/CoreLint.lhs index a2f312d4bd92e6ee3d29659ceb6d53d9a6cba368..836164e0ce9f5aa72acd206e2f47f583ff8e6d39 100644 --- a/compiler/coreSyn/CoreLint.lhs +++ b/compiler/coreSyn/CoreLint.lhs @@ -116,7 +116,7 @@ to the type of the binding variable. lintBinders does this. For Ids, the type-substituted Id is added to the in_scope set (which itself is part of the TvSubst we are carrying down), and when we -find an occurence of an Id, we fetch it from the in-scope set. +find an occurrence of an Id, we fetch it from the in-scope set. \begin{code} diff --git a/compiler/coreSyn/CoreSubst.lhs b/compiler/coreSyn/CoreSubst.lhs index 3b39320381af9acb81d422b538d0a3b1247ca182..fef3e86a2e54655e20c8ce2876c36f0402636ea3 100644 --- a/compiler/coreSyn/CoreSubst.lhs +++ b/compiler/coreSyn/CoreSubst.lhs @@ -769,7 +769,7 @@ Note [Worker inlining] A worker can get sustituted away entirely. - it might be trivial - it might simply be very small -We do not treat an InlWrapper as an 'occurrence' in the occurence +We do not treat an InlWrapper as an 'occurrence' in the occurrence analyser, so it's possible that the worker is not even in scope any more. In all all these cases we simply drop the special case, returning to @@ -843,7 +843,7 @@ simpleOptExpr :: CoreExpr -> CoreExpr -- We also inline bindings that bind a Eq# box: see -- See Note [Optimise coercion boxes agressively]. -- --- The result is NOT guaranteed occurence-analysed, because +-- The result is NOT guaranteed occurrence-analysed, because -- in (let x = y in ....) we substitute for x; so y's occ-info -- may change radically diff --git a/compiler/coreSyn/CoreSyn.lhs b/compiler/coreSyn/CoreSyn.lhs index 080c117f111c6dc31df383c82df6463a6169ab42..3dc8eeb31f7a293dc36075cf418d2b9fb7a9b7f5 100644 --- a/compiler/coreSyn/CoreSyn.lhs +++ b/compiler/coreSyn/CoreSyn.lhs @@ -992,7 +992,7 @@ See also Note [Inlining an InlineRule] in CoreUnfold. Note [OccInfo in unfoldings and rules] ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ In unfoldings and rules, we guarantee that the template is occ-analysed, -so that the occurence info on the binders is correct. This is important, +so that the occurrence info on the binders is correct. This is important, because the Simplifier does not re-analyse the template when using it. If the occurrence info is wrong - We may get more simpifier iterations than necessary, because diff --git a/compiler/hsSyn/HsUtils.lhs b/compiler/hsSyn/HsUtils.lhs index abc4758fcb25738bb4ba769392f71ae966666309..558c104fadd31fff43489640ac3a6b743fad3ffd 100644 --- a/compiler/hsSyn/HsUtils.lhs +++ b/compiler/hsSyn/HsUtils.lhs @@ -701,7 +701,7 @@ hsLTyClDeclBinders :: Eq name => Located (TyClDecl name) -> [Located name] -- ^ Returns all the /binding/ names of the decl. -- The first one is guaranteed to be the name of the decl. For record fields -- mentioned in multiple constructors, the SrcLoc will be from the first --- occurence. We use the equality to filter out duplicate field names. +-- occurrence. We use the equality to filter out duplicate field names. -- -- Each returned (Located name) is wrapped in a @SrcSpan@ of the whole -- /declaration/, not just the name itself (which is how it appears in diff --git a/compiler/rename/RnEnv.lhs b/compiler/rename/RnEnv.lhs index 1028d08f03135349699a785ee6f711b8466f149a..f0d184097022128b64efa56b1960b38f85be8254 100644 --- a/compiler/rename/RnEnv.lhs +++ b/compiler/rename/RnEnv.lhs @@ -450,7 +450,7 @@ Thus: data G a instance C S where data G S = Y1 | Y2 -Even though there are two G's in scope (M.G and Blib.G), the occurence +Even though there are two G's in scope (M.G and Blib.G), the occurrence of 'G' in the 'instance C S' decl is unambiguous, because C has only one associated type called G. This is exactly what happens for methods, and it is only consistent to do the same thing for types. That's the @@ -611,7 +611,7 @@ When the user writes: 'Zero' in the type signature of 'foo' is parsed as: HsTyVar ("Zero", TcClsName) -When the renamer hits this occurence of 'Zero' it's going to realise +When the renamer hits this occurrence of 'Zero' it's going to realise that it's not in scope. But because it is renaming a type, it knows that 'Zero' might be a promoted data constructor, so it will demote its namespace to DataName and do a second lookup. diff --git a/compiler/rename/RnPat.lhs b/compiler/rename/RnPat.lhs index 639ab51101f9fac41e1a0d77c56d705f19dbc313..3fde563cd34662449421015be5f0e0ea4ae8037e 100644 --- a/compiler/rename/RnPat.lhs +++ b/compiler/rename/RnPat.lhs @@ -153,7 +153,7 @@ Consider g _ = T1 -Arguaby we should report T2 as unused, even though it appears in a +Arguably we should report T2 as unused, even though it appears in a pattern, because it never occurs in a constructed position. See Trac #7336. However, implementing this in the face of pattern synonyms would be @@ -166,7 +166,7 @@ we need to observe the dependency between P1 and P2 so that type checking can be done in the correct order (just like for value bindings). Dependencies between bindings is analyzed in the renamer, where we don't know yet whether P2 is a constructor or a pattern -synonym. So for now, we do report conid occurances in patterns as +synonym. So for now, we do report conid occurrences in patterns as uses. %********************************************************* diff --git a/compiler/rename/RnSource.lhs b/compiler/rename/RnSource.lhs index f3b4d9178de1f52e1ab73e9e324b047f45d70a26..c726d554fcb7f1e3d8044efa18af4a6a2193faab 100644 --- a/compiler/rename/RnSource.lhs +++ b/compiler/rename/RnSource.lhs @@ -60,7 +60,7 @@ for undefined tyvars, and tyvars in contexts that are ambiguous. (Some of this checking has now been moved to module @TcMonoType@, since we don't have functional dependency information at this point.) \item -Checks that all variable occurences are defined. +Checks that all variable occurrences are defined. \item Checks the @(..)@ etc constraints in the export list. \end{enumerate} diff --git a/compiler/simplCore/OccurAnal.lhs b/compiler/simplCore/OccurAnal.lhs index 3aacce64df00c13814987811491f26abe7288750..2487787c8dba9db9cd15c68a5d280f50fd95a1e5 100644 --- a/compiler/simplCore/OccurAnal.lhs +++ b/compiler/simplCore/OccurAnal.lhs @@ -72,7 +72,7 @@ occurAnalysePgm this_mod active_rule imp_rules vects vectVars binds vectVars) -- The RULES and VECTORISE declarations keep things alive! (For VECTORISE declarations, -- we only get them *until* the vectoriser runs. Afterwards, these dependencies are - -- reflected in 'vectors' — see Note [Vectorisation declarations and occurences].) + -- reflected in 'vectors' — see Note [Vectorisation declarations and occurrences].) -- Note [Preventing loops due to imported functions rules] imp_rules_edges = foldr (plusVarEnv_C unionVarSet) emptyVarEnv @@ -92,7 +92,7 @@ occurAnalysePgm this_mod active_rule imp_rules vects vectVars binds (final_usage, bind') = occAnalBind env env imp_rules_edges bind bs_usage occurAnalyseExpr :: CoreExpr -> CoreExpr - -- Do occurrence analysis, and discard occurence info returned + -- Do occurrence analysis, and discard occurrence info returned occurAnalyseExpr = occurAnalyseExpr' True -- do binder swap occurAnalyseExpr_NoBinderSwap :: CoreExpr -> CoreExpr @@ -1657,7 +1657,7 @@ From the original we will get case x of cb(live) { p -> let x = cb in ...x... } -Core Lint never expects to find an *occurence* of an Id marked +Core Lint never expects to find an *occurrence* of an Id marked as Dead, so we must zap the OccInfo on cb before making the binding x = cb. See Trac #5028. diff --git a/compiler/simplCore/SimplCore.lhs b/compiler/simplCore/SimplCore.lhs index de562d5a97ca9091f6d53c968c567daace20d6e8..c487c984919ff030ab3dca3cac7713081367ee55 100644 --- a/compiler/simplCore/SimplCore.lhs +++ b/compiler/simplCore/SimplCore.lhs @@ -628,7 +628,7 @@ simplifyPgmIO pass@(CoreDoSimplify max_iterations mode) , sz == sz -- Force it = do { -- Occurrence analysis - let { -- Note [Vectorisation declarations and occurences] + let { -- Note [Vectorisation declarations and occurrences] -- ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ -- During the 'InitialPhase' (i.e., before vectorisation), we need to make sure -- that the right-hand sides of vectorisation declarations are taken into diff --git a/compiler/stgSyn/CoreToStg.lhs b/compiler/stgSyn/CoreToStg.lhs index 9c5bc10293571d8b743ee6b77d9e1212d671fe67..2c4df6955f9a8b99d13283b9b615e8c12e35d66d 100644 --- a/compiler/stgSyn/CoreToStg.lhs +++ b/compiler/stgSyn/CoreToStg.lhs @@ -1076,7 +1076,7 @@ type FreeVarsInfo = VarEnv (Var, HowBound, StgBinderInfo) -- -- All case/lambda-bound things are also mapped to -- noBinderInfo, since we aren't interested in their - -- occurence info. + -- occurrence info. -- -- For ILX we track free var info for type variables too; -- hence VarEnv not IdEnv diff --git a/compiler/typecheck/TcMType.lhs b/compiler/typecheck/TcMType.lhs index 59dca2cb745da4a9a001dc4efd29fe4c747ea91c..a40a93df160548c7e827f54842b462cafa6c8341 100644 --- a/compiler/typecheck/TcMType.lhs +++ b/compiler/typecheck/TcMType.lhs @@ -546,7 +546,7 @@ zonkQuantifiedTyVar :: TcTyVar -> TcM TcTyVar -- default their kind (e.g. from OpenTypeKind to TypeKind) -- -- see notes with Kind.defaultKind -- The meta tyvar is updated to point to the new skolem TyVar. Now any --- bound occurences of the original type variable will get zonked to +-- bound occurrences of the original type variable will get zonked to -- the immutable version. -- -- We leave skolem TyVars alone; they are immutable. diff --git a/docs/comm/exts/th.html b/docs/comm/exts/th.html index dbb168aa0e8d5e67649399f5fcaac724e56c6b49..539245db7469d3c2d793f4965b65d248662aa6a3 100644 --- a/docs/comm/exts/th.html +++ b/docs/comm/exts/th.html @@ -131,7 +131,7 @@ Core Language.Haskell.TH.Syntax.Type appear.
-
Name lookups in the meta environment of the desugarer use two functions
with slightly different behaviour, namely DsMeta.lookupOcc
diff --git a/docs/comm/the-beast/basicTypes.html b/docs/comm/the-beast/basicTypes.html
index ca56d6b6a8a72a0f3002e9ffafde9403404928fa..b411e4c5a9cad29fe109df729f302c9966faff95 100644
--- a/docs/comm/the-beast/basicTypes.html
+++ b/docs/comm/the-beast/basicTypes.html
@@ -41,7 +41,7 @@
IdInfo
:
OccInfo
data type is defined in the module BasicTypes.lhs
.
Apart from the trivial NoOccInfo
, it distinguishes
diff --git a/docs/comm/the-beast/renamer.html b/docs/comm/the-beast/renamer.html
index 828b569bb92e526fb7619ea74f4eb864bcdddb12..878e82b370cd7bac23b8ff1f7d578f08f51f8c57 100644
--- a/docs/comm/the-beast/renamer.html
+++ b/docs/comm/the-beast/renamer.html
@@ -194,7 +194,7 @@ data Provenance
RdrName
environment, which contains Name
s for
all imported and all locally defined toplevel binders. Hence,
when the helpers of rnSrcDecls
come across the
- defining occurences of a toplevel RdrName
, they
+ defining occurrences of a toplevel RdrName
, they
don't rename it by generating a new name, but they simply look up its
name in the global RdrName
environment.
diff --git a/docs/comm/the-beast/simplifier.html b/docs/comm/the-beast/simplifier.html
index 40cf7cf8921dc287f84f8b20732c3f964ad428c2..4dbce7765b1e1d802abdd8d7d100482102afcfd6 100644
--- a/docs/comm/the-beast/simplifier.html
+++ b/docs/comm/the-beast/simplifier.html
@@ -37,7 +37,7 @@
computes a set of loop breakers - a set of definitions that
together cut any possible loop in the binding group. It marks the
identifiers bound by these definitions as loop breakers by enriching
- their occurence information. Loop
+ their occurrence information. Loop
breakers will never be inlined by the simplifier; thus,
guaranteeing termination of the simplification procedure. (This is not
entirely accurate -- see rewrite rules below.)
diff --git a/docs/comm/the-beast/stg.html b/docs/comm/the-beast/stg.html
index 4581da7d1f88720dd1ffb24dd31d3f66a83f2363..6c9851623a2de525ba3a34c0c829b80d5354fcd5 100644
--- a/docs/comm/the-beast/stg.html
+++ b/docs/comm/the-beast/stg.html
@@ -75,10 +75,10 @@
The representation of STG language defined in StgSyn
- abstracts over both binders and occurences of variables. The type names
+ abstracts over both binders and occurrences of variables. The type names
involved in this generic definition all carry the prefix
Gen
(such as in GenStgBinding
). Instances of
- these generic definitions, where both binders and occurences are of type
+ these generic definitions, where both binders and occurrences are of type
Id
.Id
are defined as type synonyms and use type names that drop the
diff --git a/docs/comm/the-beast/typecheck.html b/docs/comm/the-beast/typecheck.html
index 8d22784b8a6b0e9eeaffd6f39cc56f9af482cb1b..482a4476281877d8cd94b78fa9ffb89fa9335a81 100644
--- a/docs/comm/the-beast/typecheck.html
+++ b/docs/comm/the-beast/typecheck.html
@@ -21,7 +21,7 @@
GHC defines the abstract syntax of Haskell programs in HsSyn
using a structure that abstracts over the concrete representation of
- bound occurences of identifiers and patterns. The module TcHsSyn
defines a number of helper function required by the type checker. Note
that the type tyvar
Expressions are type checked by TcExpr
.
- Usage occurences of identifiers are processed by the function
+ Usage occurrences of identifiers are processed by the function
tcId
whose main purpose is to instantiate
overloaded identifiers. It essentially calls
TcInst.instOverloadedFun
once for each universally
@@ -275,7 +275,7 @@ tau -> tyvar
href="http://cvs.haskell.org/cgi-bin/cvsweb.cgi/fptools/ghc/compiler/typecheck/Inst.lhs">Inst.lhs
.
The function instOverloadedFun
is invoked for each
- overloaded usage occurence of an identifier, where overloaded means that
+ overloaded usage occurrence of an identifier, where overloaded means that
the type of the idendifier contains a non-trivial type constraint. It
proceeds in two steps: (1) Allocation of a method instance
(newMethodWithGivenTy
) and (2) instantiation of functional
diff --git a/docs/ndp/haskell.sty b/docs/ndp/haskell.sty
index 969ad673fedd614f20c80baf9844fae2e2eb7fb9..3e4d478b1e22cbacae4753bf886ffbab298fb9a2 100644
--- a/docs/ndp/haskell.sty
+++ b/docs/ndp/haskell.sty
@@ -87,7 +87,7 @@
\ProvidesPackage{haskell}[2002/02/08 v1.1a Chilli's Haskell Style]
% NOTE: The sole purpose of the following is to work around what I believe is
-% a bug in LaTeX. If the first occurence of \mathit in a document uses
+% a bug in LaTeX. If the first occurrence of \mathit in a document uses
% \bgroup and \egroup to enclose the argument (instead of { and }),
% \mathit does *not* apply to the argument. (I guess, some font
% initialisation stuff is getting in the way of parsing the argument.)
diff --git a/docs/ndp/vect.tex b/docs/ndp/vect.tex
index 1244972374f28ca57287eed709b6b7216d6f1fd8..cf6ee77ed03695b3d1a0aa7c9b02de7953d1df1c 100644
--- a/docs/ndp/vect.tex
+++ b/docs/ndp/vect.tex
@@ -243,7 +243,7 @@ Note that this is precisely the reason for the \<\parr{\cdot}\> instances for
\<\alpha\to\beta\> and \