mklog: add subject line skeleton
[official-gcc.git] / gcc / tree-ssa-dom.c
blobc231e6c84677da0d3eb21cb66e8bce40182cc123
1 /* SSA Dominator optimizations for trees
2 Copyright (C) 2001-2021 Free Software Foundation, Inc.
3 Contributed by Diego Novillo <dnovillo@redhat.com>
5 This file is part of GCC.
7 GCC is free software; you can redistribute it and/or modify
8 it under the terms of the GNU General Public License as published by
9 the Free Software Foundation; either version 3, or (at your option)
10 any later version.
12 GCC is distributed in the hope that it will be useful,
13 but WITHOUT ANY WARRANTY; without even the implied warranty of
14 MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
15 GNU General Public License for more details.
17 You should have received a copy of the GNU General Public License
18 along with GCC; see the file COPYING3. If not see
19 <http://www.gnu.org/licenses/>. */
21 #include "config.h"
22 #include "system.h"
23 #include "coretypes.h"
24 #include "backend.h"
25 #include "tree.h"
26 #include "gimple.h"
27 #include "tree-pass.h"
28 #include "ssa.h"
29 #include "gimple-pretty-print.h"
30 #include "fold-const.h"
31 #include "cfganal.h"
32 #include "cfgloop.h"
33 #include "gimple-fold.h"
34 #include "tree-eh.h"
35 #include "tree-inline.h"
36 #include "gimple-iterator.h"
37 #include "tree-cfg.h"
38 #include "tree-into-ssa.h"
39 #include "domwalk.h"
40 #include "tree-ssa-propagate.h"
41 #include "tree-ssa-threadupdate.h"
42 #include "tree-ssa-scopedtables.h"
43 #include "tree-ssa-threadedge.h"
44 #include "tree-ssa-dom.h"
45 #include "gimplify.h"
46 #include "tree-cfgcleanup.h"
47 #include "dbgcnt.h"
48 #include "alloc-pool.h"
49 #include "tree-vrp.h"
50 #include "vr-values.h"
51 #include "gimple-ssa-evrp-analyze.h"
52 #include "alias.h"
54 /* This file implements optimizations on the dominator tree. */
56 /* Structure for recording edge equivalences.
58 Computing and storing the edge equivalences instead of creating
59 them on-demand can save significant amounts of time, particularly
60 for pathological cases involving switch statements.
62 These structures live for a single iteration of the dominator
63 optimizer in the edge's AUX field. At the end of an iteration we
64 free each of these structures. */
65 class edge_info
67 public:
68 typedef std::pair <tree, tree> equiv_pair;
69 edge_info (edge);
70 ~edge_info ();
72 /* Record a simple LHS = RHS equivalence. This may trigger
73 calls to derive_equivalences. */
74 void record_simple_equiv (tree, tree);
76 /* If traversing this edge creates simple equivalences, we store
77 them as LHS/RHS pairs within this vector. */
78 vec<equiv_pair> simple_equivalences;
80 /* Traversing an edge may also indicate one or more particular conditions
81 are true or false. */
82 vec<cond_equivalence> cond_equivalences;
84 private:
85 /* Derive equivalences by walking the use-def chains. */
86 void derive_equivalences (tree, tree, int);
89 /* Track whether or not we have changed the control flow graph. */
90 static bool cfg_altered;
92 /* Bitmap of blocks that have had EH statements cleaned. We should
93 remove their dead edges eventually. */
94 static bitmap need_eh_cleanup;
95 static vec<gimple *> need_noreturn_fixup;
97 /* Statistics for dominator optimizations. */
98 struct opt_stats_d
100 long num_stmts;
101 long num_exprs_considered;
102 long num_re;
103 long num_const_prop;
104 long num_copy_prop;
107 static struct opt_stats_d opt_stats;
109 /* Local functions. */
110 static void record_equality (tree, tree, class const_and_copies *);
111 static void record_equivalences_from_phis (basic_block);
112 static void record_equivalences_from_incoming_edge (basic_block,
113 class const_and_copies *,
114 class avail_exprs_stack *);
115 static void eliminate_redundant_computations (gimple_stmt_iterator *,
116 class const_and_copies *,
117 class avail_exprs_stack *);
118 static void record_equivalences_from_stmt (gimple *, int,
119 class avail_exprs_stack *);
120 static void dump_dominator_optimization_stats (FILE *file,
121 hash_table<expr_elt_hasher> *);
123 /* Constructor for EDGE_INFO. An EDGE_INFO instance is always
124 associated with an edge E. */
126 edge_info::edge_info (edge e)
128 /* Free the old one associated with E, if it exists and
129 associate our new object with E. */
130 free_dom_edge_info (e);
131 e->aux = this;
133 /* And initialize the embedded vectors. */
134 simple_equivalences = vNULL;
135 cond_equivalences = vNULL;
138 /* Destructor just needs to release the vectors. */
140 edge_info::~edge_info (void)
142 this->cond_equivalences.release ();
143 this->simple_equivalences.release ();
146 /* NAME is known to have the value VALUE, which must be a constant.
148 Walk through its use-def chain to see if there are other equivalences
149 we might be able to derive.
151 RECURSION_LIMIT controls how far back we recurse through the use-def
152 chains. */
154 void
155 edge_info::derive_equivalences (tree name, tree value, int recursion_limit)
157 if (TREE_CODE (name) != SSA_NAME || TREE_CODE (value) != INTEGER_CST)
158 return;
160 /* This records the equivalence for the toplevel object. Do
161 this before checking the recursion limit. */
162 simple_equivalences.safe_push (equiv_pair (name, value));
164 /* Limit how far up the use-def chains we are willing to walk. */
165 if (recursion_limit == 0)
166 return;
168 /* We can walk up the use-def chains to potentially find more
169 equivalences. */
170 gimple *def_stmt = SSA_NAME_DEF_STMT (name);
171 if (is_gimple_assign (def_stmt))
173 enum tree_code code = gimple_assign_rhs_code (def_stmt);
174 switch (code)
176 /* If the result of an OR is zero, then its operands are, too. */
177 case BIT_IOR_EXPR:
178 if (integer_zerop (value))
180 tree rhs1 = gimple_assign_rhs1 (def_stmt);
181 tree rhs2 = gimple_assign_rhs2 (def_stmt);
183 value = build_zero_cst (TREE_TYPE (rhs1));
184 derive_equivalences (rhs1, value, recursion_limit - 1);
185 value = build_zero_cst (TREE_TYPE (rhs2));
186 derive_equivalences (rhs2, value, recursion_limit - 1);
188 break;
190 /* If the result of an AND is nonzero, then its operands are, too. */
191 case BIT_AND_EXPR:
192 if (!integer_zerop (value))
194 tree rhs1 = gimple_assign_rhs1 (def_stmt);
195 tree rhs2 = gimple_assign_rhs2 (def_stmt);
197 /* If either operand has a boolean range, then we
198 know its value must be one, otherwise we just know it
199 is nonzero. The former is clearly useful, I haven't
200 seen cases where the latter is helpful yet. */
201 if (TREE_CODE (rhs1) == SSA_NAME)
203 if (ssa_name_has_boolean_range (rhs1))
205 value = build_one_cst (TREE_TYPE (rhs1));
206 derive_equivalences (rhs1, value, recursion_limit - 1);
209 if (TREE_CODE (rhs2) == SSA_NAME)
211 if (ssa_name_has_boolean_range (rhs2))
213 value = build_one_cst (TREE_TYPE (rhs2));
214 derive_equivalences (rhs2, value, recursion_limit - 1);
218 break;
220 /* If LHS is an SSA_NAME and RHS is a constant integer and LHS was
221 set via a widening type conversion, then we may be able to record
222 additional equivalences. */
223 case NOP_EXPR:
224 case CONVERT_EXPR:
226 tree rhs = gimple_assign_rhs1 (def_stmt);
227 tree rhs_type = TREE_TYPE (rhs);
228 if (INTEGRAL_TYPE_P (rhs_type)
229 && (TYPE_PRECISION (TREE_TYPE (name))
230 >= TYPE_PRECISION (rhs_type))
231 && int_fits_type_p (value, rhs_type))
232 derive_equivalences (rhs,
233 fold_convert (rhs_type, value),
234 recursion_limit - 1);
235 break;
238 /* We can invert the operation of these codes trivially if
239 one of the RHS operands is a constant to produce a known
240 value for the other RHS operand. */
241 case POINTER_PLUS_EXPR:
242 case PLUS_EXPR:
244 tree rhs1 = gimple_assign_rhs1 (def_stmt);
245 tree rhs2 = gimple_assign_rhs2 (def_stmt);
247 /* If either argument is a constant, then we can compute
248 a constant value for the nonconstant argument. */
249 if (TREE_CODE (rhs1) == INTEGER_CST
250 && TREE_CODE (rhs2) == SSA_NAME)
251 derive_equivalences (rhs2,
252 fold_binary (MINUS_EXPR, TREE_TYPE (rhs1),
253 value, rhs1),
254 recursion_limit - 1);
255 else if (TREE_CODE (rhs2) == INTEGER_CST
256 && TREE_CODE (rhs1) == SSA_NAME)
257 derive_equivalences (rhs1,
258 fold_binary (MINUS_EXPR, TREE_TYPE (rhs1),
259 value, rhs2),
260 recursion_limit - 1);
261 break;
264 /* If one of the operands is a constant, then we can compute
265 the value of the other operand. If both operands are
266 SSA_NAMEs, then they must be equal if the result is zero. */
267 case MINUS_EXPR:
269 tree rhs1 = gimple_assign_rhs1 (def_stmt);
270 tree rhs2 = gimple_assign_rhs2 (def_stmt);
272 /* If either argument is a constant, then we can compute
273 a constant value for the nonconstant argument. */
274 if (TREE_CODE (rhs1) == INTEGER_CST
275 && TREE_CODE (rhs2) == SSA_NAME)
276 derive_equivalences (rhs2,
277 fold_binary (MINUS_EXPR, TREE_TYPE (rhs1),
278 rhs1, value),
279 recursion_limit - 1);
280 else if (TREE_CODE (rhs2) == INTEGER_CST
281 && TREE_CODE (rhs1) == SSA_NAME)
282 derive_equivalences (rhs1,
283 fold_binary (PLUS_EXPR, TREE_TYPE (rhs1),
284 value, rhs2),
285 recursion_limit - 1);
286 else if (integer_zerop (value))
288 tree cond = build2 (EQ_EXPR, boolean_type_node,
289 gimple_assign_rhs1 (def_stmt),
290 gimple_assign_rhs2 (def_stmt));
291 tree inverted = invert_truthvalue (cond);
292 record_conditions (&this->cond_equivalences, cond, inverted);
294 break;
297 case EQ_EXPR:
298 case NE_EXPR:
300 if ((code == EQ_EXPR && integer_onep (value))
301 || (code == NE_EXPR && integer_zerop (value)))
303 tree rhs1 = gimple_assign_rhs1 (def_stmt);
304 tree rhs2 = gimple_assign_rhs2 (def_stmt);
306 /* If either argument is a constant, then record the
307 other argument as being the same as that constant.
309 If neither operand is a constant, then we have a
310 conditional name == name equivalence. */
311 if (TREE_CODE (rhs1) == INTEGER_CST)
312 derive_equivalences (rhs2, rhs1, recursion_limit - 1);
313 else if (TREE_CODE (rhs2) == INTEGER_CST)
314 derive_equivalences (rhs1, rhs2, recursion_limit - 1);
316 else
318 tree cond = build2 (code, boolean_type_node,
319 gimple_assign_rhs1 (def_stmt),
320 gimple_assign_rhs2 (def_stmt));
321 tree inverted = invert_truthvalue (cond);
322 if (integer_zerop (value))
323 std::swap (cond, inverted);
324 record_conditions (&this->cond_equivalences, cond, inverted);
326 break;
329 /* For BIT_NOT and NEGATE, we can just apply the operation to the
330 VALUE to get the new equivalence. It will always be a constant
331 so we can recurse. */
332 case BIT_NOT_EXPR:
333 case NEGATE_EXPR:
335 tree rhs = gimple_assign_rhs1 (def_stmt);
336 tree res;
337 /* If this is a NOT and the operand has a boolean range, then we
338 know its value must be zero or one. We are not supposed to
339 have a BIT_NOT_EXPR for boolean types with precision > 1 in
340 the general case, see e.g. the handling of TRUTH_NOT_EXPR in
341 the gimplifier, but it can be generated by match.pd out of
342 a BIT_XOR_EXPR wrapped in a BIT_AND_EXPR. Now the handling
343 of BIT_AND_EXPR above already forces a specific semantics for
344 boolean types with precision > 1 so we must do the same here,
345 otherwise we could change the semantics of TRUTH_NOT_EXPR for
346 boolean types with precision > 1. */
347 if (code == BIT_NOT_EXPR
348 && TREE_CODE (rhs) == SSA_NAME
349 && ssa_name_has_boolean_range (rhs))
351 if ((TREE_INT_CST_LOW (value) & 1) == 0)
352 res = build_one_cst (TREE_TYPE (rhs));
353 else
354 res = build_zero_cst (TREE_TYPE (rhs));
356 else
357 res = fold_build1 (code, TREE_TYPE (rhs), value);
358 derive_equivalences (rhs, res, recursion_limit - 1);
359 break;
362 default:
364 if (TREE_CODE_CLASS (code) == tcc_comparison)
366 tree cond = build2 (code, boolean_type_node,
367 gimple_assign_rhs1 (def_stmt),
368 gimple_assign_rhs2 (def_stmt));
369 tree inverted = invert_truthvalue (cond);
370 if (integer_zerop (value))
371 std::swap (cond, inverted);
372 record_conditions (&this->cond_equivalences, cond, inverted);
373 break;
375 break;
381 void
382 edge_info::record_simple_equiv (tree lhs, tree rhs)
384 /* If the RHS is a constant, then we may be able to derive
385 further equivalences. Else just record the name = name
386 equivalence. */
387 if (TREE_CODE (rhs) == INTEGER_CST)
388 derive_equivalences (lhs, rhs, 4);
389 else
390 simple_equivalences.safe_push (equiv_pair (lhs, rhs));
393 /* Free the edge_info data attached to E, if it exists. */
395 void
396 free_dom_edge_info (edge e)
398 class edge_info *edge_info = (class edge_info *)e->aux;
400 if (edge_info)
401 delete edge_info;
404 /* Free all EDGE_INFO structures associated with edges in the CFG.
405 If a particular edge can be threaded, copy the redirection
406 target from the EDGE_INFO structure into the edge's AUX field
407 as required by code to update the CFG and SSA graph for
408 jump threading. */
410 static void
411 free_all_edge_infos (void)
413 basic_block bb;
414 edge_iterator ei;
415 edge e;
417 FOR_EACH_BB_FN (bb, cfun)
419 FOR_EACH_EDGE (e, ei, bb->preds)
421 free_dom_edge_info (e);
422 e->aux = NULL;
427 /* We have finished optimizing BB, record any information implied by
428 taking a specific outgoing edge from BB. */
430 static void
431 record_edge_info (basic_block bb)
433 gimple_stmt_iterator gsi = gsi_last_bb (bb);
434 class edge_info *edge_info;
436 if (! gsi_end_p (gsi))
438 gimple *stmt = gsi_stmt (gsi);
439 location_t loc = gimple_location (stmt);
441 if (gimple_code (stmt) == GIMPLE_SWITCH)
443 gswitch *switch_stmt = as_a <gswitch *> (stmt);
444 tree index = gimple_switch_index (switch_stmt);
446 if (TREE_CODE (index) == SSA_NAME)
448 int i;
449 int n_labels = gimple_switch_num_labels (switch_stmt);
450 tree *info = XCNEWVEC (tree, last_basic_block_for_fn (cfun));
451 edge e;
452 edge_iterator ei;
454 for (i = 0; i < n_labels; i++)
456 tree label = gimple_switch_label (switch_stmt, i);
457 basic_block target_bb
458 = label_to_block (cfun, CASE_LABEL (label));
459 if (CASE_HIGH (label)
460 || !CASE_LOW (label)
461 || info[target_bb->index])
462 info[target_bb->index] = error_mark_node;
463 else
464 info[target_bb->index] = label;
467 FOR_EACH_EDGE (e, ei, bb->succs)
469 basic_block target_bb = e->dest;
470 tree label = info[target_bb->index];
472 if (label != NULL && label != error_mark_node)
474 tree x = fold_convert_loc (loc, TREE_TYPE (index),
475 CASE_LOW (label));
476 edge_info = new class edge_info (e);
477 edge_info->record_simple_equiv (index, x);
480 free (info);
484 /* A COND_EXPR may create equivalences too. */
485 if (gimple_code (stmt) == GIMPLE_COND)
487 edge true_edge;
488 edge false_edge;
490 tree op0 = gimple_cond_lhs (stmt);
491 tree op1 = gimple_cond_rhs (stmt);
492 enum tree_code code = gimple_cond_code (stmt);
494 extract_true_false_edges_from_block (bb, &true_edge, &false_edge);
496 /* Special case comparing booleans against a constant as we
497 know the value of OP0 on both arms of the branch. i.e., we
498 can record an equivalence for OP0 rather than COND.
500 However, don't do this if the constant isn't zero or one.
501 Such conditionals will get optimized more thoroughly during
502 the domwalk. */
503 if ((code == EQ_EXPR || code == NE_EXPR)
504 && TREE_CODE (op0) == SSA_NAME
505 && ssa_name_has_boolean_range (op0)
506 && is_gimple_min_invariant (op1)
507 && (integer_zerop (op1) || integer_onep (op1)))
509 tree true_val = constant_boolean_node (true, TREE_TYPE (op0));
510 tree false_val = constant_boolean_node (false, TREE_TYPE (op0));
512 if (code == EQ_EXPR)
514 edge_info = new class edge_info (true_edge);
515 edge_info->record_simple_equiv (op0,
516 (integer_zerop (op1)
517 ? false_val : true_val));
518 edge_info = new class edge_info (false_edge);
519 edge_info->record_simple_equiv (op0,
520 (integer_zerop (op1)
521 ? true_val : false_val));
523 else
525 edge_info = new class edge_info (true_edge);
526 edge_info->record_simple_equiv (op0,
527 (integer_zerop (op1)
528 ? true_val : false_val));
529 edge_info = new class edge_info (false_edge);
530 edge_info->record_simple_equiv (op0,
531 (integer_zerop (op1)
532 ? false_val : true_val));
535 /* This can show up in the IL as a result of copy propagation
536 it will eventually be canonicalized, but we have to cope
537 with this case within the pass. */
538 else if (is_gimple_min_invariant (op0)
539 && TREE_CODE (op1) == SSA_NAME)
541 tree cond = build2 (code, boolean_type_node, op0, op1);
542 tree inverted = invert_truthvalue_loc (loc, cond);
543 bool can_infer_simple_equiv
544 = !(HONOR_SIGNED_ZEROS (op0)
545 && real_zerop (op0));
546 class edge_info *edge_info;
548 edge_info = new class edge_info (true_edge);
549 record_conditions (&edge_info->cond_equivalences, cond, inverted);
551 if (can_infer_simple_equiv && code == EQ_EXPR)
552 edge_info->record_simple_equiv (op1, op0);
554 edge_info = new class edge_info (false_edge);
555 record_conditions (&edge_info->cond_equivalences, inverted, cond);
557 if (can_infer_simple_equiv && TREE_CODE (inverted) == EQ_EXPR)
558 edge_info->record_simple_equiv (op1, op0);
561 else if (TREE_CODE (op0) == SSA_NAME
562 && (TREE_CODE (op1) == SSA_NAME
563 || is_gimple_min_invariant (op1)))
565 tree cond = build2 (code, boolean_type_node, op0, op1);
566 tree inverted = invert_truthvalue_loc (loc, cond);
567 bool can_infer_simple_equiv
568 = !(HONOR_SIGNED_ZEROS (op1)
569 && (TREE_CODE (op1) == SSA_NAME || real_zerop (op1)));
570 class edge_info *edge_info;
572 edge_info = new class edge_info (true_edge);
573 record_conditions (&edge_info->cond_equivalences, cond, inverted);
575 if (can_infer_simple_equiv && code == EQ_EXPR)
576 edge_info->record_simple_equiv (op0, op1);
578 edge_info = new class edge_info (false_edge);
579 record_conditions (&edge_info->cond_equivalences, inverted, cond);
581 if (can_infer_simple_equiv && TREE_CODE (inverted) == EQ_EXPR)
582 edge_info->record_simple_equiv (op0, op1);
588 class dom_jump_threader_simplifier : public jump_threader_simplifier
590 public:
591 dom_jump_threader_simplifier (vr_values *v,
592 avail_exprs_stack *avails)
593 : jump_threader_simplifier (v, avails) {}
595 private:
596 tree simplify (gimple *, gimple *, basic_block);
599 tree
600 dom_jump_threader_simplifier::simplify (gimple *stmt,
601 gimple *within_stmt,
602 basic_block bb)
604 /* First see if the conditional is in the hash table. */
605 tree cached_lhs = m_avail_exprs_stack->lookup_avail_expr (stmt,
606 false, true);
607 if (cached_lhs)
608 return cached_lhs;
610 return jump_threader_simplifier::simplify (stmt, within_stmt, bb);
613 class dom_opt_dom_walker : public dom_walker
615 public:
616 dom_opt_dom_walker (cdi_direction direction,
617 jump_threader *threader,
618 evrp_range_analyzer *analyzer,
619 const_and_copies *const_and_copies,
620 avail_exprs_stack *avail_exprs_stack)
621 : dom_walker (direction, REACHABLE_BLOCKS)
623 m_evrp_range_analyzer = analyzer;
624 m_dummy_cond = gimple_build_cond (NE_EXPR, integer_zero_node,
625 integer_zero_node, NULL, NULL);
626 m_const_and_copies = const_and_copies;
627 m_avail_exprs_stack = avail_exprs_stack;
628 m_threader = threader;
631 virtual edge before_dom_children (basic_block);
632 virtual void after_dom_children (basic_block);
634 private:
636 /* Unwindable equivalences, both const/copy and expression varieties. */
637 class const_and_copies *m_const_and_copies;
638 class avail_exprs_stack *m_avail_exprs_stack;
640 /* Dummy condition to avoid creating lots of throw away statements. */
641 gcond *m_dummy_cond;
643 /* Optimize a single statement within a basic block using the
644 various tables mantained by DOM. Returns the taken edge if
645 the statement is a conditional with a statically determined
646 value. */
647 edge optimize_stmt (basic_block, gimple_stmt_iterator *, bool *);
650 void test_for_singularity (gimple *, avail_exprs_stack *);
652 jump_threader *m_threader;
653 evrp_range_analyzer *m_evrp_range_analyzer;
656 /* Jump threading, redundancy elimination and const/copy propagation.
658 This pass may expose new symbols that need to be renamed into SSA. For
659 every new symbol exposed, its corresponding bit will be set in
660 VARS_TO_RENAME. */
662 namespace {
664 const pass_data pass_data_dominator =
666 GIMPLE_PASS, /* type */
667 "dom", /* name */
668 OPTGROUP_NONE, /* optinfo_flags */
669 TV_TREE_SSA_DOMINATOR_OPTS, /* tv_id */
670 ( PROP_cfg | PROP_ssa ), /* properties_required */
671 0, /* properties_provided */
672 0, /* properties_destroyed */
673 0, /* todo_flags_start */
674 ( TODO_cleanup_cfg | TODO_update_ssa ), /* todo_flags_finish */
677 class pass_dominator : public gimple_opt_pass
679 public:
680 pass_dominator (gcc::context *ctxt)
681 : gimple_opt_pass (pass_data_dominator, ctxt),
682 may_peel_loop_headers_p (false)
685 /* opt_pass methods: */
686 opt_pass * clone () { return new pass_dominator (m_ctxt); }
687 void set_pass_param (unsigned int n, bool param)
689 gcc_assert (n == 0);
690 may_peel_loop_headers_p = param;
692 virtual bool gate (function *) { return flag_tree_dom != 0; }
693 virtual unsigned int execute (function *);
695 private:
696 /* This flag is used to prevent loops from being peeled repeatedly in jump
697 threading; it will be removed once we preserve loop structures throughout
698 the compilation -- we will be able to mark the affected loops directly in
699 jump threading, and avoid peeling them next time. */
700 bool may_peel_loop_headers_p;
701 }; // class pass_dominator
703 unsigned int
704 pass_dominator::execute (function *fun)
706 memset (&opt_stats, 0, sizeof (opt_stats));
708 /* Create our hash tables. */
709 hash_table<expr_elt_hasher> *avail_exprs
710 = new hash_table<expr_elt_hasher> (1024);
711 class avail_exprs_stack *avail_exprs_stack
712 = new class avail_exprs_stack (avail_exprs);
713 class const_and_copies *const_and_copies = new class const_and_copies ();
714 need_eh_cleanup = BITMAP_ALLOC (NULL);
715 need_noreturn_fixup.create (0);
717 calculate_dominance_info (CDI_DOMINATORS);
718 cfg_altered = false;
720 /* We need to know loop structures in order to avoid destroying them
721 in jump threading. Note that we still can e.g. thread through loop
722 headers to an exit edge, or through loop header to the loop body, assuming
723 that we update the loop info.
725 TODO: We don't need to set LOOPS_HAVE_PREHEADERS generally, but due
726 to several overly conservative bail-outs in jump threading, case
727 gcc.dg/tree-ssa/pr21417.c can't be threaded if loop preheader is
728 missing. We should improve jump threading in future then
729 LOOPS_HAVE_PREHEADERS won't be needed here. */
730 loop_optimizer_init (LOOPS_HAVE_PREHEADERS | LOOPS_HAVE_SIMPLE_LATCHES
731 | LOOPS_HAVE_MARKED_IRREDUCIBLE_REGIONS);
733 /* We need accurate information regarding back edges in the CFG
734 for jump threading; this may include back edges that are not part of
735 a single loop. */
736 mark_dfs_back_edges ();
738 /* We want to create the edge info structures before the dominator walk
739 so that they'll be in place for the jump threader, particularly when
740 threading through a join block.
742 The conditions will be lazily updated with global equivalences as
743 we reach them during the dominator walk. */
744 basic_block bb;
745 FOR_EACH_BB_FN (bb, fun)
746 record_edge_info (bb);
748 /* Recursively walk the dominator tree optimizing statements. */
749 evrp_range_analyzer analyzer (true);
750 dom_jump_threader_simplifier simplifier (&analyzer, avail_exprs_stack);
751 jump_threader threader (const_and_copies, avail_exprs_stack,
752 &simplifier, &analyzer);
753 dom_opt_dom_walker walker (CDI_DOMINATORS,
754 &threader,
755 &analyzer,
756 const_and_copies,
757 avail_exprs_stack);
758 walker.walk (fun->cfg->x_entry_block_ptr);
760 /* Look for blocks where we cleared EDGE_EXECUTABLE on an outgoing
761 edge. When found, remove jump threads which contain any outgoing
762 edge from the affected block. */
763 if (cfg_altered)
765 FOR_EACH_BB_FN (bb, fun)
767 edge_iterator ei;
768 edge e;
770 /* First see if there are any edges without EDGE_EXECUTABLE
771 set. */
772 bool found = false;
773 FOR_EACH_EDGE (e, ei, bb->succs)
775 if ((e->flags & EDGE_EXECUTABLE) == 0)
777 found = true;
778 break;
782 /* If there were any such edges found, then remove jump threads
783 containing any edge leaving BB. */
784 if (found)
785 FOR_EACH_EDGE (e, ei, bb->succs)
786 threader.remove_jump_threads_including (e);
791 gimple_stmt_iterator gsi;
792 basic_block bb;
793 FOR_EACH_BB_FN (bb, fun)
795 for (gsi = gsi_start_bb (bb); !gsi_end_p (gsi); gsi_next (&gsi))
796 update_stmt_if_modified (gsi_stmt (gsi));
800 /* If we exposed any new variables, go ahead and put them into
801 SSA form now, before we handle jump threading. This simplifies
802 interactions between rewriting of _DECL nodes into SSA form
803 and rewriting SSA_NAME nodes into SSA form after block
804 duplication and CFG manipulation. */
805 update_ssa (TODO_update_ssa);
807 free_all_edge_infos ();
809 /* Thread jumps, creating duplicate blocks as needed. */
810 cfg_altered |= threader.thread_through_all_blocks (may_peel_loop_headers_p);
812 if (cfg_altered)
813 free_dominance_info (CDI_DOMINATORS);
815 /* Removal of statements may make some EH edges dead. Purge
816 such edges from the CFG as needed. */
817 if (!bitmap_empty_p (need_eh_cleanup))
819 unsigned i;
820 bitmap_iterator bi;
822 /* Jump threading may have created forwarder blocks from blocks
823 needing EH cleanup; the new successor of these blocks, which
824 has inherited from the original block, needs the cleanup.
825 Don't clear bits in the bitmap, as that can break the bitmap
826 iterator. */
827 EXECUTE_IF_SET_IN_BITMAP (need_eh_cleanup, 0, i, bi)
829 basic_block bb = BASIC_BLOCK_FOR_FN (fun, i);
830 if (bb == NULL)
831 continue;
832 while (single_succ_p (bb)
833 && (single_succ_edge (bb)->flags
834 & (EDGE_EH|EDGE_DFS_BACK)) == 0)
835 bb = single_succ (bb);
836 if (bb == EXIT_BLOCK_PTR_FOR_FN (fun))
837 continue;
838 if ((unsigned) bb->index != i)
839 bitmap_set_bit (need_eh_cleanup, bb->index);
842 gimple_purge_all_dead_eh_edges (need_eh_cleanup);
843 bitmap_clear (need_eh_cleanup);
846 /* Fixup stmts that became noreturn calls. This may require splitting
847 blocks and thus isn't possible during the dominator walk or before
848 jump threading finished. Do this in reverse order so we don't
849 inadvertedly remove a stmt we want to fixup by visiting a dominating
850 now noreturn call first. */
851 while (!need_noreturn_fixup.is_empty ())
853 gimple *stmt = need_noreturn_fixup.pop ();
854 if (dump_file && dump_flags & TDF_DETAILS)
856 fprintf (dump_file, "Fixing up noreturn call ");
857 print_gimple_stmt (dump_file, stmt, 0);
858 fprintf (dump_file, "\n");
860 fixup_noreturn_call (stmt);
863 statistics_counter_event (fun, "Redundant expressions eliminated",
864 opt_stats.num_re);
865 statistics_counter_event (fun, "Constants propagated",
866 opt_stats.num_const_prop);
867 statistics_counter_event (fun, "Copies propagated",
868 opt_stats.num_copy_prop);
870 /* Debugging dumps. */
871 if (dump_file && (dump_flags & TDF_STATS))
872 dump_dominator_optimization_stats (dump_file, avail_exprs);
874 loop_optimizer_finalize ();
876 /* Delete our main hashtable. */
877 delete avail_exprs;
878 avail_exprs = NULL;
880 /* Free asserted bitmaps and stacks. */
881 BITMAP_FREE (need_eh_cleanup);
882 need_noreturn_fixup.release ();
883 delete avail_exprs_stack;
884 delete const_and_copies;
886 return 0;
889 } // anon namespace
891 gimple_opt_pass *
892 make_pass_dominator (gcc::context *ctxt)
894 return new pass_dominator (ctxt);
897 /* Valueize hook for gimple_fold_stmt_to_constant_1. */
899 static tree
900 dom_valueize (tree t)
902 if (TREE_CODE (t) == SSA_NAME)
904 tree tem = SSA_NAME_VALUE (t);
905 if (tem)
906 return tem;
908 return t;
911 /* We have just found an equivalence for LHS on an edge E.
912 Look backwards to other uses of LHS and see if we can derive
913 additional equivalences that are valid on edge E. */
914 static void
915 back_propagate_equivalences (tree lhs, edge e,
916 class const_and_copies *const_and_copies)
918 use_operand_p use_p;
919 imm_use_iterator iter;
920 bitmap domby = NULL;
921 basic_block dest = e->dest;
923 /* Iterate over the uses of LHS to see if any dominate E->dest.
924 If so, they may create useful equivalences too.
926 ??? If the code gets re-organized to a worklist to catch more
927 indirect opportunities and it is made to handle PHIs then this
928 should only consider use_stmts in basic-blocks we have already visited. */
929 FOR_EACH_IMM_USE_FAST (use_p, iter, lhs)
931 gimple *use_stmt = USE_STMT (use_p);
933 /* Often the use is in DEST, which we trivially know we can't use.
934 This is cheaper than the dominator set tests below. */
935 if (dest == gimple_bb (use_stmt))
936 continue;
938 /* Filter out statements that can never produce a useful
939 equivalence. */
940 tree lhs2 = gimple_get_lhs (use_stmt);
941 if (!lhs2 || TREE_CODE (lhs2) != SSA_NAME)
942 continue;
944 /* Profiling has shown the domination tests here can be fairly
945 expensive. We get significant improvements by building the
946 set of blocks that dominate BB. We can then just test
947 for set membership below.
949 We also initialize the set lazily since often the only uses
950 are going to be in the same block as DEST. */
951 if (!domby)
953 domby = BITMAP_ALLOC (NULL);
954 basic_block bb = get_immediate_dominator (CDI_DOMINATORS, dest);
955 while (bb)
957 bitmap_set_bit (domby, bb->index);
958 bb = get_immediate_dominator (CDI_DOMINATORS, bb);
962 /* This tests if USE_STMT does not dominate DEST. */
963 if (!bitmap_bit_p (domby, gimple_bb (use_stmt)->index))
964 continue;
966 /* At this point USE_STMT dominates DEST and may result in a
967 useful equivalence. Try to simplify its RHS to a constant
968 or SSA_NAME. */
969 tree res = gimple_fold_stmt_to_constant_1 (use_stmt, dom_valueize,
970 no_follow_ssa_edges);
971 if (res && (TREE_CODE (res) == SSA_NAME || is_gimple_min_invariant (res)))
972 record_equality (lhs2, res, const_and_copies);
975 if (domby)
976 BITMAP_FREE (domby);
979 /* Record into CONST_AND_COPIES and AVAIL_EXPRS_STACK any equivalences implied
980 by traversing edge E (which are cached in E->aux).
982 Callers are responsible for managing the unwinding markers. */
983 void
984 record_temporary_equivalences (edge e,
985 class const_and_copies *const_and_copies,
986 class avail_exprs_stack *avail_exprs_stack)
988 int i;
989 class edge_info *edge_info = (class edge_info *) e->aux;
991 /* If we have info associated with this edge, record it into
992 our equivalence tables. */
993 if (edge_info)
995 cond_equivalence *eq;
996 /* If we have 0 = COND or 1 = COND equivalences, record them
997 into our expression hash tables. */
998 for (i = 0; edge_info->cond_equivalences.iterate (i, &eq); ++i)
999 avail_exprs_stack->record_cond (eq);
1001 edge_info::equiv_pair *seq;
1002 for (i = 0; edge_info->simple_equivalences.iterate (i, &seq); ++i)
1004 tree lhs = seq->first;
1005 if (!lhs || TREE_CODE (lhs) != SSA_NAME)
1006 continue;
1008 /* Record the simple NAME = VALUE equivalence. */
1009 tree rhs = seq->second;
1011 /* If this is a SSA_NAME = SSA_NAME equivalence and one operand is
1012 cheaper to compute than the other, then set up the equivalence
1013 such that we replace the expensive one with the cheap one.
1015 If they are the same cost to compute, then do not record
1016 anything. */
1017 if (TREE_CODE (lhs) == SSA_NAME && TREE_CODE (rhs) == SSA_NAME)
1019 gimple *rhs_def = SSA_NAME_DEF_STMT (rhs);
1020 int rhs_cost = estimate_num_insns (rhs_def, &eni_size_weights);
1022 gimple *lhs_def = SSA_NAME_DEF_STMT (lhs);
1023 int lhs_cost = estimate_num_insns (lhs_def, &eni_size_weights);
1025 if (rhs_cost > lhs_cost)
1026 record_equality (rhs, lhs, const_and_copies);
1027 else if (rhs_cost < lhs_cost)
1028 record_equality (lhs, rhs, const_and_copies);
1030 else
1031 record_equality (lhs, rhs, const_and_copies);
1034 /* Any equivalence found for LHS may result in additional
1035 equivalences for other uses of LHS that we have already
1036 processed. */
1037 back_propagate_equivalences (lhs, e, const_and_copies);
1042 /* PHI nodes can create equivalences too.
1044 Ignoring any alternatives which are the same as the result, if
1045 all the alternatives are equal, then the PHI node creates an
1046 equivalence. */
1048 static void
1049 record_equivalences_from_phis (basic_block bb)
1051 gphi_iterator gsi;
1053 for (gsi = gsi_start_phis (bb); !gsi_end_p (gsi); )
1055 gphi *phi = gsi.phi ();
1057 /* We might eliminate the PHI, so advance GSI now. */
1058 gsi_next (&gsi);
1060 tree lhs = gimple_phi_result (phi);
1061 tree rhs = NULL;
1062 size_t i;
1064 for (i = 0; i < gimple_phi_num_args (phi); i++)
1066 tree t = gimple_phi_arg_def (phi, i);
1068 /* Ignore alternatives which are the same as our LHS. Since
1069 LHS is a PHI_RESULT, it is known to be a SSA_NAME, so we
1070 can simply compare pointers. */
1071 if (lhs == t)
1072 continue;
1074 /* If the associated edge is not marked as executable, then it
1075 can be ignored. */
1076 if ((gimple_phi_arg_edge (phi, i)->flags & EDGE_EXECUTABLE) == 0)
1077 continue;
1079 t = dom_valueize (t);
1081 /* If T is an SSA_NAME and its associated edge is a backedge,
1082 then quit as we cannot utilize this equivalence. */
1083 if (TREE_CODE (t) == SSA_NAME
1084 && (gimple_phi_arg_edge (phi, i)->flags & EDGE_DFS_BACK))
1085 break;
1087 /* If we have not processed an alternative yet, then set
1088 RHS to this alternative. */
1089 if (rhs == NULL)
1090 rhs = t;
1091 /* If we have processed an alternative (stored in RHS), then
1092 see if it is equal to this one. If it isn't, then stop
1093 the search. */
1094 else if (! operand_equal_for_phi_arg_p (rhs, t))
1095 break;
1098 /* If we had no interesting alternatives, then all the RHS alternatives
1099 must have been the same as LHS. */
1100 if (!rhs)
1101 rhs = lhs;
1103 /* If we managed to iterate through each PHI alternative without
1104 breaking out of the loop, then we have a PHI which may create
1105 a useful equivalence. We do not need to record unwind data for
1106 this, since this is a true assignment and not an equivalence
1107 inferred from a comparison. All uses of this ssa name are dominated
1108 by this assignment, so unwinding just costs time and space. */
1109 if (i == gimple_phi_num_args (phi))
1111 if (may_propagate_copy (lhs, rhs))
1112 set_ssa_name_value (lhs, rhs);
1113 else if (virtual_operand_p (lhs))
1115 gimple *use_stmt;
1116 imm_use_iterator iter;
1117 use_operand_p use_p;
1118 /* For virtual operands we have to propagate into all uses as
1119 otherwise we will create overlapping life-ranges. */
1120 FOR_EACH_IMM_USE_STMT (use_stmt, iter, lhs)
1121 FOR_EACH_IMM_USE_ON_STMT (use_p, iter)
1122 SET_USE (use_p, rhs);
1123 if (SSA_NAME_OCCURS_IN_ABNORMAL_PHI (lhs))
1124 SSA_NAME_OCCURS_IN_ABNORMAL_PHI (rhs) = 1;
1125 gimple_stmt_iterator tmp_gsi = gsi_for_stmt (phi);
1126 remove_phi_node (&tmp_gsi, true);
1132 /* Record any equivalences created by the incoming edge to BB into
1133 CONST_AND_COPIES and AVAIL_EXPRS_STACK. If BB has more than one
1134 incoming edge, then no equivalence is created. */
1136 static void
1137 record_equivalences_from_incoming_edge (basic_block bb,
1138 class const_and_copies *const_and_copies,
1139 class avail_exprs_stack *avail_exprs_stack)
1141 edge e;
1142 basic_block parent;
1144 /* If our parent block ended with a control statement, then we may be
1145 able to record some equivalences based on which outgoing edge from
1146 the parent was followed. */
1147 parent = get_immediate_dominator (CDI_DOMINATORS, bb);
1149 e = single_pred_edge_ignoring_loop_edges (bb, true);
1151 /* If we had a single incoming edge from our parent block, then enter
1152 any data associated with the edge into our tables. */
1153 if (e && e->src == parent)
1154 record_temporary_equivalences (e, const_and_copies, avail_exprs_stack);
1157 /* Dump statistics for the hash table HTAB. */
1159 static void
1160 htab_statistics (FILE *file, const hash_table<expr_elt_hasher> &htab)
1162 fprintf (file, "size %ld, %ld elements, %f collision/search ratio\n",
1163 (long) htab.size (),
1164 (long) htab.elements (),
1165 htab.collisions ());
1168 /* Dump SSA statistics on FILE. */
1170 static void
1171 dump_dominator_optimization_stats (FILE *file,
1172 hash_table<expr_elt_hasher> *avail_exprs)
1174 fprintf (file, "Total number of statements: %6ld\n\n",
1175 opt_stats.num_stmts);
1176 fprintf (file, "Exprs considered for dominator optimizations: %6ld\n",
1177 opt_stats.num_exprs_considered);
1179 fprintf (file, "\nHash table statistics:\n");
1181 fprintf (file, " avail_exprs: ");
1182 htab_statistics (file, *avail_exprs);
1186 /* Similarly, but assume that X and Y are the two operands of an EQ_EXPR.
1187 This constrains the cases in which we may treat this as assignment. */
1189 static void
1190 record_equality (tree x, tree y, class const_and_copies *const_and_copies)
1192 tree prev_x = NULL, prev_y = NULL;
1194 if (tree_swap_operands_p (x, y))
1195 std::swap (x, y);
1197 /* Most of the time tree_swap_operands_p does what we want. But there
1198 are cases where we know one operand is better for copy propagation than
1199 the other. Given no other code cares about ordering of equality
1200 comparison operators for that purpose, we just handle the special cases
1201 here. */
1202 if (TREE_CODE (x) == SSA_NAME && TREE_CODE (y) == SSA_NAME)
1204 /* If one operand is a single use operand, then make it
1205 X. This will preserve its single use properly and if this
1206 conditional is eliminated, the computation of X can be
1207 eliminated as well. */
1208 if (has_single_use (y) && ! has_single_use (x))
1209 std::swap (x, y);
1211 if (TREE_CODE (x) == SSA_NAME)
1212 prev_x = SSA_NAME_VALUE (x);
1213 if (TREE_CODE (y) == SSA_NAME)
1214 prev_y = SSA_NAME_VALUE (y);
1216 /* If one of the previous values is invariant, or invariant in more loops
1217 (by depth), then use that.
1218 Otherwise it doesn't matter which value we choose, just so
1219 long as we canonicalize on one value. */
1220 if (is_gimple_min_invariant (y))
1222 else if (is_gimple_min_invariant (x))
1223 prev_x = x, x = y, y = prev_x, prev_x = prev_y;
1224 else if (prev_x && is_gimple_min_invariant (prev_x))
1225 x = y, y = prev_x, prev_x = prev_y;
1226 else if (prev_y)
1227 y = prev_y;
1229 /* After the swapping, we must have one SSA_NAME. */
1230 if (TREE_CODE (x) != SSA_NAME)
1231 return;
1233 /* For IEEE, -0.0 == 0.0, so we don't necessarily know the sign of a
1234 variable compared against zero. If we're honoring signed zeros,
1235 then we cannot record this value unless we know that the value is
1236 nonzero. */
1237 if (HONOR_SIGNED_ZEROS (x)
1238 && (TREE_CODE (y) != REAL_CST
1239 || real_equal (&dconst0, &TREE_REAL_CST (y))))
1240 return;
1242 const_and_copies->record_const_or_copy (x, y, prev_x);
1245 /* Returns true when STMT is a simple iv increment. It detects the
1246 following situation:
1248 i_1 = phi (..., i_k)
1249 [...]
1250 i_j = i_{j-1} for each j : 2 <= j <= k-1
1251 [...]
1252 i_k = i_{k-1} +/- ... */
1254 bool
1255 simple_iv_increment_p (gimple *stmt)
1257 enum tree_code code;
1258 tree lhs, preinc;
1259 gimple *phi;
1260 size_t i;
1262 if (gimple_code (stmt) != GIMPLE_ASSIGN)
1263 return false;
1265 lhs = gimple_assign_lhs (stmt);
1266 if (TREE_CODE (lhs) != SSA_NAME)
1267 return false;
1269 code = gimple_assign_rhs_code (stmt);
1270 if (code != PLUS_EXPR
1271 && code != MINUS_EXPR
1272 && code != POINTER_PLUS_EXPR)
1273 return false;
1275 preinc = gimple_assign_rhs1 (stmt);
1276 if (TREE_CODE (preinc) != SSA_NAME)
1277 return false;
1279 phi = SSA_NAME_DEF_STMT (preinc);
1280 while (gimple_code (phi) != GIMPLE_PHI)
1282 /* Follow trivial copies, but not the DEF used in a back edge,
1283 so that we don't prevent coalescing. */
1284 if (!gimple_assign_ssa_name_copy_p (phi))
1285 return false;
1286 preinc = gimple_assign_rhs1 (phi);
1287 phi = SSA_NAME_DEF_STMT (preinc);
1290 for (i = 0; i < gimple_phi_num_args (phi); i++)
1291 if (gimple_phi_arg_def (phi, i) == lhs)
1292 return true;
1294 return false;
1297 /* Propagate know values from SSA_NAME_VALUE into the PHI nodes of the
1298 successors of BB. */
1300 static void
1301 cprop_into_successor_phis (basic_block bb,
1302 class const_and_copies *const_and_copies)
1304 edge e;
1305 edge_iterator ei;
1307 FOR_EACH_EDGE (e, ei, bb->succs)
1309 int indx;
1310 gphi_iterator gsi;
1312 /* If this is an abnormal edge, then we do not want to copy propagate
1313 into the PHI alternative associated with this edge. */
1314 if (e->flags & EDGE_ABNORMAL)
1315 continue;
1317 gsi = gsi_start_phis (e->dest);
1318 if (gsi_end_p (gsi))
1319 continue;
1321 /* We may have an equivalence associated with this edge. While
1322 we cannot propagate it into non-dominated blocks, we can
1323 propagate them into PHIs in non-dominated blocks. */
1325 /* Push the unwind marker so we can reset the const and copies
1326 table back to its original state after processing this edge. */
1327 const_and_copies->push_marker ();
1329 /* Extract and record any simple NAME = VALUE equivalences.
1331 Don't bother with [01] = COND equivalences, they're not useful
1332 here. */
1333 class edge_info *edge_info = (class edge_info *) e->aux;
1335 if (edge_info)
1337 edge_info::equiv_pair *seq;
1338 for (int i = 0; edge_info->simple_equivalences.iterate (i, &seq); ++i)
1340 tree lhs = seq->first;
1341 tree rhs = seq->second;
1343 if (lhs && TREE_CODE (lhs) == SSA_NAME)
1344 const_and_copies->record_const_or_copy (lhs, rhs);
1349 indx = e->dest_idx;
1350 for ( ; !gsi_end_p (gsi); gsi_next (&gsi))
1352 tree new_val;
1353 use_operand_p orig_p;
1354 tree orig_val;
1355 gphi *phi = gsi.phi ();
1357 /* The alternative may be associated with a constant, so verify
1358 it is an SSA_NAME before doing anything with it. */
1359 orig_p = gimple_phi_arg_imm_use_ptr (phi, indx);
1360 orig_val = get_use_from_ptr (orig_p);
1361 if (TREE_CODE (orig_val) != SSA_NAME)
1362 continue;
1364 /* If we have *ORIG_P in our constant/copy table, then replace
1365 ORIG_P with its value in our constant/copy table. */
1366 new_val = SSA_NAME_VALUE (orig_val);
1367 if (new_val
1368 && new_val != orig_val
1369 && may_propagate_copy (orig_val, new_val))
1370 propagate_value (orig_p, new_val);
1373 const_and_copies->pop_to_marker ();
1377 edge
1378 dom_opt_dom_walker::before_dom_children (basic_block bb)
1380 gimple_stmt_iterator gsi;
1382 if (dump_file && (dump_flags & TDF_DETAILS))
1383 fprintf (dump_file, "\n\nOptimizing block #%d\n\n", bb->index);
1385 m_evrp_range_analyzer->enter (bb);
1387 /* Push a marker on the stacks of local information so that we know how
1388 far to unwind when we finalize this block. */
1389 m_avail_exprs_stack->push_marker ();
1390 m_const_and_copies->push_marker ();
1392 record_equivalences_from_incoming_edge (bb, m_const_and_copies,
1393 m_avail_exprs_stack);
1395 /* PHI nodes can create equivalences too. */
1396 record_equivalences_from_phis (bb);
1398 /* Create equivalences from redundant PHIs. PHIs are only truly
1399 redundant when they exist in the same block, so push another
1400 marker and unwind right afterwards. */
1401 m_avail_exprs_stack->push_marker ();
1402 for (gsi = gsi_start_phis (bb); !gsi_end_p (gsi); gsi_next (&gsi))
1403 eliminate_redundant_computations (&gsi, m_const_and_copies,
1404 m_avail_exprs_stack);
1405 m_avail_exprs_stack->pop_to_marker ();
1407 edge taken_edge = NULL;
1408 /* Initialize visited flag ahead of us, it has undefined state on
1409 pass entry. */
1410 for (gsi = gsi_start_bb (bb); !gsi_end_p (gsi); gsi_next (&gsi))
1411 gimple_set_visited (gsi_stmt (gsi), false);
1412 for (gsi = gsi_start_bb (bb); !gsi_end_p (gsi);)
1414 /* Do not optimize a stmt twice, substitution might end up with
1415 _3 = _3 which is not valid. */
1416 if (gimple_visited_p (gsi_stmt (gsi)))
1418 gsi_next (&gsi);
1419 continue;
1422 /* Compute range information and optimize the stmt. */
1423 m_evrp_range_analyzer->record_ranges_from_stmt (gsi_stmt (gsi), false);
1424 bool removed_p = false;
1425 taken_edge = this->optimize_stmt (bb, &gsi, &removed_p);
1426 if (!removed_p)
1427 gimple_set_visited (gsi_stmt (gsi), true);
1429 /* Go back and visit stmts inserted by folding after substituting
1430 into the stmt at gsi. */
1431 if (gsi_end_p (gsi))
1433 gcc_checking_assert (removed_p);
1434 gsi = gsi_last_bb (bb);
1435 while (!gsi_end_p (gsi) && !gimple_visited_p (gsi_stmt (gsi)))
1436 gsi_prev (&gsi);
1438 else
1442 gsi_prev (&gsi);
1444 while (!gsi_end_p (gsi) && !gimple_visited_p (gsi_stmt (gsi)));
1446 if (gsi_end_p (gsi))
1447 gsi = gsi_start_bb (bb);
1448 else
1449 gsi_next (&gsi);
1452 /* Now prepare to process dominated blocks. */
1453 record_edge_info (bb);
1454 cprop_into_successor_phis (bb, m_const_and_copies);
1455 if (taken_edge && !dbg_cnt (dom_unreachable_edges))
1456 return NULL;
1458 return taken_edge;
1461 /* We have finished processing the dominator children of BB, perform
1462 any finalization actions in preparation for leaving this node in
1463 the dominator tree. */
1465 void
1466 dom_opt_dom_walker::after_dom_children (basic_block bb)
1468 m_threader->thread_outgoing_edges (bb);
1469 m_avail_exprs_stack->pop_to_marker ();
1470 m_const_and_copies->pop_to_marker ();
1471 m_evrp_range_analyzer->leave (bb);
1474 /* Search for redundant computations in STMT. If any are found, then
1475 replace them with the variable holding the result of the computation.
1477 If safe, record this expression into AVAIL_EXPRS_STACK and
1478 CONST_AND_COPIES. */
1480 static void
1481 eliminate_redundant_computations (gimple_stmt_iterator* gsi,
1482 class const_and_copies *const_and_copies,
1483 class avail_exprs_stack *avail_exprs_stack)
1485 tree expr_type;
1486 tree cached_lhs;
1487 tree def;
1488 bool insert = true;
1489 bool assigns_var_p = false;
1491 gimple *stmt = gsi_stmt (*gsi);
1493 if (gimple_code (stmt) == GIMPLE_PHI)
1494 def = gimple_phi_result (stmt);
1495 else
1496 def = gimple_get_lhs (stmt);
1498 /* Certain expressions on the RHS can be optimized away, but cannot
1499 themselves be entered into the hash tables. */
1500 if (! def
1501 || TREE_CODE (def) != SSA_NAME
1502 || SSA_NAME_OCCURS_IN_ABNORMAL_PHI (def)
1503 || gimple_vdef (stmt)
1504 /* Do not record equivalences for increments of ivs. This would create
1505 overlapping live ranges for a very questionable gain. */
1506 || simple_iv_increment_p (stmt))
1507 insert = false;
1509 /* Check if the expression has been computed before. */
1510 cached_lhs = avail_exprs_stack->lookup_avail_expr (stmt, insert, true);
1512 opt_stats.num_exprs_considered++;
1514 /* Get the type of the expression we are trying to optimize. */
1515 if (is_gimple_assign (stmt))
1517 expr_type = TREE_TYPE (gimple_assign_lhs (stmt));
1518 assigns_var_p = true;
1520 else if (gimple_code (stmt) == GIMPLE_COND)
1521 expr_type = boolean_type_node;
1522 else if (is_gimple_call (stmt))
1524 gcc_assert (gimple_call_lhs (stmt));
1525 expr_type = TREE_TYPE (gimple_call_lhs (stmt));
1526 assigns_var_p = true;
1528 else if (gswitch *swtch_stmt = dyn_cast <gswitch *> (stmt))
1529 expr_type = TREE_TYPE (gimple_switch_index (swtch_stmt));
1530 else if (gimple_code (stmt) == GIMPLE_PHI)
1531 /* We can't propagate into a phi, so the logic below doesn't apply.
1532 Instead record an equivalence between the cached LHS and the
1533 PHI result of this statement, provided they are in the same block.
1534 This should be sufficient to kill the redundant phi. */
1536 if (def && cached_lhs)
1537 const_and_copies->record_const_or_copy (def, cached_lhs);
1538 return;
1540 else
1541 gcc_unreachable ();
1543 if (!cached_lhs)
1544 return;
1546 /* It is safe to ignore types here since we have already done
1547 type checking in the hashing and equality routines. In fact
1548 type checking here merely gets in the way of constant
1549 propagation. Also, make sure that it is safe to propagate
1550 CACHED_LHS into the expression in STMT. */
1551 if ((TREE_CODE (cached_lhs) != SSA_NAME
1552 && (assigns_var_p
1553 || useless_type_conversion_p (expr_type, TREE_TYPE (cached_lhs))))
1554 || may_propagate_copy_into_stmt (stmt, cached_lhs))
1556 gcc_checking_assert (TREE_CODE (cached_lhs) == SSA_NAME
1557 || is_gimple_min_invariant (cached_lhs));
1559 if (dump_file && (dump_flags & TDF_DETAILS))
1561 fprintf (dump_file, " Replaced redundant expr '");
1562 print_gimple_expr (dump_file, stmt, 0, dump_flags);
1563 fprintf (dump_file, "' with '");
1564 print_generic_expr (dump_file, cached_lhs, dump_flags);
1565 fprintf (dump_file, "'\n");
1568 opt_stats.num_re++;
1570 if (assigns_var_p
1571 && !useless_type_conversion_p (expr_type, TREE_TYPE (cached_lhs)))
1572 cached_lhs = fold_convert (expr_type, cached_lhs);
1574 propagate_tree_value_into_stmt (gsi, cached_lhs);
1576 /* Since it is always necessary to mark the result as modified,
1577 perhaps we should move this into propagate_tree_value_into_stmt
1578 itself. */
1579 gimple_set_modified (gsi_stmt (*gsi), true);
1583 /* STMT, a GIMPLE_ASSIGN, may create certain equivalences, in either
1584 the available expressions table or the const_and_copies table.
1585 Detect and record those equivalences into AVAIL_EXPRS_STACK.
1587 We handle only very simple copy equivalences here. The heavy
1588 lifing is done by eliminate_redundant_computations. */
1590 static void
1591 record_equivalences_from_stmt (gimple *stmt, int may_optimize_p,
1592 class avail_exprs_stack *avail_exprs_stack)
1594 tree lhs;
1595 enum tree_code lhs_code;
1597 gcc_assert (is_gimple_assign (stmt));
1599 lhs = gimple_assign_lhs (stmt);
1600 lhs_code = TREE_CODE (lhs);
1602 if (lhs_code == SSA_NAME
1603 && gimple_assign_single_p (stmt))
1605 tree rhs = gimple_assign_rhs1 (stmt);
1607 /* If the RHS of the assignment is a constant or another variable that
1608 may be propagated, register it in the CONST_AND_COPIES table. We
1609 do not need to record unwind data for this, since this is a true
1610 assignment and not an equivalence inferred from a comparison. All
1611 uses of this ssa name are dominated by this assignment, so unwinding
1612 just costs time and space. */
1613 if (may_optimize_p
1614 && (TREE_CODE (rhs) == SSA_NAME
1615 || is_gimple_min_invariant (rhs)))
1617 rhs = dom_valueize (rhs);
1619 if (dump_file && (dump_flags & TDF_DETAILS))
1621 fprintf (dump_file, "==== ASGN ");
1622 print_generic_expr (dump_file, lhs);
1623 fprintf (dump_file, " = ");
1624 print_generic_expr (dump_file, rhs);
1625 fprintf (dump_file, "\n");
1628 set_ssa_name_value (lhs, rhs);
1632 /* Make sure we can propagate &x + CST. */
1633 if (lhs_code == SSA_NAME
1634 && gimple_assign_rhs_code (stmt) == POINTER_PLUS_EXPR
1635 && TREE_CODE (gimple_assign_rhs1 (stmt)) == ADDR_EXPR
1636 && TREE_CODE (gimple_assign_rhs2 (stmt)) == INTEGER_CST)
1638 tree op0 = gimple_assign_rhs1 (stmt);
1639 tree op1 = gimple_assign_rhs2 (stmt);
1640 tree new_rhs
1641 = build1 (ADDR_EXPR, TREE_TYPE (op0),
1642 fold_build2 (MEM_REF, TREE_TYPE (TREE_TYPE (op0)),
1643 unshare_expr (op0), fold_convert (ptr_type_node,
1644 op1)));
1645 if (dump_file && (dump_flags & TDF_DETAILS))
1647 fprintf (dump_file, "==== ASGN ");
1648 print_generic_expr (dump_file, lhs);
1649 fprintf (dump_file, " = ");
1650 print_generic_expr (dump_file, new_rhs);
1651 fprintf (dump_file, "\n");
1654 set_ssa_name_value (lhs, new_rhs);
1657 /* A memory store, even an aliased store, creates a useful
1658 equivalence. By exchanging the LHS and RHS, creating suitable
1659 vops and recording the result in the available expression table,
1660 we may be able to expose more redundant loads. */
1661 if (!gimple_has_volatile_ops (stmt)
1662 && gimple_references_memory_p (stmt)
1663 && gimple_assign_single_p (stmt)
1664 && (TREE_CODE (gimple_assign_rhs1 (stmt)) == SSA_NAME
1665 || is_gimple_min_invariant (gimple_assign_rhs1 (stmt)))
1666 && !is_gimple_reg (lhs))
1668 tree rhs = gimple_assign_rhs1 (stmt);
1669 gassign *new_stmt;
1671 /* Build a new statement with the RHS and LHS exchanged. */
1672 if (TREE_CODE (rhs) == SSA_NAME)
1674 /* NOTE tuples. The call to gimple_build_assign below replaced
1675 a call to build_gimple_modify_stmt, which did not set the
1676 SSA_NAME_DEF_STMT on the LHS of the assignment. Doing so
1677 may cause an SSA validation failure, as the LHS may be a
1678 default-initialized name and should have no definition. I'm
1679 a bit dubious of this, as the artificial statement that we
1680 generate here may in fact be ill-formed, but it is simply
1681 used as an internal device in this pass, and never becomes
1682 part of the CFG. */
1683 gimple *defstmt = SSA_NAME_DEF_STMT (rhs);
1684 new_stmt = gimple_build_assign (rhs, lhs);
1685 SSA_NAME_DEF_STMT (rhs) = defstmt;
1687 else
1688 new_stmt = gimple_build_assign (rhs, lhs);
1690 gimple_set_vuse (new_stmt, gimple_vdef (stmt));
1692 /* Finally enter the statement into the available expression
1693 table. */
1694 avail_exprs_stack->lookup_avail_expr (new_stmt, true, true);
1698 /* Replace *OP_P in STMT with any known equivalent value for *OP_P from
1699 CONST_AND_COPIES. */
1701 static void
1702 cprop_operand (gimple *stmt, use_operand_p op_p, vr_values *vr_values)
1704 tree val;
1705 tree op = USE_FROM_PTR (op_p);
1707 /* If the operand has a known constant value or it is known to be a
1708 copy of some other variable, use the value or copy stored in
1709 CONST_AND_COPIES. */
1710 val = SSA_NAME_VALUE (op);
1711 if (!val)
1712 val = vr_values->op_with_constant_singleton_value_range (op);
1714 if (val && val != op)
1716 /* Do not replace hard register operands in asm statements. */
1717 if (gimple_code (stmt) == GIMPLE_ASM
1718 && !may_propagate_copy_into_asm (op))
1719 return;
1721 /* Certain operands are not allowed to be copy propagated due
1722 to their interaction with exception handling and some GCC
1723 extensions. */
1724 if (!may_propagate_copy (op, val))
1725 return;
1727 /* Do not propagate copies into BIVs.
1728 See PR23821 and PR62217 for how this can disturb IV and
1729 number of iteration analysis. */
1730 if (TREE_CODE (val) != INTEGER_CST)
1732 gimple *def = SSA_NAME_DEF_STMT (op);
1733 if (gimple_code (def) == GIMPLE_PHI
1734 && gimple_bb (def)->loop_father->header == gimple_bb (def))
1735 return;
1738 /* Dump details. */
1739 if (dump_file && (dump_flags & TDF_DETAILS))
1741 fprintf (dump_file, " Replaced '");
1742 print_generic_expr (dump_file, op, dump_flags);
1743 fprintf (dump_file, "' with %s '",
1744 (TREE_CODE (val) != SSA_NAME ? "constant" : "variable"));
1745 print_generic_expr (dump_file, val, dump_flags);
1746 fprintf (dump_file, "'\n");
1749 if (TREE_CODE (val) != SSA_NAME)
1750 opt_stats.num_const_prop++;
1751 else
1752 opt_stats.num_copy_prop++;
1754 propagate_value (op_p, val);
1756 /* And note that we modified this statement. This is now
1757 safe, even if we changed virtual operands since we will
1758 rescan the statement and rewrite its operands again. */
1759 gimple_set_modified (stmt, true);
1763 /* CONST_AND_COPIES is a table which maps an SSA_NAME to the current
1764 known value for that SSA_NAME (or NULL if no value is known).
1766 Propagate values from CONST_AND_COPIES into the uses, vuses and
1767 vdef_ops of STMT. */
1769 static void
1770 cprop_into_stmt (gimple *stmt, vr_values *vr_values)
1772 use_operand_p op_p;
1773 ssa_op_iter iter;
1774 tree last_copy_propagated_op = NULL;
1776 FOR_EACH_SSA_USE_OPERAND (op_p, stmt, iter, SSA_OP_USE)
1778 tree old_op = USE_FROM_PTR (op_p);
1780 /* If we have A = B and B = A in the copy propagation tables
1781 (due to an equality comparison), avoid substituting B for A
1782 then A for B in the trivially discovered cases. This allows
1783 optimization of statements were A and B appear as input
1784 operands. */
1785 if (old_op != last_copy_propagated_op)
1787 cprop_operand (stmt, op_p, vr_values);
1789 tree new_op = USE_FROM_PTR (op_p);
1790 if (new_op != old_op && TREE_CODE (new_op) == SSA_NAME)
1791 last_copy_propagated_op = new_op;
1796 /* If STMT contains a relational test, try to convert it into an
1797 equality test if there is only a single value which can ever
1798 make the test true.
1800 For example, if the expression hash table contains:
1802 TRUE = (i <= 1)
1804 And we have a test within statement of i >= 1, then we can safely
1805 rewrite the test as i == 1 since there only a single value where
1806 the test is true.
1808 This is similar to code in VRP. */
1810 void
1811 dom_opt_dom_walker::test_for_singularity (gimple *stmt,
1812 avail_exprs_stack *avail_exprs_stack)
1814 /* We want to support gimple conditionals as well as assignments
1815 where the RHS contains a conditional. */
1816 if (is_gimple_assign (stmt) || gimple_code (stmt) == GIMPLE_COND)
1818 enum tree_code code = ERROR_MARK;
1819 tree lhs, rhs;
1821 /* Extract the condition of interest from both forms we support. */
1822 if (is_gimple_assign (stmt))
1824 code = gimple_assign_rhs_code (stmt);
1825 lhs = gimple_assign_rhs1 (stmt);
1826 rhs = gimple_assign_rhs2 (stmt);
1828 else if (gimple_code (stmt) == GIMPLE_COND)
1830 code = gimple_cond_code (as_a <gcond *> (stmt));
1831 lhs = gimple_cond_lhs (as_a <gcond *> (stmt));
1832 rhs = gimple_cond_rhs (as_a <gcond *> (stmt));
1835 /* We're looking for a relational test using LE/GE. Also note we can
1836 canonicalize LT/GT tests against constants into LE/GT tests. */
1837 if (code == LE_EXPR || code == GE_EXPR
1838 || ((code == LT_EXPR || code == GT_EXPR)
1839 && TREE_CODE (rhs) == INTEGER_CST))
1841 /* For LT_EXPR and GT_EXPR, canonicalize to LE_EXPR and GE_EXPR. */
1842 if (code == LT_EXPR)
1843 rhs = fold_build2 (MINUS_EXPR, TREE_TYPE (rhs),
1844 rhs, build_int_cst (TREE_TYPE (rhs), 1));
1846 if (code == GT_EXPR)
1847 rhs = fold_build2 (PLUS_EXPR, TREE_TYPE (rhs),
1848 rhs, build_int_cst (TREE_TYPE (rhs), 1));
1850 /* Determine the code we want to check for in the hash table. */
1851 enum tree_code test_code;
1852 if (code == GE_EXPR || code == GT_EXPR)
1853 test_code = LE_EXPR;
1854 else
1855 test_code = GE_EXPR;
1857 /* Update the dummy statement so we can query the hash tables. */
1858 gimple_cond_set_code (m_dummy_cond, test_code);
1859 gimple_cond_set_lhs (m_dummy_cond, lhs);
1860 gimple_cond_set_rhs (m_dummy_cond, rhs);
1861 tree cached_lhs
1862 = avail_exprs_stack->lookup_avail_expr (m_dummy_cond,
1863 false, false);
1865 /* If the lookup returned 1 (true), then the expression we
1866 queried was in the hash table. As a result there is only
1867 one value that makes the original conditional true. Update
1868 STMT accordingly. */
1869 if (cached_lhs && integer_onep (cached_lhs))
1871 if (is_gimple_assign (stmt))
1873 gimple_assign_set_rhs_code (stmt, EQ_EXPR);
1874 gimple_assign_set_rhs2 (stmt, rhs);
1875 gimple_set_modified (stmt, true);
1877 else
1879 gimple_set_modified (stmt, true);
1880 gimple_cond_set_code (as_a <gcond *> (stmt), EQ_EXPR);
1881 gimple_cond_set_rhs (as_a <gcond *> (stmt), rhs);
1882 gimple_set_modified (stmt, true);
1889 /* Optimize the statement in block BB pointed to by iterator SI.
1891 We try to perform some simplistic global redundancy elimination and
1892 constant propagation:
1894 1- To detect global redundancy, we keep track of expressions that have
1895 been computed in this block and its dominators. If we find that the
1896 same expression is computed more than once, we eliminate repeated
1897 computations by using the target of the first one.
1899 2- Constant values and copy assignments. This is used to do very
1900 simplistic constant and copy propagation. When a constant or copy
1901 assignment is found, we map the value on the RHS of the assignment to
1902 the variable in the LHS in the CONST_AND_COPIES table.
1904 3- Very simple redundant store elimination is performed.
1906 4- We can simplify a condition to a constant or from a relational
1907 condition to an equality condition. */
1909 edge
1910 dom_opt_dom_walker::optimize_stmt (basic_block bb, gimple_stmt_iterator *si,
1911 bool *removed_p)
1913 gimple *stmt, *old_stmt;
1914 bool may_optimize_p;
1915 bool modified_p = false;
1916 bool was_noreturn;
1917 edge retval = NULL;
1919 old_stmt = stmt = gsi_stmt (*si);
1920 was_noreturn = is_gimple_call (stmt) && gimple_call_noreturn_p (stmt);
1922 if (dump_file && (dump_flags & TDF_DETAILS))
1924 fprintf (dump_file, "Optimizing statement ");
1925 print_gimple_stmt (dump_file, stmt, 0, TDF_SLIM);
1928 update_stmt_if_modified (stmt);
1929 opt_stats.num_stmts++;
1931 /* Const/copy propagate into USES, VUSES and the RHS of VDEFs. */
1932 cprop_into_stmt (stmt, m_evrp_range_analyzer);
1934 /* If the statement has been modified with constant replacements,
1935 fold its RHS before checking for redundant computations. */
1936 if (gimple_modified_p (stmt))
1938 tree rhs = NULL;
1940 /* Try to fold the statement making sure that STMT is kept
1941 up to date. */
1942 if (fold_stmt (si))
1944 stmt = gsi_stmt (*si);
1945 gimple_set_modified (stmt, true);
1947 if (dump_file && (dump_flags & TDF_DETAILS))
1949 fprintf (dump_file, " Folded to: ");
1950 print_gimple_stmt (dump_file, stmt, 0, TDF_SLIM);
1954 /* We only need to consider cases that can yield a gimple operand. */
1955 if (gimple_assign_single_p (stmt))
1956 rhs = gimple_assign_rhs1 (stmt);
1957 else if (gimple_code (stmt) == GIMPLE_GOTO)
1958 rhs = gimple_goto_dest (stmt);
1959 else if (gswitch *swtch_stmt = dyn_cast <gswitch *> (stmt))
1960 /* This should never be an ADDR_EXPR. */
1961 rhs = gimple_switch_index (swtch_stmt);
1963 if (rhs && TREE_CODE (rhs) == ADDR_EXPR)
1964 recompute_tree_invariant_for_addr_expr (rhs);
1966 /* Indicate that maybe_clean_or_replace_eh_stmt needs to be called,
1967 even if fold_stmt updated the stmt already and thus cleared
1968 gimple_modified_p flag on it. */
1969 modified_p = true;
1972 /* Check for redundant computations. Do this optimization only
1973 for assignments that have no volatile ops and conditionals. */
1974 may_optimize_p = (!gimple_has_side_effects (stmt)
1975 && (is_gimple_assign (stmt)
1976 || (is_gimple_call (stmt)
1977 && gimple_call_lhs (stmt) != NULL_TREE)
1978 || gimple_code (stmt) == GIMPLE_COND
1979 || gimple_code (stmt) == GIMPLE_SWITCH));
1981 if (may_optimize_p)
1983 if (gimple_code (stmt) == GIMPLE_CALL)
1985 /* Resolve __builtin_constant_p. If it hasn't been
1986 folded to integer_one_node by now, it's fairly
1987 certain that the value simply isn't constant. */
1988 tree callee = gimple_call_fndecl (stmt);
1989 if (callee
1990 && fndecl_built_in_p (callee, BUILT_IN_CONSTANT_P))
1992 propagate_tree_value_into_stmt (si, integer_zero_node);
1993 stmt = gsi_stmt (*si);
1997 if (gimple_code (stmt) == GIMPLE_COND)
1999 tree lhs = gimple_cond_lhs (stmt);
2000 tree rhs = gimple_cond_rhs (stmt);
2002 /* If the LHS has a range [0..1] and the RHS has a range ~[0..1],
2003 then this conditional is computable at compile time. We can just
2004 shove either 0 or 1 into the LHS, mark the statement as modified
2005 and all the right things will just happen below.
2007 Note this would apply to any case where LHS has a range
2008 narrower than its type implies and RHS is outside that
2009 narrower range. Future work. */
2010 if (TREE_CODE (lhs) == SSA_NAME
2011 && ssa_name_has_boolean_range (lhs)
2012 && TREE_CODE (rhs) == INTEGER_CST
2013 && ! (integer_zerop (rhs) || integer_onep (rhs)))
2015 gimple_cond_set_lhs (as_a <gcond *> (stmt),
2016 fold_convert (TREE_TYPE (lhs),
2017 integer_zero_node));
2018 gimple_set_modified (stmt, true);
2020 else if (TREE_CODE (lhs) == SSA_NAME)
2022 /* Exploiting EVRP data is not yet fully integrated into DOM
2023 but we need to do something for this case to avoid regressing
2024 udr4.f90 and new1.C which have unexecutable blocks with
2025 undefined behavior that get diagnosed if they're left in the
2026 IL because we've attached range information to new
2027 SSA_NAMES. */
2028 update_stmt_if_modified (stmt);
2029 edge taken_edge = NULL;
2030 m_evrp_range_analyzer->vrp_visit_cond_stmt
2031 (as_a <gcond *> (stmt), &taken_edge);
2032 if (taken_edge)
2034 if (taken_edge->flags & EDGE_TRUE_VALUE)
2035 gimple_cond_make_true (as_a <gcond *> (stmt));
2036 else if (taken_edge->flags & EDGE_FALSE_VALUE)
2037 gimple_cond_make_false (as_a <gcond *> (stmt));
2038 else
2039 gcc_unreachable ();
2040 gimple_set_modified (stmt, true);
2041 update_stmt (stmt);
2042 cfg_altered = true;
2043 return taken_edge;
2048 update_stmt_if_modified (stmt);
2049 eliminate_redundant_computations (si, m_const_and_copies,
2050 m_avail_exprs_stack);
2051 stmt = gsi_stmt (*si);
2053 /* Perform simple redundant store elimination. */
2054 if (gimple_assign_single_p (stmt)
2055 && TREE_CODE (gimple_assign_lhs (stmt)) != SSA_NAME)
2057 tree lhs = gimple_assign_lhs (stmt);
2058 tree rhs = gimple_assign_rhs1 (stmt);
2059 tree cached_lhs;
2060 gassign *new_stmt;
2061 rhs = dom_valueize (rhs);
2062 /* Build a new statement with the RHS and LHS exchanged. */
2063 if (TREE_CODE (rhs) == SSA_NAME)
2065 gimple *defstmt = SSA_NAME_DEF_STMT (rhs);
2066 new_stmt = gimple_build_assign (rhs, lhs);
2067 SSA_NAME_DEF_STMT (rhs) = defstmt;
2069 else
2070 new_stmt = gimple_build_assign (rhs, lhs);
2071 gimple_set_vuse (new_stmt, gimple_vuse (stmt));
2072 expr_hash_elt *elt = NULL;
2073 cached_lhs = m_avail_exprs_stack->lookup_avail_expr (new_stmt, false,
2074 false, &elt);
2075 if (cached_lhs
2076 && operand_equal_p (rhs, cached_lhs, 0)
2077 && refs_same_for_tbaa_p (elt->expr ()->kind == EXPR_SINGLE
2078 ? elt->expr ()->ops.single.rhs
2079 : NULL_TREE, lhs))
2081 basic_block bb = gimple_bb (stmt);
2082 unlink_stmt_vdef (stmt);
2083 if (gsi_remove (si, true))
2085 bitmap_set_bit (need_eh_cleanup, bb->index);
2086 if (dump_file && (dump_flags & TDF_DETAILS))
2087 fprintf (dump_file, " Flagged to clear EH edges.\n");
2089 release_defs (stmt);
2090 *removed_p = true;
2091 return retval;
2095 /* If this statement was not redundant, we may still be able to simplify
2096 it, which may in turn allow other part of DOM or other passes to do
2097 a better job. */
2098 test_for_singularity (stmt, m_avail_exprs_stack);
2101 /* Record any additional equivalences created by this statement. */
2102 if (is_gimple_assign (stmt))
2103 record_equivalences_from_stmt (stmt, may_optimize_p, m_avail_exprs_stack);
2105 /* If STMT is a COND_EXPR or SWITCH_EXPR and it was modified, then we may
2106 know where it goes. */
2107 if (gimple_modified_p (stmt) || modified_p)
2109 tree val = NULL;
2111 if (gimple_code (stmt) == GIMPLE_COND)
2112 val = fold_binary_loc (gimple_location (stmt),
2113 gimple_cond_code (stmt), boolean_type_node,
2114 gimple_cond_lhs (stmt),
2115 gimple_cond_rhs (stmt));
2116 else if (gswitch *swtch_stmt = dyn_cast <gswitch *> (stmt))
2117 val = gimple_switch_index (swtch_stmt);
2119 if (val && TREE_CODE (val) == INTEGER_CST)
2121 retval = find_taken_edge (bb, val);
2122 if (retval)
2124 /* Fix the condition to be either true or false. */
2125 if (gimple_code (stmt) == GIMPLE_COND)
2127 if (integer_zerop (val))
2128 gimple_cond_make_false (as_a <gcond *> (stmt));
2129 else if (integer_onep (val))
2130 gimple_cond_make_true (as_a <gcond *> (stmt));
2131 else
2132 gcc_unreachable ();
2134 gimple_set_modified (stmt, true);
2137 /* Further simplifications may be possible. */
2138 cfg_altered = true;
2142 update_stmt_if_modified (stmt);
2144 /* If we simplified a statement in such a way as to be shown that it
2145 cannot trap, update the eh information and the cfg to match. */
2146 if (maybe_clean_or_replace_eh_stmt (old_stmt, stmt))
2148 bitmap_set_bit (need_eh_cleanup, bb->index);
2149 if (dump_file && (dump_flags & TDF_DETAILS))
2150 fprintf (dump_file, " Flagged to clear EH edges.\n");
2153 if (!was_noreturn
2154 && is_gimple_call (stmt) && gimple_call_noreturn_p (stmt))
2155 need_noreturn_fixup.safe_push (stmt);
2157 return retval;