Skip to content
GitLab
Projects
Groups
Snippets
Help
Loading...
Help
Help
Support
Community forum
Keyboard shortcuts
?
Submit feedback
Sign in / Register
Toggle navigation
GHC
Project overview
Project overview
Details
Activity
Releases
Repository
Repository
Files
Commits
Branches
Tags
Contributors
Graph
Compare
Locked Files
Issues
0
Issues
0
List
Boards
Labels
Service Desk
Milestones
Iterations
Merge Requests
0
Merge Requests
0
Requirements
Requirements
List
CI / CD
CI / CD
Pipelines
Jobs
Schedules
Security & Compliance
Security & Compliance
Dependency List
License Compliance
Operations
Operations
Incidents
Environments
Packages & Registries
Packages & Registries
Package Registry
Container Registry
Analytics
Analytics
CI / CD
Code Review
Insights
Issue
Repository
Value Stream
Wiki
Wiki
Snippets
Snippets
Members
Members
Collapse sidebar
Close sidebar
Activity
Graph
Create a new issue
Jobs
Commits
Issue Boards
Open sidebar
jberryman
GHC
Commits
bb2acfe0
Commit
bb2acfe0
authored
Jan 22, 2019
by
Gabor Greif
💬
Committed by
Ben Gamari
Jan 23, 2019
Browse files
Options
Browse Files
Download
Email Patches
Plain Diff
A few typofixes
parent
c9a02dfc
Changes
17
Hide whitespace changes
Inline
Side-by-side
Showing
17 changed files
with
19 additions
and
20 deletions
+19
-20
compiler/basicTypes/BasicTypes.hs
compiler/basicTypes/BasicTypes.hs
+1
-1
compiler/coreSyn/CoreArity.hs
compiler/coreSyn/CoreArity.hs
+1
-1
compiler/coreSyn/CoreSyn.hs
compiler/coreSyn/CoreSyn.hs
+1
-1
compiler/coreSyn/CoreUnfold.hs
compiler/coreSyn/CoreUnfold.hs
+1
-1
compiler/hieFile/HieAst.hs
compiler/hieFile/HieAst.hs
+1
-1
compiler/hsSyn/HsDecls.hs
compiler/hsSyn/HsDecls.hs
+1
-1
compiler/main/InteractiveEval.hs
compiler/main/InteractiveEval.hs
+1
-1
compiler/nativeGen/CFG.hs
compiler/nativeGen/CFG.hs
+1
-1
compiler/prelude/primops.txt.pp
compiler/prelude/primops.txt.pp
+1
-1
compiler/simplCore/Simplify.hs
compiler/simplCore/Simplify.hs
+2
-3
compiler/stgSyn/CoreToStg.hs
compiler/stgSyn/CoreToStg.hs
+1
-1
compiler/typecheck/FamInst.hs
compiler/typecheck/FamInst.hs
+1
-1
docs/users_guide/extending_ghc.rst
docs/users_guide/extending_ghc.rst
+1
-1
hadrian/src/Rules/Documentation.hs
hadrian/src/Rules/Documentation.hs
+1
-1
libraries/base/Data/Either.hs
libraries/base/Data/Either.hs
+2
-2
libraries/base/Data/Foldable.hs
libraries/base/Data/Foldable.hs
+1
-1
rts/posix/Signals.c
rts/posix/Signals.c
+1
-1
No files found.
compiler/basicTypes/BasicTypes.hs
View file @
bb2acfe0
...
...
@@ -1277,7 +1277,7 @@ The main effects of CONLIKE are:
- The occurrence analyser (OccAnal) and simplifier (Simplify) treat
CONLIKE thing like constructors, by ANF-ing them
- New function
c
oreUtils.exprIsExpandable is like exprIsCheap, but
- New function
C
oreUtils.exprIsExpandable is like exprIsCheap, but
additionally spots applications of CONLIKE functions
- A CoreUnfolding has a field that caches exprIsExpandable
...
...
compiler/coreSyn/CoreArity.hs
View file @
bb2acfe0
...
...
@@ -598,7 +598,7 @@ The analysis is easy to achieve because exprEtaExpandArity takes an
argument
type CheapFun = CoreExpr -> Maybe Type -> Bool
used to decide if an expression is cheap enough to push inside a
lambda. And exprIsCheap
'
in turn takes an argument
lambda. And exprIsCheap
X
in turn takes an argument
type CheapAppFun = Id -> Int -> Bool
which tells when an application is cheap. This makes it easy to
write the analysis loop.
...
...
compiler/coreSyn/CoreSyn.hs
View file @
bb2acfe0
...
...
@@ -509,7 +509,7 @@ this exhaustive list can be empty!
scrutinee is bound to raise an exception or diverge. When do we know
this? See Note [Bottoming expressions] in CoreUtils.
* The possiblity of empty alternatives is one reason we need a type on
* The possib
i
lity of empty alternatives is one reason we need a type on
the case expression: if the alternatives are empty we can't get the
type from the alternatives!
...
...
compiler/coreSyn/CoreUnfold.hs
View file @
bb2acfe0
...
...
@@ -294,7 +294,7 @@ Note [INLINE pragmas and boring contexts]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
An INLINE pragma uses mkInlineUnfoldingWithArity to build the
unfolding. That sets the ug_boring_ok flag to False if the function
is not tiny (inlineBor
k
ingOK), so that even INLINE functions are not
is not tiny (inlineBoringOK), so that even INLINE functions are not
inlined in an utterly boring context. E.g.
\x y. Just (f y x)
Nothing is gained by inlining f here, even if it has an INLINE
...
...
compiler/hieFile/HieAst.hs
View file @
bb2acfe0
...
...
@@ -210,7 +210,7 @@ data PScoped a = PS (Maybe Span)
{- Note [TyVar Scopes]
Due to -XScopedTypeVariables, type variables can be in scope quite far from
their original binding. We resolve the scope of these type variables
in a sep
e
rate pass
in a sep
a
rate pass
-}
data
TScoped
a
=
TS
TyVarScope
a
-- TyVarScope
...
...
compiler/hsSyn/HsDecls.hs
View file @
bb2acfe0
...
...
@@ -796,7 +796,7 @@ Examples:
* data T2 a b = ...
-- No CUSK; we do not want to guess T2 :: * -> * -> *
-- bec
ua
se the full decl might be data T a b = MkT (a b)
-- bec
au
se the full decl might be data T a b = MkT (a b)
* data T3 (a :: k -> *) (b :: *) = ...
-- CUSK; equivalent to T3 :: (k -> *) -> * -> *
...
...
compiler/main/InteractiveEval.hs
View file @
bb2acfe0
...
...
@@ -246,7 +246,7 @@ runParsedDecls decls = do
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
We don't want to display internally-generated bindings to users.
Things like the coercion axiom for newtypes. These bindings all get
OccNames that users can't write, to avoid the possiblity of name
OccNames that users can't write, to avoid the possib
i
lity of name
clashes (in linker symbols). That gives a convenient way to suppress
them. The relevant predicate is OccName.isDerivedOccName.
See Trac #11051 for more background and examples.
...
...
compiler/nativeGen/CFG.hs
View file @
bb2acfe0
...
...
@@ -361,7 +361,7 @@ pprEdgeWeights m =
ppr
weight
<>
text
"
\"
];
\n
"
--for the case that there are no edges from/to this node.
--This should rarely happen but it can save a lot of time
--to immediatly see it when it does.
--to immediat
e
ly see it when it does.
printNode
node
=
text
"
\t
"
<>
ppr
node
<>
text
";
\n
"
getEdgeNodes
(
from
,
to
,
_weight
)
=
[
from
,
to
]
...
...
compiler/prelude/primops.txt.pp
View file @
bb2acfe0
...
...
@@ -21,7 +21,7 @@
--
http
:
//
ghc
.
haskell
.
org
/
trac
/
ghc
/
wiki
/
Commentary
/
PrimOps
--
--
Note
in
particular
that
Haskell
block
-
style
comments
are
not
recognized
--
here
,
so
stick
to
'--'
(
even
for
Notes
spanning
mu
tl
iple
lines
)
.
--
here
,
so
stick
to
'--'
(
even
for
Notes
spanning
mu
lt
iple
lines
)
.
--
This
file
is
divided
into
named
sections
,
each
containing
or
more
--
primop
entries
.
Section
headers
have
the
format
:
...
...
compiler/simplCore/Simplify.hs
View file @
bb2acfe0
...
...
@@ -255,7 +255,7 @@ simplLazyBind env top_lvl is_rec bndr bndr1 rhs rhs_se
|
not
(
tickishFloatable
t
)
=
surely_not_lam
e
-- eta-reduction could float
surely_not_lam
_
=
True
-- Do not do the "abstract ty
y
var" thing if there's
-- Do not do the "abstract tyvar" thing if there's
-- a lambda inside, because it defeats eta-reduction
-- f = /\a. \x. g a x
-- should eta-reduce.
...
...
@@ -270,7 +270,7 @@ simplLazyBind env top_lvl is_rec bndr bndr1 rhs rhs_se
-- Never float join-floats out of a non-join let-binding
-- So wrap the body in the join-floats right now
-- Henc: body_floats1 consists only of let-floats
-- Henc
e
: body_floats1 consists only of let-floats
;
let
(
body_floats1
,
body1
)
=
wrapJoinFloatsX
body_floats0
body0
-- ANF-ise a constructor or PAP rhs
...
...
@@ -3560,4 +3560,3 @@ simplRules env mb_new_id rules mb_cont
,
ru_fn
=
fn_name'
,
ru_args
=
args'
,
ru_rhs
=
rhs'
})
}
compiler/stgSyn/CoreToStg.hs
View file @
bb2acfe0
...
...
@@ -180,7 +180,7 @@ import Control.Monad (liftM, ap)
-- ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
--
-- Previously `coreToStg` was initializing cost-centre stack fields as `noCCS`,
-- and the fields were then fixed by a separate pass `stgMassageForProfiling`.
-- We now initialize these correctly. The initialization works like this:
--
-- - For non-top level bindings always use `currentCCS`.
...
...
compiler/typecheck/FamInst.hs
View file @
bb2acfe0
...
...
@@ -776,7 +776,7 @@ unusedInjTvsInRHS tycon injList lhs rhs =
(`
minusVarSet
`
injRhsVars
)
<$>
injLHSVars
where
inj_pairs
::
[(
Type
,
ArgFlag
)]
-- All the injective arguments, paired with their visiblity
-- All the injective arguments, paired with their visib
i
lity
inj_pairs
=
ASSERT2
(
injList
`
equalLength
`
lhs
,
ppr
tycon
$$
ppr
injList
$$
ppr
lhs
)
filterByList
injList
(
lhs
`
zip
`
tyConArgFlags
tycon
lhs
)
...
...
docs/users_guide/extending_ghc.rst
View file @
bb2acfe0
...
...
@@ -671,7 +671,7 @@ you need to access the renamed or type checked version of the syntax tree with
renamed :: [CommandLineOption] -> TcGblEnv -> HsGroup GhcRn -> TcM (TcGblEnv, HsGroup GhcRn)
By overriding the ``renamedResultAction`` field we can modify each ``HsGroup``
after it has been renamed. A source file is sep
e
rated into groups depending on
after it has been renamed. A source file is sep
a
rated into groups depending on
the location of template haskell splices so the contents of these groups may
not be intuitive. In order to save the entire renamed AST for inspection
at the end of typechecking you can set ``renamedResultAction`` to ``keepRenamedSource``
...
...
hadrian/src/Rules/Documentation.hs
View file @
bb2acfe0
...
...
@@ -118,7 +118,7 @@ buildLibraryDocumentation = do
-- We want Haddocks for everything except `rts` to be built, but we
-- don't want the index to be polluted by stuff from `ghc`-the-library
-- (there will be a sep
e
rate top-level link to those Haddocks).
-- (there will be a sep
a
rate top-level link to those Haddocks).
haddocks
<-
allHaddocks
let
neededDocs
=
filter
(
\
x
->
takeFileName
x
/=
"rts.haddock"
)
haddocks
libDocs
=
filter
(
\
x
->
takeFileName
x
/=
"ghc.haddock"
)
neededDocs
...
...
libraries/base/Data/Either.hs
View file @
bb2acfe0
...
...
@@ -192,7 +192,7 @@ either _ g (Right y) = g y
--
lefts
::
[
Either
a
b
]
->
[
a
]
lefts
x
=
[
a
|
Left
a
<-
x
]
{-# INLINEABLE lefts #-}
-- otherwise doesnt get an unfolding, see #13689
{-# INLINEABLE lefts #-}
-- otherwise doesn
'
t get an unfolding, see #13689
-- | Extracts from a list of 'Either' all the 'Right' elements.
-- All the 'Right' elements are extracted in order.
...
...
@@ -207,7 +207,7 @@ lefts x = [a | Left a <- x]
--
rights
::
[
Either
a
b
]
->
[
b
]
rights
x
=
[
a
|
Right
a
<-
x
]
{-# INLINEABLE rights #-}
-- otherwise doesnt get an unfolding, see #13689
{-# INLINEABLE rights #-}
-- otherwise doesn
'
t get an unfolding, see #13689
-- | Partitions a list of 'Either' into two lists.
-- All the 'Left' elements are extracted, in order, to the first
...
...
libraries/base/Data/Foldable.hs
View file @
bb2acfe0
...
...
@@ -706,7 +706,7 @@ GHC used to proceed like this:
mapM_ <big> (build g)
= { Defintion of mapM_ }
= { Defin
i
tion of mapM_ }
foldr ((>>) . <big>) (return ()) (build g)
= { foldr/build rule }
...
...
rts/posix/Signals.c
View file @
bb2acfe0
...
...
@@ -164,7 +164,7 @@ ioManagerWakeup (void)
r
=
write
(
io_manager_wakeup_fd
,
&
byte
,
1
);
#endif
/* N.B. If the TimerManager is shutting down as we run this
* then there is a possiblity that our first read of
* then there is a possib
i
lity that our first read of
* io_manager_wakeup_fd is non-negative, but before we get to the
* write the file is closed. If this occurs, io_manager_wakeup_fd
* will be written into with -1 (GHC.Event.Control does this prior
...
...
Write
Preview
Markdown
is supported
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