Skip to content
Snippets Groups Projects
Commit 2803545f authored by sof's avatar sof
Browse files

[project @ 1997-05-18 23:20:49 by sof]

new PP;2.0x bootable
parent 9a51d87e
No related merge requests found
...@@ -16,6 +16,7 @@ import StgSyn ...@@ -16,6 +16,7 @@ import StgSyn
import LambdaLift ( liftProgram ) import LambdaLift ( liftProgram )
import Name ( isLocallyDefined ) import Name ( isLocallyDefined )
import UniqSet ( UniqSet(..), mapUniqSet ) import UniqSet ( UniqSet(..), mapUniqSet )
import CostCentre ( CostCentre )
import SCCfinal ( stgMassageForProfiling ) import SCCfinal ( stgMassageForProfiling )
import StgLint ( lintStgBindings ) import StgLint ( lintStgBindings )
import StgStats ( showStgStats ) import StgStats ( showStgStats )
...@@ -30,14 +31,17 @@ import CmdLineOpts ( opt_SccGroup, --Not used:opt_EnsureSplittableC, ...@@ -30,14 +31,17 @@ import CmdLineOpts ( opt_SccGroup, --Not used:opt_EnsureSplittableC,
import Id ( nullIdEnv, lookupIdEnv, addOneToIdEnv, import Id ( nullIdEnv, lookupIdEnv, addOneToIdEnv,
growIdEnvList, isNullIdEnv, SYN_IE(IdEnv), growIdEnvList, isNullIdEnv, SYN_IE(IdEnv),
setIdVisibility, setIdVisibility,
GenId{-instance Eq/Outputable -} GenId{-instance Eq/Outputable -}, SYN_IE(Id)
) )
import Maybes ( maybeToBool ) import Maybes ( maybeToBool )
import PprType ( GenType{-instance Outputable-} ) import PprType ( GenType{-instance Outputable-} )
import Pretty ( ppShow, ppAbove, ppAboves, ppStr, ppPStr ) import PprStyle ( PprStyle )
import UniqSupply ( splitUniqSupply ) import Pretty ( Doc, ($$), vcat, text, ptext )
import UniqSupply ( splitUniqSupply, UniqSupply )
import Util ( mapAccumL, panic, assertPanic ) import Util ( mapAccumL, panic, assertPanic )
#if __GLASGOW_HASKELL__ >= 202
import Outputable ( Outputable(..) )
#endif
\end{code} \end{code}
\begin{code} \begin{code}
...@@ -56,9 +60,9 @@ stg2stg stg_todos module_name ppr_style us binds ...@@ -56,9 +60,9 @@ stg2stg stg_todos module_name ppr_style us binds
(if do_verbose_stg2stg then (if do_verbose_stg2stg then
hPutStr stderr "VERBOSE STG-TO-STG:\n" >> hPutStr stderr "VERBOSE STG-TO-STG:\n" >>
hPutStr stderr (ppShow 1000 hPutStr stderr (show
(ppAbove (ppPStr SLIT("*** Core2Stg:")) (($$) (ptext SLIT("*** Core2Stg:"))
(ppAboves (map (ppr ppr_style) (setStgVarInfo False binds))) (vcat (map (ppr ppr_style) (setStgVarInfo False binds)))
)) ))
else return ()) >> else return ()) >>
...@@ -169,9 +173,9 @@ stg2stg stg_todos module_name ppr_style us binds ...@@ -169,9 +173,9 @@ stg2stg stg_todos module_name ppr_style us binds
end_pass us2 what ccs binds2 end_pass us2 what ccs binds2
= -- report verbosely, if required = -- report verbosely, if required
(if do_verbose_stg2stg then (if do_verbose_stg2stg then
hPutStr stderr (ppShow 1000 hPutStr stderr (show
(ppAbove (ppStr ("*** "++what++":")) (($$) (text ("*** "++what++":"))
(ppAboves (map (ppr ppr_style) binds2)) (vcat (map (ppr ppr_style) binds2))
)) ))
else return ()) >> else return ()) >>
let let
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment