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
9d16808e
Commit
9d16808e
authored
Apr 10, 2015
by
Gabor Greif
💬
Browse files
Options
Browse Files
Download
Email Patches
Plain Diff
Typos in error messages and in comments
parent
fa46c597
Changes
35
Hide whitespace changes
Inline
Side-by-side
Showing
35 changed files
with
44 additions
and
44 deletions
+44
-44
compiler/basicTypes/DataCon.hs
compiler/basicTypes/DataCon.hs
+1
-1
compiler/basicTypes/Demand.hs
compiler/basicTypes/Demand.hs
+1
-1
compiler/cmm/CmmLex.x
compiler/cmm/CmmLex.x
+1
-1
compiler/cmm/CmmParse.y
compiler/cmm/CmmParse.y
+1
-1
compiler/coreSyn/CoreSubst.hs
compiler/coreSyn/CoreSubst.hs
+5
-5
compiler/deSugar/DsExpr.hs
compiler/deSugar/DsExpr.hs
+1
-1
compiler/iface/MkIface.hs
compiler/iface/MkIface.hs
+1
-1
compiler/parser/Parser.y
compiler/parser/Parser.y
+1
-1
compiler/simplCore/Simplify.hs
compiler/simplCore/Simplify.hs
+1
-1
compiler/specialise/SpecConstr.hs
compiler/specialise/SpecConstr.hs
+1
-1
compiler/stranal/DmdAnal.hs
compiler/stranal/DmdAnal.hs
+1
-1
compiler/typecheck/TcDeriv.hs
compiler/typecheck/TcDeriv.hs
+1
-1
compiler/typecheck/TcInteract.hs
compiler/typecheck/TcInteract.hs
+1
-1
compiler/typecheck/TcPat.hs
compiler/typecheck/TcPat.hs
+1
-1
compiler/typecheck/TcSimplify.hs
compiler/typecheck/TcSimplify.hs
+1
-1
compiler/typecheck/TcSplice.hs
compiler/typecheck/TcSplice.hs
+1
-1
compiler/typecheck/TcType.hs
compiler/typecheck/TcType.hs
+2
-2
compiler/types/Coercion.hs
compiler/types/Coercion.hs
+1
-1
compiler/utils/GraphOps.hs
compiler/utils/GraphOps.hs
+2
-2
compiler/utils/Pretty.hs
compiler/utils/Pretty.hs
+1
-1
compiler/vectorise/Vectorise/Generic/PAMethods.hs
compiler/vectorise/Vectorise/Generic/PAMethods.hs
+1
-1
compiler/vectorise/Vectorise/Utils/Base.hs
compiler/vectorise/Vectorise/Utils/Base.hs
+1
-1
docs/users_guide/debugging.xml
docs/users_guide/debugging.xml
+1
-1
docs/users_guide/glasgow_exts.xml
docs/users_guide/glasgow_exts.xml
+1
-1
includes/Rts.h
includes/Rts.h
+1
-1
rts/RetainerProfile.c
rts/RetainerProfile.c
+1
-1
rts/ghc.mk
rts/ghc.mk
+1
-1
testsuite/tests/ffi/should_fail/ccfail004.stderr
testsuite/tests/ffi/should_fail/ccfail004.stderr
+3
-3
testsuite/tests/perf/compiler/all.T
testsuite/tests/perf/compiler/all.T
+2
-2
testsuite/tests/programs/galois_raytrace/Data.hs
testsuite/tests/programs/galois_raytrace/Data.hs
+1
-1
testsuite/tests/stranal/should_compile/newtype.hs
testsuite/tests/stranal/should_compile/newtype.hs
+1
-1
testsuite/tests/typecheck/should_compile/tc202.hs
testsuite/tests/typecheck/should_compile/tc202.hs
+1
-1
utils/genprimopcode/Lexer.x
utils/genprimopcode/Lexer.x
+1
-1
utils/genprimopcode/Parser.y
utils/genprimopcode/Parser.y
+1
-1
utils/hpc/HpcParser.y
utils/hpc/HpcParser.y
+1
-1
No files found.
compiler/basicTypes/DataCon.hs
View file @
9d16808e
...
...
@@ -179,7 +179,7 @@ Why might the wrapper have anything to do? Two reasons:
The wrapper has the programmer-specified type:
\$wMkT :: a -> T [a]
\$wMkT a x = MkT [a] a [a] x
The third argument is a coerion
The third argument is a coer
c
ion
[a] :: [a]~[a]
INVARIANT: the dictionary constructor for a class
...
...
compiler/basicTypes/Demand.hs
View file @
9d16808e
...
...
@@ -393,7 +393,7 @@ After strictness analysis:
False -> GHC.Types.True;
True -> foo wild_X7 }
It's true that ds_dnz is *itself* absent, b
ut the use of wild_X7 means
It's true that ds_dnz is *itself* absent, but the use of wild_X7 means
that it is very much alive and demanded. See Trac #10148 for how the
consequences play out.
...
...
compiler/cmm/CmmLex.x
View file @
9d16808e
...
...
@@ -13,7 +13,7 @@
{
{-# LANGUAGE BangPatterns #-}
{-# OPTIONS -Wwarn -w #-}
-- The above -Wwarn supression flag is a temporary kludge.
-- The above -Wwarn sup
p
ression flag is a temporary kludge.
-- While working on this module you are encouraged to remove it and fix
-- any warnings in the module. See
-- http://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
...
...
compiler/cmm/CmmParse.y
View file @
9d16808e
...
...
@@ -197,7 +197,7 @@ convention.
{
{-# LANGUAGE BangPatterns #-} -- required for versions of Happy before 1.18.6
{-# OPTIONS -Wwarn -w #-}
-- The above warning supression flag is a temporary kludge.
-- The above warning sup
p
ression flag is a temporary kludge.
-- While working on this module you are encouraged to remove it and fix
-- any warnings in the module. See
-- http://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
...
...
compiler/coreSyn/CoreSubst.hs
View file @
9d16808e
...
...
@@ -768,7 +768,7 @@ InlVanilla. The WARN is just so I can see if it happens a lot.
* *
************************************************************************
Note [Optimise coercion boxes agressively]
Note [Optimise coercion boxes ag
g
ressively]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
The simple expression optimiser needs to deal with Eq# boxes as follows:
...
...
@@ -789,7 +789,7 @@ We do this for two reasons:
2. The test T4356 fails Lint because it creates a coercion between types
of kind (* -> * -> *) and (?? -> ? -> *), which differ. If we do this
inlining agressively we can collapse away the intermediate coercion between
inlining ag
g
ressively we can collapse away the intermediate coercion between
these two types and hence pass Lint again. (This is a sort of a hack.)
In fact, our implementation uses slightly liberalised versions of the second rule
...
...
@@ -827,7 +827,7 @@ simpleOptExpr :: CoreExpr -> CoreExpr
-- or where the RHS is trivial
--
-- We also inline bindings that bind a Eq# box: see
-- See Note [Optimise coercion boxes agressively].
-- See Note [Optimise coercion boxes ag
g
ressively].
--
-- The result is NOT guaranteed occurrence-analysed, because
-- in (let x = y in ....) we substitute for x; so y's occ-info
...
...
@@ -904,7 +904,7 @@ simple_opt_expr subst expr
go
lam
@
(
Lam
{})
=
go_lam
[]
subst
lam
go
(
Case
e
b
ty
as
)
-- See Note [Optimise coercion boxes agressively]
-- See Note [Optimise coercion boxes ag
g
ressively]
|
isDeadBinder
b
,
Just
(
con
,
_tys
,
es
)
<-
exprIsConApp_maybe
in_scope_env
e'
,
Just
(
altcon
,
bs
,
rhs
)
<-
findAlt
(
DataAlt
con
)
as
...
...
@@ -1034,7 +1034,7 @@ maybe_substitute subst b r
|
(
Var
fun
,
args
)
<-
collectArgs
r
,
Just
dc
<-
isDataConWorkId_maybe
fun
,
dc
`
hasKey
`
eqBoxDataConKey
||
dc
`
hasKey
`
coercibleDataConKey
,
all
exprIsTrivial
args
=
True
-- See Note [Optimise coercion boxes agressively]
,
all
exprIsTrivial
args
=
True
-- See Note [Optimise coercion boxes ag
g
ressively]
|
otherwise
=
False
----------------------
...
...
compiler/deSugar/DsExpr.hs
View file @
9d16808e
...
...
@@ -485,7 +485,7 @@ For record construction we do this (assuming T has three arguments)
e
(recConErr t1 "M.hs/230/op3")
\end{verbatim}
@recConErr@ then converts its ar
ug
ment string into a proper message
@recConErr@ then converts its ar
gu
ment string into a proper message
before printing it as
\begin{verbatim}
M.hs, line 230: missing field op1 was evaluated
...
...
compiler/iface/MkIface.hs
View file @
9d16808e
...
...
@@ -1703,7 +1703,7 @@ tyConToIfaceDecl env tycon
-- (a) we don't need to redundantly put them into the interface file
-- (b) when pretty-printing an Iface data declaration in H98-style syntax,
-- we know that the type variables will line up
-- The latter (b) is important because we pretty-print type construtors
-- The latter (b) is important because we pretty-print type constru
c
tors
-- by converting to IfaceSyn and pretty-printing that
con_env1
=
(
fst
tc_env1
,
mkVarEnv
(
zipEqual
"ifaceConDecl"
univ_tvs
tc_tyvars
))
-- A bit grimy, perhaps, but it's simple!
...
...
compiler/parser/Parser.y
View file @
9d16808e
...
...
@@ -10,7 +10,7 @@
{
{-# LANGUAGE BangPatterns #-}
-- required for versions of Happy before 1.18.6
{-# OPTIONS -Wwarn -w #-}
-- The above warning supression flag is a temporary kludge.
-- The above warning sup
p
ression flag is a temporary kludge.
-- While working on this module you are encouraged to remove it and fix
-- any warnings in the module. See
-- http://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
...
...
compiler/simplCore/Simplify.hs
View file @
9d16808e
...
...
@@ -515,7 +515,7 @@ we'd like to transform it to
x' = e
x = x `cast` co -- A trivial binding
There's a chance that e will be a constructor application or function, or something
like that, so moving the coer
ion to the usage site may well cancel the coers
ions
like that, so moving the coer
cion to the usage site may well cancel the coerc
ions
and lead to further optimisation. Example:
data family T a :: *
...
...
compiler/specialise/SpecConstr.hs
View file @
9d16808e
...
...
@@ -1093,7 +1093,7 @@ evalScrutOcc = ScrutOcc emptyUFM
-- Experimentally, this vesion of combineOcc makes ScrutOcc "win", so
-- that if the thing is scrutinised anywhere then we get to see that
-- in the overall result, even if it's also used in a boxed way
-- This might be too agressive; see Note [Reboxing] Alternative 3
-- This might be too ag
g
ressive; see Note [Reboxing] Alternative 3
combineOcc
::
ArgOcc
->
ArgOcc
->
ArgOcc
combineOcc
NoOcc
occ
=
occ
combineOcc
occ
NoOcc
=
occ
...
...
compiler/stranal/DmdAnal.hs
View file @
9d16808e
...
...
@@ -308,7 +308,7 @@ io_hack_reqd :: DataCon -> [Var] -> Bool
-- case foo x s of { (# s, r #) -> y }
-- Is this strict in 'y'. Normally yes, but what if 'foo' is an I/O
-- operation that simply terminates the program (not in an erroneous way)?
-- In that case we should not evaluate
y
before the call to 'foo'.
-- In that case we should not evaluate
'y'
before the call to 'foo'.
-- Hackish solution: spot the IO-like situation and add a virtual branch,
-- as if we had
-- case foo x s of
...
...
compiler/typecheck/TcDeriv.hs
View file @
9d16808e
...
...
@@ -1601,7 +1601,7 @@ mkNewTypeEqn dflags overlap_mode tvs
substTheta
(
zipOpenTvSubst
cls_tyvars
inst_tys
)
(
classSCTheta
cls
)
-- Next we collect Coercible constaints between
-- Next we collect Coercible const
r
aints between
-- the Class method types, instantiated with the representation and the
-- newtype type; precisely the constraints required for the
-- calls to coercible that we are going to generate.
...
...
compiler/typecheck/TcInteract.hs
View file @
9d16808e
...
...
@@ -1844,7 +1844,7 @@ isCallStackIP _ _ _
-- | Assumes that we've checked that this is the 'Typeable' class,
-- and it was applied to the correct argument.
matchTypeableClass
::
Class
->
Kind
->
Type
->
CtLoc
->
TcS
LookupInstResult
matchTypeableClass
clas
k
t
loc
|
isForAllTy
k
=
return
NoInstance
...
...
compiler/typecheck/TcPat.hs
View file @
9d16808e
...
...
@@ -690,7 +690,7 @@ are not made available in the RHS of the match. For example
f :: T a -> Int -> a
f ~(T1 i) y = y
It's obviously not sound to refine a to Int in the right
hand side, because the ar
ug
ment might not match T1 at all!
hand side, because the ar
gu
ment might not match T1 at all!
Finally, a lazy pattern should not bind any existential type variables
because they won't be in scope when we do the desugaring
...
...
compiler/typecheck/TcSimplify.hs
View file @
9d16808e
...
...
@@ -351,7 +351,7 @@ simplifyInfer rhs_tclvl apply_mr name_taus wanteds
<-
decideQuantification
apply_mr
quant_pred_candidates
zonked_tau_tvs
-- Emit an implication constraint for the
-- remaining constaints from the RHS
-- remaining const
r
aints from the RHS
;
bound_ev_vars
<-
mapM
TcM
.
newEvVar
bound_theta
;
let
skol_info
=
InferSkol
[
(
name
,
mkSigmaTy
[]
bound_theta
ty
)
|
(
name
,
ty
)
<-
name_taus
]
...
...
compiler/typecheck/TcSplice.hs
View file @
9d16808e
...
...
@@ -1388,7 +1388,7 @@ annotation anyway. This should be a rare case, indeed. Here is an example:
Here G's kind is (forall k. k -> k), and the desugared RHS of that last
instance of F is (G (* -> (* -> *) -> *) (T1 * (* -> *)) Bool). According to
the algoritm above, there are 3 arguments to G so we should peel off 3
the algorit
h
m above, there are 3 arguments to G so we should peel off 3
arguments in G's kind. But G's kind has only two arguments. This is the
rare special case, and we conservatively choose to put the annotation
in.
...
...
compiler/typecheck/TcType.hs
View file @
9d16808e
...
...
@@ -1647,8 +1647,8 @@ checkRepTyCon check_tc ty extra
where
msg
=
quotes
(
ppr
ty
)
<+>
ptext
(
sLit
"cannot be marshalled in a foreign call"
)
mk_nt_reason
tc
tys
|
null
tys
=
ptext
(
sLit
"because its data construtor is not in scope"
)
|
otherwise
=
ptext
(
sLit
"because the data construtor for"
)
|
null
tys
=
ptext
(
sLit
"because its data constru
c
tor is not in scope"
)
|
otherwise
=
ptext
(
sLit
"because the data constru
c
tor for"
)
<+>
quotes
(
ppr
tc
)
<+>
ptext
(
sLit
"is not in scope"
)
nt_fix
=
ptext
(
sLit
"Possible fix: import the data constructor to bring it into scope"
)
...
...
compiler/types/Coercion.hs
View file @
9d16808e
...
...
@@ -472,7 +472,7 @@ it, assume the following definition:
type instance F Int = Bool -- Axiom axF : F Int ~N Bool
newtype Age = MkAge Int -- Axiom axAge : Age ~R Int
data Foo a = MkFoo a -- Role on Foo's parameter is Represntational
data Foo a = MkFoo a -- Role on Foo's parameter is Repres
e
ntational
TyConAppCo Nominal Foo axF : Foo (F Int) ~N Foo Bool
For (TyConAppCo Nominal) all arguments must have role Nominal. Why?
...
...
compiler/utils/GraphOps.hs
View file @
9d16808e
...
...
@@ -270,7 +270,7 @@ addPreference (u, c) color
u
-- | Do agressive coalescing on this graph.
-- | Do ag
g
ressive coalescing on this graph.
-- returns the new graph and the list of pairs of nodes that got coaleced together.
-- for each pair, the resulting node will have the least key and be second in the pair.
--
...
...
@@ -322,7 +322,7 @@ coalesceGraph' aggressive triv graph kkPairsAcc
pairs
->
coalesceGraph'
aggressive
triv
graph'
(
reverse
pairs
++
kkPairsAcc
)
-- | Coalesce this pair of nodes unconditionally \/ agressively.
-- | Coalesce this pair of nodes unconditionally \/ ag
g
ressively.
-- The resulting node is the one with the least key.
--
-- returns: Just the pair of keys if the nodes were coalesced
...
...
compiler/utils/Pretty.hs
View file @
9d16808e
...
...
@@ -448,7 +448,7 @@ The argument of @NilAbove@ is never @Empty@. Therefore
a @NilAbove@ occupies at least two lines.
\item
The ar
ug
ment of @TextBeside@ is never @Nest@.
The ar
gu
ment of @TextBeside@ is never @Nest@.
\item
The layouts of the two arguments of @Union@ both flatten to the same string.
...
...
compiler/vectorise/Vectorise/Generic/PAMethods.hs
View file @
9d16808e
...
...
@@ -365,7 +365,7 @@ buildToArrPReprs vect_tc repr_co _ pdatas_tc r
-- eg: (xss :: PDatas (Tree a b))
varg
<-
newLocalVar
(
fsLit
"xss"
)
arg_ty
-- Coer
s
ion to case between the (PRepr a) type and its instance.
-- Coer
c
ion to case between the (PRepr a) type and its instance.
pdatas_co
<-
mkBuiltinCo
pdatasTyCon
let
co
=
mkAppCo
pdatas_co
.
mkSymCo
...
...
compiler/vectorise/Vectorise/Utils/Base.hs
View file @
9d16808e
...
...
@@ -130,7 +130,7 @@ splitPrimTyCon ty
-- Coercion Construction -----------------------------------------------------
-- |Make a representational coer
s
ion to some builtin type.
-- |Make a representational coer
c
ion to some builtin type.
--
mkBuiltinCo
::
(
Builtins
->
TyCon
)
->
VM
Coercion
mkBuiltinCo
get_tc
...
...
docs/users_guide/debugging.xml
View file @
9d16808e
...
...
@@ -530,7 +530,7 @@
</sect2>
<sect2
id=
"supression"
>
<sect2
id=
"sup
p
ression"
>
<title>
Suppressing unwanted information
</title>
<indexterm><primary>
suppression
</primary></indexterm>
...
...
docs/users_guide/glasgow_exts.xml
View file @
9d16808e
...
...
@@ -4964,7 +4964,7 @@ Specfically, <option>-XFlexibleContexts</option>, allows (well-kinded) class con
of form
<literal>
(C t1 ... tn)
</literal>
in the context of an instance declaration.
</para>
<para>
Notice that the flag does not affect equality constaints in an instance context;
Notice that the flag does not affect equality const
r
aints in an instance context;
they are permitted by
<option>
-XTypeFamilies
</option>
or
<option>
-XGADTs
</option>
.
</para>
<para>
...
...
includes/Rts.h
View file @
9d16808e
...
...
@@ -191,7 +191,7 @@ INLINE_HEADER Time fsecondsToTime (double t)
#include "rts/Config.h"
/* Global constaints */
/* Global const
r
aints */
#include "rts/Constants.h"
/* Profiling information */
...
...
rts/RetainerProfile.c
View file @
9d16808e
...
...
@@ -2199,7 +2199,7 @@ checkHeapSanityForRetainerProfiling( void )
/*
After all live objects have been scavenged, the garbage
collector may create some objects in
scheduleFinalizers(). These objects are created through
t
scheduleFinalizers(). These objects are created through
allocate(), so the small object pool or the large object
pool of the g0s0 may not be empty.
*/
...
...
rts/ghc.mk
View file @
9d16808e
...
...
@@ -422,7 +422,7 @@ rts/RetainerSet_CC_OPTS += -Wno-format
# On Windows:
rts/win32/
ConsoleHandler_CC_OPTS
+=
-w
rts/win32/
ThrIOManager_CC_OPTS
+=
-w
# The above warning supression flags are a temporary kludge.
# The above warning sup
p
ression flags are a temporary kludge.
# While working on this module you are encouraged to remove it and fix
# any warnings in the module. See
# http://ghc.haskell.org/trac/ghc/wiki/WorkingConventions#Warnings
...
...
testsuite/tests/ffi/should_fail/ccfail004.stderr
View file @
9d16808e
...
...
@@ -2,7 +2,7 @@
ccfail004.hs:9:1:
Unacceptable argument type in foreign declaration:
‘NInt’ cannot be marshalled in a foreign call
because its data construtor is not in scope
because its data constru
c
tor is not in scope
Possible fix: import the data constructor to bring it into scope
When checking declaration:
foreign import ccall safe "static f1" f1 :: NInt -> IO Int
...
...
@@ -10,7 +10,7 @@ ccfail004.hs:9:1:
ccfail004.hs:10:1:
Unacceptable result type in foreign declaration:
‘NInt’ cannot be marshalled in a foreign call
because its data construtor is not in scope
because its data constru
c
tor is not in scope
Possible fix: import the data constructor to bring it into scope
When checking declaration:
foreign import ccall safe "static f2" f2 :: Int -> IO NInt
...
...
@@ -18,7 +18,7 @@ ccfail004.hs:10:1:
ccfail004.hs:11:1:
Unacceptable result type in foreign declaration:
‘NIO Int’ cannot be marshalled in a foreign call
because the data construtor for ‘NIO’ is not in scope
because the data constru
c
tor for ‘NIO’ is not in scope
Possible fix: import the data constructor to bring it into scope
When checking declaration:
foreign import ccall safe "static f3" f3 :: Int -> NIO Int
...
...
testsuite/tests/perf/compiler/all.T
View file @
9d16808e
...
...
@@ -329,7 +329,7 @@ test('T5030',
# previous: 196457520
# 2012-10-08: 259547660 (x86/Linux, new codegen)
# 2013-11-21: 198573456 (x86 Windows, 64 bit machine)
# 2014-12-10: 227205560 constraint solver got worse again; more agressive solving
# 2014-12-10: 227205560 constraint solver got worse again; more ag
g
ressive solving
# of family-applications leads to less sharing, I think
(
wordsize
(
64
),
403932600
,
10
)]),
...
...
@@ -346,7 +346,7 @@ test('T5030',
# general round of updates
# 2014-09-10 385152728 post-AMP-cleanup
# 2014-12-08 340969128 constraint solver perf improvements (esp kick-out)
# 2014-12-10 449042120 constraint solver got worse again; more agressive solving
# 2014-12-10 449042120 constraint solver got worse again; more ag
g
ressive solving
# of family-applications leads to less sharing, I think
# 2015-03-17 403932600 tweak to solver algorithm
...
...
testsuite/tests/programs/galois_raytrace/Data.hs
View file @
9d16808e
...
...
@@ -215,7 +215,7 @@ opcodes =
,
(
"false"
,
TBool
False
,
error
"incorrect use of false"
)
,
(
"true"
,
TBool
True
,
error
"incorrect use of true"
)
]
++
map
(
\
(
a
,
b
,
c
)
->
(
a
,
TOp
b
,
c
))
-- These are just invocation, any coer
s
ions need to occur between here
-- These are just invocation, any coer
c
ions need to occur between here
-- and before arriving at the application code (like deg -> rad).
[
(
"acos"
,
Op_acos
,
Real_Real
(
rad2deg
.
acos
))
,
(
"addi"
,
Op_addi
,
Int_Int_Int
(
+
))
...
...
testsuite/tests/stranal/should_compile/newtype.hs
View file @
9d16808e
-- This one killed GHC 6.4 because it bogusly attributed
-- the CPR property to the construtor T
-- the CPR property to the constru
c
tor T
-- Result: a mkWWcpr crash
-- Needs -prof -auto-all to show it up
...
...
testsuite/tests/typecheck/should_compile/tc202.hs
View file @
9d16808e
-- Tests that subFunTys works when the ar
ug
ment is a type of form (a ty1 ty2)
-- Tests that subFunTys works when the ar
gu
ment is a type of form (a ty1 ty2)
module
ShouldCompile
where
...
...
utils/genprimopcode/Lexer.x
View file @
9d16808e
...
...
@@ -2,7 +2,7 @@
{
{-# LANGUAGE BangPatterns #-} -- required for versions of Alex before 2.3.4
{-# OPTIONS -w -Wwarn #-}
-- The above warning supression flag is a temporary kludge.
-- The above warning sup
p
ression flag is a temporary kludge.
-- While working on this module you are encouraged to remove it and fix
-- any warnings in the module. See
-- http://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
...
...
utils/genprimopcode/Parser.y
View file @
9d16808e
{
{-# LANGUAGE BangPatterns #-} -- required for versions of Happy before 1.18.6
{-# OPTIONS -w -Wwarn #-}
-- The above warning supression flag is a temporary kludge.
-- The above warning sup
p
ression flag is a temporary kludge.
-- While working on this module you are encouraged to remove it and fix
-- any warnings in the module. See
-- http://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
...
...
utils/hpc/HpcParser.y
View file @
9d16808e
...
...
@@ -9,7 +9,7 @@
-- the generalisation. Better would be to make Happy generate
-- an appropriate signature.
--
-- The above warning supression flag is a temporary kludge.
-- The above warning sup
p
ression flag is a temporary kludge.
-- While working on this module you are encouraged to remove it and fix
-- any warnings in the module. See
-- http://ghc.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
...
...
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