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
Alex D
GHC
Commits
a76e6f55
Commit
a76e6f55
authored
Mar 30, 2016
by
Gabor Greif
💬
Browse files
Options
Browse Files
Download
Email Patches
Plain Diff
Typos in non-code
parent
cb9a1e68
Changes
17
Hide whitespace changes
Inline
Side-by-side
Showing
17 changed files
with
18 additions
and
18 deletions
+18
-18
compiler/coreSyn/CoreSubst.hs
compiler/coreSyn/CoreSubst.hs
+1
-1
compiler/coreSyn/CoreUnfold.hs
compiler/coreSyn/CoreUnfold.hs
+1
-1
compiler/coreSyn/MkCore.hs
compiler/coreSyn/MkCore.hs
+1
-1
compiler/ghci/ByteCodeGen.hs
compiler/ghci/ByteCodeGen.hs
+1
-1
compiler/parser/Lexer.x
compiler/parser/Lexer.x
+1
-1
compiler/simplCore/CallArity.hs
compiler/simplCore/CallArity.hs
+1
-1
compiler/simplCore/OccurAnal.hs
compiler/simplCore/OccurAnal.hs
+1
-1
compiler/simplCore/SetLevels.hs
compiler/simplCore/SetLevels.hs
+1
-1
compiler/specialise/SpecConstr.hs
compiler/specialise/SpecConstr.hs
+1
-1
compiler/typecheck/TcExpr.hs
compiler/typecheck/TcExpr.hs
+1
-1
compiler/types/TyCoRep.hs
compiler/types/TyCoRep.hs
+2
-2
docs/stg-spec/stg-spec.mng
docs/stg-spec/stg-spec.mng
+1
-1
docs/users_guide/glasgow_exts.rst
docs/users_guide/glasgow_exts.rst
+1
-1
testsuite/tests/primops/should_run/T7689.hs
testsuite/tests/primops/should_run/T7689.hs
+1
-1
testsuite/tests/typecheck/should_compile/tc195.hs
testsuite/tests/typecheck/should_compile/tc195.hs
+1
-1
testsuite/tests/warnings/should_compile/T11128.hs
testsuite/tests/warnings/should_compile/T11128.hs
+1
-1
testsuite/tests/warnings/should_compile/T11128b.hs
testsuite/tests/warnings/should_compile/T11128b.hs
+1
-1
No files found.
compiler/coreSyn/CoreSubst.hs
View file @
a76e6f55
...
...
@@ -747,7 +747,7 @@ substTickish _subst other = other
{- Note [Substitute lazily]
~~~~~~~~~~~~~~~~~~~~~~~~~~~
The functions that substitute over IdInfo must be pretty lazy, bec
u
ause
The functions that substitute over IdInfo must be pretty lazy, because
they are knot-tied by substRecBndrs.
One case in point was Trac #10627 in which a rule for a function 'f'
...
...
compiler/coreSyn/CoreUnfold.hs
View file @
a76e6f55
...
...
@@ -785,7 +785,7 @@ buildSize :: ExprSize
buildSize
=
SizeIs
0
emptyBag
40
-- We really want to inline applications of build
-- build t (\cn -> e) should cost only the cost of e (because build will be inlined later)
-- Indeed, we should add a result_discount bec
u
ause build is
-- Indeed, we should add a result_discount because build is
-- very like a constructor. We don't bother to check that the
-- build is saturated (it usually is). The "-2" discounts for the \c n,
-- The "4" is rather arbitrary.
...
...
compiler/coreSyn/MkCore.hs
View file @
a76e6f55
...
...
@@ -327,7 +327,7 @@ Usually we want the former, but occasionally the latter.
mkCoreVarTup
::
[
Id
]
->
CoreExpr
mkCoreVarTup
ids
=
mkCoreTup
(
map
Var
ids
)
-- | Bu
li
d the type of a small tuple that holds the specified variables
-- | Bu
il
d the type of a small tuple that holds the specified variables
-- One-tuples are flattened; see Note [Flattening of one-tuples]
mkCoreVarTupTy
::
[
Id
]
->
Type
mkCoreVarTupTy
ids
=
mkBoxedTupleTy
(
map
idType
ids
)
...
...
compiler/ghci/ByteCodeGen.hs
View file @
a76e6f55
...
...
@@ -525,7 +525,7 @@ schemeE d s p (AnnCase scrut bndr _ [(DataAlt dc, [bind1, bind2], rhs)])
-- case .... of x { (# V'd-thing, a #) -> ... }
-- to
-- case .... of a { DEFAULT -> ... }
-- becuse the return convention for both are identical.
-- bec
a
use the return convention for both are identical.
--
-- Note that it does not matter losing the void-rep thing from the
-- envt (it won't be bound now) because we never look such things up.
...
...
compiler/parser/Lexer.x
View file @
a76e6f55
...
...
@@ -526,7 +526,7 @@ $tab { warnTab }
-- expressions and patterns use the same parser, and also because we want
-- to allow type patterns within expression patterns.
--
-- Disambiguation is accomplished by requiring *something* to appear betwen
-- Disambiguation is accomplished by requiring *something* to appear betwe
e
n
-- type application and the preceding token. This something must end with
-- a character that cannot be the end of the variable bound in an as-pattern.
-- Currently (June 2015), this means that the something cannot end with a
...
...
compiler/simplCore/CallArity.hs
View file @
a76e6f55
...
...
@@ -353,7 +353,7 @@ We never eta-expand a thunk in a recursive group, on the grounds that if it is
part of a recursive group, then it will be called multipe times.
This is not necessarily true, e.g. it would be safe to eta-expand t2 (but not
t1) in the follwing code:
t1) in the foll
o
wing code:
let go x = t1
t1 = if ... then t2 else ...
...
...
compiler/simplCore/OccurAnal.hs
View file @
a76e6f55
...
...
@@ -117,7 +117,7 @@ occurAnalyseExpr' enable_binder_swap expr
{- Note [Plugin rules]
~~~~~~~~~~~~~~~~~~~~~~
Conal El
io
t (Trac #11651) built a GHC plugin that added some
Conal El
liot
t (Trac #11651) built a GHC plugin that added some
BuiltinRules (for imported Ids) to the mg_rules field of ModGuts, to
do some domain-specific transformations that could not be expressed
with an ordinary pattern-matching CoreRule. But then we can't extract
...
...
compiler/simplCore/SetLevels.hs
View file @
a76e6f55
...
...
@@ -1146,7 +1146,7 @@ zap_demand_info v
Note [Zapping the demand info]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
VERY IMPORTANT: we must zap the demand info if the thing is going to
float out, bec
u
ause it may be less demanded than at its original
float out, because it may be less demanded than at its original
binding site. Eg
f :: Int -> Int
f x = let v = 3*4 in v+x
...
...
compiler/specialise/SpecConstr.hs
View file @
a76e6f55
...
...
@@ -1764,7 +1764,7 @@ Note [Strictness information in worker binders]
After having calculated the strictness annotation for the worker (see Note
[Transfer strictness] above), we also want to have this information attached to
the worker’s arguments, for the benefit of later passes. The function
handOutStrictnessInformation decomposes the stric
nt
ess annotation calculated by
handOutStrictnessInformation decomposes the stric
tn
ess annotation calculated by
calcSpecStrictness and attaches them to the variables.
************************************************************************
...
...
compiler/typecheck/TcExpr.hs
View file @
a76e6f55
...
...
@@ -1214,7 +1214,7 @@ tcArgs fun orig_fun_ty fun_orig orig_args herald
tcArg
::
LHsExpr
Name
-- The function (for error messages)
->
LHsExpr
Name
-- Actual arguments
->
TcRhoType
-- expected arg type
->
Int
-- # of ar
ug
ment
->
Int
-- # of ar
gu
ment
->
TcM
(
LHsExpr
TcId
)
-- Resulting argument
tcArg
fun
arg
ty
arg_no
=
addErrCtxt
(
funAppCtxt
fun
arg
arg_no
)
$
tcPolyExprNC
arg
ty
...
...
compiler/types/TyCoRep.hs
View file @
a76e6f55
...
...
@@ -499,8 +499,8 @@ In type declarations:
* Invisible (k1), Specified (k)
data T a b (c :: k) = MkT (a b) (Proxy c)
Here T's kind is T :: forall {k1:*} (k:*). (k1->*) -> k1 -> k -> *
So 'k' is Specified, bec
ua
se it appears explicitly,
but 'k1' is Invisible, bec
ua
se it does not
So 'k' is Specified, bec
au
se it appears explicitly,
but 'k1' is Invisible, bec
au
se it does not
---- Printing -----
...
...
docs/stg-spec/stg-spec.mng
View file @
a76e6f55
...
...
@@ -139,7 +139,7 @@ application of a let-no-escape variable.
\gram
{
\ottret
}
Values
$
v
$
are functions (re-entrant closures) and constructors; thunks
are not considered va
ul
es. Evaluation guarantees that a value will be
are not considered va
lu
es. Evaluation guarantees that a value will be
produced.
Profiling also records allocation costs for creating objects on the heap:
...
...
docs/users_guide/glasgow_exts.rst
View file @
a76e6f55
...
...
@@ -4301,7 +4301,7 @@ all currently bundled constructors. For example, we could write: ::
in which case, ``Example`` would export the type constructor ``MyNum`` with
the data constructor ``MkNum`` and also the pattern synonym ``Zero``.
Bundled patterns synoyms are type checked to ensure that they are of the same
Bundled patterns syno
n
yms are type checked to ensure that they are of the same
type as the type constructor which they are bundled with. A pattern synonym
``P`` can not be bundled with a type constructor ``T`` if ``P``\'s type is visibly
incompatible with ``T``.
...
...
testsuite/tests/primops/should_run/T7689.hs
View file @
a76e6f55
...
...
@@ -53,7 +53,7 @@ main = do
-- anything xored with itself is 0
print
(
I
#
(
maxI
#
`
xorI
#
`
maxI
#
)
==
0
)
print
(
I
#
(
minI
#
`
xorI
#
`
minI
#
)
==
0
)
-- xoring with -1 is like bitwise negation (becuse -1 has all bits set to 1)
-- xoring with -1 is like bitwise negation (bec
a
use -1 has all bits set to 1)
print
(
I
#
(
minI
#
`
xorI
#
`
-
1
#
)
==
maxI
)
print
(
I
#
(
maxI
#
`
xorI
#
`
-
1
#
)
==
minI
)
print
(
I
#
(
-
1
#
`
xorI
#
`
minI
#
)
==
maxI
)
...
...
testsuite/tests/typecheck/should_compile/tc195.hs
View file @
a76e6f55
{-# LANGUAGE MultiParamTypeClasses, FunctionalDependencies,
FlexibleInstances, TypeSynonymInstances #-}
-- This one made GHC 6.4 loop bec
u
ause Unify.unify
-- This one made GHC 6.4 loop because Unify.unify
-- didn't deal correctly with unifying
-- a :=: Foo a
-- where
...
...
testsuite/tests/warnings/should_compile/T11128.hs
View file @
a76e6f55
...
...
@@ -35,7 +35,7 @@ instance M.Monad T1 where
(
>>
)
=
undefined
----------------------------------------------------------------------------
-- backward compat canonical defintion
-- backward compat canonical defin
i
tion
data
T2
a
=
T2
a
deriving
Functor
...
...
testsuite/tests/warnings/should_compile/T11128b.hs
View file @
a76e6f55
...
...
@@ -43,7 +43,7 @@ instance MF.MonadFail T1 where
fail
=
M
.
fail
----------------------------------------------------------------------------
-- backward compat canonical defintion
-- backward compat canonical defin
i
tion
data
T2
a
=
T2
a
deriving
Functor
...
...
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