26d4c1f7c2f3ecdef37dacb4b4899746eb8ffaec
[libfirm] / ir / opt / tailrec.c
1 /*
2  * Copyright (C) 1995-2008 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   Tail-recursion call optimization.
23  * @date    08.06.2004
24  * @author  Michael Beck
25  * @version $Id$
26  */
27 #include "config.h"
28
29 #include <string.h>
30 #include <assert.h>
31
32 #include "debug.h"
33 #include "iroptimize.h"
34 #include "scalar_replace.h"
35 #include "array_t.h"
36 #include "irprog_t.h"
37 #include "irgwalk.h"
38 #include "irgmod.h"
39 #include "irop.h"
40 #include "irnode_t.h"
41 #include "irgraph_t.h"
42 #include "ircons.h"
43 #include "irflag.h"
44 #include "trouts.h"
45 #include "irouts.h"
46 #include "irhooks.h"
47 #include "ircons_t.h"
48 #include "irpass.h"
49
50 DEBUG_ONLY(static firm_dbg_module_t *dbg);
51
52 /**
53  * the environment for collecting data
54  */
55 typedef struct _collect_t {
56         ir_node *proj_X;      /**< initial exec proj */
57         ir_node *block;       /**< old first block */
58         int     blk_idx;      /**< cfgpred index of the initial exec in block */
59         ir_node *proj_m;      /**< memory from start proj's */
60         ir_node *proj_data;   /**< linked list of all parameter access proj's */
61 } collect_t;
62
63 /**
64  * walker for collecting data, fills a collect_t environment
65  */
66 static void collect_data(ir_node *node, void *env) {
67         collect_t *data = env;
68         ir_node *pred;
69         ir_op *op;
70
71         switch (get_irn_opcode(node)) {
72         case iro_Proj:
73                 pred = get_Proj_pred(node);
74
75                 op = get_irn_op(pred);
76                 if (op == op_Proj) {
77                         ir_node *start = get_Proj_pred(pred);
78
79                         if (is_Start(start)) {
80                                 if (get_Proj_proj(pred) == pn_Start_T_args) {
81                                         /* found Proj(ProjT(Start)) */
82                                         set_irn_link(node, data->proj_data);
83                                         data->proj_data = node;
84                                 }
85                         }
86                 } else if (op == op_Start) {
87                         if (get_Proj_proj(node) == pn_Start_X_initial_exec) {
88                                 /* found ProjX(Start) */
89                                 data->proj_X = node;
90                         }
91                 }
92                 break;
93         case iro_Block: {
94                 int i, n_pred = get_Block_n_cfgpreds(node);
95
96                 /*
97                  * the first block has the initial exec as cfg predecessor
98                  */
99                 if (node != get_irg_start_block(current_ir_graph)) {
100                         for (i = 0; i < n_pred; ++i) {
101                                 if (get_Block_cfgpred(node, i) == data->proj_X) {
102                                         data->block   = node;
103                                         data->blk_idx = i;
104                                         break;
105                                 }
106                         }
107                 }
108                 break;
109         }
110         default:
111                 break;
112         }
113 }
114
115 typedef enum tail_rec_variants {
116         TR_DIRECT,  /**< direct return value, i.e. return func(). */
117         TR_ADD,     /**< additive return value, i.e. return x +/- func() */
118         TR_MUL,     /**< multiplicative return value, i.e. return x * func() or return -func() */
119         TR_BAD,     /**< any other transformation */
120         TR_UNKNOWN  /**< during construction */
121 } tail_rec_variants;
122
123 typedef struct tr_env {
124         int               n_tail_calls;  /**< number of tail calls found */
125         int               n_ress;        /**< number of return values */
126         tail_rec_variants *variants;     /**< return value variants */
127         ir_node           *rets;         /**< list of returns that can be transformed */
128 } tr_env;
129
130
131 /**
132  * do the graph reconstruction for tail-recursion elimination
133  *
134  * @param irg           the graph that will reconstructed
135  * @param rets          linked list of all rets
136  * @param n_tail_calls  number of tail-recursion calls
137  */
138 static void do_opt_tail_rec(ir_graph *irg, tr_env *env) {
139         ir_node *end_block = get_irg_end_block(irg);
140         ir_node *block, *jmp, *call, *calls;
141         ir_node **in;
142         ir_node **phis;
143         ir_node ***call_params;
144         ir_node *p, *n;
145         int i, j, n_params, n_locs;
146         collect_t data;
147         int rem            = get_optimize();
148         ir_entity *ent     = get_irg_entity(irg);
149         ir_type *method_tp = get_entity_type(ent);
150         ir_graph *old      = current_ir_graph;
151
152         current_ir_graph = irg;
153
154         assert(env->n_tail_calls > 0);
155
156         /* we add new nodes, so the outs are inconsistent */
157         set_irg_outs_inconsistent(irg);
158
159         /* we add new blocks and change the control flow */
160         set_irg_doms_inconsistent(irg);
161         set_irg_extblk_inconsistent(irg);
162
163         /* we add a new loop */
164         set_irg_loopinfo_inconsistent(irg);
165
166         /* calls are removed */
167         set_trouts_inconsistent();
168
169         /* we must build some new nodes WITHOUT CSE */
170         set_optimize(0);
171
172         /* collect needed data */
173         data.proj_X    = NULL;
174         data.block     = NULL;
175         data.blk_idx   = -1;
176         data.proj_m    = get_irg_initial_mem(irg);
177         data.proj_data = NULL;
178         irg_walk_graph(irg, NULL, collect_data, &data);
179
180         /* check number of arguments */
181         call = get_irn_link(end_block);
182         n_params = get_Call_n_params(call);
183
184         assert(data.proj_X && "Could not find initial exec from Start");
185         assert(data.block  && "Could not find first block");
186         assert(data.proj_m && "Could not find initial memory");
187         assert((data.proj_data || n_params == 0) && "Could not find Proj(ProjT(Start)) of non-void function");
188
189         /* allocate in's for phi and block construction */
190         NEW_ARR_A(ir_node *, in, env->n_tail_calls + 1);
191
192         in[0] = data.proj_X;
193
194         /* turn Return's into Jmp's */
195         for (i = 1, p = env->rets; p; p = n) {
196                 ir_node *block = get_nodes_block(p);
197
198                 n = get_irn_link(p);
199                 in[i++] = new_r_Jmp(block);
200
201                 // exchange(p, new_r_Bad(irg));
202
203                 /* we might generate an endless loop, so add
204                  * the block to the keep-alive list */
205                 add_End_keepalive(get_irg_end(irg), block);
206         }
207
208         /* create a new block at start */
209         block = new_r_Block(irg, env->n_tail_calls + 1, in);
210         jmp   = new_r_Jmp(block);
211
212         /* the old first block is now the second one */
213         set_Block_cfgpred(data.block, data.blk_idx, jmp);
214
215         /* allocate phi's, position 0 contains the memory phi */
216         NEW_ARR_A(ir_node *, phis, n_params + 1);
217
218         /* build the memory phi */
219         i = 0;
220         in[i] = new_r_Proj(get_irg_start_block(irg), get_irg_start(irg), mode_M, pn_Start_M);
221         set_irg_initial_mem(irg, in[i]);
222         ++i;
223
224         for (calls = call; calls; calls = get_irn_link(calls)) {
225                 in[i] = get_Call_mem(calls);
226                 ++i;
227         }
228         assert(i == env->n_tail_calls + 1);
229
230         phis[0] = new_r_Phi(block, env->n_tail_calls + 1, in, mode_M);
231
232         /* build the data Phi's */
233         if (n_params > 0) {
234                 ir_node *calls;
235                 ir_node *args;
236                 ir_node *args_bl;
237
238                 NEW_ARR_A(ir_node **, call_params, env->n_tail_calls);
239
240                 /* collect all parameters */
241                 for (i = 0, calls = call; calls; calls = get_irn_link(calls)) {
242                         call_params[i] = get_Call_param_arr(calls);
243                         ++i;
244                 }
245
246                 /* build new Proj's and Phi's */
247                 args    = get_irg_args(irg);
248                 args_bl = get_nodes_block(args);
249                 for (i = 0; i < n_params; ++i) {
250                         ir_mode *mode = get_type_mode(get_method_param_type(method_tp, i));
251
252                         in[0] = new_r_Proj(args_bl, args, mode, i);
253                         for (j = 0; j < env->n_tail_calls; ++j)
254                                 in[j + 1] = call_params[j][i];
255
256                         phis[i + 1] = new_r_Phi(block, env->n_tail_calls + 1, in, mode);
257                 }
258         }
259
260         /*
261          * ok, we are here, so we have build and collected all needed Phi's
262          * now exchange all Projs into links to Phi
263          */
264         exchange(data.proj_m, phis[0]);
265         for (p = data.proj_data; p; p = n) {
266                 long proj = get_Proj_proj(p);
267
268                 assert(0 <= proj && proj < n_params);
269                 n = get_irn_link(p);
270                 exchange(p, phis[proj + 1]);
271         }
272
273         /* tail recursion was done, all info is invalid */
274         set_irg_doms_inconsistent(irg);
275         set_irg_outs_inconsistent(irg);
276         set_irg_extblk_inconsistent(irg);
277         set_irg_loopinfo_state(current_ir_graph, loopinfo_cf_inconsistent);
278         set_trouts_inconsistent();
279         set_irg_callee_info_state(irg, irg_callee_info_inconsistent);
280
281         set_optimize(rem);
282
283         /* check if we need new values */
284         n_locs = 0;
285         for (i = 0; i < env->n_ress; ++i) {
286                 if (env->variants[i] != TR_DIRECT)
287                         ++n_locs;
288         }
289
290         if (n_locs > 0) {
291                 ir_node *bad, *start_block;
292                 ir_node **in;
293                 ir_mode **modes;
294
295                 NEW_ARR_A(ir_node *, in, n_locs);
296                 NEW_ARR_A(ir_mode *, modes, n_locs);
297                 ssa_cons_start(irg, n_locs);
298
299                 start_block = get_irg_start_block(irg);
300                 set_cur_block(start_block);
301
302                 for (i = 0; i < env->n_ress; ++i) {
303                         ir_type *tp = get_method_res_type(method_tp, i);
304                         ir_mode *mode = get_type_mode(tp);
305
306                         modes[i] = mode;
307                         if (env->variants[i] == TR_ADD) {
308                                 set_value(i, new_Const(get_mode_null(mode)));
309                         } else if (env->variants[i] == TR_MUL) {
310                                 set_value(i, new_Const(get_mode_one(mode)));
311                         }
312                 }
313                 mature_immBlock(start_block);
314
315                 /* no: we can kill all returns */
316                 bad = get_irg_bad(irg);
317
318                 for (p = env->rets; p; p = n) {
319                         ir_node *block = get_nodes_block(p);
320                         ir_node *call, *mem, *jmp, *tuple;
321
322                         set_cur_block(block);
323                         n = get_irn_link(p);
324
325                         call = skip_Proj(get_Return_mem(p));
326                         assert(is_Call(call));
327
328                         mem = get_Call_mem(call);
329
330                         /* create a new jump, free of CSE */
331                         set_optimize(0);
332                         jmp = new_Jmp();
333                         set_optimize(rem);
334
335                         for (i = 0; i < env->n_ress; ++i) {
336                                 if (env->variants[i] != TR_DIRECT) {
337                                         in[i] = get_value(i, modes[i]);
338                                 } else {
339                                         in[i] = bad;
340                                 }
341                         }
342                         /* create a new tuple for the return values */
343                         tuple = new_Tuple(env->n_ress, in);
344
345                         turn_into_tuple(call, pn_Call_max);
346                         set_Tuple_pred(call, pn_Call_M,                mem);
347                         set_Tuple_pred(call, pn_Call_X_regular,        jmp);
348                         set_Tuple_pred(call, pn_Call_X_except,         bad);
349                         set_Tuple_pred(call, pn_Call_T_result,         tuple);
350                         set_Tuple_pred(call, pn_Call_M_except,         mem);
351                         set_Tuple_pred(call, pn_Call_P_value_res_base, bad);
352
353                         for (i = 0; i < env->n_ress; ++i) {
354                                 ir_node *res = get_Return_res(p, i);
355                                 if (env->variants[i] != TR_DIRECT) {
356                                         set_value(i, res);
357                                 }
358                         }
359
360                         exchange(p, bad);
361                 }
362
363                 /* finally fix all other returns */
364                 end_block = get_irg_end_block(irg);
365                 for (i = get_Block_n_cfgpreds(end_block) - 1; i >= 0; --i) {
366                         ir_node *ret = get_Block_cfgpred(end_block, i);
367
368                         /* search all Returns of a block */
369                         if (! is_Return(ret))
370                                 continue;
371
372                         set_cur_block(get_nodes_block(ret));
373                         for (j = 0; j < env->n_ress; ++j) {
374                                 ir_node *pred = get_Return_res(ret, j);
375                                 ir_node *n;
376
377                                 switch (env->variants[j]) {
378                                 case TR_DIRECT:
379                                         continue;
380
381                                 case TR_ADD:
382                                         n = get_value(j, modes[j]);
383                                         n = new_Add(n, pred, modes[j]);
384                                         set_Return_res(ret, j, n);
385                                         break;
386
387                                 case TR_MUL:
388                                         n = get_value(j, modes[j]);
389                                         n = new_Mul(n, pred, modes[j]);
390                                         set_Return_res(ret, j, n);
391                                         break;
392
393                                 default:
394                                         assert(!"unexpected tail recursion variant");
395                                 }
396                         }
397                 }
398                 ssa_cons_finish(irg);
399         } else {
400                 ir_node *bad = get_irg_bad(irg);
401
402                 /* no: we can kill all returns */
403                 for (p = env->rets; p; p = n) {
404                         n = get_irn_link(p);
405                         exchange(p, bad);
406                 }
407         }
408         current_ir_graph = old;
409 }
410
411 /**
412  * Check the lifetime of locals in the given graph.
413  * Tail recursion can only be done, if we can prove that
414  * the lifetime of locals end with the recursive call.
415  * We do this by checking that no address of a local variable is
416  * stored or transmitted as an argument to a call.
417  *
418  * @return non-zero if it's ok to do tail recursion
419  */
420 static int check_lifetime_of_locals(ir_graph *irg) {
421         ir_node *irg_frame;
422         int i;
423         ir_type *frame_tp = get_irg_frame_type(irg);
424
425         irg_frame = get_irg_frame(irg);
426         for (i = get_irn_n_outs(irg_frame) - 1; i >= 0; --i) {
427                 ir_node *succ = get_irn_out(irg_frame, i);
428
429                 if (is_Sel(succ)) {
430                         /* Check if we have compound arguments.
431                            For now, we cannot handle them, */
432                         if (get_entity_owner(get_Sel_entity(succ)) != frame_tp)
433                                 return 0;
434
435                         if (is_address_taken(succ))
436                                 return 0;
437                 }
438         }
439         return 1;
440 }
441
442 /**
443  * Examine irn and detect the recursion variant.
444  */
445 static tail_rec_variants find_variant(ir_node *irn, ir_node *call) {
446         ir_node           *a, *b;
447         tail_rec_variants va, vb, res;
448
449         if (skip_Proj(skip_Proj(irn)) == call) {
450                 /* found it */
451                 return TR_DIRECT;
452         }
453         switch (get_irn_opcode(irn)) {
454         case iro_Add:
455                 /* try additive */
456                 a = get_Add_left(irn);
457                 if (get_irn_MacroBlock(a) != get_irn_MacroBlock(call)) {
458                         /* we are outside, ignore */
459                         va = TR_UNKNOWN;
460                 } else {
461                         va = find_variant(a, call);
462                         if (va == TR_BAD)
463                                 return TR_BAD;
464                 }
465                 b = get_Add_right(irn);
466                 if (get_irn_MacroBlock(b) != get_irn_MacroBlock(call)) {
467                         /* we are outside, ignore */
468                         vb = TR_UNKNOWN;
469                 } else {
470                         vb = find_variant(b, call);
471                         if (vb == TR_BAD)
472                                 return TR_BAD;
473                 }
474                 if (va == vb) {
475                         res = va;
476                 }
477                 else if (va == TR_UNKNOWN)
478                         res = vb;
479                 else if (vb == TR_UNKNOWN)
480                         res = va;
481                 else {
482                         /* they are different but none is TR_UNKNOWN -> incompatible */
483                         return TR_BAD;
484                 }
485                 if (res == TR_DIRECT || res == TR_ADD)
486                         return TR_ADD;
487                 /* not compatible */
488                 return TR_BAD;
489
490         case iro_Sub:
491                 /* try additive, but return value must be left */
492                 a = get_Sub_left(irn);
493                 if (get_irn_MacroBlock(a) != get_irn_MacroBlock(call)) {
494                         /* we are outside, ignore */
495                         va = TR_UNKNOWN;
496                 } else {
497                         va = find_variant(a, call);
498                         if (va == TR_BAD)
499                                 return TR_BAD;
500                 }
501                 b = get_Sub_right(irn);
502                 if (get_irn_MacroBlock(b) != get_irn_MacroBlock(call)) {
503                         /* we are outside, ignore */
504                         vb = TR_UNKNOWN;
505                 } else {
506                         vb = find_variant(b, call);
507                         if (vb != TR_UNKNOWN)
508                                 return TR_BAD;
509                 }
510                 res = va;
511                 if (res == TR_DIRECT || res == TR_ADD)
512                         return res;
513                 /* not compatible */
514                 return TR_BAD;
515
516         case iro_Mul:
517                 /* try multiplicative */
518                 a = get_Mul_left(irn);
519                 if (get_irn_MacroBlock(a) != get_irn_MacroBlock(call)) {
520                         /* we are outside, ignore */
521                         va = TR_UNKNOWN;
522                 } else {
523                         va = find_variant(a, call);
524                         if (va == TR_BAD)
525                                 return TR_BAD;
526                 }
527                 b = get_Mul_right(irn);
528                 if (get_irn_MacroBlock(b) != get_irn_MacroBlock(call)) {
529                         /* we are outside, ignore */
530                         vb = TR_UNKNOWN;
531                 } else {
532                         vb = find_variant(b, call);
533                         if (vb == TR_BAD)
534                                 return TR_BAD;
535                 }
536                 if (va == vb) {
537                         res = va;
538                 }
539                 else if (va == TR_UNKNOWN)
540                         res = vb;
541                 else if (vb == TR_UNKNOWN)
542                         res = va;
543                 else {
544                         /* they are different but none is TR_UNKNOWN -> incompatible */
545                         return TR_BAD;
546                 }
547                 if (res == TR_DIRECT || res == TR_MUL)
548                         return TR_MUL;
549                 /* not compatible */
550                 return TR_BAD;
551
552         case iro_Minus:
553                 /* try multiplicative */
554                 a = get_Minus_op(irn);
555                 res =  find_variant(a, call);
556                 if (res == TR_DIRECT)
557                         return TR_MUL;
558                 if (res == TR_MUL || res == TR_UNKNOWN)
559                         return res;
560                 /* not compatible */
561                 return TR_BAD;
562
563         default:
564                 return TR_UNKNOWN;
565         }
566 }
567
568
569 /*
570  * convert simple tail-calls into loops
571  */
572 int opt_tail_rec_irg(ir_graph *irg) {
573         tr_env            env;
574         ir_node           *end_block;
575         int               i, n_ress, n_tail_calls = 0;
576         ir_node           *rets = NULL;
577         ir_type           *mtd_type, *call_type;
578         ir_entity         *ent;
579
580         assure_irg_outs(irg);
581
582         if (! check_lifetime_of_locals(irg))
583                 return 0;
584
585
586         ent      = get_irg_entity(irg);
587         mtd_type = get_entity_type(ent);
588     n_ress   = get_method_n_ress(mtd_type);
589
590         env.variants = NULL;
591         env.n_ress   = n_ress;
592
593         if (n_ress > 0) {
594                 NEW_ARR_A(tail_rec_variants, env.variants, n_ress);
595
596                 for (i = 0; i < n_ress; ++i)
597                         env.variants[i] = TR_DIRECT;
598         }
599
600         /*
601          * This tail recursion optimization works best
602          * if the Returns are normalized.
603          */
604         normalize_n_returns(irg);
605
606         end_block = get_irg_end_block(irg);
607         set_irn_link(end_block, NULL);
608
609         for (i = get_Block_n_cfgpreds(end_block) - 1; i >= 0; --i) {
610                 ir_node *ret = get_Block_cfgpred(end_block, i);
611                 ir_node *call, *call_ptr;
612                 int j;
613                 ir_node **ress;
614
615                 /* search all Returns of a block */
616                 if (! is_Return(ret))
617                         continue;
618
619                 /* check, if it's a Return self() */
620                 call = skip_Proj(get_Return_mem(ret));
621                 if (! is_Call(call))
622                         continue;
623
624                 /* the call must be in the same block as the return */
625                 if (get_nodes_block(call) != get_nodes_block(ret))
626                         continue;
627
628                 /* check if it's a recursive call */
629                 call_ptr = get_Call_ptr(call);
630
631                 if (! is_Global(call_ptr))
632                         continue;
633
634                 ent = get_Global_entity(call_ptr);
635                 if (!ent || get_entity_irg(ent) != irg)
636                         continue;
637
638                 /*
639                  * Check, that the types match. At least in C
640                  * this might fail.
641                  */
642                 mtd_type  = get_entity_type(ent);
643                 call_type = get_Call_type(call);
644
645                 if (mtd_type != call_type) {
646                         /*
647                          * Hmm, the types did not match, bad.
648                          * This can happen in C when no prototype is given
649                          * or K&R style is used.
650                          */
651 #if 0
652                         printf("Warning: Tail recursion fails because of different method and call types:\n");
653                         dump_type(mtd_type);
654                         dump_type(call_type);
655 #endif
656                         continue;
657                 }
658
659                 /* ok, mem is routed to a recursive call, check return args */
660                 ress = get_Return_res_arr(ret);
661                 for (j = get_Return_n_ress(ret) - 1; j >= 0; --j) {
662                         tail_rec_variants var = find_variant(ress[j], call);
663
664                         if (var >= TR_BAD) {
665                                 /* cannot be transformed */
666                                 break;
667                         }
668                         if (var == TR_DIRECT)
669                                 var = env.variants[j];
670                         else if (env.variants[j] == TR_DIRECT)
671                                 env.variants[j] = var;
672                         if (env.variants[j] != var) {
673                                 /* not compatible */
674                                 break;
675                         }
676                 }
677                 if (j >= 0)
678                         continue;
679
680                 /* here, we have found a call */
681                 set_irn_link(call, get_irn_link(end_block));
682                 set_irn_link(end_block, call);
683                 ++n_tail_calls;
684
685                 /* link all returns, we will need this */
686                 set_irn_link(ret, rets);
687                 rets = ret;
688         }
689
690         /* now, end_block->link contains the list of all tail calls */
691         if (n_tail_calls <= 0)
692                 return 0;
693
694         DB((dbg, LEVEL_2, "  Performing tail recursion for graph %s and %d Calls\n",
695             get_entity_ld_name(get_irg_entity(irg)), n_tail_calls));
696
697         hook_tail_rec(irg, n_tail_calls);
698
699         env.n_tail_calls = n_tail_calls;
700         env.rets         = rets;
701         do_opt_tail_rec(irg, &env);
702
703         return n_tail_calls;
704 }
705
706 ir_graph_pass_t *opt_tail_rec_irg_pass(const char *name)
707 {
708         return def_graph_pass_ret(name ? name : "tailrec", opt_tail_rec_irg);
709 }
710
711 /*
712  * optimize tail recursion away
713  */
714 void opt_tail_recursion(void) {
715         int i;
716         int n_opt_applications = 0;
717         ir_graph *irg;
718
719         FIRM_DBG_REGISTER(dbg, "firm.opt.tailrec");
720
721         for (i = get_irp_n_irgs() - 1; i >= 0; --i) {
722                 irg = get_irp_irg(i);
723
724                 current_ir_graph = irg;
725
726                 ir_reserve_resources(irg, IR_RESOURCE_IRN_LINK);
727                 if (opt_tail_rec_irg(irg))
728                         ++n_opt_applications;
729
730                 ir_free_resources(irg, IR_RESOURCE_IRN_LINK);
731         }
732
733         DB((dbg, LEVEL_1, "Performed tail recursion for %d of %d graphs\n",
734             n_opt_applications, get_irp_n_irgs()));
735 }
736
737 ir_prog_pass_t *opt_tail_recursion_pass(const char *name)
738 {
739         return def_prog_pass(name ? name : "tailrec", opt_tail_recursion);
740 }