Skip to content
GitLab
Menu
Projects
Groups
Snippets
Help
Help
Support
Community forum
Keyboard shortcuts
?
Submit feedback
Sign in / Register
Toggle navigation
Menu
Open sidebar
Glasgow Haskell Compiler
GHC
Commits
3748ba3a
Commit
3748ba3a
authored
Nov 26, 2019
by
Brian Wignall
Committed by
Marge Bot
Nov 28, 2019
Browse files
Fix typos, using Wikipedia list of common typos
parent
5f84b52a
Pipeline
#13270
passed with stages
in 494 minutes and 53 seconds
Changes
121
Pipelines
1
Hide whitespace changes
Inline
Side-by-side
compiler/GHC/Hs/Binds.hs
View file @
3748ba3a
...
...
@@ -407,7 +407,7 @@ where 'BIND' binds the monomorphic Ids 'fm' and 'gm', means
gp = ...same again, with gm instead of fm
The 'fwrap' is an imped
e
nce-matcher that typically does nothing; see
The 'fwrap' is an imped
a
nce-matcher that typically does nothing; see
Note [ABExport wrapper].
This is a pretty bad translation, because it duplicates all the bindings.
...
...
compiler/GHC/HsToCore/PmCheck.hs
View file @
3748ba3a
...
...
@@ -947,7 +947,7 @@ Main functions are:
* pmCheck :: PatVec -> [PatVec] -> ValVec -> Delta -> DsM PartialResult
This function implements functions `covered`, `uncovered` and
`divergent` from the paper at once. Calls out to the auxilary function
`divergent` from the paper at once. Calls out to the auxil
i
ary function
`pmCheckGuards` for handling (possibly multiple) guarded RHSs when the whole
clause is checked. Slightly different from the paper because it does not even
produce the covered and uncovered sets. Since we only care about whether a
...
...
compiler/GHC/StgToCmm/Bind.hs
View file @
3748ba3a
...
...
@@ -180,7 +180,7 @@ cgBind (StgRec pairs)
3. emit all the inits, and then all the bodies
We'd rather not have separate functions to do steps 1 and 2 for
each binding, since in pratice they share a lot of code. So we
each binding, since in pra
c
tice they share a lot of code. So we
have just one function, cgRhs, that returns a pair of the CgIdInfo
for step 1, and a monadic computation to generate the code in step
2.
...
...
compiler/GHC/StgToCmm/Prof.hs
View file @
3748ba3a
...
...
@@ -328,14 +328,14 @@ ldvEnterClosure :: ClosureInfo -> CmmReg -> FCode ()
ldvEnterClosure
closure_info
node_reg
=
do
dflags
<-
getDynFlags
let
tag
=
funTag
dflags
closure_info
-- don't forget to sub
s
tract node's tag
-- don't forget to subtract node's tag
ldvEnter
(
cmmOffsetB
dflags
(
CmmReg
node_reg
)
(
-
tag
))
ldvEnter
::
CmmExpr
->
FCode
()
-- Argument is a closure pointer
ldvEnter
cl_ptr
=
do
dflags
<-
getDynFlags
let
-- don't forget to sub
s
tract node's tag
let
-- don't forget to subtract node's tag
ldv_wd
=
ldvWord
dflags
cl_ptr
new_ldv_wd
=
cmmOrWord
dflags
(
cmmAndWord
dflags
(
CmmLoad
ldv_wd
(
bWord
dflags
))
(
CmmLit
(
mkWordCLit
dflags
(
iLDV_CREATE_MASK
dflags
))))
...
...
compiler/GHC/ThToHs.hs
View file @
3748ba3a
...
...
@@ -1059,7 +1059,7 @@ cvt_tup es boxity = do { let cvtl_maybe Nothing = return missingTupArg
(
map
noLoc
es'
)
boxity
}
{- Note [Operator assocation]
{- Note [Operator assoc
i
ation]
We must be quite careful about adding parens:
* Infix (UInfix ...) op arg Needs parens round the first arg
* Infix (Infix ...) op arg Needs parens round the first arg
...
...
compiler/basicTypes/Demand.hs
View file @
3748ba3a
...
...
@@ -618,7 +618,7 @@ useCount _ = Many
* *
************************************************************************
This domain differst from JointDemand in the sen
c
e that pure absence
This domain differst from JointDemand in the sen
s
e that pure absence
is taken away, i.e., we deal *only* with non-absent demands.
Note [Strict demands]
...
...
compiler/basicTypes/IdInfo.hs
View file @
3748ba3a
...
...
@@ -402,7 +402,7 @@ But we don't do that for instance declarations and so we just treat
them all uniformly.
The EXCEPTION is PrimOpIds, which do have rules in their IdInfo. That is
j
s
ut for convenience really.
ju
s
t for convenience really.
However, LocalIds may have non-empty RuleInfo. We treat them
differently because:
...
...
compiler/basicTypes/Literal.hs
View file @
3748ba3a
...
...
@@ -180,7 +180,7 @@ They only get converted into real Core,
during the CorePrep phase, although TidyPgm looks ahead at what the
core will be, so that it can see whether it involves CAFs.
When we initally build an Integer literal, notably when
When we init
i
ally build an Integer literal, notably when
deserialising it from an interface file (see the Binary instance
below), we don't have convenient access to the mkInteger Id. So we
just use an error thunk, and fill in the real Id when we do tcIfaceLit
...
...
compiler/cmm/CLabel.hs
View file @
3748ba3a
...
...
@@ -348,7 +348,7 @@ data ForeignLabelSource
-- external packages. It is safe to treat the RTS package as "external".
|
ForeignLabelInExternalPackage
-- | Label is in the package currenly being compiled.
-- | Label is in the package curren
t
ly being compiled.
-- This is only used for creating hacky tmp labels during code generation.
-- Don't use it in any code that might be inlined across a package boundary
-- (ie, core code) else the information will be wrong relative to the
...
...
compiler/cmm/CmmNode.hs
View file @
3748ba3a
...
...
@@ -669,7 +669,7 @@ scopeUniques (SubScope u _) = [u]
scopeUniques
(
CombinedScope
s1
s2
)
=
scopeUniques
s1
++
scopeUniques
s2
-- Equality and order is based on the head uniques defined above. We
-- take care to short-cut the (extremly) common cases.
-- take care to short-cut the (extrem
e
ly) common cases.
instance
Eq
CmmTickScope
where
GlobalScope
==
GlobalScope
=
True
GlobalScope
==
_
=
False
...
...
compiler/cmm/CmmParse.y
View file @
3748ba3a
...
...
@@ -574,7 +574,7 @@ importName
:: { (FastString, CLabel) }
-- A label imported without an explicit packageId.
-- These are taken to come from
e
some foreign, unnamed package.
-- These are taken to come from some foreign, unnamed package.
: NAME
{ ($1, mkForeignLabel $1 Nothing ForeignLabelInExternalPackage IsFunction) }
...
...
compiler/coreSyn/CoreOpt.hs
View file @
3748ba3a
...
...
@@ -542,7 +542,7 @@ A program has the Let-Unfoldings property iff:
- For every let-bound variable f, whether top-level or nested, whether
recursive or not:
- Both the binding Id of f, and every occurence Id of f, has an idUnfolding.
- Both the binding Id of f, and every occur
r
ence Id of f, has an idUnfolding.
- For non-INLINE things, that unfolding will be f's right hand sids
- For INLINE things (which have a "stable" unfolding) that unfolding is
semantically equivalent to f's RHS, but derived from the original RHS of f
...
...
@@ -1226,11 +1226,11 @@ Here we implement the "push rules" from FC papers:
(fun |> co) arg
and we want to transform it to
(fun arg') |> co'
for some suitable co' and tranformed arg'.
for some suitable co' and tran
s
formed arg'.
* The PushK rule for data constructors. We have
(K e1 .. en) |> co
and we want to tranform to
and we want to tran
s
form to
(K e1' .. en')
by pushing the coercion into the arguments
-}
...
...
compiler/coreSyn/CoreSyn.hs
View file @
3748ba3a
...
...
@@ -1227,7 +1227,7 @@ notOrphan _ = False
chooseOrphanAnchor
::
NameSet
->
IsOrphan
-- Something (rule, instance) is relate to all the Names in this
-- list. Choose one of them to be an "anchor" for the orphan. We make
-- the choice deterministic to avoid gratuit
i
ous changes in the ABI
-- the choice deterministic to avoid gratuitous changes in the ABI
-- hash (#4012). Specifically, use lexicographic comparison of
-- OccName rather than comparing Uniques
--
...
...
@@ -1559,7 +1559,7 @@ data UnfoldingGuidance
ug_size
::
Int
,
-- The "size" of the unfolding.
ug_res
::
Int
-- Scrutinee discount: the discount to sub
s
tract if the thing is in
ug_res
::
Int
-- Scrutinee discount: the discount to subtract if the thing is in
}
-- a context (case (thing args) of ...),
-- (where there are the right number of arguments.)
...
...
compiler/deSugar/Desugar.hs
View file @
3748ba3a
...
...
@@ -528,7 +528,7 @@ In the above example, suppose we had
{-# RULES "rule-for-g" forally. g [y] = ... #-}
Then "rule-for-f" and "rule-for-g" would compete. Better to add phase
control, so "rule-for-f" has a chance to fire before "rule-for-g" becomes
active; or perh
p
as after "rule-for-g" has become inactive. This is checked
active; or perha
p
s after "rule-for-g" has become inactive. This is checked
by 'competesWith'
Class methods have a built-in RULE to select the method from the dictionary,
...
...
compiler/deSugar/DsMeta.hs
View file @
3748ba3a
...
...
@@ -279,7 +279,7 @@ in repTyClD and repC.
Note [Don't quantify implicit type variables in quotes]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
If you're not careful, it's suprisingly easy to take this quoted declaration:
If you're not careful, it's su
r
prisingly easy to take this quoted declaration:
[d| idProxy :: forall proxy (b :: k). proxy b -> proxy b
idProxy x = x
...
...
@@ -1404,7 +1404,7 @@ repE e@(HsTickPragma {}) = notHandled "Tick Pragma" (ppr e)
repE
e
=
notHandled
"Expression form"
(
ppr
e
)
-----------------------------------------------------------------------------
-- Building representations of auxil
l
ary structures like Match, Clause, Stmt,
-- Building representations of auxil
i
ary structures like Match, Clause, Stmt,
repMatchTup
::
LMatch
GhcRn
(
LHsExpr
GhcRn
)
->
DsM
(
Core
TH
.
MatchQ
)
repMatchTup
(
dL
->
L
_
(
Match
{
m_pats
=
[
p
]
...
...
@@ -1481,7 +1481,7 @@ repUpdFields = repList fieldExpQTyConName rep_fld
-- shadow each other. Consider: [| do { x <- f 1; x <- f x; g x } |]
-- First gensym new names for every variable in any of the patterns.
-- both static (x'1 and x'2), and dynamic ((gensym "x") and (gensym "y"))
-- if variables didn't shad
d
ow, the static gensym wouldn't be necessary
-- if variables didn't shadow, the static gensym wouldn't be necessary
-- and we could reuse the original names (x and x).
--
-- do { x'1 <- gensym "x"
...
...
compiler/deSugar/DsMonad.hs
View file @
3748ba3a
...
...
@@ -530,7 +530,7 @@ dsExtendMetaEnv menv thing_inside
discardWarningsDs
::
DsM
a
->
DsM
a
-- Ignore warnings inside the thing inside;
-- used to ignore inaccess
a
ble cases etc. inside generated code
-- used to ignore inaccess
i
ble cases etc. inside generated code
discardWarningsDs
thing_inside
=
do
{
env
<-
getGblEnv
;
old_msgs
<-
readTcRef
(
ds_msgs
env
)
...
...
compiler/hieFile/HieAst.hs
View file @
3748ba3a
...
...
@@ -402,7 +402,7 @@ bar (x :: forall a. a -> a) = ... -- a is not in scope here
bax (x :: a) = ... -- a is in scope here
Because of HsWC and HsIB pass on their scope to their children
we must wrap the LHsType in pattern signatures in a
Shielded explictly, so that the HsWC/HsIB scope is not passed
Shielded explic
i
tly, so that the HsWC/HsIB scope is not passed
on the the LHsType
-}
...
...
compiler/hieFile/HieBin.hs
View file @
3748ba3a
...
...
@@ -117,7 +117,7 @@ writeHieFile hie_file_path hiefile = do
symtab_p_p
<-
tellBin
bh0
put_
bh0
symtab_p_p
-- Make some intial state
-- Make some in
i
tial state
symtab_next
<-
newFastMutInt
writeFastMutInt
symtab_next
0
symtab_map
<-
newIORef
emptyUFM
...
...
compiler/iface/IfaceType.hs
View file @
3748ba3a
...
...
@@ -885,7 +885,7 @@ ppr_ty ctxt_prec (IfaceCoercionTy co)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
RuntimeRep variables are considered by many (most?) users to be little
more than syntactic noise. When the notion was introduced there was a
signficant and understandable push-back from those with pedagogy in
sign
i
ficant and understandable push-back from those with pedagogy in
mind, which argued that RuntimeRep variables would throw a wrench into
nearly any teach approach since they appear in even the lowly ($)
function's type,
...
...
compiler/iface/LoadIface.hs
View file @
3748ba3a
...
...
@@ -549,7 +549,7 @@ But there is a HORRIBLE HACK here.
* And that means we end up loading M.hi-boot, because those
data types are not yet in the type environment.
But in this w
i
erd case, /all/ we need is the types. We don't need
But in this we
i
rd case, /all/ we need is the types. We don't need
instances, rules etc. And if we put the instances in the EPS
we get "duplicate instance" warnings when we compile the "real"
instance in M itself. Hence the strange business of just updateing
...
...
Prev
1
2
3
4
5
…
7
Next
Marge Bot
💬
@marge-bot
mentioned in merge request
!2227 (closed)
·
Nov 28, 2019
mentioned in merge request
!2227 (closed)
mentioned in merge request !2227
Toggle commit list
Write
Preview
Supports
Markdown
0%
Try again
or
attach a new file
.
Attach a file
Cancel
You are about to add
0
people
to the discussion. Proceed with caution.
Finish editing this message first!
Cancel
Please
register
or
sign in
to comment