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
1241c26f
Commit
1241c26f
authored
Sep 12, 2007
by
Ian Lynagh
Browse files
Remove warning flags from individual compiler modules
We now set the flags once and for all in compiler/Makefile.
parent
b494094b
Changes
16
Hide whitespace changes
Inline
Side-by-side
compiler/cmm/CmmCPSZ.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmCPSZ
(
-- | Converts C-- with full proceedures and parameters
...
...
compiler/cmm/CmmContFlowOpt.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmContFlowOpt
(
runCmmOpts
,
cmmCfgOpts
,
cmmCfgOptsZ
,
branchChainElimZ
,
removeUnreachableBlocksZ
...
...
compiler/cmm/CmmCvt.hs
View file @
1241c26f
{-# LANGUAGE PatternGuards #-}
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmCvt
(
cmmToZgraph
,
cmmOfZgraph
)
...
...
compiler/cmm/CmmExpr.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmExpr
(
CmmExpr
(
..
),
cmmExprRep
,
maybeInvertCmmExpr
...
...
compiler/cmm/CmmLiveZ.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmLiveZ
(
CmmLive
,
cmmLivenessZ
...
...
compiler/cmm/CmmProcPointZ.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmProcPointZ
(
minimalProcPointSet
,
addProcPointProtocols
...
...
compiler/cmm/CmmSpillReload.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmSpillReload
(
ExtendWithSpills
(
..
)
...
...
compiler/cmm/CmmTx.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmTx
where
data
ChangeFlag
=
NoChange
|
SomeChange
...
...
compiler/cmm/CmmZipUtil.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
CmmZipUtil
module
CmmZipUtil
(
zipPreds
)
where
import
Prelude
hiding
(
last
,
unzip
)
import
ZipCfg
import
ZipCfg
import
Maybes
-- | Compute the predecessors of each *reachable* block
...
...
compiler/cmm/DFMonad.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
DFMonad
(
OptimizationFuel
,
DFTx
,
runDFTx
,
lastTxPass
,
txDecrement
,
txRemaining
,
txExhausted
...
...
compiler/cmm/MkZipCfg.hs
View file @
1241c26f
{-#
OPTIONS -Wall -fno-warn-name-shadowing
#-}
{-#
LANGUAGE ScopedTypeVariables
#-}
module
MkZipCfg
(
AGraph
,
(
<*>
),
emptyAGraph
,
withFreshLabel
,
withUnique
,
mkMiddle
,
mkMiddles
,
mkLast
,
mkZTail
,
mkBranch
,
mkLabel
,
mkIfThenElse
,
mkWhileDo
...
...
compiler/cmm/StackColor.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
StackColor
where
import
StackPlacements
...
...
compiler/cmm/StackPlacements.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
module
StackPlacements
(
SlotSet
,
allStackSlots
-- the infinite set of stack slots
,
SlotClass
(
..
),
slotClassBits
,
stackSlot32
,
stackSlot64
,
stackSlot128
...
...
compiler/cmm/ZipCfg.hs
View file @
1241c26f
{-#
OPTIONS -Wall -fno-warn-name-shadowing
#-}
{-#
LANGUAGE ScopedTypeVariables
#-}
module
ZipCfg
(
BlockId
(
..
),
freshBlockId
,
BlockEnv
,
emptyBlockEnv
,
lookupBlockEnv
,
extendBlockEnv
,
insertBlock
,
mkBlockEnv
...
...
compiler/cmm/ZipCfgCmmRep.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
-- This module is pure representation and should be imported only by
-- clients that need to manipulate representation and know what
...
...
compiler/cmm/ZipDataflow.hs
View file @
1241c26f
{-# OPTIONS -Wall -fno-warn-name-shadowing #-}
{-# LANGUAGE MultiParamTypeClasses #-}
module
ZipDataflow
(
Answer
(
..
)
...
...
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