Skip to content
GitLab
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
80d4a033
Commit
80d4a033
authored
Oct 31, 2016
by
Gabor Greif
💬
Browse files
Typos in comments
parent
7ddbdfd3
Changes
12
Hide whitespace changes
Inline
Side-by-side
compiler/iface/MkIface.hs
View file @
80d4a033
...
...
@@ -1024,7 +1024,7 @@ mkIfaceExports exports
sort_flds
=
sortBy
(
stableNameCmp
`
on
`
flSelector
)
{-
Note [Orignal module]
Note [Orig
i
nal module]
~~~~~~~~~~~~~~~~~~~~~
Consider this:
module X where { data family T }
...
...
compiler/rename/RnEnv.hs
View file @
80d4a033
...
...
@@ -1572,7 +1572,7 @@ respectively. Initially, we just store the "standard" name (PrelNames.fromInteg
fromRationalName etc), but the renamer changes this to the appropriate user
name if Opt_NoImplicitPrelude is on. That is what lookupSyntaxName does.
We treat the orignal (standard) names as free-vars too, because the type checker
We treat the orig
i
nal (standard) names as free-vars too, because the type checker
checks the type of the user thing against the type of the standard thing.
-}
...
...
compiler/typecheck/TcRnMonad.hs
View file @
80d4a033
...
...
@@ -1123,7 +1123,7 @@ error to report. So this capture-the-emit dance isn't as stupid as it
looks :-).
However suppose we throw an exception inside an invocation of
captureConstraints. Then we'll discard all the costraints. But some
captureConstraints. Then we'll discard all the co
n
straints. But some
of those contraints might be "variable out of scope" Hole constraints,
and that might have been the actual original cause of the exception!
For example (Trac #12529):
...
...
compiler/typecheck/TcSMonad.hs
View file @
80d4a033
...
...
@@ -607,7 +607,7 @@ data InertCans -- See Note [Detailed InertCans Invariants] for more
,
inert_safehask
::
DictMap
Ct
-- Failed dictionary resolution due to Safe Haskell overlapping
-- instances restriction. We keep this sep
e
rate from inert_dicts
-- instances restriction. We keep this sep
a
rate from inert_dicts
-- as it doesn't cause compilation failure, just safe inference
-- failure.
--
...
...
compiler/typecheck/TcTyClsDecls.hs
View file @
80d4a033
...
...
@@ -742,7 +742,7 @@ tcTyClDecl1 _parent roles_info
,
tcdATs
=
ats
,
tcdATDefs
=
at_defs
})
=
ASSERT
(
isNothing
_parent
)
do
{
clas
<-
fixM
$
\
clas
->
-- We need the knot becase 'clas' is passed into tcClassATs
-- We need the knot beca
u
se 'clas' is passed into tcClassATs
tcTyClTyVars
class_name
$
\
binders
res_kind
->
do
{
MASSERT
(
isConstraintKind
res_kind
)
;
traceTc
"tcClassDecl 1"
(
ppr
class_name
$$
ppr
binders
)
...
...
compiler/typecheck/TcType.hs
View file @
80d4a033
...
...
@@ -303,7 +303,7 @@ data InferResult
,
ir_lvl
::
TcLevel
-- See Note [TcLevel of ExpType] in TcMType
,
ir_inst
::
Bool
-- True <=> deeply instantiate before returning
-- i.e. return a RhoType
-- False <=> do not instant
a
ite before returning
-- False <=> do not instanti
a
te before returning
-- i.e. return a SigmaType
,
ir_ref
::
IORef
(
Maybe
TcType
)
}
-- The type that fills in this hole should be a Type,
...
...
compiler/vectorise/Vectorise/Monad/Naming.hs
View file @
80d4a033
...
...
@@ -35,7 +35,7 @@ import Control.Monad
-- |Create a localised variant of a name, using the provided function to transform its `OccName`.
--
-- If the name external, encode the orignal name's module into the new 'OccName'. The result is
-- If the name external, encode the orig
i
nal name's module into the new 'OccName'. The result is
-- always an internal system name.
--
mkLocalisedName
::
(
Maybe
String
->
OccName
->
OccName
)
->
Name
->
VM
Name
...
...
compiler/vectorise/Vectorise/Type/Env.hs
View file @
80d4a033
...
...
@@ -330,7 +330,7 @@ vectTypeEnv tycons vectTypeDecls vectClassDecls
}
-- Add a mapping from the original to vectorised type constructor to the vectorisation map.
-- Unless the type constructor is abstract, also mappings from the orignal's data constructors
-- Unless the type constructor is abstract, also mappings from the orig
i
nal's data constructors
-- to the vectorised type's data constructors.
--
-- We have three cases: (1) original and vectorised type constructor are the same, (2) the
...
...
libraries/base/System/Console/GetOpt.hs
View file @
80d4a033
...
...
@@ -124,7 +124,7 @@ data OptKind a -- kind of cmd line arg (internal use only):
-- second argument.
usageInfo
::
String
-- header
->
[
OptDescr
a
]
-- option descriptors
->
String
-- nicely formatted decription of options
->
String
-- nicely formatted de
s
cription of options
usageInfo
header
optDescr
=
unlines
(
header
:
table
)
where
(
ss
,
ls
,
ds
)
=
(
unzip3
.
concatMap
fmtOpt
)
optDescr
table
=
zipWith3
paste
(
sameLen
ss
)
(
sameLen
ls
)
ds
...
...
testsuite/tests/ffi/should_run/ffi005.hs
View file @
80d4a033
-- !!! test for foreign import dynamic/wrapper, orignally by Alastair Reid,
-- !!! test for foreign import dynamic/wrapper, orig
i
nally by Alastair Reid,
-- with a few changes to get it to run on GHC by Simon Marlow.
import
Foreign
hiding
(
unsafePerformIO
)
...
...
testsuite/tests/polykinds/T7332.hs
View file @
80d4a033
...
...
@@ -63,8 +63,8 @@ hence
Now things are delicate. Either the instance Monoid (DC d) will fire or,
if we are lucky, we might spot that (Monoid (DC d)) is a superclass of
a given. But now (Decl 15) we add superclasses lazily, so that is less
likely to happen, and was always fragile. So include (M
O
noid d) in the
signature, as was the case in the orignal ticket.
likely to happen, and was always fragile. So include (M
o
noid d) in the
signature, as was the case in the orig
i
nal ticket.
-}
...
...
testsuite/tests/typecheck/should_compile/tc080.hs
View file @
80d4a033
--module Parse(Parse(..),whiteSpace,sep
e
ratedBy) where
--module Parse(Parse(..),whiteSpace,sep
a
ratedBy) where
--import StdLib
module
ShouldSucceed
where
...
...
@@ -27,14 +27,14 @@ instance Parse Char where
forced
n
=
True
instance
(
Parse
a
)
=>
Parse
[
a
]
where
parseType
more
=
(
map
parseLine
(
sep
e
ratedBy
','
(
l
++
","
)),
out
)
parseType
more
=
(
map
parseLine
(
sep
a
ratedBy
','
(
l
++
","
)),
out
)
where
(
l
,
']'
:
out
)
=
span'
(
\
x
->
x
/=
']'
)
(
tail
more
)
forced
=
all
forced
sep
e
ratedBy
::
Char
->
String
->
[
String
]
sep
e
ratedBy
ch
[]
=
[]
sep
e
ratedBy
ch
xs
=
twaddle
ch
(
span'
(
\
x
->
x
/=
ch
)
xs
)
where
twaddle
ch
(
l
,
_
:
r
)
=
l
:
sep
e
ratedBy
ch
r
sep
a
ratedBy
::
Char
->
String
->
[
String
]
sep
a
ratedBy
ch
[]
=
[]
sep
a
ratedBy
ch
xs
=
twaddle
ch
(
span'
(
\
x
->
x
/=
ch
)
xs
)
where
twaddle
ch
(
l
,
_
:
r
)
=
l
:
sep
a
ratedBy
ch
r
whiteSpace
::
String
->
String
whiteSpace
=
dropWhile
isSpace
...
...
Write
Preview
Supports
Markdown
0%
Try again
or
attach a new 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