1 {-# OPTIONS_GHC -XNoMonoLocalBinds #-}
2 -- Norman likes local bindings
3 -- If this module lives on I'd like to get rid of this flag in due course
5 -- | Converts C-- with full proceedures and parameters
6 -- to a CPS transformed C-- with the stack made manifest.
14 import CmmBuildInfoTables
15 import CmmCommonBlockElim
19 import OptimizationFuel
27 import qualified Data.Map as Map
31 -----------------------------------------------------------------------------
32 -- |Top level driver for the CPS pass
33 -----------------------------------------------------------------------------
34 -- There are two complications here:
35 -- 1. We need to compile the procedures in two stages because we need
36 -- an analysis of the procedures to tell us what CAFs they use.
37 -- The first stage returns a map from procedure labels to CAFs,
38 -- along with a closure that will compute SRTs and attach them to
39 -- the compiled procedures.
40 -- The second stage is to combine the CAF information into a top-level
41 -- CAF environment mapping non-static closures to the CAFs they keep live,
42 -- then pass that environment to the closures returned in the first
43 -- stage of compilation.
44 -- 2. We need to thread the module's SRT around when the SRT tables
45 -- are computed for each procedure.
46 -- The SRT needs to be threaded because it is grown lazily.
47 protoCmmCPS :: HscEnv -- Compilation env including
48 -- dynamic flags: -dcmm-lint -ddump-cps-cmm
49 -> (TopSRT, [Cmm]) -- SRT table and accumulating list of compiled procs
50 -> Cmm -- Input C-- with Procedures
51 -> IO (TopSRT, [Cmm]) -- Output CPS transformed C--
52 protoCmmCPS hsc_env (topSRT, rst) (Cmm tops) =
53 do let dflags = hsc_dflags hsc_env
54 showPass dflags "CPSZ"
55 (cafEnvs, tops) <- liftM unzip $ mapM (cpsTop hsc_env) tops
56 let topCAFEnv = mkTopCAFInfo (concat cafEnvs)
57 (topSRT, tops) <- foldM (toTops hsc_env topCAFEnv) (topSRT, []) tops
58 let cmms = Cmm (reverse (concat tops))
59 dumpIfSet_dyn dflags Opt_D_dump_cps_cmm "Post CPS Cmm" (ppr cmms)
60 return (topSRT, cmms : rst)
64 The identity and the last pass are stored in
65 mutable reference cells in an 'HscEnv' and are
66 global to one compiler session.
69 cpsTop :: HscEnv -> CmmTop -> IO ([(CLabel, CAFSet)], [(CAFSet, CmmTop)])
70 cpsTop _ p@(CmmData {}) = return ([], [(Map.empty, p)])
71 cpsTop hsc_env (CmmProc h@(TopInfo {stack_info=StackInfo {arg_space=entry_off}}) l g) =
73 -- Why bother doing it this early?
74 -- g <- dual_rewrite Opt_D_dump_cmmz "spills and reloads"
75 -- (dualLivenessWithInsertion callPPs) g
76 -- g <- run $ insertLateReloads g -- Duplicate reloads just before uses
77 -- g <- dual_rewrite Opt_D_dump_cmmz "Dead Assignment Elimination"
78 -- (removeDeadAssignmentsAndReloads callPPs) g
79 dump Opt_D_dump_cmmz "Pre common block elimination" g
80 g <- return $ elimCommonBlocks g
81 dump Opt_D_dump_cmmz "Post common block elimination" g
83 -- Any work storing block Labels must be performed _after_ elimCommonBlocks
85 ----------- Proc points -------------------
86 let callPPs = callProcPoints g
87 procPoints <- run $ minimalProcPointSet callPPs g
88 g <- run $ addProcPointProtocols callPPs procPoints g
89 dump Opt_D_dump_cmmz "Post Proc Points Added" g
91 ----------- Spills and reloads -------------------
93 -- pprTrace "pre Spills" (ppr g) $
94 dual_rewrite Opt_D_dump_cmmz "spills and reloads"
95 (dualLivenessWithInsertion procPoints) g
96 -- Insert spills at defns; reloads at return points
98 -- pprTrace "pre insertLateReloads" (ppr g) $
99 run $ insertLateReloads g -- Duplicate reloads just before uses
100 dump Opt_D_dump_cmmz "Post late reloads" g
102 -- pprTrace "post insertLateReloads" (ppr g) $
103 dual_rewrite Opt_D_dump_cmmz "Dead Assignment Elimination"
104 (removeDeadAssignmentsAndReloads procPoints) g
105 -- Remove redundant reloads (and any other redundant asst)
107 ----------- Debug only: add code to put zero in dead stack slots----
108 -- Debugging: stubbing slots on death can cause crashes early
109 g <- -- trace "post dead-assign elim" $
110 if opt_StubDeadValues then run $ stubSlotsOnDeath g else return g
113 --------------- Stack layout ----------------
114 slotEnv <- run $ liveSlotAnal g
115 mbpprTrace "live slot analysis results: " (ppr slotEnv) $ return ()
116 let areaMap = layout procPoints slotEnv entry_off g
117 mbpprTrace "areaMap" (ppr areaMap) $ return ()
119 ------------ Manifest the stack pointer --------
120 g <- run $ manifestSP areaMap entry_off g
121 dump Opt_D_dump_cmmz "after manifestSP" g
122 -- UGH... manifestSP can require updates to the procPointMap.
123 -- We can probably do something quicker here for the update...
125 ------------- Split into separate procedures ------------
126 procPointMap <- run $ procPointAnalysis procPoints g
127 dump Opt_D_dump_cmmz "procpoint map" procPointMap
128 gs <- run $ splitAtProcPoints l callPPs procPoints procPointMap
130 mapM_ (dump Opt_D_dump_cmmz "after splitting") gs
132 ------------- More CAFs and foreign calls ------------
133 cafEnv <- run $ cafAnal g
134 let localCAFs = catMaybes $ map (localCAFInfo cafEnv) gs
135 mbpprTrace "localCAFs" (ppr localCAFs) $ return ()
137 gs <- run $ mapM (lowerSafeForeignCalls areaMap) gs
138 mapM_ (dump Opt_D_dump_cmmz "after lowerSafeForeignCalls") gs
140 -- NO MORE GRAPH TRANSFORMATION AFTER HERE -- JUST MAKING INFOTABLES
141 let gs' = map (setInfoTableStackMap slotEnv areaMap) gs
142 mapM_ (dump Opt_D_dump_cmmz "after setInfoTableStackMap") gs'
143 let gs'' = map (bundleCAFs cafEnv) gs'
144 mapM_ (dump Opt_D_dump_cmmz "after bundleCAFs") gs''
145 return (localCAFs, gs'')
146 where dflags = hsc_dflags hsc_env
147 mbpprTrace x y z = if dopt Opt_D_dump_cmmz dflags then pprTrace x y z else z
148 dump f txt g = dumpIfSet_dyn dflags f txt (ppr g)
150 run = runFuelIO (hsc_OptFuel hsc_env)
152 dual_rewrite flag txt pass g =
153 do dump flag ("Pre " ++ txt) g
155 dump flag ("Post " ++ txt) $ g
158 -- This probably belongs in CmmBuildInfoTables?
159 -- We're just finishing the job here: once we know what CAFs are defined
160 -- in non-static closures, we can build the SRTs.
161 toTops :: HscEnv -> Map CLabel CAFSet -> (TopSRT, [[CmmTop]])
162 -> [(CAFSet, CmmTop)] -> IO (TopSRT, [[CmmTop]])
163 toTops hsc_env topCAFEnv (topSRT, tops) gs =
164 do let setSRT (topSRT, rst) g =
165 do (topSRT, gs) <- setInfoTableSRT topCAFEnv topSRT g
166 return (topSRT, gs : rst)
167 (topSRT, gs') <- runFuelIO (hsc_OptFuel hsc_env) $ foldM setSRT (topSRT, []) gs
168 return (topSRT, concat gs' : tops)