1 /* Conditional constant propagation pass for the GNU compiler.
2 Copyright (C) 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007
3 Free Software Foundation, Inc.
4 Adapted from original RTL SSA-CCP by Daniel Berlin <dberlin@dberlin.org>
5 Adapted to GIMPLE trees by Diego Novillo <dnovillo@redhat.com>
7 This file is part of GCC.
9 GCC is free software; you can redistribute it and/or modify it
10 under the terms of the GNU General Public License as published by the
11 Free Software Foundation; either version 3, or (at your option) any
14 GCC is distributed in the hope that it will be useful, but WITHOUT
15 ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or
16 FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License
19 You should have received a copy of the GNU General Public License
20 along with GCC; see the file COPYING3. If not see
21 <http://www.gnu.org/licenses/>. */
23 /* Conditional constant propagation (CCP) is based on the SSA
24 propagation engine (tree-ssa-propagate.c). Constant assignments of
25 the form VAR = CST are propagated from the assignments into uses of
26 VAR, which in turn may generate new constants. The simulation uses
27 a four level lattice to keep track of constant values associated
28 with SSA names. Given an SSA name V_i, it may take one of the
31 UNINITIALIZED -> the initial state of the value. This value
32 is replaced with a correct initial value
33 the first time the value is used, so the
34 rest of the pass does not need to care about
35 it. Using this value simplifies initialization
36 of the pass, and prevents us from needlessly
37 scanning statements that are never reached.
39 UNDEFINED -> V_i is a local variable whose definition
40 has not been processed yet. Therefore we
41 don't yet know if its value is a constant
44 CONSTANT -> V_i has been found to hold a constant
47 VARYING -> V_i cannot take a constant value, or if it
48 does, it is not possible to determine it
51 The core of SSA-CCP is in ccp_visit_stmt and ccp_visit_phi_node:
53 1- In ccp_visit_stmt, we are interested in assignments whose RHS
54 evaluates into a constant and conditional jumps whose predicate
55 evaluates into a boolean true or false. When an assignment of
56 the form V_i = CONST is found, V_i's lattice value is set to
57 CONSTANT and CONST is associated with it. This causes the
58 propagation engine to add all the SSA edges coming out the
59 assignment into the worklists, so that statements that use V_i
62 If the statement is a conditional with a constant predicate, we
63 mark the outgoing edges as executable or not executable
64 depending on the predicate's value. This is then used when
65 visiting PHI nodes to know when a PHI argument can be ignored.
68 2- In ccp_visit_phi_node, if all the PHI arguments evaluate to the
69 same constant C, then the LHS of the PHI is set to C. This
70 evaluation is known as the "meet operation". Since one of the
71 goals of this evaluation is to optimistically return constant
72 values as often as possible, it uses two main short cuts:
74 - If an argument is flowing in through a non-executable edge, it
75 is ignored. This is useful in cases like this:
81 a_11 = PHI (a_9, a_10)
83 If PRED is known to always evaluate to false, then we can
84 assume that a_11 will always take its value from a_10, meaning
85 that instead of consider it VARYING (a_9 and a_10 have
86 different values), we can consider it CONSTANT 100.
88 - If an argument has an UNDEFINED value, then it does not affect
89 the outcome of the meet operation. If a variable V_i has an
90 UNDEFINED value, it means that either its defining statement
91 hasn't been visited yet or V_i has no defining statement, in
92 which case the original symbol 'V' is being used
93 uninitialized. Since 'V' is a local variable, the compiler
94 may assume any initial value for it.
97 After propagation, every variable V_i that ends up with a lattice
98 value of CONSTANT will have the associated constant value in the
99 array CONST_VAL[i].VALUE. That is fed into substitute_and_fold for
100 final substitution and folding.
103 Constant propagation in stores and loads (STORE-CCP)
104 ----------------------------------------------------
106 While CCP has all the logic to propagate constants in GIMPLE
107 registers, it is missing the ability to associate constants with
108 stores and loads (i.e., pointer dereferences, structures and
109 global/aliased variables). We don't keep loads and stores in
110 SSA, but we do build a factored use-def web for them (in the
113 For instance, consider the following code fragment:
132 We should be able to deduce that the predicate 'a.a != B' is always
133 false. To achieve this, we associate constant values to the SSA
134 names in the VDEF operands for each store. Additionally,
135 since we also glob partial loads/stores with the base symbol, we
136 also keep track of the memory reference where the constant value
137 was stored (in the MEM_REF field of PROP_VALUE_T). For instance,
145 In the example above, CCP will associate value '2' with 'a_5', but
146 it would be wrong to replace the load from 'a.b' with '2', because
147 '2' had been stored into a.a.
149 Note that the initial value of virtual operands is VARYING, not
150 UNDEFINED. Consider, for instance global variables:
158 # A_5 = PHI (A_4, A_2);
166 The value of A_2 cannot be assumed to be UNDEFINED, as it may have
167 been defined outside of foo. If we were to assume it UNDEFINED, we
168 would erroneously optimize the above into 'return 3;'.
170 Though STORE-CCP is not too expensive, it does have to do more work
171 than regular CCP, so it is only enabled at -O2. Both regular CCP
172 and STORE-CCP use the exact same algorithm. The only distinction
173 is that when doing STORE-CCP, the boolean variable DO_STORE_CCP is
174 set to true. This affects the evaluation of statements and PHI
179 Constant propagation with conditional branches,
180 Wegman and Zadeck, ACM TOPLAS 13(2):181-210.
182 Building an Optimizing Compiler,
183 Robert Morgan, Butterworth-Heinemann, 1998, Section 8.9.
185 Advanced Compiler Design and Implementation,
186 Steven Muchnick, Morgan Kaufmann, 1997, Section 12.6 */
190 #include "coretypes.h"
197 #include "basic-block.h"
200 #include "function.h"
201 #include "diagnostic.h"
203 #include "tree-dump.h"
204 #include "tree-flow.h"
205 #include "tree-pass.h"
206 #include "tree-ssa-propagate.h"
207 #include "langhooks.h"
212 /* Possible lattice values. */
221 /* Array of propagated constant values. After propagation,
222 CONST_VAL[I].VALUE holds the constant value for SSA_NAME(I). If
223 the constant is held in an SSA name representing a memory store
224 (i.e., a VDEF), CONST_VAL[I].MEM_REF will contain the actual
225 memory reference used to store (i.e., the LHS of the assignment
227 static prop_value_t
*const_val
;
229 /* True if we are also propagating constants in stores and loads. */
230 static bool do_store_ccp
;
232 /* Dump constant propagation value VAL to file OUTF prefixed by PREFIX. */
235 dump_lattice_value (FILE *outf
, const char *prefix
, prop_value_t val
)
237 switch (val
.lattice_val
)
240 fprintf (outf
, "%sUNINITIALIZED", prefix
);
243 fprintf (outf
, "%sUNDEFINED", prefix
);
246 fprintf (outf
, "%sVARYING", prefix
);
249 fprintf (outf
, "%sCONSTANT ", prefix
);
250 print_generic_expr (outf
, val
.value
, dump_flags
);
258 /* Print lattice value VAL to stderr. */
260 void debug_lattice_value (prop_value_t val
);
263 debug_lattice_value (prop_value_t val
)
265 dump_lattice_value (stderr
, "", val
);
266 fprintf (stderr
, "\n");
270 /* If SYM is a constant variable with known value, return the value.
271 NULL_TREE is returned otherwise. */
274 get_symbol_constant_value (tree sym
)
276 if (TREE_STATIC (sym
)
277 && TREE_READONLY (sym
)
280 tree val
= DECL_INITIAL (sym
);
283 STRIP_USELESS_TYPE_CONVERSION (val
);
284 if (is_gimple_min_invariant (val
))
287 /* Variables declared 'const' without an initializer
288 have zero as the intializer if they may not be
289 overridden at link or run time. */
291 && targetm
.binds_local_p (sym
)
292 && (INTEGRAL_TYPE_P (TREE_TYPE (sym
))
293 || SCALAR_FLOAT_TYPE_P (TREE_TYPE (sym
))))
294 return fold_convert (TREE_TYPE (sym
), integer_zero_node
);
300 /* Compute a default value for variable VAR and store it in the
301 CONST_VAL array. The following rules are used to get default
304 1- Global and static variables that are declared constant are
307 2- Any other value is considered UNDEFINED. This is useful when
308 considering PHI nodes. PHI arguments that are undefined do not
309 change the constant value of the PHI node, which allows for more
310 constants to be propagated.
312 3- If SSA_NAME_VALUE is set and it is a constant, its value is
315 4- Variables defined by statements other than assignments and PHI
316 nodes are considered VARYING.
318 5- Initial values of variables that are not GIMPLE registers are
319 considered VARYING. */
322 get_default_value (tree var
)
324 tree sym
= SSA_NAME_VAR (var
);
325 prop_value_t val
= { UNINITIALIZED
, NULL_TREE
, NULL_TREE
};
328 if (!do_store_ccp
&& !is_gimple_reg (var
))
330 /* Short circuit for regular CCP. We are not interested in any
331 non-register when DO_STORE_CCP is false. */
332 val
.lattice_val
= VARYING
;
334 else if (SSA_NAME_VALUE (var
)
335 && is_gimple_min_invariant (SSA_NAME_VALUE (var
)))
337 val
.lattice_val
= CONSTANT
;
338 val
.value
= SSA_NAME_VALUE (var
);
340 else if ((cst_val
= get_symbol_constant_value (sym
)) != NULL_TREE
)
342 /* Globals and static variables declared 'const' take their
344 val
.lattice_val
= CONSTANT
;
350 tree stmt
= SSA_NAME_DEF_STMT (var
);
352 if (IS_EMPTY_STMT (stmt
))
354 /* Variables defined by an empty statement are those used
355 before being initialized. If VAR is a local variable, we
356 can assume initially that it is UNDEFINED, otherwise we must
357 consider it VARYING. */
358 if (is_gimple_reg (sym
) && TREE_CODE (sym
) != PARM_DECL
)
359 val
.lattice_val
= UNDEFINED
;
361 val
.lattice_val
= VARYING
;
363 else if (TREE_CODE (stmt
) == GIMPLE_MODIFY_STMT
364 || TREE_CODE (stmt
) == PHI_NODE
)
366 /* Any other variable defined by an assignment or a PHI node
367 is considered UNDEFINED. */
368 val
.lattice_val
= UNDEFINED
;
372 /* Otherwise, VAR will never take on a constant value. */
373 val
.lattice_val
= VARYING
;
381 /* Get the constant value associated with variable VAR. */
383 static inline prop_value_t
*
388 if (const_val
== NULL
)
391 val
= &const_val
[SSA_NAME_VERSION (var
)];
392 if (val
->lattice_val
== UNINITIALIZED
)
393 *val
= get_default_value (var
);
398 /* Sets the value associated with VAR to VARYING. */
401 set_value_varying (tree var
)
403 prop_value_t
*val
= &const_val
[SSA_NAME_VERSION (var
)];
405 val
->lattice_val
= VARYING
;
406 val
->value
= NULL_TREE
;
407 val
->mem_ref
= NULL_TREE
;
410 /* For float types, modify the value of VAL to make ccp work correctly
411 for non-standard values (-0, NaN):
413 If HONOR_SIGNED_ZEROS is false, and VAL = -0, we canonicalize it to 0.
414 If HONOR_NANS is false, and VAL is NaN, we canonicalize it to UNDEFINED.
415 This is to fix the following problem (see PR 29921): Suppose we have
419 and we set value of y to NaN. This causes value of x to be set to NaN.
420 When we later determine that y is in fact VARYING, fold uses the fact
421 that HONOR_NANS is false, and we try to change the value of x to 0,
422 causing an ICE. With HONOR_NANS being false, the real appearance of
423 NaN would cause undefined behavior, though, so claiming that y (and x)
424 are UNDEFINED initially is correct. */
427 canonicalize_float_value (prop_value_t
*val
)
429 enum machine_mode mode
;
433 if (val
->lattice_val
!= CONSTANT
434 || TREE_CODE (val
->value
) != REAL_CST
)
437 d
= TREE_REAL_CST (val
->value
);
438 type
= TREE_TYPE (val
->value
);
439 mode
= TYPE_MODE (type
);
441 if (!HONOR_SIGNED_ZEROS (mode
)
442 && REAL_VALUE_MINUS_ZERO (d
))
444 val
->value
= build_real (type
, dconst0
);
448 if (!HONOR_NANS (mode
)
449 && REAL_VALUE_ISNAN (d
))
451 val
->lattice_val
= UNDEFINED
;
458 /* Set the value for variable VAR to NEW_VAL. Return true if the new
459 value is different from VAR's previous value. */
462 set_lattice_value (tree var
, prop_value_t new_val
)
464 prop_value_t
*old_val
= get_value (var
);
466 canonicalize_float_value (&new_val
);
468 /* Lattice transitions must always be monotonically increasing in
469 value. If *OLD_VAL and NEW_VAL are the same, return false to
470 inform the caller that this was a non-transition. */
472 gcc_assert (old_val
->lattice_val
< new_val
.lattice_val
473 || (old_val
->lattice_val
== new_val
.lattice_val
474 && ((!old_val
->value
&& !new_val
.value
)
475 || operand_equal_p (old_val
->value
, new_val
.value
, 0))
476 && old_val
->mem_ref
== new_val
.mem_ref
));
478 if (old_val
->lattice_val
!= new_val
.lattice_val
)
480 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
482 dump_lattice_value (dump_file
, "Lattice value changed to ", new_val
);
483 fprintf (dump_file
, ". Adding SSA edges to worklist.\n");
488 gcc_assert (new_val
.lattice_val
!= UNDEFINED
);
496 /* Return the likely CCP lattice value for STMT.
498 If STMT has no operands, then return CONSTANT.
500 Else if undefinedness of operands of STMT cause its value to be
501 undefined, then return UNDEFINED.
503 Else if any operands of STMT are constants, then return CONSTANT.
505 Else return VARYING. */
508 likely_value (tree stmt
)
510 bool has_constant_operand
, has_undefined_operand
, all_undefined_operands
;
515 ann
= stmt_ann (stmt
);
517 /* If the statement has volatile operands, it won't fold to a
519 if (ann
->has_volatile_ops
)
522 /* If we are not doing store-ccp, statements with loads
523 and/or stores will never fold into a constant. */
525 && !ZERO_SSA_OPERANDS (stmt
, SSA_OP_ALL_VIRTUALS
))
529 /* A CALL_EXPR is assumed to be varying. NOTE: This may be overly
530 conservative, in the presence of const and pure calls. */
531 if (get_call_expr_in (stmt
) != NULL_TREE
)
534 /* Anything other than assignments and conditional jumps are not
535 interesting for CCP. */
536 if (TREE_CODE (stmt
) != GIMPLE_MODIFY_STMT
537 && !(TREE_CODE (stmt
) == RETURN_EXPR
&& get_rhs (stmt
) != NULL_TREE
)
538 && TREE_CODE (stmt
) != COND_EXPR
539 && TREE_CODE (stmt
) != SWITCH_EXPR
)
542 if (is_gimple_min_invariant (get_rhs (stmt
)))
545 has_constant_operand
= false;
546 has_undefined_operand
= false;
547 all_undefined_operands
= true;
548 FOR_EACH_SSA_TREE_OPERAND (use
, stmt
, iter
, SSA_OP_USE
| SSA_OP_VUSE
)
550 prop_value_t
*val
= get_value (use
);
552 if (val
->lattice_val
== UNDEFINED
)
553 has_undefined_operand
= true;
555 all_undefined_operands
= false;
557 if (val
->lattice_val
== CONSTANT
)
558 has_constant_operand
= true;
561 /* If the operation combines operands like COMPLEX_EXPR make sure to
562 not mark the result UNDEFINED if only one part of the result is
564 if (has_undefined_operand
565 && all_undefined_operands
)
567 else if (TREE_CODE (stmt
) == GIMPLE_MODIFY_STMT
568 && has_undefined_operand
)
570 switch (TREE_CODE (GIMPLE_STMT_OPERAND (stmt
, 1)))
572 /* Unary operators are handled with all_undefined_operands. */
575 case POINTER_PLUS_EXPR
:
576 /* Not MIN_EXPR, MAX_EXPR. One VARYING operand may be selected.
577 Not bitwise operators, one VARYING operand may specify the
578 result completely. Not logical operators for the same reason.
579 Not COMPLEX_EXPR as one VARYING operand makes the result partly
580 not UNDEFINED. Not *DIV_EXPR, comparisons and shifts because
581 the undefined operand may be promoted. */
588 /* If there was an UNDEFINED operand but the result may be not UNDEFINED
589 fall back to VARYING even if there were CONSTANT operands. */
590 if (has_undefined_operand
)
593 if (has_constant_operand
594 /* We do not consider virtual operands here -- load from read-only
595 memory may have only VARYING virtual operands, but still be
597 || ZERO_SSA_OPERANDS (stmt
, SSA_OP_USE
))
603 /* Returns true if STMT cannot be constant. */
606 surely_varying_stmt_p (tree stmt
)
608 /* If the statement has operands that we cannot handle, it cannot be
610 if (stmt_ann (stmt
)->has_volatile_ops
)
613 if (!ZERO_SSA_OPERANDS (stmt
, SSA_OP_ALL_VIRTUALS
))
618 /* We can only handle simple loads and stores. */
619 if (!stmt_makes_single_load (stmt
)
620 && !stmt_makes_single_store (stmt
))
624 /* If it contains a call, it is varying. */
625 if (get_call_expr_in (stmt
) != NULL_TREE
)
628 /* Anything other than assignments and conditional jumps are not
629 interesting for CCP. */
630 if (TREE_CODE (stmt
) != GIMPLE_MODIFY_STMT
631 && !(TREE_CODE (stmt
) == RETURN_EXPR
&& get_rhs (stmt
) != NULL_TREE
)
632 && TREE_CODE (stmt
) != COND_EXPR
633 && TREE_CODE (stmt
) != SWITCH_EXPR
)
639 /* Initialize local data structures for CCP. */
642 ccp_initialize (void)
646 const_val
= XCNEWVEC (prop_value_t
, num_ssa_names
);
648 /* Initialize simulation flags for PHI nodes and statements. */
651 block_stmt_iterator i
;
653 for (i
= bsi_start (bb
); !bsi_end_p (i
); bsi_next (&i
))
655 tree stmt
= bsi_stmt (i
);
656 bool is_varying
= surely_varying_stmt_p (stmt
);
663 /* If the statement will not produce a constant, mark
664 all its outputs VARYING. */
665 FOR_EACH_SSA_TREE_OPERAND (def
, stmt
, iter
, SSA_OP_ALL_DEFS
)
668 set_value_varying (def
);
672 DONT_SIMULATE_AGAIN (stmt
) = is_varying
;
676 /* Now process PHI nodes. We never set DONT_SIMULATE_AGAIN on phi node,
677 since we do not know which edges are executable yet, except for
678 phi nodes for virtual operands when we do not do store ccp. */
683 for (phi
= phi_nodes (bb
); phi
; phi
= PHI_CHAIN (phi
))
685 if (!do_store_ccp
&& !is_gimple_reg (PHI_RESULT (phi
)))
686 DONT_SIMULATE_AGAIN (phi
) = true;
688 DONT_SIMULATE_AGAIN (phi
) = false;
694 /* Do final substitution of propagated values, cleanup the flowgraph and
695 free allocated storage.
697 Return TRUE when something was optimized. */
702 /* Perform substitutions based on the known constant values. */
703 bool something_changed
= substitute_and_fold (const_val
, false);
707 return something_changed
;;
711 /* Compute the meet operator between *VAL1 and *VAL2. Store the result
714 any M UNDEFINED = any
715 any M VARYING = VARYING
716 Ci M Cj = Ci if (i == j)
717 Ci M Cj = VARYING if (i != j)
721 ccp_lattice_meet (prop_value_t
*val1
, prop_value_t
*val2
)
723 if (val1
->lattice_val
== UNDEFINED
)
725 /* UNDEFINED M any = any */
728 else if (val2
->lattice_val
== UNDEFINED
)
730 /* any M UNDEFINED = any
731 Nothing to do. VAL1 already contains the value we want. */
734 else if (val1
->lattice_val
== VARYING
735 || val2
->lattice_val
== VARYING
)
737 /* any M VARYING = VARYING. */
738 val1
->lattice_val
= VARYING
;
739 val1
->value
= NULL_TREE
;
740 val1
->mem_ref
= NULL_TREE
;
742 else if (val1
->lattice_val
== CONSTANT
743 && val2
->lattice_val
== CONSTANT
744 && simple_cst_equal (val1
->value
, val2
->value
) == 1
746 || (val1
->mem_ref
&& val2
->mem_ref
747 && operand_equal_p (val1
->mem_ref
, val2
->mem_ref
, 0))))
749 /* Ci M Cj = Ci if (i == j)
750 Ci M Cj = VARYING if (i != j)
752 If these two values come from memory stores, make sure that
753 they come from the same memory reference. */
754 val1
->lattice_val
= CONSTANT
;
755 val1
->value
= val1
->value
;
756 val1
->mem_ref
= val1
->mem_ref
;
760 /* Any other combination is VARYING. */
761 val1
->lattice_val
= VARYING
;
762 val1
->value
= NULL_TREE
;
763 val1
->mem_ref
= NULL_TREE
;
768 /* Loop through the PHI_NODE's parameters for BLOCK and compare their
769 lattice values to determine PHI_NODE's lattice value. The value of a
770 PHI node is determined calling ccp_lattice_meet with all the arguments
771 of the PHI node that are incoming via executable edges. */
773 static enum ssa_prop_result
774 ccp_visit_phi_node (tree phi
)
777 prop_value_t
*old_val
, new_val
;
779 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
781 fprintf (dump_file
, "\nVisiting PHI node: ");
782 print_generic_expr (dump_file
, phi
, dump_flags
);
785 old_val
= get_value (PHI_RESULT (phi
));
786 switch (old_val
->lattice_val
)
789 return SSA_PROP_VARYING
;
796 new_val
.lattice_val
= UNDEFINED
;
797 new_val
.value
= NULL_TREE
;
798 new_val
.mem_ref
= NULL_TREE
;
805 for (i
= 0; i
< PHI_NUM_ARGS (phi
); i
++)
807 /* Compute the meet operator over all the PHI arguments flowing
808 through executable edges. */
809 edge e
= PHI_ARG_EDGE (phi
, i
);
811 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
814 "\n Argument #%d (%d -> %d %sexecutable)\n",
815 i
, e
->src
->index
, e
->dest
->index
,
816 (e
->flags
& EDGE_EXECUTABLE
) ? "" : "not ");
819 /* If the incoming edge is executable, Compute the meet operator for
820 the existing value of the PHI node and the current PHI argument. */
821 if (e
->flags
& EDGE_EXECUTABLE
)
823 tree arg
= PHI_ARG_DEF (phi
, i
);
824 prop_value_t arg_val
;
826 if (is_gimple_min_invariant (arg
))
828 arg_val
.lattice_val
= CONSTANT
;
830 arg_val
.mem_ref
= NULL_TREE
;
833 arg_val
= *(get_value (arg
));
835 ccp_lattice_meet (&new_val
, &arg_val
);
837 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
839 fprintf (dump_file
, "\t");
840 print_generic_expr (dump_file
, arg
, dump_flags
);
841 dump_lattice_value (dump_file
, "\tValue: ", arg_val
);
842 fprintf (dump_file
, "\n");
845 if (new_val
.lattice_val
== VARYING
)
850 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
852 dump_lattice_value (dump_file
, "\n PHI node value: ", new_val
);
853 fprintf (dump_file
, "\n\n");
856 /* Make the transition to the new value. */
857 if (set_lattice_value (PHI_RESULT (phi
), new_val
))
859 if (new_val
.lattice_val
== VARYING
)
860 return SSA_PROP_VARYING
;
862 return SSA_PROP_INTERESTING
;
865 return SSA_PROP_NOT_INTERESTING
;
869 /* CCP specific front-end to the non-destructive constant folding
872 Attempt to simplify the RHS of STMT knowing that one or more
873 operands are constants.
875 If simplification is possible, return the simplified RHS,
876 otherwise return the original RHS. */
881 tree rhs
= get_rhs (stmt
);
882 enum tree_code code
= TREE_CODE (rhs
);
883 enum tree_code_class kind
= TREE_CODE_CLASS (code
);
884 tree retval
= NULL_TREE
;
886 if (TREE_CODE (rhs
) == SSA_NAME
)
888 /* If the RHS is an SSA_NAME, return its known constant value,
890 return get_value (rhs
)->value
;
892 else if (do_store_ccp
&& stmt_makes_single_load (stmt
))
894 /* If the RHS is a memory load, see if the VUSEs associated with
895 it are a valid constant for that memory load. */
896 prop_value_t
*val
= get_value_loaded_by (stmt
, const_val
);
897 if (val
&& val
->mem_ref
)
899 if (operand_equal_p (val
->mem_ref
, rhs
, 0))
902 /* If RHS is extracting REALPART_EXPR or IMAGPART_EXPR of a
903 complex type with a known constant value, return it. */
904 if ((TREE_CODE (rhs
) == REALPART_EXPR
905 || TREE_CODE (rhs
) == IMAGPART_EXPR
)
906 && operand_equal_p (val
->mem_ref
, TREE_OPERAND (rhs
, 0), 0))
907 return fold_build1 (TREE_CODE (rhs
), TREE_TYPE (rhs
), val
->value
);
912 /* Unary operators. Note that we know the single operand must
913 be a constant. So this should almost always return a
915 if (kind
== tcc_unary
)
917 /* Handle unary operators which can appear in GIMPLE form. */
918 tree op0
= TREE_OPERAND (rhs
, 0);
920 /* Simplify the operand down to a constant. */
921 if (TREE_CODE (op0
) == SSA_NAME
)
923 prop_value_t
*val
= get_value (op0
);
924 if (val
->lattice_val
== CONSTANT
)
925 op0
= get_value (op0
)->value
;
928 /* Conversions are useless for CCP purposes if they are
929 value-preserving. Thus the restrictions that
930 useless_type_conversion_p places for pointer type conversions do
931 not apply here. Substitution later will only substitute to
933 if ((code
== NOP_EXPR
|| code
== CONVERT_EXPR
)
934 && ((POINTER_TYPE_P (TREE_TYPE (rhs
))
935 && POINTER_TYPE_P (TREE_TYPE (op0
)))
936 || useless_type_conversion_p (TREE_TYPE (rhs
), TREE_TYPE (op0
))))
938 return fold_unary (code
, TREE_TYPE (rhs
), op0
);
941 /* Binary and comparison operators. We know one or both of the
942 operands are constants. */
943 else if (kind
== tcc_binary
944 || kind
== tcc_comparison
945 || code
== TRUTH_AND_EXPR
946 || code
== TRUTH_OR_EXPR
947 || code
== TRUTH_XOR_EXPR
)
949 /* Handle binary and comparison operators that can appear in
951 tree op0
= TREE_OPERAND (rhs
, 0);
952 tree op1
= TREE_OPERAND (rhs
, 1);
954 /* Simplify the operands down to constants when appropriate. */
955 if (TREE_CODE (op0
) == SSA_NAME
)
957 prop_value_t
*val
= get_value (op0
);
958 if (val
->lattice_val
== CONSTANT
)
962 if (TREE_CODE (op1
) == SSA_NAME
)
964 prop_value_t
*val
= get_value (op1
);
965 if (val
->lattice_val
== CONSTANT
)
969 return fold_binary (code
, TREE_TYPE (rhs
), op0
, op1
);
972 else if (kind
== tcc_declaration
)
973 return get_symbol_constant_value (rhs
);
975 else if (kind
== tcc_reference
)
976 return fold_const_aggregate_ref (rhs
);
978 /* We may be able to fold away calls to builtin functions if their
979 arguments are constants. */
980 else if (code
== CALL_EXPR
981 && TREE_CODE (CALL_EXPR_FN (rhs
)) == ADDR_EXPR
982 && TREE_CODE (TREE_OPERAND (CALL_EXPR_FN (rhs
), 0)) == FUNCTION_DECL
983 && DECL_BUILT_IN (TREE_OPERAND (CALL_EXPR_FN (rhs
), 0)))
985 if (!ZERO_SSA_OPERANDS (stmt
, SSA_OP_USE
))
992 /* Preserve the original values of every operand. */
993 orig
= XNEWVEC (tree
, NUM_SSA_OPERANDS (stmt
, SSA_OP_USE
));
994 FOR_EACH_SSA_TREE_OPERAND (var
, stmt
, iter
, SSA_OP_USE
)
997 /* Substitute operands with their values and try to fold. */
998 replace_uses_in (stmt
, NULL
, const_val
);
999 retval
= fold_call_expr (rhs
, false);
1001 /* Restore operands to their original form. */
1003 FOR_EACH_SSA_USE_OPERAND (var_p
, stmt
, iter
, SSA_OP_USE
)
1004 SET_USE (var_p
, orig
[i
++]);
1011 /* If we got a simplified form, see if we need to convert its type. */
1013 return fold_convert (TREE_TYPE (rhs
), retval
);
1015 /* No simplification was possible. */
1020 /* Return the tree representing the element referenced by T if T is an
1021 ARRAY_REF or COMPONENT_REF into constant aggregates. Return
1022 NULL_TREE otherwise. */
1025 fold_const_aggregate_ref (tree t
)
1027 prop_value_t
*value
;
1028 tree base
, ctor
, idx
, field
;
1029 unsigned HOST_WIDE_INT cnt
;
1032 switch (TREE_CODE (t
))
1035 /* Get a CONSTRUCTOR. If BASE is a VAR_DECL, get its
1036 DECL_INITIAL. If BASE is a nested reference into another
1037 ARRAY_REF or COMPONENT_REF, make a recursive call to resolve
1038 the inner reference. */
1039 base
= TREE_OPERAND (t
, 0);
1040 switch (TREE_CODE (base
))
1043 if (!TREE_READONLY (base
)
1044 || TREE_CODE (TREE_TYPE (base
)) != ARRAY_TYPE
1045 || !targetm
.binds_local_p (base
))
1048 ctor
= DECL_INITIAL (base
);
1053 ctor
= fold_const_aggregate_ref (base
);
1065 if (ctor
== NULL_TREE
1066 || (TREE_CODE (ctor
) != CONSTRUCTOR
1067 && TREE_CODE (ctor
) != STRING_CST
)
1068 || !TREE_STATIC (ctor
))
1071 /* Get the index. If we have an SSA_NAME, try to resolve it
1072 with the current lattice value for the SSA_NAME. */
1073 idx
= TREE_OPERAND (t
, 1);
1074 switch (TREE_CODE (idx
))
1077 if ((value
= get_value (idx
))
1078 && value
->lattice_val
== CONSTANT
1079 && TREE_CODE (value
->value
) == INTEGER_CST
)
1092 /* Fold read from constant string. */
1093 if (TREE_CODE (ctor
) == STRING_CST
)
1095 if ((TYPE_MODE (TREE_TYPE (t
))
1096 == TYPE_MODE (TREE_TYPE (TREE_TYPE (ctor
))))
1097 && (GET_MODE_CLASS (TYPE_MODE (TREE_TYPE (TREE_TYPE (ctor
))))
1099 && GET_MODE_SIZE (TYPE_MODE (TREE_TYPE (TREE_TYPE (ctor
)))) == 1
1100 && compare_tree_int (idx
, TREE_STRING_LENGTH (ctor
)) < 0)
1101 return build_int_cst_type (TREE_TYPE (t
),
1102 (TREE_STRING_POINTER (ctor
)
1103 [TREE_INT_CST_LOW (idx
)]));
1107 /* Whoo-hoo! I'll fold ya baby. Yeah! */
1108 FOR_EACH_CONSTRUCTOR_ELT (CONSTRUCTOR_ELTS (ctor
), cnt
, cfield
, cval
)
1109 if (tree_int_cst_equal (cfield
, idx
))
1111 STRIP_USELESS_TYPE_CONVERSION (cval
);
1117 /* Get a CONSTRUCTOR. If BASE is a VAR_DECL, get its
1118 DECL_INITIAL. If BASE is a nested reference into another
1119 ARRAY_REF or COMPONENT_REF, make a recursive call to resolve
1120 the inner reference. */
1121 base
= TREE_OPERAND (t
, 0);
1122 switch (TREE_CODE (base
))
1125 if (!TREE_READONLY (base
)
1126 || TREE_CODE (TREE_TYPE (base
)) != RECORD_TYPE
1127 || !targetm
.binds_local_p (base
))
1130 ctor
= DECL_INITIAL (base
);
1135 ctor
= fold_const_aggregate_ref (base
);
1142 if (ctor
== NULL_TREE
1143 || TREE_CODE (ctor
) != CONSTRUCTOR
1144 || !TREE_STATIC (ctor
))
1147 field
= TREE_OPERAND (t
, 1);
1149 FOR_EACH_CONSTRUCTOR_ELT (CONSTRUCTOR_ELTS (ctor
), cnt
, cfield
, cval
)
1151 /* FIXME: Handle bit-fields. */
1152 && ! DECL_BIT_FIELD (cfield
))
1154 STRIP_USELESS_TYPE_CONVERSION (cval
);
1162 tree c
= fold_const_aggregate_ref (TREE_OPERAND (t
, 0));
1163 if (c
&& TREE_CODE (c
) == COMPLEX_CST
)
1164 return fold_build1 (TREE_CODE (t
), TREE_TYPE (t
), c
);
1170 tree base
= TREE_OPERAND (t
, 0);
1171 if (TREE_CODE (base
) == SSA_NAME
1172 && (value
= get_value (base
))
1173 && value
->lattice_val
== CONSTANT
1174 && TREE_CODE (value
->value
) == ADDR_EXPR
)
1175 return fold_const_aggregate_ref (TREE_OPERAND (value
->value
, 0));
1186 /* Evaluate statement STMT. */
1189 evaluate_stmt (tree stmt
)
1192 tree simplified
= NULL_TREE
;
1193 ccp_lattice_t likelyvalue
= likely_value (stmt
);
1196 val
.mem_ref
= NULL_TREE
;
1198 fold_defer_overflow_warnings ();
1200 /* If the statement is likely to have a CONSTANT result, then try
1201 to fold the statement to determine the constant value. */
1202 if (likelyvalue
== CONSTANT
)
1203 simplified
= ccp_fold (stmt
);
1204 /* If the statement is likely to have a VARYING result, then do not
1205 bother folding the statement. */
1206 else if (likelyvalue
== VARYING
)
1207 simplified
= get_rhs (stmt
);
1209 is_constant
= simplified
&& is_gimple_min_invariant (simplified
);
1211 fold_undefer_overflow_warnings (is_constant
, stmt
, 0);
1215 /* The statement produced a constant value. */
1216 val
.lattice_val
= CONSTANT
;
1217 val
.value
= simplified
;
1221 /* The statement produced a nonconstant value. If the statement
1222 had UNDEFINED operands, then the result of the statement
1223 should be UNDEFINED. Otherwise, the statement is VARYING. */
1224 if (likelyvalue
== UNDEFINED
)
1225 val
.lattice_val
= likelyvalue
;
1227 val
.lattice_val
= VARYING
;
1229 val
.value
= NULL_TREE
;
1236 /* Visit the assignment statement STMT. Set the value of its LHS to the
1237 value computed by the RHS and store LHS in *OUTPUT_P. If STMT
1238 creates virtual definitions, set the value of each new name to that
1239 of the RHS (if we can derive a constant out of the RHS). */
1241 static enum ssa_prop_result
1242 visit_assignment (tree stmt
, tree
*output_p
)
1246 enum ssa_prop_result retval
;
1248 lhs
= GIMPLE_STMT_OPERAND (stmt
, 0);
1249 rhs
= GIMPLE_STMT_OPERAND (stmt
, 1);
1251 if (TREE_CODE (rhs
) == SSA_NAME
)
1253 /* For a simple copy operation, we copy the lattice values. */
1254 prop_value_t
*nval
= get_value (rhs
);
1257 else if (do_store_ccp
&& stmt_makes_single_load (stmt
))
1259 /* Same as above, but the RHS is not a gimple register and yet
1260 has a known VUSE. If STMT is loading from the same memory
1261 location that created the SSA_NAMEs for the virtual operands,
1262 we can propagate the value on the RHS. */
1263 prop_value_t
*nval
= get_value_loaded_by (stmt
, const_val
);
1267 && operand_equal_p (nval
->mem_ref
, rhs
, 0))
1270 val
= evaluate_stmt (stmt
);
1273 /* Evaluate the statement. */
1274 val
= evaluate_stmt (stmt
);
1276 retval
= SSA_PROP_NOT_INTERESTING
;
1278 /* Set the lattice value of the statement's output. */
1279 if (TREE_CODE (lhs
) == SSA_NAME
)
1281 /* If STMT is an assignment to an SSA_NAME, we only have one
1283 if (set_lattice_value (lhs
, val
))
1286 if (val
.lattice_val
== VARYING
)
1287 retval
= SSA_PROP_VARYING
;
1289 retval
= SSA_PROP_INTERESTING
;
1292 else if (do_store_ccp
&& stmt_makes_single_store (stmt
))
1294 /* Otherwise, set the names in VDEF operands to the new
1295 constant value and mark the LHS as the memory reference
1296 associated with VAL. */
1301 /* Mark VAL as stored in the LHS of this assignment. */
1302 if (val
.lattice_val
== CONSTANT
)
1305 /* Set the value of every VDEF to VAL. */
1307 FOR_EACH_SSA_TREE_OPERAND (vdef
, stmt
, i
, SSA_OP_VIRTUAL_DEFS
)
1309 /* See PR 29801. We may have VDEFs for read-only variables
1310 (see the handling of unmodifiable variables in
1311 add_virtual_operand); do not attempt to change their value. */
1312 if (get_symbol_constant_value (SSA_NAME_VAR (vdef
)) != NULL_TREE
)
1315 changed
|= set_lattice_value (vdef
, val
);
1318 /* Note that for propagation purposes, we are only interested in
1319 visiting statements that load the exact same memory reference
1320 stored here. Those statements will have the exact same list
1321 of virtual uses, so it is enough to set the output of this
1322 statement to be its first virtual definition. */
1323 *output_p
= first_vdef (stmt
);
1326 if (val
.lattice_val
== VARYING
)
1327 retval
= SSA_PROP_VARYING
;
1329 retval
= SSA_PROP_INTERESTING
;
1337 /* Visit the conditional statement STMT. Return SSA_PROP_INTERESTING
1338 if it can determine which edge will be taken. Otherwise, return
1339 SSA_PROP_VARYING. */
1341 static enum ssa_prop_result
1342 visit_cond_stmt (tree stmt
, edge
*taken_edge_p
)
1347 block
= bb_for_stmt (stmt
);
1348 val
= evaluate_stmt (stmt
);
1350 /* Find which edge out of the conditional block will be taken and add it
1351 to the worklist. If no single edge can be determined statically,
1352 return SSA_PROP_VARYING to feed all the outgoing edges to the
1353 propagation engine. */
1354 *taken_edge_p
= val
.value
? find_taken_edge (block
, val
.value
) : 0;
1356 return SSA_PROP_INTERESTING
;
1358 return SSA_PROP_VARYING
;
1362 /* Evaluate statement STMT. If the statement produces an output value and
1363 its evaluation changes the lattice value of its output, return
1364 SSA_PROP_INTERESTING and set *OUTPUT_P to the SSA_NAME holding the
1367 If STMT is a conditional branch and we can determine its truth
1368 value, set *TAKEN_EDGE_P accordingly. If STMT produces a varying
1369 value, return SSA_PROP_VARYING. */
1371 static enum ssa_prop_result
1372 ccp_visit_stmt (tree stmt
, edge
*taken_edge_p
, tree
*output_p
)
1377 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
1379 fprintf (dump_file
, "\nVisiting statement:\n");
1380 print_generic_stmt (dump_file
, stmt
, dump_flags
);
1381 fprintf (dump_file
, "\n");
1384 if (TREE_CODE (stmt
) == GIMPLE_MODIFY_STMT
)
1386 /* If the statement is an assignment that produces a single
1387 output value, evaluate its RHS to see if the lattice value of
1388 its output has changed. */
1389 return visit_assignment (stmt
, output_p
);
1391 else if (TREE_CODE (stmt
) == COND_EXPR
|| TREE_CODE (stmt
) == SWITCH_EXPR
)
1393 /* If STMT is a conditional branch, see if we can determine
1394 which branch will be taken. */
1395 return visit_cond_stmt (stmt
, taken_edge_p
);
1398 /* Any other kind of statement is not interesting for constant
1399 propagation and, therefore, not worth simulating. */
1400 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
1401 fprintf (dump_file
, "No interesting values produced. Marked VARYING.\n");
1403 /* Definitions made by statements other than assignments to
1404 SSA_NAMEs represent unknown modifications to their outputs.
1405 Mark them VARYING. */
1406 FOR_EACH_SSA_TREE_OPERAND (def
, stmt
, iter
, SSA_OP_ALL_DEFS
)
1408 prop_value_t v
= { VARYING
, NULL_TREE
, NULL_TREE
};
1409 set_lattice_value (def
, v
);
1412 return SSA_PROP_VARYING
;
1416 /* Main entry point for SSA Conditional Constant Propagation. */
1419 execute_ssa_ccp (bool store_ccp
)
1421 do_store_ccp
= store_ccp
;
1423 ssa_propagate (ccp_visit_stmt
, ccp_visit_phi_node
);
1424 if (ccp_finalize ())
1425 return (TODO_cleanup_cfg
| TODO_update_ssa
| TODO_remove_unused_locals
);
1434 return execute_ssa_ccp (false);
1441 return flag_tree_ccp
!= 0;
1445 struct gimple_opt_pass pass_ccp
=
1450 gate_ccp
, /* gate */
1451 do_ssa_ccp
, /* execute */
1454 0, /* static_pass_number */
1455 TV_TREE_CCP
, /* tv_id */
1456 PROP_cfg
| PROP_ssa
, /* properties_required */
1457 0, /* properties_provided */
1458 0, /* properties_destroyed */
1459 0, /* todo_flags_start */
1460 TODO_dump_func
| TODO_verify_ssa
1461 | TODO_verify_stmts
| TODO_ggc_collect
/* todo_flags_finish */
1467 do_ssa_store_ccp (void)
1469 /* If STORE-CCP is not enabled, we just run regular CCP. */
1470 return execute_ssa_ccp (flag_tree_store_ccp
!= 0);
1474 gate_store_ccp (void)
1476 /* STORE-CCP is enabled only with -ftree-store-ccp, but when
1477 -fno-tree-store-ccp is specified, we should run regular CCP.
1478 That's why the pass is enabled with either flag. */
1479 return flag_tree_store_ccp
!= 0 || flag_tree_ccp
!= 0;
1483 struct gimple_opt_pass pass_store_ccp
=
1487 "store_ccp", /* name */
1488 gate_store_ccp
, /* gate */
1489 do_ssa_store_ccp
, /* execute */
1492 0, /* static_pass_number */
1493 TV_TREE_STORE_CCP
, /* tv_id */
1494 PROP_cfg
| PROP_ssa
| PROP_alias
, /* properties_required */
1495 0, /* properties_provided */
1496 0, /* properties_destroyed */
1497 0, /* todo_flags_start */
1498 TODO_dump_func
| TODO_verify_ssa
1499 | TODO_verify_stmts
| TODO_ggc_collect
/* todo_flags_finish */
1503 /* A subroutine of fold_stmt_r. Attempts to fold *(A+O) to A[X].
1504 BASE is an array type. OFFSET is a byte displacement. ORIG_TYPE
1505 is the desired result type. */
1508 maybe_fold_offset_to_array_ref (tree base
, tree offset
, tree orig_type
,
1509 bool allow_negative_idx
)
1511 tree min_idx
, idx
, idx_type
, elt_offset
= integer_zero_node
;
1512 tree array_type
, elt_type
, elt_size
;
1515 /* If BASE is an ARRAY_REF, we can pick up another offset (this time
1516 measured in units of the size of elements type) from that ARRAY_REF).
1517 We can't do anything if either is variable.
1519 The case we handle here is *(&A[N]+O). */
1520 if (TREE_CODE (base
) == ARRAY_REF
)
1522 tree low_bound
= array_ref_low_bound (base
);
1524 elt_offset
= TREE_OPERAND (base
, 1);
1525 if (TREE_CODE (low_bound
) != INTEGER_CST
1526 || TREE_CODE (elt_offset
) != INTEGER_CST
)
1529 elt_offset
= int_const_binop (MINUS_EXPR
, elt_offset
, low_bound
, 0);
1530 base
= TREE_OPERAND (base
, 0);
1533 /* Ignore stupid user tricks of indexing non-array variables. */
1534 array_type
= TREE_TYPE (base
);
1535 if (TREE_CODE (array_type
) != ARRAY_TYPE
)
1537 elt_type
= TREE_TYPE (array_type
);
1538 if (!useless_type_conversion_p (orig_type
, elt_type
))
1541 /* Use signed size type for intermediate computation on the index. */
1542 idx_type
= signed_type_for (size_type_node
);
1544 /* If OFFSET and ELT_OFFSET are zero, we don't care about the size of the
1545 element type (so we can use the alignment if it's not constant).
1546 Otherwise, compute the offset as an index by using a division. If the
1547 division isn't exact, then don't do anything. */
1548 elt_size
= TYPE_SIZE_UNIT (elt_type
);
1551 if (integer_zerop (offset
))
1553 if (TREE_CODE (elt_size
) != INTEGER_CST
)
1554 elt_size
= size_int (TYPE_ALIGN (elt_type
));
1556 idx
= build_int_cst (idx_type
, 0);
1560 unsigned HOST_WIDE_INT lquo
, lrem
;
1561 HOST_WIDE_INT hquo
, hrem
;
1564 /* The final array offset should be signed, so we need
1565 to sign-extend the (possibly pointer) offset here
1566 and use signed division. */
1567 soffset
= double_int_sext (tree_to_double_int (offset
),
1568 TYPE_PRECISION (TREE_TYPE (offset
)));
1569 if (TREE_CODE (elt_size
) != INTEGER_CST
1570 || div_and_round_double (TRUNC_DIV_EXPR
, 0,
1571 soffset
.low
, soffset
.high
,
1572 TREE_INT_CST_LOW (elt_size
),
1573 TREE_INT_CST_HIGH (elt_size
),
1574 &lquo
, &hquo
, &lrem
, &hrem
)
1578 idx
= build_int_cst_wide (idx_type
, lquo
, hquo
);
1581 /* Assume the low bound is zero. If there is a domain type, get the
1582 low bound, if any, convert the index into that type, and add the
1584 min_idx
= build_int_cst (idx_type
, 0);
1585 domain_type
= TYPE_DOMAIN (array_type
);
1588 idx_type
= domain_type
;
1589 if (TYPE_MIN_VALUE (idx_type
))
1590 min_idx
= TYPE_MIN_VALUE (idx_type
);
1592 min_idx
= fold_convert (idx_type
, min_idx
);
1594 if (TREE_CODE (min_idx
) != INTEGER_CST
)
1597 elt_offset
= fold_convert (idx_type
, elt_offset
);
1600 if (!integer_zerop (min_idx
))
1601 idx
= int_const_binop (PLUS_EXPR
, idx
, min_idx
, 0);
1602 if (!integer_zerop (elt_offset
))
1603 idx
= int_const_binop (PLUS_EXPR
, idx
, elt_offset
, 0);
1605 /* Make sure to possibly truncate late after offsetting. */
1606 idx
= fold_convert (idx_type
, idx
);
1608 /* We don't want to construct access past array bounds. For example
1611 should not be simplified into (*c)[14] or tree-vrp will
1612 give false warnings. The same is true for
1613 struct A { long x; char d[0]; } *a;
1615 which should be not folded to &a->d[-8]. */
1617 && TYPE_MAX_VALUE (domain_type
)
1618 && TREE_CODE (TYPE_MAX_VALUE (domain_type
)) == INTEGER_CST
)
1620 tree up_bound
= TYPE_MAX_VALUE (domain_type
);
1622 if (tree_int_cst_lt (up_bound
, idx
)
1623 /* Accesses after the end of arrays of size 0 (gcc
1624 extension) and 1 are likely intentional ("struct
1626 && compare_tree_int (up_bound
, 1) > 0)
1630 && TYPE_MIN_VALUE (domain_type
))
1632 if (!allow_negative_idx
1633 && TREE_CODE (TYPE_MIN_VALUE (domain_type
)) == INTEGER_CST
1634 && tree_int_cst_lt (idx
, TYPE_MIN_VALUE (domain_type
)))
1637 else if (!allow_negative_idx
1638 && compare_tree_int (idx
, 0) < 0)
1641 return build4 (ARRAY_REF
, elt_type
, base
, idx
, NULL_TREE
, NULL_TREE
);
1645 /* Attempt to fold *(S+O) to S.X.
1646 BASE is a record type. OFFSET is a byte displacement. ORIG_TYPE
1647 is the desired result type. */
1650 maybe_fold_offset_to_component_ref (tree record_type
, tree base
, tree offset
,
1651 tree orig_type
, bool base_is_ptr
)
1653 tree f
, t
, field_type
, tail_array_field
, field_offset
;
1657 if (TREE_CODE (record_type
) != RECORD_TYPE
1658 && TREE_CODE (record_type
) != UNION_TYPE
1659 && TREE_CODE (record_type
) != QUAL_UNION_TYPE
)
1662 /* Short-circuit silly cases. */
1663 if (useless_type_conversion_p (record_type
, orig_type
))
1666 tail_array_field
= NULL_TREE
;
1667 for (f
= TYPE_FIELDS (record_type
); f
; f
= TREE_CHAIN (f
))
1671 if (TREE_CODE (f
) != FIELD_DECL
)
1673 if (DECL_BIT_FIELD (f
))
1676 if (!DECL_FIELD_OFFSET (f
))
1678 field_offset
= byte_position (f
);
1679 if (TREE_CODE (field_offset
) != INTEGER_CST
)
1682 /* ??? Java creates "interesting" fields for representing base classes.
1683 They have no name, and have no context. With no context, we get into
1684 trouble with nonoverlapping_component_refs_p. Skip them. */
1685 if (!DECL_FIELD_CONTEXT (f
))
1688 /* The previous array field isn't at the end. */
1689 tail_array_field
= NULL_TREE
;
1691 /* Check to see if this offset overlaps with the field. */
1692 cmp
= tree_int_cst_compare (field_offset
, offset
);
1696 field_type
= TREE_TYPE (f
);
1698 /* Here we exactly match the offset being checked. If the types match,
1699 then we can return that field. */
1701 && useless_type_conversion_p (orig_type
, field_type
))
1704 base
= build1 (INDIRECT_REF
, record_type
, base
);
1705 t
= build3 (COMPONENT_REF
, field_type
, base
, f
, NULL_TREE
);
1709 /* Don't care about offsets into the middle of scalars. */
1710 if (!AGGREGATE_TYPE_P (field_type
))
1713 /* Check for array at the end of the struct. This is often
1714 used as for flexible array members. We should be able to
1715 turn this into an array access anyway. */
1716 if (TREE_CODE (field_type
) == ARRAY_TYPE
)
1717 tail_array_field
= f
;
1719 /* Check the end of the field against the offset. */
1720 if (!DECL_SIZE_UNIT (f
)
1721 || TREE_CODE (DECL_SIZE_UNIT (f
)) != INTEGER_CST
)
1723 t
= int_const_binop (MINUS_EXPR
, offset
, field_offset
, 1);
1724 if (!tree_int_cst_lt (t
, DECL_SIZE_UNIT (f
)))
1727 /* If we matched, then set offset to the displacement into
1730 new_base
= build1 (INDIRECT_REF
, record_type
, base
);
1733 new_base
= build3 (COMPONENT_REF
, field_type
, new_base
, f
, NULL_TREE
);
1735 /* Recurse to possibly find the match. */
1736 ret
= maybe_fold_offset_to_array_ref (new_base
, t
, orig_type
,
1737 f
== TYPE_FIELDS (record_type
));
1740 ret
= maybe_fold_offset_to_component_ref (field_type
, new_base
, t
,
1746 if (!tail_array_field
)
1749 f
= tail_array_field
;
1750 field_type
= TREE_TYPE (f
);
1751 offset
= int_const_binop (MINUS_EXPR
, offset
, byte_position (f
), 1);
1753 /* If we get here, we've got an aggregate field, and a possibly
1754 nonzero offset into them. Recurse and hope for a valid match. */
1756 base
= build1 (INDIRECT_REF
, record_type
, base
);
1757 base
= build3 (COMPONENT_REF
, field_type
, base
, f
, NULL_TREE
);
1759 t
= maybe_fold_offset_to_array_ref (base
, offset
, orig_type
,
1760 f
== TYPE_FIELDS (record_type
));
1763 return maybe_fold_offset_to_component_ref (field_type
, base
, offset
,
1767 /* Attempt to express (ORIG_TYPE)BASE+OFFSET as BASE->field_of_orig_type
1768 or BASE[index] or by combination of those.
1770 Before attempting the conversion strip off existing ADDR_EXPRs and
1771 handled component refs. */
1774 maybe_fold_offset_to_reference (tree base
, tree offset
, tree orig_type
)
1778 bool base_is_ptr
= true;
1781 if (TREE_CODE (base
) == ADDR_EXPR
)
1783 base_is_ptr
= false;
1785 base
= TREE_OPERAND (base
, 0);
1787 /* Handle case where existing COMPONENT_REF pick e.g. wrong field of union,
1788 so it needs to be removed and new COMPONENT_REF constructed.
1789 The wrong COMPONENT_REF are often constructed by folding the
1790 (type *)&object within the expression (type *)&object+offset */
1791 if (handled_component_p (base
) && 0)
1793 HOST_WIDE_INT sub_offset
, size
, maxsize
;
1795 newbase
= get_ref_base_and_extent (base
, &sub_offset
,
1797 gcc_assert (newbase
);
1798 gcc_assert (!(sub_offset
& (BITS_PER_UNIT
- 1)));
1799 if (size
== maxsize
)
1803 offset
= int_const_binop (PLUS_EXPR
, offset
,
1804 build_int_cst (TREE_TYPE (offset
),
1805 sub_offset
/ BITS_PER_UNIT
), 1);
1808 if (useless_type_conversion_p (orig_type
, TREE_TYPE (base
))
1809 && integer_zerop (offset
))
1811 type
= TREE_TYPE (base
);
1816 if (!POINTER_TYPE_P (TREE_TYPE (base
)))
1818 type
= TREE_TYPE (TREE_TYPE (base
));
1820 ret
= maybe_fold_offset_to_component_ref (type
, base
, offset
,
1821 orig_type
, base_is_ptr
);
1825 base
= build1 (INDIRECT_REF
, type
, base
);
1826 ret
= maybe_fold_offset_to_array_ref (base
, offset
, orig_type
, true);
1831 /* A subroutine of fold_stmt_r. Attempt to simplify *(BASE+OFFSET).
1832 Return the simplified expression, or NULL if nothing could be done. */
1835 maybe_fold_stmt_indirect (tree expr
, tree base
, tree offset
)
1838 bool volatile_p
= TREE_THIS_VOLATILE (expr
);
1840 /* We may well have constructed a double-nested PLUS_EXPR via multiple
1841 substitutions. Fold that down to one. Remove NON_LVALUE_EXPRs that
1842 are sometimes added. */
1844 STRIP_TYPE_NOPS (base
);
1845 TREE_OPERAND (expr
, 0) = base
;
1847 /* One possibility is that the address reduces to a string constant. */
1848 t
= fold_read_from_constant_string (expr
);
1852 /* Add in any offset from a POINTER_PLUS_EXPR. */
1853 if (TREE_CODE (base
) == POINTER_PLUS_EXPR
)
1857 offset2
= TREE_OPERAND (base
, 1);
1858 if (TREE_CODE (offset2
) != INTEGER_CST
)
1860 base
= TREE_OPERAND (base
, 0);
1862 offset
= fold_convert (sizetype
,
1863 int_const_binop (PLUS_EXPR
, offset
, offset2
, 1));
1866 if (TREE_CODE (base
) == ADDR_EXPR
)
1868 tree base_addr
= base
;
1870 /* Strip the ADDR_EXPR. */
1871 base
= TREE_OPERAND (base
, 0);
1873 /* Fold away CONST_DECL to its value, if the type is scalar. */
1874 if (TREE_CODE (base
) == CONST_DECL
1875 && is_gimple_min_invariant (DECL_INITIAL (base
)))
1876 return DECL_INITIAL (base
);
1878 /* Try folding *(&B+O) to B.X. */
1879 t
= maybe_fold_offset_to_reference (base_addr
, offset
,
1883 TREE_THIS_VOLATILE (t
) = volatile_p
;
1889 /* We can get here for out-of-range string constant accesses,
1890 such as "_"[3]. Bail out of the entire substitution search
1891 and arrange for the entire statement to be replaced by a
1892 call to __builtin_trap. In all likelihood this will all be
1893 constant-folded away, but in the meantime we can't leave with
1894 something that get_expr_operands can't understand. */
1898 if (TREE_CODE (t
) == ADDR_EXPR
1899 && TREE_CODE (TREE_OPERAND (t
, 0)) == STRING_CST
)
1901 /* FIXME: Except that this causes problems elsewhere with dead
1902 code not being deleted, and we die in the rtl expanders
1903 because we failed to remove some ssa_name. In the meantime,
1904 just return zero. */
1905 /* FIXME2: This condition should be signaled by
1906 fold_read_from_constant_string directly, rather than
1907 re-checking for it here. */
1908 return integer_zero_node
;
1911 /* Try folding *(B+O) to B->X. Still an improvement. */
1912 if (POINTER_TYPE_P (TREE_TYPE (base
)))
1914 t
= maybe_fold_offset_to_reference (base
, offset
,
1921 /* Otherwise we had an offset that we could not simplify. */
1926 /* A subroutine of fold_stmt_r. EXPR is a POINTER_PLUS_EXPR.
1928 A quaint feature extant in our address arithmetic is that there
1929 can be hidden type changes here. The type of the result need
1930 not be the same as the type of the input pointer.
1932 What we're after here is an expression of the form
1933 (T *)(&array + const)
1934 where the cast doesn't actually exist, but is implicit in the
1935 type of the POINTER_PLUS_EXPR. We'd like to turn this into
1937 which may be able to propagate further. */
1940 maybe_fold_stmt_addition (tree expr
)
1942 tree op0
= TREE_OPERAND (expr
, 0);
1943 tree op1
= TREE_OPERAND (expr
, 1);
1944 tree ptr_type
= TREE_TYPE (expr
);
1948 gcc_assert (TREE_CODE (expr
) == POINTER_PLUS_EXPR
);
1950 /* It had better be a constant. */
1951 if (TREE_CODE (op1
) != INTEGER_CST
)
1953 /* The first operand should be an ADDR_EXPR. */
1954 if (TREE_CODE (op0
) != ADDR_EXPR
)
1956 op0
= TREE_OPERAND (op0
, 0);
1958 /* If the first operand is an ARRAY_REF, expand it so that we can fold
1959 the offset into it. */
1960 while (TREE_CODE (op0
) == ARRAY_REF
)
1962 tree array_obj
= TREE_OPERAND (op0
, 0);
1963 tree array_idx
= TREE_OPERAND (op0
, 1);
1964 tree elt_type
= TREE_TYPE (op0
);
1965 tree elt_size
= TYPE_SIZE_UNIT (elt_type
);
1968 if (TREE_CODE (array_idx
) != INTEGER_CST
)
1970 if (TREE_CODE (elt_size
) != INTEGER_CST
)
1973 /* Un-bias the index by the min index of the array type. */
1974 min_idx
= TYPE_DOMAIN (TREE_TYPE (array_obj
));
1977 min_idx
= TYPE_MIN_VALUE (min_idx
);
1980 if (TREE_CODE (min_idx
) != INTEGER_CST
)
1983 array_idx
= fold_convert (TREE_TYPE (min_idx
), array_idx
);
1984 if (!integer_zerop (min_idx
))
1985 array_idx
= int_const_binop (MINUS_EXPR
, array_idx
,
1990 /* Convert the index to a byte offset. */
1991 array_idx
= fold_convert (sizetype
, array_idx
);
1992 array_idx
= int_const_binop (MULT_EXPR
, array_idx
, elt_size
, 0);
1994 /* Update the operands for the next round, or for folding. */
1995 op1
= int_const_binop (PLUS_EXPR
,
2000 ptd_type
= TREE_TYPE (ptr_type
);
2001 /* If we want a pointer to void, reconstruct the reference from the
2002 array element type. A pointer to that can be trivially converted
2003 to void *. This happens as we fold (void *)(ptr p+ off). */
2004 if (VOID_TYPE_P (ptd_type
)
2005 && TREE_CODE (TREE_TYPE (op0
)) == ARRAY_TYPE
)
2006 ptd_type
= TREE_TYPE (TREE_TYPE (op0
));
2008 /* At which point we can try some of the same things as for indirects. */
2009 t
= maybe_fold_offset_to_array_ref (op0
, op1
, ptd_type
, true);
2011 t
= maybe_fold_offset_to_component_ref (TREE_TYPE (op0
), op0
, op1
,
2014 t
= build1 (ADDR_EXPR
, ptr_type
, t
);
2019 /* For passing state through walk_tree into fold_stmt_r and its
2022 struct fold_stmt_r_data
2026 bool *inside_addr_expr_p
;
2029 /* Subroutine of fold_stmt called via walk_tree. We perform several
2030 simplifications of EXPR_P, mostly having to do with pointer arithmetic. */
2033 fold_stmt_r (tree
*expr_p
, int *walk_subtrees
, void *data
)
2035 struct fold_stmt_r_data
*fold_stmt_r_data
= (struct fold_stmt_r_data
*) data
;
2036 bool *inside_addr_expr_p
= fold_stmt_r_data
->inside_addr_expr_p
;
2037 bool *changed_p
= fold_stmt_r_data
->changed_p
;
2038 tree expr
= *expr_p
, t
;
2039 bool volatile_p
= TREE_THIS_VOLATILE (expr
);
2041 /* ??? It'd be nice if walk_tree had a pre-order option. */
2042 switch (TREE_CODE (expr
))
2045 t
= walk_tree (&TREE_OPERAND (expr
, 0), fold_stmt_r
, data
, NULL
);
2050 t
= maybe_fold_stmt_indirect (expr
, TREE_OPERAND (expr
, 0),
2053 && TREE_CODE (TREE_OPERAND (expr
, 0)) == ADDR_EXPR
)
2054 /* If we had a good reason for propagating the address here,
2055 make sure we end up with valid gimple. See PR34989. */
2056 t
= TREE_OPERAND (TREE_OPERAND (expr
, 0), 0);
2060 t
= walk_tree (&TREE_OPERAND (expr
, 0), fold_stmt_r
, data
, NULL
);
2065 if (POINTER_TYPE_P (TREE_TYPE (expr
))
2066 && POINTER_TYPE_P (TREE_TYPE (TREE_OPERAND (expr
, 0)))
2067 && (t
= maybe_fold_offset_to_reference
2068 (TREE_OPERAND (expr
, 0),
2070 TREE_TYPE (TREE_TYPE (expr
)))))
2072 tree ptr_type
= build_pointer_type (TREE_TYPE (t
));
2073 if (!useless_type_conversion_p (TREE_TYPE (expr
), ptr_type
))
2075 t
= build_fold_addr_expr_with_type (t
, ptr_type
);
2079 /* ??? Could handle more ARRAY_REFs here, as a variant of INDIRECT_REF.
2080 We'd only want to bother decomposing an existing ARRAY_REF if
2081 the base array is found to have another offset contained within.
2082 Otherwise we'd be wasting time. */
2084 /* If we are not processing expressions found within an
2085 ADDR_EXPR, then we can fold constant array references. */
2086 if (!*inside_addr_expr_p
)
2087 t
= fold_read_from_constant_string (expr
);
2093 *inside_addr_expr_p
= true;
2094 t
= walk_tree (&TREE_OPERAND (expr
, 0), fold_stmt_r
, data
, NULL
);
2095 *inside_addr_expr_p
= false;
2100 /* Set TREE_INVARIANT properly so that the value is properly
2101 considered constant, and so gets propagated as expected. */
2103 recompute_tree_invariant_for_addr_expr (expr
);
2106 case POINTER_PLUS_EXPR
:
2107 t
= walk_tree (&TREE_OPERAND (expr
, 0), fold_stmt_r
, data
, NULL
);
2110 t
= walk_tree (&TREE_OPERAND (expr
, 1), fold_stmt_r
, data
, NULL
);
2115 t
= maybe_fold_stmt_addition (expr
);
2119 t
= walk_tree (&TREE_OPERAND (expr
, 0), fold_stmt_r
, data
, NULL
);
2124 /* Make sure the FIELD_DECL is actually a field in the type on the lhs.
2125 We've already checked that the records are compatible, so we should
2126 come up with a set of compatible fields. */
2128 tree expr_record
= TREE_TYPE (TREE_OPERAND (expr
, 0));
2129 tree expr_field
= TREE_OPERAND (expr
, 1);
2131 if (DECL_FIELD_CONTEXT (expr_field
) != TYPE_MAIN_VARIANT (expr_record
))
2133 expr_field
= find_compatible_field (expr_record
, expr_field
);
2134 TREE_OPERAND (expr
, 1) = expr_field
;
2139 case TARGET_MEM_REF
:
2140 t
= maybe_fold_tmr (expr
);
2144 if (COMPARISON_CLASS_P (TREE_OPERAND (expr
, 0)))
2146 tree op0
= TREE_OPERAND (expr
, 0);
2150 fold_defer_overflow_warnings ();
2151 tem
= fold_binary (TREE_CODE (op0
), TREE_TYPE (op0
),
2152 TREE_OPERAND (op0
, 0),
2153 TREE_OPERAND (op0
, 1));
2154 set
= tem
&& set_rhs (expr_p
, tem
);
2155 fold_undefer_overflow_warnings (set
, fold_stmt_r_data
->stmt
, 0);
2170 /* Preserve volatileness of the original expression. */
2171 TREE_THIS_VOLATILE (t
) = volatile_p
;
2180 /* Return the string length, maximum string length or maximum value of
2182 If ARG is an SSA name variable, follow its use-def chains. If LENGTH
2183 is not NULL and, for TYPE == 0, its value is not equal to the length
2184 we determine or if we are unable to determine the length or value,
2185 return false. VISITED is a bitmap of visited variables.
2186 TYPE is 0 if string length should be returned, 1 for maximum string
2187 length and 2 for maximum value ARG can have. */
2190 get_maxval_strlen (tree arg
, tree
*length
, bitmap visited
, int type
)
2192 tree var
, def_stmt
, val
;
2194 if (TREE_CODE (arg
) != SSA_NAME
)
2196 if (TREE_CODE (arg
) == COND_EXPR
)
2197 return get_maxval_strlen (COND_EXPR_THEN (arg
), length
, visited
, type
)
2198 && get_maxval_strlen (COND_EXPR_ELSE (arg
), length
, visited
, type
);
2199 /* We can end up with &(*iftmp_1)[0] here as well, so handle it. */
2200 else if (TREE_CODE (arg
) == ADDR_EXPR
2201 && TREE_CODE (TREE_OPERAND (arg
, 0)) == ARRAY_REF
2202 && integer_zerop (TREE_OPERAND (TREE_OPERAND (arg
, 0), 1)))
2204 tree aop0
= TREE_OPERAND (TREE_OPERAND (arg
, 0), 0);
2205 if (TREE_CODE (aop0
) == INDIRECT_REF
2206 && TREE_CODE (TREE_OPERAND (aop0
, 0)) == SSA_NAME
)
2207 return get_maxval_strlen (TREE_OPERAND (aop0
, 0),
2208 length
, visited
, type
);
2214 if (TREE_CODE (val
) != INTEGER_CST
2215 || tree_int_cst_sgn (val
) < 0)
2219 val
= c_strlen (arg
, 1);
2227 if (TREE_CODE (*length
) != INTEGER_CST
2228 || TREE_CODE (val
) != INTEGER_CST
)
2231 if (tree_int_cst_lt (*length
, val
))
2235 else if (simple_cst_equal (val
, *length
) != 1)
2243 /* If we were already here, break the infinite cycle. */
2244 if (bitmap_bit_p (visited
, SSA_NAME_VERSION (arg
)))
2246 bitmap_set_bit (visited
, SSA_NAME_VERSION (arg
));
2249 def_stmt
= SSA_NAME_DEF_STMT (var
);
2251 switch (TREE_CODE (def_stmt
))
2253 case GIMPLE_MODIFY_STMT
:
2257 /* The RHS of the statement defining VAR must either have a
2258 constant length or come from another SSA_NAME with a constant
2260 rhs
= GIMPLE_STMT_OPERAND (def_stmt
, 1);
2262 return get_maxval_strlen (rhs
, length
, visited
, type
);
2267 /* All the arguments of the PHI node must have the same constant
2271 for (i
= 0; i
< PHI_NUM_ARGS (def_stmt
); i
++)
2273 tree arg
= PHI_ARG_DEF (def_stmt
, i
);
2275 /* If this PHI has itself as an argument, we cannot
2276 determine the string length of this argument. However,
2277 if we can find a constant string length for the other
2278 PHI args then we can still be sure that this is a
2279 constant string length. So be optimistic and just
2280 continue with the next argument. */
2281 if (arg
== PHI_RESULT (def_stmt
))
2284 if (!get_maxval_strlen (arg
, length
, visited
, type
))
2300 /* Fold builtin call FN in statement STMT. If it cannot be folded into a
2301 constant, return NULL_TREE. Otherwise, return its constant value. */
2304 ccp_fold_builtin (tree stmt
, tree fn
)
2306 tree result
, val
[3];
2308 int arg_mask
, i
, type
;
2311 call_expr_arg_iterator iter
;
2314 ignore
= TREE_CODE (stmt
) != GIMPLE_MODIFY_STMT
;
2316 /* First try the generic builtin folder. If that succeeds, return the
2318 result
= fold_call_expr (fn
, ignore
);
2322 STRIP_NOPS (result
);
2326 /* Ignore MD builtins. */
2327 callee
= get_callee_fndecl (fn
);
2328 if (DECL_BUILT_IN_CLASS (callee
) == BUILT_IN_MD
)
2331 /* If the builtin could not be folded, and it has no argument list,
2333 nargs
= call_expr_nargs (fn
);
2337 /* Limit the work only for builtins we know how to simplify. */
2338 switch (DECL_FUNCTION_CODE (callee
))
2340 case BUILT_IN_STRLEN
:
2341 case BUILT_IN_FPUTS
:
2342 case BUILT_IN_FPUTS_UNLOCKED
:
2346 case BUILT_IN_STRCPY
:
2347 case BUILT_IN_STRNCPY
:
2351 case BUILT_IN_MEMCPY_CHK
:
2352 case BUILT_IN_MEMPCPY_CHK
:
2353 case BUILT_IN_MEMMOVE_CHK
:
2354 case BUILT_IN_MEMSET_CHK
:
2355 case BUILT_IN_STRNCPY_CHK
:
2359 case BUILT_IN_STRCPY_CHK
:
2360 case BUILT_IN_STPCPY_CHK
:
2364 case BUILT_IN_SNPRINTF_CHK
:
2365 case BUILT_IN_VSNPRINTF_CHK
:
2373 /* Try to use the dataflow information gathered by the CCP process. */
2374 visited
= BITMAP_ALLOC (NULL
);
2376 memset (val
, 0, sizeof (val
));
2377 init_call_expr_arg_iterator (fn
, &iter
);
2378 for (i
= 0; arg_mask
; i
++, arg_mask
>>= 1)
2380 a
= next_call_expr_arg (&iter
);
2383 bitmap_clear (visited
);
2384 if (!get_maxval_strlen (a
, &val
[i
], visited
, type
))
2389 BITMAP_FREE (visited
);
2392 switch (DECL_FUNCTION_CODE (callee
))
2394 case BUILT_IN_STRLEN
:
2397 tree new_val
= fold_convert (TREE_TYPE (fn
), val
[0]);
2399 /* If the result is not a valid gimple value, or not a cast
2400 of a valid gimple value, then we can not use the result. */
2401 if (is_gimple_val (new_val
)
2402 || (is_gimple_cast (new_val
)
2403 && is_gimple_val (TREE_OPERAND (new_val
, 0))))
2408 case BUILT_IN_STRCPY
:
2409 if (val
[1] && is_gimple_val (val
[1]) && nargs
== 2)
2410 result
= fold_builtin_strcpy (callee
,
2411 CALL_EXPR_ARG (fn
, 0),
2412 CALL_EXPR_ARG (fn
, 1),
2416 case BUILT_IN_STRNCPY
:
2417 if (val
[1] && is_gimple_val (val
[1]) && nargs
== 3)
2418 result
= fold_builtin_strncpy (callee
,
2419 CALL_EXPR_ARG (fn
, 0),
2420 CALL_EXPR_ARG (fn
, 1),
2421 CALL_EXPR_ARG (fn
, 2),
2425 case BUILT_IN_FPUTS
:
2426 result
= fold_builtin_fputs (CALL_EXPR_ARG (fn
, 0),
2427 CALL_EXPR_ARG (fn
, 1),
2428 TREE_CODE (stmt
) != GIMPLE_MODIFY_STMT
, 0,
2432 case BUILT_IN_FPUTS_UNLOCKED
:
2433 result
= fold_builtin_fputs (CALL_EXPR_ARG (fn
, 0),
2434 CALL_EXPR_ARG (fn
, 1),
2435 TREE_CODE (stmt
) != GIMPLE_MODIFY_STMT
, 1,
2439 case BUILT_IN_MEMCPY_CHK
:
2440 case BUILT_IN_MEMPCPY_CHK
:
2441 case BUILT_IN_MEMMOVE_CHK
:
2442 case BUILT_IN_MEMSET_CHK
:
2443 if (val
[2] && is_gimple_val (val
[2]))
2444 result
= fold_builtin_memory_chk (callee
,
2445 CALL_EXPR_ARG (fn
, 0),
2446 CALL_EXPR_ARG (fn
, 1),
2447 CALL_EXPR_ARG (fn
, 2),
2448 CALL_EXPR_ARG (fn
, 3),
2450 DECL_FUNCTION_CODE (callee
));
2453 case BUILT_IN_STRCPY_CHK
:
2454 case BUILT_IN_STPCPY_CHK
:
2455 if (val
[1] && is_gimple_val (val
[1]))
2456 result
= fold_builtin_stxcpy_chk (callee
,
2457 CALL_EXPR_ARG (fn
, 0),
2458 CALL_EXPR_ARG (fn
, 1),
2459 CALL_EXPR_ARG (fn
, 2),
2461 DECL_FUNCTION_CODE (callee
));
2464 case BUILT_IN_STRNCPY_CHK
:
2465 if (val
[2] && is_gimple_val (val
[2]))
2466 result
= fold_builtin_strncpy_chk (CALL_EXPR_ARG (fn
, 0),
2467 CALL_EXPR_ARG (fn
, 1),
2468 CALL_EXPR_ARG (fn
, 2),
2469 CALL_EXPR_ARG (fn
, 3),
2473 case BUILT_IN_SNPRINTF_CHK
:
2474 case BUILT_IN_VSNPRINTF_CHK
:
2475 if (val
[1] && is_gimple_val (val
[1]))
2476 result
= fold_builtin_snprintf_chk (fn
, val
[1],
2477 DECL_FUNCTION_CODE (callee
));
2484 if (result
&& ignore
)
2485 result
= fold_ignored_result (result
);
2490 /* Fold the statement pointed to by STMT_P. In some cases, this function may
2491 replace the whole statement with a new one. Returns true iff folding
2492 makes any changes. */
2495 fold_stmt (tree
*stmt_p
)
2497 tree rhs
, result
, stmt
;
2498 struct fold_stmt_r_data fold_stmt_r_data
;
2499 bool changed
= false;
2500 bool inside_addr_expr
= false;
2504 fold_stmt_r_data
.stmt
= stmt
;
2505 fold_stmt_r_data
.changed_p
= &changed
;
2506 fold_stmt_r_data
.inside_addr_expr_p
= &inside_addr_expr
;
2508 /* If we replaced constants and the statement makes pointer dereferences,
2509 then we may need to fold instances of *&VAR into VAR, etc. */
2510 if (walk_tree (stmt_p
, fold_stmt_r
, &fold_stmt_r_data
, NULL
))
2512 *stmt_p
= build_call_expr (implicit_built_in_decls
[BUILT_IN_TRAP
], 0);
2516 rhs
= get_rhs (stmt
);
2521 if (TREE_CODE (rhs
) == CALL_EXPR
)
2525 /* Check for builtins that CCP can handle using information not
2526 available in the generic fold routines. */
2527 callee
= get_callee_fndecl (rhs
);
2528 if (callee
&& DECL_BUILT_IN (callee
))
2529 result
= ccp_fold_builtin (stmt
, rhs
);
2532 /* Check for resolvable OBJ_TYPE_REF. The only sorts we can resolve
2533 here are when we've propagated the address of a decl into the
2535 /* ??? Should perhaps do this in fold proper. However, doing it
2536 there requires that we create a new CALL_EXPR, and that requires
2537 copying EH region info to the new node. Easier to just do it
2538 here where we can just smash the call operand. Also
2539 CALL_EXPR_RETURN_SLOT_OPT needs to be handled correctly and
2540 copied, fold_call_expr does not have not information. */
2541 callee
= CALL_EXPR_FN (rhs
);
2542 if (TREE_CODE (callee
) == OBJ_TYPE_REF
2543 && lang_hooks
.fold_obj_type_ref
2544 && TREE_CODE (OBJ_TYPE_REF_OBJECT (callee
)) == ADDR_EXPR
2545 && DECL_P (TREE_OPERAND
2546 (OBJ_TYPE_REF_OBJECT (callee
), 0)))
2550 /* ??? Caution: Broken ADDR_EXPR semantics means that
2551 looking at the type of the operand of the addr_expr
2552 can yield an array type. See silly exception in
2553 check_pointer_types_r. */
2555 t
= TREE_TYPE (TREE_TYPE (OBJ_TYPE_REF_OBJECT (callee
)));
2556 t
= lang_hooks
.fold_obj_type_ref (callee
, t
);
2559 CALL_EXPR_FN (rhs
) = t
;
2565 else if (TREE_CODE (rhs
) == COND_EXPR
)
2567 tree temp
= fold (COND_EXPR_COND (rhs
));
2568 if (temp
!= COND_EXPR_COND (rhs
))
2569 result
= fold_build3 (COND_EXPR
, TREE_TYPE (rhs
), temp
,
2570 COND_EXPR_THEN (rhs
), COND_EXPR_ELSE (rhs
));
2573 /* If we couldn't fold the RHS, hand over to the generic fold routines. */
2574 if (result
== NULL_TREE
)
2575 result
= fold (rhs
);
2577 /* Strip away useless type conversions. Both the NON_LVALUE_EXPR that
2578 may have been added by fold, and "useless" type conversions that might
2579 now be apparent due to propagation. */
2580 STRIP_USELESS_TYPE_CONVERSION (result
);
2583 changed
|= set_rhs (stmt_p
, result
);
2588 /* Perform the minimal folding on statement STMT. Only operations like
2589 *&x created by constant propagation are handled. The statement cannot
2590 be replaced with a new one. */
2593 fold_stmt_inplace (tree stmt
)
2595 tree old_stmt
= stmt
, rhs
, new_rhs
;
2596 struct fold_stmt_r_data fold_stmt_r_data
;
2597 bool changed
= false;
2598 bool inside_addr_expr
= false;
2600 fold_stmt_r_data
.stmt
= stmt
;
2601 fold_stmt_r_data
.changed_p
= &changed
;
2602 fold_stmt_r_data
.inside_addr_expr_p
= &inside_addr_expr
;
2604 walk_tree (&stmt
, fold_stmt_r
, &fold_stmt_r_data
, NULL
);
2605 gcc_assert (stmt
== old_stmt
);
2607 rhs
= get_rhs (stmt
);
2608 if (!rhs
|| rhs
== stmt
)
2611 new_rhs
= fold (rhs
);
2612 STRIP_USELESS_TYPE_CONVERSION (new_rhs
);
2616 changed
|= set_rhs (&stmt
, new_rhs
);
2617 gcc_assert (stmt
== old_stmt
);
2622 /* Try to optimize out __builtin_stack_restore. Optimize it out
2623 if there is another __builtin_stack_restore in the same basic
2624 block and no calls or ASM_EXPRs are in between, or if this block's
2625 only outgoing edge is to EXIT_BLOCK and there are no calls or
2626 ASM_EXPRs after this __builtin_stack_restore. */
2629 optimize_stack_restore (basic_block bb
, tree call
, block_stmt_iterator i
)
2631 tree stack_save
, stmt
, callee
;
2633 if (TREE_CODE (call
) != CALL_EXPR
2634 || call_expr_nargs (call
) != 1
2635 || TREE_CODE (CALL_EXPR_ARG (call
, 0)) != SSA_NAME
2636 || !POINTER_TYPE_P (TREE_TYPE (CALL_EXPR_ARG (call
, 0))))
2639 for (bsi_next (&i
); !bsi_end_p (i
); bsi_next (&i
))
2643 stmt
= bsi_stmt (i
);
2644 if (TREE_CODE (stmt
) == ASM_EXPR
)
2646 call
= get_call_expr_in (stmt
);
2650 callee
= get_callee_fndecl (call
);
2651 if (!callee
|| DECL_BUILT_IN_CLASS (callee
) != BUILT_IN_NORMAL
)
2654 if (DECL_FUNCTION_CODE (callee
) == BUILT_IN_STACK_RESTORE
)
2659 && (! single_succ_p (bb
)
2660 || single_succ_edge (bb
)->dest
!= EXIT_BLOCK_PTR
))
2663 stack_save
= SSA_NAME_DEF_STMT (CALL_EXPR_ARG (call
, 0));
2664 if (TREE_CODE (stack_save
) != GIMPLE_MODIFY_STMT
2665 || GIMPLE_STMT_OPERAND (stack_save
, 0) != CALL_EXPR_ARG (call
, 0)
2666 || TREE_CODE (GIMPLE_STMT_OPERAND (stack_save
, 1)) != CALL_EXPR
2667 || tree_could_throw_p (stack_save
)
2668 || !has_single_use (CALL_EXPR_ARG (call
, 0)))
2671 callee
= get_callee_fndecl (GIMPLE_STMT_OPERAND (stack_save
, 1));
2673 || DECL_BUILT_IN_CLASS (callee
) != BUILT_IN_NORMAL
2674 || DECL_FUNCTION_CODE (callee
) != BUILT_IN_STACK_SAVE
2675 || call_expr_nargs (GIMPLE_STMT_OPERAND (stack_save
, 1)) != 0)
2679 push_stmt_changes (&stmt
);
2680 if (!set_rhs (&stmt
,
2681 build_int_cst (TREE_TYPE (CALL_EXPR_ARG (call
, 0)), 0)))
2683 discard_stmt_changes (&stmt
);
2686 gcc_assert (stmt
== stack_save
);
2687 pop_stmt_changes (&stmt
);
2689 return integer_zero_node
;
2692 /* If va_list type is a simple pointer and nothing special is needed,
2693 optimize __builtin_va_start (&ap, 0) into ap = __builtin_next_arg (0),
2694 __builtin_va_end (&ap) out as NOP and __builtin_va_copy into a simple
2695 pointer assignment. */
2698 optimize_stdarg_builtin (tree call
)
2700 tree callee
, lhs
, rhs
;
2701 bool va_list_simple_ptr
;
2703 if (TREE_CODE (call
) != CALL_EXPR
)
2706 va_list_simple_ptr
= POINTER_TYPE_P (va_list_type_node
)
2707 && (TREE_TYPE (va_list_type_node
) == void_type_node
2708 || TREE_TYPE (va_list_type_node
) == char_type_node
);
2710 callee
= get_callee_fndecl (call
);
2711 switch (DECL_FUNCTION_CODE (callee
))
2713 case BUILT_IN_VA_START
:
2714 if (!va_list_simple_ptr
2715 || targetm
.expand_builtin_va_start
!= NULL
2716 || built_in_decls
[BUILT_IN_NEXT_ARG
] == NULL
)
2719 if (call_expr_nargs (call
) != 2)
2722 lhs
= CALL_EXPR_ARG (call
, 0);
2723 if (!POINTER_TYPE_P (TREE_TYPE (lhs
))
2724 || TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (lhs
)))
2725 != TYPE_MAIN_VARIANT (va_list_type_node
))
2728 lhs
= build_fold_indirect_ref (lhs
);
2729 rhs
= build_call_expr (built_in_decls
[BUILT_IN_NEXT_ARG
],
2730 1, integer_zero_node
);
2731 rhs
= fold_convert (TREE_TYPE (lhs
), rhs
);
2732 return build2 (MODIFY_EXPR
, TREE_TYPE (lhs
), lhs
, rhs
);
2734 case BUILT_IN_VA_COPY
:
2735 if (!va_list_simple_ptr
)
2738 if (call_expr_nargs (call
) != 2)
2741 lhs
= CALL_EXPR_ARG (call
, 0);
2742 if (!POINTER_TYPE_P (TREE_TYPE (lhs
))
2743 || TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (lhs
)))
2744 != TYPE_MAIN_VARIANT (va_list_type_node
))
2747 lhs
= build_fold_indirect_ref (lhs
);
2748 rhs
= CALL_EXPR_ARG (call
, 1);
2749 if (TYPE_MAIN_VARIANT (TREE_TYPE (rhs
))
2750 != TYPE_MAIN_VARIANT (va_list_type_node
))
2753 rhs
= fold_convert (TREE_TYPE (lhs
), rhs
);
2754 return build2 (MODIFY_EXPR
, TREE_TYPE (lhs
), lhs
, rhs
);
2756 case BUILT_IN_VA_END
:
2757 return integer_zero_node
;
2764 /* Convert EXPR into a GIMPLE value suitable for substitution on the
2765 RHS of an assignment. Insert the necessary statements before
2767 When IGNORE is set, don't worry about the return value. */
2770 convert_to_gimple_builtin (block_stmt_iterator
*si_p
, tree expr
, bool ignore
)
2772 tree_stmt_iterator ti
;
2773 tree stmt
= bsi_stmt (*si_p
);
2774 tree tmp
, stmts
= NULL
;
2776 push_gimplify_context ();
2779 tmp
= build_empty_stmt ();
2780 gimplify_and_add (expr
, &stmts
);
2783 tmp
= get_initialized_tmp_var (expr
, &stmts
, NULL
);
2784 pop_gimplify_context (NULL
);
2786 if (EXPR_HAS_LOCATION (stmt
))
2787 annotate_all_with_locus (&stmts
, EXPR_LOCATION (stmt
));
2789 /* The replacement can expose previously unreferenced variables. */
2790 for (ti
= tsi_start (stmts
); !tsi_end_p (ti
); tsi_next (&ti
))
2792 tree new_stmt
= tsi_stmt (ti
);
2793 find_new_referenced_vars (tsi_stmt_ptr (ti
));
2794 bsi_insert_before (si_p
, new_stmt
, BSI_NEW_STMT
);
2795 mark_symbols_for_renaming (new_stmt
);
2803 /* A simple pass that attempts to fold all builtin functions. This pass
2804 is run after we've propagated as many constants as we can. */
2807 execute_fold_all_builtins (void)
2809 bool cfg_changed
= false;
2811 unsigned int todoflags
= 0;
2815 block_stmt_iterator i
;
2816 for (i
= bsi_start (bb
); !bsi_end_p (i
); )
2818 tree
*stmtp
= bsi_stmt_ptr (i
);
2819 tree old_stmt
= *stmtp
;
2820 tree call
= get_rhs (*stmtp
);
2821 tree callee
, result
;
2822 enum built_in_function fcode
;
2824 if (!call
|| TREE_CODE (call
) != CALL_EXPR
)
2829 callee
= get_callee_fndecl (call
);
2830 if (!callee
|| DECL_BUILT_IN_CLASS (callee
) != BUILT_IN_NORMAL
)
2835 fcode
= DECL_FUNCTION_CODE (callee
);
2837 result
= ccp_fold_builtin (*stmtp
, call
);
2839 switch (DECL_FUNCTION_CODE (callee
))
2841 case BUILT_IN_CONSTANT_P
:
2842 /* Resolve __builtin_constant_p. If it hasn't been
2843 folded to integer_one_node by now, it's fairly
2844 certain that the value simply isn't constant. */
2845 result
= integer_zero_node
;
2848 case BUILT_IN_STACK_RESTORE
:
2849 result
= optimize_stack_restore (bb
, *stmtp
, i
);
2855 case BUILT_IN_VA_START
:
2856 case BUILT_IN_VA_END
:
2857 case BUILT_IN_VA_COPY
:
2858 /* These shouldn't be folded before pass_stdarg. */
2859 result
= optimize_stdarg_builtin (*stmtp
);
2869 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
2871 fprintf (dump_file
, "Simplified\n ");
2872 print_generic_stmt (dump_file
, *stmtp
, dump_flags
);
2875 push_stmt_changes (stmtp
);
2877 if (!set_rhs (stmtp
, result
))
2879 result
= convert_to_gimple_builtin (&i
, result
,
2880 TREE_CODE (old_stmt
)
2881 != GIMPLE_MODIFY_STMT
);
2884 bool ok
= set_rhs (stmtp
, result
);
2886 todoflags
|= TODO_rebuild_alias
;
2890 pop_stmt_changes (stmtp
);
2892 if (maybe_clean_or_replace_eh_stmt (old_stmt
, *stmtp
)
2893 && tree_purge_dead_eh_edges (bb
))
2896 if (dump_file
&& (dump_flags
& TDF_DETAILS
))
2898 fprintf (dump_file
, "to\n ");
2899 print_generic_stmt (dump_file
, *stmtp
, dump_flags
);
2900 fprintf (dump_file
, "\n");
2903 /* Retry the same statement if it changed into another
2904 builtin, there might be new opportunities now. */
2905 call
= get_rhs (*stmtp
);
2906 if (!call
|| TREE_CODE (call
) != CALL_EXPR
)
2911 callee
= get_callee_fndecl (call
);
2913 || DECL_BUILT_IN_CLASS (callee
) != BUILT_IN_NORMAL
2914 || DECL_FUNCTION_CODE (callee
) == fcode
)
2919 /* Delete unreachable blocks. */
2921 todoflags
|= TODO_cleanup_cfg
;
2927 struct gimple_opt_pass pass_fold_builtins
=
2933 execute_fold_all_builtins
, /* execute */
2936 0, /* static_pass_number */
2938 PROP_cfg
| PROP_ssa
, /* properties_required */
2939 0, /* properties_provided */
2940 0, /* properties_destroyed */
2941 0, /* todo_flags_start */
2944 | TODO_update_ssa
/* todo_flags_finish */