8df30e1416b2ed1898fd406adaf0705649ffa3cd
[ghc-hetmet.git] / ghc / compiler / simplCore / LiberateCase.lhs
1 %
2 % (c) The AQUA Project, Glasgow University, 1994-1998
3 %
4 \section[LiberateCase]{Unroll recursion to allow evals to be lifted from a loop}
5
6 \begin{code}
7 module LiberateCase ( liberateCase ) where
8
9 #include "HsVersions.h"
10
11 import CmdLineOpts      ( DynFlags, DynFlag(..), opt_LiberateCaseThreshold )
12 import CoreLint         ( showPass, endPass )
13 import CoreSyn
14 import CoreUnfold       ( couldBeSmallEnoughToInline )
15 import Var              ( Id )
16 import VarEnv
17 import Outputable
18 import Util             ( notNull )
19 \end{code}
20
21 This module walks over @Core@, and looks for @case@ on free variables.
22 The criterion is:
23         if there is case on a free on the route to the recursive call,
24         then the recursive call is replaced with an unfolding.
25
26 Example
27
28 \begin{verbatim}
29 f = \ t -> case v of
30                V a b -> a : f t
31 \end{verbatim}
32
33 => the inner f is replaced.
34
35 \begin{verbatim}
36 f = \ t -> case v of
37                V a b -> a : (letrec
38                                 f =  \ t -> case v of
39                                                V a b -> a : f t
40                              in f) t
41 \end{verbatim}
42 (note the NEED for shadowing)
43
44 => Simplify
45
46 \begin{verbatim}
47 f = \ t -> case v of
48                V a b -> a : (letrec
49                                 f = \ t -> a : f t
50                              in f t)
51 \begin{verbatim}
52
53 Better code, because 'a' is  free inside the inner letrec, rather
54 than needing projection from v.
55
56 Other examples we'd like to catch with this kind of transformation
57
58         last []     = error 
59         last (x:[]) = x
60         last (x:xs) = last xs
61
62 We'd like to avoid the redundant pattern match, transforming to
63
64         last [] = error
65         last (x:[]) = x
66         last (x:(y:ys)) = last' y ys
67                 where
68                   last' y []     = y
69                   last' _ (y:ys) = last' y ys
70
71         (is this necessarily an improvement)
72
73
74 Similarly drop:
75
76         drop n [] = []
77         drop 0 xs = xs
78         drop n (x:xs) = drop (n-1) xs
79
80 Would like to pass n along unboxed.
81         
82
83 To think about (Apr 94)
84 ~~~~~~~~~~~~~~
85
86 Main worry: duplicating code excessively.  At the moment we duplicate
87 the entire binding group once at each recursive call.  But there may
88 be a group of recursive calls which share a common set of evaluated
89 free variables, in which case the duplication is a plain waste.
90
91 Another thing we could consider adding is some unfold-threshold thing,
92 so that we'll only duplicate if the size of the group rhss isn't too
93 big.
94
95 Data types
96 ~~~~~~~~~~
97
98 The ``level'' of a binder tells how many
99 recursive defns lexically enclose the binding
100 A recursive defn "encloses" its RHS, not its
101 scope.  For example:
102 \begin{verbatim}
103         letrec f = let g = ... in ...
104         in
105         let h = ...
106         in ...
107 \end{verbatim}
108 Here, the level of @f@ is zero, the level of @g@ is one,
109 and the level of @h@ is zero (NB not one).
110
111 \begin{code}
112 type LibCaseLevel = Int
113
114 topLevel :: LibCaseLevel
115 topLevel = 0
116 \end{code}
117
118 \begin{code}
119 data LibCaseEnv
120   = LibCaseEnv
121         Int                     -- Bomb-out size for deciding if
122                                 -- potential liberatees are too big.
123                                 -- (passed in from cmd-line args)
124
125         LibCaseLevel            -- Current level
126
127         (IdEnv LibCaseLevel)    -- Binds all non-top-level in-scope Ids
128                                 -- (top-level and imported things have
129                                 -- a level of zero)
130
131         (IdEnv CoreBind)        -- Binds *only* recursively defined
132                                 -- Ids, to their own binding group,
133                                 -- and *only* in their own RHSs
134
135         [(Id,LibCaseLevel)]     -- Each of these Ids was scrutinised by an
136                                 -- enclosing case expression, with the
137                                 -- specified number of enclosing
138                                 -- recursive bindings; furthermore,
139                                 -- the Id is bound at a lower level
140                                 -- than the case expression.  The
141                                 -- order is insignificant; it's a bag
142                                 -- really
143
144 initEnv :: Int -> LibCaseEnv
145 initEnv bomb_size = LibCaseEnv bomb_size 0 emptyVarEnv emptyVarEnv []
146
147 bombOutSize (LibCaseEnv bomb_size _ _ _ _) = bomb_size
148 \end{code}
149
150
151 Programs
152 ~~~~~~~~
153 \begin{code}
154 liberateCase :: DynFlags -> [CoreBind] -> IO [CoreBind]
155 liberateCase dflags binds
156   = do {
157         showPass dflags "Liberate case" ;
158         let { binds' = do_prog (initEnv opt_LiberateCaseThreshold) binds } ;
159         endPass dflags "Liberate case" Opt_D_verbose_core2core binds'
160                                 {- no specific flag for dumping -} 
161     }
162   where
163     do_prog env [] = []
164     do_prog env (bind:binds) = bind' : do_prog env' binds
165                              where
166                                (env', bind') = libCaseBind env bind
167 \end{code}
168
169 Bindings
170 ~~~~~~~~
171
172 \begin{code}
173 libCaseBind :: LibCaseEnv -> CoreBind -> (LibCaseEnv, CoreBind)
174
175 libCaseBind env (NonRec binder rhs)
176   = (addBinders env [binder], NonRec binder (libCase env rhs))
177
178 libCaseBind env (Rec pairs)
179   = (env_body, Rec pairs')
180   where
181     (binders, rhss) = unzip pairs
182
183     env_body = addBinders env binders
184
185     pairs' = [(binder, libCase env_rhs rhs) | (binder,rhs) <- pairs]
186
187     env_rhs = if all rhs_small_enough rhss then extended_env else env
188
189         -- We extend the rec-env by binding each Id to its rhs, first
190         -- processing the rhs with an *un-extended* environment, so
191         -- that the same process doesn't occur for ever!
192
193     extended_env = addRecBinds env [ (binder, libCase env_body rhs)
194                                    | (binder, rhs) <- pairs ]
195
196     rhs_small_enough rhs = couldBeSmallEnoughToInline lIBERATE_BOMB_SIZE rhs
197     lIBERATE_BOMB_SIZE   = bombOutSize env
198 \end{code}
199
200
201 Expressions
202 ~~~~~~~~~~~
203
204 \begin{code}
205 libCase :: LibCaseEnv
206         -> CoreExpr
207         -> CoreExpr
208
209 libCase env (Var v)             = libCaseId env v
210 libCase env (Lit lit)           = Lit lit
211 libCase env (Type ty)           = Type ty
212 libCase env (App fun arg)       = App (libCase env fun) (libCase env arg)
213 libCase env (Note note body)    = Note note (libCase env body)
214
215 libCase env (Lam binder body)
216   = Lam binder (libCase (addBinders env [binder]) body)
217
218 libCase env (Let bind body)
219   = Let bind' (libCase env_body body)
220   where
221     (env_body, bind') = libCaseBind env bind
222
223 -- gaw 2004
224 libCase env (Case scrut bndr ty alts)
225   = Case (libCase env scrut) bndr ty (map (libCaseAlt env_alts) alts)
226   where
227     env_alts = addBinders env_with_scrut [bndr]
228     env_with_scrut = case scrut of
229                         Var scrut_var -> addScrutedVar env scrut_var
230                         other         -> env
231
232 libCaseAlt env (con,args,rhs) = (con, args, libCase (addBinders env args) rhs)
233 \end{code}
234
235 Ids
236 ~~~
237 \begin{code}
238 libCaseId :: LibCaseEnv -> Id -> CoreExpr
239 libCaseId env v
240   | Just the_bind <- lookupRecId env v  -- It's a use of a recursive thing
241   , notNull free_scruts                 -- with free vars scrutinised in RHS
242   = Let the_bind (Var v)
243
244   | otherwise
245   = Var v
246
247   where
248     rec_id_level = lookupLevel env v
249     free_scruts  = freeScruts env rec_id_level
250 \end{code}
251
252
253
254 Utility functions
255 ~~~~~~~~~~~~~~~~~
256 \begin{code}
257 addBinders :: LibCaseEnv -> [CoreBndr] -> LibCaseEnv
258 addBinders (LibCaseEnv bomb lvl lvl_env rec_env scruts) binders
259   = LibCaseEnv bomb lvl lvl_env' rec_env scruts
260   where
261     lvl_env' = extendVarEnvList lvl_env (binders `zip` repeat lvl)
262
263 addRecBinds :: LibCaseEnv -> [(Id,CoreExpr)] -> LibCaseEnv
264 addRecBinds (LibCaseEnv bomb lvl lvl_env rec_env scruts) pairs
265   = LibCaseEnv bomb lvl' lvl_env' rec_env' scruts
266   where
267     lvl'     = lvl + 1
268     lvl_env' = extendVarEnvList lvl_env [(binder,lvl) | (binder,_) <- pairs]
269     rec_env' = extendVarEnvList rec_env [(binder, Rec pairs) | (binder,_) <- pairs]
270
271 addScrutedVar :: LibCaseEnv
272               -> Id             -- This Id is being scrutinised by a case expression
273               -> LibCaseEnv
274
275 addScrutedVar env@(LibCaseEnv bomb lvl lvl_env rec_env scruts) scrut_var
276   | bind_lvl < lvl
277   = LibCaseEnv bomb lvl lvl_env rec_env scruts'
278         -- Add to scruts iff the scrut_var is being scrutinised at
279         -- a deeper level than its defn
280
281   | otherwise = env
282   where
283     scruts'  = (scrut_var, lvl) : scruts
284     bind_lvl = case lookupVarEnv lvl_env scrut_var of
285                  Just lvl -> lvl
286                  Nothing  -> topLevel
287
288 lookupRecId :: LibCaseEnv -> Id -> Maybe CoreBind
289 lookupRecId (LibCaseEnv bomb lvl lvl_env rec_env scruts) id
290   = lookupVarEnv rec_env id
291
292 lookupLevel :: LibCaseEnv -> Id -> LibCaseLevel
293 lookupLevel (LibCaseEnv bomb lvl lvl_env rec_env scruts) id
294   = case lookupVarEnv lvl_env id of
295       Just lvl -> lvl
296       Nothing  -> topLevel
297
298 freeScruts :: LibCaseEnv
299            -> LibCaseLevel      -- Level of the recursive Id
300            -> [Id]              -- Ids that are scrutinised between the binding
301                                 -- of the recursive Id and here
302 freeScruts (LibCaseEnv bomb lvl lvl_env rec_env scruts) rec_bind_lvl
303   = [v | (v,scrut_lvl) <- scruts, scrut_lvl > rec_bind_lvl]
304 \end{code}