PR target/4198
[official-gcc.git] / gcc / tree-ssa-loop-ivopts.c
blob7853d69acd363e62fb5518789b527f89ff2fa34e
1 /* Induction variable optimizations.
2 Copyright (C) 2003, 2004, 2005 Free Software Foundation, Inc.
4 This file is part of GCC.
6 GCC is free software; you can redistribute it and/or modify it
7 under the terms of the GNU General Public License as published by the
8 Free Software Foundation; either version 2, or (at your option) any
9 later version.
11 GCC is distributed in the hope that it will be useful, but WITHOUT
12 ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or
13 FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License
14 for more details.
16 You should have received a copy of the GNU General Public License
17 along with GCC; see the file COPYING. If not, write to the Free
18 Software Foundation, 59 Temple Place - Suite 330, Boston, MA
19 02111-1307, USA. */
21 /* This pass tries to find the optimal set of induction variables for the loop.
22 It optimizes just the basic linear induction variables (although adding
23 support for other types should not be too hard). It includes the
24 optimizations commonly known as strength reduction, induction variable
25 coalescing and induction variable elimination. It does it in the
26 following steps:
28 1) The interesting uses of induction variables are found. This includes
30 -- uses of induction variables in non-linear expressions
31 -- addresses of arrays
32 -- comparisons of induction variables
34 2) Candidates for the induction variables are found. This includes
36 -- old induction variables
37 -- the variables defined by expressions derived from the "interesting
38 uses" above
40 3) The optimal (w.r. to a cost function) set of variables is chosen. The
41 cost function assigns a cost to sets of induction variables and consists
42 of three parts:
44 -- The use costs. Each of the interesting uses chooses the best induction
45 variable in the set and adds its cost to the sum. The cost reflects
46 the time spent on modifying the induction variables value to be usable
47 for the given purpose (adding base and offset for arrays, etc.).
48 -- The variable costs. Each of the variables has a cost assigned that
49 reflects the costs associated with incrementing the value of the
50 variable. The original variables are somewhat preferred.
51 -- The set cost. Depending on the size of the set, extra cost may be
52 added to reflect register pressure.
54 All the costs are defined in a machine-specific way, using the target
55 hooks and machine descriptions to determine them.
57 4) The trees are transformed to use the new variables, the dead code is
58 removed.
60 All of this is done loop by loop. Doing it globally is theoretically
61 possible, it might give a better performance and it might enable us
62 to decide costs more precisely, but getting all the interactions right
63 would be complicated. */
65 #include "config.h"
66 #include "system.h"
67 #include "coretypes.h"
68 #include "tm.h"
69 #include "tree.h"
70 #include "rtl.h"
71 #include "tm_p.h"
72 #include "hard-reg-set.h"
73 #include "basic-block.h"
74 #include "output.h"
75 #include "diagnostic.h"
76 #include "tree-flow.h"
77 #include "tree-dump.h"
78 #include "timevar.h"
79 #include "cfgloop.h"
80 #include "varray.h"
81 #include "expr.h"
82 #include "tree-pass.h"
83 #include "ggc.h"
84 #include "insn-config.h"
85 #include "recog.h"
86 #include "hashtab.h"
87 #include "tree-chrec.h"
88 #include "tree-scalar-evolution.h"
89 #include "cfgloop.h"
90 #include "params.h"
92 /* The infinite cost. */
93 #define INFTY 10000000
95 /* The expected number of loop iterations. TODO -- use profiling instead of
96 this. */
97 #define AVG_LOOP_NITER(LOOP) 5
100 /* Representation of the induction variable. */
101 struct iv
103 tree base; /* Initial value of the iv. */
104 tree base_object; /* A memory object to that the induction variable points. */
105 tree step; /* Step of the iv (constant only). */
106 tree ssa_name; /* The ssa name with the value. */
107 bool biv_p; /* Is it a biv? */
108 bool have_use_for; /* Do we already have a use for it? */
109 unsigned use_id; /* The identifier in the use if it is the case. */
112 /* Per-ssa version information (induction variable descriptions, etc.). */
113 struct version_info
115 tree name; /* The ssa name. */
116 struct iv *iv; /* Induction variable description. */
117 bool has_nonlin_use; /* For a loop-level invariant, whether it is used in
118 an expression that is not an induction variable. */
119 unsigned inv_id; /* Id of an invariant. */
120 bool preserve_biv; /* For the original biv, whether to preserve it. */
123 /* Information attached to loop. */
124 struct loop_data
126 unsigned regs_used; /* Number of registers used. */
129 /* Types of uses. */
130 enum use_type
132 USE_NONLINEAR_EXPR, /* Use in a nonlinear expression. */
133 USE_OUTER, /* The induction variable is used outside the loop. */
134 USE_ADDRESS, /* Use in an address. */
135 USE_COMPARE /* Use is a compare. */
138 /* The candidate - cost pair. */
139 struct cost_pair
141 struct iv_cand *cand; /* The candidate. */
142 unsigned cost; /* The cost. */
143 bitmap depends_on; /* The list of invariants that have to be
144 preserved. */
147 /* Use. */
148 struct iv_use
150 unsigned id; /* The id of the use. */
151 enum use_type type; /* Type of the use. */
152 struct iv *iv; /* The induction variable it is based on. */
153 tree stmt; /* Statement in that it occurs. */
154 tree *op_p; /* The place where it occurs. */
155 bitmap related_cands; /* The set of "related" iv candidates, plus the common
156 important ones. */
158 unsigned n_map_members; /* Number of candidates in the cost_map list. */
159 struct cost_pair *cost_map;
160 /* The costs wrto the iv candidates. */
162 struct iv_cand *selected;
163 /* The selected candidate. */
166 /* The position where the iv is computed. */
167 enum iv_position
169 IP_NORMAL, /* At the end, just before the exit condition. */
170 IP_END, /* At the end of the latch block. */
171 IP_ORIGINAL /* The original biv. */
174 /* The induction variable candidate. */
175 struct iv_cand
177 unsigned id; /* The number of the candidate. */
178 bool important; /* Whether this is an "important" candidate, i.e. such
179 that it should be considered by all uses. */
180 enum iv_position pos; /* Where it is computed. */
181 tree incremented_at; /* For original biv, the statement where it is
182 incremented. */
183 tree var_before; /* The variable used for it before increment. */
184 tree var_after; /* The variable used for it after increment. */
185 struct iv *iv; /* The value of the candidate. NULL for
186 "pseudocandidate" used to indicate the possibility
187 to replace the final value of an iv by direct
188 computation of the value. */
189 unsigned cost; /* Cost of the candidate. */
192 /* The data used by the induction variable optimizations. */
194 struct ivopts_data
196 /* The currently optimized loop. */
197 struct loop *current_loop;
199 /* Numbers of iterations for all exits of the current loop. */
200 htab_t niters;
202 /* The size of version_info array allocated. */
203 unsigned version_info_size;
205 /* The array of information for the ssa names. */
206 struct version_info *version_info;
208 /* The bitmap of indices in version_info whose value was changed. */
209 bitmap relevant;
211 /* The maximum invariant id. */
212 unsigned max_inv_id;
214 /* The uses of induction variables. */
215 varray_type iv_uses;
217 /* The candidates. */
218 varray_type iv_candidates;
220 /* A bitmap of important candidates. */
221 bitmap important_candidates;
223 /* Whether to consider just related and important candidates when replacing a
224 use. */
225 bool consider_all_candidates;
228 /* An assignment of iv candidates to uses. */
230 struct iv_ca
232 /* The number of uses covered by the assignment. */
233 unsigned upto;
235 /* Number of uses that cannot be expressed by the candidates in the set. */
236 unsigned bad_uses;
238 /* Candidate assigned to a use, together with the related costs. */
239 struct cost_pair **cand_for_use;
241 /* Number of times each candidate is used. */
242 unsigned *n_cand_uses;
244 /* The candidates used. */
245 bitmap cands;
247 /* The number of candidates in the set. */
248 unsigned n_cands;
250 /* Total number of registers needed. */
251 unsigned n_regs;
253 /* Total cost of expressing uses. */
254 unsigned cand_use_cost;
256 /* Total cost of candidates. */
257 unsigned cand_cost;
259 /* Number of times each invariant is used. */
260 unsigned *n_invariant_uses;
262 /* Total cost of the assignment. */
263 unsigned cost;
266 /* Difference of two iv candidate assignments. */
268 struct iv_ca_delta
270 /* Changed use. */
271 struct iv_use *use;
273 /* An old assignment (for rollback purposes). */
274 struct cost_pair *old_cp;
276 /* A new assignment. */
277 struct cost_pair *new_cp;
279 /* Next change in the list. */
280 struct iv_ca_delta *next_change;
283 /* Bound on number of candidates below that all candidates are considered. */
285 #define CONSIDER_ALL_CANDIDATES_BOUND \
286 ((unsigned) PARAM_VALUE (PARAM_IV_CONSIDER_ALL_CANDIDATES_BOUND))
288 /* If there are more iv occurrences, we just give up (it is quite unlikely that
289 optimizing such a loop would help, and it would take ages). */
291 #define MAX_CONSIDERED_USES \
292 ((unsigned) PARAM_VALUE (PARAM_IV_MAX_CONSIDERED_USES))
294 /* If there are at most this number of ivs in the set, try removing unnecessary
295 ivs from the set always. */
297 #define ALWAYS_PRUNE_CAND_SET_BOUND \
298 ((unsigned) PARAM_VALUE (PARAM_IV_ALWAYS_PRUNE_CAND_SET_BOUND))
300 /* The list of trees for that the decl_rtl field must be reset is stored
301 here. */
303 static varray_type decl_rtl_to_reset;
305 /* Number of uses recorded in DATA. */
307 static inline unsigned
308 n_iv_uses (struct ivopts_data *data)
310 return VARRAY_ACTIVE_SIZE (data->iv_uses);
313 /* Ith use recorded in DATA. */
315 static inline struct iv_use *
316 iv_use (struct ivopts_data *data, unsigned i)
318 return VARRAY_GENERIC_PTR_NOGC (data->iv_uses, i);
321 /* Number of candidates recorded in DATA. */
323 static inline unsigned
324 n_iv_cands (struct ivopts_data *data)
326 return VARRAY_ACTIVE_SIZE (data->iv_candidates);
329 /* Ith candidate recorded in DATA. */
331 static inline struct iv_cand *
332 iv_cand (struct ivopts_data *data, unsigned i)
334 return VARRAY_GENERIC_PTR_NOGC (data->iv_candidates, i);
337 /* The data for LOOP. */
339 static inline struct loop_data *
340 loop_data (struct loop *loop)
342 return loop->aux;
345 /* The single loop exit if it dominates the latch, NULL otherwise. */
347 static edge
348 single_dom_exit (struct loop *loop)
350 edge exit = loop->single_exit;
352 if (!exit)
353 return NULL;
355 if (!just_once_each_iteration_p (loop, exit->src))
356 return NULL;
358 return exit;
361 /* Dumps information about the induction variable IV to FILE. */
363 extern void dump_iv (FILE *, struct iv *);
364 void
365 dump_iv (FILE *file, struct iv *iv)
367 if (iv->ssa_name)
369 fprintf (file, "ssa name ");
370 print_generic_expr (file, iv->ssa_name, TDF_SLIM);
371 fprintf (file, "\n");
374 fprintf (file, " type ");
375 print_generic_expr (file, TREE_TYPE (iv->base), TDF_SLIM);
376 fprintf (file, "\n");
378 if (iv->step)
380 fprintf (file, " base ");
381 print_generic_expr (file, iv->base, TDF_SLIM);
382 fprintf (file, "\n");
384 fprintf (file, " step ");
385 print_generic_expr (file, iv->step, TDF_SLIM);
386 fprintf (file, "\n");
388 else
390 fprintf (file, " invariant ");
391 print_generic_expr (file, iv->base, TDF_SLIM);
392 fprintf (file, "\n");
395 if (iv->base_object)
397 fprintf (file, " base object ");
398 print_generic_expr (file, iv->base_object, TDF_SLIM);
399 fprintf (file, "\n");
402 if (iv->biv_p)
403 fprintf (file, " is a biv\n");
406 /* Dumps information about the USE to FILE. */
408 extern void dump_use (FILE *, struct iv_use *);
409 void
410 dump_use (FILE *file, struct iv_use *use)
412 fprintf (file, "use %d\n", use->id);
414 switch (use->type)
416 case USE_NONLINEAR_EXPR:
417 fprintf (file, " generic\n");
418 break;
420 case USE_OUTER:
421 fprintf (file, " outside\n");
422 break;
424 case USE_ADDRESS:
425 fprintf (file, " address\n");
426 break;
428 case USE_COMPARE:
429 fprintf (file, " compare\n");
430 break;
432 default:
433 gcc_unreachable ();
436 fprintf (file, " in statement ");
437 print_generic_expr (file, use->stmt, TDF_SLIM);
438 fprintf (file, "\n");
440 fprintf (file, " at position ");
441 if (use->op_p)
442 print_generic_expr (file, *use->op_p, TDF_SLIM);
443 fprintf (file, "\n");
445 dump_iv (file, use->iv);
447 if (use->related_cands)
449 fprintf (file, " related candidates ");
450 dump_bitmap (file, use->related_cands);
454 /* Dumps information about the uses to FILE. */
456 extern void dump_uses (FILE *, struct ivopts_data *);
457 void
458 dump_uses (FILE *file, struct ivopts_data *data)
460 unsigned i;
461 struct iv_use *use;
463 for (i = 0; i < n_iv_uses (data); i++)
465 use = iv_use (data, i);
467 dump_use (file, use);
468 fprintf (file, "\n");
472 /* Dumps information about induction variable candidate CAND to FILE. */
474 extern void dump_cand (FILE *, struct iv_cand *);
475 void
476 dump_cand (FILE *file, struct iv_cand *cand)
478 struct iv *iv = cand->iv;
480 fprintf (file, "candidate %d%s\n",
481 cand->id, cand->important ? " (important)" : "");
483 if (!iv)
485 fprintf (file, " final value replacement\n");
486 return;
489 switch (cand->pos)
491 case IP_NORMAL:
492 fprintf (file, " incremented before exit test\n");
493 break;
495 case IP_END:
496 fprintf (file, " incremented at end\n");
497 break;
499 case IP_ORIGINAL:
500 fprintf (file, " original biv\n");
501 break;
504 dump_iv (file, iv);
507 /* Returns the info for ssa version VER. */
509 static inline struct version_info *
510 ver_info (struct ivopts_data *data, unsigned ver)
512 return data->version_info + ver;
515 /* Returns the info for ssa name NAME. */
517 static inline struct version_info *
518 name_info (struct ivopts_data *data, tree name)
520 return ver_info (data, SSA_NAME_VERSION (name));
523 /* Checks whether there exists number X such that X * B = A, counting modulo
524 2^BITS. */
526 static bool
527 divide (unsigned bits, unsigned HOST_WIDE_INT a, unsigned HOST_WIDE_INT b,
528 HOST_WIDE_INT *x)
530 unsigned HOST_WIDE_INT mask = ~(~(unsigned HOST_WIDE_INT) 0 << (bits - 1) << 1);
531 unsigned HOST_WIDE_INT inv, ex, val;
532 unsigned i;
534 a &= mask;
535 b &= mask;
537 /* First divide the whole equation by 2 as long as possible. */
538 while (!(a & 1) && !(b & 1))
540 a >>= 1;
541 b >>= 1;
542 bits--;
543 mask >>= 1;
546 if (!(b & 1))
548 /* If b is still even, a is odd and there is no such x. */
549 return false;
552 /* Find the inverse of b. We compute it as
553 b^(2^(bits - 1) - 1) (mod 2^bits). */
554 inv = 1;
555 ex = b;
556 for (i = 0; i < bits - 1; i++)
558 inv = (inv * ex) & mask;
559 ex = (ex * ex) & mask;
562 val = (a * inv) & mask;
564 gcc_assert (((val * b) & mask) == a);
566 if ((val >> (bits - 1)) & 1)
567 val |= ~mask;
569 *x = val;
571 return true;
574 /* Returns true if STMT is after the place where the IP_NORMAL ivs will be
575 emitted in LOOP. */
577 static bool
578 stmt_after_ip_normal_pos (struct loop *loop, tree stmt)
580 basic_block bb = ip_normal_pos (loop), sbb = bb_for_stmt (stmt);
582 gcc_assert (bb);
584 if (sbb == loop->latch)
585 return true;
587 if (sbb != bb)
588 return false;
590 return stmt == last_stmt (bb);
593 /* Returns true if STMT if after the place where the original induction
594 variable CAND is incremented. */
596 static bool
597 stmt_after_ip_original_pos (struct iv_cand *cand, tree stmt)
599 basic_block cand_bb = bb_for_stmt (cand->incremented_at);
600 basic_block stmt_bb = bb_for_stmt (stmt);
601 block_stmt_iterator bsi;
603 if (!dominated_by_p (CDI_DOMINATORS, stmt_bb, cand_bb))
604 return false;
606 if (stmt_bb != cand_bb)
607 return true;
609 /* Scan the block from the end, since the original ivs are usually
610 incremented at the end of the loop body. */
611 for (bsi = bsi_last (stmt_bb); ; bsi_prev (&bsi))
613 if (bsi_stmt (bsi) == cand->incremented_at)
614 return false;
615 if (bsi_stmt (bsi) == stmt)
616 return true;
620 /* Returns true if STMT if after the place where the induction variable
621 CAND is incremented in LOOP. */
623 static bool
624 stmt_after_increment (struct loop *loop, struct iv_cand *cand, tree stmt)
626 switch (cand->pos)
628 case IP_END:
629 return false;
631 case IP_NORMAL:
632 return stmt_after_ip_normal_pos (loop, stmt);
634 case IP_ORIGINAL:
635 return stmt_after_ip_original_pos (cand, stmt);
637 default:
638 gcc_unreachable ();
642 /* Element of the table in that we cache the numbers of iterations obtained
643 from exits of the loop. */
645 struct nfe_cache_elt
647 /* The edge for that the number of iterations is cached. */
648 edge exit;
650 /* True if the # of iterations was successfully determined. */
651 bool valid_p;
653 /* Description of # of iterations. */
654 struct tree_niter_desc niter;
657 /* Hash function for nfe_cache_elt E. */
659 static hashval_t
660 nfe_hash (const void *e)
662 const struct nfe_cache_elt *elt = e;
664 return htab_hash_pointer (elt->exit);
667 /* Equality function for nfe_cache_elt E1 and edge E2. */
669 static int
670 nfe_eq (const void *e1, const void *e2)
672 const struct nfe_cache_elt *elt1 = e1;
674 return elt1->exit == e2;
677 /* Returns structure describing number of iterations determined from
678 EXIT of DATA->current_loop, or NULL if something goes wrong. */
680 static struct tree_niter_desc *
681 niter_for_exit (struct ivopts_data *data, edge exit)
683 struct nfe_cache_elt *nfe_desc;
684 PTR *slot;
686 slot = htab_find_slot_with_hash (data->niters, exit,
687 htab_hash_pointer (exit),
688 INSERT);
690 if (!*slot)
692 nfe_desc = xmalloc (sizeof (struct nfe_cache_elt));
693 nfe_desc->exit = exit;
694 nfe_desc->valid_p = number_of_iterations_exit (data->current_loop,
695 exit, &nfe_desc->niter);
696 *slot = nfe_desc;
698 else
699 nfe_desc = *slot;
701 if (!nfe_desc->valid_p)
702 return NULL;
704 return &nfe_desc->niter;
707 /* Returns structure describing number of iterations determined from
708 single dominating exit of DATA->current_loop, or NULL if something
709 goes wrong. */
711 static struct tree_niter_desc *
712 niter_for_single_dom_exit (struct ivopts_data *data)
714 edge exit = single_dom_exit (data->current_loop);
716 if (!exit)
717 return NULL;
719 return niter_for_exit (data, exit);
722 /* Initializes data structures used by the iv optimization pass, stored
723 in DATA. LOOPS is the loop tree. */
725 static void
726 tree_ssa_iv_optimize_init (struct loops *loops, struct ivopts_data *data)
728 unsigned i;
730 data->version_info_size = 2 * num_ssa_names;
731 data->version_info = xcalloc (data->version_info_size,
732 sizeof (struct version_info));
733 data->relevant = BITMAP_ALLOC (NULL);
734 data->important_candidates = BITMAP_ALLOC (NULL);
735 data->max_inv_id = 0;
736 data->niters = htab_create (10, nfe_hash, nfe_eq, free);
738 for (i = 1; i < loops->num; i++)
739 if (loops->parray[i])
740 loops->parray[i]->aux = xcalloc (1, sizeof (struct loop_data));
742 VARRAY_GENERIC_PTR_NOGC_INIT (data->iv_uses, 20, "iv_uses");
743 VARRAY_GENERIC_PTR_NOGC_INIT (data->iv_candidates, 20, "iv_candidates");
744 VARRAY_GENERIC_PTR_NOGC_INIT (decl_rtl_to_reset, 20, "decl_rtl_to_reset");
747 /* Returns a memory object to that EXPR points. In case we are able to
748 determine that it does not point to any such object, NULL is returned. */
750 static tree
751 determine_base_object (tree expr)
753 enum tree_code code = TREE_CODE (expr);
754 tree base, obj, op0, op1;
756 if (!POINTER_TYPE_P (TREE_TYPE (expr)))
757 return NULL_TREE;
759 switch (code)
761 case INTEGER_CST:
762 return NULL_TREE;
764 case ADDR_EXPR:
765 obj = TREE_OPERAND (expr, 0);
766 base = get_base_address (obj);
768 if (!base)
769 return expr;
771 if (TREE_CODE (base) == INDIRECT_REF)
772 return determine_base_object (TREE_OPERAND (base, 0));
774 return fold (build1 (ADDR_EXPR, ptr_type_node, base));
776 case PLUS_EXPR:
777 case MINUS_EXPR:
778 op0 = determine_base_object (TREE_OPERAND (expr, 0));
779 op1 = determine_base_object (TREE_OPERAND (expr, 1));
781 if (!op1)
782 return op0;
784 if (!op0)
785 return (code == PLUS_EXPR
786 ? op1
787 : fold (build1 (NEGATE_EXPR, ptr_type_node, op1)));
789 return fold (build (code, ptr_type_node, op0, op1));
791 case NOP_EXPR:
792 case CONVERT_EXPR:
793 return determine_base_object (TREE_OPERAND (expr, 0));
795 default:
796 return fold_convert (ptr_type_node, expr);
800 /* Allocates an induction variable with given initial value BASE and step STEP
801 for loop LOOP. */
803 static struct iv *
804 alloc_iv (tree base, tree step)
806 struct iv *iv = xcalloc (1, sizeof (struct iv));
808 if (step && integer_zerop (step))
809 step = NULL_TREE;
811 iv->base = base;
812 iv->base_object = determine_base_object (base);
813 iv->step = step;
814 iv->biv_p = false;
815 iv->have_use_for = false;
816 iv->use_id = 0;
817 iv->ssa_name = NULL_TREE;
819 return iv;
822 /* Sets STEP and BASE for induction variable IV. */
824 static void
825 set_iv (struct ivopts_data *data, tree iv, tree base, tree step)
827 struct version_info *info = name_info (data, iv);
829 gcc_assert (!info->iv);
831 bitmap_set_bit (data->relevant, SSA_NAME_VERSION (iv));
832 info->iv = alloc_iv (base, step);
833 info->iv->ssa_name = iv;
836 /* Finds induction variable declaration for VAR. */
838 static struct iv *
839 get_iv (struct ivopts_data *data, tree var)
841 basic_block bb;
843 if (!name_info (data, var)->iv)
845 bb = bb_for_stmt (SSA_NAME_DEF_STMT (var));
847 if (!bb
848 || !flow_bb_inside_loop_p (data->current_loop, bb))
849 set_iv (data, var, var, NULL_TREE);
852 return name_info (data, var)->iv;
855 /* Determines the step of a biv defined in PHI. */
857 static tree
858 determine_biv_step (tree phi)
860 struct loop *loop = bb_for_stmt (phi)->loop_father;
861 tree name = PHI_RESULT (phi), base, step;
862 tree type = TREE_TYPE (name);
864 if (!is_gimple_reg (name))
865 return NULL_TREE;
867 if (!simple_iv (loop, phi, name, &base, &step))
868 return NULL_TREE;
870 if (!step)
871 return build_int_cst (type, 0);
873 return step;
876 /* Returns true if EXP is a ssa name that occurs in an abnormal phi node. */
878 static bool
879 abnormal_ssa_name_p (tree exp)
881 if (!exp)
882 return false;
884 if (TREE_CODE (exp) != SSA_NAME)
885 return false;
887 return SSA_NAME_OCCURS_IN_ABNORMAL_PHI (exp) != 0;
890 /* Returns false if BASE or INDEX contains a ssa name that occurs in an
891 abnormal phi node. Callback for for_each_index. */
893 static bool
894 idx_contains_abnormal_ssa_name_p (tree base, tree *index,
895 void *data ATTRIBUTE_UNUSED)
897 if (TREE_CODE (base) == ARRAY_REF)
899 if (abnormal_ssa_name_p (TREE_OPERAND (base, 2)))
900 return false;
901 if (abnormal_ssa_name_p (TREE_OPERAND (base, 3)))
902 return false;
905 return !abnormal_ssa_name_p (*index);
908 /* Returns true if EXPR contains a ssa name that occurs in an
909 abnormal phi node. */
911 static bool
912 contains_abnormal_ssa_name_p (tree expr)
914 enum tree_code code = TREE_CODE (expr);
915 enum tree_code_class class = TREE_CODE_CLASS (code);
917 if (code == SSA_NAME)
918 return SSA_NAME_OCCURS_IN_ABNORMAL_PHI (expr) != 0;
920 if (code == INTEGER_CST
921 || is_gimple_min_invariant (expr))
922 return false;
924 if (code == ADDR_EXPR)
925 return !for_each_index (&TREE_OPERAND (expr, 0),
926 idx_contains_abnormal_ssa_name_p,
927 NULL);
929 switch (class)
931 case tcc_binary:
932 case tcc_comparison:
933 if (contains_abnormal_ssa_name_p (TREE_OPERAND (expr, 1)))
934 return true;
936 /* Fallthru. */
937 case tcc_unary:
938 if (contains_abnormal_ssa_name_p (TREE_OPERAND (expr, 0)))
939 return true;
941 break;
943 default:
944 gcc_unreachable ();
947 return false;
950 /* Finds basic ivs. */
952 static bool
953 find_bivs (struct ivopts_data *data)
955 tree phi, step, type, base;
956 bool found = false;
957 struct loop *loop = data->current_loop;
959 for (phi = phi_nodes (loop->header); phi; phi = PHI_CHAIN (phi))
961 if (SSA_NAME_OCCURS_IN_ABNORMAL_PHI (PHI_RESULT (phi)))
962 continue;
964 step = determine_biv_step (phi);
966 if (!step)
967 continue;
968 if (cst_and_fits_in_hwi (step)
969 && int_cst_value (step) == 0)
970 continue;
972 base = PHI_ARG_DEF_FROM_EDGE (phi, loop_preheader_edge (loop));
973 if (contains_abnormal_ssa_name_p (base))
974 continue;
976 type = TREE_TYPE (PHI_RESULT (phi));
977 base = fold_convert (type, base);
978 step = fold_convert (type, step);
980 /* FIXME: We do not handle induction variables whose step does
981 not satisfy cst_and_fits_in_hwi. */
982 if (!cst_and_fits_in_hwi (step))
983 continue;
985 set_iv (data, PHI_RESULT (phi), base, step);
986 found = true;
989 return found;
992 /* Marks basic ivs. */
994 static void
995 mark_bivs (struct ivopts_data *data)
997 tree phi, var;
998 struct iv *iv, *incr_iv;
999 struct loop *loop = data->current_loop;
1000 basic_block incr_bb;
1002 for (phi = phi_nodes (loop->header); phi; phi = PHI_CHAIN (phi))
1004 iv = get_iv (data, PHI_RESULT (phi));
1005 if (!iv)
1006 continue;
1008 var = PHI_ARG_DEF_FROM_EDGE (phi, loop_latch_edge (loop));
1009 incr_iv = get_iv (data, var);
1010 if (!incr_iv)
1011 continue;
1013 /* If the increment is in the subloop, ignore it. */
1014 incr_bb = bb_for_stmt (SSA_NAME_DEF_STMT (var));
1015 if (incr_bb->loop_father != data->current_loop
1016 || (incr_bb->flags & BB_IRREDUCIBLE_LOOP))
1017 continue;
1019 iv->biv_p = true;
1020 incr_iv->biv_p = true;
1024 /* Checks whether STMT defines a linear induction variable and stores its
1025 parameters to BASE and STEP. */
1027 static bool
1028 find_givs_in_stmt_scev (struct ivopts_data *data, tree stmt,
1029 tree *base, tree *step)
1031 tree lhs;
1032 struct loop *loop = data->current_loop;
1034 *base = NULL_TREE;
1035 *step = NULL_TREE;
1037 if (TREE_CODE (stmt) != MODIFY_EXPR)
1038 return false;
1040 lhs = TREE_OPERAND (stmt, 0);
1041 if (TREE_CODE (lhs) != SSA_NAME)
1042 return false;
1044 if (!simple_iv (loop, stmt, TREE_OPERAND (stmt, 1), base, step))
1045 return false;
1047 /* FIXME: We do not handle induction variables whose step does
1048 not satisfy cst_and_fits_in_hwi. */
1049 if (!zero_p (*step)
1050 && !cst_and_fits_in_hwi (*step))
1051 return false;
1053 if (contains_abnormal_ssa_name_p (*base))
1054 return false;
1056 return true;
1059 /* Finds general ivs in statement STMT. */
1061 static void
1062 find_givs_in_stmt (struct ivopts_data *data, tree stmt)
1064 tree base, step;
1066 if (!find_givs_in_stmt_scev (data, stmt, &base, &step))
1067 return;
1069 set_iv (data, TREE_OPERAND (stmt, 0), base, step);
1072 /* Finds general ivs in basic block BB. */
1074 static void
1075 find_givs_in_bb (struct ivopts_data *data, basic_block bb)
1077 block_stmt_iterator bsi;
1079 for (bsi = bsi_start (bb); !bsi_end_p (bsi); bsi_next (&bsi))
1080 find_givs_in_stmt (data, bsi_stmt (bsi));
1083 /* Finds general ivs. */
1085 static void
1086 find_givs (struct ivopts_data *data)
1088 struct loop *loop = data->current_loop;
1089 basic_block *body = get_loop_body_in_dom_order (loop);
1090 unsigned i;
1092 for (i = 0; i < loop->num_nodes; i++)
1093 find_givs_in_bb (data, body[i]);
1094 free (body);
1097 /* For each ssa name defined in LOOP determines whether it is an induction
1098 variable and if so, its initial value and step. */
1100 static bool
1101 find_induction_variables (struct ivopts_data *data)
1103 unsigned i;
1104 bitmap_iterator bi;
1106 if (!find_bivs (data))
1107 return false;
1109 find_givs (data);
1110 mark_bivs (data);
1112 if (dump_file && (dump_flags & TDF_DETAILS))
1114 struct tree_niter_desc *niter;
1116 niter = niter_for_single_dom_exit (data);
1118 if (niter)
1120 fprintf (dump_file, " number of iterations ");
1121 print_generic_expr (dump_file, niter->niter, TDF_SLIM);
1122 fprintf (dump_file, "\n");
1124 fprintf (dump_file, " may be zero if ");
1125 print_generic_expr (dump_file, niter->may_be_zero, TDF_SLIM);
1126 fprintf (dump_file, "\n");
1127 fprintf (dump_file, "\n");
1130 fprintf (dump_file, "Induction variables:\n\n");
1132 EXECUTE_IF_SET_IN_BITMAP (data->relevant, 0, i, bi)
1134 if (ver_info (data, i)->iv)
1135 dump_iv (dump_file, ver_info (data, i)->iv);
1139 return true;
1142 /* Records a use of type USE_TYPE at *USE_P in STMT whose value is IV. */
1144 static struct iv_use *
1145 record_use (struct ivopts_data *data, tree *use_p, struct iv *iv,
1146 tree stmt, enum use_type use_type)
1148 struct iv_use *use = xcalloc (1, sizeof (struct iv_use));
1150 use->id = n_iv_uses (data);
1151 use->type = use_type;
1152 use->iv = iv;
1153 use->stmt = stmt;
1154 use->op_p = use_p;
1155 use->related_cands = BITMAP_ALLOC (NULL);
1157 /* To avoid showing ssa name in the dumps, if it was not reset by the
1158 caller. */
1159 iv->ssa_name = NULL_TREE;
1161 if (dump_file && (dump_flags & TDF_DETAILS))
1162 dump_use (dump_file, use);
1164 VARRAY_PUSH_GENERIC_PTR_NOGC (data->iv_uses, use);
1166 return use;
1169 /* Checks whether OP is a loop-level invariant and if so, records it.
1170 NONLINEAR_USE is true if the invariant is used in a way we do not
1171 handle specially. */
1173 static void
1174 record_invariant (struct ivopts_data *data, tree op, bool nonlinear_use)
1176 basic_block bb;
1177 struct version_info *info;
1179 if (TREE_CODE (op) != SSA_NAME
1180 || !is_gimple_reg (op))
1181 return;
1183 bb = bb_for_stmt (SSA_NAME_DEF_STMT (op));
1184 if (bb
1185 && flow_bb_inside_loop_p (data->current_loop, bb))
1186 return;
1188 info = name_info (data, op);
1189 info->name = op;
1190 info->has_nonlin_use |= nonlinear_use;
1191 if (!info->inv_id)
1192 info->inv_id = ++data->max_inv_id;
1193 bitmap_set_bit (data->relevant, SSA_NAME_VERSION (op));
1196 /* Checks whether the use OP is interesting and if so, records it
1197 as TYPE. */
1199 static struct iv_use *
1200 find_interesting_uses_outer_or_nonlin (struct ivopts_data *data, tree op,
1201 enum use_type type)
1203 struct iv *iv;
1204 struct iv *civ;
1205 tree stmt;
1206 struct iv_use *use;
1208 if (TREE_CODE (op) != SSA_NAME)
1209 return NULL;
1211 iv = get_iv (data, op);
1212 if (!iv)
1213 return NULL;
1215 if (iv->have_use_for)
1217 use = iv_use (data, iv->use_id);
1219 gcc_assert (use->type == USE_NONLINEAR_EXPR
1220 || use->type == USE_OUTER);
1222 if (type == USE_NONLINEAR_EXPR)
1223 use->type = USE_NONLINEAR_EXPR;
1224 return use;
1227 if (zero_p (iv->step))
1229 record_invariant (data, op, true);
1230 return NULL;
1232 iv->have_use_for = true;
1234 civ = xmalloc (sizeof (struct iv));
1235 *civ = *iv;
1237 stmt = SSA_NAME_DEF_STMT (op);
1238 gcc_assert (TREE_CODE (stmt) == PHI_NODE
1239 || TREE_CODE (stmt) == MODIFY_EXPR);
1241 use = record_use (data, NULL, civ, stmt, type);
1242 iv->use_id = use->id;
1244 return use;
1247 /* Checks whether the use OP is interesting and if so, records it. */
1249 static struct iv_use *
1250 find_interesting_uses_op (struct ivopts_data *data, tree op)
1252 return find_interesting_uses_outer_or_nonlin (data, op, USE_NONLINEAR_EXPR);
1255 /* Records a definition of induction variable OP that is used outside of the
1256 loop. */
1258 static struct iv_use *
1259 find_interesting_uses_outer (struct ivopts_data *data, tree op)
1261 return find_interesting_uses_outer_or_nonlin (data, op, USE_OUTER);
1264 /* Checks whether the condition *COND_P in STMT is interesting
1265 and if so, records it. */
1267 static void
1268 find_interesting_uses_cond (struct ivopts_data *data, tree stmt, tree *cond_p)
1270 tree *op0_p;
1271 tree *op1_p;
1272 struct iv *iv0 = NULL, *iv1 = NULL, *civ;
1273 struct iv const_iv;
1274 tree zero = integer_zero_node;
1276 const_iv.step = NULL_TREE;
1278 if (integer_zerop (*cond_p)
1279 || integer_nonzerop (*cond_p))
1280 return;
1282 if (TREE_CODE (*cond_p) == SSA_NAME)
1284 op0_p = cond_p;
1285 op1_p = &zero;
1287 else
1289 op0_p = &TREE_OPERAND (*cond_p, 0);
1290 op1_p = &TREE_OPERAND (*cond_p, 1);
1293 if (TREE_CODE (*op0_p) == SSA_NAME)
1294 iv0 = get_iv (data, *op0_p);
1295 else
1296 iv0 = &const_iv;
1298 if (TREE_CODE (*op1_p) == SSA_NAME)
1299 iv1 = get_iv (data, *op1_p);
1300 else
1301 iv1 = &const_iv;
1303 if (/* When comparing with non-invariant value, we may not do any senseful
1304 induction variable elimination. */
1305 (!iv0 || !iv1)
1306 /* Eliminating condition based on two ivs would be nontrivial.
1307 ??? TODO -- it is not really important to handle this case. */
1308 || (!zero_p (iv0->step) && !zero_p (iv1->step)))
1310 find_interesting_uses_op (data, *op0_p);
1311 find_interesting_uses_op (data, *op1_p);
1312 return;
1315 if (zero_p (iv0->step) && zero_p (iv1->step))
1317 /* If both are invariants, this is a work for unswitching. */
1318 return;
1321 civ = xmalloc (sizeof (struct iv));
1322 *civ = zero_p (iv0->step) ? *iv1: *iv0;
1323 record_use (data, cond_p, civ, stmt, USE_COMPARE);
1326 /* Returns true if expression EXPR is obviously invariant in LOOP,
1327 i.e. if all its operands are defined outside of the LOOP. */
1329 bool
1330 expr_invariant_in_loop_p (struct loop *loop, tree expr)
1332 basic_block def_bb;
1333 unsigned i, len;
1335 if (is_gimple_min_invariant (expr))
1336 return true;
1338 if (TREE_CODE (expr) == SSA_NAME)
1340 def_bb = bb_for_stmt (SSA_NAME_DEF_STMT (expr));
1341 if (def_bb
1342 && flow_bb_inside_loop_p (loop, def_bb))
1343 return false;
1345 return true;
1348 if (!EXPR_P (expr))
1349 return false;
1351 len = TREE_CODE_LENGTH (TREE_CODE (expr));
1352 for (i = 0; i < len; i++)
1353 if (!expr_invariant_in_loop_p (loop, TREE_OPERAND (expr, i)))
1354 return false;
1356 return true;
1359 /* Cumulates the steps of indices into DATA and replaces their values with the
1360 initial ones. Returns false when the value of the index cannot be determined.
1361 Callback for for_each_index. */
1363 struct ifs_ivopts_data
1365 struct ivopts_data *ivopts_data;
1366 tree stmt;
1367 tree *step_p;
1370 static bool
1371 idx_find_step (tree base, tree *idx, void *data)
1373 struct ifs_ivopts_data *dta = data;
1374 struct iv *iv;
1375 tree step, type, iv_type, iv_step, lbound, off;
1376 struct loop *loop = dta->ivopts_data->current_loop;
1378 if (TREE_CODE (base) == MISALIGNED_INDIRECT_REF
1379 || TREE_CODE (base) == ALIGN_INDIRECT_REF)
1380 return false;
1382 /* If base is a component ref, require that the offset of the reference
1383 be invariant. */
1384 if (TREE_CODE (base) == COMPONENT_REF)
1386 off = component_ref_field_offset (base);
1387 return expr_invariant_in_loop_p (loop, off);
1390 /* If base is array, first check whether we will be able to move the
1391 reference out of the loop (in order to take its address in strength
1392 reduction). In order for this to work we need both lower bound
1393 and step to be loop invariants. */
1394 if (TREE_CODE (base) == ARRAY_REF)
1396 step = array_ref_element_size (base);
1397 lbound = array_ref_low_bound (base);
1399 if (!expr_invariant_in_loop_p (loop, step)
1400 || !expr_invariant_in_loop_p (loop, lbound))
1401 return false;
1404 if (TREE_CODE (*idx) != SSA_NAME)
1405 return true;
1407 iv = get_iv (dta->ivopts_data, *idx);
1408 if (!iv)
1409 return false;
1411 *idx = iv->base;
1413 if (!iv->step)
1414 return true;
1416 iv_type = TREE_TYPE (iv->base);
1417 type = build_pointer_type (TREE_TYPE (base));
1418 if (TREE_CODE (base) == ARRAY_REF)
1420 step = array_ref_element_size (base);
1422 /* We only handle addresses whose step is an integer constant. */
1423 if (TREE_CODE (step) != INTEGER_CST)
1424 return false;
1426 else
1427 /* The step for pointer arithmetics already is 1 byte. */
1428 step = build_int_cst (type, 1);
1430 if (TYPE_PRECISION (iv_type) < TYPE_PRECISION (type))
1431 iv_step = can_count_iv_in_wider_type (dta->ivopts_data->current_loop,
1432 type, iv->base, iv->step, dta->stmt);
1433 else
1434 iv_step = fold_convert (iv_type, iv->step);
1436 if (!iv_step)
1438 /* The index might wrap. */
1439 return false;
1442 step = fold_binary_to_constant (MULT_EXPR, type, step, iv_step);
1444 if (!*dta->step_p)
1445 *dta->step_p = step;
1446 else
1447 *dta->step_p = fold_binary_to_constant (PLUS_EXPR, type,
1448 *dta->step_p, step);
1450 return true;
1453 /* Records use in index IDX. Callback for for_each_index. Ivopts data
1454 object is passed to it in DATA. */
1456 static bool
1457 idx_record_use (tree base, tree *idx,
1458 void *data)
1460 find_interesting_uses_op (data, *idx);
1461 if (TREE_CODE (base) == ARRAY_REF)
1463 find_interesting_uses_op (data, array_ref_element_size (base));
1464 find_interesting_uses_op (data, array_ref_low_bound (base));
1466 return true;
1469 /* Returns true if memory reference REF may be unaligned. */
1471 static bool
1472 may_be_unaligned_p (tree ref)
1474 tree base;
1475 tree base_type;
1476 HOST_WIDE_INT bitsize;
1477 HOST_WIDE_INT bitpos;
1478 tree toffset;
1479 enum machine_mode mode;
1480 int unsignedp, volatilep;
1481 unsigned base_align;
1483 /* The test below is basically copy of what expr.c:normal_inner_ref
1484 does to check whether the object must be loaded by parts when
1485 STRICT_ALIGNMENT is true. */
1486 base = get_inner_reference (ref, &bitsize, &bitpos, &toffset, &mode,
1487 &unsignedp, &volatilep, true);
1488 base_type = TREE_TYPE (base);
1489 base_align = TYPE_ALIGN (base_type);
1491 if (mode != BLKmode
1492 && (base_align < GET_MODE_ALIGNMENT (mode)
1493 || bitpos % GET_MODE_ALIGNMENT (mode) != 0
1494 || bitpos % BITS_PER_UNIT != 0))
1495 return true;
1497 return false;
1500 /* Finds addresses in *OP_P inside STMT. */
1502 static void
1503 find_interesting_uses_address (struct ivopts_data *data, tree stmt, tree *op_p)
1505 tree base = unshare_expr (*op_p), step = NULL;
1506 struct iv *civ;
1507 struct ifs_ivopts_data ifs_ivopts_data;
1509 /* Ignore bitfields for now. Not really something terribly complicated
1510 to handle. TODO. */
1511 if (TREE_CODE (base) == COMPONENT_REF
1512 && DECL_NONADDRESSABLE_P (TREE_OPERAND (base, 1)))
1513 goto fail;
1515 if (STRICT_ALIGNMENT
1516 && may_be_unaligned_p (base))
1517 goto fail;
1519 ifs_ivopts_data.ivopts_data = data;
1520 ifs_ivopts_data.stmt = stmt;
1521 ifs_ivopts_data.step_p = &step;
1522 if (!for_each_index (&base, idx_find_step, &ifs_ivopts_data)
1523 || zero_p (step))
1524 goto fail;
1526 gcc_assert (TREE_CODE (base) != ALIGN_INDIRECT_REF);
1527 gcc_assert (TREE_CODE (base) != MISALIGNED_INDIRECT_REF);
1529 if (TREE_CODE (base) == INDIRECT_REF)
1530 base = TREE_OPERAND (base, 0);
1531 else
1532 base = build_addr (base);
1534 civ = alloc_iv (base, step);
1535 record_use (data, op_p, civ, stmt, USE_ADDRESS);
1536 return;
1538 fail:
1539 for_each_index (op_p, idx_record_use, data);
1542 /* Finds and records invariants used in STMT. */
1544 static void
1545 find_invariants_stmt (struct ivopts_data *data, tree stmt)
1547 use_optype uses = NULL;
1548 unsigned i, n;
1549 tree op;
1551 if (TREE_CODE (stmt) == PHI_NODE)
1552 n = PHI_NUM_ARGS (stmt);
1553 else
1555 get_stmt_operands (stmt);
1556 uses = STMT_USE_OPS (stmt);
1557 n = NUM_USES (uses);
1560 for (i = 0; i < n; i++)
1562 if (TREE_CODE (stmt) == PHI_NODE)
1563 op = PHI_ARG_DEF (stmt, i);
1564 else
1565 op = USE_OP (uses, i);
1567 record_invariant (data, op, false);
1571 /* Finds interesting uses of induction variables in the statement STMT. */
1573 static void
1574 find_interesting_uses_stmt (struct ivopts_data *data, tree stmt)
1576 struct iv *iv;
1577 tree op, lhs, rhs;
1578 use_optype uses = NULL;
1579 unsigned i, n;
1581 find_invariants_stmt (data, stmt);
1583 if (TREE_CODE (stmt) == COND_EXPR)
1585 find_interesting_uses_cond (data, stmt, &COND_EXPR_COND (stmt));
1586 return;
1589 if (TREE_CODE (stmt) == MODIFY_EXPR)
1591 lhs = TREE_OPERAND (stmt, 0);
1592 rhs = TREE_OPERAND (stmt, 1);
1594 if (TREE_CODE (lhs) == SSA_NAME)
1596 /* If the statement defines an induction variable, the uses are not
1597 interesting by themselves. */
1599 iv = get_iv (data, lhs);
1601 if (iv && !zero_p (iv->step))
1602 return;
1605 switch (TREE_CODE_CLASS (TREE_CODE (rhs)))
1607 case tcc_comparison:
1608 find_interesting_uses_cond (data, stmt, &TREE_OPERAND (stmt, 1));
1609 return;
1611 case tcc_reference:
1612 find_interesting_uses_address (data, stmt, &TREE_OPERAND (stmt, 1));
1613 if (REFERENCE_CLASS_P (lhs))
1614 find_interesting_uses_address (data, stmt, &TREE_OPERAND (stmt, 0));
1615 return;
1617 default: ;
1620 if (REFERENCE_CLASS_P (lhs)
1621 && is_gimple_val (rhs))
1623 find_interesting_uses_address (data, stmt, &TREE_OPERAND (stmt, 0));
1624 find_interesting_uses_op (data, rhs);
1625 return;
1628 /* TODO -- we should also handle address uses of type
1630 memory = call (whatever);
1634 call (memory). */
1637 if (TREE_CODE (stmt) == PHI_NODE
1638 && bb_for_stmt (stmt) == data->current_loop->header)
1640 lhs = PHI_RESULT (stmt);
1641 iv = get_iv (data, lhs);
1643 if (iv && !zero_p (iv->step))
1644 return;
1647 if (TREE_CODE (stmt) == PHI_NODE)
1648 n = PHI_NUM_ARGS (stmt);
1649 else
1651 uses = STMT_USE_OPS (stmt);
1652 n = NUM_USES (uses);
1655 for (i = 0; i < n; i++)
1657 if (TREE_CODE (stmt) == PHI_NODE)
1658 op = PHI_ARG_DEF (stmt, i);
1659 else
1660 op = USE_OP (uses, i);
1662 if (TREE_CODE (op) != SSA_NAME)
1663 continue;
1665 iv = get_iv (data, op);
1666 if (!iv)
1667 continue;
1669 find_interesting_uses_op (data, op);
1673 /* Finds interesting uses of induction variables outside of loops
1674 on loop exit edge EXIT. */
1676 static void
1677 find_interesting_uses_outside (struct ivopts_data *data, edge exit)
1679 tree phi, def;
1681 for (phi = phi_nodes (exit->dest); phi; phi = PHI_CHAIN (phi))
1683 def = PHI_ARG_DEF_FROM_EDGE (phi, exit);
1684 find_interesting_uses_outer (data, def);
1688 /* Finds uses of the induction variables that are interesting. */
1690 static void
1691 find_interesting_uses (struct ivopts_data *data)
1693 basic_block bb;
1694 block_stmt_iterator bsi;
1695 tree phi;
1696 basic_block *body = get_loop_body (data->current_loop);
1697 unsigned i;
1698 struct version_info *info;
1699 edge e;
1701 if (dump_file && (dump_flags & TDF_DETAILS))
1702 fprintf (dump_file, "Uses:\n\n");
1704 for (i = 0; i < data->current_loop->num_nodes; i++)
1706 edge_iterator ei;
1707 bb = body[i];
1709 FOR_EACH_EDGE (e, ei, bb->succs)
1710 if (e->dest != EXIT_BLOCK_PTR
1711 && !flow_bb_inside_loop_p (data->current_loop, e->dest))
1712 find_interesting_uses_outside (data, e);
1714 for (phi = phi_nodes (bb); phi; phi = PHI_CHAIN (phi))
1715 find_interesting_uses_stmt (data, phi);
1716 for (bsi = bsi_start (bb); !bsi_end_p (bsi); bsi_next (&bsi))
1717 find_interesting_uses_stmt (data, bsi_stmt (bsi));
1720 if (dump_file && (dump_flags & TDF_DETAILS))
1722 bitmap_iterator bi;
1724 fprintf (dump_file, "\n");
1726 EXECUTE_IF_SET_IN_BITMAP (data->relevant, 0, i, bi)
1728 info = ver_info (data, i);
1729 if (info->inv_id)
1731 fprintf (dump_file, " ");
1732 print_generic_expr (dump_file, info->name, TDF_SLIM);
1733 fprintf (dump_file, " is invariant (%d)%s\n",
1734 info->inv_id, info->has_nonlin_use ? "" : ", eliminable");
1738 fprintf (dump_file, "\n");
1741 free (body);
1744 /* Strips constant offsets from EXPR and stores them to OFFSET. If INSIDE_ADDR
1745 is true, assume we are inside an address. */
1747 static tree
1748 strip_offset (tree expr, bool inside_addr, unsigned HOST_WIDE_INT *offset)
1750 tree op0 = NULL_TREE, op1 = NULL_TREE, step;
1751 enum tree_code code;
1752 tree type, orig_type = TREE_TYPE (expr);
1753 unsigned HOST_WIDE_INT off0, off1, st;
1754 tree orig_expr = expr;
1756 STRIP_NOPS (expr);
1757 type = TREE_TYPE (expr);
1758 code = TREE_CODE (expr);
1759 *offset = 0;
1761 switch (code)
1763 case INTEGER_CST:
1764 if (!cst_and_fits_in_hwi (expr)
1765 || zero_p (expr))
1766 return orig_expr;
1768 *offset = int_cst_value (expr);
1769 return build_int_cst_type (orig_type, 0);
1771 case PLUS_EXPR:
1772 case MINUS_EXPR:
1773 op0 = TREE_OPERAND (expr, 0);
1774 op1 = TREE_OPERAND (expr, 1);
1776 op0 = strip_offset (op0, false, &off0);
1777 op1 = strip_offset (op1, false, &off1);
1779 *offset = (code == PLUS_EXPR ? off0 + off1 : off0 - off1);
1780 if (op0 == TREE_OPERAND (expr, 0)
1781 && op1 == TREE_OPERAND (expr, 1))
1782 return orig_expr;
1784 if (zero_p (op1))
1785 expr = op0;
1786 else if (zero_p (op0))
1788 if (code == PLUS_EXPR)
1789 expr = op1;
1790 else
1791 expr = build1 (NEGATE_EXPR, type, op1);
1793 else
1794 expr = build2 (code, type, op0, op1);
1796 return fold_convert (orig_type, expr);
1798 case ARRAY_REF:
1799 if (!inside_addr)
1800 return orig_expr;
1802 step = array_ref_element_size (expr);
1803 if (!cst_and_fits_in_hwi (step))
1804 break;
1806 st = int_cst_value (step);
1807 op1 = TREE_OPERAND (expr, 1);
1808 op1 = strip_offset (op1, false, &off1);
1809 *offset = off1 * st;
1810 break;
1812 case COMPONENT_REF:
1813 if (!inside_addr)
1814 return orig_expr;
1815 break;
1817 case ADDR_EXPR:
1818 inside_addr = true;
1819 break;
1821 default:
1822 return orig_expr;
1825 /* Default handling of expressions for that we want to recurse into
1826 the first operand. */
1827 op0 = TREE_OPERAND (expr, 0);
1828 op0 = strip_offset (op0, inside_addr, &off0);
1829 *offset += off0;
1831 if (op0 == TREE_OPERAND (expr, 0)
1832 && (!op1 || op1 == TREE_OPERAND (expr, 1)))
1833 return orig_expr;
1835 expr = copy_node (expr);
1836 TREE_OPERAND (expr, 0) = op0;
1837 if (op1)
1838 TREE_OPERAND (expr, 1) = op1;
1840 return fold_convert (orig_type, expr);
1843 /* Adds a candidate BASE + STEP * i. Important field is set to IMPORTANT and
1844 position to POS. If USE is not NULL, the candidate is set as related to
1845 it. If both BASE and STEP are NULL, we add a pseudocandidate for the
1846 replacement of the final value of the iv by a direct computation. */
1848 static struct iv_cand *
1849 add_candidate_1 (struct ivopts_data *data,
1850 tree base, tree step, bool important, enum iv_position pos,
1851 struct iv_use *use, tree incremented_at)
1853 unsigned i;
1854 struct iv_cand *cand = NULL;
1855 tree type;
1857 if (base)
1859 type = TREE_TYPE (base);
1860 if (!TYPE_UNSIGNED (type))
1862 type = unsigned_type_for (type);
1863 base = fold_convert (type, base);
1864 if (step)
1865 step = fold_convert (type, step);
1869 for (i = 0; i < n_iv_cands (data); i++)
1871 cand = iv_cand (data, i);
1873 if (cand->pos != pos)
1874 continue;
1876 if (cand->incremented_at != incremented_at)
1877 continue;
1879 if (!cand->iv)
1881 if (!base && !step)
1882 break;
1884 continue;
1887 if (!base && !step)
1888 continue;
1890 if (!operand_equal_p (base, cand->iv->base, 0))
1891 continue;
1893 if (zero_p (cand->iv->step))
1895 if (zero_p (step))
1896 break;
1898 else
1900 if (step && operand_equal_p (step, cand->iv->step, 0))
1901 break;
1905 if (i == n_iv_cands (data))
1907 cand = xcalloc (1, sizeof (struct iv_cand));
1908 cand->id = i;
1910 if (!base && !step)
1911 cand->iv = NULL;
1912 else
1913 cand->iv = alloc_iv (base, step);
1915 cand->pos = pos;
1916 if (pos != IP_ORIGINAL && cand->iv)
1918 cand->var_before = create_tmp_var_raw (TREE_TYPE (base), "ivtmp");
1919 cand->var_after = cand->var_before;
1921 cand->important = important;
1922 cand->incremented_at = incremented_at;
1923 VARRAY_PUSH_GENERIC_PTR_NOGC (data->iv_candidates, cand);
1925 if (dump_file && (dump_flags & TDF_DETAILS))
1926 dump_cand (dump_file, cand);
1929 if (important && !cand->important)
1931 cand->important = true;
1932 if (dump_file && (dump_flags & TDF_DETAILS))
1933 fprintf (dump_file, "Candidate %d is important\n", cand->id);
1936 if (use)
1938 bitmap_set_bit (use->related_cands, i);
1939 if (dump_file && (dump_flags & TDF_DETAILS))
1940 fprintf (dump_file, "Candidate %d is related to use %d\n",
1941 cand->id, use->id);
1944 return cand;
1947 /* Returns true if incrementing the induction variable at the end of the LOOP
1948 is allowed.
1950 The purpose is to avoid splitting latch edge with a biv increment, thus
1951 creating a jump, possibly confusing other optimization passes and leaving
1952 less freedom to scheduler. So we allow IP_END_POS only if IP_NORMAL_POS
1953 is not available (so we do not have a better alternative), or if the latch
1954 edge is already nonempty. */
1956 static bool
1957 allow_ip_end_pos_p (struct loop *loop)
1959 if (!ip_normal_pos (loop))
1960 return true;
1962 if (!empty_block_p (ip_end_pos (loop)))
1963 return true;
1965 return false;
1968 /* Adds a candidate BASE + STEP * i. Important field is set to IMPORTANT and
1969 position to POS. If USE is not NULL, the candidate is set as related to
1970 it. The candidate computation is scheduled on all available positions. */
1972 static void
1973 add_candidate (struct ivopts_data *data,
1974 tree base, tree step, bool important, struct iv_use *use)
1976 if (ip_normal_pos (data->current_loop))
1977 add_candidate_1 (data, base, step, important, IP_NORMAL, use, NULL_TREE);
1978 if (ip_end_pos (data->current_loop)
1979 && allow_ip_end_pos_p (data->current_loop))
1980 add_candidate_1 (data, base, step, important, IP_END, use, NULL_TREE);
1983 /* Adds standard iv candidates. */
1985 static void
1986 add_standard_iv_candidates (struct ivopts_data *data)
1988 /* Add 0 + 1 * iteration candidate. */
1989 add_candidate (data,
1990 build_int_cst (unsigned_intSI_type_node, 0),
1991 build_int_cst (unsigned_intSI_type_node, 1),
1992 true, NULL);
1994 /* The same for a long type if it is still fast enough. */
1995 if (BITS_PER_WORD > 32)
1996 add_candidate (data,
1997 build_int_cst (unsigned_intDI_type_node, 0),
1998 build_int_cst (unsigned_intDI_type_node, 1),
1999 true, NULL);
2003 /* Adds candidates bases on the old induction variable IV. */
2005 static void
2006 add_old_iv_candidates (struct ivopts_data *data, struct iv *iv)
2008 tree phi, def;
2009 struct iv_cand *cand;
2011 add_candidate (data, iv->base, iv->step, true, NULL);
2013 /* The same, but with initial value zero. */
2014 add_candidate (data,
2015 build_int_cst (TREE_TYPE (iv->base), 0),
2016 iv->step, true, NULL);
2018 phi = SSA_NAME_DEF_STMT (iv->ssa_name);
2019 if (TREE_CODE (phi) == PHI_NODE)
2021 /* Additionally record the possibility of leaving the original iv
2022 untouched. */
2023 def = PHI_ARG_DEF_FROM_EDGE (phi, loop_latch_edge (data->current_loop));
2024 cand = add_candidate_1 (data,
2025 iv->base, iv->step, true, IP_ORIGINAL, NULL,
2026 SSA_NAME_DEF_STMT (def));
2027 cand->var_before = iv->ssa_name;
2028 cand->var_after = def;
2032 /* Adds candidates based on the old induction variables. */
2034 static void
2035 add_old_ivs_candidates (struct ivopts_data *data)
2037 unsigned i;
2038 struct iv *iv;
2039 bitmap_iterator bi;
2041 EXECUTE_IF_SET_IN_BITMAP (data->relevant, 0, i, bi)
2043 iv = ver_info (data, i)->iv;
2044 if (iv && iv->biv_p && !zero_p (iv->step))
2045 add_old_iv_candidates (data, iv);
2049 /* Adds candidates based on the value of the induction variable IV and USE. */
2051 static void
2052 add_iv_value_candidates (struct ivopts_data *data,
2053 struct iv *iv, struct iv_use *use)
2055 add_candidate (data, iv->base, iv->step, false, use);
2057 /* The same, but with initial value zero. */
2058 add_candidate (data, build_int_cst (TREE_TYPE (iv->base), 0),
2059 iv->step, false, use);
2062 /* Adds candidates based on the address IV and USE. */
2064 static void
2065 add_address_candidates (struct ivopts_data *data,
2066 struct iv *iv, struct iv_use *use)
2068 tree base, abase;
2069 unsigned HOST_WIDE_INT offset;
2071 /* First, the trivial choices. */
2072 add_iv_value_candidates (data, iv, use);
2074 /* Second, try removing the COMPONENT_REFs. */
2075 if (TREE_CODE (iv->base) == ADDR_EXPR)
2077 base = TREE_OPERAND (iv->base, 0);
2078 while (TREE_CODE (base) == COMPONENT_REF
2079 || (TREE_CODE (base) == ARRAY_REF
2080 && TREE_CODE (TREE_OPERAND (base, 1)) == INTEGER_CST))
2081 base = TREE_OPERAND (base, 0);
2083 if (base != TREE_OPERAND (iv->base, 0))
2085 gcc_assert (TREE_CODE (base) != ALIGN_INDIRECT_REF);
2086 gcc_assert (TREE_CODE (base) != MISALIGNED_INDIRECT_REF);
2088 if (TREE_CODE (base) == INDIRECT_REF)
2089 base = TREE_OPERAND (base, 0);
2090 else
2091 base = build_addr (base);
2092 add_candidate (data, base, iv->step, false, use);
2096 /* Third, try removing the constant offset. */
2097 abase = iv->base;
2098 base = strip_offset (abase, false, &offset);
2099 if (offset)
2100 add_candidate (data, base, iv->step, false, use);
2103 /* Possibly adds pseudocandidate for replacing the final value of USE by
2104 a direct computation. */
2106 static void
2107 add_iv_outer_candidates (struct ivopts_data *data, struct iv_use *use)
2109 struct tree_niter_desc *niter;
2111 /* We must know where we exit the loop and how many times does it roll. */
2112 niter = niter_for_single_dom_exit (data);
2113 if (!niter
2114 || !zero_p (niter->may_be_zero))
2115 return;
2117 add_candidate_1 (data, NULL, NULL, false, IP_NORMAL, use, NULL_TREE);
2120 /* Adds candidates based on the uses. */
2122 static void
2123 add_derived_ivs_candidates (struct ivopts_data *data)
2125 unsigned i;
2127 for (i = 0; i < n_iv_uses (data); i++)
2129 struct iv_use *use = iv_use (data, i);
2131 if (!use)
2132 continue;
2134 switch (use->type)
2136 case USE_NONLINEAR_EXPR:
2137 case USE_COMPARE:
2138 /* Just add the ivs based on the value of the iv used here. */
2139 add_iv_value_candidates (data, use->iv, use);
2140 break;
2142 case USE_OUTER:
2143 add_iv_value_candidates (data, use->iv, use);
2145 /* Additionally, add the pseudocandidate for the possibility to
2146 replace the final value by a direct computation. */
2147 add_iv_outer_candidates (data, use);
2148 break;
2150 case USE_ADDRESS:
2151 add_address_candidates (data, use->iv, use);
2152 break;
2154 default:
2155 gcc_unreachable ();
2160 /* Record important candidates and add them to related_cands bitmaps
2161 if needed. */
2163 static void
2164 record_important_candidates (struct ivopts_data *data)
2166 unsigned i;
2167 struct iv_use *use;
2169 for (i = 0; i < n_iv_cands (data); i++)
2171 struct iv_cand *cand = iv_cand (data, i);
2173 if (cand->important)
2174 bitmap_set_bit (data->important_candidates, i);
2177 data->consider_all_candidates = (n_iv_cands (data)
2178 <= CONSIDER_ALL_CANDIDATES_BOUND);
2180 if (data->consider_all_candidates)
2182 /* We will not need "related_cands" bitmaps in this case,
2183 so release them to decrease peak memory consumption. */
2184 for (i = 0; i < n_iv_uses (data); i++)
2186 use = iv_use (data, i);
2187 BITMAP_FREE (use->related_cands);
2190 else
2192 /* Add important candidates to the related_cands bitmaps. */
2193 for (i = 0; i < n_iv_uses (data); i++)
2194 bitmap_ior_into (iv_use (data, i)->related_cands,
2195 data->important_candidates);
2199 /* Finds the candidates for the induction variables. */
2201 static void
2202 find_iv_candidates (struct ivopts_data *data)
2204 /* Add commonly used ivs. */
2205 add_standard_iv_candidates (data);
2207 /* Add old induction variables. */
2208 add_old_ivs_candidates (data);
2210 /* Add induction variables derived from uses. */
2211 add_derived_ivs_candidates (data);
2213 /* Record the important candidates. */
2214 record_important_candidates (data);
2217 /* Allocates the data structure mapping the (use, candidate) pairs to costs.
2218 If consider_all_candidates is true, we use a two-dimensional array, otherwise
2219 we allocate a simple list to every use. */
2221 static void
2222 alloc_use_cost_map (struct ivopts_data *data)
2224 unsigned i, size, s, j;
2226 for (i = 0; i < n_iv_uses (data); i++)
2228 struct iv_use *use = iv_use (data, i);
2229 bitmap_iterator bi;
2231 if (data->consider_all_candidates)
2232 size = n_iv_cands (data);
2233 else
2235 s = 0;
2236 EXECUTE_IF_SET_IN_BITMAP (use->related_cands, 0, j, bi)
2238 s++;
2241 /* Round up to the power of two, so that moduling by it is fast. */
2242 for (size = 1; size < s; size <<= 1)
2243 continue;
2246 use->n_map_members = size;
2247 use->cost_map = xcalloc (size, sizeof (struct cost_pair));
2251 /* Sets cost of (USE, CANDIDATE) pair to COST and record that it depends
2252 on invariants DEPENDS_ON. */
2254 static void
2255 set_use_iv_cost (struct ivopts_data *data,
2256 struct iv_use *use, struct iv_cand *cand, unsigned cost,
2257 bitmap depends_on)
2259 unsigned i, s;
2261 if (cost == INFTY)
2263 BITMAP_FREE (depends_on);
2264 return;
2267 if (data->consider_all_candidates)
2269 use->cost_map[cand->id].cand = cand;
2270 use->cost_map[cand->id].cost = cost;
2271 use->cost_map[cand->id].depends_on = depends_on;
2272 return;
2275 /* n_map_members is a power of two, so this computes modulo. */
2276 s = cand->id & (use->n_map_members - 1);
2277 for (i = s; i < use->n_map_members; i++)
2278 if (!use->cost_map[i].cand)
2279 goto found;
2280 for (i = 0; i < s; i++)
2281 if (!use->cost_map[i].cand)
2282 goto found;
2284 gcc_unreachable ();
2286 found:
2287 use->cost_map[i].cand = cand;
2288 use->cost_map[i].cost = cost;
2289 use->cost_map[i].depends_on = depends_on;
2292 /* Gets cost of (USE, CANDIDATE) pair. */
2294 static struct cost_pair *
2295 get_use_iv_cost (struct ivopts_data *data, struct iv_use *use,
2296 struct iv_cand *cand)
2298 unsigned i, s;
2299 struct cost_pair *ret;
2301 if (!cand)
2302 return NULL;
2304 if (data->consider_all_candidates)
2306 ret = use->cost_map + cand->id;
2307 if (!ret->cand)
2308 return NULL;
2310 return ret;
2313 /* n_map_members is a power of two, so this computes modulo. */
2314 s = cand->id & (use->n_map_members - 1);
2315 for (i = s; i < use->n_map_members; i++)
2316 if (use->cost_map[i].cand == cand)
2317 return use->cost_map + i;
2319 for (i = 0; i < s; i++)
2320 if (use->cost_map[i].cand == cand)
2321 return use->cost_map + i;
2323 return NULL;
2326 /* Returns estimate on cost of computing SEQ. */
2328 static unsigned
2329 seq_cost (rtx seq)
2331 unsigned cost = 0;
2332 rtx set;
2334 for (; seq; seq = NEXT_INSN (seq))
2336 set = single_set (seq);
2337 if (set)
2338 cost += rtx_cost (set, SET);
2339 else
2340 cost++;
2343 return cost;
2346 /* Produce DECL_RTL for object obj so it looks like it is stored in memory. */
2347 static rtx
2348 produce_memory_decl_rtl (tree obj, int *regno)
2350 rtx x;
2352 gcc_assert (obj);
2353 if (TREE_STATIC (obj) || DECL_EXTERNAL (obj))
2355 const char *name = IDENTIFIER_POINTER (DECL_ASSEMBLER_NAME (obj));
2356 x = gen_rtx_SYMBOL_REF (Pmode, name);
2358 else
2359 x = gen_raw_REG (Pmode, (*regno)++);
2361 return gen_rtx_MEM (DECL_MODE (obj), x);
2364 /* Prepares decl_rtl for variables referred in *EXPR_P. Callback for
2365 walk_tree. DATA contains the actual fake register number. */
2367 static tree
2368 prepare_decl_rtl (tree *expr_p, int *ws, void *data)
2370 tree obj = NULL_TREE;
2371 rtx x = NULL_RTX;
2372 int *regno = data;
2374 switch (TREE_CODE (*expr_p))
2376 case ADDR_EXPR:
2377 for (expr_p = &TREE_OPERAND (*expr_p, 0);
2378 handled_component_p (*expr_p);
2379 expr_p = &TREE_OPERAND (*expr_p, 0))
2380 continue;
2381 obj = *expr_p;
2382 if (DECL_P (obj))
2383 x = produce_memory_decl_rtl (obj, regno);
2384 break;
2386 case SSA_NAME:
2387 *ws = 0;
2388 obj = SSA_NAME_VAR (*expr_p);
2389 if (!DECL_RTL_SET_P (obj))
2390 x = gen_raw_REG (DECL_MODE (obj), (*regno)++);
2391 break;
2393 case VAR_DECL:
2394 case PARM_DECL:
2395 case RESULT_DECL:
2396 *ws = 0;
2397 obj = *expr_p;
2399 if (DECL_RTL_SET_P (obj))
2400 break;
2402 if (DECL_MODE (obj) == BLKmode)
2403 x = produce_memory_decl_rtl (obj, regno);
2404 else
2405 x = gen_raw_REG (DECL_MODE (obj), (*regno)++);
2407 break;
2409 default:
2410 break;
2413 if (x)
2415 VARRAY_PUSH_GENERIC_PTR_NOGC (decl_rtl_to_reset, obj);
2416 SET_DECL_RTL (obj, x);
2419 return NULL_TREE;
2422 /* Determines cost of the computation of EXPR. */
2424 static unsigned
2425 computation_cost (tree expr)
2427 rtx seq, rslt;
2428 tree type = TREE_TYPE (expr);
2429 unsigned cost;
2430 /* Avoid using hard regs in ways which may be unsupported. */
2431 int regno = LAST_VIRTUAL_REGISTER + 1;
2433 walk_tree (&expr, prepare_decl_rtl, &regno, NULL);
2434 start_sequence ();
2435 rslt = expand_expr (expr, NULL_RTX, TYPE_MODE (type), EXPAND_NORMAL);
2436 seq = get_insns ();
2437 end_sequence ();
2439 cost = seq_cost (seq);
2440 if (GET_CODE (rslt) == MEM)
2441 cost += address_cost (XEXP (rslt, 0), TYPE_MODE (type));
2443 return cost;
2446 /* Returns variable containing the value of candidate CAND at statement AT. */
2448 static tree
2449 var_at_stmt (struct loop *loop, struct iv_cand *cand, tree stmt)
2451 if (stmt_after_increment (loop, cand, stmt))
2452 return cand->var_after;
2453 else
2454 return cand->var_before;
2457 /* Determines the expression by that USE is expressed from induction variable
2458 CAND at statement AT in LOOP. */
2460 static tree
2461 get_computation_at (struct loop *loop,
2462 struct iv_use *use, struct iv_cand *cand, tree at)
2464 tree ubase = use->iv->base;
2465 tree ustep = use->iv->step;
2466 tree cbase = cand->iv->base;
2467 tree cstep = cand->iv->step;
2468 tree utype = TREE_TYPE (ubase), ctype = TREE_TYPE (cbase);
2469 tree uutype;
2470 tree expr, delta;
2471 tree ratio;
2472 unsigned HOST_WIDE_INT ustepi, cstepi;
2473 HOST_WIDE_INT ratioi;
2475 if (TYPE_PRECISION (utype) > TYPE_PRECISION (ctype))
2477 /* We do not have a precision to express the values of use. */
2478 return NULL_TREE;
2481 expr = var_at_stmt (loop, cand, at);
2483 if (TREE_TYPE (expr) != ctype)
2485 /* This may happen with the original ivs. */
2486 expr = fold_convert (ctype, expr);
2489 if (TYPE_UNSIGNED (utype))
2490 uutype = utype;
2491 else
2493 uutype = unsigned_type_for (utype);
2494 ubase = fold_convert (uutype, ubase);
2495 ustep = fold_convert (uutype, ustep);
2498 if (uutype != ctype)
2500 expr = fold_convert (uutype, expr);
2501 cbase = fold_convert (uutype, cbase);
2502 cstep = fold_convert (uutype, cstep);
2505 if (!cst_and_fits_in_hwi (cstep)
2506 || !cst_and_fits_in_hwi (ustep))
2507 return NULL_TREE;
2509 ustepi = int_cst_value (ustep);
2510 cstepi = int_cst_value (cstep);
2512 if (!divide (TYPE_PRECISION (uutype), ustepi, cstepi, &ratioi))
2514 /* TODO maybe consider case when ustep divides cstep and the ratio is
2515 a power of 2 (so that the division is fast to execute)? We would
2516 need to be much more careful with overflows etc. then. */
2517 return NULL_TREE;
2520 /* We may need to shift the value if we are after the increment. */
2521 if (stmt_after_increment (loop, cand, at))
2522 cbase = fold (build2 (PLUS_EXPR, uutype, cbase, cstep));
2524 /* use = ubase - ratio * cbase + ratio * var.
2526 In general case ubase + ratio * (var - cbase) could be better (one less
2527 multiplication), but often it is possible to eliminate redundant parts
2528 of computations from (ubase - ratio * cbase) term, and if it does not
2529 happen, fold is able to apply the distributive law to obtain this form
2530 anyway. */
2532 if (ratioi == 1)
2534 delta = fold (build2 (MINUS_EXPR, uutype, ubase, cbase));
2535 expr = fold (build2 (PLUS_EXPR, uutype, expr, delta));
2537 else if (ratioi == -1)
2539 delta = fold (build2 (PLUS_EXPR, uutype, ubase, cbase));
2540 expr = fold (build2 (MINUS_EXPR, uutype, delta, expr));
2542 else
2544 ratio = build_int_cst_type (uutype, ratioi);
2545 delta = fold (build2 (MULT_EXPR, uutype, ratio, cbase));
2546 delta = fold (build2 (MINUS_EXPR, uutype, ubase, delta));
2547 expr = fold (build2 (MULT_EXPR, uutype, ratio, expr));
2548 expr = fold (build2 (PLUS_EXPR, uutype, delta, expr));
2551 return fold_convert (utype, expr);
2554 /* Determines the expression by that USE is expressed from induction variable
2555 CAND in LOOP. */
2557 static tree
2558 get_computation (struct loop *loop, struct iv_use *use, struct iv_cand *cand)
2560 return get_computation_at (loop, use, cand, use->stmt);
2563 /* Returns cost of addition in MODE. */
2565 static unsigned
2566 add_cost (enum machine_mode mode)
2568 static unsigned costs[NUM_MACHINE_MODES];
2569 rtx seq;
2570 unsigned cost;
2572 if (costs[mode])
2573 return costs[mode];
2575 start_sequence ();
2576 force_operand (gen_rtx_fmt_ee (PLUS, mode,
2577 gen_raw_REG (mode, FIRST_PSEUDO_REGISTER),
2578 gen_raw_REG (mode, FIRST_PSEUDO_REGISTER + 1)),
2579 NULL_RTX);
2580 seq = get_insns ();
2581 end_sequence ();
2583 cost = seq_cost (seq);
2584 if (!cost)
2585 cost = 1;
2587 costs[mode] = cost;
2589 if (dump_file && (dump_flags & TDF_DETAILS))
2590 fprintf (dump_file, "Addition in %s costs %d\n",
2591 GET_MODE_NAME (mode), cost);
2592 return cost;
2595 /* Entry in a hashtable of already known costs for multiplication. */
2596 struct mbc_entry
2598 HOST_WIDE_INT cst; /* The constant to multiply by. */
2599 enum machine_mode mode; /* In mode. */
2600 unsigned cost; /* The cost. */
2603 /* Counts hash value for the ENTRY. */
2605 static hashval_t
2606 mbc_entry_hash (const void *entry)
2608 const struct mbc_entry *e = entry;
2610 return 57 * (hashval_t) e->mode + (hashval_t) (e->cst % 877);
2613 /* Compares the hash table entries ENTRY1 and ENTRY2. */
2615 static int
2616 mbc_entry_eq (const void *entry1, const void *entry2)
2618 const struct mbc_entry *e1 = entry1;
2619 const struct mbc_entry *e2 = entry2;
2621 return (e1->mode == e2->mode
2622 && e1->cst == e2->cst);
2625 /* Returns cost of multiplication by constant CST in MODE. */
2627 static unsigned
2628 multiply_by_cost (HOST_WIDE_INT cst, enum machine_mode mode)
2630 static htab_t costs;
2631 struct mbc_entry **cached, act;
2632 rtx seq;
2633 unsigned cost;
2635 if (!costs)
2636 costs = htab_create (100, mbc_entry_hash, mbc_entry_eq, free);
2638 act.mode = mode;
2639 act.cst = cst;
2640 cached = (struct mbc_entry **) htab_find_slot (costs, &act, INSERT);
2641 if (*cached)
2642 return (*cached)->cost;
2644 *cached = xmalloc (sizeof (struct mbc_entry));
2645 (*cached)->mode = mode;
2646 (*cached)->cst = cst;
2648 start_sequence ();
2649 expand_mult (mode, gen_raw_REG (mode, FIRST_PSEUDO_REGISTER), GEN_INT (cst),
2650 NULL_RTX, 0);
2651 seq = get_insns ();
2652 end_sequence ();
2654 cost = seq_cost (seq);
2656 if (dump_file && (dump_flags & TDF_DETAILS))
2657 fprintf (dump_file, "Multiplication by %d in %s costs %d\n",
2658 (int) cst, GET_MODE_NAME (mode), cost);
2660 (*cached)->cost = cost;
2662 return cost;
2665 /* Returns cost of address in shape symbol + var + OFFSET + RATIO * index.
2666 If SYMBOL_PRESENT is false, symbol is omitted. If VAR_PRESENT is false,
2667 variable is omitted. The created memory accesses MODE.
2669 TODO -- there must be some better way. This all is quite crude. */
2671 static unsigned
2672 get_address_cost (bool symbol_present, bool var_present,
2673 unsigned HOST_WIDE_INT offset, HOST_WIDE_INT ratio)
2675 #define MAX_RATIO 128
2676 static sbitmap valid_mult;
2677 static HOST_WIDE_INT rat, off;
2678 static HOST_WIDE_INT min_offset, max_offset;
2679 static unsigned costs[2][2][2][2];
2680 unsigned cost, acost;
2681 rtx seq, addr, base;
2682 bool offset_p, ratio_p;
2683 rtx reg1;
2684 HOST_WIDE_INT s_offset;
2685 unsigned HOST_WIDE_INT mask;
2686 unsigned bits;
2688 if (!valid_mult)
2690 HOST_WIDE_INT i;
2692 reg1 = gen_raw_REG (Pmode, FIRST_PSEUDO_REGISTER);
2694 addr = gen_rtx_fmt_ee (PLUS, Pmode, reg1, NULL_RTX);
2695 for (i = 1; i <= 1 << 20; i <<= 1)
2697 XEXP (addr, 1) = GEN_INT (i);
2698 if (!memory_address_p (Pmode, addr))
2699 break;
2701 max_offset = i >> 1;
2702 off = max_offset;
2704 for (i = 1; i <= 1 << 20; i <<= 1)
2706 XEXP (addr, 1) = GEN_INT (-i);
2707 if (!memory_address_p (Pmode, addr))
2708 break;
2710 min_offset = -(i >> 1);
2712 if (dump_file && (dump_flags & TDF_DETAILS))
2714 fprintf (dump_file, "get_address_cost:\n");
2715 fprintf (dump_file, " min offset %d\n", (int) min_offset);
2716 fprintf (dump_file, " max offset %d\n", (int) max_offset);
2719 valid_mult = sbitmap_alloc (2 * MAX_RATIO + 1);
2720 sbitmap_zero (valid_mult);
2721 rat = 1;
2722 addr = gen_rtx_fmt_ee (MULT, Pmode, reg1, NULL_RTX);
2723 for (i = -MAX_RATIO; i <= MAX_RATIO; i++)
2725 XEXP (addr, 1) = GEN_INT (i);
2726 if (memory_address_p (Pmode, addr))
2728 SET_BIT (valid_mult, i + MAX_RATIO);
2729 rat = i;
2733 if (dump_file && (dump_flags & TDF_DETAILS))
2735 fprintf (dump_file, " allowed multipliers:");
2736 for (i = -MAX_RATIO; i <= MAX_RATIO; i++)
2737 if (TEST_BIT (valid_mult, i + MAX_RATIO))
2738 fprintf (dump_file, " %d", (int) i);
2739 fprintf (dump_file, "\n");
2740 fprintf (dump_file, "\n");
2744 bits = GET_MODE_BITSIZE (Pmode);
2745 mask = ~(~(unsigned HOST_WIDE_INT) 0 << (bits - 1) << 1);
2746 offset &= mask;
2747 if ((offset >> (bits - 1) & 1))
2748 offset |= ~mask;
2749 s_offset = offset;
2751 cost = 0;
2752 offset_p = (s_offset != 0
2753 && min_offset <= s_offset && s_offset <= max_offset);
2754 ratio_p = (ratio != 1
2755 && -MAX_RATIO <= ratio && ratio <= MAX_RATIO
2756 && TEST_BIT (valid_mult, ratio + MAX_RATIO));
2758 if (ratio != 1 && !ratio_p)
2759 cost += multiply_by_cost (ratio, Pmode);
2761 if (s_offset && !offset_p && !symbol_present)
2763 cost += add_cost (Pmode);
2764 var_present = true;
2767 acost = costs[symbol_present][var_present][offset_p][ratio_p];
2768 if (!acost)
2770 acost = 0;
2772 addr = gen_raw_REG (Pmode, FIRST_PSEUDO_REGISTER);
2773 reg1 = gen_raw_REG (Pmode, FIRST_PSEUDO_REGISTER + 1);
2774 if (ratio_p)
2775 addr = gen_rtx_fmt_ee (MULT, Pmode, addr, GEN_INT (rat));
2777 if (var_present)
2778 addr = gen_rtx_fmt_ee (PLUS, Pmode, addr, reg1);
2780 if (symbol_present)
2782 base = gen_rtx_SYMBOL_REF (Pmode, ggc_strdup (""));
2783 if (offset_p)
2784 base = gen_rtx_fmt_e (CONST, Pmode,
2785 gen_rtx_fmt_ee (PLUS, Pmode,
2786 base,
2787 GEN_INT (off)));
2789 else if (offset_p)
2790 base = GEN_INT (off);
2791 else
2792 base = NULL_RTX;
2794 if (base)
2795 addr = gen_rtx_fmt_ee (PLUS, Pmode, addr, base);
2797 start_sequence ();
2798 addr = memory_address (Pmode, addr);
2799 seq = get_insns ();
2800 end_sequence ();
2802 acost = seq_cost (seq);
2803 acost += address_cost (addr, Pmode);
2805 if (!acost)
2806 acost = 1;
2807 costs[symbol_present][var_present][offset_p][ratio_p] = acost;
2810 return cost + acost;
2813 /* Records invariants in *EXPR_P. Callback for walk_tree. DATA contains
2814 the bitmap to that we should store it. */
2816 static struct ivopts_data *fd_ivopts_data;
2817 static tree
2818 find_depends (tree *expr_p, int *ws ATTRIBUTE_UNUSED, void *data)
2820 bitmap *depends_on = data;
2821 struct version_info *info;
2823 if (TREE_CODE (*expr_p) != SSA_NAME)
2824 return NULL_TREE;
2825 info = name_info (fd_ivopts_data, *expr_p);
2827 if (!info->inv_id || info->has_nonlin_use)
2828 return NULL_TREE;
2830 if (!*depends_on)
2831 *depends_on = BITMAP_ALLOC (NULL);
2832 bitmap_set_bit (*depends_on, info->inv_id);
2834 return NULL_TREE;
2837 /* Estimates cost of forcing EXPR into a variable. DEPENDS_ON is a set of the
2838 invariants the computation depends on. */
2840 static unsigned
2841 force_var_cost (struct ivopts_data *data,
2842 tree expr, bitmap *depends_on)
2844 static bool costs_initialized = false;
2845 static unsigned integer_cost;
2846 static unsigned symbol_cost;
2847 static unsigned address_cost;
2848 tree op0, op1;
2849 unsigned cost0, cost1, cost;
2850 enum machine_mode mode;
2852 if (!costs_initialized)
2854 tree var = create_tmp_var_raw (integer_type_node, "test_var");
2855 rtx x = gen_rtx_MEM (DECL_MODE (var),
2856 gen_rtx_SYMBOL_REF (Pmode, "test_var"));
2857 tree addr;
2858 tree type = build_pointer_type (integer_type_node);
2860 integer_cost = computation_cost (build_int_cst_type (integer_type_node,
2861 2000));
2863 SET_DECL_RTL (var, x);
2864 TREE_STATIC (var) = 1;
2865 addr = build1 (ADDR_EXPR, type, var);
2866 symbol_cost = computation_cost (addr) + 1;
2868 address_cost
2869 = computation_cost (build2 (PLUS_EXPR, type,
2870 addr,
2871 build_int_cst_type (type, 2000))) + 1;
2872 if (dump_file && (dump_flags & TDF_DETAILS))
2874 fprintf (dump_file, "force_var_cost:\n");
2875 fprintf (dump_file, " integer %d\n", (int) integer_cost);
2876 fprintf (dump_file, " symbol %d\n", (int) symbol_cost);
2877 fprintf (dump_file, " address %d\n", (int) address_cost);
2878 fprintf (dump_file, " other %d\n", (int) target_spill_cost);
2879 fprintf (dump_file, "\n");
2882 costs_initialized = true;
2885 STRIP_NOPS (expr);
2887 if (depends_on)
2889 fd_ivopts_data = data;
2890 walk_tree (&expr, find_depends, depends_on, NULL);
2893 if (SSA_VAR_P (expr))
2894 return 0;
2896 if (TREE_INVARIANT (expr))
2898 if (TREE_CODE (expr) == INTEGER_CST)
2899 return integer_cost;
2901 if (TREE_CODE (expr) == ADDR_EXPR)
2903 tree obj = TREE_OPERAND (expr, 0);
2905 if (TREE_CODE (obj) == VAR_DECL
2906 || TREE_CODE (obj) == PARM_DECL
2907 || TREE_CODE (obj) == RESULT_DECL)
2908 return symbol_cost;
2911 return address_cost;
2914 switch (TREE_CODE (expr))
2916 case PLUS_EXPR:
2917 case MINUS_EXPR:
2918 case MULT_EXPR:
2919 op0 = TREE_OPERAND (expr, 0);
2920 op1 = TREE_OPERAND (expr, 1);
2921 STRIP_NOPS (op0);
2922 STRIP_NOPS (op1);
2924 if (is_gimple_val (op0))
2925 cost0 = 0;
2926 else
2927 cost0 = force_var_cost (data, op0, NULL);
2929 if (is_gimple_val (op1))
2930 cost1 = 0;
2931 else
2932 cost1 = force_var_cost (data, op1, NULL);
2934 break;
2936 default:
2937 /* Just an arbitrary value, FIXME. */
2938 return target_spill_cost;
2941 mode = TYPE_MODE (TREE_TYPE (expr));
2942 switch (TREE_CODE (expr))
2944 case PLUS_EXPR:
2945 case MINUS_EXPR:
2946 cost = add_cost (mode);
2947 break;
2949 case MULT_EXPR:
2950 if (cst_and_fits_in_hwi (op0))
2951 cost = multiply_by_cost (int_cst_value (op0), mode);
2952 else if (cst_and_fits_in_hwi (op1))
2953 cost = multiply_by_cost (int_cst_value (op1), mode);
2954 else
2955 return target_spill_cost;
2956 break;
2958 default:
2959 gcc_unreachable ();
2962 cost += cost0;
2963 cost += cost1;
2965 /* Bound the cost by target_spill_cost. The parts of complicated
2966 computations often are either loop invariant or at least can
2967 be shared between several iv uses, so letting this grow without
2968 limits would not give reasonable results. */
2969 return cost < target_spill_cost ? cost : target_spill_cost;
2972 /* Estimates cost of expressing address ADDR as var + symbol + offset. The
2973 value of offset is added to OFFSET, SYMBOL_PRESENT and VAR_PRESENT are set
2974 to false if the corresponding part is missing. DEPENDS_ON is a set of the
2975 invariants the computation depends on. */
2977 static unsigned
2978 split_address_cost (struct ivopts_data *data,
2979 tree addr, bool *symbol_present, bool *var_present,
2980 unsigned HOST_WIDE_INT *offset, bitmap *depends_on)
2982 tree core;
2983 HOST_WIDE_INT bitsize;
2984 HOST_WIDE_INT bitpos;
2985 tree toffset;
2986 enum machine_mode mode;
2987 int unsignedp, volatilep;
2989 core = get_inner_reference (addr, &bitsize, &bitpos, &toffset, &mode,
2990 &unsignedp, &volatilep, false);
2992 if (toffset != 0
2993 || bitpos % BITS_PER_UNIT != 0
2994 || TREE_CODE (core) != VAR_DECL)
2996 *symbol_present = false;
2997 *var_present = true;
2998 fd_ivopts_data = data;
2999 walk_tree (&addr, find_depends, depends_on, NULL);
3000 return target_spill_cost;
3003 *offset += bitpos / BITS_PER_UNIT;
3004 if (TREE_STATIC (core)
3005 || DECL_EXTERNAL (core))
3007 *symbol_present = true;
3008 *var_present = false;
3009 return 0;
3012 *symbol_present = false;
3013 *var_present = true;
3014 return 0;
3017 /* Estimates cost of expressing difference of addresses E1 - E2 as
3018 var + symbol + offset. The value of offset is added to OFFSET,
3019 SYMBOL_PRESENT and VAR_PRESENT are set to false if the corresponding
3020 part is missing. DEPENDS_ON is a set of the invariants the computation
3021 depends on. */
3023 static unsigned
3024 ptr_difference_cost (struct ivopts_data *data,
3025 tree e1, tree e2, bool *symbol_present, bool *var_present,
3026 unsigned HOST_WIDE_INT *offset, bitmap *depends_on)
3028 HOST_WIDE_INT diff = 0;
3029 unsigned cost;
3031 gcc_assert (TREE_CODE (e1) == ADDR_EXPR);
3033 if (ptr_difference_const (e1, e2, &diff))
3035 *offset += diff;
3036 *symbol_present = false;
3037 *var_present = false;
3038 return 0;
3041 if (e2 == integer_zero_node)
3042 return split_address_cost (data, TREE_OPERAND (e1, 0),
3043 symbol_present, var_present, offset, depends_on);
3045 *symbol_present = false;
3046 *var_present = true;
3048 cost = force_var_cost (data, e1, depends_on);
3049 cost += force_var_cost (data, e2, depends_on);
3050 cost += add_cost (Pmode);
3052 return cost;
3055 /* Estimates cost of expressing difference E1 - E2 as
3056 var + symbol + offset. The value of offset is added to OFFSET,
3057 SYMBOL_PRESENT and VAR_PRESENT are set to false if the corresponding
3058 part is missing. DEPENDS_ON is a set of the invariants the computation
3059 depends on. */
3061 static unsigned
3062 difference_cost (struct ivopts_data *data,
3063 tree e1, tree e2, bool *symbol_present, bool *var_present,
3064 unsigned HOST_WIDE_INT *offset, bitmap *depends_on)
3066 unsigned cost;
3067 enum machine_mode mode = TYPE_MODE (TREE_TYPE (e1));
3068 unsigned HOST_WIDE_INT off1, off2;
3070 e1 = strip_offset (e1, false, &off1);
3071 e2 = strip_offset (e2, false, &off2);
3072 *offset += off1 - off2;
3074 STRIP_NOPS (e1);
3075 STRIP_NOPS (e2);
3077 if (TREE_CODE (e1) == ADDR_EXPR)
3078 return ptr_difference_cost (data, e1, e2, symbol_present, var_present, offset,
3079 depends_on);
3080 *symbol_present = false;
3082 if (operand_equal_p (e1, e2, 0))
3084 *var_present = false;
3085 return 0;
3087 *var_present = true;
3088 if (zero_p (e2))
3089 return force_var_cost (data, e1, depends_on);
3091 if (zero_p (e1))
3093 cost = force_var_cost (data, e2, depends_on);
3094 cost += multiply_by_cost (-1, mode);
3096 return cost;
3099 cost = force_var_cost (data, e1, depends_on);
3100 cost += force_var_cost (data, e2, depends_on);
3101 cost += add_cost (mode);
3103 return cost;
3106 /* Determines the cost of the computation by that USE is expressed
3107 from induction variable CAND. If ADDRESS_P is true, we just need
3108 to create an address from it, otherwise we want to get it into
3109 register. A set of invariants we depend on is stored in
3110 DEPENDS_ON. AT is the statement at that the value is computed. */
3112 static unsigned
3113 get_computation_cost_at (struct ivopts_data *data,
3114 struct iv_use *use, struct iv_cand *cand,
3115 bool address_p, bitmap *depends_on, tree at)
3117 tree ubase = use->iv->base, ustep = use->iv->step;
3118 tree cbase, cstep;
3119 tree utype = TREE_TYPE (ubase), ctype;
3120 unsigned HOST_WIDE_INT ustepi, cstepi, offset = 0;
3121 HOST_WIDE_INT ratio, aratio;
3122 bool var_present, symbol_present;
3123 unsigned cost = 0, n_sums;
3125 *depends_on = NULL;
3127 /* Only consider real candidates. */
3128 if (!cand->iv)
3129 return INFTY;
3131 cbase = cand->iv->base;
3132 cstep = cand->iv->step;
3133 ctype = TREE_TYPE (cbase);
3135 if (TYPE_PRECISION (utype) > TYPE_PRECISION (ctype))
3137 /* We do not have a precision to express the values of use. */
3138 return INFTY;
3141 if (address_p)
3143 /* Do not try to express address of an object with computation based
3144 on address of a different object. This may cause problems in rtl
3145 level alias analysis (that does not expect this to be happening,
3146 as this is illegal in C), and would be unlikely to be useful
3147 anyway. */
3148 if (use->iv->base_object
3149 && cand->iv->base_object
3150 && !operand_equal_p (use->iv->base_object, cand->iv->base_object, 0))
3151 return INFTY;
3154 if (!cst_and_fits_in_hwi (ustep)
3155 || !cst_and_fits_in_hwi (cstep))
3156 return INFTY;
3158 if (TREE_CODE (ubase) == INTEGER_CST
3159 && !cst_and_fits_in_hwi (ubase))
3160 goto fallback;
3162 if (TREE_CODE (cbase) == INTEGER_CST
3163 && !cst_and_fits_in_hwi (cbase))
3164 goto fallback;
3166 ustepi = int_cst_value (ustep);
3167 cstepi = int_cst_value (cstep);
3169 if (TYPE_PRECISION (utype) != TYPE_PRECISION (ctype))
3171 /* TODO -- add direct handling of this case. */
3172 goto fallback;
3175 if (!divide (TYPE_PRECISION (utype), ustepi, cstepi, &ratio))
3176 return INFTY;
3178 /* use = ubase + ratio * (var - cbase). If either cbase is a constant
3179 or ratio == 1, it is better to handle this like
3181 ubase - ratio * cbase + ratio * var
3183 (also holds in the case ratio == -1, TODO. */
3185 if (TREE_CODE (cbase) == INTEGER_CST)
3187 offset = - ratio * int_cst_value (cbase);
3188 cost += difference_cost (data,
3189 ubase, integer_zero_node,
3190 &symbol_present, &var_present, &offset,
3191 depends_on);
3193 else if (ratio == 1)
3195 cost += difference_cost (data,
3196 ubase, cbase,
3197 &symbol_present, &var_present, &offset,
3198 depends_on);
3200 else
3202 cost += force_var_cost (data, cbase, depends_on);
3203 cost += add_cost (TYPE_MODE (ctype));
3204 cost += difference_cost (data,
3205 ubase, integer_zero_node,
3206 &symbol_present, &var_present, &offset,
3207 depends_on);
3210 /* If we are after the increment, the value of the candidate is higher by
3211 one iteration. */
3212 if (stmt_after_increment (data->current_loop, cand, at))
3213 offset -= ratio * cstepi;
3215 /* Now the computation is in shape symbol + var1 + const + ratio * var2.
3216 (symbol/var/const parts may be omitted). If we are looking for an address,
3217 find the cost of addressing this. */
3218 if (address_p)
3219 return cost + get_address_cost (symbol_present, var_present, offset, ratio);
3221 /* Otherwise estimate the costs for computing the expression. */
3222 aratio = ratio > 0 ? ratio : -ratio;
3223 if (!symbol_present && !var_present && !offset)
3225 if (ratio != 1)
3226 cost += multiply_by_cost (ratio, TYPE_MODE (ctype));
3228 return cost;
3231 if (aratio != 1)
3232 cost += multiply_by_cost (aratio, TYPE_MODE (ctype));
3234 n_sums = 1;
3235 if (var_present
3236 /* Symbol + offset should be compile-time computable. */
3237 && (symbol_present || offset))
3238 n_sums++;
3240 return cost + n_sums * add_cost (TYPE_MODE (ctype));
3242 fallback:
3244 /* Just get the expression, expand it and measure the cost. */
3245 tree comp = get_computation_at (data->current_loop, use, cand, at);
3247 if (!comp)
3248 return INFTY;
3250 if (address_p)
3251 comp = build1 (INDIRECT_REF, TREE_TYPE (TREE_TYPE (comp)), comp);
3253 return computation_cost (comp);
3257 /* Determines the cost of the computation by that USE is expressed
3258 from induction variable CAND. If ADDRESS_P is true, we just need
3259 to create an address from it, otherwise we want to get it into
3260 register. A set of invariants we depend on is stored in
3261 DEPENDS_ON. */
3263 static unsigned
3264 get_computation_cost (struct ivopts_data *data,
3265 struct iv_use *use, struct iv_cand *cand,
3266 bool address_p, bitmap *depends_on)
3268 return get_computation_cost_at (data,
3269 use, cand, address_p, depends_on, use->stmt);
3272 /* Determines cost of basing replacement of USE on CAND in a generic
3273 expression. */
3275 static bool
3276 determine_use_iv_cost_generic (struct ivopts_data *data,
3277 struct iv_use *use, struct iv_cand *cand)
3279 bitmap depends_on;
3280 unsigned cost;
3282 /* The simple case first -- if we need to express value of the preserved
3283 original biv, the cost is 0. This also prevents us from counting the
3284 cost of increment twice -- once at this use and once in the cost of
3285 the candidate. */
3286 if (cand->pos == IP_ORIGINAL
3287 && cand->incremented_at == use->stmt)
3289 set_use_iv_cost (data, use, cand, 0, NULL);
3290 return true;
3293 cost = get_computation_cost (data, use, cand, false, &depends_on);
3294 set_use_iv_cost (data, use, cand, cost, depends_on);
3296 return cost != INFTY;
3299 /* Determines cost of basing replacement of USE on CAND in an address. */
3301 static bool
3302 determine_use_iv_cost_address (struct ivopts_data *data,
3303 struct iv_use *use, struct iv_cand *cand)
3305 bitmap depends_on;
3306 unsigned cost = get_computation_cost (data, use, cand, true, &depends_on);
3308 set_use_iv_cost (data, use, cand, cost, depends_on);
3310 return cost != INFTY;
3313 /* Computes value of induction variable IV in iteration NITER. */
3315 static tree
3316 iv_value (struct iv *iv, tree niter)
3318 tree val;
3319 tree type = TREE_TYPE (iv->base);
3321 niter = fold_convert (type, niter);
3322 val = fold (build2 (MULT_EXPR, type, iv->step, niter));
3324 return fold (build2 (PLUS_EXPR, type, iv->base, val));
3327 /* Computes value of candidate CAND at position AT in iteration NITER. */
3329 static tree
3330 cand_value_at (struct loop *loop, struct iv_cand *cand, tree at, tree niter)
3332 tree val = iv_value (cand->iv, niter);
3333 tree type = TREE_TYPE (cand->iv->base);
3335 if (stmt_after_increment (loop, cand, at))
3336 val = fold (build2 (PLUS_EXPR, type, val, cand->iv->step));
3338 return val;
3341 /* Returns period of induction variable iv. */
3343 static tree
3344 iv_period (struct iv *iv)
3346 tree step = iv->step, period, type;
3347 tree pow2div;
3349 gcc_assert (step && TREE_CODE (step) == INTEGER_CST);
3351 /* Period of the iv is gcd (step, type range). Since type range is power
3352 of two, it suffices to determine the maximum power of two that divides
3353 step. */
3354 pow2div = num_ending_zeros (step);
3355 type = unsigned_type_for (TREE_TYPE (step));
3357 period = build_low_bits_mask (type,
3358 (TYPE_PRECISION (type)
3359 - tree_low_cst (pow2div, 1)));
3361 return period;
3364 /* Check whether it is possible to express the condition in USE by comparison
3365 of candidate CAND. If so, store the comparison code to COMPARE and the
3366 value compared with to BOUND. */
3368 static bool
3369 may_eliminate_iv (struct ivopts_data *data,
3370 struct iv_use *use, struct iv_cand *cand,
3371 enum tree_code *compare, tree *bound)
3373 basic_block ex_bb;
3374 edge exit;
3375 struct tree_niter_desc *niter;
3376 tree nit, nit_type;
3377 tree wider_type, period, per_type;
3378 struct loop *loop = data->current_loop;
3380 /* For now works only for exits that dominate the loop latch. TODO -- extend
3381 for other conditions inside loop body. */
3382 ex_bb = bb_for_stmt (use->stmt);
3383 if (use->stmt != last_stmt (ex_bb)
3384 || TREE_CODE (use->stmt) != COND_EXPR)
3385 return false;
3386 if (!dominated_by_p (CDI_DOMINATORS, loop->latch, ex_bb))
3387 return false;
3389 exit = EDGE_SUCC (ex_bb, 0);
3390 if (flow_bb_inside_loop_p (loop, exit->dest))
3391 exit = EDGE_SUCC (ex_bb, 1);
3392 if (flow_bb_inside_loop_p (loop, exit->dest))
3393 return false;
3395 niter = niter_for_exit (data, exit);
3396 if (!niter
3397 || !zero_p (niter->may_be_zero))
3398 return false;
3400 nit = niter->niter;
3401 nit_type = TREE_TYPE (nit);
3403 /* Determine whether we may use the variable to test whether niter iterations
3404 elapsed. This is the case iff the period of the induction variable is
3405 greater than the number of iterations. */
3406 period = iv_period (cand->iv);
3407 if (!period)
3408 return false;
3409 per_type = TREE_TYPE (period);
3411 wider_type = TREE_TYPE (period);
3412 if (TYPE_PRECISION (nit_type) < TYPE_PRECISION (per_type))
3413 wider_type = per_type;
3414 else
3415 wider_type = nit_type;
3417 if (!integer_nonzerop (fold (build2 (GE_EXPR, boolean_type_node,
3418 fold_convert (wider_type, period),
3419 fold_convert (wider_type, nit)))))
3420 return false;
3422 if (exit->flags & EDGE_TRUE_VALUE)
3423 *compare = EQ_EXPR;
3424 else
3425 *compare = NE_EXPR;
3427 *bound = cand_value_at (loop, cand, use->stmt, nit);
3428 return true;
3431 /* Determines cost of basing replacement of USE on CAND in a condition. */
3433 static bool
3434 determine_use_iv_cost_condition (struct ivopts_data *data,
3435 struct iv_use *use, struct iv_cand *cand)
3437 tree bound;
3438 enum tree_code compare;
3440 /* Only consider real candidates. */
3441 if (!cand->iv)
3443 set_use_iv_cost (data, use, cand, INFTY, NULL);
3444 return false;
3447 if (may_eliminate_iv (data, use, cand, &compare, &bound))
3449 bitmap depends_on = NULL;
3450 unsigned cost = force_var_cost (data, bound, &depends_on);
3452 set_use_iv_cost (data, use, cand, cost, depends_on);
3453 return cost != INFTY;
3456 /* The induction variable elimination failed; just express the original
3457 giv. If it is compared with an invariant, note that we cannot get
3458 rid of it. */
3459 if (TREE_CODE (*use->op_p) == SSA_NAME)
3460 record_invariant (data, *use->op_p, true);
3461 else
3463 record_invariant (data, TREE_OPERAND (*use->op_p, 0), true);
3464 record_invariant (data, TREE_OPERAND (*use->op_p, 1), true);
3467 return determine_use_iv_cost_generic (data, use, cand);
3470 /* Checks whether it is possible to replace the final value of USE by
3471 a direct computation. If so, the formula is stored to *VALUE. */
3473 static bool
3474 may_replace_final_value (struct ivopts_data *data, struct iv_use *use,
3475 tree *value)
3477 struct loop *loop = data->current_loop;
3478 edge exit;
3479 struct tree_niter_desc *niter;
3481 exit = single_dom_exit (loop);
3482 if (!exit)
3483 return false;
3485 gcc_assert (dominated_by_p (CDI_DOMINATORS, exit->src,
3486 bb_for_stmt (use->stmt)));
3488 niter = niter_for_single_dom_exit (data);
3489 if (!niter
3490 || !zero_p (niter->may_be_zero))
3491 return false;
3493 *value = iv_value (use->iv, niter->niter);
3495 return true;
3498 /* Determines cost of replacing final value of USE using CAND. */
3500 static bool
3501 determine_use_iv_cost_outer (struct ivopts_data *data,
3502 struct iv_use *use, struct iv_cand *cand)
3504 bitmap depends_on;
3505 unsigned cost;
3506 edge exit;
3507 tree value;
3508 struct loop *loop = data->current_loop;
3510 /* The simple case first -- if we need to express value of the preserved
3511 original biv, the cost is 0. This also prevents us from counting the
3512 cost of increment twice -- once at this use and once in the cost of
3513 the candidate. */
3514 if (cand->pos == IP_ORIGINAL
3515 && cand->incremented_at == use->stmt)
3517 set_use_iv_cost (data, use, cand, 0, NULL);
3518 return true;
3521 if (!cand->iv)
3523 if (!may_replace_final_value (data, use, &value))
3525 set_use_iv_cost (data, use, cand, INFTY, NULL);
3526 return false;
3529 depends_on = NULL;
3530 cost = force_var_cost (data, value, &depends_on);
3532 cost /= AVG_LOOP_NITER (loop);
3534 set_use_iv_cost (data, use, cand, cost, depends_on);
3535 return cost != INFTY;
3538 exit = single_dom_exit (loop);
3539 if (exit)
3541 /* If there is just a single exit, we may use value of the candidate
3542 after we take it to determine the value of use. */
3543 cost = get_computation_cost_at (data, use, cand, false, &depends_on,
3544 last_stmt (exit->src));
3545 if (cost != INFTY)
3546 cost /= AVG_LOOP_NITER (loop);
3548 else
3550 /* Otherwise we just need to compute the iv. */
3551 cost = get_computation_cost (data, use, cand, false, &depends_on);
3554 set_use_iv_cost (data, use, cand, cost, depends_on);
3556 return cost != INFTY;
3559 /* Determines cost of basing replacement of USE on CAND. Returns false
3560 if USE cannot be based on CAND. */
3562 static bool
3563 determine_use_iv_cost (struct ivopts_data *data,
3564 struct iv_use *use, struct iv_cand *cand)
3566 switch (use->type)
3568 case USE_NONLINEAR_EXPR:
3569 return determine_use_iv_cost_generic (data, use, cand);
3571 case USE_OUTER:
3572 return determine_use_iv_cost_outer (data, use, cand);
3574 case USE_ADDRESS:
3575 return determine_use_iv_cost_address (data, use, cand);
3577 case USE_COMPARE:
3578 return determine_use_iv_cost_condition (data, use, cand);
3580 default:
3581 gcc_unreachable ();
3585 /* Determines costs of basing the use of the iv on an iv candidate. */
3587 static void
3588 determine_use_iv_costs (struct ivopts_data *data)
3590 unsigned i, j;
3591 struct iv_use *use;
3592 struct iv_cand *cand;
3593 bitmap to_clear = BITMAP_ALLOC (NULL);
3595 alloc_use_cost_map (data);
3597 for (i = 0; i < n_iv_uses (data); i++)
3599 use = iv_use (data, i);
3601 if (data->consider_all_candidates)
3603 for (j = 0; j < n_iv_cands (data); j++)
3605 cand = iv_cand (data, j);
3606 determine_use_iv_cost (data, use, cand);
3609 else
3611 bitmap_iterator bi;
3613 EXECUTE_IF_SET_IN_BITMAP (use->related_cands, 0, j, bi)
3615 cand = iv_cand (data, j);
3616 if (!determine_use_iv_cost (data, use, cand))
3617 bitmap_set_bit (to_clear, j);
3620 /* Remove the candidates for that the cost is infinite from
3621 the list of related candidates. */
3622 bitmap_and_compl_into (use->related_cands, to_clear);
3623 bitmap_clear (to_clear);
3627 BITMAP_FREE (to_clear);
3629 if (dump_file && (dump_flags & TDF_DETAILS))
3631 fprintf (dump_file, "Use-candidate costs:\n");
3633 for (i = 0; i < n_iv_uses (data); i++)
3635 use = iv_use (data, i);
3637 fprintf (dump_file, "Use %d:\n", i);
3638 fprintf (dump_file, " cand\tcost\tdepends on\n");
3639 for (j = 0; j < use->n_map_members; j++)
3641 if (!use->cost_map[j].cand
3642 || use->cost_map[j].cost == INFTY)
3643 continue;
3645 fprintf (dump_file, " %d\t%d\t",
3646 use->cost_map[j].cand->id,
3647 use->cost_map[j].cost);
3648 if (use->cost_map[j].depends_on)
3649 bitmap_print (dump_file,
3650 use->cost_map[j].depends_on, "","");
3651 fprintf (dump_file, "\n");
3654 fprintf (dump_file, "\n");
3656 fprintf (dump_file, "\n");
3660 /* Determines cost of the candidate CAND. */
3662 static void
3663 determine_iv_cost (struct ivopts_data *data, struct iv_cand *cand)
3665 unsigned cost_base, cost_step;
3666 tree base;
3668 if (!cand->iv)
3670 cand->cost = 0;
3671 return;
3674 /* There are two costs associated with the candidate -- its increment
3675 and its initialization. The second is almost negligible for any loop
3676 that rolls enough, so we take it just very little into account. */
3678 base = cand->iv->base;
3679 cost_base = force_var_cost (data, base, NULL);
3680 cost_step = add_cost (TYPE_MODE (TREE_TYPE (base)));
3682 cand->cost = cost_step + cost_base / AVG_LOOP_NITER (current_loop);
3684 /* Prefer the original iv unless we may gain something by replacing it;
3685 this is not really relevant for artificial ivs created by other
3686 passes. */
3687 if (cand->pos == IP_ORIGINAL
3688 && !DECL_ARTIFICIAL (SSA_NAME_VAR (cand->var_before)))
3689 cand->cost--;
3691 /* Prefer not to insert statements into latch unless there are some
3692 already (so that we do not create unnecessary jumps). */
3693 if (cand->pos == IP_END
3694 && empty_block_p (ip_end_pos (data->current_loop)))
3695 cand->cost++;
3698 /* Determines costs of computation of the candidates. */
3700 static void
3701 determine_iv_costs (struct ivopts_data *data)
3703 unsigned i;
3705 if (dump_file && (dump_flags & TDF_DETAILS))
3707 fprintf (dump_file, "Candidate costs:\n");
3708 fprintf (dump_file, " cand\tcost\n");
3711 for (i = 0; i < n_iv_cands (data); i++)
3713 struct iv_cand *cand = iv_cand (data, i);
3715 determine_iv_cost (data, cand);
3717 if (dump_file && (dump_flags & TDF_DETAILS))
3718 fprintf (dump_file, " %d\t%d\n", i, cand->cost);
3721 if (dump_file && (dump_flags & TDF_DETAILS))
3722 fprintf (dump_file, "\n");
3725 /* Calculates cost for having SIZE induction variables. */
3727 static unsigned
3728 ivopts_global_cost_for_size (struct ivopts_data *data, unsigned size)
3730 return global_cost_for_size (size,
3731 loop_data (data->current_loop)->regs_used,
3732 n_iv_uses (data));
3735 /* For each size of the induction variable set determine the penalty. */
3737 static void
3738 determine_set_costs (struct ivopts_data *data)
3740 unsigned j, n;
3741 tree phi, op;
3742 struct loop *loop = data->current_loop;
3743 bitmap_iterator bi;
3745 /* We use the following model (definitely improvable, especially the
3746 cost function -- TODO):
3748 We estimate the number of registers available (using MD data), name it A.
3750 We estimate the number of registers used by the loop, name it U. This
3751 number is obtained as the number of loop phi nodes (not counting virtual
3752 registers and bivs) + the number of variables from outside of the loop.
3754 We set a reserve R (free regs that are used for temporary computations,
3755 etc.). For now the reserve is a constant 3.
3757 Let I be the number of induction variables.
3759 -- if U + I + R <= A, the cost is I * SMALL_COST (just not to encourage
3760 make a lot of ivs without a reason).
3761 -- if A - R < U + I <= A, the cost is I * PRES_COST
3762 -- if U + I > A, the cost is I * PRES_COST and
3763 number of uses * SPILL_COST * (U + I - A) / (U + I) is added. */
3765 if (dump_file && (dump_flags & TDF_DETAILS))
3767 fprintf (dump_file, "Global costs:\n");
3768 fprintf (dump_file, " target_avail_regs %d\n", target_avail_regs);
3769 fprintf (dump_file, " target_small_cost %d\n", target_small_cost);
3770 fprintf (dump_file, " target_pres_cost %d\n", target_pres_cost);
3771 fprintf (dump_file, " target_spill_cost %d\n", target_spill_cost);
3774 n = 0;
3775 for (phi = phi_nodes (loop->header); phi; phi = PHI_CHAIN (phi))
3777 op = PHI_RESULT (phi);
3779 if (!is_gimple_reg (op))
3780 continue;
3782 if (get_iv (data, op))
3783 continue;
3785 n++;
3788 EXECUTE_IF_SET_IN_BITMAP (data->relevant, 0, j, bi)
3790 struct version_info *info = ver_info (data, j);
3792 if (info->inv_id && info->has_nonlin_use)
3793 n++;
3796 loop_data (loop)->regs_used = n;
3797 if (dump_file && (dump_flags & TDF_DETAILS))
3798 fprintf (dump_file, " regs_used %d\n", n);
3800 if (dump_file && (dump_flags & TDF_DETAILS))
3802 fprintf (dump_file, " cost for size:\n");
3803 fprintf (dump_file, " ivs\tcost\n");
3804 for (j = 0; j <= 2 * target_avail_regs; j++)
3805 fprintf (dump_file, " %d\t%d\n", j,
3806 ivopts_global_cost_for_size (data, j));
3807 fprintf (dump_file, "\n");
3811 /* Returns true if A is a cheaper cost pair than B. */
3813 static bool
3814 cheaper_cost_pair (struct cost_pair *a, struct cost_pair *b)
3816 if (!a)
3817 return false;
3819 if (!b)
3820 return true;
3822 if (a->cost < b->cost)
3823 return true;
3825 if (a->cost > b->cost)
3826 return false;
3828 /* In case the costs are the same, prefer the cheaper candidate. */
3829 if (a->cand->cost < b->cand->cost)
3830 return true;
3832 return false;
3835 /* Computes the cost field of IVS structure. */
3837 static void
3838 iv_ca_recount_cost (struct ivopts_data *data, struct iv_ca *ivs)
3840 unsigned cost = 0;
3842 cost += ivs->cand_use_cost;
3843 cost += ivs->cand_cost;
3844 cost += ivopts_global_cost_for_size (data, ivs->n_regs);
3846 ivs->cost = cost;
3849 /* Set USE not to be expressed by any candidate in IVS. */
3851 static void
3852 iv_ca_set_no_cp (struct ivopts_data *data, struct iv_ca *ivs,
3853 struct iv_use *use)
3855 unsigned uid = use->id, cid, iid;
3856 bitmap deps;
3857 struct cost_pair *cp;
3858 bitmap_iterator bi;
3860 cp = ivs->cand_for_use[uid];
3861 if (!cp)
3862 return;
3863 cid = cp->cand->id;
3865 ivs->bad_uses++;
3866 ivs->cand_for_use[uid] = NULL;
3867 ivs->n_cand_uses[cid]--;
3869 if (ivs->n_cand_uses[cid] == 0)
3871 bitmap_clear_bit (ivs->cands, cid);
3872 /* Do not count the pseudocandidates. */
3873 if (cp->cand->iv)
3874 ivs->n_regs--;
3875 ivs->n_cands--;
3876 ivs->cand_cost -= cp->cand->cost;
3879 ivs->cand_use_cost -= cp->cost;
3881 deps = cp->depends_on;
3883 if (deps)
3885 EXECUTE_IF_SET_IN_BITMAP (deps, 0, iid, bi)
3887 ivs->n_invariant_uses[iid]--;
3888 if (ivs->n_invariant_uses[iid] == 0)
3889 ivs->n_regs--;
3893 iv_ca_recount_cost (data, ivs);
3896 /* Set cost pair for USE in set IVS to CP. */
3898 static void
3899 iv_ca_set_cp (struct ivopts_data *data, struct iv_ca *ivs,
3900 struct iv_use *use, struct cost_pair *cp)
3902 unsigned uid = use->id, cid, iid;
3903 bitmap deps;
3904 bitmap_iterator bi;
3906 if (ivs->cand_for_use[uid] == cp)
3907 return;
3909 if (ivs->cand_for_use[uid])
3910 iv_ca_set_no_cp (data, ivs, use);
3912 if (cp)
3914 cid = cp->cand->id;
3916 ivs->bad_uses--;
3917 ivs->cand_for_use[uid] = cp;
3918 ivs->n_cand_uses[cid]++;
3919 if (ivs->n_cand_uses[cid] == 1)
3921 bitmap_set_bit (ivs->cands, cid);
3922 /* Do not count the pseudocandidates. */
3923 if (cp->cand->iv)
3924 ivs->n_regs++;
3925 ivs->n_cands++;
3926 ivs->cand_cost += cp->cand->cost;
3929 ivs->cand_use_cost += cp->cost;
3931 deps = cp->depends_on;
3933 if (deps)
3935 EXECUTE_IF_SET_IN_BITMAP (deps, 0, iid, bi)
3937 ivs->n_invariant_uses[iid]++;
3938 if (ivs->n_invariant_uses[iid] == 1)
3939 ivs->n_regs++;
3943 iv_ca_recount_cost (data, ivs);
3947 /* Extend set IVS by expressing USE by some of the candidates in it
3948 if possible. */
3950 static void
3951 iv_ca_add_use (struct ivopts_data *data, struct iv_ca *ivs,
3952 struct iv_use *use)
3954 struct cost_pair *best_cp = NULL, *cp;
3955 bitmap_iterator bi;
3956 unsigned i;
3958 gcc_assert (ivs->upto >= use->id);
3960 if (ivs->upto == use->id)
3962 ivs->upto++;
3963 ivs->bad_uses++;
3966 EXECUTE_IF_SET_IN_BITMAP (ivs->cands, 0, i, bi)
3968 cp = get_use_iv_cost (data, use, iv_cand (data, i));
3970 if (cheaper_cost_pair (cp, best_cp))
3971 best_cp = cp;
3974 iv_ca_set_cp (data, ivs, use, best_cp);
3977 /* Get cost for assignment IVS. */
3979 static unsigned
3980 iv_ca_cost (struct iv_ca *ivs)
3982 return (ivs->bad_uses ? INFTY : ivs->cost);
3985 /* Returns true if all dependences of CP are among invariants in IVS. */
3987 static bool
3988 iv_ca_has_deps (struct iv_ca *ivs, struct cost_pair *cp)
3990 unsigned i;
3991 bitmap_iterator bi;
3993 if (!cp->depends_on)
3994 return true;
3996 EXECUTE_IF_SET_IN_BITMAP (cp->depends_on, 0, i, bi)
3998 if (ivs->n_invariant_uses[i] == 0)
3999 return false;
4002 return true;
4005 /* Creates change of expressing USE by NEW_CP instead of OLD_CP and chains
4006 it before NEXT_CHANGE. */
4008 static struct iv_ca_delta *
4009 iv_ca_delta_add (struct iv_use *use, struct cost_pair *old_cp,
4010 struct cost_pair *new_cp, struct iv_ca_delta *next_change)
4012 struct iv_ca_delta *change = xmalloc (sizeof (struct iv_ca_delta));
4014 change->use = use;
4015 change->old_cp = old_cp;
4016 change->new_cp = new_cp;
4017 change->next_change = next_change;
4019 return change;
4022 /* Joins two lists of changes L1 and L2. Destructive -- old lists
4023 are rewritten. */
4025 static struct iv_ca_delta *
4026 iv_ca_delta_join (struct iv_ca_delta *l1, struct iv_ca_delta *l2)
4028 struct iv_ca_delta *last;
4030 if (!l2)
4031 return l1;
4033 if (!l1)
4034 return l2;
4036 for (last = l1; last->next_change; last = last->next_change)
4037 continue;
4038 last->next_change = l2;
4040 return l1;
4043 /* Returns candidate by that USE is expressed in IVS. */
4045 static struct cost_pair *
4046 iv_ca_cand_for_use (struct iv_ca *ivs, struct iv_use *use)
4048 return ivs->cand_for_use[use->id];
4051 /* Reverse the list of changes DELTA, forming the inverse to it. */
4053 static struct iv_ca_delta *
4054 iv_ca_delta_reverse (struct iv_ca_delta *delta)
4056 struct iv_ca_delta *act, *next, *prev = NULL;
4057 struct cost_pair *tmp;
4059 for (act = delta; act; act = next)
4061 next = act->next_change;
4062 act->next_change = prev;
4063 prev = act;
4065 tmp = act->old_cp;
4066 act->old_cp = act->new_cp;
4067 act->new_cp = tmp;
4070 return prev;
4073 /* Commit changes in DELTA to IVS. If FORWARD is false, the changes are
4074 reverted instead. */
4076 static void
4077 iv_ca_delta_commit (struct ivopts_data *data, struct iv_ca *ivs,
4078 struct iv_ca_delta *delta, bool forward)
4080 struct cost_pair *from, *to;
4081 struct iv_ca_delta *act;
4083 if (!forward)
4084 delta = iv_ca_delta_reverse (delta);
4086 for (act = delta; act; act = act->next_change)
4088 from = act->old_cp;
4089 to = act->new_cp;
4090 gcc_assert (iv_ca_cand_for_use (ivs, act->use) == from);
4091 iv_ca_set_cp (data, ivs, act->use, to);
4094 if (!forward)
4095 iv_ca_delta_reverse (delta);
4098 /* Returns true if CAND is used in IVS. */
4100 static bool
4101 iv_ca_cand_used_p (struct iv_ca *ivs, struct iv_cand *cand)
4103 return ivs->n_cand_uses[cand->id] > 0;
4106 /* Returns number of induction variable candidates in the set IVS. */
4108 static unsigned
4109 iv_ca_n_cands (struct iv_ca *ivs)
4111 return ivs->n_cands;
4114 /* Free the list of changes DELTA. */
4116 static void
4117 iv_ca_delta_free (struct iv_ca_delta **delta)
4119 struct iv_ca_delta *act, *next;
4121 for (act = *delta; act; act = next)
4123 next = act->next_change;
4124 free (act);
4127 *delta = NULL;
4130 /* Allocates new iv candidates assignment. */
4132 static struct iv_ca *
4133 iv_ca_new (struct ivopts_data *data)
4135 struct iv_ca *nw = xmalloc (sizeof (struct iv_ca));
4137 nw->upto = 0;
4138 nw->bad_uses = 0;
4139 nw->cand_for_use = xcalloc (n_iv_uses (data), sizeof (struct cost_pair *));
4140 nw->n_cand_uses = xcalloc (n_iv_cands (data), sizeof (unsigned));
4141 nw->cands = BITMAP_ALLOC (NULL);
4142 nw->n_cands = 0;
4143 nw->n_regs = 0;
4144 nw->cand_use_cost = 0;
4145 nw->cand_cost = 0;
4146 nw->n_invariant_uses = xcalloc (data->max_inv_id + 1, sizeof (unsigned));
4147 nw->cost = 0;
4149 return nw;
4152 /* Free memory occupied by the set IVS. */
4154 static void
4155 iv_ca_free (struct iv_ca **ivs)
4157 free ((*ivs)->cand_for_use);
4158 free ((*ivs)->n_cand_uses);
4159 BITMAP_FREE ((*ivs)->cands);
4160 free ((*ivs)->n_invariant_uses);
4161 free (*ivs);
4162 *ivs = NULL;
4165 /* Dumps IVS to FILE. */
4167 static void
4168 iv_ca_dump (struct ivopts_data *data, FILE *file, struct iv_ca *ivs)
4170 const char *pref = " invariants ";
4171 unsigned i;
4173 fprintf (file, " cost %d\n", iv_ca_cost (ivs));
4174 bitmap_print (file, ivs->cands, " candidates ","\n");
4176 for (i = 1; i <= data->max_inv_id; i++)
4177 if (ivs->n_invariant_uses[i])
4179 fprintf (file, "%s%d", pref, i);
4180 pref = ", ";
4182 fprintf (file, "\n");
4185 /* Try changing candidate in IVS to CAND for each use. Return cost of the
4186 new set, and store differences in DELTA. Number of induction variables
4187 in the new set is stored to N_IVS. */
4189 static unsigned
4190 iv_ca_extend (struct ivopts_data *data, struct iv_ca *ivs,
4191 struct iv_cand *cand, struct iv_ca_delta **delta,
4192 unsigned *n_ivs)
4194 unsigned i, cost;
4195 struct iv_use *use;
4196 struct cost_pair *old_cp, *new_cp;
4198 *delta = NULL;
4199 for (i = 0; i < ivs->upto; i++)
4201 use = iv_use (data, i);
4202 old_cp = iv_ca_cand_for_use (ivs, use);
4204 if (old_cp
4205 && old_cp->cand == cand)
4206 continue;
4208 new_cp = get_use_iv_cost (data, use, cand);
4209 if (!new_cp)
4210 continue;
4212 if (!iv_ca_has_deps (ivs, new_cp))
4213 continue;
4215 if (!cheaper_cost_pair (new_cp, old_cp))
4216 continue;
4218 *delta = iv_ca_delta_add (use, old_cp, new_cp, *delta);
4221 iv_ca_delta_commit (data, ivs, *delta, true);
4222 cost = iv_ca_cost (ivs);
4223 if (n_ivs)
4224 *n_ivs = iv_ca_n_cands (ivs);
4225 iv_ca_delta_commit (data, ivs, *delta, false);
4227 return cost;
4230 /* Try narrowing set IVS by removing CAND. Return the cost of
4231 the new set and store the differences in DELTA. */
4233 static unsigned
4234 iv_ca_narrow (struct ivopts_data *data, struct iv_ca *ivs,
4235 struct iv_cand *cand, struct iv_ca_delta **delta)
4237 unsigned i, ci;
4238 struct iv_use *use;
4239 struct cost_pair *old_cp, *new_cp, *cp;
4240 bitmap_iterator bi;
4241 struct iv_cand *cnd;
4242 unsigned cost;
4244 *delta = NULL;
4245 for (i = 0; i < n_iv_uses (data); i++)
4247 use = iv_use (data, i);
4249 old_cp = iv_ca_cand_for_use (ivs, use);
4250 if (old_cp->cand != cand)
4251 continue;
4253 new_cp = NULL;
4255 if (data->consider_all_candidates)
4257 EXECUTE_IF_SET_IN_BITMAP (ivs->cands, 0, ci, bi)
4259 if (ci == cand->id)
4260 continue;
4262 cnd = iv_cand (data, ci);
4264 cp = get_use_iv_cost (data, use, cnd);
4265 if (!cp)
4266 continue;
4267 if (!iv_ca_has_deps (ivs, cp))
4268 continue;
4270 if (!cheaper_cost_pair (cp, new_cp))
4271 continue;
4273 new_cp = cp;
4276 else
4278 EXECUTE_IF_AND_IN_BITMAP (use->related_cands, ivs->cands, 0, ci, bi)
4280 if (ci == cand->id)
4281 continue;
4283 cnd = iv_cand (data, ci);
4285 cp = get_use_iv_cost (data, use, cnd);
4286 if (!cp)
4287 continue;
4288 if (!iv_ca_has_deps (ivs, cp))
4289 continue;
4291 if (!cheaper_cost_pair (cp, new_cp))
4292 continue;
4294 new_cp = cp;
4298 if (!new_cp)
4300 iv_ca_delta_free (delta);
4301 return INFTY;
4304 *delta = iv_ca_delta_add (use, old_cp, new_cp, *delta);
4307 iv_ca_delta_commit (data, ivs, *delta, true);
4308 cost = iv_ca_cost (ivs);
4309 iv_ca_delta_commit (data, ivs, *delta, false);
4311 return cost;
4314 /* Try optimizing the set of candidates IVS by removing candidates different
4315 from to EXCEPT_CAND from it. Return cost of the new set, and store
4316 differences in DELTA. */
4318 static unsigned
4319 iv_ca_prune (struct ivopts_data *data, struct iv_ca *ivs,
4320 struct iv_cand *except_cand, struct iv_ca_delta **delta)
4322 bitmap_iterator bi;
4323 struct iv_ca_delta *act_delta, *best_delta;
4324 unsigned i, best_cost, acost;
4325 struct iv_cand *cand;
4327 best_delta = NULL;
4328 best_cost = iv_ca_cost (ivs);
4330 EXECUTE_IF_SET_IN_BITMAP (ivs->cands, 0, i, bi)
4332 cand = iv_cand (data, i);
4334 if (cand == except_cand)
4335 continue;
4337 acost = iv_ca_narrow (data, ivs, cand, &act_delta);
4339 if (acost < best_cost)
4341 best_cost = acost;
4342 iv_ca_delta_free (&best_delta);
4343 best_delta = act_delta;
4345 else
4346 iv_ca_delta_free (&act_delta);
4349 if (!best_delta)
4351 *delta = NULL;
4352 return best_cost;
4355 /* Recurse to possibly remove other unnecessary ivs. */
4356 iv_ca_delta_commit (data, ivs, best_delta, true);
4357 best_cost = iv_ca_prune (data, ivs, except_cand, delta);
4358 iv_ca_delta_commit (data, ivs, best_delta, false);
4359 *delta = iv_ca_delta_join (best_delta, *delta);
4360 return best_cost;
4363 /* Tries to extend the sets IVS in the best possible way in order
4364 to express the USE. */
4366 static bool
4367 try_add_cand_for (struct ivopts_data *data, struct iv_ca *ivs,
4368 struct iv_use *use)
4370 unsigned best_cost, act_cost;
4371 unsigned i;
4372 bitmap_iterator bi;
4373 struct iv_cand *cand;
4374 struct iv_ca_delta *best_delta = NULL, *act_delta;
4375 struct cost_pair *cp;
4377 iv_ca_add_use (data, ivs, use);
4378 best_cost = iv_ca_cost (ivs);
4380 cp = iv_ca_cand_for_use (ivs, use);
4381 if (cp)
4383 best_delta = iv_ca_delta_add (use, NULL, cp, NULL);
4384 iv_ca_set_no_cp (data, ivs, use);
4387 /* First try important candidates. Only if it fails, try the specific ones.
4388 Rationale -- in loops with many variables the best choice often is to use
4389 just one generic biv. If we added here many ivs specific to the uses,
4390 the optimization algorithm later would be likely to get stuck in a local
4391 minimum, thus causing us to create too many ivs. The approach from
4392 few ivs to more seems more likely to be successful -- starting from few
4393 ivs, replacing an expensive use by a specific iv should always be a
4394 win. */
4395 EXECUTE_IF_SET_IN_BITMAP (data->important_candidates, 0, i, bi)
4397 cand = iv_cand (data, i);
4399 if (iv_ca_cand_used_p (ivs, cand))
4400 continue;
4402 cp = get_use_iv_cost (data, use, cand);
4403 if (!cp)
4404 continue;
4406 iv_ca_set_cp (data, ivs, use, cp);
4407 act_cost = iv_ca_extend (data, ivs, cand, &act_delta, NULL);
4408 iv_ca_set_no_cp (data, ivs, use);
4409 act_delta = iv_ca_delta_add (use, NULL, cp, act_delta);
4411 if (act_cost < best_cost)
4413 best_cost = act_cost;
4415 iv_ca_delta_free (&best_delta);
4416 best_delta = act_delta;
4418 else
4419 iv_ca_delta_free (&act_delta);
4422 if (best_cost == INFTY)
4424 for (i = 0; i < use->n_map_members; i++)
4426 cp = use->cost_map + i;
4427 cand = cp->cand;
4428 if (!cand)
4429 continue;
4431 /* Already tried this. */
4432 if (cand->important)
4433 continue;
4435 if (iv_ca_cand_used_p (ivs, cand))
4436 continue;
4438 act_delta = NULL;
4439 iv_ca_set_cp (data, ivs, use, cp);
4440 act_cost = iv_ca_extend (data, ivs, cand, &act_delta, NULL);
4441 iv_ca_set_no_cp (data, ivs, use);
4442 act_delta = iv_ca_delta_add (use, iv_ca_cand_for_use (ivs, use),
4443 cp, act_delta);
4445 if (act_cost < best_cost)
4447 best_cost = act_cost;
4449 if (best_delta)
4450 iv_ca_delta_free (&best_delta);
4451 best_delta = act_delta;
4453 else
4454 iv_ca_delta_free (&act_delta);
4458 iv_ca_delta_commit (data, ivs, best_delta, true);
4459 iv_ca_delta_free (&best_delta);
4461 return (best_cost != INFTY);
4464 /* Finds an initial assignment of candidates to uses. */
4466 static struct iv_ca *
4467 get_initial_solution (struct ivopts_data *data)
4469 struct iv_ca *ivs = iv_ca_new (data);
4470 unsigned i;
4472 for (i = 0; i < n_iv_uses (data); i++)
4473 if (!try_add_cand_for (data, ivs, iv_use (data, i)))
4475 iv_ca_free (&ivs);
4476 return NULL;
4479 return ivs;
4482 /* Tries to improve set of induction variables IVS. */
4484 static bool
4485 try_improve_iv_set (struct ivopts_data *data, struct iv_ca *ivs)
4487 unsigned i, acost, best_cost = iv_ca_cost (ivs), n_ivs;
4488 struct iv_ca_delta *best_delta = NULL, *act_delta, *tmp_delta;
4489 struct iv_cand *cand;
4491 /* Try extending the set of induction variables by one. */
4492 for (i = 0; i < n_iv_cands (data); i++)
4494 cand = iv_cand (data, i);
4496 if (iv_ca_cand_used_p (ivs, cand))
4497 continue;
4499 acost = iv_ca_extend (data, ivs, cand, &act_delta, &n_ivs);
4500 if (!act_delta)
4501 continue;
4503 /* If we successfully added the candidate and the set is small enough,
4504 try optimizing it by removing other candidates. */
4505 if (n_ivs <= ALWAYS_PRUNE_CAND_SET_BOUND)
4507 iv_ca_delta_commit (data, ivs, act_delta, true);
4508 acost = iv_ca_prune (data, ivs, cand, &tmp_delta);
4509 iv_ca_delta_commit (data, ivs, act_delta, false);
4510 act_delta = iv_ca_delta_join (act_delta, tmp_delta);
4513 if (acost < best_cost)
4515 best_cost = acost;
4516 iv_ca_delta_free (&best_delta);
4517 best_delta = act_delta;
4519 else
4520 iv_ca_delta_free (&act_delta);
4523 if (!best_delta)
4525 /* Try removing the candidates from the set instead. */
4526 best_cost = iv_ca_prune (data, ivs, NULL, &best_delta);
4528 /* Nothing more we can do. */
4529 if (!best_delta)
4530 return false;
4533 iv_ca_delta_commit (data, ivs, best_delta, true);
4534 gcc_assert (best_cost == iv_ca_cost (ivs));
4535 iv_ca_delta_free (&best_delta);
4536 return true;
4539 /* Attempts to find the optimal set of induction variables. We do simple
4540 greedy heuristic -- we try to replace at most one candidate in the selected
4541 solution and remove the unused ivs while this improves the cost. */
4543 static struct iv_ca *
4544 find_optimal_iv_set (struct ivopts_data *data)
4546 unsigned i;
4547 struct iv_ca *set;
4548 struct iv_use *use;
4550 /* Get the initial solution. */
4551 set = get_initial_solution (data);
4552 if (!set)
4554 if (dump_file && (dump_flags & TDF_DETAILS))
4555 fprintf (dump_file, "Unable to substitute for ivs, failed.\n");
4556 return NULL;
4559 if (dump_file && (dump_flags & TDF_DETAILS))
4561 fprintf (dump_file, "Initial set of candidates:\n");
4562 iv_ca_dump (data, dump_file, set);
4565 while (try_improve_iv_set (data, set))
4567 if (dump_file && (dump_flags & TDF_DETAILS))
4569 fprintf (dump_file, "Improved to:\n");
4570 iv_ca_dump (data, dump_file, set);
4574 if (dump_file && (dump_flags & TDF_DETAILS))
4575 fprintf (dump_file, "Final cost %d\n\n", iv_ca_cost (set));
4577 for (i = 0; i < n_iv_uses (data); i++)
4579 use = iv_use (data, i);
4580 use->selected = iv_ca_cand_for_use (set, use)->cand;
4583 return set;
4586 /* Creates a new induction variable corresponding to CAND. */
4588 static void
4589 create_new_iv (struct ivopts_data *data, struct iv_cand *cand)
4591 block_stmt_iterator incr_pos;
4592 tree base;
4593 bool after = false;
4595 if (!cand->iv)
4596 return;
4598 switch (cand->pos)
4600 case IP_NORMAL:
4601 incr_pos = bsi_last (ip_normal_pos (data->current_loop));
4602 break;
4604 case IP_END:
4605 incr_pos = bsi_last (ip_end_pos (data->current_loop));
4606 after = true;
4607 break;
4609 case IP_ORIGINAL:
4610 /* Mark that the iv is preserved. */
4611 name_info (data, cand->var_before)->preserve_biv = true;
4612 name_info (data, cand->var_after)->preserve_biv = true;
4614 /* Rewrite the increment so that it uses var_before directly. */
4615 find_interesting_uses_op (data, cand->var_after)->selected = cand;
4617 return;
4620 gimple_add_tmp_var (cand->var_before);
4621 add_referenced_tmp_var (cand->var_before);
4623 base = unshare_expr (cand->iv->base);
4625 create_iv (base, cand->iv->step, cand->var_before, data->current_loop,
4626 &incr_pos, after, &cand->var_before, &cand->var_after);
4629 /* Creates new induction variables described in SET. */
4631 static void
4632 create_new_ivs (struct ivopts_data *data, struct iv_ca *set)
4634 unsigned i;
4635 struct iv_cand *cand;
4636 bitmap_iterator bi;
4638 EXECUTE_IF_SET_IN_BITMAP (set->cands, 0, i, bi)
4640 cand = iv_cand (data, i);
4641 create_new_iv (data, cand);
4645 /* Removes statement STMT (real or a phi node). If INCLUDING_DEFINED_NAME
4646 is true, remove also the ssa name defined by the statement. */
4648 static void
4649 remove_statement (tree stmt, bool including_defined_name)
4651 if (TREE_CODE (stmt) == PHI_NODE)
4653 if (!including_defined_name)
4655 /* Prevent the ssa name defined by the statement from being removed. */
4656 SET_PHI_RESULT (stmt, NULL);
4658 remove_phi_node (stmt, NULL_TREE);
4660 else
4662 block_stmt_iterator bsi = bsi_for_stmt (stmt);
4664 bsi_remove (&bsi);
4668 /* Rewrites USE (definition of iv used in a nonlinear expression)
4669 using candidate CAND. */
4671 static void
4672 rewrite_use_nonlinear_expr (struct ivopts_data *data,
4673 struct iv_use *use, struct iv_cand *cand)
4675 tree comp;
4676 tree op, stmts, tgt, ass;
4677 block_stmt_iterator bsi, pbsi;
4679 /* An important special case -- if we are asked to express value of
4680 the original iv by itself, just exit; there is no need to
4681 introduce a new computation (that might also need casting the
4682 variable to unsigned and back). */
4683 if (cand->pos == IP_ORIGINAL
4684 && TREE_CODE (use->stmt) == MODIFY_EXPR
4685 && TREE_OPERAND (use->stmt, 0) == cand->var_after)
4687 op = TREE_OPERAND (use->stmt, 1);
4689 /* Be a bit careful. In case variable is expressed in some
4690 complicated way, rewrite it so that we may get rid of this
4691 complicated expression. */
4692 if ((TREE_CODE (op) == PLUS_EXPR
4693 || TREE_CODE (op) == MINUS_EXPR)
4694 && TREE_OPERAND (op, 0) == cand->var_before
4695 && TREE_CODE (TREE_OPERAND (op, 1)) == INTEGER_CST)
4696 return;
4699 comp = unshare_expr (get_computation (data->current_loop,
4700 use, cand));
4701 switch (TREE_CODE (use->stmt))
4703 case PHI_NODE:
4704 tgt = PHI_RESULT (use->stmt);
4706 /* If we should keep the biv, do not replace it. */
4707 if (name_info (data, tgt)->preserve_biv)
4708 return;
4710 pbsi = bsi = bsi_start (bb_for_stmt (use->stmt));
4711 while (!bsi_end_p (pbsi)
4712 && TREE_CODE (bsi_stmt (pbsi)) == LABEL_EXPR)
4714 bsi = pbsi;
4715 bsi_next (&pbsi);
4717 break;
4719 case MODIFY_EXPR:
4720 tgt = TREE_OPERAND (use->stmt, 0);
4721 bsi = bsi_for_stmt (use->stmt);
4722 break;
4724 default:
4725 gcc_unreachable ();
4728 op = force_gimple_operand (comp, &stmts, false, SSA_NAME_VAR (tgt));
4730 if (TREE_CODE (use->stmt) == PHI_NODE)
4732 if (stmts)
4733 bsi_insert_after (&bsi, stmts, BSI_CONTINUE_LINKING);
4734 ass = build2 (MODIFY_EXPR, TREE_TYPE (tgt), tgt, op);
4735 bsi_insert_after (&bsi, ass, BSI_NEW_STMT);
4736 remove_statement (use->stmt, false);
4737 SSA_NAME_DEF_STMT (tgt) = ass;
4739 else
4741 if (stmts)
4742 bsi_insert_before (&bsi, stmts, BSI_SAME_STMT);
4743 TREE_OPERAND (use->stmt, 1) = op;
4747 /* Replaces ssa name in index IDX by its basic variable. Callback for
4748 for_each_index. */
4750 static bool
4751 idx_remove_ssa_names (tree base, tree *idx,
4752 void *data ATTRIBUTE_UNUSED)
4754 tree *op;
4756 if (TREE_CODE (*idx) == SSA_NAME)
4757 *idx = SSA_NAME_VAR (*idx);
4759 if (TREE_CODE (base) == ARRAY_REF)
4761 op = &TREE_OPERAND (base, 2);
4762 if (*op
4763 && TREE_CODE (*op) == SSA_NAME)
4764 *op = SSA_NAME_VAR (*op);
4765 op = &TREE_OPERAND (base, 3);
4766 if (*op
4767 && TREE_CODE (*op) == SSA_NAME)
4768 *op = SSA_NAME_VAR (*op);
4771 return true;
4774 /* Unshares REF and replaces ssa names inside it by their basic variables. */
4776 static tree
4777 unshare_and_remove_ssa_names (tree ref)
4779 ref = unshare_expr (ref);
4780 for_each_index (&ref, idx_remove_ssa_names, NULL);
4782 return ref;
4785 /* Rewrites base of memory access OP with expression WITH in statement
4786 pointed to by BSI. */
4788 static void
4789 rewrite_address_base (block_stmt_iterator *bsi, tree *op, tree with)
4791 tree bvar, var, new_var, new_name, copy, name;
4792 tree orig;
4794 var = bvar = get_base_address (*op);
4796 if (!var || TREE_CODE (with) != SSA_NAME)
4797 goto do_rewrite;
4799 gcc_assert (TREE_CODE (var) != ALIGN_INDIRECT_REF);
4800 gcc_assert (TREE_CODE (var) != MISALIGNED_INDIRECT_REF);
4801 if (TREE_CODE (var) == INDIRECT_REF)
4802 var = TREE_OPERAND (var, 0);
4803 if (TREE_CODE (var) == SSA_NAME)
4805 name = var;
4806 var = SSA_NAME_VAR (var);
4808 else if (DECL_P (var))
4809 name = NULL_TREE;
4810 else
4811 goto do_rewrite;
4813 if (var_ann (var)->type_mem_tag)
4814 var = var_ann (var)->type_mem_tag;
4816 /* We need to add a memory tag for the variable. But we do not want
4817 to add it to the temporary used for the computations, since this leads
4818 to problems in redundancy elimination when there are common parts
4819 in two computations referring to the different arrays. So we copy
4820 the variable to a new temporary. */
4821 copy = build2 (MODIFY_EXPR, void_type_node, NULL_TREE, with);
4822 if (name)
4823 new_name = duplicate_ssa_name (name, copy);
4824 else
4826 new_var = create_tmp_var (TREE_TYPE (with), "ruatmp");
4827 add_referenced_tmp_var (new_var);
4828 var_ann (new_var)->type_mem_tag = var;
4829 new_name = make_ssa_name (new_var, copy);
4831 TREE_OPERAND (copy, 0) = new_name;
4832 bsi_insert_before (bsi, copy, BSI_SAME_STMT);
4833 with = new_name;
4835 do_rewrite:
4837 orig = NULL_TREE;
4838 gcc_assert (TREE_CODE (*op) != ALIGN_INDIRECT_REF);
4839 gcc_assert (TREE_CODE (*op) != MISALIGNED_INDIRECT_REF);
4841 if (TREE_CODE (*op) == INDIRECT_REF)
4842 orig = REF_ORIGINAL (*op);
4843 if (!orig)
4844 orig = unshare_and_remove_ssa_names (*op);
4846 *op = build1 (INDIRECT_REF, TREE_TYPE (*op), with);
4848 /* Record the original reference, for purposes of alias analysis. */
4849 REF_ORIGINAL (*op) = orig;
4852 /* Rewrites USE (address that is an iv) using candidate CAND. */
4854 static void
4855 rewrite_use_address (struct ivopts_data *data,
4856 struct iv_use *use, struct iv_cand *cand)
4858 tree comp = unshare_expr (get_computation (data->current_loop,
4859 use, cand));
4860 block_stmt_iterator bsi = bsi_for_stmt (use->stmt);
4861 tree stmts;
4862 tree op = force_gimple_operand (comp, &stmts, true, NULL_TREE);
4864 if (stmts)
4865 bsi_insert_before (&bsi, stmts, BSI_SAME_STMT);
4867 rewrite_address_base (&bsi, use->op_p, op);
4870 /* Rewrites USE (the condition such that one of the arguments is an iv) using
4871 candidate CAND. */
4873 static void
4874 rewrite_use_compare (struct ivopts_data *data,
4875 struct iv_use *use, struct iv_cand *cand)
4877 tree comp;
4878 tree *op_p, cond, op, stmts, bound;
4879 block_stmt_iterator bsi = bsi_for_stmt (use->stmt);
4880 enum tree_code compare;
4882 if (may_eliminate_iv (data, use, cand, &compare, &bound))
4884 tree var = var_at_stmt (data->current_loop, cand, use->stmt);
4885 tree var_type = TREE_TYPE (var);
4887 bound = fold_convert (var_type, bound);
4888 op = force_gimple_operand (unshare_expr (bound), &stmts,
4889 true, NULL_TREE);
4891 if (stmts)
4892 bsi_insert_before (&bsi, stmts, BSI_SAME_STMT);
4894 *use->op_p = build2 (compare, boolean_type_node, var, op);
4895 modify_stmt (use->stmt);
4896 return;
4899 /* The induction variable elimination failed; just express the original
4900 giv. */
4901 comp = unshare_expr (get_computation (data->current_loop, use, cand));
4903 cond = *use->op_p;
4904 op_p = &TREE_OPERAND (cond, 0);
4905 if (TREE_CODE (*op_p) != SSA_NAME
4906 || zero_p (get_iv (data, *op_p)->step))
4907 op_p = &TREE_OPERAND (cond, 1);
4909 op = force_gimple_operand (comp, &stmts, true, SSA_NAME_VAR (*op_p));
4910 if (stmts)
4911 bsi_insert_before (&bsi, stmts, BSI_SAME_STMT);
4913 *op_p = op;
4916 /* Ensure that operand *OP_P may be used at the end of EXIT without
4917 violating loop closed ssa form. */
4919 static void
4920 protect_loop_closed_ssa_form_use (edge exit, use_operand_p op_p)
4922 basic_block def_bb;
4923 struct loop *def_loop;
4924 tree phi, use;
4926 use = USE_FROM_PTR (op_p);
4927 if (TREE_CODE (use) != SSA_NAME)
4928 return;
4930 def_bb = bb_for_stmt (SSA_NAME_DEF_STMT (use));
4931 if (!def_bb)
4932 return;
4934 def_loop = def_bb->loop_father;
4935 if (flow_bb_inside_loop_p (def_loop, exit->dest))
4936 return;
4938 /* Try finding a phi node that copies the value out of the loop. */
4939 for (phi = phi_nodes (exit->dest); phi; phi = PHI_CHAIN (phi))
4940 if (PHI_ARG_DEF_FROM_EDGE (phi, exit) == use)
4941 break;
4943 if (!phi)
4945 /* Create such a phi node. */
4946 tree new_name = duplicate_ssa_name (use, NULL);
4948 phi = create_phi_node (new_name, exit->dest);
4949 SSA_NAME_DEF_STMT (new_name) = phi;
4950 add_phi_arg (phi, use, exit);
4953 SET_USE (op_p, PHI_RESULT (phi));
4956 /* Ensure that operands of STMT may be used at the end of EXIT without
4957 violating loop closed ssa form. */
4959 static void
4960 protect_loop_closed_ssa_form (edge exit, tree stmt)
4962 use_optype uses;
4963 vuse_optype vuses;
4964 v_may_def_optype v_may_defs;
4965 unsigned i;
4967 get_stmt_operands (stmt);
4969 uses = STMT_USE_OPS (stmt);
4970 for (i = 0; i < NUM_USES (uses); i++)
4971 protect_loop_closed_ssa_form_use (exit, USE_OP_PTR (uses, i));
4973 vuses = STMT_VUSE_OPS (stmt);
4974 for (i = 0; i < NUM_VUSES (vuses); i++)
4975 protect_loop_closed_ssa_form_use (exit, VUSE_OP_PTR (vuses, i));
4977 v_may_defs = STMT_V_MAY_DEF_OPS (stmt);
4978 for (i = 0; i < NUM_V_MAY_DEFS (v_may_defs); i++)
4979 protect_loop_closed_ssa_form_use (exit, V_MAY_DEF_OP_PTR (v_may_defs, i));
4982 /* STMTS compute a value of a phi argument OP on EXIT of a loop. Arrange things
4983 so that they are emitted on the correct place, and so that the loop closed
4984 ssa form is preserved. */
4986 static void
4987 compute_phi_arg_on_exit (edge exit, tree stmts, tree op)
4989 tree_stmt_iterator tsi;
4990 block_stmt_iterator bsi;
4991 tree phi, stmt, def, next;
4993 if (!single_pred_p (exit->dest))
4994 split_loop_exit_edge (exit);
4996 if (TREE_CODE (stmts) == STATEMENT_LIST)
4998 for (tsi = tsi_start (stmts); !tsi_end_p (tsi); tsi_next (&tsi))
4999 protect_loop_closed_ssa_form (exit, tsi_stmt (tsi));
5001 else
5002 protect_loop_closed_ssa_form (exit, stmts);
5004 /* Ensure there is label in exit->dest, so that we can
5005 insert after it. */
5006 tree_block_label (exit->dest);
5007 bsi = bsi_after_labels (exit->dest);
5008 bsi_insert_after (&bsi, stmts, BSI_CONTINUE_LINKING);
5010 if (!op)
5011 return;
5013 for (phi = phi_nodes (exit->dest); phi; phi = next)
5015 next = PHI_CHAIN (phi);
5017 if (PHI_ARG_DEF_FROM_EDGE (phi, exit) == op)
5019 def = PHI_RESULT (phi);
5020 remove_statement (phi, false);
5021 stmt = build2 (MODIFY_EXPR, TREE_TYPE (op),
5022 def, op);
5023 SSA_NAME_DEF_STMT (def) = stmt;
5024 bsi_insert_after (&bsi, stmt, BSI_CONTINUE_LINKING);
5029 /* Rewrites the final value of USE (that is only needed outside of the loop)
5030 using candidate CAND. */
5032 static void
5033 rewrite_use_outer (struct ivopts_data *data,
5034 struct iv_use *use, struct iv_cand *cand)
5036 edge exit;
5037 tree value, op, stmts, tgt;
5038 tree phi;
5040 switch (TREE_CODE (use->stmt))
5042 case PHI_NODE:
5043 tgt = PHI_RESULT (use->stmt);
5044 break;
5045 case MODIFY_EXPR:
5046 tgt = TREE_OPERAND (use->stmt, 0);
5047 break;
5048 default:
5049 gcc_unreachable ();
5052 exit = single_dom_exit (data->current_loop);
5054 if (exit)
5056 if (!cand->iv)
5058 bool ok = may_replace_final_value (data, use, &value);
5059 gcc_assert (ok);
5061 else
5062 value = get_computation_at (data->current_loop,
5063 use, cand, last_stmt (exit->src));
5065 value = unshare_expr (value);
5066 op = force_gimple_operand (value, &stmts, true, SSA_NAME_VAR (tgt));
5068 /* If we will preserve the iv anyway and we would need to perform
5069 some computation to replace the final value, do nothing. */
5070 if (stmts && name_info (data, tgt)->preserve_biv)
5071 return;
5073 for (phi = phi_nodes (exit->dest); phi; phi = PHI_CHAIN (phi))
5075 use_operand_p use_p = PHI_ARG_DEF_PTR_FROM_EDGE (phi, exit);
5077 if (USE_FROM_PTR (use_p) == tgt)
5078 SET_USE (use_p, op);
5081 if (stmts)
5082 compute_phi_arg_on_exit (exit, stmts, op);
5084 /* Enable removal of the statement. We cannot remove it directly,
5085 since we may still need the aliasing information attached to the
5086 ssa name defined by it. */
5087 name_info (data, tgt)->iv->have_use_for = false;
5088 return;
5091 /* If the variable is going to be preserved anyway, there is nothing to
5092 do. */
5093 if (name_info (data, tgt)->preserve_biv)
5094 return;
5096 /* Otherwise we just need to compute the iv. */
5097 rewrite_use_nonlinear_expr (data, use, cand);
5100 /* Rewrites USE using candidate CAND. */
5102 static void
5103 rewrite_use (struct ivopts_data *data,
5104 struct iv_use *use, struct iv_cand *cand)
5106 switch (use->type)
5108 case USE_NONLINEAR_EXPR:
5109 rewrite_use_nonlinear_expr (data, use, cand);
5110 break;
5112 case USE_OUTER:
5113 rewrite_use_outer (data, use, cand);
5114 break;
5116 case USE_ADDRESS:
5117 rewrite_use_address (data, use, cand);
5118 break;
5120 case USE_COMPARE:
5121 rewrite_use_compare (data, use, cand);
5122 break;
5124 default:
5125 gcc_unreachable ();
5127 modify_stmt (use->stmt);
5130 /* Rewrite the uses using the selected induction variables. */
5132 static void
5133 rewrite_uses (struct ivopts_data *data)
5135 unsigned i;
5136 struct iv_cand *cand;
5137 struct iv_use *use;
5139 for (i = 0; i < n_iv_uses (data); i++)
5141 use = iv_use (data, i);
5142 cand = use->selected;
5143 gcc_assert (cand);
5145 rewrite_use (data, use, cand);
5149 /* Removes the ivs that are not used after rewriting. */
5151 static void
5152 remove_unused_ivs (struct ivopts_data *data)
5154 unsigned j;
5155 bitmap_iterator bi;
5157 EXECUTE_IF_SET_IN_BITMAP (data->relevant, 0, j, bi)
5159 struct version_info *info;
5161 info = ver_info (data, j);
5162 if (info->iv
5163 && !zero_p (info->iv->step)
5164 && !info->inv_id
5165 && !info->iv->have_use_for
5166 && !info->preserve_biv)
5167 remove_statement (SSA_NAME_DEF_STMT (info->iv->ssa_name), true);
5171 /* Frees data allocated by the optimization of a single loop. */
5173 static void
5174 free_loop_data (struct ivopts_data *data)
5176 unsigned i, j;
5177 bitmap_iterator bi;
5179 htab_empty (data->niters);
5181 EXECUTE_IF_SET_IN_BITMAP (data->relevant, 0, i, bi)
5183 struct version_info *info;
5185 info = ver_info (data, i);
5186 if (info->iv)
5187 free (info->iv);
5188 info->iv = NULL;
5189 info->has_nonlin_use = false;
5190 info->preserve_biv = false;
5191 info->inv_id = 0;
5193 bitmap_clear (data->relevant);
5194 bitmap_clear (data->important_candidates);
5196 for (i = 0; i < n_iv_uses (data); i++)
5198 struct iv_use *use = iv_use (data, i);
5200 free (use->iv);
5201 BITMAP_FREE (use->related_cands);
5202 for (j = 0; j < use->n_map_members; j++)
5203 if (use->cost_map[j].depends_on)
5204 BITMAP_FREE (use->cost_map[j].depends_on);
5205 free (use->cost_map);
5206 free (use);
5208 VARRAY_POP_ALL (data->iv_uses);
5210 for (i = 0; i < n_iv_cands (data); i++)
5212 struct iv_cand *cand = iv_cand (data, i);
5214 if (cand->iv)
5215 free (cand->iv);
5216 free (cand);
5218 VARRAY_POP_ALL (data->iv_candidates);
5220 if (data->version_info_size < num_ssa_names)
5222 data->version_info_size = 2 * num_ssa_names;
5223 free (data->version_info);
5224 data->version_info = xcalloc (data->version_info_size,
5225 sizeof (struct version_info));
5228 data->max_inv_id = 0;
5230 for (i = 0; i < VARRAY_ACTIVE_SIZE (decl_rtl_to_reset); i++)
5232 tree obj = VARRAY_GENERIC_PTR_NOGC (decl_rtl_to_reset, i);
5234 SET_DECL_RTL (obj, NULL_RTX);
5236 VARRAY_POP_ALL (decl_rtl_to_reset);
5239 /* Finalizes data structures used by the iv optimization pass. LOOPS is the
5240 loop tree. */
5242 static void
5243 tree_ssa_iv_optimize_finalize (struct loops *loops, struct ivopts_data *data)
5245 unsigned i;
5247 for (i = 1; i < loops->num; i++)
5248 if (loops->parray[i])
5250 free (loops->parray[i]->aux);
5251 loops->parray[i]->aux = NULL;
5254 free_loop_data (data);
5255 free (data->version_info);
5256 BITMAP_FREE (data->relevant);
5257 BITMAP_FREE (data->important_candidates);
5258 htab_delete (data->niters);
5260 VARRAY_FREE (decl_rtl_to_reset);
5261 VARRAY_FREE (data->iv_uses);
5262 VARRAY_FREE (data->iv_candidates);
5265 /* Optimizes the LOOP. Returns true if anything changed. */
5267 static bool
5268 tree_ssa_iv_optimize_loop (struct ivopts_data *data, struct loop *loop)
5270 bool changed = false;
5271 struct iv_ca *iv_ca;
5272 edge exit;
5274 data->current_loop = loop;
5276 if (dump_file && (dump_flags & TDF_DETAILS))
5278 fprintf (dump_file, "Processing loop %d\n", loop->num);
5280 exit = single_dom_exit (loop);
5281 if (exit)
5283 fprintf (dump_file, " single exit %d -> %d, exit condition ",
5284 exit->src->index, exit->dest->index);
5285 print_generic_expr (dump_file, last_stmt (exit->src), TDF_SLIM);
5286 fprintf (dump_file, "\n");
5289 fprintf (dump_file, "\n");
5292 /* For each ssa name determines whether it behaves as an induction variable
5293 in some loop. */
5294 if (!find_induction_variables (data))
5295 goto finish;
5297 /* Finds interesting uses (item 1). */
5298 find_interesting_uses (data);
5299 if (n_iv_uses (data) > MAX_CONSIDERED_USES)
5300 goto finish;
5302 /* Finds candidates for the induction variables (item 2). */
5303 find_iv_candidates (data);
5305 /* Calculates the costs (item 3, part 1). */
5306 determine_use_iv_costs (data);
5307 determine_iv_costs (data);
5308 determine_set_costs (data);
5310 /* Find the optimal set of induction variables (item 3, part 2). */
5311 iv_ca = find_optimal_iv_set (data);
5312 if (!iv_ca)
5313 goto finish;
5314 changed = true;
5316 /* Create the new induction variables (item 4, part 1). */
5317 create_new_ivs (data, iv_ca);
5318 iv_ca_free (&iv_ca);
5320 /* Rewrite the uses (item 4, part 2). */
5321 rewrite_uses (data);
5323 /* Remove the ivs that are unused after rewriting. */
5324 remove_unused_ivs (data);
5326 /* We have changed the structure of induction variables; it might happen
5327 that definitions in the scev database refer to some of them that were
5328 eliminated. */
5329 scev_reset ();
5331 finish:
5332 free_loop_data (data);
5334 return changed;
5337 /* Main entry point. Optimizes induction variables in LOOPS. */
5339 void
5340 tree_ssa_iv_optimize (struct loops *loops)
5342 struct loop *loop;
5343 struct ivopts_data data;
5345 tree_ssa_iv_optimize_init (loops, &data);
5347 /* Optimize the loops starting with the innermost ones. */
5348 loop = loops->tree_root;
5349 while (loop->inner)
5350 loop = loop->inner;
5352 #ifdef ENABLE_CHECKING
5353 verify_loop_closed_ssa ();
5354 verify_stmts ();
5355 #endif
5357 /* Scan the loops, inner ones first. */
5358 while (loop != loops->tree_root)
5360 if (dump_file && (dump_flags & TDF_DETAILS))
5361 flow_loop_dump (loop, dump_file, NULL, 1);
5363 tree_ssa_iv_optimize_loop (&data, loop);
5365 if (loop->next)
5367 loop = loop->next;
5368 while (loop->inner)
5369 loop = loop->inner;
5371 else
5372 loop = loop->outer;
5375 #ifdef ENABLE_CHECKING
5376 verify_loop_closed_ssa ();
5377 verify_stmts ();
5378 #endif
5380 tree_ssa_iv_optimize_finalize (loops, &data);