is_SymConst_addr_ent() added
[libfirm] / ir / opt / proc_cloning.c
1 /*
2  * Copyright (C) 1995-2007 University of Karlsruhe.  All right reserved.
3  *
4  * This file is part of libFirm.
5  *
6  * This file may be distributed and/or modified under the terms of the
7  * GNU General Public License version 2 as published by the Free Software
8  * Foundation and appearing in the file LICENSE.GPL included in the
9  * packaging of this file.
10  *
11  * Licensees holding valid libFirm Professional Edition licenses may use
12  * this file in accordance with the libFirm Commercial License.
13  * Agreement provided with the Software.
14  *
15  * This file is provided AS IS with NO WARRANTY OF ANY KIND, INCLUDING THE
16  * WARRANTY OF DESIGN, MERCHANTABILITY AND FITNESS FOR A PARTICULAR
17  * PURPOSE.
18  */
19
20 /**
21  * @file
22  * @brief   Procedure cloning.
23  * @author  Beyhan Veliev, Michael Beck
24  * @version $Id$
25  * @summary
26  *
27  * The purpose is first to find and analyze functions, that are called
28  * with constant parameter(s).
29  * The second step is to optimize the function that are found from our
30  * analyze. Optimize mean to make a new function with parameters, that
31  * aren't be constant. The constant parameters of the function are placed
32  * in the function graph. They aren't be passed as parameters.
33  */
34 #ifdef HAVE_CONFIG_H
35 #include "config.h"
36 #endif
37
38 #include <string.h>
39
40 #include "iroptimize.h"
41 #include "tv.h"
42 #include "set.h"
43 #include "irprog_t.h"
44 #include "hashptr.h"
45 #include "irgwalk.h"
46 #include "analyze_irg_args.h"
47 #include "irprintf.h"
48 #include "ircons.h"
49 #include "irouts.h"
50 #include "irnode_t.h"
51 #include "irtools.h"
52 #include "irgmod.h"
53 #include "array.h"
54 #include "xmalloc.h"
55
56 /* A macro to iterate sets.*/
57 #define ITERATE_SET(set_entries, entry) for(entry = set_first(set_entries); entry; entry = set_next(set_entries))
58
59 /**
60  * This struct contains the information quadruple for a Call, which we need to
61  * decide if this function must be cloned.
62  */
63 typedef struct quadruple {
64         ir_entity       *ent;     /**< The entity of our Call. */
65         int             pos;      /**< Position of a constant argument of our Call. */
66         tarval          *tv;      /**< The tarval of this argument if Const node. */
67         ir_node         **calls;  /**< The list of all calls with the same characteristics */
68 } quadruple_t;
69
70 /**
71  * The quadruplets are hold in a sorted list
72  */
73 typedef struct entry {
74         quadruple_t  q;      /**< the quadruple */
75         float        weight; /**< its weight */
76         struct entry *next;  /**< link to the next one */
77 } entry_t;
78
79 typedef struct q_set {
80         struct obstack obst;        /**< an obstack containing all entries */
81         pset           *map;        /**< a hash map containing the quadruples */
82         entry_t        *heavy_uses; /**< the ordered list of heavy uses */
83 } q_set;
84
85 /**
86  * Compare two quadruplets.
87  *
88  * @return zero if they are identically, non-zero else
89  */
90 static int entry_cmp(const void *elt, const void *key) {
91         const entry_t *e1 = elt;
92         const entry_t *e2 = key;
93
94         return (e1->q.ent != e2->q.ent) || (e1->q.pos != e2->q.pos) || (e1->q.tv != e2->q.tv);
95 }
96
97 /**
98  * Hash an element of type entry_t.
99  *
100  * @param entry  The element to be hashed.
101  */
102 static int hash_entry(const entry_t *entry) {
103         return HASH_PTR(entry->q.ent) ^ HASH_PTR(entry->q.tv) ^ (entry->q.pos * 9);
104 }
105
106 /**
107  * Free memory associated with a quadruplet.
108  */
109 static void kill_entry(entry_t *entry) {
110         if (entry->q.calls) {
111                 DEL_ARR_F(entry->q.calls);
112                 entry->q.calls = NULL;
113         }
114 }
115
116 /**
117  * Process a call node.
118  *
119  * @param call    A ir_node to be checked.
120  * @param callee  The entity of the callee
121  * @param hmap    The quadruple-set containing the calls with constant parameters
122  */
123 static void process_call(ir_node *call, ir_entity *callee, q_set *hmap) {
124         ir_type *mtp;
125         entry_t *key, *entry;
126         ir_node *call_param;
127         int i, n_params;
128
129         n_params = get_Call_n_params(call);
130
131         /* Beware: we cannot clone variadic parameters as well as the
132          * last non-variadic one, which might be needed for the va_start()
133          * magic
134          */
135         mtp = get_Call_type(call);
136         if (get_method_variadicity(mtp) != variadicity_non_variadic) {
137                 n_params = get_method_first_variadic_param_index(mtp) - 1;
138         }
139
140         /* In this for loop we collect the calls, that have
141            an constant parameter. */
142         for (i = n_params - 1; i >= 0; --i) {
143                 call_param = get_Call_param(call, i);
144                 if (is_Const(call_param)) {
145                         /* we have found a Call to collect and we save the informations,
146                            which we need.*/
147                         if (! hmap->map)
148                                 hmap->map = new_pset(entry_cmp, 8);
149
150                         key = obstack_alloc(&hmap->obst, sizeof(*key));
151
152                         key->q.ent   = callee;
153                         key->q.pos   = i;
154                         key->q.tv    = get_Const_tarval(call_param);
155                         key->q.calls = NULL;
156                         key->weight  = 0.0F;
157                         key->next    = NULL;
158
159                         /* We insert our information in the set, where we collect the calls.*/
160                         entry = pset_insert(hmap->map, key, hash_entry(key));
161
162                         if (entry != key)
163                                 obstack_free(&hmap->obst, key);
164
165                         /* add the call to the list */
166                         if (! entry->q.calls) {
167                                 entry->q.calls = NEW_ARR_F(ir_node *, 1);
168                                 entry->q.calls[0] = call;
169                         } else
170                                 ARR_APP1(ir_node *, entry->q.calls, call);
171                 }
172         }
173 }
174
175 /**
176  * Collect all calls in a ir_graph to a set.
177  *
178  * @param call   A ir_node to be checked.
179  * @param env   The quadruple-set containing the calls with constant parameters
180  */
181 static void collect_irg_calls(ir_node *call, void *env) {
182         q_set *hmap = env;
183         ir_node *call_ptr;
184         ir_entity *callee;
185
186         /* We collect just "Call" nodes */
187         if (is_Call(call)) {
188                 call_ptr = get_Call_ptr(call);
189
190                 if (! is_SymConst_addr_ent(call_ptr))
191                         return;
192
193                 callee = get_SymConst_entity(call_ptr);
194
195                 /* we can only clone calls to existing entities */
196                 if (get_entity_visibility(callee) == visibility_external_allocated)
197                         return;
198
199                 process_call(call, callee, hmap);
200         }
201 }
202
203 /**
204  * Make a name for a clone. The clone name is
205  * the name of the original method suffixed with "_cl_pos_nr".
206  * pos is the pos from our quadruplet and nr is a counter.
207  *
208  * @param id  The ident of the cloned function.
209  * @param pos The "pos" from our quadruplet.
210  * @param nr  A counter for the clones.
211  */
212 static ident *get_clone_ident(ident *id, int pos, unsigned nr) {
213         char clone_postfix[32];
214
215         snprintf(clone_postfix, sizeof(clone_postfix), "_cl_%d_%u", pos, nr);
216
217         return mangle(id, new_id_from_str(clone_postfix));
218 }
219
220 /**
221  * Pre-Walker: Copies blocks and nodes from the original method graph
222  * to the cloned graph. Fixes the argument projection numbers for
223  * all arguments behind the removed one.
224  *
225  * @param irn  A node from the original method graph.
226  * @param env  The clone graph.
227  */
228 static void copy_nodes(ir_node *irn, void *env) {
229         ir_node *arg, *irg_args, *irn_copy;
230         int proj_nr;
231         ir_graph *clone_irg = env;
232
233         arg      = get_irg_link(clone_irg);
234         irg_args = get_Proj_pred(arg);
235
236         /* Copy all nodes except the arg. */
237         if (irn != arg)
238                 copy_irn_to_irg(irn, clone_irg);
239
240         irn_copy = get_irn_link(irn);
241
242         /* Fix argument numbers */
243         if (is_Proj(irn) && get_Proj_pred(irn) == irg_args) {
244                 proj_nr = get_Proj_proj(irn);
245                 if (get_Proj_proj(arg) < proj_nr)
246                         set_Proj_proj(irn_copy, proj_nr - 1);
247         }
248 }
249
250 /**
251  * Post-walker: Set the predecessors of the copied nodes.
252  * The copied nodes are set as link of their original nodes. The links of
253  * "irn" predecessors are the predecessors of copied node.
254  */
255 static void set_preds(ir_node *irn, void *env) {
256         int i;
257         ir_node *irn_copy, *pred, *arg;
258         ir_graph *clone_irg = env;
259
260         arg = get_irg_link(clone_irg);
261         /* Arg is the method argument, that we have replaced by a constant.*/
262         if (arg == irn)
263                 return;
264
265         irn_copy  = get_irn_link(irn);
266
267         if (is_Block(irn)) {
268                 for (i = get_Block_n_cfgpreds(irn) - 1; i >= 0; i--) {
269                         pred = get_Block_cfgpred(irn, i);
270                         /* "End" block must be handled extra, because it is not matured.*/
271                         if (get_irg_end_block(current_ir_graph) == irn)
272                                 add_immBlock_pred(get_irg_end_block(clone_irg), get_irn_link(pred));
273                         else
274                                 set_Block_cfgpred(irn_copy, i, get_irn_link(pred));
275                 }
276         } else {
277                 /* First we set the block our copy if it is not a block.*/
278                 set_nodes_block(irn_copy, get_irn_link(get_nodes_block(irn)));
279                 if (get_irn_op(irn) == op_End) {
280                         /* Handle the keep-alives. This must be done separately, because
281                            the End node was NOT copied */
282                         for (i = 0; i < get_End_n_keepalives(irn); ++i)
283                                 add_End_keepalive(irn_copy, get_irn_link(get_End_keepalive(irn, i)));
284                 } else {
285                         for (i = get_irn_arity(irn) - 1; i >= 0; i--) {
286                                 pred = get_irn_n(irn, i);
287                                 set_irn_n(irn_copy, i, get_irn_link(pred));
288                         }
289                 }
290         }
291 }
292
293 /**
294  * Get the method argument at the position "pos".
295  *
296  * @param irg  irg that must be cloned.
297  * @param pos  The position of the argument.
298  */
299 static ir_node *get_irg_arg(ir_graph *irg, int pos) {
300         ir_node *irg_args = get_irg_args(irg), *arg = NULL;
301         int i;
302
303         /* Call algorithm that computes the out edges */
304         assure_irg_outs(irg);
305
306         /* Search the argument with the number pos.*/
307         for (i = get_irn_n_outs(irg_args) - 1; i >= 0; --i) {
308                 ir_node *proj = get_irn_out(irg_args, i);
309                 if (pos == get_Proj_proj(proj)) {
310                         if (arg) {
311                                 /*
312                                  * More than one arg node found:
313                                  * We rely on the fact the only one arg exists, so do
314                                  * a cheap CSE in this case.
315                                  */
316                                 set_irn_out(irg_args, i, arg);
317                                 exchange(proj, arg);
318                         } else
319                                 arg = proj;
320                 }
321         }
322         assert(arg && "Argument not found");
323         return arg;
324 }
325
326 /**
327  * Create a new graph for the clone of the method,
328  * that we want to clone.
329  *
330  * @param ent The entity of the method that must be cloned.
331  * @param q   Our quadruplet.
332  */
333 static void create_clone_proc_irg(ir_entity *ent, quadruple_t *q) {
334         ir_graph *method_irg, *clone_irg;
335         ir_node *arg, *const_arg;
336
337         method_irg = get_entity_irg(ent);
338
339         /* We create the skeleton of the clone irg.*/
340         clone_irg  = new_ir_graph(ent, 0);
341
342         arg        = get_irg_arg(get_entity_irg(q->ent), q->pos);
343         /* we will replace the argument in position "q->pos" by this constant. */
344         const_arg  = new_r_Const_type(
345                 clone_irg, get_nodes_block(arg), get_irn_mode(arg), q->tv,
346                 get_method_param_type(get_entity_type(q->ent), q->pos));
347
348         /* args copy in the cloned graph will be the const. */
349         set_irn_link(arg, const_arg);
350
351         /* Store the arg that will be replaced here, so we can easily detect it. */
352         set_irg_link(clone_irg, arg);
353
354         /* We copy the blocks and nodes, that must be in
355         the clone graph and set their predecessors. */
356         irg_walk_graph(method_irg, copy_nodes, set_preds, clone_irg);
357
358         /* The "cloned" graph must be matured. */
359         mature_immBlock(get_irg_end_block(clone_irg));
360         irg_finalize_cons(clone_irg);
361 }
362
363 /**
364  * The function create a new entity type
365  * for our clone and set it to clone entity.
366  *
367  * @param q   Contains information for the method to clone.
368  * @param ent The entity of the clone.
369  * @param nr  A pointer to the counter of clones.
370  **/
371 static void change_entity_type(quadruple_t *q, ir_entity *ent, unsigned *nr) {
372         ir_type *mtp, *new_mtp, *tp;
373         ident   *tp_name;
374         int     i, j, n_params, n_ress;
375
376         mtp      = get_entity_type(q->ent);
377         tp_name  = get_clone_ident(get_type_ident(mtp), q->pos, (*nr)++);
378         n_params = get_method_n_params(mtp);
379         n_ress   = get_method_n_ress(mtp);
380
381         /* Create the new type for our clone. It must have one parameter
382            less then the original.*/
383         new_mtp  = new_type_method(tp_name, n_params - 1, n_ress);
384
385         /* We must set the type of the methods parameters.*/
386         for (i = j = 0; i < n_params; ++i) {
387                 if (i == q->pos)
388                 /* This is the position of the argument, that we have
389                 replaced. */
390                 continue;
391
392                 tp = get_method_param_type(mtp, i);
393                 set_method_param_type(new_mtp, j++, tp);
394         }
395         /* Copy the methods result types. */
396         for (i = 0; i < n_ress; ++i) {
397                 tp = get_method_res_type(mtp, i);
398                 set_method_res_type(new_mtp, i, tp);
399         }
400         set_entity_type(ent, new_mtp);
401 }
402
403 /**
404  * Make a clone of a method.
405  *
406  * @param q   Contains information for the method to clone.
407  */
408 static ir_entity *clone_method(quadruple_t *q) {
409         ir_entity *new_entity;
410         ident *clone_ident;
411         ir_graph *rem;
412         symconst_symbol sym;
413         /* A counter for the clones.*/
414         static unsigned nr = 0;
415
416         /* We get a new ident for our clone method.*/
417         clone_ident = get_clone_ident(get_entity_ident(q->ent), q->pos, nr);
418         /* We get our entity for the clone method. */
419         new_entity  = copy_entity_name(q->ent, clone_ident);
420
421         /* a cloned entity is always local */
422         set_entity_visibility(new_entity, visibility_local);
423
424         /* set a ld name here: Should we mangle this ? */
425         set_entity_ld_ident(new_entity, get_entity_ident(new_entity));
426
427         /* set a new type here. */
428         change_entity_type(q, new_entity, &nr);
429
430         /* We need now a new ir_graph for our clone method. */
431         create_clone_proc_irg(new_entity, q);
432
433         /* We must set the atomic value of our "new_entity". */
434         sym.entity_p = new_entity;
435         rem = current_ir_graph;
436         current_ir_graph =  get_const_code_irg();
437         new_entity->value = new_SymConst(mode_P_code, sym, symconst_addr_ent);
438         current_ir_graph = rem;
439
440         /* The "new_entity" don't have this information. */
441         new_entity->attr.mtd_attr.param_access = NULL;
442         new_entity->attr.mtd_attr.param_weight = NULL;
443
444         return new_entity;
445 }
446
447 /**
448  * Creates a new "cloned" Call node and return it.
449  *
450  * @param call        The call that must be cloned.
451  * @param new_entity  The entity of the cloned function.
452  * @param pos         The position of the replaced parameter of this call.
453  **/
454 static ir_node *new_cl_Call(ir_node *call, ir_entity *new_entity, int pos) {
455         ir_node **in;
456         ir_type *mtp;
457         int i, n_params, new_params = 0;
458         ir_node *callee;
459         symconst_symbol sym;
460         ir_graph *irg = get_irn_irg(call);
461         ir_node *bl = get_nodes_block(call);
462
463         sym.entity_p = new_entity;
464         callee = new_r_SymConst(irg, bl, mode_P_code, sym, symconst_addr_ent);
465
466         mtp      = get_entity_type(new_entity);
467         n_params = get_Call_n_params(call);
468         NEW_ARR_A(ir_node *, in, n_params - 1);
469
470         /* we save the parameters of the new call in the array "in" without the
471          * parameter in position "pos", that is replaced with a constant.*/
472         for (i = 0; i < n_params; i++){
473                 if (pos != i)
474                         in[new_params++] = get_Call_param(call, i);
475         }
476         /* Create and return the new Call. */
477         return new_r_Call(irg, bl, get_Call_mem(call),
478                 callee, n_params - 1, in, get_entity_type(new_entity));
479 }
480
481 /**
482  * Exchange all Calls stored in the quadruplet to Calls of the cloned entity.
483  *
484  * @param q             The quadruple
485  * @param cloned_ent    The entity of the new function that must be called
486  *                      from the new Call.
487  */
488 static void exchange_calls(quadruple_t *q, ir_entity *cloned_ent) {
489         int pos = q->pos;
490         ir_node *new_call, *call;
491         int i;
492
493         /* We iterate the list of the "call".*/
494         for (i = 0; i < ARR_LEN(q->calls); ++i) {
495                 call = q->calls[i];
496
497                 /* A clone exist and the copy of "call" in this
498                  * clone graph must be exchanged with new one.*/
499                 new_call = new_cl_Call(call, cloned_ent, pos);
500                 exchange(call, new_call);
501         }
502 }
503
504 /**
505  * The weight formula:
506  * We save one instruction in every caller and param_weight instructions
507  * in the callee.
508  */
509 static float calculate_weight(const entry_t *entry) {
510         return ARR_LEN(entry->q.calls) *
511                 (get_method_param_weight(entry->q.ent, entry->q.pos) + 1);
512 }
513
514 /**
515  * After we exchanged all calls, some entries on the list for
516  * the next cloned entity may get invalid, so we have to check
517  * them and may even update the list of heavy uses.
518  */
519 static void reorder_weights(q_set *hmap, float threshold) {
520         entry_t **adr, *p, *entry;
521         int i, len;
522         ir_entity *callee;
523
524 restart:
525         entry = hmap->heavy_uses;
526         if (! entry)
527                 return;
528
529         len = ARR_LEN(entry->q.calls);
530         for (i = 0; i < len; ++i) {
531                 ir_node *ptr, *call = entry->q.calls[i];
532
533                 /* might be exchanged, so skip Id nodes here. */
534                 call = skip_Id(call);
535
536                 /* we know, that a SymConst is here */
537                 ptr = get_Call_ptr(call);
538                 assert(get_irn_op(ptr) == op_SymConst);
539
540                 callee = get_SymConst_entity(ptr);
541                 if (callee != entry->q.ent) {
542                         /*
543                          * This call is already changed because of a previous
544                          * optimization. Remove it from the list.
545                          */
546                         --len;
547                         entry->q.calls[i] = entry->q.calls[len];
548                         entry->q.calls[len] = NULL;
549
550                         /* the new call should be processed */
551                         process_call(call, callee, hmap);
552                         --i;
553                 }
554         }
555
556         /* the length might be changed */
557         ARR_SHRINKLEN(entry->q.calls, len);
558
559         /* recalculate the weight and resort the heavy uses map */
560         entry->weight = calculate_weight(entry);
561
562         if (len <= 0 || entry->weight < threshold) {
563                 hmap->heavy_uses = entry->next;
564                 kill_entry(entry);
565
566                 /* we have changed the list, check the next one */
567                 goto restart;
568         }
569
570         adr = NULL;
571         for (p = entry->next; p && entry->weight < p->weight; p = p->next) {
572                 adr = &p->next;
573         }
574
575         if (adr) {
576                 hmap->heavy_uses = entry->next;
577                 entry->next      = *adr;
578                 *adr             = entry;
579                 entry            = hmap->heavy_uses;
580
581                 /* we have changed the list, check the next one */
582                 goto restart;
583         }
584 }
585
586 /*
587  * Do the procedure cloning. Evaluate a heuristic weight for every
588  * call(..., Const, ...). If the weight is bigger than threshold,
589  * clone the entity and fix the calls.
590  */
591 void proc_cloning(float threshold) {
592         entry_t *entry = NULL, *p;
593         ir_graph *irg;
594         int i;
595         q_set hmap;
596
597         obstack_init(&hmap.obst);
598         hmap.map        = NULL;
599         hmap.heavy_uses = NULL;
600
601         /* initially fill our map by visiting all irgs */
602         for (i = get_irp_n_irgs() - 1; i >= 0; --i) {
603                 irg = get_irp_irg(i);
604                 irg_walk_graph(irg, collect_irg_calls, NULL, &hmap);
605         }
606
607         /* We have the "Call" nodes to optimize in set "set_entries". Our algorithm
608            replace one constant parameter and make a new "Call" node for all found "Calls". It exchange the
609            old one with the new one and the algorithm is called with the new "Call".
610          */
611         while (hmap.map || hmap.heavy_uses) {
612                 /* We iterate the set and arrange the element of the set in a list.
613                    The elements are arranged dependent of their value descending.*/
614                 if (hmap.map) {
615                         foreach_pset(hmap.map, entry) {
616                                 entry->weight = calculate_weight(entry);
617
618                                 /*
619                                  * Do not put entry with a weight < threshold in the list
620                                  */
621                                 if (entry->weight < threshold) {
622                                         kill_entry(entry);
623                                         continue;
624                                 }
625
626                                 /* put entry in the heavy uses list */
627                                 entry->next = NULL;
628                                 if (! hmap.heavy_uses)
629                                         hmap.heavy_uses = entry;
630                                 else {
631                                         if (entry->weight >= hmap.heavy_uses->weight) {
632                                                 entry->next     = hmap.heavy_uses;
633                                                 hmap.heavy_uses = entry;
634                                         } else {
635                                                 for (p = hmap.heavy_uses; p->next; p = p->next) {
636                                                         if (entry->weight >= p->next->weight) {
637                                                                 entry->next = p->next;
638                                                                 p->next     = entry;
639                                                                 break;
640                                                         }
641                                                 }
642                                                 if (! p->next)
643                                                         p->next = entry;
644                                         }
645                                 }
646                         }
647                         del_pset(hmap.map);
648                         hmap.map = NULL;
649                 }
650
651                 /* Print some information about the list. */
652                 printf("-----------------\n");
653                 for (entry = hmap.heavy_uses; entry; entry = entry->next) {
654                         printf("\nweight: is %f\n", entry->weight);
655                         ir_printf("Call for Method %E\n", entry->q.ent);
656                         printf("Position %i\n", entry->q.pos);
657                         ir_printf("Value %T\n", entry->q.tv);
658                 }
659
660                 entry = hmap.heavy_uses;
661                 if (entry) {
662                         ir_entity *ent = clone_method(&entry->q);
663
664                         hmap.heavy_uses = entry->next;
665
666                         /* We must exchange the copies of this call in all clones too.*/
667                         exchange_calls(&entry->q, ent);
668                         kill_entry(entry);
669
670                         /*
671                          * after we exchanged all calls, some entries on the list for
672                          * the next cloned entity may get invalid, so we have to check
673                          * them and may even update the list of heavy uses.
674                          */
675                         reorder_weights(&hmap, threshold);
676                 }
677         }
678         obstack_free(&hmap.obst, NULL);
679 }