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
4,262
Issues
4,262
List
Boards
Labels
Service Desk
Milestones
Iterations
Merge Requests
419
Merge Requests
419
Requirements
Requirements
List
CI / CD
CI / CD
Pipelines
Jobs
Schedules
Security & Compliance
Security & Compliance
Dependency List
License Compliance
Operations
Operations
Incidents
Environments
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
Glasgow Haskell Compiler
GHC
Commits
749740f9
Commit
749740f9
authored
Mar 06, 2017
by
Gabor Greif
💬
1
Browse files
Options
Browse Files
Download
Email Patches
Plain Diff
Typos in comments and manual
parent
fb9ae288
Changes
16
Hide whitespace changes
Inline
Side-by-side
Showing
16 changed files
with
21 additions
and
21 deletions
+21
-21
compiler/coreSyn/CoreUnfold.hs
compiler/coreSyn/CoreUnfold.hs
+1
-1
compiler/simplCore/SetLevels.hs
compiler/simplCore/SetLevels.hs
+1
-1
compiler/simplCore/Simplify.hs
compiler/simplCore/Simplify.hs
+1
-1
compiler/specialise/Specialise.hs
compiler/specialise/Specialise.hs
+1
-1
compiler/typecheck/TcDerivInfer.hs
compiler/typecheck/TcDerivInfer.hs
+1
-1
compiler/typecheck/TcHsType.hs
compiler/typecheck/TcHsType.hs
+1
-1
compiler/typecheck/TcValidity.hs
compiler/typecheck/TcValidity.hs
+2
-2
docs/users_guide/glasgow_exts.rst
docs/users_guide/glasgow_exts.rst
+3
-3
libraries/base/Control/Monad.hs
libraries/base/Control/Monad.hs
+1
-1
libraries/base/GHC/Generics.hs
libraries/base/GHC/Generics.hs
+1
-1
libraries/base/Text/Printf.hs
libraries/base/Text/Printf.hs
+1
-1
libraries/ghc-compact/GHC/Compact.hs
libraries/ghc-compact/GHC/Compact.hs
+2
-2
libraries/ghc-prim/GHC/CString.hs
libraries/ghc-prim/GHC/CString.hs
+1
-1
testsuite/tests/perf/compiler/all.T
testsuite/tests/perf/compiler/all.T
+2
-2
testsuite/tests/simplCore/should_compile/T13317.hs
testsuite/tests/simplCore/should_compile/T13317.hs
+1
-1
utils/deriveConstants/Main.hs
utils/deriveConstants/Main.hs
+1
-1
No files found.
compiler/coreSyn/CoreUnfold.hs
View file @
749740f9
...
...
@@ -768,7 +768,7 @@ funSize dflags top_args fun n_val_args voids
res_discount
|
idArity
fun
>
n_val_args
=
ufFunAppDiscount
dflags
|
otherwise
=
0
-- If the function is partially applied, show a result discount
-- XXX maybe behave like ConSize for eval'd var
ai
ble
-- XXX maybe behave like ConSize for eval'd var
ia
ble
conSize
::
DataCon
->
Int
->
ExprSize
conSize
dc
n_val_args
...
...
compiler/simplCore/SetLevels.hs
View file @
749740f9
...
...
@@ -799,7 +799,7 @@ to
and float bx = I# (a /# 3), because the application of f no
longer obeys the let/app invariant. But (a /# 3) is ok-for-spec
due to a special hack that says division operators can't fail
when the denominator is definitely no-zero. And yet that
when the denominator is definitely no
n
-zero. And yet that
same expression says False to exprIsCheap. Simplest way to
guarantee the let/app invariant is to use the same function!
...
...
compiler/simplCore/Simplify.hs
View file @
749740f9
...
...
@@ -1869,7 +1869,7 @@ be huge. Here's an example (simplCore/should_compile/T7785)
foldr (mapFB c1 f) n xs))
= -- Use mapFB rule: mapFB (mapFB c f) g = mapFB c (f.g)
-- We can do this bec
ua
se (mapFB c n) is a PAP and hence expandable
-- We can do this bec
au
se (mapFB c n) is a PAP and hence expandable
map f (build (\cn. let c1 = mapFB c n in
foldr (mapFB c (f.f)) n x))
...
...
compiler/specialise/Specialise.hs
View file @
749740f9
...
...
@@ -214,7 +214,7 @@ Consider a function whose most general type is
f :: forall a b. Ord a => [a] -> b -> b
There is really no point in making a version of g at Int/Int and another
at Int/Bool, because it's only instan
c
ing the type variable "a" which
at Int/Bool, because it's only instan
tiat
ing the type variable "a" which
buys us any efficiency. Since g is completely polymorphic in b there
ain't much point in making separate versions of g for the different
b types.
...
...
compiler/typecheck/TcDerivInfer.hs
View file @
749740f9
...
...
@@ -737,7 +737,7 @@ GHC were typechecking the binding
bar = $gdm bar
it would
* skolemise the expected type of bar
* instantiate the type of $dm_bar with meta-type varibles
* instantiate the type of $dm_bar with meta-type vari
a
bles
* build an implication constraint
[STEP DAC BUILD]
...
...
compiler/typecheck/TcHsType.hs
View file @
749740f9
...
...
@@ -320,7 +320,7 @@ tcLHsType ty = addTypeCtxt ty (tc_infer_lhs_type typeLevelMode ty)
---------------------------
-- | Should we generalise the kind of this type signature?
-- We *should* generalise if the type
is
mentions no scoped type variables
-- We *should* generalise if the type mentions no scoped type variables
-- or if NoMonoLocalBinds is set. Otherwise, nope.
decideKindGeneralisationPlan
::
Type
->
TcM
Bool
decideKindGeneralisationPlan
ty
...
...
compiler/typecheck/TcValidity.hs
View file @
749740f9
...
...
@@ -306,7 +306,7 @@ This might not necessarily show up in kind checking.
checkValidType
::
UserTypeCtxt
->
Type
->
TcM
()
-- Checks that a user-written type is valid for the given context
-- Assumes argu
em
t is fully zonked
-- Assumes argu
men
t is fully zonked
-- Not used for instance decls; checkValidInstance instead
checkValidType
ctxt
ty
=
do
{
traceTc
"checkValidType"
(
ppr
ty
<+>
text
"::"
<+>
ppr
(
typeKind
ty
))
...
...
@@ -365,7 +365,7 @@ checkValidType ctxt ty
;
traceTc
"checkValidType done"
(
ppr
ty
<+>
text
"::"
<+>
ppr
(
typeKind
ty
))
}
checkValidMonoType
::
Type
->
TcM
()
-- Assumes argu
em
t is fully zonked
-- Assumes argu
men
t is fully zonked
checkValidMonoType
ty
=
do
{
env
<-
tcInitOpenTidyEnv
(
tyCoVarsOfTypeList
ty
)
;
check_type
env
SigmaCtxt
MustBeMonoType
ty
}
...
...
docs/users_guide/glasgow_exts.rst
View file @
749740f9
...
...
@@ -5104,8 +5104,8 @@ this case ``a``). More precisely, a constraint in a class method signature is r
class C a where
op3 :: Eq a => a -> a -- Rejected: constrains class variable only
op4 :: D b => a -> b -- Accepted: constrains a locally-quantified varible `b`
op5 :: D (a,b) => a -> b -- Accepted: constrains a locally-quantified varible `b`
op4 :: D b => a -> b -- Accepted: constrains a locally-quantified vari
a
ble `b`
op5 :: D (a,b) => a -> b -- Accepted: constrains a locally-quantified vari
a
ble `b`
GHC lifts this restriction with language extension
...
...
@@ -8866,7 +8866,7 @@ is ambiguous if and only if ``((undefined :: ty) :: ty)`` would fail to
typecheck
.
We
use
a
very
similar
test
for
*
inferred
*
types
,
to
ensure
that
they
too
are
unambiguous
.
*
Switching
off
the
ambiguity
check
.*
Even
if
a
function
is
has
an
*
Switching
off
the
ambiguity
check
.*
Even
if
a
function
has
an
ambiguous
type
according
the
"guiding principle"
,
it
is
possible
that
the
function
is
callable
.
For
example
:
::
...
...
libraries/base/Control/Monad.hs
View file @
749740f9
...
...
@@ -117,7 +117,7 @@ f >=> g = \x -> f x >>= g
forever
::
(
Applicative
f
)
=>
f
a
->
f
b
{-# INLINE forever #-}
forever
a
=
let
a'
=
a
*>
a'
in
a'
-- Use explicit sharing here, as it
is
prevents a space leak regardless of
-- Use explicit sharing here, as it prevents a space leak regardless of
-- optimizations.
-- -----------------------------------------------------------------------------
...
...
libraries/base/GHC/Generics.hs
View file @
749740f9
...
...
@@ -1176,7 +1176,7 @@ class Generic1 (f :: k -> *) where
-- * In @MetaCons n f s@, @n@ is the constructor's name, @f@ is its fixity,
-- and @s@ is @'True@ if the constructor contains record selectors.
--
-- * In @MetaSel mn su ss ds@, if the field
is
uses record syntax, then @mn@ is
-- * In @MetaSel mn su ss ds@, if the field uses record syntax, then @mn@ is
-- 'Just' the record name. Otherwise, @mn@ is 'Nothing'. @su@ and @ss@ are
-- the field's unpackedness and strictness annotations, and @ds@ is the
-- strictness that GHC infers for the field.
...
...
libraries/base/Text/Printf.hs
View file @
749740f9
...
...
@@ -27,7 +27,7 @@ module Text.Printf(
--
-- | This 'printf' can be extended to format types
-- other than those provided for by default. This
-- is done by instan
c
ing 'PrintfArg' and providing
-- is done by instan
tiat
ing 'PrintfArg' and providing
-- a 'formatArg' for the type. It is possible to
-- provide a 'parseFormat' to process type-specific
-- modifiers, but the default instance is usually
...
...
libraries/ghc-compact/GHC/Compact.hs
View file @
749740f9
...
...
@@ -30,7 +30,7 @@
-- dump the memory to disk and/or send it over the network.
-- For applications that are not bandwidth bound (GHC's heap
-- representation can be as much of a x4 expansion over a
-- binary serialization), this can lead to substantial speed
ups.
-- binary serialization), this can lead to substantial speedups.
--
-- For example, suppose you have a function @loadBigStruct :: IO BigStruct@,
-- which loads a large data structure from the file system. You can "compact"
...
...
@@ -106,7 +106,7 @@ import GHC.Types
-- data, but it is perfomed only once. However, because
-- "Data.Compact.compact" does not stop-the-world, retaining internal
-- sharing during the compaction process is very costly. The user
-- can choose wether to 'compact' or 'compactWithSharing'.
-- can choose w
h
ether to 'compact' or 'compactWithSharing'.
--
-- When you have a @'Compact' a@, you can get a pointer to the actual object
-- in the region using "Data.Compact.getCompact". The 'Compact' type
...
...
libraries/ghc-prim/GHC/CString.hs
View file @
749740f9
...
...
@@ -63,7 +63,7 @@ Moreover, we want to make it CONLIKE, so that:
E.g. the eqString rule in PrelRules
eqString (unpackCString# (Lit s1)) (unpackCString# (Lit s2) = s1==s2
* exprIsConApp_maybe will see the string when we
ah
ve
* exprIsConApp_maybe will see the string when we
ha
ve
let x = unpackCString# "foo"#
...(case x of algs)...
...
...
testsuite/tests/perf/compiler/all.T
View file @
749740f9
...
...
@@ -909,7 +909,7 @@ test('T10370',
# were identical, so I think it's just GC noise.
# 2016-10-20 38221184 Allow top-level string literals.
# See the comment 16 on #8472.
# 2017-02-17 51126304 Type-indexed Typea
w
ble
# 2017-02-17 51126304 Type-indexed Typeable
# 2017-02-27 43455848 Likely drift from recent simplifier improvements
# 2017-02-25 41291976 Early inline patch
...
...
@@ -922,7 +922,7 @@ test('T10370',
# 2016-04-14 101 final demand analyzer run
# 2016-08-08 121 see above
# 2017-01-18 146 Allow top-level string literals in Core
# 2017-02-17 187 Type-indexed Typea
w
ble
# 2017-02-17 187 Type-indexed Typeable
# 2017-02-25 154 Early inline patch
(
wordsize
(
32
),
39
,
15
),
# 2015-10-22 39
...
...
testsuite/tests/simplCore/should_compile/T13317.hs
View file @
749740f9
...
...
@@ -13,4 +13,4 @@ f x = let x = "foo"#
_
->
False
)
-- This case-expression should simplify
-- y
ei
lding a KnownBranch simplifier tick
-- y
ie
lding a KnownBranch simplifier tick
utils/deriveConstants/Main.hs
View file @
749740f9
...
...
@@ -653,7 +653,7 @@ wanteds os = concat
,
constantWord
Haskell
"MAX_Real_Long_REG"
"MAX_REAL_LONG_REG"
-- This tells the native code generator the size of the spill
-- area i
s
has available.
-- area i
t
has available.
,
constantWord
Haskell
"RESERVED_C_STACK_BYTES"
"RESERVED_C_STACK_BYTES"
-- The amount of (Haskell) stack to leave free for saving
-- registers when returning to the scheduler.
...
...
Ben Gamari
🐢
@bgamari
mentioned in issue
#13384 (closed)
·
Mar 06, 2017
mentioned in issue
#13384 (closed)
mentioned in issue #13384
Toggle commit list
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