1 /* Tree lowering pass. This pass converts the GENERIC functions-as-trees
2 tree representation into the GIMPLE form.
3 Copyright (C) 2002-2017 Free Software Foundation, Inc.
4 Major work done by Sebastian Pop <s.pop@laposte.net>,
5 Diego Novillo <dnovillo@redhat.com> and Jason Merrill <jason@redhat.com>.
7 This file is part of GCC.
9 GCC is free software; you can redistribute it and/or modify it under
10 the terms of the GNU General Public License as published by the Free
11 Software Foundation; either version 3, or (at your option) any later
14 GCC is distributed in the hope that it will be useful, but WITHOUT ANY
15 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/>. */
25 #include "coretypes.h"
31 #include "gimple-predict.h"
32 #include "tree-pass.h" /* FIXME: only for PROP_gimple_any */
35 #include "tree-pretty-print.h"
36 #include "diagnostic-core.h"
38 #include "fold-const.h"
43 #include "gimple-fold.h"
46 #include "gimple-iterator.h"
47 #include "stor-layout.h"
48 #include "print-tree.h"
49 #include "tree-iterator.h"
50 #include "tree-inline.h"
51 #include "langhooks.h"
54 #include "omp-general.h"
56 #include "gimple-low.h"
58 #include "gomp-constants.h"
59 #include "splay-tree.h"
60 #include "gimple-walk.h"
61 #include "langhooks-def.h" /* FIXME: for lhd_set_decl_assembler_name */
66 /* Hash set of poisoned variables in a bind expr. */
67 static hash_set
<tree
> *asan_poisoned_variables
= NULL
;
69 enum gimplify_omp_var_data
75 GOVD_FIRSTPRIVATE
= 16,
76 GOVD_LASTPRIVATE
= 32,
80 GOVD_DEBUG_PRIVATE
= 512,
81 GOVD_PRIVATE_OUTER_REF
= 1024,
85 /* Flag for GOVD_MAP: don't copy back. */
86 GOVD_MAP_TO_ONLY
= 8192,
88 /* Flag for GOVD_LINEAR or GOVD_LASTPRIVATE: no outer reference. */
89 GOVD_LINEAR_LASTPRIVATE_NO_OUTER
= 16384,
91 GOVD_MAP_0LEN_ARRAY
= 32768,
93 /* Flag for GOVD_MAP, if it is always, to or always, tofrom mapping. */
94 GOVD_MAP_ALWAYS_TO
= 65536,
96 /* Flag for shared vars that are or might be stored to in the region. */
97 GOVD_WRITTEN
= 131072,
99 /* Flag for GOVD_MAP, if it is a forced mapping. */
100 GOVD_MAP_FORCE
= 262144,
102 /* Flag for GOVD_MAP: must be present already. */
103 GOVD_MAP_FORCE_PRESENT
= 524288,
105 GOVD_DATA_SHARE_CLASS
= (GOVD_SHARED
| GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
106 | GOVD_LASTPRIVATE
| GOVD_REDUCTION
| GOVD_LINEAR
113 ORT_WORKSHARE
= 0x00,
117 ORT_COMBINED_PARALLEL
= 0x03,
120 ORT_UNTIED_TASK
= 0x05,
123 ORT_COMBINED_TEAMS
= 0x09,
126 ORT_TARGET_DATA
= 0x10,
128 /* Data region with offloading. */
130 ORT_COMBINED_TARGET
= 0x21,
132 /* OpenACC variants. */
133 ORT_ACC
= 0x40, /* A generic OpenACC region. */
134 ORT_ACC_DATA
= ORT_ACC
| ORT_TARGET_DATA
, /* Data construct. */
135 ORT_ACC_PARALLEL
= ORT_ACC
| ORT_TARGET
, /* Parallel construct */
136 ORT_ACC_KERNELS
= ORT_ACC
| ORT_TARGET
| 0x80, /* Kernels construct. */
137 ORT_ACC_HOST_DATA
= ORT_ACC
| ORT_TARGET_DATA
| 0x80, /* Host data. */
139 /* Dummy OpenMP region, used to disable expansion of
140 DECL_VALUE_EXPRs in taskloop pre body. */
144 /* Gimplify hashtable helper. */
146 struct gimplify_hasher
: free_ptr_hash
<elt_t
>
148 static inline hashval_t
hash (const elt_t
*);
149 static inline bool equal (const elt_t
*, const elt_t
*);
154 struct gimplify_ctx
*prev_context
;
156 vec
<gbind
*> bind_expr_stack
;
158 gimple_seq conditional_cleanups
;
162 vec
<tree
> case_labels
;
163 hash_set
<tree
> *live_switch_vars
;
164 /* The formal temporary table. Should this be persistent? */
165 hash_table
<gimplify_hasher
> *temp_htab
;
168 unsigned into_ssa
: 1;
169 unsigned allow_rhs_cond_expr
: 1;
170 unsigned in_cleanup_point_expr
: 1;
171 unsigned keep_stack
: 1;
172 unsigned save_stack
: 1;
173 unsigned in_switch_expr
: 1;
176 struct gimplify_omp_ctx
178 struct gimplify_omp_ctx
*outer_context
;
179 splay_tree variables
;
180 hash_set
<tree
> *privatized_types
;
181 /* Iteration variables in an OMP_FOR. */
182 vec
<tree
> loop_iter_var
;
184 enum omp_clause_default_kind default_kind
;
185 enum omp_region_type region_type
;
188 bool target_map_scalars_firstprivate
;
189 bool target_map_pointers_as_0len_arrays
;
190 bool target_firstprivatize_array_bases
;
193 static struct gimplify_ctx
*gimplify_ctxp
;
194 static struct gimplify_omp_ctx
*gimplify_omp_ctxp
;
196 /* Forward declaration. */
197 static enum gimplify_status
gimplify_compound_expr (tree
*, gimple_seq
*, bool);
198 static hash_map
<tree
, tree
> *oacc_declare_returns
;
199 static enum gimplify_status
gimplify_expr (tree
*, gimple_seq
*, gimple_seq
*,
200 bool (*) (tree
), fallback_t
, bool);
202 /* Shorter alias name for the above function for use in gimplify.c
206 gimplify_seq_add_stmt (gimple_seq
*seq_p
, gimple
*gs
)
208 gimple_seq_add_stmt_without_update (seq_p
, gs
);
211 /* Append sequence SRC to the end of sequence *DST_P. If *DST_P is
212 NULL, a new sequence is allocated. This function is
213 similar to gimple_seq_add_seq, but does not scan the operands.
214 During gimplification, we need to manipulate statement sequences
215 before the def/use vectors have been constructed. */
218 gimplify_seq_add_seq (gimple_seq
*dst_p
, gimple_seq src
)
220 gimple_stmt_iterator si
;
225 si
= gsi_last (*dst_p
);
226 gsi_insert_seq_after_without_update (&si
, src
, GSI_NEW_STMT
);
230 /* Pointer to a list of allocated gimplify_ctx structs to be used for pushing
231 and popping gimplify contexts. */
233 static struct gimplify_ctx
*ctx_pool
= NULL
;
235 /* Return a gimplify context struct from the pool. */
237 static inline struct gimplify_ctx
*
240 struct gimplify_ctx
* c
= ctx_pool
;
243 ctx_pool
= c
->prev_context
;
245 c
= XNEW (struct gimplify_ctx
);
247 memset (c
, '\0', sizeof (*c
));
251 /* Put gimplify context C back into the pool. */
254 ctx_free (struct gimplify_ctx
*c
)
256 c
->prev_context
= ctx_pool
;
260 /* Free allocated ctx stack memory. */
263 free_gimplify_stack (void)
265 struct gimplify_ctx
*c
;
267 while ((c
= ctx_pool
))
269 ctx_pool
= c
->prev_context
;
275 /* Set up a context for the gimplifier. */
278 push_gimplify_context (bool in_ssa
, bool rhs_cond_ok
)
280 struct gimplify_ctx
*c
= ctx_alloc ();
282 c
->prev_context
= gimplify_ctxp
;
284 gimplify_ctxp
->into_ssa
= in_ssa
;
285 gimplify_ctxp
->allow_rhs_cond_expr
= rhs_cond_ok
;
288 /* Tear down a context for the gimplifier. If BODY is non-null, then
289 put the temporaries into the outer BIND_EXPR. Otherwise, put them
292 BODY is not a sequence, but the first tuple in a sequence. */
295 pop_gimplify_context (gimple
*body
)
297 struct gimplify_ctx
*c
= gimplify_ctxp
;
300 && (!c
->bind_expr_stack
.exists ()
301 || c
->bind_expr_stack
.is_empty ()));
302 c
->bind_expr_stack
.release ();
303 gimplify_ctxp
= c
->prev_context
;
306 declare_vars (c
->temps
, body
, false);
308 record_vars (c
->temps
);
315 /* Push a GIMPLE_BIND tuple onto the stack of bindings. */
318 gimple_push_bind_expr (gbind
*bind_stmt
)
320 gimplify_ctxp
->bind_expr_stack
.reserve (8);
321 gimplify_ctxp
->bind_expr_stack
.safe_push (bind_stmt
);
324 /* Pop the first element off the stack of bindings. */
327 gimple_pop_bind_expr (void)
329 gimplify_ctxp
->bind_expr_stack
.pop ();
332 /* Return the first element of the stack of bindings. */
335 gimple_current_bind_expr (void)
337 return gimplify_ctxp
->bind_expr_stack
.last ();
340 /* Return the stack of bindings created during gimplification. */
343 gimple_bind_expr_stack (void)
345 return gimplify_ctxp
->bind_expr_stack
;
348 /* Return true iff there is a COND_EXPR between us and the innermost
349 CLEANUP_POINT_EXPR. This info is used by gimple_push_cleanup. */
352 gimple_conditional_context (void)
354 return gimplify_ctxp
->conditions
> 0;
357 /* Note that we've entered a COND_EXPR. */
360 gimple_push_condition (void)
362 #ifdef ENABLE_GIMPLE_CHECKING
363 if (gimplify_ctxp
->conditions
== 0)
364 gcc_assert (gimple_seq_empty_p (gimplify_ctxp
->conditional_cleanups
));
366 ++(gimplify_ctxp
->conditions
);
369 /* Note that we've left a COND_EXPR. If we're back at unconditional scope
370 now, add any conditional cleanups we've seen to the prequeue. */
373 gimple_pop_condition (gimple_seq
*pre_p
)
375 int conds
= --(gimplify_ctxp
->conditions
);
377 gcc_assert (conds
>= 0);
380 gimplify_seq_add_seq (pre_p
, gimplify_ctxp
->conditional_cleanups
);
381 gimplify_ctxp
->conditional_cleanups
= NULL
;
385 /* A stable comparison routine for use with splay trees and DECLs. */
388 splay_tree_compare_decl_uid (splay_tree_key xa
, splay_tree_key xb
)
393 return DECL_UID (a
) - DECL_UID (b
);
396 /* Create a new omp construct that deals with variable remapping. */
398 static struct gimplify_omp_ctx
*
399 new_omp_context (enum omp_region_type region_type
)
401 struct gimplify_omp_ctx
*c
;
403 c
= XCNEW (struct gimplify_omp_ctx
);
404 c
->outer_context
= gimplify_omp_ctxp
;
405 c
->variables
= splay_tree_new (splay_tree_compare_decl_uid
, 0, 0);
406 c
->privatized_types
= new hash_set
<tree
>;
407 c
->location
= input_location
;
408 c
->region_type
= region_type
;
409 if ((region_type
& ORT_TASK
) == 0)
410 c
->default_kind
= OMP_CLAUSE_DEFAULT_SHARED
;
412 c
->default_kind
= OMP_CLAUSE_DEFAULT_UNSPECIFIED
;
417 /* Destroy an omp construct that deals with variable remapping. */
420 delete_omp_context (struct gimplify_omp_ctx
*c
)
422 splay_tree_delete (c
->variables
);
423 delete c
->privatized_types
;
424 c
->loop_iter_var
.release ();
428 static void omp_add_variable (struct gimplify_omp_ctx
*, tree
, unsigned int);
429 static bool omp_notice_variable (struct gimplify_omp_ctx
*, tree
, bool);
431 /* Both gimplify the statement T and append it to *SEQ_P. This function
432 behaves exactly as gimplify_stmt, but you don't have to pass T as a
436 gimplify_and_add (tree t
, gimple_seq
*seq_p
)
438 gimplify_stmt (&t
, seq_p
);
441 /* Gimplify statement T into sequence *SEQ_P, and return the first
442 tuple in the sequence of generated tuples for this statement.
443 Return NULL if gimplifying T produced no tuples. */
446 gimplify_and_return_first (tree t
, gimple_seq
*seq_p
)
448 gimple_stmt_iterator last
= gsi_last (*seq_p
);
450 gimplify_and_add (t
, seq_p
);
452 if (!gsi_end_p (last
))
455 return gsi_stmt (last
);
458 return gimple_seq_first_stmt (*seq_p
);
461 /* Returns true iff T is a valid RHS for an assignment to an un-renamed
462 LHS, or for a call argument. */
465 is_gimple_mem_rhs (tree t
)
467 /* If we're dealing with a renamable type, either source or dest must be
468 a renamed variable. */
469 if (is_gimple_reg_type (TREE_TYPE (t
)))
470 return is_gimple_val (t
);
472 return is_gimple_val (t
) || is_gimple_lvalue (t
);
475 /* Return true if T is a CALL_EXPR or an expression that can be
476 assigned to a temporary. Note that this predicate should only be
477 used during gimplification. See the rationale for this in
478 gimplify_modify_expr. */
481 is_gimple_reg_rhs_or_call (tree t
)
483 return (get_gimple_rhs_class (TREE_CODE (t
)) != GIMPLE_INVALID_RHS
484 || TREE_CODE (t
) == CALL_EXPR
);
487 /* Return true if T is a valid memory RHS or a CALL_EXPR. Note that
488 this predicate should only be used during gimplification. See the
489 rationale for this in gimplify_modify_expr. */
492 is_gimple_mem_rhs_or_call (tree t
)
494 /* If we're dealing with a renamable type, either source or dest must be
495 a renamed variable. */
496 if (is_gimple_reg_type (TREE_TYPE (t
)))
497 return is_gimple_val (t
);
499 return (is_gimple_val (t
)
500 || is_gimple_lvalue (t
)
501 || TREE_CLOBBER_P (t
)
502 || TREE_CODE (t
) == CALL_EXPR
);
505 /* Create a temporary with a name derived from VAL. Subroutine of
506 lookup_tmp_var; nobody else should call this function. */
509 create_tmp_from_val (tree val
)
511 /* Drop all qualifiers and address-space information from the value type. */
512 tree type
= TYPE_MAIN_VARIANT (TREE_TYPE (val
));
513 tree var
= create_tmp_var (type
, get_name (val
));
514 if (TREE_CODE (TREE_TYPE (var
)) == COMPLEX_TYPE
515 || TREE_CODE (TREE_TYPE (var
)) == VECTOR_TYPE
)
516 DECL_GIMPLE_REG_P (var
) = 1;
520 /* Create a temporary to hold the value of VAL. If IS_FORMAL, try to reuse
521 an existing expression temporary. */
524 lookup_tmp_var (tree val
, bool is_formal
)
528 /* If not optimizing, never really reuse a temporary. local-alloc
529 won't allocate any variable that is used in more than one basic
530 block, which means it will go into memory, causing much extra
531 work in reload and final and poorer code generation, outweighing
532 the extra memory allocation here. */
533 if (!optimize
|| !is_formal
|| TREE_SIDE_EFFECTS (val
))
534 ret
= create_tmp_from_val (val
);
541 if (!gimplify_ctxp
->temp_htab
)
542 gimplify_ctxp
->temp_htab
= new hash_table
<gimplify_hasher
> (1000);
543 slot
= gimplify_ctxp
->temp_htab
->find_slot (&elt
, INSERT
);
546 elt_p
= XNEW (elt_t
);
548 elt_p
->temp
= ret
= create_tmp_from_val (val
);
561 /* Helper for get_formal_tmp_var and get_initialized_tmp_var. */
564 internal_get_tmp_var (tree val
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
565 bool is_formal
, bool allow_ssa
)
569 /* Notice that we explicitly allow VAL to be a CALL_EXPR so that we
570 can create an INIT_EXPR and convert it into a GIMPLE_CALL below. */
571 gimplify_expr (&val
, pre_p
, post_p
, is_gimple_reg_rhs_or_call
,
575 && gimplify_ctxp
->into_ssa
576 && is_gimple_reg_type (TREE_TYPE (val
)))
578 t
= make_ssa_name (TYPE_MAIN_VARIANT (TREE_TYPE (val
)));
579 if (! gimple_in_ssa_p (cfun
))
581 const char *name
= get_name (val
);
583 SET_SSA_NAME_VAR_OR_IDENTIFIER (t
, create_tmp_var_name (name
));
587 t
= lookup_tmp_var (val
, is_formal
);
589 mod
= build2 (INIT_EXPR
, TREE_TYPE (t
), t
, unshare_expr (val
));
591 SET_EXPR_LOCATION (mod
, EXPR_LOC_OR_LOC (val
, input_location
));
593 /* gimplify_modify_expr might want to reduce this further. */
594 gimplify_and_add (mod
, pre_p
);
600 /* Return a formal temporary variable initialized with VAL. PRE_P is as
601 in gimplify_expr. Only use this function if:
603 1) The value of the unfactored expression represented by VAL will not
604 change between the initialization and use of the temporary, and
605 2) The temporary will not be otherwise modified.
607 For instance, #1 means that this is inappropriate for SAVE_EXPR temps,
608 and #2 means it is inappropriate for && temps.
610 For other cases, use get_initialized_tmp_var instead. */
613 get_formal_tmp_var (tree val
, gimple_seq
*pre_p
)
615 return internal_get_tmp_var (val
, pre_p
, NULL
, true, true);
618 /* Return a temporary variable initialized with VAL. PRE_P and POST_P
619 are as in gimplify_expr. */
622 get_initialized_tmp_var (tree val
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
625 return internal_get_tmp_var (val
, pre_p
, post_p
, false, allow_ssa
);
628 /* Declare all the variables in VARS in SCOPE. If DEBUG_INFO is true,
629 generate debug info for them; otherwise don't. */
632 declare_vars (tree vars
, gimple
*gs
, bool debug_info
)
639 gbind
*scope
= as_a
<gbind
*> (gs
);
641 temps
= nreverse (last
);
643 block
= gimple_bind_block (scope
);
644 gcc_assert (!block
|| TREE_CODE (block
) == BLOCK
);
645 if (!block
|| !debug_info
)
647 DECL_CHAIN (last
) = gimple_bind_vars (scope
);
648 gimple_bind_set_vars (scope
, temps
);
652 /* We need to attach the nodes both to the BIND_EXPR and to its
653 associated BLOCK for debugging purposes. The key point here
654 is that the BLOCK_VARS of the BIND_EXPR_BLOCK of a BIND_EXPR
655 is a subchain of the BIND_EXPR_VARS of the BIND_EXPR. */
656 if (BLOCK_VARS (block
))
657 BLOCK_VARS (block
) = chainon (BLOCK_VARS (block
), temps
);
660 gimple_bind_set_vars (scope
,
661 chainon (gimple_bind_vars (scope
), temps
));
662 BLOCK_VARS (block
) = temps
;
668 /* For VAR a VAR_DECL of variable size, try to find a constant upper bound
669 for the size and adjust DECL_SIZE/DECL_SIZE_UNIT accordingly. Abort if
670 no such upper bound can be obtained. */
673 force_constant_size (tree var
)
675 /* The only attempt we make is by querying the maximum size of objects
676 of the variable's type. */
678 HOST_WIDE_INT max_size
;
680 gcc_assert (VAR_P (var
));
682 max_size
= max_int_size_in_bytes (TREE_TYPE (var
));
684 gcc_assert (max_size
>= 0);
687 = build_int_cst (TREE_TYPE (DECL_SIZE_UNIT (var
)), max_size
);
689 = build_int_cst (TREE_TYPE (DECL_SIZE (var
)), max_size
* BITS_PER_UNIT
);
692 /* Push the temporary variable TMP into the current binding. */
695 gimple_add_tmp_var_fn (struct function
*fn
, tree tmp
)
697 gcc_assert (!DECL_CHAIN (tmp
) && !DECL_SEEN_IN_BIND_EXPR_P (tmp
));
699 /* Later processing assumes that the object size is constant, which might
700 not be true at this point. Force the use of a constant upper bound in
702 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp
)))
703 force_constant_size (tmp
);
705 DECL_CONTEXT (tmp
) = fn
->decl
;
706 DECL_SEEN_IN_BIND_EXPR_P (tmp
) = 1;
708 record_vars_into (tmp
, fn
->decl
);
711 /* Push the temporary variable TMP into the current binding. */
714 gimple_add_tmp_var (tree tmp
)
716 gcc_assert (!DECL_CHAIN (tmp
) && !DECL_SEEN_IN_BIND_EXPR_P (tmp
));
718 /* Later processing assumes that the object size is constant, which might
719 not be true at this point. Force the use of a constant upper bound in
721 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp
)))
722 force_constant_size (tmp
);
724 DECL_CONTEXT (tmp
) = current_function_decl
;
725 DECL_SEEN_IN_BIND_EXPR_P (tmp
) = 1;
729 DECL_CHAIN (tmp
) = gimplify_ctxp
->temps
;
730 gimplify_ctxp
->temps
= tmp
;
732 /* Mark temporaries local within the nearest enclosing parallel. */
733 if (gimplify_omp_ctxp
)
735 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
737 && (ctx
->region_type
== ORT_WORKSHARE
738 || ctx
->region_type
== ORT_SIMD
739 || ctx
->region_type
== ORT_ACC
))
740 ctx
= ctx
->outer_context
;
742 omp_add_variable (ctx
, tmp
, GOVD_LOCAL
| GOVD_SEEN
);
751 /* This case is for nested functions. We need to expose the locals
753 body_seq
= gimple_body (current_function_decl
);
754 declare_vars (tmp
, gimple_seq_first_stmt (body_seq
), false);
760 /* This page contains routines to unshare tree nodes, i.e. to duplicate tree
761 nodes that are referenced more than once in GENERIC functions. This is
762 necessary because gimplification (translation into GIMPLE) is performed
763 by modifying tree nodes in-place, so gimplication of a shared node in a
764 first context could generate an invalid GIMPLE form in a second context.
766 This is achieved with a simple mark/copy/unmark algorithm that walks the
767 GENERIC representation top-down, marks nodes with TREE_VISITED the first
768 time it encounters them, duplicates them if they already have TREE_VISITED
769 set, and finally removes the TREE_VISITED marks it has set.
771 The algorithm works only at the function level, i.e. it generates a GENERIC
772 representation of a function with no nodes shared within the function when
773 passed a GENERIC function (except for nodes that are allowed to be shared).
775 At the global level, it is also necessary to unshare tree nodes that are
776 referenced in more than one function, for the same aforementioned reason.
777 This requires some cooperation from the front-end. There are 2 strategies:
779 1. Manual unsharing. The front-end needs to call unshare_expr on every
780 expression that might end up being shared across functions.
782 2. Deep unsharing. This is an extension of regular unsharing. Instead
783 of calling unshare_expr on expressions that might be shared across
784 functions, the front-end pre-marks them with TREE_VISITED. This will
785 ensure that they are unshared on the first reference within functions
786 when the regular unsharing algorithm runs. The counterpart is that
787 this algorithm must look deeper than for manual unsharing, which is
788 specified by LANG_HOOKS_DEEP_UNSHARING.
790 If there are only few specific cases of node sharing across functions, it is
791 probably easier for a front-end to unshare the expressions manually. On the
792 contrary, if the expressions generated at the global level are as widespread
793 as expressions generated within functions, deep unsharing is very likely the
796 /* Similar to copy_tree_r but do not copy SAVE_EXPR or TARGET_EXPR nodes.
797 These nodes model computations that must be done once. If we were to
798 unshare something like SAVE_EXPR(i++), the gimplification process would
799 create wrong code. However, if DATA is non-null, it must hold a pointer
800 set that is used to unshare the subtrees of these nodes. */
803 mostly_copy_tree_r (tree
*tp
, int *walk_subtrees
, void *data
)
806 enum tree_code code
= TREE_CODE (t
);
808 /* Do not copy SAVE_EXPR, TARGET_EXPR or BIND_EXPR nodes themselves, but
809 copy their subtrees if we can make sure to do it only once. */
810 if (code
== SAVE_EXPR
|| code
== TARGET_EXPR
|| code
== BIND_EXPR
)
812 if (data
&& !((hash_set
<tree
> *)data
)->add (t
))
818 /* Stop at types, decls, constants like copy_tree_r. */
819 else if (TREE_CODE_CLASS (code
) == tcc_type
820 || TREE_CODE_CLASS (code
) == tcc_declaration
821 || TREE_CODE_CLASS (code
) == tcc_constant
822 /* We can't do anything sensible with a BLOCK used as an
823 expression, but we also can't just die when we see it
824 because of non-expression uses. So we avert our eyes
825 and cross our fingers. Silly Java. */
829 /* Cope with the statement expression extension. */
830 else if (code
== STATEMENT_LIST
)
833 /* Leave the bulk of the work to copy_tree_r itself. */
835 copy_tree_r (tp
, walk_subtrees
, NULL
);
840 /* Callback for walk_tree to unshare most of the shared trees rooted at *TP.
841 If *TP has been visited already, then *TP is deeply copied by calling
842 mostly_copy_tree_r. DATA is passed to mostly_copy_tree_r unmodified. */
845 copy_if_shared_r (tree
*tp
, int *walk_subtrees
, void *data
)
848 enum tree_code code
= TREE_CODE (t
);
850 /* Skip types, decls, and constants. But we do want to look at their
851 types and the bounds of types. Mark them as visited so we properly
852 unmark their subtrees on the unmark pass. If we've already seen them,
853 don't look down further. */
854 if (TREE_CODE_CLASS (code
) == tcc_type
855 || TREE_CODE_CLASS (code
) == tcc_declaration
856 || TREE_CODE_CLASS (code
) == tcc_constant
)
858 if (TREE_VISITED (t
))
861 TREE_VISITED (t
) = 1;
864 /* If this node has been visited already, unshare it and don't look
866 else if (TREE_VISITED (t
))
868 walk_tree (tp
, mostly_copy_tree_r
, data
, NULL
);
872 /* Otherwise, mark the node as visited and keep looking. */
874 TREE_VISITED (t
) = 1;
879 /* Unshare most of the shared trees rooted at *TP. DATA is passed to the
880 copy_if_shared_r callback unmodified. */
883 copy_if_shared (tree
*tp
, void *data
)
885 walk_tree (tp
, copy_if_shared_r
, data
, NULL
);
888 /* Unshare all the trees in the body of FNDECL, as well as in the bodies of
889 any nested functions. */
892 unshare_body (tree fndecl
)
894 struct cgraph_node
*cgn
= cgraph_node::get (fndecl
);
895 /* If the language requires deep unsharing, we need a pointer set to make
896 sure we don't repeatedly unshare subtrees of unshareable nodes. */
897 hash_set
<tree
> *visited
898 = lang_hooks
.deep_unsharing
? new hash_set
<tree
> : NULL
;
900 copy_if_shared (&DECL_SAVED_TREE (fndecl
), visited
);
901 copy_if_shared (&DECL_SIZE (DECL_RESULT (fndecl
)), visited
);
902 copy_if_shared (&DECL_SIZE_UNIT (DECL_RESULT (fndecl
)), visited
);
907 for (cgn
= cgn
->nested
; cgn
; cgn
= cgn
->next_nested
)
908 unshare_body (cgn
->decl
);
911 /* Callback for walk_tree to unmark the visited trees rooted at *TP.
912 Subtrees are walked until the first unvisited node is encountered. */
915 unmark_visited_r (tree
*tp
, int *walk_subtrees
, void *data ATTRIBUTE_UNUSED
)
919 /* If this node has been visited, unmark it and keep looking. */
920 if (TREE_VISITED (t
))
921 TREE_VISITED (t
) = 0;
923 /* Otherwise, don't look any deeper. */
930 /* Unmark the visited trees rooted at *TP. */
933 unmark_visited (tree
*tp
)
935 walk_tree (tp
, unmark_visited_r
, NULL
, NULL
);
938 /* Likewise, but mark all trees as not visited. */
941 unvisit_body (tree fndecl
)
943 struct cgraph_node
*cgn
= cgraph_node::get (fndecl
);
945 unmark_visited (&DECL_SAVED_TREE (fndecl
));
946 unmark_visited (&DECL_SIZE (DECL_RESULT (fndecl
)));
947 unmark_visited (&DECL_SIZE_UNIT (DECL_RESULT (fndecl
)));
950 for (cgn
= cgn
->nested
; cgn
; cgn
= cgn
->next_nested
)
951 unvisit_body (cgn
->decl
);
954 /* Unconditionally make an unshared copy of EXPR. This is used when using
955 stored expressions which span multiple functions, such as BINFO_VTABLE,
956 as the normal unsharing process can't tell that they're shared. */
959 unshare_expr (tree expr
)
961 walk_tree (&expr
, mostly_copy_tree_r
, NULL
, NULL
);
965 /* Worker for unshare_expr_without_location. */
968 prune_expr_location (tree
*tp
, int *walk_subtrees
, void *)
971 SET_EXPR_LOCATION (*tp
, UNKNOWN_LOCATION
);
977 /* Similar to unshare_expr but also prune all expression locations
981 unshare_expr_without_location (tree expr
)
983 walk_tree (&expr
, mostly_copy_tree_r
, NULL
, NULL
);
985 walk_tree (&expr
, prune_expr_location
, NULL
, NULL
);
989 /* WRAPPER is a code such as BIND_EXPR or CLEANUP_POINT_EXPR which can both
990 contain statements and have a value. Assign its value to a temporary
991 and give it void_type_node. Return the temporary, or NULL_TREE if
992 WRAPPER was already void. */
995 voidify_wrapper_expr (tree wrapper
, tree temp
)
997 tree type
= TREE_TYPE (wrapper
);
998 if (type
&& !VOID_TYPE_P (type
))
1002 /* Set p to point to the body of the wrapper. Loop until we find
1003 something that isn't a wrapper. */
1004 for (p
= &wrapper
; p
&& *p
; )
1006 switch (TREE_CODE (*p
))
1009 TREE_SIDE_EFFECTS (*p
) = 1;
1010 TREE_TYPE (*p
) = void_type_node
;
1011 /* For a BIND_EXPR, the body is operand 1. */
1012 p
= &BIND_EXPR_BODY (*p
);
1015 case CLEANUP_POINT_EXPR
:
1016 case TRY_FINALLY_EXPR
:
1017 case TRY_CATCH_EXPR
:
1018 TREE_SIDE_EFFECTS (*p
) = 1;
1019 TREE_TYPE (*p
) = void_type_node
;
1020 p
= &TREE_OPERAND (*p
, 0);
1023 case STATEMENT_LIST
:
1025 tree_stmt_iterator i
= tsi_last (*p
);
1026 TREE_SIDE_EFFECTS (*p
) = 1;
1027 TREE_TYPE (*p
) = void_type_node
;
1028 p
= tsi_end_p (i
) ? NULL
: tsi_stmt_ptr (i
);
1033 /* Advance to the last statement. Set all container types to
1035 for (; TREE_CODE (*p
) == COMPOUND_EXPR
; p
= &TREE_OPERAND (*p
, 1))
1037 TREE_SIDE_EFFECTS (*p
) = 1;
1038 TREE_TYPE (*p
) = void_type_node
;
1042 case TRANSACTION_EXPR
:
1043 TREE_SIDE_EFFECTS (*p
) = 1;
1044 TREE_TYPE (*p
) = void_type_node
;
1045 p
= &TRANSACTION_EXPR_BODY (*p
);
1049 /* Assume that any tree upon which voidify_wrapper_expr is
1050 directly called is a wrapper, and that its body is op0. */
1053 TREE_SIDE_EFFECTS (*p
) = 1;
1054 TREE_TYPE (*p
) = void_type_node
;
1055 p
= &TREE_OPERAND (*p
, 0);
1063 if (p
== NULL
|| IS_EMPTY_STMT (*p
))
1067 /* The wrapper is on the RHS of an assignment that we're pushing
1069 gcc_assert (TREE_CODE (temp
) == INIT_EXPR
1070 || TREE_CODE (temp
) == MODIFY_EXPR
);
1071 TREE_OPERAND (temp
, 1) = *p
;
1076 temp
= create_tmp_var (type
, "retval");
1077 *p
= build2 (INIT_EXPR
, type
, temp
, *p
);
1086 /* Prepare calls to builtins to SAVE and RESTORE the stack as well as
1087 a temporary through which they communicate. */
1090 build_stack_save_restore (gcall
**save
, gcall
**restore
)
1094 *save
= gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_SAVE
), 0);
1095 tmp_var
= create_tmp_var (ptr_type_node
, "saved_stack");
1096 gimple_call_set_lhs (*save
, tmp_var
);
1099 = gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_RESTORE
),
1103 /* Generate IFN_ASAN_MARK call that poisons shadow of a for DECL variable. */
1106 build_asan_poison_call_expr (tree decl
)
1108 /* Do not poison variables that have size equal to zero. */
1109 tree unit_size
= DECL_SIZE_UNIT (decl
);
1110 if (zerop (unit_size
))
1113 tree base
= build_fold_addr_expr (decl
);
1115 return build_call_expr_internal_loc (UNKNOWN_LOCATION
, IFN_ASAN_MARK
,
1117 build_int_cst (integer_type_node
,
1122 /* Generate IFN_ASAN_MARK call that would poison or unpoison, depending
1123 on POISON flag, shadow memory of a DECL variable. The call will be
1124 put on location identified by IT iterator, where BEFORE flag drives
1125 position where the stmt will be put. */
1128 asan_poison_variable (tree decl
, bool poison
, gimple_stmt_iterator
*it
,
1131 /* When within an OMP context, do not emit ASAN_MARK internal fns. */
1132 if (gimplify_omp_ctxp
)
1135 tree unit_size
= DECL_SIZE_UNIT (decl
);
1136 tree base
= build_fold_addr_expr (decl
);
1138 /* Do not poison variables that have size equal to zero. */
1139 if (zerop (unit_size
))
1142 /* It's necessary to have all stack variables aligned to ASAN granularity
1144 if (DECL_ALIGN_UNIT (decl
) <= ASAN_SHADOW_GRANULARITY
)
1145 SET_DECL_ALIGN (decl
, BITS_PER_UNIT
* ASAN_SHADOW_GRANULARITY
);
1147 HOST_WIDE_INT flags
= poison
? ASAN_MARK_POISON
: ASAN_MARK_UNPOISON
;
1150 = gimple_build_call_internal (IFN_ASAN_MARK
, 3,
1151 build_int_cst (integer_type_node
, flags
),
1155 gsi_insert_before (it
, g
, GSI_NEW_STMT
);
1157 gsi_insert_after (it
, g
, GSI_NEW_STMT
);
1160 /* Generate IFN_ASAN_MARK internal call that depending on POISON flag
1161 either poisons or unpoisons a DECL. Created statement is appended
1162 to SEQ_P gimple sequence. */
1165 asan_poison_variable (tree decl
, bool poison
, gimple_seq
*seq_p
)
1167 gimple_stmt_iterator it
= gsi_last (*seq_p
);
1168 bool before
= false;
1173 asan_poison_variable (decl
, poison
, &it
, before
);
1176 /* Sort pair of VAR_DECLs A and B by DECL_UID. */
1179 sort_by_decl_uid (const void *a
, const void *b
)
1181 const tree
*t1
= (const tree
*)a
;
1182 const tree
*t2
= (const tree
*)b
;
1184 int uid1
= DECL_UID (*t1
);
1185 int uid2
= DECL_UID (*t2
);
1189 else if (uid1
> uid2
)
1195 /* Generate IFN_ASAN_MARK internal call for all VARIABLES
1196 depending on POISON flag. Created statement is appended
1197 to SEQ_P gimple sequence. */
1200 asan_poison_variables (hash_set
<tree
> *variables
, bool poison
, gimple_seq
*seq_p
)
1202 unsigned c
= variables
->elements ();
1206 auto_vec
<tree
> sorted_variables (c
);
1208 for (hash_set
<tree
>::iterator it
= variables
->begin ();
1209 it
!= variables
->end (); ++it
)
1210 sorted_variables
.safe_push (*it
);
1212 sorted_variables
.qsort (sort_by_decl_uid
);
1216 FOR_EACH_VEC_ELT (sorted_variables
, i
, var
)
1218 asan_poison_variable (var
, poison
, seq_p
);
1220 /* Add use_after_scope_memory attribute for the variable in order
1221 to prevent re-written into SSA. */
1222 if (!lookup_attribute (ASAN_USE_AFTER_SCOPE_ATTRIBUTE
,
1223 DECL_ATTRIBUTES (var
)))
1224 DECL_ATTRIBUTES (var
)
1225 = tree_cons (get_identifier (ASAN_USE_AFTER_SCOPE_ATTRIBUTE
),
1227 DECL_ATTRIBUTES (var
));
1231 /* Gimplify a BIND_EXPR. Just voidify and recurse. */
1233 static enum gimplify_status
1234 gimplify_bind_expr (tree
*expr_p
, gimple_seq
*pre_p
)
1236 tree bind_expr
= *expr_p
;
1237 bool old_keep_stack
= gimplify_ctxp
->keep_stack
;
1238 bool old_save_stack
= gimplify_ctxp
->save_stack
;
1241 gimple_seq body
, cleanup
;
1243 location_t start_locus
= 0, end_locus
= 0;
1244 tree ret_clauses
= NULL
;
1246 tree temp
= voidify_wrapper_expr (bind_expr
, NULL
);
1248 /* Mark variables seen in this bind expr. */
1249 for (t
= BIND_EXPR_VARS (bind_expr
); t
; t
= DECL_CHAIN (t
))
1253 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
1255 /* Mark variable as local. */
1256 if (ctx
&& ctx
->region_type
!= ORT_NONE
&& !DECL_EXTERNAL (t
)
1257 && (! DECL_SEEN_IN_BIND_EXPR_P (t
)
1258 || splay_tree_lookup (ctx
->variables
,
1259 (splay_tree_key
) t
) == NULL
))
1261 if (ctx
->region_type
== ORT_SIMD
1262 && TREE_ADDRESSABLE (t
)
1263 && !TREE_STATIC (t
))
1264 omp_add_variable (ctx
, t
, GOVD_PRIVATE
| GOVD_SEEN
);
1266 omp_add_variable (ctx
, t
, GOVD_LOCAL
| GOVD_SEEN
);
1269 DECL_SEEN_IN_BIND_EXPR_P (t
) = 1;
1271 if (DECL_HARD_REGISTER (t
) && !is_global_var (t
) && cfun
)
1272 cfun
->has_local_explicit_reg_vars
= true;
1275 /* Preliminarily mark non-addressed complex variables as eligible
1276 for promotion to gimple registers. We'll transform their uses
1278 if ((TREE_CODE (TREE_TYPE (t
)) == COMPLEX_TYPE
1279 || TREE_CODE (TREE_TYPE (t
)) == VECTOR_TYPE
)
1280 && !TREE_THIS_VOLATILE (t
)
1281 && (VAR_P (t
) && !DECL_HARD_REGISTER (t
))
1282 && !needs_to_live_in_memory (t
))
1283 DECL_GIMPLE_REG_P (t
) = 1;
1286 bind_stmt
= gimple_build_bind (BIND_EXPR_VARS (bind_expr
), NULL
,
1287 BIND_EXPR_BLOCK (bind_expr
));
1288 gimple_push_bind_expr (bind_stmt
);
1290 gimplify_ctxp
->keep_stack
= false;
1291 gimplify_ctxp
->save_stack
= false;
1293 /* Gimplify the body into the GIMPLE_BIND tuple's body. */
1295 gimplify_stmt (&BIND_EXPR_BODY (bind_expr
), &body
);
1296 gimple_bind_set_body (bind_stmt
, body
);
1298 /* Source location wise, the cleanup code (stack_restore and clobbers)
1299 belongs to the end of the block, so propagate what we have. The
1300 stack_save operation belongs to the beginning of block, which we can
1301 infer from the bind_expr directly if the block has no explicit
1303 if (BIND_EXPR_BLOCK (bind_expr
))
1305 end_locus
= BLOCK_SOURCE_END_LOCATION (BIND_EXPR_BLOCK (bind_expr
));
1306 start_locus
= BLOCK_SOURCE_LOCATION (BIND_EXPR_BLOCK (bind_expr
));
1308 if (start_locus
== 0)
1309 start_locus
= EXPR_LOCATION (bind_expr
);
1314 /* If the code both contains VLAs and calls alloca, then we cannot reclaim
1315 the stack space allocated to the VLAs. */
1316 if (gimplify_ctxp
->save_stack
&& !gimplify_ctxp
->keep_stack
)
1318 gcall
*stack_restore
;
1320 /* Save stack on entry and restore it on exit. Add a try_finally
1321 block to achieve this. */
1322 build_stack_save_restore (&stack_save
, &stack_restore
);
1324 gimple_set_location (stack_save
, start_locus
);
1325 gimple_set_location (stack_restore
, end_locus
);
1327 gimplify_seq_add_stmt (&cleanup
, stack_restore
);
1330 /* Add clobbers for all variables that go out of scope. */
1331 for (t
= BIND_EXPR_VARS (bind_expr
); t
; t
= DECL_CHAIN (t
))
1334 && !is_global_var (t
)
1335 && DECL_CONTEXT (t
) == current_function_decl
)
1337 if (!DECL_HARD_REGISTER (t
)
1338 && !TREE_THIS_VOLATILE (t
)
1339 && !DECL_HAS_VALUE_EXPR_P (t
)
1340 /* Only care for variables that have to be in memory. Others
1341 will be rewritten into SSA names, hence moved to the
1343 && !is_gimple_reg (t
)
1344 && flag_stack_reuse
!= SR_NONE
)
1346 tree clobber
= build_constructor (TREE_TYPE (t
), NULL
);
1347 gimple
*clobber_stmt
;
1348 TREE_THIS_VOLATILE (clobber
) = 1;
1349 clobber_stmt
= gimple_build_assign (t
, clobber
);
1350 gimple_set_location (clobber_stmt
, end_locus
);
1351 gimplify_seq_add_stmt (&cleanup
, clobber_stmt
);
1354 if (flag_openacc
&& oacc_declare_returns
!= NULL
)
1356 tree
*c
= oacc_declare_returns
->get (t
);
1360 OMP_CLAUSE_CHAIN (*c
) = ret_clauses
;
1364 oacc_declare_returns
->remove (t
);
1366 if (oacc_declare_returns
->elements () == 0)
1368 delete oacc_declare_returns
;
1369 oacc_declare_returns
= NULL
;
1375 if (asan_poisoned_variables
!= NULL
1376 && asan_poisoned_variables
->contains (t
))
1378 asan_poisoned_variables
->remove (t
);
1379 asan_poison_variable (t
, true, &cleanup
);
1382 if (gimplify_ctxp
->live_switch_vars
!= NULL
1383 && gimplify_ctxp
->live_switch_vars
->contains (t
))
1384 gimplify_ctxp
->live_switch_vars
->remove (t
);
1390 gimple_stmt_iterator si
= gsi_start (cleanup
);
1392 stmt
= gimple_build_omp_target (NULL
, GF_OMP_TARGET_KIND_OACC_DECLARE
,
1394 gsi_insert_seq_before_without_update (&si
, stmt
, GSI_NEW_STMT
);
1400 gimple_seq new_body
;
1403 gs
= gimple_build_try (gimple_bind_body (bind_stmt
), cleanup
,
1404 GIMPLE_TRY_FINALLY
);
1407 gimplify_seq_add_stmt (&new_body
, stack_save
);
1408 gimplify_seq_add_stmt (&new_body
, gs
);
1409 gimple_bind_set_body (bind_stmt
, new_body
);
1412 /* keep_stack propagates all the way up to the outermost BIND_EXPR. */
1413 if (!gimplify_ctxp
->keep_stack
)
1414 gimplify_ctxp
->keep_stack
= old_keep_stack
;
1415 gimplify_ctxp
->save_stack
= old_save_stack
;
1417 gimple_pop_bind_expr ();
1419 gimplify_seq_add_stmt (pre_p
, bind_stmt
);
1427 *expr_p
= NULL_TREE
;
1431 /* Maybe add early return predict statement to PRE_P sequence. */
1434 maybe_add_early_return_predict_stmt (gimple_seq
*pre_p
)
1436 /* If we are not in a conditional context, add PREDICT statement. */
1437 if (gimple_conditional_context ())
1439 gimple
*predict
= gimple_build_predict (PRED_TREE_EARLY_RETURN
,
1441 gimplify_seq_add_stmt (pre_p
, predict
);
1445 /* Gimplify a RETURN_EXPR. If the expression to be returned is not a
1446 GIMPLE value, it is assigned to a new temporary and the statement is
1447 re-written to return the temporary.
1449 PRE_P points to the sequence where side effects that must happen before
1450 STMT should be stored. */
1452 static enum gimplify_status
1453 gimplify_return_expr (tree stmt
, gimple_seq
*pre_p
)
1456 tree ret_expr
= TREE_OPERAND (stmt
, 0);
1457 tree result_decl
, result
;
1459 if (ret_expr
== error_mark_node
)
1462 /* Implicit _Cilk_sync must be inserted right before any return statement
1463 if there is a _Cilk_spawn in the function. If the user has provided a
1464 _Cilk_sync, the optimizer should remove this duplicate one. */
1465 if (fn_contains_cilk_spawn_p (cfun
))
1467 tree impl_sync
= build0 (CILK_SYNC_STMT
, void_type_node
);
1468 gimplify_and_add (impl_sync
, pre_p
);
1472 || TREE_CODE (ret_expr
) == RESULT_DECL
1473 || ret_expr
== error_mark_node
)
1475 maybe_add_early_return_predict_stmt (pre_p
);
1476 greturn
*ret
= gimple_build_return (ret_expr
);
1477 gimple_set_no_warning (ret
, TREE_NO_WARNING (stmt
));
1478 gimplify_seq_add_stmt (pre_p
, ret
);
1482 if (VOID_TYPE_P (TREE_TYPE (TREE_TYPE (current_function_decl
))))
1483 result_decl
= NULL_TREE
;
1486 result_decl
= TREE_OPERAND (ret_expr
, 0);
1488 /* See through a return by reference. */
1489 if (TREE_CODE (result_decl
) == INDIRECT_REF
)
1490 result_decl
= TREE_OPERAND (result_decl
, 0);
1492 gcc_assert ((TREE_CODE (ret_expr
) == MODIFY_EXPR
1493 || TREE_CODE (ret_expr
) == INIT_EXPR
)
1494 && TREE_CODE (result_decl
) == RESULT_DECL
);
1497 /* If aggregate_value_p is true, then we can return the bare RESULT_DECL.
1498 Recall that aggregate_value_p is FALSE for any aggregate type that is
1499 returned in registers. If we're returning values in registers, then
1500 we don't want to extend the lifetime of the RESULT_DECL, particularly
1501 across another call. In addition, for those aggregates for which
1502 hard_function_value generates a PARALLEL, we'll die during normal
1503 expansion of structure assignments; there's special code in expand_return
1504 to handle this case that does not exist in expand_expr. */
1507 else if (aggregate_value_p (result_decl
, TREE_TYPE (current_function_decl
)))
1509 if (TREE_CODE (DECL_SIZE (result_decl
)) != INTEGER_CST
)
1511 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (result_decl
)))
1512 gimplify_type_sizes (TREE_TYPE (result_decl
), pre_p
);
1513 /* Note that we don't use gimplify_vla_decl because the RESULT_DECL
1514 should be effectively allocated by the caller, i.e. all calls to
1515 this function must be subject to the Return Slot Optimization. */
1516 gimplify_one_sizepos (&DECL_SIZE (result_decl
), pre_p
);
1517 gimplify_one_sizepos (&DECL_SIZE_UNIT (result_decl
), pre_p
);
1519 result
= result_decl
;
1521 else if (gimplify_ctxp
->return_temp
)
1522 result
= gimplify_ctxp
->return_temp
;
1525 result
= create_tmp_reg (TREE_TYPE (result_decl
));
1527 /* ??? With complex control flow (usually involving abnormal edges),
1528 we can wind up warning about an uninitialized value for this. Due
1529 to how this variable is constructed and initialized, this is never
1530 true. Give up and never warn. */
1531 TREE_NO_WARNING (result
) = 1;
1533 gimplify_ctxp
->return_temp
= result
;
1536 /* Smash the lhs of the MODIFY_EXPR to the temporary we plan to use.
1537 Then gimplify the whole thing. */
1538 if (result
!= result_decl
)
1539 TREE_OPERAND (ret_expr
, 0) = result
;
1541 gimplify_and_add (TREE_OPERAND (stmt
, 0), pre_p
);
1543 maybe_add_early_return_predict_stmt (pre_p
);
1544 ret
= gimple_build_return (result
);
1545 gimple_set_no_warning (ret
, TREE_NO_WARNING (stmt
));
1546 gimplify_seq_add_stmt (pre_p
, ret
);
1551 /* Gimplify a variable-length array DECL. */
1554 gimplify_vla_decl (tree decl
, gimple_seq
*seq_p
)
1556 /* This is a variable-sized decl. Simplify its size and mark it
1557 for deferred expansion. */
1558 tree t
, addr
, ptr_type
;
1560 gimplify_one_sizepos (&DECL_SIZE (decl
), seq_p
);
1561 gimplify_one_sizepos (&DECL_SIZE_UNIT (decl
), seq_p
);
1563 /* Don't mess with a DECL_VALUE_EXPR set by the front-end. */
1564 if (DECL_HAS_VALUE_EXPR_P (decl
))
1567 /* All occurrences of this decl in final gimplified code will be
1568 replaced by indirection. Setting DECL_VALUE_EXPR does two
1569 things: First, it lets the rest of the gimplifier know what
1570 replacement to use. Second, it lets the debug info know
1571 where to find the value. */
1572 ptr_type
= build_pointer_type (TREE_TYPE (decl
));
1573 addr
= create_tmp_var (ptr_type
, get_name (decl
));
1574 DECL_IGNORED_P (addr
) = 0;
1575 t
= build_fold_indirect_ref (addr
);
1576 TREE_THIS_NOTRAP (t
) = 1;
1577 SET_DECL_VALUE_EXPR (decl
, t
);
1578 DECL_HAS_VALUE_EXPR_P (decl
) = 1;
1580 t
= builtin_decl_explicit (BUILT_IN_ALLOCA_WITH_ALIGN
);
1581 t
= build_call_expr (t
, 2, DECL_SIZE_UNIT (decl
),
1582 size_int (DECL_ALIGN (decl
)));
1583 /* The call has been built for a variable-sized object. */
1584 CALL_ALLOCA_FOR_VAR_P (t
) = 1;
1585 t
= fold_convert (ptr_type
, t
);
1586 t
= build2 (MODIFY_EXPR
, TREE_TYPE (addr
), addr
, t
);
1588 gimplify_and_add (t
, seq_p
);
1591 /* A helper function to be called via walk_tree. Mark all labels under *TP
1592 as being forced. To be called for DECL_INITIAL of static variables. */
1595 force_labels_r (tree
*tp
, int *walk_subtrees
, void *data ATTRIBUTE_UNUSED
)
1599 if (TREE_CODE (*tp
) == LABEL_DECL
)
1601 FORCED_LABEL (*tp
) = 1;
1602 cfun
->has_forced_label_in_static
= 1;
1608 /* Gimplify a DECL_EXPR node *STMT_P by making any necessary allocation
1609 and initialization explicit. */
1611 static enum gimplify_status
1612 gimplify_decl_expr (tree
*stmt_p
, gimple_seq
*seq_p
)
1614 tree stmt
= *stmt_p
;
1615 tree decl
= DECL_EXPR_DECL (stmt
);
1617 *stmt_p
= NULL_TREE
;
1619 if (TREE_TYPE (decl
) == error_mark_node
)
1622 if ((TREE_CODE (decl
) == TYPE_DECL
1624 && !TYPE_SIZES_GIMPLIFIED (TREE_TYPE (decl
)))
1626 gimplify_type_sizes (TREE_TYPE (decl
), seq_p
);
1627 if (TREE_CODE (TREE_TYPE (decl
)) == REFERENCE_TYPE
)
1628 gimplify_type_sizes (TREE_TYPE (TREE_TYPE (decl
)), seq_p
);
1631 /* ??? DECL_ORIGINAL_TYPE is streamed for LTO so it needs to be gimplified
1632 in case its size expressions contain problematic nodes like CALL_EXPR. */
1633 if (TREE_CODE (decl
) == TYPE_DECL
1634 && DECL_ORIGINAL_TYPE (decl
)
1635 && !TYPE_SIZES_GIMPLIFIED (DECL_ORIGINAL_TYPE (decl
)))
1637 gimplify_type_sizes (DECL_ORIGINAL_TYPE (decl
), seq_p
);
1638 if (TREE_CODE (DECL_ORIGINAL_TYPE (decl
)) == REFERENCE_TYPE
)
1639 gimplify_type_sizes (TREE_TYPE (DECL_ORIGINAL_TYPE (decl
)), seq_p
);
1642 if (VAR_P (decl
) && !DECL_EXTERNAL (decl
))
1644 tree init
= DECL_INITIAL (decl
);
1645 bool is_vla
= false;
1647 if (TREE_CODE (DECL_SIZE_UNIT (decl
)) != INTEGER_CST
1648 || (!TREE_STATIC (decl
)
1649 && flag_stack_check
== GENERIC_STACK_CHECK
1650 && compare_tree_int (DECL_SIZE_UNIT (decl
),
1651 STACK_CHECK_MAX_VAR_SIZE
) > 0))
1653 gimplify_vla_decl (decl
, seq_p
);
1657 if (asan_poisoned_variables
1659 && TREE_ADDRESSABLE (decl
)
1660 && !TREE_STATIC (decl
)
1661 && !DECL_HAS_VALUE_EXPR_P (decl
)
1662 && dbg_cnt (asan_use_after_scope
))
1664 asan_poisoned_variables
->add (decl
);
1665 asan_poison_variable (decl
, false, seq_p
);
1666 if (!DECL_ARTIFICIAL (decl
) && gimplify_ctxp
->live_switch_vars
)
1667 gimplify_ctxp
->live_switch_vars
->add (decl
);
1670 /* Some front ends do not explicitly declare all anonymous
1671 artificial variables. We compensate here by declaring the
1672 variables, though it would be better if the front ends would
1673 explicitly declare them. */
1674 if (!DECL_SEEN_IN_BIND_EXPR_P (decl
)
1675 && DECL_ARTIFICIAL (decl
) && DECL_NAME (decl
) == NULL_TREE
)
1676 gimple_add_tmp_var (decl
);
1678 if (init
&& init
!= error_mark_node
)
1680 if (!TREE_STATIC (decl
))
1682 DECL_INITIAL (decl
) = NULL_TREE
;
1683 init
= build2 (INIT_EXPR
, void_type_node
, decl
, init
);
1684 gimplify_and_add (init
, seq_p
);
1688 /* We must still examine initializers for static variables
1689 as they may contain a label address. */
1690 walk_tree (&init
, force_labels_r
, NULL
, NULL
);
1697 /* Gimplify a LOOP_EXPR. Normally this just involves gimplifying the body
1698 and replacing the LOOP_EXPR with goto, but if the loop contains an
1699 EXIT_EXPR, we need to append a label for it to jump to. */
1701 static enum gimplify_status
1702 gimplify_loop_expr (tree
*expr_p
, gimple_seq
*pre_p
)
1704 tree saved_label
= gimplify_ctxp
->exit_label
;
1705 tree start_label
= create_artificial_label (UNKNOWN_LOCATION
);
1707 gimplify_seq_add_stmt (pre_p
, gimple_build_label (start_label
));
1709 gimplify_ctxp
->exit_label
= NULL_TREE
;
1711 gimplify_and_add (LOOP_EXPR_BODY (*expr_p
), pre_p
);
1713 gimplify_seq_add_stmt (pre_p
, gimple_build_goto (start_label
));
1715 if (gimplify_ctxp
->exit_label
)
1716 gimplify_seq_add_stmt (pre_p
,
1717 gimple_build_label (gimplify_ctxp
->exit_label
));
1719 gimplify_ctxp
->exit_label
= saved_label
;
1725 /* Gimplify a statement list onto a sequence. These may be created either
1726 by an enlightened front-end, or by shortcut_cond_expr. */
1728 static enum gimplify_status
1729 gimplify_statement_list (tree
*expr_p
, gimple_seq
*pre_p
)
1731 tree temp
= voidify_wrapper_expr (*expr_p
, NULL
);
1733 tree_stmt_iterator i
= tsi_start (*expr_p
);
1735 while (!tsi_end_p (i
))
1737 gimplify_stmt (tsi_stmt_ptr (i
), pre_p
);
1750 /* Callback for walk_gimple_seq. */
1753 warn_switch_unreachable_r (gimple_stmt_iterator
*gsi_p
, bool *handled_ops_p
,
1754 struct walk_stmt_info
*wi
)
1756 gimple
*stmt
= gsi_stmt (*gsi_p
);
1758 *handled_ops_p
= true;
1759 switch (gimple_code (stmt
))
1762 /* A compiler-generated cleanup or a user-written try block.
1763 If it's empty, don't dive into it--that would result in
1764 worse location info. */
1765 if (gimple_try_eval (stmt
) == NULL
)
1768 return integer_zero_node
;
1773 case GIMPLE_EH_FILTER
:
1774 case GIMPLE_TRANSACTION
:
1775 /* Walk the sub-statements. */
1776 *handled_ops_p
= false;
1779 if (gimple_call_internal_p (stmt
, IFN_ASAN_MARK
))
1781 *handled_ops_p
= false;
1786 /* Save the first "real" statement (not a decl/lexical scope/...). */
1788 return integer_zero_node
;
1793 /* Possibly warn about unreachable statements between switch's controlling
1794 expression and the first case. SEQ is the body of a switch expression. */
1797 maybe_warn_switch_unreachable (gimple_seq seq
)
1799 if (!warn_switch_unreachable
1800 /* This warning doesn't play well with Fortran when optimizations
1802 || lang_GNU_Fortran ()
1806 struct walk_stmt_info wi
;
1807 memset (&wi
, 0, sizeof (wi
));
1808 walk_gimple_seq (seq
, warn_switch_unreachable_r
, NULL
, &wi
);
1809 gimple
*stmt
= (gimple
*) wi
.info
;
1811 if (stmt
&& gimple_code (stmt
) != GIMPLE_LABEL
)
1813 if (gimple_code (stmt
) == GIMPLE_GOTO
1814 && TREE_CODE (gimple_goto_dest (stmt
)) == LABEL_DECL
1815 && DECL_ARTIFICIAL (gimple_goto_dest (stmt
)))
1816 /* Don't warn for compiler-generated gotos. These occur
1817 in Duff's devices, for example. */;
1819 warning_at (gimple_location (stmt
), OPT_Wswitch_unreachable
,
1820 "statement will never be executed");
1825 /* A label entry that pairs label and a location. */
1832 /* Find LABEL in vector of label entries VEC. */
1834 static struct label_entry
*
1835 find_label_entry (const auto_vec
<struct label_entry
> *vec
, tree label
)
1838 struct label_entry
*l
;
1840 FOR_EACH_VEC_ELT (*vec
, i
, l
)
1841 if (l
->label
== label
)
1846 /* Return true if LABEL, a LABEL_DECL, represents a case label
1847 in a vector of labels CASES. */
1850 case_label_p (const vec
<tree
> *cases
, tree label
)
1855 FOR_EACH_VEC_ELT (*cases
, i
, l
)
1856 if (CASE_LABEL (l
) == label
)
1861 /* Find the last statement in a scope STMT. */
1864 last_stmt_in_scope (gimple
*stmt
)
1869 switch (gimple_code (stmt
))
1873 gbind
*bind
= as_a
<gbind
*> (stmt
);
1874 stmt
= gimple_seq_last_stmt (gimple_bind_body (bind
));
1875 return last_stmt_in_scope (stmt
);
1880 gtry
*try_stmt
= as_a
<gtry
*> (stmt
);
1881 stmt
= gimple_seq_last_stmt (gimple_try_eval (try_stmt
));
1882 gimple
*last_eval
= last_stmt_in_scope (stmt
);
1883 if (gimple_stmt_may_fallthru (last_eval
)
1884 && (last_eval
== NULL
1885 || !gimple_call_internal_p (last_eval
, IFN_FALLTHROUGH
))
1886 && gimple_try_kind (try_stmt
) == GIMPLE_TRY_FINALLY
)
1888 stmt
= gimple_seq_last_stmt (gimple_try_cleanup (try_stmt
));
1889 return last_stmt_in_scope (stmt
);
1900 /* Collect interesting labels in LABELS and return the statement preceding
1901 another case label, or a user-defined label. */
1904 collect_fallthrough_labels (gimple_stmt_iterator
*gsi_p
,
1905 auto_vec
<struct label_entry
> *labels
)
1907 gimple
*prev
= NULL
;
1911 if (gimple_code (gsi_stmt (*gsi_p
)) == GIMPLE_BIND
1912 || gimple_code (gsi_stmt (*gsi_p
)) == GIMPLE_TRY
)
1914 /* Nested scope. Only look at the last statement of
1915 the innermost scope. */
1916 location_t bind_loc
= gimple_location (gsi_stmt (*gsi_p
));
1917 gimple
*last
= last_stmt_in_scope (gsi_stmt (*gsi_p
));
1921 /* It might be a label without a location. Use the
1922 location of the scope then. */
1923 if (!gimple_has_location (prev
))
1924 gimple_set_location (prev
, bind_loc
);
1930 /* Ifs are tricky. */
1931 if (gimple_code (gsi_stmt (*gsi_p
)) == GIMPLE_COND
)
1933 gcond
*cond_stmt
= as_a
<gcond
*> (gsi_stmt (*gsi_p
));
1934 tree false_lab
= gimple_cond_false_label (cond_stmt
);
1935 location_t if_loc
= gimple_location (cond_stmt
);
1938 if (i > 1) goto <D.2259>; else goto D;
1939 we can't do much with the else-branch. */
1940 if (!DECL_ARTIFICIAL (false_lab
))
1943 /* Go on until the false label, then one step back. */
1944 for (; !gsi_end_p (*gsi_p
); gsi_next (gsi_p
))
1946 gimple
*stmt
= gsi_stmt (*gsi_p
);
1947 if (gimple_code (stmt
) == GIMPLE_LABEL
1948 && gimple_label_label (as_a
<glabel
*> (stmt
)) == false_lab
)
1952 /* Not found? Oops. */
1953 if (gsi_end_p (*gsi_p
))
1956 struct label_entry l
= { false_lab
, if_loc
};
1957 labels
->safe_push (l
);
1959 /* Go to the last statement of the then branch. */
1962 /* if (i != 0) goto <D.1759>; else goto <D.1760>;
1968 if (gimple_code (gsi_stmt (*gsi_p
)) == GIMPLE_GOTO
1969 && !gimple_has_location (gsi_stmt (*gsi_p
)))
1971 /* Look at the statement before, it might be
1972 attribute fallthrough, in which case don't warn. */
1974 bool fallthru_before_dest
1975 = gimple_call_internal_p (gsi_stmt (*gsi_p
), IFN_FALLTHROUGH
);
1977 tree goto_dest
= gimple_goto_dest (gsi_stmt (*gsi_p
));
1978 if (!fallthru_before_dest
)
1980 struct label_entry l
= { goto_dest
, if_loc
};
1981 labels
->safe_push (l
);
1984 /* And move back. */
1988 /* Remember the last statement. Skip labels that are of no interest
1990 if (gimple_code (gsi_stmt (*gsi_p
)) == GIMPLE_LABEL
)
1992 tree label
= gimple_label_label (as_a
<glabel
*> (gsi_stmt (*gsi_p
)));
1993 if (find_label_entry (labels
, label
))
1994 prev
= gsi_stmt (*gsi_p
);
1996 else if (gimple_call_internal_p (gsi_stmt (*gsi_p
), IFN_ASAN_MARK
))
1999 prev
= gsi_stmt (*gsi_p
);
2002 while (!gsi_end_p (*gsi_p
)
2003 /* Stop if we find a case or a user-defined label. */
2004 && (gimple_code (gsi_stmt (*gsi_p
)) != GIMPLE_LABEL
2005 || !gimple_has_location (gsi_stmt (*gsi_p
))));
2010 /* Return true if the switch fallthough warning should occur. LABEL is
2011 the label statement that we're falling through to. */
2014 should_warn_for_implicit_fallthrough (gimple_stmt_iterator
*gsi_p
, tree label
)
2016 gimple_stmt_iterator gsi
= *gsi_p
;
2018 /* Don't warn if the label is marked with a "falls through" comment. */
2019 if (FALLTHROUGH_LABEL_P (label
))
2022 /* Don't warn for non-case labels followed by a statement:
2027 as these are likely intentional. */
2028 if (!case_label_p (&gimplify_ctxp
->case_labels
, label
))
2031 while (!gsi_end_p (gsi
)
2032 && gimple_code (gsi_stmt (gsi
)) == GIMPLE_LABEL
2033 && (l
= gimple_label_label (as_a
<glabel
*> (gsi_stmt (gsi
))))
2034 && !case_label_p (&gimplify_ctxp
->case_labels
, l
))
2036 if (gsi_end_p (gsi
) || gimple_code (gsi_stmt (gsi
)) != GIMPLE_LABEL
)
2040 /* Don't warn for terminated branches, i.e. when the subsequent case labels
2041 immediately breaks. */
2044 /* Skip all immediately following labels. */
2045 while (!gsi_end_p (gsi
) && gimple_code (gsi_stmt (gsi
)) == GIMPLE_LABEL
)
2048 /* { ... something; default:; } */
2050 /* { ... something; default: break; } or
2051 { ... something; default: goto L; } */
2052 || gimple_code (gsi_stmt (gsi
)) == GIMPLE_GOTO
2053 /* { ... something; default: return; } */
2054 || gimple_code (gsi_stmt (gsi
)) == GIMPLE_RETURN
)
2060 /* Callback for walk_gimple_seq. */
2063 warn_implicit_fallthrough_r (gimple_stmt_iterator
*gsi_p
, bool *handled_ops_p
,
2064 struct walk_stmt_info
*)
2066 gimple
*stmt
= gsi_stmt (*gsi_p
);
2068 *handled_ops_p
= true;
2069 switch (gimple_code (stmt
))
2074 case GIMPLE_EH_FILTER
:
2075 case GIMPLE_TRANSACTION
:
2076 /* Walk the sub-statements. */
2077 *handled_ops_p
= false;
2080 /* Find a sequence of form:
2087 and possibly warn. */
2090 /* Found a label. Skip all immediately following labels. */
2091 while (!gsi_end_p (*gsi_p
)
2092 && gimple_code (gsi_stmt (*gsi_p
)) == GIMPLE_LABEL
)
2095 /* There might be no more statements. */
2096 if (gsi_end_p (*gsi_p
))
2097 return integer_zero_node
;
2099 /* Vector of labels that fall through. */
2100 auto_vec
<struct label_entry
> labels
;
2101 gimple
*prev
= collect_fallthrough_labels (gsi_p
, &labels
);
2103 /* There might be no more statements. */
2104 if (gsi_end_p (*gsi_p
))
2105 return integer_zero_node
;
2107 gimple
*next
= gsi_stmt (*gsi_p
);
2109 /* If what follows is a label, then we may have a fallthrough. */
2110 if (gimple_code (next
) == GIMPLE_LABEL
2111 && gimple_has_location (next
)
2112 && (label
= gimple_label_label (as_a
<glabel
*> (next
)))
2115 struct label_entry
*l
;
2116 bool warned_p
= false;
2117 if (!should_warn_for_implicit_fallthrough (gsi_p
, label
))
2119 else if (gimple_code (prev
) == GIMPLE_LABEL
2120 && (label
= gimple_label_label (as_a
<glabel
*> (prev
)))
2121 && (l
= find_label_entry (&labels
, label
)))
2122 warned_p
= warning_at (l
->loc
, OPT_Wimplicit_fallthrough_
,
2123 "this statement may fall through");
2124 else if (!gimple_call_internal_p (prev
, IFN_FALLTHROUGH
)
2125 /* Try to be clever and don't warn when the statement
2126 can't actually fall through. */
2127 && gimple_stmt_may_fallthru (prev
)
2128 && gimple_has_location (prev
))
2129 warned_p
= warning_at (gimple_location (prev
),
2130 OPT_Wimplicit_fallthrough_
,
2131 "this statement may fall through");
2133 inform (gimple_location (next
), "here");
2135 /* Mark this label as processed so as to prevent multiple
2136 warnings in nested switches. */
2137 FALLTHROUGH_LABEL_P (label
) = true;
2139 /* So that next warn_implicit_fallthrough_r will start looking for
2140 a new sequence starting with this label. */
2151 /* Warn when a switch case falls through. */
2154 maybe_warn_implicit_fallthrough (gimple_seq seq
)
2156 if (!warn_implicit_fallthrough
)
2159 /* This warning is meant for C/C++/ObjC/ObjC++ only. */
2162 || lang_GNU_OBJC ()))
2165 struct walk_stmt_info wi
;
2166 memset (&wi
, 0, sizeof (wi
));
2167 walk_gimple_seq (seq
, warn_implicit_fallthrough_r
, NULL
, &wi
);
2170 /* Callback for walk_gimple_seq. */
2173 expand_FALLTHROUGH_r (gimple_stmt_iterator
*gsi_p
, bool *handled_ops_p
,
2174 struct walk_stmt_info
*)
2176 gimple
*stmt
= gsi_stmt (*gsi_p
);
2178 *handled_ops_p
= true;
2179 switch (gimple_code (stmt
))
2184 case GIMPLE_EH_FILTER
:
2185 case GIMPLE_TRANSACTION
:
2186 /* Walk the sub-statements. */
2187 *handled_ops_p
= false;
2190 if (gimple_call_internal_p (stmt
, IFN_FALLTHROUGH
))
2192 gsi_remove (gsi_p
, true);
2193 if (gsi_end_p (*gsi_p
))
2194 return integer_zero_node
;
2197 location_t loc
= gimple_location (stmt
);
2199 gimple_stmt_iterator gsi2
= *gsi_p
;
2200 stmt
= gsi_stmt (gsi2
);
2201 if (gimple_code (stmt
) == GIMPLE_GOTO
&& !gimple_has_location (stmt
))
2203 /* Go on until the artificial label. */
2204 tree goto_dest
= gimple_goto_dest (stmt
);
2205 for (; !gsi_end_p (gsi2
); gsi_next (&gsi2
))
2207 if (gimple_code (gsi_stmt (gsi2
)) == GIMPLE_LABEL
2208 && gimple_label_label (as_a
<glabel
*> (gsi_stmt (gsi2
)))
2213 /* Not found? Stop. */
2214 if (gsi_end_p (gsi2
))
2217 /* Look one past it. */
2221 /* We're looking for a case label or default label here. */
2222 while (!gsi_end_p (gsi2
))
2224 stmt
= gsi_stmt (gsi2
);
2225 if (gimple_code (stmt
) == GIMPLE_LABEL
)
2227 tree label
= gimple_label_label (as_a
<glabel
*> (stmt
));
2228 if (gimple_has_location (stmt
) && DECL_ARTIFICIAL (label
))
2235 /* Something other than a label. That's not expected. */
2240 warning_at (loc
, 0, "attribute %<fallthrough%> not preceding "
2241 "a case label or default label");
2250 /* Expand all FALLTHROUGH () calls in SEQ. */
2253 expand_FALLTHROUGH (gimple_seq
*seq_p
)
2255 struct walk_stmt_info wi
;
2256 memset (&wi
, 0, sizeof (wi
));
2257 walk_gimple_seq_mod (seq_p
, expand_FALLTHROUGH_r
, NULL
, &wi
);
2261 /* Gimplify a SWITCH_EXPR, and collect the vector of labels it can
2264 static enum gimplify_status
2265 gimplify_switch_expr (tree
*expr_p
, gimple_seq
*pre_p
)
2267 tree switch_expr
= *expr_p
;
2268 gimple_seq switch_body_seq
= NULL
;
2269 enum gimplify_status ret
;
2270 tree index_type
= TREE_TYPE (switch_expr
);
2271 if (index_type
== NULL_TREE
)
2272 index_type
= TREE_TYPE (SWITCH_COND (switch_expr
));
2274 ret
= gimplify_expr (&SWITCH_COND (switch_expr
), pre_p
, NULL
, is_gimple_val
,
2276 if (ret
== GS_ERROR
|| ret
== GS_UNHANDLED
)
2279 if (SWITCH_BODY (switch_expr
))
2282 vec
<tree
> saved_labels
;
2283 hash_set
<tree
> *saved_live_switch_vars
= NULL
;
2284 tree default_case
= NULL_TREE
;
2285 gswitch
*switch_stmt
;
2287 /* If someone can be bothered to fill in the labels, they can
2288 be bothered to null out the body too. */
2289 gcc_assert (!SWITCH_LABELS (switch_expr
));
2291 /* Save old labels, get new ones from body, then restore the old
2292 labels. Save all the things from the switch body to append after. */
2293 saved_labels
= gimplify_ctxp
->case_labels
;
2294 gimplify_ctxp
->case_labels
.create (8);
2296 /* Do not create live_switch_vars if SWITCH_BODY is not a BIND_EXPR. */
2297 saved_live_switch_vars
= gimplify_ctxp
->live_switch_vars
;
2298 tree_code body_type
= TREE_CODE (SWITCH_BODY (switch_expr
));
2299 if (body_type
== BIND_EXPR
|| body_type
== STATEMENT_LIST
)
2300 gimplify_ctxp
->live_switch_vars
= new hash_set
<tree
> (4);
2302 gimplify_ctxp
->live_switch_vars
= NULL
;
2304 bool old_in_switch_expr
= gimplify_ctxp
->in_switch_expr
;
2305 gimplify_ctxp
->in_switch_expr
= true;
2307 gimplify_stmt (&SWITCH_BODY (switch_expr
), &switch_body_seq
);
2309 gimplify_ctxp
->in_switch_expr
= old_in_switch_expr
;
2310 maybe_warn_switch_unreachable (switch_body_seq
);
2311 maybe_warn_implicit_fallthrough (switch_body_seq
);
2312 /* Only do this for the outermost GIMPLE_SWITCH. */
2313 if (!gimplify_ctxp
->in_switch_expr
)
2314 expand_FALLTHROUGH (&switch_body_seq
);
2316 labels
= gimplify_ctxp
->case_labels
;
2317 gimplify_ctxp
->case_labels
= saved_labels
;
2319 if (gimplify_ctxp
->live_switch_vars
)
2321 gcc_assert (gimplify_ctxp
->live_switch_vars
->elements () == 0);
2322 delete gimplify_ctxp
->live_switch_vars
;
2324 gimplify_ctxp
->live_switch_vars
= saved_live_switch_vars
;
2326 preprocess_case_label_vec_for_gimple (labels
, index_type
,
2331 glabel
*new_default
;
2334 = build_case_label (NULL_TREE
, NULL_TREE
,
2335 create_artificial_label (UNKNOWN_LOCATION
));
2336 new_default
= gimple_build_label (CASE_LABEL (default_case
));
2337 gimplify_seq_add_stmt (&switch_body_seq
, new_default
);
2340 switch_stmt
= gimple_build_switch (SWITCH_COND (switch_expr
),
2341 default_case
, labels
);
2342 gimplify_seq_add_stmt (pre_p
, switch_stmt
);
2343 gimplify_seq_add_seq (pre_p
, switch_body_seq
);
2347 gcc_assert (SWITCH_LABELS (switch_expr
));
2352 /* Gimplify the LABEL_EXPR pointed to by EXPR_P. */
2354 static enum gimplify_status
2355 gimplify_label_expr (tree
*expr_p
, gimple_seq
*pre_p
)
2357 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p
))
2358 == current_function_decl
);
2360 tree label
= LABEL_EXPR_LABEL (*expr_p
);
2361 glabel
*label_stmt
= gimple_build_label (label
);
2362 gimple_set_location (label_stmt
, EXPR_LOCATION (*expr_p
));
2363 gimplify_seq_add_stmt (pre_p
, label_stmt
);
2365 if (lookup_attribute ("cold", DECL_ATTRIBUTES (label
)))
2366 gimple_seq_add_stmt (pre_p
, gimple_build_predict (PRED_COLD_LABEL
,
2368 else if (lookup_attribute ("hot", DECL_ATTRIBUTES (label
)))
2369 gimple_seq_add_stmt (pre_p
, gimple_build_predict (PRED_HOT_LABEL
,
2375 /* Gimplify the CASE_LABEL_EXPR pointed to by EXPR_P. */
2377 static enum gimplify_status
2378 gimplify_case_label_expr (tree
*expr_p
, gimple_seq
*pre_p
)
2380 struct gimplify_ctx
*ctxp
;
2383 /* Invalid programs can play Duff's Device type games with, for example,
2384 #pragma omp parallel. At least in the C front end, we don't
2385 detect such invalid branches until after gimplification, in the
2386 diagnose_omp_blocks pass. */
2387 for (ctxp
= gimplify_ctxp
; ; ctxp
= ctxp
->prev_context
)
2388 if (ctxp
->case_labels
.exists ())
2391 label_stmt
= gimple_build_label (CASE_LABEL (*expr_p
));
2392 gimple_set_location (label_stmt
, EXPR_LOCATION (*expr_p
));
2393 ctxp
->case_labels
.safe_push (*expr_p
);
2394 gimplify_seq_add_stmt (pre_p
, label_stmt
);
2399 /* Build a GOTO to the LABEL_DECL pointed to by LABEL_P, building it first
2403 build_and_jump (tree
*label_p
)
2405 if (label_p
== NULL
)
2406 /* If there's nowhere to jump, just fall through. */
2409 if (*label_p
== NULL_TREE
)
2411 tree label
= create_artificial_label (UNKNOWN_LOCATION
);
2415 return build1 (GOTO_EXPR
, void_type_node
, *label_p
);
2418 /* Gimplify an EXIT_EXPR by converting to a GOTO_EXPR inside a COND_EXPR.
2419 This also involves building a label to jump to and communicating it to
2420 gimplify_loop_expr through gimplify_ctxp->exit_label. */
2422 static enum gimplify_status
2423 gimplify_exit_expr (tree
*expr_p
)
2425 tree cond
= TREE_OPERAND (*expr_p
, 0);
2428 expr
= build_and_jump (&gimplify_ctxp
->exit_label
);
2429 expr
= build3 (COND_EXPR
, void_type_node
, cond
, expr
, NULL_TREE
);
2435 /* *EXPR_P is a COMPONENT_REF being used as an rvalue. If its type is
2436 different from its canonical type, wrap the whole thing inside a
2437 NOP_EXPR and force the type of the COMPONENT_REF to be the canonical
2440 The canonical type of a COMPONENT_REF is the type of the field being
2441 referenced--unless the field is a bit-field which can be read directly
2442 in a smaller mode, in which case the canonical type is the
2443 sign-appropriate type corresponding to that mode. */
2446 canonicalize_component_ref (tree
*expr_p
)
2448 tree expr
= *expr_p
;
2451 gcc_assert (TREE_CODE (expr
) == COMPONENT_REF
);
2453 if (INTEGRAL_TYPE_P (TREE_TYPE (expr
)))
2454 type
= TREE_TYPE (get_unwidened (expr
, NULL_TREE
));
2456 type
= TREE_TYPE (TREE_OPERAND (expr
, 1));
2458 /* One could argue that all the stuff below is not necessary for
2459 the non-bitfield case and declare it a FE error if type
2460 adjustment would be needed. */
2461 if (TREE_TYPE (expr
) != type
)
2463 #ifdef ENABLE_TYPES_CHECKING
2464 tree old_type
= TREE_TYPE (expr
);
2468 /* We need to preserve qualifiers and propagate them from
2470 type_quals
= TYPE_QUALS (type
)
2471 | TYPE_QUALS (TREE_TYPE (TREE_OPERAND (expr
, 0)));
2472 if (TYPE_QUALS (type
) != type_quals
)
2473 type
= build_qualified_type (TYPE_MAIN_VARIANT (type
), type_quals
);
2475 /* Set the type of the COMPONENT_REF to the underlying type. */
2476 TREE_TYPE (expr
) = type
;
2478 #ifdef ENABLE_TYPES_CHECKING
2479 /* It is now a FE error, if the conversion from the canonical
2480 type to the original expression type is not useless. */
2481 gcc_assert (useless_type_conversion_p (old_type
, type
));
2486 /* If a NOP conversion is changing a pointer to array of foo to a pointer
2487 to foo, embed that change in the ADDR_EXPR by converting
2492 where L is the lower bound. For simplicity, only do this for constant
2494 The constraint is that the type of &array[L] is trivially convertible
2498 canonicalize_addr_expr (tree
*expr_p
)
2500 tree expr
= *expr_p
;
2501 tree addr_expr
= TREE_OPERAND (expr
, 0);
2502 tree datype
, ddatype
, pddatype
;
2504 /* We simplify only conversions from an ADDR_EXPR to a pointer type. */
2505 if (!POINTER_TYPE_P (TREE_TYPE (expr
))
2506 || TREE_CODE (addr_expr
) != ADDR_EXPR
)
2509 /* The addr_expr type should be a pointer to an array. */
2510 datype
= TREE_TYPE (TREE_TYPE (addr_expr
));
2511 if (TREE_CODE (datype
) != ARRAY_TYPE
)
2514 /* The pointer to element type shall be trivially convertible to
2515 the expression pointer type. */
2516 ddatype
= TREE_TYPE (datype
);
2517 pddatype
= build_pointer_type (ddatype
);
2518 if (!useless_type_conversion_p (TYPE_MAIN_VARIANT (TREE_TYPE (expr
)),
2522 /* The lower bound and element sizes must be constant. */
2523 if (!TYPE_SIZE_UNIT (ddatype
)
2524 || TREE_CODE (TYPE_SIZE_UNIT (ddatype
)) != INTEGER_CST
2525 || !TYPE_DOMAIN (datype
) || !TYPE_MIN_VALUE (TYPE_DOMAIN (datype
))
2526 || TREE_CODE (TYPE_MIN_VALUE (TYPE_DOMAIN (datype
))) != INTEGER_CST
)
2529 /* All checks succeeded. Build a new node to merge the cast. */
2530 *expr_p
= build4 (ARRAY_REF
, ddatype
, TREE_OPERAND (addr_expr
, 0),
2531 TYPE_MIN_VALUE (TYPE_DOMAIN (datype
)),
2532 NULL_TREE
, NULL_TREE
);
2533 *expr_p
= build1 (ADDR_EXPR
, pddatype
, *expr_p
);
2535 /* We can have stripped a required restrict qualifier above. */
2536 if (!useless_type_conversion_p (TREE_TYPE (expr
), TREE_TYPE (*expr_p
)))
2537 *expr_p
= fold_convert (TREE_TYPE (expr
), *expr_p
);
2540 /* *EXPR_P is a NOP_EXPR or CONVERT_EXPR. Remove it and/or other conversions
2541 underneath as appropriate. */
2543 static enum gimplify_status
2544 gimplify_conversion (tree
*expr_p
)
2546 location_t loc
= EXPR_LOCATION (*expr_p
);
2547 gcc_assert (CONVERT_EXPR_P (*expr_p
));
2549 /* Then strip away all but the outermost conversion. */
2550 STRIP_SIGN_NOPS (TREE_OPERAND (*expr_p
, 0));
2552 /* And remove the outermost conversion if it's useless. */
2553 if (tree_ssa_useless_type_conversion (*expr_p
))
2554 *expr_p
= TREE_OPERAND (*expr_p
, 0);
2556 /* If we still have a conversion at the toplevel,
2557 then canonicalize some constructs. */
2558 if (CONVERT_EXPR_P (*expr_p
))
2560 tree sub
= TREE_OPERAND (*expr_p
, 0);
2562 /* If a NOP conversion is changing the type of a COMPONENT_REF
2563 expression, then canonicalize its type now in order to expose more
2564 redundant conversions. */
2565 if (TREE_CODE (sub
) == COMPONENT_REF
)
2566 canonicalize_component_ref (&TREE_OPERAND (*expr_p
, 0));
2568 /* If a NOP conversion is changing a pointer to array of foo
2569 to a pointer to foo, embed that change in the ADDR_EXPR. */
2570 else if (TREE_CODE (sub
) == ADDR_EXPR
)
2571 canonicalize_addr_expr (expr_p
);
2574 /* If we have a conversion to a non-register type force the
2575 use of a VIEW_CONVERT_EXPR instead. */
2576 if (CONVERT_EXPR_P (*expr_p
) && !is_gimple_reg_type (TREE_TYPE (*expr_p
)))
2577 *expr_p
= fold_build1_loc (loc
, VIEW_CONVERT_EXPR
, TREE_TYPE (*expr_p
),
2578 TREE_OPERAND (*expr_p
, 0));
2580 /* Canonicalize CONVERT_EXPR to NOP_EXPR. */
2581 if (TREE_CODE (*expr_p
) == CONVERT_EXPR
)
2582 TREE_SET_CODE (*expr_p
, NOP_EXPR
);
2587 /* Nonlocal VLAs seen in the current function. */
2588 static hash_set
<tree
> *nonlocal_vlas
;
2590 /* The VAR_DECLs created for nonlocal VLAs for debug info purposes. */
2591 static tree nonlocal_vla_vars
;
2593 /* Gimplify a VAR_DECL or PARM_DECL. Return GS_OK if we expanded a
2594 DECL_VALUE_EXPR, and it's worth re-examining things. */
2596 static enum gimplify_status
2597 gimplify_var_or_parm_decl (tree
*expr_p
)
2599 tree decl
= *expr_p
;
2601 /* ??? If this is a local variable, and it has not been seen in any
2602 outer BIND_EXPR, then it's probably the result of a duplicate
2603 declaration, for which we've already issued an error. It would
2604 be really nice if the front end wouldn't leak these at all.
2605 Currently the only known culprit is C++ destructors, as seen
2606 in g++.old-deja/g++.jason/binding.C. */
2608 && !DECL_SEEN_IN_BIND_EXPR_P (decl
)
2609 && !TREE_STATIC (decl
) && !DECL_EXTERNAL (decl
)
2610 && decl_function_context (decl
) == current_function_decl
)
2612 gcc_assert (seen_error ());
2616 /* When within an OMP context, notice uses of variables. */
2617 if (gimplify_omp_ctxp
&& omp_notice_variable (gimplify_omp_ctxp
, decl
, true))
2620 /* If the decl is an alias for another expression, substitute it now. */
2621 if (DECL_HAS_VALUE_EXPR_P (decl
))
2623 tree value_expr
= DECL_VALUE_EXPR (decl
);
2625 /* For referenced nonlocal VLAs add a decl for debugging purposes
2626 to the current function. */
2628 && TREE_CODE (DECL_SIZE_UNIT (decl
)) != INTEGER_CST
2629 && nonlocal_vlas
!= NULL
2630 && TREE_CODE (value_expr
) == INDIRECT_REF
2631 && TREE_CODE (TREE_OPERAND (value_expr
, 0)) == VAR_DECL
2632 && decl_function_context (decl
) != current_function_decl
)
2634 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
2636 && (ctx
->region_type
== ORT_WORKSHARE
2637 || ctx
->region_type
== ORT_SIMD
2638 || ctx
->region_type
== ORT_ACC
))
2639 ctx
= ctx
->outer_context
;
2640 if (!ctx
&& !nonlocal_vlas
->add (decl
))
2642 tree copy
= copy_node (decl
);
2644 lang_hooks
.dup_lang_specific_decl (copy
);
2645 SET_DECL_RTL (copy
, 0);
2646 TREE_USED (copy
) = 1;
2647 DECL_CHAIN (copy
) = nonlocal_vla_vars
;
2648 nonlocal_vla_vars
= copy
;
2649 SET_DECL_VALUE_EXPR (copy
, unshare_expr (value_expr
));
2650 DECL_HAS_VALUE_EXPR_P (copy
) = 1;
2654 *expr_p
= unshare_expr (value_expr
);
2661 /* Recalculate the value of the TREE_SIDE_EFFECTS flag for T. */
2664 recalculate_side_effects (tree t
)
2666 enum tree_code code
= TREE_CODE (t
);
2667 int len
= TREE_OPERAND_LENGTH (t
);
2670 switch (TREE_CODE_CLASS (code
))
2672 case tcc_expression
:
2678 case PREDECREMENT_EXPR
:
2679 case PREINCREMENT_EXPR
:
2680 case POSTDECREMENT_EXPR
:
2681 case POSTINCREMENT_EXPR
:
2682 /* All of these have side-effects, no matter what their
2691 case tcc_comparison
: /* a comparison expression */
2692 case tcc_unary
: /* a unary arithmetic expression */
2693 case tcc_binary
: /* a binary arithmetic expression */
2694 case tcc_reference
: /* a reference */
2695 case tcc_vl_exp
: /* a function call */
2696 TREE_SIDE_EFFECTS (t
) = TREE_THIS_VOLATILE (t
);
2697 for (i
= 0; i
< len
; ++i
)
2699 tree op
= TREE_OPERAND (t
, i
);
2700 if (op
&& TREE_SIDE_EFFECTS (op
))
2701 TREE_SIDE_EFFECTS (t
) = 1;
2706 /* No side-effects. */
2714 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
2718 : min_lval '[' val ']'
2720 | compound_lval '[' val ']'
2721 | compound_lval '.' ID
2723 This is not part of the original SIMPLE definition, which separates
2724 array and member references, but it seems reasonable to handle them
2725 together. Also, this way we don't run into problems with union
2726 aliasing; gcc requires that for accesses through a union to alias, the
2727 union reference must be explicit, which was not always the case when we
2728 were splitting up array and member refs.
2730 PRE_P points to the sequence where side effects that must happen before
2731 *EXPR_P should be stored.
2733 POST_P points to the sequence where side effects that must happen after
2734 *EXPR_P should be stored. */
2736 static enum gimplify_status
2737 gimplify_compound_lval (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
2738 fallback_t fallback
)
2741 enum gimplify_status ret
= GS_ALL_DONE
, tret
;
2743 location_t loc
= EXPR_LOCATION (*expr_p
);
2744 tree expr
= *expr_p
;
2746 /* Create a stack of the subexpressions so later we can walk them in
2747 order from inner to outer. */
2748 auto_vec
<tree
, 10> expr_stack
;
2750 /* We can handle anything that get_inner_reference can deal with. */
2751 for (p
= expr_p
; ; p
= &TREE_OPERAND (*p
, 0))
2754 /* Fold INDIRECT_REFs now to turn them into ARRAY_REFs. */
2755 if (TREE_CODE (*p
) == INDIRECT_REF
)
2756 *p
= fold_indirect_ref_loc (loc
, *p
);
2758 if (handled_component_p (*p
))
2760 /* Expand DECL_VALUE_EXPR now. In some cases that may expose
2761 additional COMPONENT_REFs. */
2762 else if ((VAR_P (*p
) || TREE_CODE (*p
) == PARM_DECL
)
2763 && gimplify_var_or_parm_decl (p
) == GS_OK
)
2768 expr_stack
.safe_push (*p
);
2771 gcc_assert (expr_stack
.length ());
2773 /* Now EXPR_STACK is a stack of pointers to all the refs we've
2774 walked through and P points to the innermost expression.
2776 Java requires that we elaborated nodes in source order. That
2777 means we must gimplify the inner expression followed by each of
2778 the indices, in order. But we can't gimplify the inner
2779 expression until we deal with any variable bounds, sizes, or
2780 positions in order to deal with PLACEHOLDER_EXPRs.
2782 So we do this in three steps. First we deal with the annotations
2783 for any variables in the components, then we gimplify the base,
2784 then we gimplify any indices, from left to right. */
2785 for (i
= expr_stack
.length () - 1; i
>= 0; i
--)
2787 tree t
= expr_stack
[i
];
2789 if (TREE_CODE (t
) == ARRAY_REF
|| TREE_CODE (t
) == ARRAY_RANGE_REF
)
2791 /* Gimplify the low bound and element type size and put them into
2792 the ARRAY_REF. If these values are set, they have already been
2794 if (TREE_OPERAND (t
, 2) == NULL_TREE
)
2796 tree low
= unshare_expr (array_ref_low_bound (t
));
2797 if (!is_gimple_min_invariant (low
))
2799 TREE_OPERAND (t
, 2) = low
;
2800 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
,
2801 post_p
, is_gimple_reg
,
2803 ret
= MIN (ret
, tret
);
2808 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
, post_p
,
2809 is_gimple_reg
, fb_rvalue
);
2810 ret
= MIN (ret
, tret
);
2813 if (TREE_OPERAND (t
, 3) == NULL_TREE
)
2815 tree elmt_type
= TREE_TYPE (TREE_TYPE (TREE_OPERAND (t
, 0)));
2816 tree elmt_size
= unshare_expr (array_ref_element_size (t
));
2817 tree factor
= size_int (TYPE_ALIGN_UNIT (elmt_type
));
2819 /* Divide the element size by the alignment of the element
2822 = size_binop_loc (loc
, EXACT_DIV_EXPR
, elmt_size
, factor
);
2824 if (!is_gimple_min_invariant (elmt_size
))
2826 TREE_OPERAND (t
, 3) = elmt_size
;
2827 tret
= gimplify_expr (&TREE_OPERAND (t
, 3), pre_p
,
2828 post_p
, is_gimple_reg
,
2830 ret
= MIN (ret
, tret
);
2835 tret
= gimplify_expr (&TREE_OPERAND (t
, 3), pre_p
, post_p
,
2836 is_gimple_reg
, fb_rvalue
);
2837 ret
= MIN (ret
, tret
);
2840 else if (TREE_CODE (t
) == COMPONENT_REF
)
2842 /* Set the field offset into T and gimplify it. */
2843 if (TREE_OPERAND (t
, 2) == NULL_TREE
)
2845 tree offset
= unshare_expr (component_ref_field_offset (t
));
2846 tree field
= TREE_OPERAND (t
, 1);
2848 = size_int (DECL_OFFSET_ALIGN (field
) / BITS_PER_UNIT
);
2850 /* Divide the offset by its alignment. */
2851 offset
= size_binop_loc (loc
, EXACT_DIV_EXPR
, offset
, factor
);
2853 if (!is_gimple_min_invariant (offset
))
2855 TREE_OPERAND (t
, 2) = offset
;
2856 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
,
2857 post_p
, is_gimple_reg
,
2859 ret
= MIN (ret
, tret
);
2864 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
, post_p
,
2865 is_gimple_reg
, fb_rvalue
);
2866 ret
= MIN (ret
, tret
);
2871 /* Step 2 is to gimplify the base expression. Make sure lvalue is set
2872 so as to match the min_lval predicate. Failure to do so may result
2873 in the creation of large aggregate temporaries. */
2874 tret
= gimplify_expr (p
, pre_p
, post_p
, is_gimple_min_lval
,
2875 fallback
| fb_lvalue
);
2876 ret
= MIN (ret
, tret
);
2878 /* And finally, the indices and operands of ARRAY_REF. During this
2879 loop we also remove any useless conversions. */
2880 for (; expr_stack
.length () > 0; )
2882 tree t
= expr_stack
.pop ();
2884 if (TREE_CODE (t
) == ARRAY_REF
|| TREE_CODE (t
) == ARRAY_RANGE_REF
)
2886 /* Gimplify the dimension. */
2887 if (!is_gimple_min_invariant (TREE_OPERAND (t
, 1)))
2889 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), pre_p
, post_p
,
2890 is_gimple_val
, fb_rvalue
);
2891 ret
= MIN (ret
, tret
);
2895 STRIP_USELESS_TYPE_CONVERSION (TREE_OPERAND (t
, 0));
2897 /* The innermost expression P may have originally had
2898 TREE_SIDE_EFFECTS set which would have caused all the outer
2899 expressions in *EXPR_P leading to P to also have had
2900 TREE_SIDE_EFFECTS set. */
2901 recalculate_side_effects (t
);
2904 /* If the outermost expression is a COMPONENT_REF, canonicalize its type. */
2905 if ((fallback
& fb_rvalue
) && TREE_CODE (*expr_p
) == COMPONENT_REF
)
2907 canonicalize_component_ref (expr_p
);
2910 expr_stack
.release ();
2912 gcc_assert (*expr_p
== expr
|| ret
!= GS_ALL_DONE
);
2917 /* Gimplify the self modifying expression pointed to by EXPR_P
2920 PRE_P points to the list where side effects that must happen before
2921 *EXPR_P should be stored.
2923 POST_P points to the list where side effects that must happen after
2924 *EXPR_P should be stored.
2926 WANT_VALUE is nonzero iff we want to use the value of this expression
2927 in another expression.
2929 ARITH_TYPE is the type the computation should be performed in. */
2931 enum gimplify_status
2932 gimplify_self_mod_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
2933 bool want_value
, tree arith_type
)
2935 enum tree_code code
;
2936 tree lhs
, lvalue
, rhs
, t1
;
2937 gimple_seq post
= NULL
, *orig_post_p
= post_p
;
2939 enum tree_code arith_code
;
2940 enum gimplify_status ret
;
2941 location_t loc
= EXPR_LOCATION (*expr_p
);
2943 code
= TREE_CODE (*expr_p
);
2945 gcc_assert (code
== POSTINCREMENT_EXPR
|| code
== POSTDECREMENT_EXPR
2946 || code
== PREINCREMENT_EXPR
|| code
== PREDECREMENT_EXPR
);
2948 /* Prefix or postfix? */
2949 if (code
== POSTINCREMENT_EXPR
|| code
== POSTDECREMENT_EXPR
)
2950 /* Faster to treat as prefix if result is not used. */
2951 postfix
= want_value
;
2955 /* For postfix, make sure the inner expression's post side effects
2956 are executed after side effects from this expression. */
2960 /* Add or subtract? */
2961 if (code
== PREINCREMENT_EXPR
|| code
== POSTINCREMENT_EXPR
)
2962 arith_code
= PLUS_EXPR
;
2964 arith_code
= MINUS_EXPR
;
2966 /* Gimplify the LHS into a GIMPLE lvalue. */
2967 lvalue
= TREE_OPERAND (*expr_p
, 0);
2968 ret
= gimplify_expr (&lvalue
, pre_p
, post_p
, is_gimple_lvalue
, fb_lvalue
);
2969 if (ret
== GS_ERROR
)
2972 /* Extract the operands to the arithmetic operation. */
2974 rhs
= TREE_OPERAND (*expr_p
, 1);
2976 /* For postfix operator, we evaluate the LHS to an rvalue and then use
2977 that as the result value and in the postqueue operation. */
2980 ret
= gimplify_expr (&lhs
, pre_p
, post_p
, is_gimple_val
, fb_rvalue
);
2981 if (ret
== GS_ERROR
)
2984 lhs
= get_initialized_tmp_var (lhs
, pre_p
, NULL
);
2987 /* For POINTERs increment, use POINTER_PLUS_EXPR. */
2988 if (POINTER_TYPE_P (TREE_TYPE (lhs
)))
2990 rhs
= convert_to_ptrofftype_loc (loc
, rhs
);
2991 if (arith_code
== MINUS_EXPR
)
2992 rhs
= fold_build1_loc (loc
, NEGATE_EXPR
, TREE_TYPE (rhs
), rhs
);
2993 t1
= fold_build2 (POINTER_PLUS_EXPR
, TREE_TYPE (*expr_p
), lhs
, rhs
);
2996 t1
= fold_convert (TREE_TYPE (*expr_p
),
2997 fold_build2 (arith_code
, arith_type
,
2998 fold_convert (arith_type
, lhs
),
2999 fold_convert (arith_type
, rhs
)));
3003 gimplify_assign (lvalue
, t1
, pre_p
);
3004 gimplify_seq_add_seq (orig_post_p
, post
);
3010 *expr_p
= build2 (MODIFY_EXPR
, TREE_TYPE (lvalue
), lvalue
, t1
);
3015 /* If *EXPR_P has a variable sized type, wrap it in a WITH_SIZE_EXPR. */
3018 maybe_with_size_expr (tree
*expr_p
)
3020 tree expr
= *expr_p
;
3021 tree type
= TREE_TYPE (expr
);
3024 /* If we've already wrapped this or the type is error_mark_node, we can't do
3026 if (TREE_CODE (expr
) == WITH_SIZE_EXPR
3027 || type
== error_mark_node
)
3030 /* If the size isn't known or is a constant, we have nothing to do. */
3031 size
= TYPE_SIZE_UNIT (type
);
3032 if (!size
|| TREE_CODE (size
) == INTEGER_CST
)
3035 /* Otherwise, make a WITH_SIZE_EXPR. */
3036 size
= unshare_expr (size
);
3037 size
= SUBSTITUTE_PLACEHOLDER_IN_EXPR (size
, expr
);
3038 *expr_p
= build2 (WITH_SIZE_EXPR
, type
, expr
, size
);
3041 /* Helper for gimplify_call_expr. Gimplify a single argument *ARG_P
3042 Store any side-effects in PRE_P. CALL_LOCATION is the location of
3043 the CALL_EXPR. If ALLOW_SSA is set the actual parameter may be
3044 gimplified to an SSA name. */
3046 enum gimplify_status
3047 gimplify_arg (tree
*arg_p
, gimple_seq
*pre_p
, location_t call_location
,
3050 bool (*test
) (tree
);
3053 /* In general, we allow lvalues for function arguments to avoid
3054 extra overhead of copying large aggregates out of even larger
3055 aggregates into temporaries only to copy the temporaries to
3056 the argument list. Make optimizers happy by pulling out to
3057 temporaries those types that fit in registers. */
3058 if (is_gimple_reg_type (TREE_TYPE (*arg_p
)))
3059 test
= is_gimple_val
, fb
= fb_rvalue
;
3062 test
= is_gimple_lvalue
, fb
= fb_either
;
3063 /* Also strip a TARGET_EXPR that would force an extra copy. */
3064 if (TREE_CODE (*arg_p
) == TARGET_EXPR
)
3066 tree init
= TARGET_EXPR_INITIAL (*arg_p
);
3068 && !VOID_TYPE_P (TREE_TYPE (init
)))
3073 /* If this is a variable sized type, we must remember the size. */
3074 maybe_with_size_expr (arg_p
);
3076 /* FIXME diagnostics: This will mess up gcc.dg/Warray-bounds.c. */
3077 /* Make sure arguments have the same location as the function call
3079 protected_set_expr_location (*arg_p
, call_location
);
3081 /* There is a sequence point before a function call. Side effects in
3082 the argument list must occur before the actual call. So, when
3083 gimplifying arguments, force gimplify_expr to use an internal
3084 post queue which is then appended to the end of PRE_P. */
3085 return gimplify_expr (arg_p
, pre_p
, NULL
, test
, fb
, allow_ssa
);
3088 /* Don't fold inside offloading or taskreg regions: it can break code by
3089 adding decl references that weren't in the source. We'll do it during
3090 omplower pass instead. */
3093 maybe_fold_stmt (gimple_stmt_iterator
*gsi
)
3095 struct gimplify_omp_ctx
*ctx
;
3096 for (ctx
= gimplify_omp_ctxp
; ctx
; ctx
= ctx
->outer_context
)
3097 if ((ctx
->region_type
& (ORT_TARGET
| ORT_PARALLEL
| ORT_TASK
)) != 0)
3099 return fold_stmt (gsi
);
3102 /* Add a gimple call to __builtin_cilk_detach to GIMPLE sequence PRE_P,
3103 with the pointer to the proper cilk frame. */
3105 gimplify_cilk_detach (gimple_seq
*pre_p
)
3107 tree frame
= cfun
->cilk_frame_decl
;
3108 tree ptrf
= build1 (ADDR_EXPR
, cilk_frame_ptr_type_decl
,
3110 gcall
*detach
= gimple_build_call (cilk_detach_fndecl
, 1,
3112 gimplify_seq_add_stmt(pre_p
, detach
);
3115 /* Gimplify the CALL_EXPR node *EXPR_P into the GIMPLE sequence PRE_P.
3116 WANT_VALUE is true if the result of the call is desired. */
3118 static enum gimplify_status
3119 gimplify_call_expr (tree
*expr_p
, gimple_seq
*pre_p
, bool want_value
)
3121 tree fndecl
, parms
, p
, fnptrtype
;
3122 enum gimplify_status ret
;
3125 bool builtin_va_start_p
= false;
3126 location_t loc
= EXPR_LOCATION (*expr_p
);
3128 gcc_assert (TREE_CODE (*expr_p
) == CALL_EXPR
);
3130 /* For reliable diagnostics during inlining, it is necessary that
3131 every call_expr be annotated with file and line. */
3132 if (! EXPR_HAS_LOCATION (*expr_p
))
3133 SET_EXPR_LOCATION (*expr_p
, input_location
);
3135 /* Gimplify internal functions created in the FEs. */
3136 if (CALL_EXPR_FN (*expr_p
) == NULL_TREE
)
3141 nargs
= call_expr_nargs (*expr_p
);
3142 enum internal_fn ifn
= CALL_EXPR_IFN (*expr_p
);
3143 auto_vec
<tree
> vargs (nargs
);
3145 for (i
= 0; i
< nargs
; i
++)
3147 gimplify_arg (&CALL_EXPR_ARG (*expr_p
, i
), pre_p
,
3148 EXPR_LOCATION (*expr_p
));
3149 vargs
.quick_push (CALL_EXPR_ARG (*expr_p
, i
));
3152 if (EXPR_CILK_SPAWN (*expr_p
))
3153 gimplify_cilk_detach (pre_p
);
3154 gimple
*call
= gimple_build_call_internal_vec (ifn
, vargs
);
3155 gimplify_seq_add_stmt (pre_p
, call
);
3159 /* This may be a call to a builtin function.
3161 Builtin function calls may be transformed into different
3162 (and more efficient) builtin function calls under certain
3163 circumstances. Unfortunately, gimplification can muck things
3164 up enough that the builtin expanders are not aware that certain
3165 transformations are still valid.
3167 So we attempt transformation/gimplification of the call before
3168 we gimplify the CALL_EXPR. At this time we do not manage to
3169 transform all calls in the same manner as the expanders do, but
3170 we do transform most of them. */
3171 fndecl
= get_callee_fndecl (*expr_p
);
3173 && DECL_BUILT_IN_CLASS (fndecl
) == BUILT_IN_NORMAL
)
3174 switch (DECL_FUNCTION_CODE (fndecl
))
3176 case BUILT_IN_ALLOCA
:
3177 case BUILT_IN_ALLOCA_WITH_ALIGN
:
3178 /* If the call has been built for a variable-sized object, then we
3179 want to restore the stack level when the enclosing BIND_EXPR is
3180 exited to reclaim the allocated space; otherwise, we precisely
3181 need to do the opposite and preserve the latest stack level. */
3182 if (CALL_ALLOCA_FOR_VAR_P (*expr_p
))
3183 gimplify_ctxp
->save_stack
= true;
3185 gimplify_ctxp
->keep_stack
= true;
3188 case BUILT_IN_VA_START
:
3190 builtin_va_start_p
= TRUE
;
3191 if (call_expr_nargs (*expr_p
) < 2)
3193 error ("too few arguments to function %<va_start%>");
3194 *expr_p
= build_empty_stmt (EXPR_LOCATION (*expr_p
));
3198 if (fold_builtin_next_arg (*expr_p
, true))
3200 *expr_p
= build_empty_stmt (EXPR_LOCATION (*expr_p
));
3209 if (fndecl
&& DECL_BUILT_IN (fndecl
))
3211 tree new_tree
= fold_call_expr (input_location
, *expr_p
, !want_value
);
3212 if (new_tree
&& new_tree
!= *expr_p
)
3214 /* There was a transformation of this call which computes the
3215 same value, but in a more efficient way. Return and try
3222 /* Remember the original function pointer type. */
3223 fnptrtype
= TREE_TYPE (CALL_EXPR_FN (*expr_p
));
3225 /* There is a sequence point before the call, so any side effects in
3226 the calling expression must occur before the actual call. Force
3227 gimplify_expr to use an internal post queue. */
3228 ret
= gimplify_expr (&CALL_EXPR_FN (*expr_p
), pre_p
, NULL
,
3229 is_gimple_call_addr
, fb_rvalue
);
3231 nargs
= call_expr_nargs (*expr_p
);
3233 /* Get argument types for verification. */
3234 fndecl
= get_callee_fndecl (*expr_p
);
3237 parms
= TYPE_ARG_TYPES (TREE_TYPE (fndecl
));
3239 parms
= TYPE_ARG_TYPES (TREE_TYPE (fnptrtype
));
3241 if (fndecl
&& DECL_ARGUMENTS (fndecl
))
3242 p
= DECL_ARGUMENTS (fndecl
);
3247 for (i
= 0; i
< nargs
&& p
; i
++, p
= TREE_CHAIN (p
))
3250 /* If the last argument is __builtin_va_arg_pack () and it is not
3251 passed as a named argument, decrease the number of CALL_EXPR
3252 arguments and set instead the CALL_EXPR_VA_ARG_PACK flag. */
3255 && TREE_CODE (CALL_EXPR_ARG (*expr_p
, nargs
- 1)) == CALL_EXPR
)
3257 tree last_arg
= CALL_EXPR_ARG (*expr_p
, nargs
- 1);
3258 tree last_arg_fndecl
= get_callee_fndecl (last_arg
);
3261 && TREE_CODE (last_arg_fndecl
) == FUNCTION_DECL
3262 && DECL_BUILT_IN_CLASS (last_arg_fndecl
) == BUILT_IN_NORMAL
3263 && DECL_FUNCTION_CODE (last_arg_fndecl
) == BUILT_IN_VA_ARG_PACK
)
3265 tree call
= *expr_p
;
3268 *expr_p
= build_call_array_loc (loc
, TREE_TYPE (call
),
3269 CALL_EXPR_FN (call
),
3270 nargs
, CALL_EXPR_ARGP (call
));
3272 /* Copy all CALL_EXPR flags, location and block, except
3273 CALL_EXPR_VA_ARG_PACK flag. */
3274 CALL_EXPR_STATIC_CHAIN (*expr_p
) = CALL_EXPR_STATIC_CHAIN (call
);
3275 CALL_EXPR_TAILCALL (*expr_p
) = CALL_EXPR_TAILCALL (call
);
3276 CALL_EXPR_RETURN_SLOT_OPT (*expr_p
)
3277 = CALL_EXPR_RETURN_SLOT_OPT (call
);
3278 CALL_FROM_THUNK_P (*expr_p
) = CALL_FROM_THUNK_P (call
);
3279 SET_EXPR_LOCATION (*expr_p
, EXPR_LOCATION (call
));
3281 /* Set CALL_EXPR_VA_ARG_PACK. */
3282 CALL_EXPR_VA_ARG_PACK (*expr_p
) = 1;
3286 /* If the call returns twice then after building the CFG the call
3287 argument computations will no longer dominate the call because
3288 we add an abnormal incoming edge to the call. So do not use SSA
3290 bool returns_twice
= call_expr_flags (*expr_p
) & ECF_RETURNS_TWICE
;
3292 /* Gimplify the function arguments. */
3295 for (i
= (PUSH_ARGS_REVERSED
? nargs
- 1 : 0);
3296 PUSH_ARGS_REVERSED
? i
>= 0 : i
< nargs
;
3297 PUSH_ARGS_REVERSED
? i
-- : i
++)
3299 enum gimplify_status t
;
3301 /* Avoid gimplifying the second argument to va_start, which needs to
3302 be the plain PARM_DECL. */
3303 if ((i
!= 1) || !builtin_va_start_p
)
3305 t
= gimplify_arg (&CALL_EXPR_ARG (*expr_p
, i
), pre_p
,
3306 EXPR_LOCATION (*expr_p
), ! returns_twice
);
3314 /* Gimplify the static chain. */
3315 if (CALL_EXPR_STATIC_CHAIN (*expr_p
))
3317 if (fndecl
&& !DECL_STATIC_CHAIN (fndecl
))
3318 CALL_EXPR_STATIC_CHAIN (*expr_p
) = NULL
;
3321 enum gimplify_status t
;
3322 t
= gimplify_arg (&CALL_EXPR_STATIC_CHAIN (*expr_p
), pre_p
,
3323 EXPR_LOCATION (*expr_p
), ! returns_twice
);
3329 /* Verify the function result. */
3330 if (want_value
&& fndecl
3331 && VOID_TYPE_P (TREE_TYPE (TREE_TYPE (fnptrtype
))))
3333 error_at (loc
, "using result of function returning %<void%>");
3337 /* Try this again in case gimplification exposed something. */
3338 if (ret
!= GS_ERROR
)
3340 tree new_tree
= fold_call_expr (input_location
, *expr_p
, !want_value
);
3342 if (new_tree
&& new_tree
!= *expr_p
)
3344 /* There was a transformation of this call which computes the
3345 same value, but in a more efficient way. Return and try
3353 *expr_p
= error_mark_node
;
3357 /* If the function is "const" or "pure", then clear TREE_SIDE_EFFECTS on its
3358 decl. This allows us to eliminate redundant or useless
3359 calls to "const" functions. */
3360 if (TREE_CODE (*expr_p
) == CALL_EXPR
)
3362 int flags
= call_expr_flags (*expr_p
);
3363 if (flags
& (ECF_CONST
| ECF_PURE
)
3364 /* An infinite loop is considered a side effect. */
3365 && !(flags
& (ECF_LOOPING_CONST_OR_PURE
)))
3366 TREE_SIDE_EFFECTS (*expr_p
) = 0;
3369 /* If the value is not needed by the caller, emit a new GIMPLE_CALL
3370 and clear *EXPR_P. Otherwise, leave *EXPR_P in its gimplified
3371 form and delegate the creation of a GIMPLE_CALL to
3372 gimplify_modify_expr. This is always possible because when
3373 WANT_VALUE is true, the caller wants the result of this call into
3374 a temporary, which means that we will emit an INIT_EXPR in
3375 internal_get_tmp_var which will then be handled by
3376 gimplify_modify_expr. */
3379 /* The CALL_EXPR in *EXPR_P is already in GIMPLE form, so all we
3380 have to do is replicate it as a GIMPLE_CALL tuple. */
3381 gimple_stmt_iterator gsi
;
3382 call
= gimple_build_call_from_tree (*expr_p
);
3383 gimple_call_set_fntype (call
, TREE_TYPE (fnptrtype
));
3384 notice_special_calls (call
);
3385 if (EXPR_CILK_SPAWN (*expr_p
))
3386 gimplify_cilk_detach (pre_p
);
3387 gimplify_seq_add_stmt (pre_p
, call
);
3388 gsi
= gsi_last (*pre_p
);
3389 maybe_fold_stmt (&gsi
);
3390 *expr_p
= NULL_TREE
;
3393 /* Remember the original function type. */
3394 CALL_EXPR_FN (*expr_p
) = build1 (NOP_EXPR
, fnptrtype
,
3395 CALL_EXPR_FN (*expr_p
));
3400 /* Handle shortcut semantics in the predicate operand of a COND_EXPR by
3401 rewriting it into multiple COND_EXPRs, and possibly GOTO_EXPRs.
3403 TRUE_LABEL_P and FALSE_LABEL_P point to the labels to jump to if the
3404 condition is true or false, respectively. If null, we should generate
3405 our own to skip over the evaluation of this specific expression.
3407 LOCUS is the source location of the COND_EXPR.
3409 This function is the tree equivalent of do_jump.
3411 shortcut_cond_r should only be called by shortcut_cond_expr. */
3414 shortcut_cond_r (tree pred
, tree
*true_label_p
, tree
*false_label_p
,
3417 tree local_label
= NULL_TREE
;
3418 tree t
, expr
= NULL
;
3420 /* OK, it's not a simple case; we need to pull apart the COND_EXPR to
3421 retain the shortcut semantics. Just insert the gotos here;
3422 shortcut_cond_expr will append the real blocks later. */
3423 if (TREE_CODE (pred
) == TRUTH_ANDIF_EXPR
)
3425 location_t new_locus
;
3427 /* Turn if (a && b) into
3429 if (a); else goto no;
3430 if (b) goto yes; else goto no;
3433 if (false_label_p
== NULL
)
3434 false_label_p
= &local_label
;
3436 /* Keep the original source location on the first 'if'. */
3437 t
= shortcut_cond_r (TREE_OPERAND (pred
, 0), NULL
, false_label_p
, locus
);
3438 append_to_statement_list (t
, &expr
);
3440 /* Set the source location of the && on the second 'if'. */
3441 new_locus
= EXPR_HAS_LOCATION (pred
) ? EXPR_LOCATION (pred
) : locus
;
3442 t
= shortcut_cond_r (TREE_OPERAND (pred
, 1), true_label_p
, false_label_p
,
3444 append_to_statement_list (t
, &expr
);
3446 else if (TREE_CODE (pred
) == TRUTH_ORIF_EXPR
)
3448 location_t new_locus
;
3450 /* Turn if (a || b) into
3453 if (b) goto yes; else goto no;
3456 if (true_label_p
== NULL
)
3457 true_label_p
= &local_label
;
3459 /* Keep the original source location on the first 'if'. */
3460 t
= shortcut_cond_r (TREE_OPERAND (pred
, 0), true_label_p
, NULL
, locus
);
3461 append_to_statement_list (t
, &expr
);
3463 /* Set the source location of the || on the second 'if'. */
3464 new_locus
= EXPR_HAS_LOCATION (pred
) ? EXPR_LOCATION (pred
) : locus
;
3465 t
= shortcut_cond_r (TREE_OPERAND (pred
, 1), true_label_p
, false_label_p
,
3467 append_to_statement_list (t
, &expr
);
3469 else if (TREE_CODE (pred
) == COND_EXPR
3470 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred
, 1)))
3471 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred
, 2))))
3473 location_t new_locus
;
3475 /* As long as we're messing with gotos, turn if (a ? b : c) into
3477 if (b) goto yes; else goto no;
3479 if (c) goto yes; else goto no;
3481 Don't do this if one of the arms has void type, which can happen
3482 in C++ when the arm is throw. */
3484 /* Keep the original source location on the first 'if'. Set the source
3485 location of the ? on the second 'if'. */
3486 new_locus
= EXPR_HAS_LOCATION (pred
) ? EXPR_LOCATION (pred
) : locus
;
3487 expr
= build3 (COND_EXPR
, void_type_node
, TREE_OPERAND (pred
, 0),
3488 shortcut_cond_r (TREE_OPERAND (pred
, 1), true_label_p
,
3489 false_label_p
, locus
),
3490 shortcut_cond_r (TREE_OPERAND (pred
, 2), true_label_p
,
3491 false_label_p
, new_locus
));
3495 expr
= build3 (COND_EXPR
, void_type_node
, pred
,
3496 build_and_jump (true_label_p
),
3497 build_and_jump (false_label_p
));
3498 SET_EXPR_LOCATION (expr
, locus
);
3503 t
= build1 (LABEL_EXPR
, void_type_node
, local_label
);
3504 append_to_statement_list (t
, &expr
);
3510 /* Given a conditional expression EXPR with short-circuit boolean
3511 predicates using TRUTH_ANDIF_EXPR or TRUTH_ORIF_EXPR, break the
3512 predicate apart into the equivalent sequence of conditionals. */
3515 shortcut_cond_expr (tree expr
)
3517 tree pred
= TREE_OPERAND (expr
, 0);
3518 tree then_
= TREE_OPERAND (expr
, 1);
3519 tree else_
= TREE_OPERAND (expr
, 2);
3520 tree true_label
, false_label
, end_label
, t
;
3522 tree
*false_label_p
;
3523 bool emit_end
, emit_false
, jump_over_else
;
3524 bool then_se
= then_
&& TREE_SIDE_EFFECTS (then_
);
3525 bool else_se
= else_
&& TREE_SIDE_EFFECTS (else_
);
3527 /* First do simple transformations. */
3530 /* If there is no 'else', turn
3533 if (a) if (b) then c. */
3534 while (TREE_CODE (pred
) == TRUTH_ANDIF_EXPR
)
3536 /* Keep the original source location on the first 'if'. */
3537 location_t locus
= EXPR_LOC_OR_LOC (expr
, input_location
);
3538 TREE_OPERAND (expr
, 0) = TREE_OPERAND (pred
, 1);
3539 /* Set the source location of the && on the second 'if'. */
3540 if (EXPR_HAS_LOCATION (pred
))
3541 SET_EXPR_LOCATION (expr
, EXPR_LOCATION (pred
));
3542 then_
= shortcut_cond_expr (expr
);
3543 then_se
= then_
&& TREE_SIDE_EFFECTS (then_
);
3544 pred
= TREE_OPERAND (pred
, 0);
3545 expr
= build3 (COND_EXPR
, void_type_node
, pred
, then_
, NULL_TREE
);
3546 SET_EXPR_LOCATION (expr
, locus
);
3552 /* If there is no 'then', turn
3555 if (a); else if (b); else d. */
3556 while (TREE_CODE (pred
) == TRUTH_ORIF_EXPR
)
3558 /* Keep the original source location on the first 'if'. */
3559 location_t locus
= EXPR_LOC_OR_LOC (expr
, input_location
);
3560 TREE_OPERAND (expr
, 0) = TREE_OPERAND (pred
, 1);
3561 /* Set the source location of the || on the second 'if'. */
3562 if (EXPR_HAS_LOCATION (pred
))
3563 SET_EXPR_LOCATION (expr
, EXPR_LOCATION (pred
));
3564 else_
= shortcut_cond_expr (expr
);
3565 else_se
= else_
&& TREE_SIDE_EFFECTS (else_
);
3566 pred
= TREE_OPERAND (pred
, 0);
3567 expr
= build3 (COND_EXPR
, void_type_node
, pred
, NULL_TREE
, else_
);
3568 SET_EXPR_LOCATION (expr
, locus
);
3572 /* If we're done, great. */
3573 if (TREE_CODE (pred
) != TRUTH_ANDIF_EXPR
3574 && TREE_CODE (pred
) != TRUTH_ORIF_EXPR
)
3577 /* Otherwise we need to mess with gotos. Change
3580 if (a); else goto no;
3583 and recursively gimplify the condition. */
3585 true_label
= false_label
= end_label
= NULL_TREE
;
3587 /* If our arms just jump somewhere, hijack those labels so we don't
3588 generate jumps to jumps. */
3591 && TREE_CODE (then_
) == GOTO_EXPR
3592 && TREE_CODE (GOTO_DESTINATION (then_
)) == LABEL_DECL
)
3594 true_label
= GOTO_DESTINATION (then_
);
3600 && TREE_CODE (else_
) == GOTO_EXPR
3601 && TREE_CODE (GOTO_DESTINATION (else_
)) == LABEL_DECL
)
3603 false_label
= GOTO_DESTINATION (else_
);
3608 /* If we aren't hijacking a label for the 'then' branch, it falls through. */
3610 true_label_p
= &true_label
;
3612 true_label_p
= NULL
;
3614 /* The 'else' branch also needs a label if it contains interesting code. */
3615 if (false_label
|| else_se
)
3616 false_label_p
= &false_label
;
3618 false_label_p
= NULL
;
3620 /* If there was nothing else in our arms, just forward the label(s). */
3621 if (!then_se
&& !else_se
)
3622 return shortcut_cond_r (pred
, true_label_p
, false_label_p
,
3623 EXPR_LOC_OR_LOC (expr
, input_location
));
3625 /* If our last subexpression already has a terminal label, reuse it. */
3627 t
= expr_last (else_
);
3629 t
= expr_last (then_
);
3632 if (t
&& TREE_CODE (t
) == LABEL_EXPR
)
3633 end_label
= LABEL_EXPR_LABEL (t
);
3635 /* If we don't care about jumping to the 'else' branch, jump to the end
3636 if the condition is false. */
3638 false_label_p
= &end_label
;
3640 /* We only want to emit these labels if we aren't hijacking them. */
3641 emit_end
= (end_label
== NULL_TREE
);
3642 emit_false
= (false_label
== NULL_TREE
);
3644 /* We only emit the jump over the else clause if we have to--if the
3645 then clause may fall through. Otherwise we can wind up with a
3646 useless jump and a useless label at the end of gimplified code,
3647 which will cause us to think that this conditional as a whole
3648 falls through even if it doesn't. If we then inline a function
3649 which ends with such a condition, that can cause us to issue an
3650 inappropriate warning about control reaching the end of a
3651 non-void function. */
3652 jump_over_else
= block_may_fallthru (then_
);
3654 pred
= shortcut_cond_r (pred
, true_label_p
, false_label_p
,
3655 EXPR_LOC_OR_LOC (expr
, input_location
));
3658 append_to_statement_list (pred
, &expr
);
3660 append_to_statement_list (then_
, &expr
);
3665 tree last
= expr_last (expr
);
3666 t
= build_and_jump (&end_label
);
3667 if (EXPR_HAS_LOCATION (last
))
3668 SET_EXPR_LOCATION (t
, EXPR_LOCATION (last
));
3669 append_to_statement_list (t
, &expr
);
3673 t
= build1 (LABEL_EXPR
, void_type_node
, false_label
);
3674 append_to_statement_list (t
, &expr
);
3676 append_to_statement_list (else_
, &expr
);
3678 if (emit_end
&& end_label
)
3680 t
= build1 (LABEL_EXPR
, void_type_node
, end_label
);
3681 append_to_statement_list (t
, &expr
);
3687 /* EXPR is used in a boolean context; make sure it has BOOLEAN_TYPE. */
3690 gimple_boolify (tree expr
)
3692 tree type
= TREE_TYPE (expr
);
3693 location_t loc
= EXPR_LOCATION (expr
);
3695 if (TREE_CODE (expr
) == NE_EXPR
3696 && TREE_CODE (TREE_OPERAND (expr
, 0)) == CALL_EXPR
3697 && integer_zerop (TREE_OPERAND (expr
, 1)))
3699 tree call
= TREE_OPERAND (expr
, 0);
3700 tree fn
= get_callee_fndecl (call
);
3702 /* For __builtin_expect ((long) (x), y) recurse into x as well
3703 if x is truth_value_p. */
3705 && DECL_BUILT_IN_CLASS (fn
) == BUILT_IN_NORMAL
3706 && DECL_FUNCTION_CODE (fn
) == BUILT_IN_EXPECT
3707 && call_expr_nargs (call
) == 2)
3709 tree arg
= CALL_EXPR_ARG (call
, 0);
3712 if (TREE_CODE (arg
) == NOP_EXPR
3713 && TREE_TYPE (arg
) == TREE_TYPE (call
))
3714 arg
= TREE_OPERAND (arg
, 0);
3715 if (truth_value_p (TREE_CODE (arg
)))
3717 arg
= gimple_boolify (arg
);
3718 CALL_EXPR_ARG (call
, 0)
3719 = fold_convert_loc (loc
, TREE_TYPE (call
), arg
);
3725 switch (TREE_CODE (expr
))
3727 case TRUTH_AND_EXPR
:
3729 case TRUTH_XOR_EXPR
:
3730 case TRUTH_ANDIF_EXPR
:
3731 case TRUTH_ORIF_EXPR
:
3732 /* Also boolify the arguments of truth exprs. */
3733 TREE_OPERAND (expr
, 1) = gimple_boolify (TREE_OPERAND (expr
, 1));
3736 case TRUTH_NOT_EXPR
:
3737 TREE_OPERAND (expr
, 0) = gimple_boolify (TREE_OPERAND (expr
, 0));
3739 /* These expressions always produce boolean results. */
3740 if (TREE_CODE (type
) != BOOLEAN_TYPE
)
3741 TREE_TYPE (expr
) = boolean_type_node
;
3745 switch ((enum annot_expr_kind
) TREE_INT_CST_LOW (TREE_OPERAND (expr
, 1)))
3747 case annot_expr_ivdep_kind
:
3748 case annot_expr_no_vector_kind
:
3749 case annot_expr_vector_kind
:
3750 TREE_OPERAND (expr
, 0) = gimple_boolify (TREE_OPERAND (expr
, 0));
3751 if (TREE_CODE (type
) != BOOLEAN_TYPE
)
3752 TREE_TYPE (expr
) = boolean_type_node
;
3759 if (COMPARISON_CLASS_P (expr
))
3761 /* There expressions always prduce boolean results. */
3762 if (TREE_CODE (type
) != BOOLEAN_TYPE
)
3763 TREE_TYPE (expr
) = boolean_type_node
;
3766 /* Other expressions that get here must have boolean values, but
3767 might need to be converted to the appropriate mode. */
3768 if (TREE_CODE (type
) == BOOLEAN_TYPE
)
3770 return fold_convert_loc (loc
, boolean_type_node
, expr
);
3774 /* Given a conditional expression *EXPR_P without side effects, gimplify
3775 its operands. New statements are inserted to PRE_P. */
3777 static enum gimplify_status
3778 gimplify_pure_cond_expr (tree
*expr_p
, gimple_seq
*pre_p
)
3780 tree expr
= *expr_p
, cond
;
3781 enum gimplify_status ret
, tret
;
3782 enum tree_code code
;
3784 cond
= gimple_boolify (COND_EXPR_COND (expr
));
3786 /* We need to handle && and || specially, as their gimplification
3787 creates pure cond_expr, thus leading to an infinite cycle otherwise. */
3788 code
= TREE_CODE (cond
);
3789 if (code
== TRUTH_ANDIF_EXPR
)
3790 TREE_SET_CODE (cond
, TRUTH_AND_EXPR
);
3791 else if (code
== TRUTH_ORIF_EXPR
)
3792 TREE_SET_CODE (cond
, TRUTH_OR_EXPR
);
3793 ret
= gimplify_expr (&cond
, pre_p
, NULL
, is_gimple_condexpr
, fb_rvalue
);
3794 COND_EXPR_COND (*expr_p
) = cond
;
3796 tret
= gimplify_expr (&COND_EXPR_THEN (expr
), pre_p
, NULL
,
3797 is_gimple_val
, fb_rvalue
);
3798 ret
= MIN (ret
, tret
);
3799 tret
= gimplify_expr (&COND_EXPR_ELSE (expr
), pre_p
, NULL
,
3800 is_gimple_val
, fb_rvalue
);
3802 return MIN (ret
, tret
);
3805 /* Return true if evaluating EXPR could trap.
3806 EXPR is GENERIC, while tree_could_trap_p can be called
3810 generic_expr_could_trap_p (tree expr
)
3814 if (!expr
|| is_gimple_val (expr
))
3817 if (!EXPR_P (expr
) || tree_could_trap_p (expr
))
3820 n
= TREE_OPERAND_LENGTH (expr
);
3821 for (i
= 0; i
< n
; i
++)
3822 if (generic_expr_could_trap_p (TREE_OPERAND (expr
, i
)))
3828 /* Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
3837 The second form is used when *EXPR_P is of type void.
3839 PRE_P points to the list where side effects that must happen before
3840 *EXPR_P should be stored. */
3842 static enum gimplify_status
3843 gimplify_cond_expr (tree
*expr_p
, gimple_seq
*pre_p
, fallback_t fallback
)
3845 tree expr
= *expr_p
;
3846 tree type
= TREE_TYPE (expr
);
3847 location_t loc
= EXPR_LOCATION (expr
);
3848 tree tmp
, arm1
, arm2
;
3849 enum gimplify_status ret
;
3850 tree label_true
, label_false
, label_cont
;
3851 bool have_then_clause_p
, have_else_clause_p
;
3853 enum tree_code pred_code
;
3854 gimple_seq seq
= NULL
;
3856 /* If this COND_EXPR has a value, copy the values into a temporary within
3858 if (!VOID_TYPE_P (type
))
3860 tree then_
= TREE_OPERAND (expr
, 1), else_
= TREE_OPERAND (expr
, 2);
3863 /* If either an rvalue is ok or we do not require an lvalue, create the
3864 temporary. But we cannot do that if the type is addressable. */
3865 if (((fallback
& fb_rvalue
) || !(fallback
& fb_lvalue
))
3866 && !TREE_ADDRESSABLE (type
))
3868 if (gimplify_ctxp
->allow_rhs_cond_expr
3869 /* If either branch has side effects or could trap, it can't be
3870 evaluated unconditionally. */
3871 && !TREE_SIDE_EFFECTS (then_
)
3872 && !generic_expr_could_trap_p (then_
)
3873 && !TREE_SIDE_EFFECTS (else_
)
3874 && !generic_expr_could_trap_p (else_
))
3875 return gimplify_pure_cond_expr (expr_p
, pre_p
);
3877 tmp
= create_tmp_var (type
, "iftmp");
3881 /* Otherwise, only create and copy references to the values. */
3884 type
= build_pointer_type (type
);
3886 if (!VOID_TYPE_P (TREE_TYPE (then_
)))
3887 then_
= build_fold_addr_expr_loc (loc
, then_
);
3889 if (!VOID_TYPE_P (TREE_TYPE (else_
)))
3890 else_
= build_fold_addr_expr_loc (loc
, else_
);
3893 = build3 (COND_EXPR
, type
, TREE_OPERAND (expr
, 0), then_
, else_
);
3895 tmp
= create_tmp_var (type
, "iftmp");
3896 result
= build_simple_mem_ref_loc (loc
, tmp
);
3899 /* Build the new then clause, `tmp = then_;'. But don't build the
3900 assignment if the value is void; in C++ it can be if it's a throw. */
3901 if (!VOID_TYPE_P (TREE_TYPE (then_
)))
3902 TREE_OPERAND (expr
, 1) = build2 (MODIFY_EXPR
, type
, tmp
, then_
);
3904 /* Similarly, build the new else clause, `tmp = else_;'. */
3905 if (!VOID_TYPE_P (TREE_TYPE (else_
)))
3906 TREE_OPERAND (expr
, 2) = build2 (MODIFY_EXPR
, type
, tmp
, else_
);
3908 TREE_TYPE (expr
) = void_type_node
;
3909 recalculate_side_effects (expr
);
3911 /* Move the COND_EXPR to the prequeue. */
3912 gimplify_stmt (&expr
, pre_p
);
3918 /* Remove any COMPOUND_EXPR so the following cases will be caught. */
3919 STRIP_TYPE_NOPS (TREE_OPERAND (expr
, 0));
3920 if (TREE_CODE (TREE_OPERAND (expr
, 0)) == COMPOUND_EXPR
)
3921 gimplify_compound_expr (&TREE_OPERAND (expr
, 0), pre_p
, true);
3923 /* Make sure the condition has BOOLEAN_TYPE. */
3924 TREE_OPERAND (expr
, 0) = gimple_boolify (TREE_OPERAND (expr
, 0));
3926 /* Break apart && and || conditions. */
3927 if (TREE_CODE (TREE_OPERAND (expr
, 0)) == TRUTH_ANDIF_EXPR
3928 || TREE_CODE (TREE_OPERAND (expr
, 0)) == TRUTH_ORIF_EXPR
)
3930 expr
= shortcut_cond_expr (expr
);
3932 if (expr
!= *expr_p
)
3936 /* We can't rely on gimplify_expr to re-gimplify the expanded
3937 form properly, as cleanups might cause the target labels to be
3938 wrapped in a TRY_FINALLY_EXPR. To prevent that, we need to
3939 set up a conditional context. */
3940 gimple_push_condition ();
3941 gimplify_stmt (expr_p
, &seq
);
3942 gimple_pop_condition (pre_p
);
3943 gimple_seq_add_seq (pre_p
, seq
);
3949 /* Now do the normal gimplification. */
3951 /* Gimplify condition. */
3952 ret
= gimplify_expr (&TREE_OPERAND (expr
, 0), pre_p
, NULL
, is_gimple_condexpr
,
3954 if (ret
== GS_ERROR
)
3956 gcc_assert (TREE_OPERAND (expr
, 0) != NULL_TREE
);
3958 gimple_push_condition ();
3960 have_then_clause_p
= have_else_clause_p
= false;
3961 if (TREE_OPERAND (expr
, 1) != NULL
3962 && TREE_CODE (TREE_OPERAND (expr
, 1)) == GOTO_EXPR
3963 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr
, 1))) == LABEL_DECL
3964 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr
, 1)))
3965 == current_function_decl
)
3966 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3967 have different locations, otherwise we end up with incorrect
3968 location information on the branches. */
3970 || !EXPR_HAS_LOCATION (expr
)
3971 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr
, 1))
3972 || EXPR_LOCATION (expr
) == EXPR_LOCATION (TREE_OPERAND (expr
, 1))))
3974 label_true
= GOTO_DESTINATION (TREE_OPERAND (expr
, 1));
3975 have_then_clause_p
= true;
3978 label_true
= create_artificial_label (UNKNOWN_LOCATION
);
3979 if (TREE_OPERAND (expr
, 2) != NULL
3980 && TREE_CODE (TREE_OPERAND (expr
, 2)) == GOTO_EXPR
3981 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr
, 2))) == LABEL_DECL
3982 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr
, 2)))
3983 == current_function_decl
)
3984 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3985 have different locations, otherwise we end up with incorrect
3986 location information on the branches. */
3988 || !EXPR_HAS_LOCATION (expr
)
3989 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr
, 2))
3990 || EXPR_LOCATION (expr
) == EXPR_LOCATION (TREE_OPERAND (expr
, 2))))
3992 label_false
= GOTO_DESTINATION (TREE_OPERAND (expr
, 2));
3993 have_else_clause_p
= true;
3996 label_false
= create_artificial_label (UNKNOWN_LOCATION
);
3998 gimple_cond_get_ops_from_tree (COND_EXPR_COND (expr
), &pred_code
, &arm1
,
4000 cond_stmt
= gimple_build_cond (pred_code
, arm1
, arm2
, label_true
,
4002 gimple_set_no_warning (cond_stmt
, TREE_NO_WARNING (COND_EXPR_COND (expr
)));
4003 gimplify_seq_add_stmt (&seq
, cond_stmt
);
4004 gimple_stmt_iterator gsi
= gsi_last (seq
);
4005 maybe_fold_stmt (&gsi
);
4007 label_cont
= NULL_TREE
;
4008 if (!have_then_clause_p
)
4010 /* For if (...) {} else { code; } put label_true after
4012 if (TREE_OPERAND (expr
, 1) == NULL_TREE
4013 && !have_else_clause_p
4014 && TREE_OPERAND (expr
, 2) != NULL_TREE
)
4015 label_cont
= label_true
;
4018 gimplify_seq_add_stmt (&seq
, gimple_build_label (label_true
));
4019 have_then_clause_p
= gimplify_stmt (&TREE_OPERAND (expr
, 1), &seq
);
4020 /* For if (...) { code; } else {} or
4021 if (...) { code; } else goto label; or
4022 if (...) { code; return; } else { ... }
4023 label_cont isn't needed. */
4024 if (!have_else_clause_p
4025 && TREE_OPERAND (expr
, 2) != NULL_TREE
4026 && gimple_seq_may_fallthru (seq
))
4029 label_cont
= create_artificial_label (UNKNOWN_LOCATION
);
4031 g
= gimple_build_goto (label_cont
);
4033 /* GIMPLE_COND's are very low level; they have embedded
4034 gotos. This particular embedded goto should not be marked
4035 with the location of the original COND_EXPR, as it would
4036 correspond to the COND_EXPR's condition, not the ELSE or the
4037 THEN arms. To avoid marking it with the wrong location, flag
4038 it as "no location". */
4039 gimple_set_do_not_emit_location (g
);
4041 gimplify_seq_add_stmt (&seq
, g
);
4045 if (!have_else_clause_p
)
4047 gimplify_seq_add_stmt (&seq
, gimple_build_label (label_false
));
4048 have_else_clause_p
= gimplify_stmt (&TREE_OPERAND (expr
, 2), &seq
);
4051 gimplify_seq_add_stmt (&seq
, gimple_build_label (label_cont
));
4053 gimple_pop_condition (pre_p
);
4054 gimple_seq_add_seq (pre_p
, seq
);
4056 if (ret
== GS_ERROR
)
4058 else if (have_then_clause_p
|| have_else_clause_p
)
4062 /* Both arms are empty; replace the COND_EXPR with its predicate. */
4063 expr
= TREE_OPERAND (expr
, 0);
4064 gimplify_stmt (&expr
, pre_p
);
4071 /* Prepare the node pointed to by EXPR_P, an is_gimple_addressable expression,
4072 to be marked addressable.
4074 We cannot rely on such an expression being directly markable if a temporary
4075 has been created by the gimplification. In this case, we create another
4076 temporary and initialize it with a copy, which will become a store after we
4077 mark it addressable. This can happen if the front-end passed us something
4078 that it could not mark addressable yet, like a Fortran pass-by-reference
4079 parameter (int) floatvar. */
4082 prepare_gimple_addressable (tree
*expr_p
, gimple_seq
*seq_p
)
4084 while (handled_component_p (*expr_p
))
4085 expr_p
= &TREE_OPERAND (*expr_p
, 0);
4086 if (is_gimple_reg (*expr_p
))
4088 /* Do not allow an SSA name as the temporary. */
4089 tree var
= get_initialized_tmp_var (*expr_p
, seq_p
, NULL
, false);
4090 DECL_GIMPLE_REG_P (var
) = 0;
4095 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
4096 a call to __builtin_memcpy. */
4098 static enum gimplify_status
4099 gimplify_modify_expr_to_memcpy (tree
*expr_p
, tree size
, bool want_value
,
4102 tree t
, to
, to_ptr
, from
, from_ptr
;
4104 location_t loc
= EXPR_LOCATION (*expr_p
);
4106 to
= TREE_OPERAND (*expr_p
, 0);
4107 from
= TREE_OPERAND (*expr_p
, 1);
4109 /* Mark the RHS addressable. Beware that it may not be possible to do so
4110 directly if a temporary has been created by the gimplification. */
4111 prepare_gimple_addressable (&from
, seq_p
);
4113 mark_addressable (from
);
4114 from_ptr
= build_fold_addr_expr_loc (loc
, from
);
4115 gimplify_arg (&from_ptr
, seq_p
, loc
);
4117 mark_addressable (to
);
4118 to_ptr
= build_fold_addr_expr_loc (loc
, to
);
4119 gimplify_arg (&to_ptr
, seq_p
, loc
);
4121 t
= builtin_decl_implicit (BUILT_IN_MEMCPY
);
4123 gs
= gimple_build_call (t
, 3, to_ptr
, from_ptr
, size
);
4127 /* tmp = memcpy() */
4128 t
= create_tmp_var (TREE_TYPE (to_ptr
));
4129 gimple_call_set_lhs (gs
, t
);
4130 gimplify_seq_add_stmt (seq_p
, gs
);
4132 *expr_p
= build_simple_mem_ref (t
);
4136 gimplify_seq_add_stmt (seq_p
, gs
);
4141 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
4142 a call to __builtin_memset. In this case we know that the RHS is
4143 a CONSTRUCTOR with an empty element list. */
4145 static enum gimplify_status
4146 gimplify_modify_expr_to_memset (tree
*expr_p
, tree size
, bool want_value
,
4149 tree t
, from
, to
, to_ptr
;
4151 location_t loc
= EXPR_LOCATION (*expr_p
);
4153 /* Assert our assumptions, to abort instead of producing wrong code
4154 silently if they are not met. Beware that the RHS CONSTRUCTOR might
4155 not be immediately exposed. */
4156 from
= TREE_OPERAND (*expr_p
, 1);
4157 if (TREE_CODE (from
) == WITH_SIZE_EXPR
)
4158 from
= TREE_OPERAND (from
, 0);
4160 gcc_assert (TREE_CODE (from
) == CONSTRUCTOR
4161 && vec_safe_is_empty (CONSTRUCTOR_ELTS (from
)));
4164 to
= TREE_OPERAND (*expr_p
, 0);
4166 to_ptr
= build_fold_addr_expr_loc (loc
, to
);
4167 gimplify_arg (&to_ptr
, seq_p
, loc
);
4168 t
= builtin_decl_implicit (BUILT_IN_MEMSET
);
4170 gs
= gimple_build_call (t
, 3, to_ptr
, integer_zero_node
, size
);
4174 /* tmp = memset() */
4175 t
= create_tmp_var (TREE_TYPE (to_ptr
));
4176 gimple_call_set_lhs (gs
, t
);
4177 gimplify_seq_add_stmt (seq_p
, gs
);
4179 *expr_p
= build1 (INDIRECT_REF
, TREE_TYPE (to
), t
);
4183 gimplify_seq_add_stmt (seq_p
, gs
);
4188 /* A subroutine of gimplify_init_ctor_preeval. Called via walk_tree,
4189 determine, cautiously, if a CONSTRUCTOR overlaps the lhs of an
4190 assignment. Return non-null if we detect a potential overlap. */
4192 struct gimplify_init_ctor_preeval_data
4194 /* The base decl of the lhs object. May be NULL, in which case we
4195 have to assume the lhs is indirect. */
4198 /* The alias set of the lhs object. */
4199 alias_set_type lhs_alias_set
;
4203 gimplify_init_ctor_preeval_1 (tree
*tp
, int *walk_subtrees
, void *xdata
)
4205 struct gimplify_init_ctor_preeval_data
*data
4206 = (struct gimplify_init_ctor_preeval_data
*) xdata
;
4209 /* If we find the base object, obviously we have overlap. */
4210 if (data
->lhs_base_decl
== t
)
4213 /* If the constructor component is indirect, determine if we have a
4214 potential overlap with the lhs. The only bits of information we
4215 have to go on at this point are addressability and alias sets. */
4216 if ((INDIRECT_REF_P (t
)
4217 || TREE_CODE (t
) == MEM_REF
)
4218 && (!data
->lhs_base_decl
|| TREE_ADDRESSABLE (data
->lhs_base_decl
))
4219 && alias_sets_conflict_p (data
->lhs_alias_set
, get_alias_set (t
)))
4222 /* If the constructor component is a call, determine if it can hide a
4223 potential overlap with the lhs through an INDIRECT_REF like above.
4224 ??? Ugh - this is completely broken. In fact this whole analysis
4225 doesn't look conservative. */
4226 if (TREE_CODE (t
) == CALL_EXPR
)
4228 tree type
, fntype
= TREE_TYPE (TREE_TYPE (CALL_EXPR_FN (t
)));
4230 for (type
= TYPE_ARG_TYPES (fntype
); type
; type
= TREE_CHAIN (type
))
4231 if (POINTER_TYPE_P (TREE_VALUE (type
))
4232 && (!data
->lhs_base_decl
|| TREE_ADDRESSABLE (data
->lhs_base_decl
))
4233 && alias_sets_conflict_p (data
->lhs_alias_set
,
4235 (TREE_TYPE (TREE_VALUE (type
)))))
4239 if (IS_TYPE_OR_DECL_P (t
))
4244 /* A subroutine of gimplify_init_constructor. Pre-evaluate EXPR,
4245 force values that overlap with the lhs (as described by *DATA)
4246 into temporaries. */
4249 gimplify_init_ctor_preeval (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
4250 struct gimplify_init_ctor_preeval_data
*data
)
4252 enum gimplify_status one
;
4254 /* If the value is constant, then there's nothing to pre-evaluate. */
4255 if (TREE_CONSTANT (*expr_p
))
4257 /* Ensure it does not have side effects, it might contain a reference to
4258 the object we're initializing. */
4259 gcc_assert (!TREE_SIDE_EFFECTS (*expr_p
));
4263 /* If the type has non-trivial constructors, we can't pre-evaluate. */
4264 if (TREE_ADDRESSABLE (TREE_TYPE (*expr_p
)))
4267 /* Recurse for nested constructors. */
4268 if (TREE_CODE (*expr_p
) == CONSTRUCTOR
)
4270 unsigned HOST_WIDE_INT ix
;
4271 constructor_elt
*ce
;
4272 vec
<constructor_elt
, va_gc
> *v
= CONSTRUCTOR_ELTS (*expr_p
);
4274 FOR_EACH_VEC_SAFE_ELT (v
, ix
, ce
)
4275 gimplify_init_ctor_preeval (&ce
->value
, pre_p
, post_p
, data
);
4280 /* If this is a variable sized type, we must remember the size. */
4281 maybe_with_size_expr (expr_p
);
4283 /* Gimplify the constructor element to something appropriate for the rhs
4284 of a MODIFY_EXPR. Given that we know the LHS is an aggregate, we know
4285 the gimplifier will consider this a store to memory. Doing this
4286 gimplification now means that we won't have to deal with complicated
4287 language-specific trees, nor trees like SAVE_EXPR that can induce
4288 exponential search behavior. */
4289 one
= gimplify_expr (expr_p
, pre_p
, post_p
, is_gimple_mem_rhs
, fb_rvalue
);
4290 if (one
== GS_ERROR
)
4296 /* If we gimplified to a bare decl, we can be sure that it doesn't overlap
4297 with the lhs, since "a = { .x=a }" doesn't make sense. This will
4298 always be true for all scalars, since is_gimple_mem_rhs insists on a
4299 temporary variable for them. */
4300 if (DECL_P (*expr_p
))
4303 /* If this is of variable size, we have no choice but to assume it doesn't
4304 overlap since we can't make a temporary for it. */
4305 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (*expr_p
))) != INTEGER_CST
)
4308 /* Otherwise, we must search for overlap ... */
4309 if (!walk_tree (expr_p
, gimplify_init_ctor_preeval_1
, data
, NULL
))
4312 /* ... and if found, force the value into a temporary. */
4313 *expr_p
= get_formal_tmp_var (*expr_p
, pre_p
);
4316 /* A subroutine of gimplify_init_ctor_eval. Create a loop for
4317 a RANGE_EXPR in a CONSTRUCTOR for an array.
4321 object[var] = value;
4328 We increment var _after_ the loop exit check because we might otherwise
4329 fail if upper == TYPE_MAX_VALUE (type for upper).
4331 Note that we never have to deal with SAVE_EXPRs here, because this has
4332 already been taken care of for us, in gimplify_init_ctor_preeval(). */
4334 static void gimplify_init_ctor_eval (tree
, vec
<constructor_elt
, va_gc
> *,
4335 gimple_seq
*, bool);
4338 gimplify_init_ctor_eval_range (tree object
, tree lower
, tree upper
,
4339 tree value
, tree array_elt_type
,
4340 gimple_seq
*pre_p
, bool cleared
)
4342 tree loop_entry_label
, loop_exit_label
, fall_thru_label
;
4343 tree var
, var_type
, cref
, tmp
;
4345 loop_entry_label
= create_artificial_label (UNKNOWN_LOCATION
);
4346 loop_exit_label
= create_artificial_label (UNKNOWN_LOCATION
);
4347 fall_thru_label
= create_artificial_label (UNKNOWN_LOCATION
);
4349 /* Create and initialize the index variable. */
4350 var_type
= TREE_TYPE (upper
);
4351 var
= create_tmp_var (var_type
);
4352 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (var
, lower
));
4354 /* Add the loop entry label. */
4355 gimplify_seq_add_stmt (pre_p
, gimple_build_label (loop_entry_label
));
4357 /* Build the reference. */
4358 cref
= build4 (ARRAY_REF
, array_elt_type
, unshare_expr (object
),
4359 var
, NULL_TREE
, NULL_TREE
);
4361 /* If we are a constructor, just call gimplify_init_ctor_eval to do
4362 the store. Otherwise just assign value to the reference. */
4364 if (TREE_CODE (value
) == CONSTRUCTOR
)
4365 /* NB we might have to call ourself recursively through
4366 gimplify_init_ctor_eval if the value is a constructor. */
4367 gimplify_init_ctor_eval (cref
, CONSTRUCTOR_ELTS (value
),
4370 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (cref
, value
));
4372 /* We exit the loop when the index var is equal to the upper bound. */
4373 gimplify_seq_add_stmt (pre_p
,
4374 gimple_build_cond (EQ_EXPR
, var
, upper
,
4375 loop_exit_label
, fall_thru_label
));
4377 gimplify_seq_add_stmt (pre_p
, gimple_build_label (fall_thru_label
));
4379 /* Otherwise, increment the index var... */
4380 tmp
= build2 (PLUS_EXPR
, var_type
, var
,
4381 fold_convert (var_type
, integer_one_node
));
4382 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (var
, tmp
));
4384 /* ...and jump back to the loop entry. */
4385 gimplify_seq_add_stmt (pre_p
, gimple_build_goto (loop_entry_label
));
4387 /* Add the loop exit label. */
4388 gimplify_seq_add_stmt (pre_p
, gimple_build_label (loop_exit_label
));
4391 /* Return true if FDECL is accessing a field that is zero sized. */
4394 zero_sized_field_decl (const_tree fdecl
)
4396 if (TREE_CODE (fdecl
) == FIELD_DECL
&& DECL_SIZE (fdecl
)
4397 && integer_zerop (DECL_SIZE (fdecl
)))
4402 /* Return true if TYPE is zero sized. */
4405 zero_sized_type (const_tree type
)
4407 if (AGGREGATE_TYPE_P (type
) && TYPE_SIZE (type
)
4408 && integer_zerop (TYPE_SIZE (type
)))
4413 /* A subroutine of gimplify_init_constructor. Generate individual
4414 MODIFY_EXPRs for a CONSTRUCTOR. OBJECT is the LHS against which the
4415 assignments should happen. ELTS is the CONSTRUCTOR_ELTS of the
4416 CONSTRUCTOR. CLEARED is true if the entire LHS object has been
4420 gimplify_init_ctor_eval (tree object
, vec
<constructor_elt
, va_gc
> *elts
,
4421 gimple_seq
*pre_p
, bool cleared
)
4423 tree array_elt_type
= NULL
;
4424 unsigned HOST_WIDE_INT ix
;
4425 tree purpose
, value
;
4427 if (TREE_CODE (TREE_TYPE (object
)) == ARRAY_TYPE
)
4428 array_elt_type
= TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (object
)));
4430 FOR_EACH_CONSTRUCTOR_ELT (elts
, ix
, purpose
, value
)
4434 /* NULL values are created above for gimplification errors. */
4438 if (cleared
&& initializer_zerop (value
))
4441 /* ??? Here's to hoping the front end fills in all of the indices,
4442 so we don't have to figure out what's missing ourselves. */
4443 gcc_assert (purpose
);
4445 /* Skip zero-sized fields, unless value has side-effects. This can
4446 happen with calls to functions returning a zero-sized type, which
4447 we shouldn't discard. As a number of downstream passes don't
4448 expect sets of zero-sized fields, we rely on the gimplification of
4449 the MODIFY_EXPR we make below to drop the assignment statement. */
4450 if (! TREE_SIDE_EFFECTS (value
) && zero_sized_field_decl (purpose
))
4453 /* If we have a RANGE_EXPR, we have to build a loop to assign the
4455 if (TREE_CODE (purpose
) == RANGE_EXPR
)
4457 tree lower
= TREE_OPERAND (purpose
, 0);
4458 tree upper
= TREE_OPERAND (purpose
, 1);
4460 /* If the lower bound is equal to upper, just treat it as if
4461 upper was the index. */
4462 if (simple_cst_equal (lower
, upper
))
4466 gimplify_init_ctor_eval_range (object
, lower
, upper
, value
,
4467 array_elt_type
, pre_p
, cleared
);
4474 /* Do not use bitsizetype for ARRAY_REF indices. */
4475 if (TYPE_DOMAIN (TREE_TYPE (object
)))
4477 = fold_convert (TREE_TYPE (TYPE_DOMAIN (TREE_TYPE (object
))),
4479 cref
= build4 (ARRAY_REF
, array_elt_type
, unshare_expr (object
),
4480 purpose
, NULL_TREE
, NULL_TREE
);
4484 gcc_assert (TREE_CODE (purpose
) == FIELD_DECL
);
4485 cref
= build3 (COMPONENT_REF
, TREE_TYPE (purpose
),
4486 unshare_expr (object
), purpose
, NULL_TREE
);
4489 if (TREE_CODE (value
) == CONSTRUCTOR
4490 && TREE_CODE (TREE_TYPE (value
)) != VECTOR_TYPE
)
4491 gimplify_init_ctor_eval (cref
, CONSTRUCTOR_ELTS (value
),
4495 tree init
= build2 (INIT_EXPR
, TREE_TYPE (cref
), cref
, value
);
4496 gimplify_and_add (init
, pre_p
);
4502 /* Return the appropriate RHS predicate for this LHS. */
4505 rhs_predicate_for (tree lhs
)
4507 if (is_gimple_reg (lhs
))
4508 return is_gimple_reg_rhs_or_call
;
4510 return is_gimple_mem_rhs_or_call
;
4513 /* Return the initial guess for an appropriate RHS predicate for this LHS,
4514 before the LHS has been gimplified. */
4516 static gimple_predicate
4517 initial_rhs_predicate_for (tree lhs
)
4519 if (is_gimple_reg_type (TREE_TYPE (lhs
)))
4520 return is_gimple_reg_rhs_or_call
;
4522 return is_gimple_mem_rhs_or_call
;
4525 /* Gimplify a C99 compound literal expression. This just means adding
4526 the DECL_EXPR before the current statement and using its anonymous
4529 static enum gimplify_status
4530 gimplify_compound_literal_expr (tree
*expr_p
, gimple_seq
*pre_p
,
4531 bool (*gimple_test_f
) (tree
),
4532 fallback_t fallback
)
4534 tree decl_s
= COMPOUND_LITERAL_EXPR_DECL_EXPR (*expr_p
);
4535 tree decl
= DECL_EXPR_DECL (decl_s
);
4536 tree init
= DECL_INITIAL (decl
);
4537 /* Mark the decl as addressable if the compound literal
4538 expression is addressable now, otherwise it is marked too late
4539 after we gimplify the initialization expression. */
4540 if (TREE_ADDRESSABLE (*expr_p
))
4541 TREE_ADDRESSABLE (decl
) = 1;
4542 /* Otherwise, if we don't need an lvalue and have a literal directly
4543 substitute it. Check if it matches the gimple predicate, as
4544 otherwise we'd generate a new temporary, and we can as well just
4545 use the decl we already have. */
4546 else if (!TREE_ADDRESSABLE (decl
)
4548 && (fallback
& fb_lvalue
) == 0
4549 && gimple_test_f (init
))
4555 /* Preliminarily mark non-addressed complex variables as eligible
4556 for promotion to gimple registers. We'll transform their uses
4558 if ((TREE_CODE (TREE_TYPE (decl
)) == COMPLEX_TYPE
4559 || TREE_CODE (TREE_TYPE (decl
)) == VECTOR_TYPE
)
4560 && !TREE_THIS_VOLATILE (decl
)
4561 && !needs_to_live_in_memory (decl
))
4562 DECL_GIMPLE_REG_P (decl
) = 1;
4564 /* If the decl is not addressable, then it is being used in some
4565 expression or on the right hand side of a statement, and it can
4566 be put into a readonly data section. */
4567 if (!TREE_ADDRESSABLE (decl
) && (fallback
& fb_lvalue
) == 0)
4568 TREE_READONLY (decl
) = 1;
4570 /* This decl isn't mentioned in the enclosing block, so add it to the
4571 list of temps. FIXME it seems a bit of a kludge to say that
4572 anonymous artificial vars aren't pushed, but everything else is. */
4573 if (DECL_NAME (decl
) == NULL_TREE
&& !DECL_SEEN_IN_BIND_EXPR_P (decl
))
4574 gimple_add_tmp_var (decl
);
4576 gimplify_and_add (decl_s
, pre_p
);
4581 /* Optimize embedded COMPOUND_LITERAL_EXPRs within a CONSTRUCTOR,
4582 return a new CONSTRUCTOR if something changed. */
4585 optimize_compound_literals_in_ctor (tree orig_ctor
)
4587 tree ctor
= orig_ctor
;
4588 vec
<constructor_elt
, va_gc
> *elts
= CONSTRUCTOR_ELTS (ctor
);
4589 unsigned int idx
, num
= vec_safe_length (elts
);
4591 for (idx
= 0; idx
< num
; idx
++)
4593 tree value
= (*elts
)[idx
].value
;
4594 tree newval
= value
;
4595 if (TREE_CODE (value
) == CONSTRUCTOR
)
4596 newval
= optimize_compound_literals_in_ctor (value
);
4597 else if (TREE_CODE (value
) == COMPOUND_LITERAL_EXPR
)
4599 tree decl_s
= COMPOUND_LITERAL_EXPR_DECL_EXPR (value
);
4600 tree decl
= DECL_EXPR_DECL (decl_s
);
4601 tree init
= DECL_INITIAL (decl
);
4603 if (!TREE_ADDRESSABLE (value
)
4604 && !TREE_ADDRESSABLE (decl
)
4606 && TREE_CODE (init
) == CONSTRUCTOR
)
4607 newval
= optimize_compound_literals_in_ctor (init
);
4609 if (newval
== value
)
4612 if (ctor
== orig_ctor
)
4614 ctor
= copy_node (orig_ctor
);
4615 CONSTRUCTOR_ELTS (ctor
) = vec_safe_copy (elts
);
4616 elts
= CONSTRUCTOR_ELTS (ctor
);
4618 (*elts
)[idx
].value
= newval
;
4623 /* A subroutine of gimplify_modify_expr. Break out elements of a
4624 CONSTRUCTOR used as an initializer into separate MODIFY_EXPRs.
4626 Note that we still need to clear any elements that don't have explicit
4627 initializers, so if not all elements are initialized we keep the
4628 original MODIFY_EXPR, we just remove all of the constructor elements.
4630 If NOTIFY_TEMP_CREATION is true, do not gimplify, just return
4631 GS_ERROR if we would have to create a temporary when gimplifying
4632 this constructor. Otherwise, return GS_OK.
4634 If NOTIFY_TEMP_CREATION is false, just do the gimplification. */
4636 static enum gimplify_status
4637 gimplify_init_constructor (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
4638 bool want_value
, bool notify_temp_creation
)
4640 tree object
, ctor
, type
;
4641 enum gimplify_status ret
;
4642 vec
<constructor_elt
, va_gc
> *elts
;
4644 gcc_assert (TREE_CODE (TREE_OPERAND (*expr_p
, 1)) == CONSTRUCTOR
);
4646 if (!notify_temp_creation
)
4648 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
4649 is_gimple_lvalue
, fb_lvalue
);
4650 if (ret
== GS_ERROR
)
4654 object
= TREE_OPERAND (*expr_p
, 0);
4655 ctor
= TREE_OPERAND (*expr_p
, 1)
4656 = optimize_compound_literals_in_ctor (TREE_OPERAND (*expr_p
, 1));
4657 type
= TREE_TYPE (ctor
);
4658 elts
= CONSTRUCTOR_ELTS (ctor
);
4661 switch (TREE_CODE (type
))
4665 case QUAL_UNION_TYPE
:
4668 struct gimplify_init_ctor_preeval_data preeval_data
;
4669 HOST_WIDE_INT num_ctor_elements
, num_nonzero_elements
;
4670 bool cleared
, complete_p
, valid_const_initializer
;
4672 /* Aggregate types must lower constructors to initialization of
4673 individual elements. The exception is that a CONSTRUCTOR node
4674 with no elements indicates zero-initialization of the whole. */
4675 if (vec_safe_is_empty (elts
))
4677 if (notify_temp_creation
)
4682 /* Fetch information about the constructor to direct later processing.
4683 We might want to make static versions of it in various cases, and
4684 can only do so if it known to be a valid constant initializer. */
4685 valid_const_initializer
4686 = categorize_ctor_elements (ctor
, &num_nonzero_elements
,
4687 &num_ctor_elements
, &complete_p
);
4689 /* If a const aggregate variable is being initialized, then it
4690 should never be a lose to promote the variable to be static. */
4691 if (valid_const_initializer
4692 && num_nonzero_elements
> 1
4693 && TREE_READONLY (object
)
4695 && (flag_merge_constants
>= 2 || !TREE_ADDRESSABLE (object
)))
4697 if (notify_temp_creation
)
4699 DECL_INITIAL (object
) = ctor
;
4700 TREE_STATIC (object
) = 1;
4701 if (!DECL_NAME (object
))
4702 DECL_NAME (object
) = create_tmp_var_name ("C");
4703 walk_tree (&DECL_INITIAL (object
), force_labels_r
, NULL
, NULL
);
4705 /* ??? C++ doesn't automatically append a .<number> to the
4706 assembler name, and even when it does, it looks at FE private
4707 data structures to figure out what that number should be,
4708 which are not set for this variable. I suppose this is
4709 important for local statics for inline functions, which aren't
4710 "local" in the object file sense. So in order to get a unique
4711 TU-local symbol, we must invoke the lhd version now. */
4712 lhd_set_decl_assembler_name (object
);
4714 *expr_p
= NULL_TREE
;
4718 /* If there are "lots" of initialized elements, even discounting
4719 those that are not address constants (and thus *must* be
4720 computed at runtime), then partition the constructor into
4721 constant and non-constant parts. Block copy the constant
4722 parts in, then generate code for the non-constant parts. */
4723 /* TODO. There's code in cp/typeck.c to do this. */
4725 if (int_size_in_bytes (TREE_TYPE (ctor
)) < 0)
4726 /* store_constructor will ignore the clearing of variable-sized
4727 objects. Initializers for such objects must explicitly set
4728 every field that needs to be set. */
4730 else if (!complete_p
&& !CONSTRUCTOR_NO_CLEARING (ctor
))
4731 /* If the constructor isn't complete, clear the whole object
4732 beforehand, unless CONSTRUCTOR_NO_CLEARING is set on it.
4734 ??? This ought not to be needed. For any element not present
4735 in the initializer, we should simply set them to zero. Except
4736 we'd need to *find* the elements that are not present, and that
4737 requires trickery to avoid quadratic compile-time behavior in
4738 large cases or excessive memory use in small cases. */
4740 else if (num_ctor_elements
- num_nonzero_elements
4741 > CLEAR_RATIO (optimize_function_for_speed_p (cfun
))
4742 && num_nonzero_elements
< num_ctor_elements
/ 4)
4743 /* If there are "lots" of zeros, it's more efficient to clear
4744 the memory and then set the nonzero elements. */
4749 /* If there are "lots" of initialized elements, and all of them
4750 are valid address constants, then the entire initializer can
4751 be dropped to memory, and then memcpy'd out. Don't do this
4752 for sparse arrays, though, as it's more efficient to follow
4753 the standard CONSTRUCTOR behavior of memset followed by
4754 individual element initialization. Also don't do this for small
4755 all-zero initializers (which aren't big enough to merit
4756 clearing), and don't try to make bitwise copies of
4757 TREE_ADDRESSABLE types.
4759 We cannot apply such transformation when compiling chkp static
4760 initializer because creation of initializer image in the memory
4761 will require static initialization of bounds for it. It should
4762 result in another gimplification of similar initializer and we
4763 may fall into infinite loop. */
4764 if (valid_const_initializer
4765 && !(cleared
|| num_nonzero_elements
== 0)
4766 && !TREE_ADDRESSABLE (type
)
4767 && (!current_function_decl
4768 || !lookup_attribute ("chkp ctor",
4769 DECL_ATTRIBUTES (current_function_decl
))))
4771 HOST_WIDE_INT size
= int_size_in_bytes (type
);
4774 /* ??? We can still get unbounded array types, at least
4775 from the C++ front end. This seems wrong, but attempt
4776 to work around it for now. */
4779 size
= int_size_in_bytes (TREE_TYPE (object
));
4781 TREE_TYPE (ctor
) = type
= TREE_TYPE (object
);
4784 /* Find the maximum alignment we can assume for the object. */
4785 /* ??? Make use of DECL_OFFSET_ALIGN. */
4786 if (DECL_P (object
))
4787 align
= DECL_ALIGN (object
);
4789 align
= TYPE_ALIGN (type
);
4791 /* Do a block move either if the size is so small as to make
4792 each individual move a sub-unit move on average, or if it
4793 is so large as to make individual moves inefficient. */
4795 && num_nonzero_elements
> 1
4796 && (size
< num_nonzero_elements
4797 || !can_move_by_pieces (size
, align
)))
4799 if (notify_temp_creation
)
4802 walk_tree (&ctor
, force_labels_r
, NULL
, NULL
);
4803 ctor
= tree_output_constant_def (ctor
);
4804 if (!useless_type_conversion_p (type
, TREE_TYPE (ctor
)))
4805 ctor
= build1 (VIEW_CONVERT_EXPR
, type
, ctor
);
4806 TREE_OPERAND (*expr_p
, 1) = ctor
;
4808 /* This is no longer an assignment of a CONSTRUCTOR, but
4809 we still may have processing to do on the LHS. So
4810 pretend we didn't do anything here to let that happen. */
4811 return GS_UNHANDLED
;
4815 /* If the target is volatile, we have non-zero elements and more than
4816 one field to assign, initialize the target from a temporary. */
4817 if (TREE_THIS_VOLATILE (object
)
4818 && !TREE_ADDRESSABLE (type
)
4819 && num_nonzero_elements
> 0
4820 && vec_safe_length (elts
) > 1)
4822 tree temp
= create_tmp_var (TYPE_MAIN_VARIANT (type
));
4823 TREE_OPERAND (*expr_p
, 0) = temp
;
4824 *expr_p
= build2 (COMPOUND_EXPR
, TREE_TYPE (*expr_p
),
4826 build2 (MODIFY_EXPR
, void_type_node
,
4831 if (notify_temp_creation
)
4834 /* If there are nonzero elements and if needed, pre-evaluate to capture
4835 elements overlapping with the lhs into temporaries. We must do this
4836 before clearing to fetch the values before they are zeroed-out. */
4837 if (num_nonzero_elements
> 0 && TREE_CODE (*expr_p
) != INIT_EXPR
)
4839 preeval_data
.lhs_base_decl
= get_base_address (object
);
4840 if (!DECL_P (preeval_data
.lhs_base_decl
))
4841 preeval_data
.lhs_base_decl
= NULL
;
4842 preeval_data
.lhs_alias_set
= get_alias_set (object
);
4844 gimplify_init_ctor_preeval (&TREE_OPERAND (*expr_p
, 1),
4845 pre_p
, post_p
, &preeval_data
);
4848 bool ctor_has_side_effects_p
4849 = TREE_SIDE_EFFECTS (TREE_OPERAND (*expr_p
, 1));
4853 /* Zap the CONSTRUCTOR element list, which simplifies this case.
4854 Note that we still have to gimplify, in order to handle the
4855 case of variable sized types. Avoid shared tree structures. */
4856 CONSTRUCTOR_ELTS (ctor
) = NULL
;
4857 TREE_SIDE_EFFECTS (ctor
) = 0;
4858 object
= unshare_expr (object
);
4859 gimplify_stmt (expr_p
, pre_p
);
4862 /* If we have not block cleared the object, or if there are nonzero
4863 elements in the constructor, or if the constructor has side effects,
4864 add assignments to the individual scalar fields of the object. */
4866 || num_nonzero_elements
> 0
4867 || ctor_has_side_effects_p
)
4868 gimplify_init_ctor_eval (object
, elts
, pre_p
, cleared
);
4870 *expr_p
= NULL_TREE
;
4878 if (notify_temp_creation
)
4881 /* Extract the real and imaginary parts out of the ctor. */
4882 gcc_assert (elts
->length () == 2);
4883 r
= (*elts
)[0].value
;
4884 i
= (*elts
)[1].value
;
4885 if (r
== NULL
|| i
== NULL
)
4887 tree zero
= build_zero_cst (TREE_TYPE (type
));
4894 /* Complex types have either COMPLEX_CST or COMPLEX_EXPR to
4895 represent creation of a complex value. */
4896 if (TREE_CONSTANT (r
) && TREE_CONSTANT (i
))
4898 ctor
= build_complex (type
, r
, i
);
4899 TREE_OPERAND (*expr_p
, 1) = ctor
;
4903 ctor
= build2 (COMPLEX_EXPR
, type
, r
, i
);
4904 TREE_OPERAND (*expr_p
, 1) = ctor
;
4905 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1),
4908 rhs_predicate_for (TREE_OPERAND (*expr_p
, 0)),
4916 unsigned HOST_WIDE_INT ix
;
4917 constructor_elt
*ce
;
4919 if (notify_temp_creation
)
4922 /* Go ahead and simplify constant constructors to VECTOR_CST. */
4923 if (TREE_CONSTANT (ctor
))
4925 bool constant_p
= true;
4928 /* Even when ctor is constant, it might contain non-*_CST
4929 elements, such as addresses or trapping values like
4930 1.0/0.0 - 1.0/0.0. Such expressions don't belong
4931 in VECTOR_CST nodes. */
4932 FOR_EACH_CONSTRUCTOR_VALUE (elts
, ix
, value
)
4933 if (!CONSTANT_CLASS_P (value
))
4941 TREE_OPERAND (*expr_p
, 1) = build_vector_from_ctor (type
, elts
);
4945 TREE_CONSTANT (ctor
) = 0;
4948 /* Vector types use CONSTRUCTOR all the way through gimple
4949 compilation as a general initializer. */
4950 FOR_EACH_VEC_SAFE_ELT (elts
, ix
, ce
)
4952 enum gimplify_status tret
;
4953 tret
= gimplify_expr (&ce
->value
, pre_p
, post_p
, is_gimple_val
,
4955 if (tret
== GS_ERROR
)
4957 else if (TREE_STATIC (ctor
)
4958 && !initializer_constant_valid_p (ce
->value
,
4959 TREE_TYPE (ce
->value
)))
4960 TREE_STATIC (ctor
) = 0;
4962 if (!is_gimple_reg (TREE_OPERAND (*expr_p
, 0)))
4963 TREE_OPERAND (*expr_p
, 1) = get_formal_tmp_var (ctor
, pre_p
);
4968 /* So how did we get a CONSTRUCTOR for a scalar type? */
4972 if (ret
== GS_ERROR
)
4974 /* If we have gimplified both sides of the initializer but have
4975 not emitted an assignment, do so now. */
4978 tree lhs
= TREE_OPERAND (*expr_p
, 0);
4979 tree rhs
= TREE_OPERAND (*expr_p
, 1);
4980 if (want_value
&& object
== lhs
)
4981 lhs
= unshare_expr (lhs
);
4982 gassign
*init
= gimple_build_assign (lhs
, rhs
);
4983 gimplify_seq_add_stmt (pre_p
, init
);
4997 /* Given a pointer value OP0, return a simplified version of an
4998 indirection through OP0, or NULL_TREE if no simplification is
4999 possible. This may only be applied to a rhs of an expression.
5000 Note that the resulting type may be different from the type pointed
5001 to in the sense that it is still compatible from the langhooks
5005 gimple_fold_indirect_ref_rhs (tree t
)
5007 return gimple_fold_indirect_ref (t
);
5010 /* Subroutine of gimplify_modify_expr to do simplifications of
5011 MODIFY_EXPRs based on the code of the RHS. We loop for as long as
5012 something changes. */
5014 static enum gimplify_status
5015 gimplify_modify_expr_rhs (tree
*expr_p
, tree
*from_p
, tree
*to_p
,
5016 gimple_seq
*pre_p
, gimple_seq
*post_p
,
5019 enum gimplify_status ret
= GS_UNHANDLED
;
5025 switch (TREE_CODE (*from_p
))
5028 /* If we're assigning from a read-only variable initialized with
5029 a constructor, do the direct assignment from the constructor,
5030 but only if neither source nor target are volatile since this
5031 latter assignment might end up being done on a per-field basis. */
5032 if (DECL_INITIAL (*from_p
)
5033 && TREE_READONLY (*from_p
)
5034 && !TREE_THIS_VOLATILE (*from_p
)
5035 && !TREE_THIS_VOLATILE (*to_p
)
5036 && TREE_CODE (DECL_INITIAL (*from_p
)) == CONSTRUCTOR
)
5038 tree old_from
= *from_p
;
5039 enum gimplify_status subret
;
5041 /* Move the constructor into the RHS. */
5042 *from_p
= unshare_expr (DECL_INITIAL (*from_p
));
5044 /* Let's see if gimplify_init_constructor will need to put
5046 subret
= gimplify_init_constructor (expr_p
, NULL
, NULL
,
5048 if (subret
== GS_ERROR
)
5050 /* If so, revert the change. */
5062 /* If we have code like
5066 where the type of "x" is a (possibly cv-qualified variant
5067 of "A"), treat the entire expression as identical to "x".
5068 This kind of code arises in C++ when an object is bound
5069 to a const reference, and if "x" is a TARGET_EXPR we want
5070 to take advantage of the optimization below. */
5071 bool volatile_p
= TREE_THIS_VOLATILE (*from_p
);
5072 tree t
= gimple_fold_indirect_ref_rhs (TREE_OPERAND (*from_p
, 0));
5075 if (TREE_THIS_VOLATILE (t
) != volatile_p
)
5078 t
= build_simple_mem_ref_loc (EXPR_LOCATION (*from_p
),
5079 build_fold_addr_expr (t
));
5080 if (REFERENCE_CLASS_P (t
))
5081 TREE_THIS_VOLATILE (t
) = volatile_p
;
5092 /* If we are initializing something from a TARGET_EXPR, strip the
5093 TARGET_EXPR and initialize it directly, if possible. This can't
5094 be done if the initializer is void, since that implies that the
5095 temporary is set in some non-trivial way.
5097 ??? What about code that pulls out the temp and uses it
5098 elsewhere? I think that such code never uses the TARGET_EXPR as
5099 an initializer. If I'm wrong, we'll die because the temp won't
5100 have any RTL. In that case, I guess we'll need to replace
5101 references somehow. */
5102 tree init
= TARGET_EXPR_INITIAL (*from_p
);
5105 && !VOID_TYPE_P (TREE_TYPE (init
)))
5115 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
5117 gimplify_compound_expr (from_p
, pre_p
, true);
5123 /* If we already made some changes, let the front end have a
5124 crack at this before we break it down. */
5125 if (ret
!= GS_UNHANDLED
)
5127 /* If we're initializing from a CONSTRUCTOR, break this into
5128 individual MODIFY_EXPRs. */
5129 return gimplify_init_constructor (expr_p
, pre_p
, post_p
, want_value
,
5133 /* If we're assigning to a non-register type, push the assignment
5134 down into the branches. This is mandatory for ADDRESSABLE types,
5135 since we cannot generate temporaries for such, but it saves a
5136 copy in other cases as well. */
5137 if (!is_gimple_reg_type (TREE_TYPE (*from_p
)))
5139 /* This code should mirror the code in gimplify_cond_expr. */
5140 enum tree_code code
= TREE_CODE (*expr_p
);
5141 tree cond
= *from_p
;
5142 tree result
= *to_p
;
5144 ret
= gimplify_expr (&result
, pre_p
, post_p
,
5145 is_gimple_lvalue
, fb_lvalue
);
5146 if (ret
!= GS_ERROR
)
5149 /* If we are going to write RESULT more than once, clear
5150 TREE_READONLY flag, otherwise we might incorrectly promote
5151 the variable to static const and initialize it at compile
5152 time in one of the branches. */
5154 && TREE_TYPE (TREE_OPERAND (cond
, 1)) != void_type_node
5155 && TREE_TYPE (TREE_OPERAND (cond
, 2)) != void_type_node
)
5156 TREE_READONLY (result
) = 0;
5157 if (TREE_TYPE (TREE_OPERAND (cond
, 1)) != void_type_node
)
5158 TREE_OPERAND (cond
, 1)
5159 = build2 (code
, void_type_node
, result
,
5160 TREE_OPERAND (cond
, 1));
5161 if (TREE_TYPE (TREE_OPERAND (cond
, 2)) != void_type_node
)
5162 TREE_OPERAND (cond
, 2)
5163 = build2 (code
, void_type_node
, unshare_expr (result
),
5164 TREE_OPERAND (cond
, 2));
5166 TREE_TYPE (cond
) = void_type_node
;
5167 recalculate_side_effects (cond
);
5171 gimplify_and_add (cond
, pre_p
);
5172 *expr_p
= unshare_expr (result
);
5181 /* For calls that return in memory, give *to_p as the CALL_EXPR's
5182 return slot so that we don't generate a temporary. */
5183 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p
)
5184 && aggregate_value_p (*from_p
, *from_p
))
5188 if (!(rhs_predicate_for (*to_p
))(*from_p
))
5189 /* If we need a temporary, *to_p isn't accurate. */
5191 /* It's OK to use the return slot directly unless it's an NRV. */
5192 else if (TREE_CODE (*to_p
) == RESULT_DECL
5193 && DECL_NAME (*to_p
) == NULL_TREE
5194 && needs_to_live_in_memory (*to_p
))
5196 else if (is_gimple_reg_type (TREE_TYPE (*to_p
))
5197 || (DECL_P (*to_p
) && DECL_REGISTER (*to_p
)))
5198 /* Don't force regs into memory. */
5200 else if (TREE_CODE (*expr_p
) == INIT_EXPR
)
5201 /* It's OK to use the target directly if it's being
5204 else if (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (*to_p
)))
5206 /* Always use the target and thus RSO for variable-sized types.
5207 GIMPLE cannot deal with a variable-sized assignment
5208 embedded in a call statement. */
5210 else if (TREE_CODE (*to_p
) != SSA_NAME
5211 && (!is_gimple_variable (*to_p
)
5212 || needs_to_live_in_memory (*to_p
)))
5213 /* Don't use the original target if it's already addressable;
5214 if its address escapes, and the called function uses the
5215 NRV optimization, a conforming program could see *to_p
5216 change before the called function returns; see c++/19317.
5217 When optimizing, the return_slot pass marks more functions
5218 as safe after we have escape info. */
5225 CALL_EXPR_RETURN_SLOT_OPT (*from_p
) = 1;
5226 mark_addressable (*to_p
);
5231 case WITH_SIZE_EXPR
:
5232 /* Likewise for calls that return an aggregate of non-constant size,
5233 since we would not be able to generate a temporary at all. */
5234 if (TREE_CODE (TREE_OPERAND (*from_p
, 0)) == CALL_EXPR
)
5236 *from_p
= TREE_OPERAND (*from_p
, 0);
5237 /* We don't change ret in this case because the
5238 WITH_SIZE_EXPR might have been added in
5239 gimplify_modify_expr, so returning GS_OK would lead to an
5245 /* If we're initializing from a container, push the initialization
5247 case CLEANUP_POINT_EXPR
:
5249 case STATEMENT_LIST
:
5251 tree wrap
= *from_p
;
5254 ret
= gimplify_expr (to_p
, pre_p
, post_p
, is_gimple_min_lval
,
5256 if (ret
!= GS_ERROR
)
5259 t
= voidify_wrapper_expr (wrap
, *expr_p
);
5260 gcc_assert (t
== *expr_p
);
5264 gimplify_and_add (wrap
, pre_p
);
5265 *expr_p
= unshare_expr (*to_p
);
5272 case COMPOUND_LITERAL_EXPR
:
5274 tree complit
= TREE_OPERAND (*expr_p
, 1);
5275 tree decl_s
= COMPOUND_LITERAL_EXPR_DECL_EXPR (complit
);
5276 tree decl
= DECL_EXPR_DECL (decl_s
);
5277 tree init
= DECL_INITIAL (decl
);
5279 /* struct T x = (struct T) { 0, 1, 2 } can be optimized
5280 into struct T x = { 0, 1, 2 } if the address of the
5281 compound literal has never been taken. */
5282 if (!TREE_ADDRESSABLE (complit
)
5283 && !TREE_ADDRESSABLE (decl
)
5286 *expr_p
= copy_node (*expr_p
);
5287 TREE_OPERAND (*expr_p
, 1) = init
;
5302 /* Return true if T looks like a valid GIMPLE statement. */
5305 is_gimple_stmt (tree t
)
5307 const enum tree_code code
= TREE_CODE (t
);
5312 /* The only valid NOP_EXPR is the empty statement. */
5313 return IS_EMPTY_STMT (t
);
5317 /* These are only valid if they're void. */
5318 return TREE_TYPE (t
) == NULL
|| VOID_TYPE_P (TREE_TYPE (t
));
5324 case CASE_LABEL_EXPR
:
5325 case TRY_CATCH_EXPR
:
5326 case TRY_FINALLY_EXPR
:
5327 case EH_FILTER_EXPR
:
5330 case STATEMENT_LIST
:
5334 case OACC_HOST_DATA
:
5337 case OACC_ENTER_DATA
:
5338 case OACC_EXIT_DATA
:
5344 case OMP_DISTRIBUTE
:
5355 case OMP_TARGET_DATA
:
5356 case OMP_TARGET_UPDATE
:
5357 case OMP_TARGET_ENTER_DATA
:
5358 case OMP_TARGET_EXIT_DATA
:
5361 /* These are always void. */
5367 /* These are valid regardless of their type. */
5376 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
5377 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
5378 DECL_GIMPLE_REG_P set.
5380 IMPORTANT NOTE: This promotion is performed by introducing a load of the
5381 other, unmodified part of the complex object just before the total store.
5382 As a consequence, if the object is still uninitialized, an undefined value
5383 will be loaded into a register, which may result in a spurious exception
5384 if the register is floating-point and the value happens to be a signaling
5385 NaN for example. Then the fully-fledged complex operations lowering pass
5386 followed by a DCE pass are necessary in order to fix things up. */
5388 static enum gimplify_status
5389 gimplify_modify_expr_complex_part (tree
*expr_p
, gimple_seq
*pre_p
,
5392 enum tree_code code
, ocode
;
5393 tree lhs
, rhs
, new_rhs
, other
, realpart
, imagpart
;
5395 lhs
= TREE_OPERAND (*expr_p
, 0);
5396 rhs
= TREE_OPERAND (*expr_p
, 1);
5397 code
= TREE_CODE (lhs
);
5398 lhs
= TREE_OPERAND (lhs
, 0);
5400 ocode
= code
== REALPART_EXPR
? IMAGPART_EXPR
: REALPART_EXPR
;
5401 other
= build1 (ocode
, TREE_TYPE (rhs
), lhs
);
5402 TREE_NO_WARNING (other
) = 1;
5403 other
= get_formal_tmp_var (other
, pre_p
);
5405 realpart
= code
== REALPART_EXPR
? rhs
: other
;
5406 imagpart
= code
== REALPART_EXPR
? other
: rhs
;
5408 if (TREE_CONSTANT (realpart
) && TREE_CONSTANT (imagpart
))
5409 new_rhs
= build_complex (TREE_TYPE (lhs
), realpart
, imagpart
);
5411 new_rhs
= build2 (COMPLEX_EXPR
, TREE_TYPE (lhs
), realpart
, imagpart
);
5413 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (lhs
, new_rhs
));
5414 *expr_p
= (want_value
) ? rhs
: NULL_TREE
;
5419 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
5425 PRE_P points to the list where side effects that must happen before
5426 *EXPR_P should be stored.
5428 POST_P points to the list where side effects that must happen after
5429 *EXPR_P should be stored.
5431 WANT_VALUE is nonzero iff we want to use the value of this expression
5432 in another expression. */
5434 static enum gimplify_status
5435 gimplify_modify_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
5438 tree
*from_p
= &TREE_OPERAND (*expr_p
, 1);
5439 tree
*to_p
= &TREE_OPERAND (*expr_p
, 0);
5440 enum gimplify_status ret
= GS_UNHANDLED
;
5442 location_t loc
= EXPR_LOCATION (*expr_p
);
5443 gimple_stmt_iterator gsi
;
5445 gcc_assert (TREE_CODE (*expr_p
) == MODIFY_EXPR
5446 || TREE_CODE (*expr_p
) == INIT_EXPR
);
5448 /* Trying to simplify a clobber using normal logic doesn't work,
5449 so handle it here. */
5450 if (TREE_CLOBBER_P (*from_p
))
5452 ret
= gimplify_expr (to_p
, pre_p
, post_p
, is_gimple_lvalue
, fb_lvalue
);
5453 if (ret
== GS_ERROR
)
5455 gcc_assert (!want_value
5456 && (VAR_P (*to_p
) || TREE_CODE (*to_p
) == MEM_REF
));
5457 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (*to_p
, *from_p
));
5462 /* Insert pointer conversions required by the middle-end that are not
5463 required by the frontend. This fixes middle-end type checking for
5464 for example gcc.dg/redecl-6.c. */
5465 if (POINTER_TYPE_P (TREE_TYPE (*to_p
)))
5467 STRIP_USELESS_TYPE_CONVERSION (*from_p
);
5468 if (!useless_type_conversion_p (TREE_TYPE (*to_p
), TREE_TYPE (*from_p
)))
5469 *from_p
= fold_convert_loc (loc
, TREE_TYPE (*to_p
), *from_p
);
5472 /* See if any simplifications can be done based on what the RHS is. */
5473 ret
= gimplify_modify_expr_rhs (expr_p
, from_p
, to_p
, pre_p
, post_p
,
5475 if (ret
!= GS_UNHANDLED
)
5478 /* For zero sized types only gimplify the left hand side and right hand
5479 side as statements and throw away the assignment. Do this after
5480 gimplify_modify_expr_rhs so we handle TARGET_EXPRs of addressable
5482 if (zero_sized_type (TREE_TYPE (*from_p
)) && !want_value
)
5484 gimplify_stmt (from_p
, pre_p
);
5485 gimplify_stmt (to_p
, pre_p
);
5486 *expr_p
= NULL_TREE
;
5490 /* If the value being copied is of variable width, compute the length
5491 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
5492 before gimplifying any of the operands so that we can resolve any
5493 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
5494 the size of the expression to be copied, not of the destination, so
5495 that is what we must do here. */
5496 maybe_with_size_expr (from_p
);
5498 /* As a special case, we have to temporarily allow for assignments
5499 with a CALL_EXPR on the RHS. Since in GIMPLE a function call is
5500 a toplevel statement, when gimplifying the GENERIC expression
5501 MODIFY_EXPR <a, CALL_EXPR <foo>>, we cannot create the tuple
5502 GIMPLE_ASSIGN <a, GIMPLE_CALL <foo>>.
5504 Instead, we need to create the tuple GIMPLE_CALL <a, foo>. To
5505 prevent gimplify_expr from trying to create a new temporary for
5506 foo's LHS, we tell it that it should only gimplify until it
5507 reaches the CALL_EXPR. On return from gimplify_expr, the newly
5508 created GIMPLE_CALL <foo> will be the last statement in *PRE_P
5509 and all we need to do here is set 'a' to be its LHS. */
5511 /* Gimplify the RHS first for C++17 and bug 71104. */
5512 gimple_predicate initial_pred
= initial_rhs_predicate_for (*to_p
);
5513 ret
= gimplify_expr (from_p
, pre_p
, post_p
, initial_pred
, fb_rvalue
);
5514 if (ret
== GS_ERROR
)
5517 /* Then gimplify the LHS. */
5518 /* If we gimplified the RHS to a CALL_EXPR and that call may return
5519 twice we have to make sure to gimplify into non-SSA as otherwise
5520 the abnormal edge added later will make those defs not dominate
5522 ??? Technically this applies only to the registers used in the
5523 resulting non-register *TO_P. */
5524 bool saved_into_ssa
= gimplify_ctxp
->into_ssa
;
5526 && TREE_CODE (*from_p
) == CALL_EXPR
5527 && call_expr_flags (*from_p
) & ECF_RETURNS_TWICE
)
5528 gimplify_ctxp
->into_ssa
= false;
5529 ret
= gimplify_expr (to_p
, pre_p
, post_p
, is_gimple_lvalue
, fb_lvalue
);
5530 gimplify_ctxp
->into_ssa
= saved_into_ssa
;
5531 if (ret
== GS_ERROR
)
5534 /* Now that the LHS is gimplified, re-gimplify the RHS if our initial
5535 guess for the predicate was wrong. */
5536 gimple_predicate final_pred
= rhs_predicate_for (*to_p
);
5537 if (final_pred
!= initial_pred
)
5539 ret
= gimplify_expr (from_p
, pre_p
, post_p
, final_pred
, fb_rvalue
);
5540 if (ret
== GS_ERROR
)
5544 /* In case of va_arg internal fn wrappped in a WITH_SIZE_EXPR, add the type
5545 size as argument to the call. */
5546 if (TREE_CODE (*from_p
) == WITH_SIZE_EXPR
)
5548 tree call
= TREE_OPERAND (*from_p
, 0);
5549 tree vlasize
= TREE_OPERAND (*from_p
, 1);
5551 if (TREE_CODE (call
) == CALL_EXPR
5552 && CALL_EXPR_IFN (call
) == IFN_VA_ARG
)
5554 int nargs
= call_expr_nargs (call
);
5555 tree type
= TREE_TYPE (call
);
5556 tree ap
= CALL_EXPR_ARG (call
, 0);
5557 tree tag
= CALL_EXPR_ARG (call
, 1);
5558 tree aptag
= CALL_EXPR_ARG (call
, 2);
5559 tree newcall
= build_call_expr_internal_loc (EXPR_LOCATION (call
),
5563 TREE_OPERAND (*from_p
, 0) = newcall
;
5567 /* Now see if the above changed *from_p to something we handle specially. */
5568 ret
= gimplify_modify_expr_rhs (expr_p
, from_p
, to_p
, pre_p
, post_p
,
5570 if (ret
!= GS_UNHANDLED
)
5573 /* If we've got a variable sized assignment between two lvalues (i.e. does
5574 not involve a call), then we can make things a bit more straightforward
5575 by converting the assignment to memcpy or memset. */
5576 if (TREE_CODE (*from_p
) == WITH_SIZE_EXPR
)
5578 tree from
= TREE_OPERAND (*from_p
, 0);
5579 tree size
= TREE_OPERAND (*from_p
, 1);
5581 if (TREE_CODE (from
) == CONSTRUCTOR
)
5582 return gimplify_modify_expr_to_memset (expr_p
, size
, want_value
, pre_p
);
5584 if (is_gimple_addressable (from
))
5587 return gimplify_modify_expr_to_memcpy (expr_p
, size
, want_value
,
5592 /* Transform partial stores to non-addressable complex variables into
5593 total stores. This allows us to use real instead of virtual operands
5594 for these variables, which improves optimization. */
5595 if ((TREE_CODE (*to_p
) == REALPART_EXPR
5596 || TREE_CODE (*to_p
) == IMAGPART_EXPR
)
5597 && is_gimple_reg (TREE_OPERAND (*to_p
, 0)))
5598 return gimplify_modify_expr_complex_part (expr_p
, pre_p
, want_value
);
5600 /* Try to alleviate the effects of the gimplification creating artificial
5601 temporaries (see for example is_gimple_reg_rhs) on the debug info, but
5602 make sure not to create DECL_DEBUG_EXPR links across functions. */
5603 if (!gimplify_ctxp
->into_ssa
5605 && DECL_IGNORED_P (*from_p
)
5607 && !DECL_IGNORED_P (*to_p
)
5608 && decl_function_context (*to_p
) == current_function_decl
5609 && decl_function_context (*from_p
) == current_function_decl
)
5611 if (!DECL_NAME (*from_p
) && DECL_NAME (*to_p
))
5613 = create_tmp_var_name (IDENTIFIER_POINTER (DECL_NAME (*to_p
)));
5614 DECL_HAS_DEBUG_EXPR_P (*from_p
) = 1;
5615 SET_DECL_DEBUG_EXPR (*from_p
, *to_p
);
5618 if (want_value
&& TREE_THIS_VOLATILE (*to_p
))
5619 *from_p
= get_initialized_tmp_var (*from_p
, pre_p
, post_p
);
5621 if (TREE_CODE (*from_p
) == CALL_EXPR
)
5623 /* Since the RHS is a CALL_EXPR, we need to create a GIMPLE_CALL
5624 instead of a GIMPLE_ASSIGN. */
5626 if (CALL_EXPR_FN (*from_p
) == NULL_TREE
)
5628 /* Gimplify internal functions created in the FEs. */
5629 int nargs
= call_expr_nargs (*from_p
), i
;
5630 enum internal_fn ifn
= CALL_EXPR_IFN (*from_p
);
5631 auto_vec
<tree
> vargs (nargs
);
5633 for (i
= 0; i
< nargs
; i
++)
5635 gimplify_arg (&CALL_EXPR_ARG (*from_p
, i
), pre_p
,
5636 EXPR_LOCATION (*from_p
));
5637 vargs
.quick_push (CALL_EXPR_ARG (*from_p
, i
));
5639 call_stmt
= gimple_build_call_internal_vec (ifn
, vargs
);
5640 gimple_set_location (call_stmt
, EXPR_LOCATION (*expr_p
));
5644 tree fnptrtype
= TREE_TYPE (CALL_EXPR_FN (*from_p
));
5645 CALL_EXPR_FN (*from_p
) = TREE_OPERAND (CALL_EXPR_FN (*from_p
), 0);
5646 STRIP_USELESS_TYPE_CONVERSION (CALL_EXPR_FN (*from_p
));
5647 tree fndecl
= get_callee_fndecl (*from_p
);
5649 && DECL_BUILT_IN_CLASS (fndecl
) == BUILT_IN_NORMAL
5650 && DECL_FUNCTION_CODE (fndecl
) == BUILT_IN_EXPECT
5651 && call_expr_nargs (*from_p
) == 3)
5652 call_stmt
= gimple_build_call_internal (IFN_BUILTIN_EXPECT
, 3,
5653 CALL_EXPR_ARG (*from_p
, 0),
5654 CALL_EXPR_ARG (*from_p
, 1),
5655 CALL_EXPR_ARG (*from_p
, 2));
5658 call_stmt
= gimple_build_call_from_tree (*from_p
);
5659 gimple_call_set_fntype (call_stmt
, TREE_TYPE (fnptrtype
));
5662 notice_special_calls (call_stmt
);
5663 if (!gimple_call_noreturn_p (call_stmt
) || !should_remove_lhs_p (*to_p
))
5664 gimple_call_set_lhs (call_stmt
, *to_p
);
5665 else if (TREE_CODE (*to_p
) == SSA_NAME
)
5666 /* The above is somewhat premature, avoid ICEing later for a
5667 SSA name w/o a definition. We may have uses in the GIMPLE IL.
5668 ??? This doesn't make it a default-def. */
5669 SSA_NAME_DEF_STMT (*to_p
) = gimple_build_nop ();
5671 if (EXPR_CILK_SPAWN (*from_p
))
5672 gimplify_cilk_detach (pre_p
);
5677 assign
= gimple_build_assign (*to_p
, *from_p
);
5678 gimple_set_location (assign
, EXPR_LOCATION (*expr_p
));
5679 if (COMPARISON_CLASS_P (*from_p
))
5680 gimple_set_no_warning (assign
, TREE_NO_WARNING (*from_p
));
5683 if (gimplify_ctxp
->into_ssa
&& is_gimple_reg (*to_p
))
5685 /* We should have got an SSA name from the start. */
5686 gcc_assert (TREE_CODE (*to_p
) == SSA_NAME
5687 || ! gimple_in_ssa_p (cfun
));
5690 gimplify_seq_add_stmt (pre_p
, assign
);
5691 gsi
= gsi_last (*pre_p
);
5692 maybe_fold_stmt (&gsi
);
5696 *expr_p
= TREE_THIS_VOLATILE (*to_p
) ? *from_p
: unshare_expr (*to_p
);
5705 /* Gimplify a comparison between two variable-sized objects. Do this
5706 with a call to BUILT_IN_MEMCMP. */
5708 static enum gimplify_status
5709 gimplify_variable_sized_compare (tree
*expr_p
)
5711 location_t loc
= EXPR_LOCATION (*expr_p
);
5712 tree op0
= TREE_OPERAND (*expr_p
, 0);
5713 tree op1
= TREE_OPERAND (*expr_p
, 1);
5714 tree t
, arg
, dest
, src
, expr
;
5716 arg
= TYPE_SIZE_UNIT (TREE_TYPE (op0
));
5717 arg
= unshare_expr (arg
);
5718 arg
= SUBSTITUTE_PLACEHOLDER_IN_EXPR (arg
, op0
);
5719 src
= build_fold_addr_expr_loc (loc
, op1
);
5720 dest
= build_fold_addr_expr_loc (loc
, op0
);
5721 t
= builtin_decl_implicit (BUILT_IN_MEMCMP
);
5722 t
= build_call_expr_loc (loc
, t
, 3, dest
, src
, arg
);
5725 = build2 (TREE_CODE (*expr_p
), TREE_TYPE (*expr_p
), t
, integer_zero_node
);
5726 SET_EXPR_LOCATION (expr
, loc
);
5732 /* Gimplify a comparison between two aggregate objects of integral scalar
5733 mode as a comparison between the bitwise equivalent scalar values. */
5735 static enum gimplify_status
5736 gimplify_scalar_mode_aggregate_compare (tree
*expr_p
)
5738 location_t loc
= EXPR_LOCATION (*expr_p
);
5739 tree op0
= TREE_OPERAND (*expr_p
, 0);
5740 tree op1
= TREE_OPERAND (*expr_p
, 1);
5742 tree type
= TREE_TYPE (op0
);
5743 tree scalar_type
= lang_hooks
.types
.type_for_mode (TYPE_MODE (type
), 1);
5745 op0
= fold_build1_loc (loc
, VIEW_CONVERT_EXPR
, scalar_type
, op0
);
5746 op1
= fold_build1_loc (loc
, VIEW_CONVERT_EXPR
, scalar_type
, op1
);
5749 = fold_build2_loc (loc
, TREE_CODE (*expr_p
), TREE_TYPE (*expr_p
), op0
, op1
);
5754 /* Gimplify an expression sequence. This function gimplifies each
5755 expression and rewrites the original expression with the last
5756 expression of the sequence in GIMPLE form.
5758 PRE_P points to the list where the side effects for all the
5759 expressions in the sequence will be emitted.
5761 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
5763 static enum gimplify_status
5764 gimplify_compound_expr (tree
*expr_p
, gimple_seq
*pre_p
, bool want_value
)
5770 tree
*sub_p
= &TREE_OPERAND (t
, 0);
5772 if (TREE_CODE (*sub_p
) == COMPOUND_EXPR
)
5773 gimplify_compound_expr (sub_p
, pre_p
, false);
5775 gimplify_stmt (sub_p
, pre_p
);
5777 t
= TREE_OPERAND (t
, 1);
5779 while (TREE_CODE (t
) == COMPOUND_EXPR
);
5786 gimplify_stmt (expr_p
, pre_p
);
5791 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
5792 gimplify. After gimplification, EXPR_P will point to a new temporary
5793 that holds the original value of the SAVE_EXPR node.
5795 PRE_P points to the list where side effects that must happen before
5796 *EXPR_P should be stored. */
5798 static enum gimplify_status
5799 gimplify_save_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
5801 enum gimplify_status ret
= GS_ALL_DONE
;
5804 gcc_assert (TREE_CODE (*expr_p
) == SAVE_EXPR
);
5805 val
= TREE_OPERAND (*expr_p
, 0);
5807 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
5808 if (!SAVE_EXPR_RESOLVED_P (*expr_p
))
5810 /* The operand may be a void-valued expression such as SAVE_EXPRs
5811 generated by the Java frontend for class initialization. It is
5812 being executed only for its side-effects. */
5813 if (TREE_TYPE (val
) == void_type_node
)
5815 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
5816 is_gimple_stmt
, fb_none
);
5820 /* The temporary may not be an SSA name as later abnormal and EH
5821 control flow may invalidate use/def domination. */
5822 val
= get_initialized_tmp_var (val
, pre_p
, post_p
, false);
5824 TREE_OPERAND (*expr_p
, 0) = val
;
5825 SAVE_EXPR_RESOLVED_P (*expr_p
) = 1;
5833 /* Rewrite the ADDR_EXPR node pointed to by EXPR_P
5840 PRE_P points to the list where side effects that must happen before
5841 *EXPR_P should be stored.
5843 POST_P points to the list where side effects that must happen after
5844 *EXPR_P should be stored. */
5846 static enum gimplify_status
5847 gimplify_addr_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
5849 tree expr
= *expr_p
;
5850 tree op0
= TREE_OPERAND (expr
, 0);
5851 enum gimplify_status ret
;
5852 location_t loc
= EXPR_LOCATION (*expr_p
);
5854 switch (TREE_CODE (op0
))
5858 /* Check if we are dealing with an expression of the form '&*ptr'.
5859 While the front end folds away '&*ptr' into 'ptr', these
5860 expressions may be generated internally by the compiler (e.g.,
5861 builtins like __builtin_va_end). */
5862 /* Caution: the silent array decomposition semantics we allow for
5863 ADDR_EXPR means we can't always discard the pair. */
5864 /* Gimplification of the ADDR_EXPR operand may drop
5865 cv-qualification conversions, so make sure we add them if
5868 tree op00
= TREE_OPERAND (op0
, 0);
5869 tree t_expr
= TREE_TYPE (expr
);
5870 tree t_op00
= TREE_TYPE (op00
);
5872 if (!useless_type_conversion_p (t_expr
, t_op00
))
5873 op00
= fold_convert_loc (loc
, TREE_TYPE (expr
), op00
);
5879 case VIEW_CONVERT_EXPR
:
5880 /* Take the address of our operand and then convert it to the type of
5883 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
5884 all clear. The impact of this transformation is even less clear. */
5886 /* If the operand is a useless conversion, look through it. Doing so
5887 guarantees that the ADDR_EXPR and its operand will remain of the
5889 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0
, 0)))
5890 op0
= TREE_OPERAND (op0
, 0);
5892 *expr_p
= fold_convert_loc (loc
, TREE_TYPE (expr
),
5893 build_fold_addr_expr_loc (loc
,
5894 TREE_OPERAND (op0
, 0)));
5899 if (integer_zerop (TREE_OPERAND (op0
, 1)))
5900 goto do_indirect_ref
;
5905 /* If we see a call to a declared builtin or see its address
5906 being taken (we can unify those cases here) then we can mark
5907 the builtin for implicit generation by GCC. */
5908 if (TREE_CODE (op0
) == FUNCTION_DECL
5909 && DECL_BUILT_IN_CLASS (op0
) == BUILT_IN_NORMAL
5910 && builtin_decl_declared_p (DECL_FUNCTION_CODE (op0
)))
5911 set_builtin_decl_implicit_p (DECL_FUNCTION_CODE (op0
), true);
5913 /* We use fb_either here because the C frontend sometimes takes
5914 the address of a call that returns a struct; see
5915 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
5916 the implied temporary explicit. */
5918 /* Make the operand addressable. */
5919 ret
= gimplify_expr (&TREE_OPERAND (expr
, 0), pre_p
, post_p
,
5920 is_gimple_addressable
, fb_either
);
5921 if (ret
== GS_ERROR
)
5924 /* Then mark it. Beware that it may not be possible to do so directly
5925 if a temporary has been created by the gimplification. */
5926 prepare_gimple_addressable (&TREE_OPERAND (expr
, 0), pre_p
);
5928 op0
= TREE_OPERAND (expr
, 0);
5930 /* For various reasons, the gimplification of the expression
5931 may have made a new INDIRECT_REF. */
5932 if (TREE_CODE (op0
) == INDIRECT_REF
)
5933 goto do_indirect_ref
;
5935 mark_addressable (TREE_OPERAND (expr
, 0));
5937 /* The FEs may end up building ADDR_EXPRs early on a decl with
5938 an incomplete type. Re-build ADDR_EXPRs in canonical form
5940 if (!types_compatible_p (TREE_TYPE (op0
), TREE_TYPE (TREE_TYPE (expr
))))
5941 *expr_p
= build_fold_addr_expr (op0
);
5943 /* Make sure TREE_CONSTANT and TREE_SIDE_EFFECTS are set properly. */
5944 recompute_tree_invariant_for_addr_expr (*expr_p
);
5946 /* If we re-built the ADDR_EXPR add a conversion to the original type
5948 if (!useless_type_conversion_p (TREE_TYPE (expr
), TREE_TYPE (*expr_p
)))
5949 *expr_p
= fold_convert (TREE_TYPE (expr
), *expr_p
);
5957 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
5958 value; output operands should be a gimple lvalue. */
5960 static enum gimplify_status
5961 gimplify_asm_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
5965 const char **oconstraints
;
5968 const char *constraint
;
5969 bool allows_mem
, allows_reg
, is_inout
;
5970 enum gimplify_status ret
, tret
;
5972 vec
<tree
, va_gc
> *inputs
;
5973 vec
<tree
, va_gc
> *outputs
;
5974 vec
<tree
, va_gc
> *clobbers
;
5975 vec
<tree
, va_gc
> *labels
;
5979 noutputs
= list_length (ASM_OUTPUTS (expr
));
5980 oconstraints
= (const char **) alloca ((noutputs
) * sizeof (const char *));
5988 link_next
= NULL_TREE
;
5989 for (i
= 0, link
= ASM_OUTPUTS (expr
); link
; ++i
, link
= link_next
)
5992 size_t constraint_len
;
5994 link_next
= TREE_CHAIN (link
);
5998 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link
)));
5999 constraint_len
= strlen (constraint
);
6000 if (constraint_len
== 0)
6003 ok
= parse_output_constraint (&constraint
, i
, 0, 0,
6004 &allows_mem
, &allows_reg
, &is_inout
);
6011 if (!allows_reg
&& allows_mem
)
6012 mark_addressable (TREE_VALUE (link
));
6014 tret
= gimplify_expr (&TREE_VALUE (link
), pre_p
, post_p
,
6015 is_inout
? is_gimple_min_lval
: is_gimple_lvalue
,
6016 fb_lvalue
| fb_mayfail
);
6017 if (tret
== GS_ERROR
)
6019 error ("invalid lvalue in asm output %d", i
);
6023 /* If the constraint does not allow memory make sure we gimplify
6024 it to a register if it is not already but its base is. This
6025 happens for complex and vector components. */
6028 tree op
= TREE_VALUE (link
);
6029 if (! is_gimple_val (op
)
6030 && is_gimple_reg_type (TREE_TYPE (op
))
6031 && is_gimple_reg (get_base_address (op
)))
6033 tree tem
= create_tmp_reg (TREE_TYPE (op
));
6037 ass
= build2 (MODIFY_EXPR
, TREE_TYPE (tem
),
6038 tem
, unshare_expr (op
));
6039 gimplify_and_add (ass
, pre_p
);
6041 ass
= build2 (MODIFY_EXPR
, TREE_TYPE (tem
), op
, tem
);
6042 gimplify_and_add (ass
, post_p
);
6044 TREE_VALUE (link
) = tem
;
6049 vec_safe_push (outputs
, link
);
6050 TREE_CHAIN (link
) = NULL_TREE
;
6054 /* An input/output operand. To give the optimizers more
6055 flexibility, split it into separate input and output
6058 /* Buffer big enough to format a 32-bit UINT_MAX into. */
6061 /* Turn the in/out constraint into an output constraint. */
6062 char *p
= xstrdup (constraint
);
6064 TREE_VALUE (TREE_PURPOSE (link
)) = build_string (constraint_len
, p
);
6066 /* And add a matching input constraint. */
6069 sprintf (buf
, "%u", i
);
6071 /* If there are multiple alternatives in the constraint,
6072 handle each of them individually. Those that allow register
6073 will be replaced with operand number, the others will stay
6075 if (strchr (p
, ',') != NULL
)
6077 size_t len
= 0, buflen
= strlen (buf
);
6078 char *beg
, *end
, *str
, *dst
;
6082 end
= strchr (beg
, ',');
6084 end
= strchr (beg
, '\0');
6085 if ((size_t) (end
- beg
) < buflen
)
6088 len
+= end
- beg
+ 1;
6095 str
= (char *) alloca (len
);
6096 for (beg
= p
+ 1, dst
= str
;;)
6099 bool mem_p
, reg_p
, inout_p
;
6101 end
= strchr (beg
, ',');
6106 parse_output_constraint (&tem
, i
, 0, 0,
6107 &mem_p
, ®_p
, &inout_p
);
6112 memcpy (dst
, buf
, buflen
);
6121 memcpy (dst
, beg
, len
);
6130 input
= build_string (dst
- str
, str
);
6133 input
= build_string (strlen (buf
), buf
);
6136 input
= build_string (constraint_len
- 1, constraint
+ 1);
6140 input
= build_tree_list (build_tree_list (NULL_TREE
, input
),
6141 unshare_expr (TREE_VALUE (link
)));
6142 ASM_INPUTS (expr
) = chainon (ASM_INPUTS (expr
), input
);
6146 link_next
= NULL_TREE
;
6147 for (link
= ASM_INPUTS (expr
); link
; ++i
, link
= link_next
)
6149 link_next
= TREE_CHAIN (link
);
6150 constraint
= TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link
)));
6151 parse_input_constraint (&constraint
, 0, 0, noutputs
, 0,
6152 oconstraints
, &allows_mem
, &allows_reg
);
6154 /* If we can't make copies, we can only accept memory. */
6155 if (TREE_ADDRESSABLE (TREE_TYPE (TREE_VALUE (link
))))
6161 error ("impossible constraint in %<asm%>");
6162 error ("non-memory input %d must stay in memory", i
);
6167 /* If the operand is a memory input, it should be an lvalue. */
6168 if (!allows_reg
&& allows_mem
)
6170 tree inputv
= TREE_VALUE (link
);
6171 STRIP_NOPS (inputv
);
6172 if (TREE_CODE (inputv
) == PREDECREMENT_EXPR
6173 || TREE_CODE (inputv
) == PREINCREMENT_EXPR
6174 || TREE_CODE (inputv
) == POSTDECREMENT_EXPR
6175 || TREE_CODE (inputv
) == POSTINCREMENT_EXPR
6176 || TREE_CODE (inputv
) == MODIFY_EXPR
)
6177 TREE_VALUE (link
) = error_mark_node
;
6178 tret
= gimplify_expr (&TREE_VALUE (link
), pre_p
, post_p
,
6179 is_gimple_lvalue
, fb_lvalue
| fb_mayfail
);
6180 if (tret
!= GS_ERROR
)
6182 /* Unlike output operands, memory inputs are not guaranteed
6183 to be lvalues by the FE, and while the expressions are
6184 marked addressable there, if it is e.g. a statement
6185 expression, temporaries in it might not end up being
6186 addressable. They might be already used in the IL and thus
6187 it is too late to make them addressable now though. */
6188 tree x
= TREE_VALUE (link
);
6189 while (handled_component_p (x
))
6190 x
= TREE_OPERAND (x
, 0);
6191 if (TREE_CODE (x
) == MEM_REF
6192 && TREE_CODE (TREE_OPERAND (x
, 0)) == ADDR_EXPR
)
6193 x
= TREE_OPERAND (TREE_OPERAND (x
, 0), 0);
6195 || TREE_CODE (x
) == PARM_DECL
6196 || TREE_CODE (x
) == RESULT_DECL
)
6197 && !TREE_ADDRESSABLE (x
)
6198 && is_gimple_reg (x
))
6200 warning_at (EXPR_LOC_OR_LOC (TREE_VALUE (link
),
6202 "memory input %d is not directly addressable",
6204 prepare_gimple_addressable (&TREE_VALUE (link
), pre_p
);
6207 mark_addressable (TREE_VALUE (link
));
6208 if (tret
== GS_ERROR
)
6210 error_at (EXPR_LOC_OR_LOC (TREE_VALUE (link
), input_location
),
6211 "memory input %d is not directly addressable", i
);
6217 tret
= gimplify_expr (&TREE_VALUE (link
), pre_p
, post_p
,
6218 is_gimple_asm_val
, fb_rvalue
);
6219 if (tret
== GS_ERROR
)
6223 TREE_CHAIN (link
) = NULL_TREE
;
6224 vec_safe_push (inputs
, link
);
6227 link_next
= NULL_TREE
;
6228 for (link
= ASM_CLOBBERS (expr
); link
; ++i
, link
= link_next
)
6230 link_next
= TREE_CHAIN (link
);
6231 TREE_CHAIN (link
) = NULL_TREE
;
6232 vec_safe_push (clobbers
, link
);
6235 link_next
= NULL_TREE
;
6236 for (link
= ASM_LABELS (expr
); link
; ++i
, link
= link_next
)
6238 link_next
= TREE_CHAIN (link
);
6239 TREE_CHAIN (link
) = NULL_TREE
;
6240 vec_safe_push (labels
, link
);
6243 /* Do not add ASMs with errors to the gimple IL stream. */
6244 if (ret
!= GS_ERROR
)
6246 stmt
= gimple_build_asm_vec (TREE_STRING_POINTER (ASM_STRING (expr
)),
6247 inputs
, outputs
, clobbers
, labels
);
6249 gimple_asm_set_volatile (stmt
, ASM_VOLATILE_P (expr
) || noutputs
== 0);
6250 gimple_asm_set_input (stmt
, ASM_INPUT_P (expr
));
6252 gimplify_seq_add_stmt (pre_p
, stmt
);
6258 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
6259 GIMPLE_WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
6260 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
6261 return to this function.
6263 FIXME should we complexify the prequeue handling instead? Or use flags
6264 for all the cleanups and let the optimizer tighten them up? The current
6265 code seems pretty fragile; it will break on a cleanup within any
6266 non-conditional nesting. But any such nesting would be broken, anyway;
6267 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
6268 and continues out of it. We can do that at the RTL level, though, so
6269 having an optimizer to tighten up try/finally regions would be a Good
6272 static enum gimplify_status
6273 gimplify_cleanup_point_expr (tree
*expr_p
, gimple_seq
*pre_p
)
6275 gimple_stmt_iterator iter
;
6276 gimple_seq body_sequence
= NULL
;
6278 tree temp
= voidify_wrapper_expr (*expr_p
, NULL
);
6280 /* We only care about the number of conditions between the innermost
6281 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
6282 any cleanups collected outside the CLEANUP_POINT_EXPR. */
6283 int old_conds
= gimplify_ctxp
->conditions
;
6284 gimple_seq old_cleanups
= gimplify_ctxp
->conditional_cleanups
;
6285 bool old_in_cleanup_point_expr
= gimplify_ctxp
->in_cleanup_point_expr
;
6286 gimplify_ctxp
->conditions
= 0;
6287 gimplify_ctxp
->conditional_cleanups
= NULL
;
6288 gimplify_ctxp
->in_cleanup_point_expr
= true;
6290 gimplify_stmt (&TREE_OPERAND (*expr_p
, 0), &body_sequence
);
6292 gimplify_ctxp
->conditions
= old_conds
;
6293 gimplify_ctxp
->conditional_cleanups
= old_cleanups
;
6294 gimplify_ctxp
->in_cleanup_point_expr
= old_in_cleanup_point_expr
;
6296 for (iter
= gsi_start (body_sequence
); !gsi_end_p (iter
); )
6298 gimple
*wce
= gsi_stmt (iter
);
6300 if (gimple_code (wce
) == GIMPLE_WITH_CLEANUP_EXPR
)
6302 if (gsi_one_before_end_p (iter
))
6304 /* Note that gsi_insert_seq_before and gsi_remove do not
6305 scan operands, unlike some other sequence mutators. */
6306 if (!gimple_wce_cleanup_eh_only (wce
))
6307 gsi_insert_seq_before_without_update (&iter
,
6308 gimple_wce_cleanup (wce
),
6310 gsi_remove (&iter
, true);
6317 enum gimple_try_flags kind
;
6319 if (gimple_wce_cleanup_eh_only (wce
))
6320 kind
= GIMPLE_TRY_CATCH
;
6322 kind
= GIMPLE_TRY_FINALLY
;
6323 seq
= gsi_split_seq_after (iter
);
6325 gtry
= gimple_build_try (seq
, gimple_wce_cleanup (wce
), kind
);
6326 /* Do not use gsi_replace here, as it may scan operands.
6327 We want to do a simple structural modification only. */
6328 gsi_set_stmt (&iter
, gtry
);
6329 iter
= gsi_start (gtry
->eval
);
6336 gimplify_seq_add_seq (pre_p
, body_sequence
);
6349 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
6350 is the cleanup action required. EH_ONLY is true if the cleanup should
6351 only be executed if an exception is thrown, not on normal exit.
6352 If FORCE_UNCOND is true perform the cleanup unconditionally; this is
6353 only valid for clobbers. */
6356 gimple_push_cleanup (tree var
, tree cleanup
, bool eh_only
, gimple_seq
*pre_p
,
6357 bool force_uncond
= false)
6360 gimple_seq cleanup_stmts
= NULL
;
6362 /* Errors can result in improperly nested cleanups. Which results in
6363 confusion when trying to resolve the GIMPLE_WITH_CLEANUP_EXPR. */
6367 if (gimple_conditional_context ())
6369 /* If we're in a conditional context, this is more complex. We only
6370 want to run the cleanup if we actually ran the initialization that
6371 necessitates it, but we want to run it after the end of the
6372 conditional context. So we wrap the try/finally around the
6373 condition and use a flag to determine whether or not to actually
6374 run the destructor. Thus
6378 becomes (approximately)
6382 if (test) { A::A(temp); flag = 1; val = f(temp); }
6385 if (flag) A::~A(temp);
6391 gimplify_stmt (&cleanup
, &cleanup_stmts
);
6392 wce
= gimple_build_wce (cleanup_stmts
);
6393 gimplify_seq_add_stmt (&gimplify_ctxp
->conditional_cleanups
, wce
);
6397 tree flag
= create_tmp_var (boolean_type_node
, "cleanup");
6398 gassign
*ffalse
= gimple_build_assign (flag
, boolean_false_node
);
6399 gassign
*ftrue
= gimple_build_assign (flag
, boolean_true_node
);
6401 cleanup
= build3 (COND_EXPR
, void_type_node
, flag
, cleanup
, NULL
);
6402 gimplify_stmt (&cleanup
, &cleanup_stmts
);
6403 wce
= gimple_build_wce (cleanup_stmts
);
6405 gimplify_seq_add_stmt (&gimplify_ctxp
->conditional_cleanups
, ffalse
);
6406 gimplify_seq_add_stmt (&gimplify_ctxp
->conditional_cleanups
, wce
);
6407 gimplify_seq_add_stmt (pre_p
, ftrue
);
6409 /* Because of this manipulation, and the EH edges that jump
6410 threading cannot redirect, the temporary (VAR) will appear
6411 to be used uninitialized. Don't warn. */
6412 TREE_NO_WARNING (var
) = 1;
6417 gimplify_stmt (&cleanup
, &cleanup_stmts
);
6418 wce
= gimple_build_wce (cleanup_stmts
);
6419 gimple_wce_set_cleanup_eh_only (wce
, eh_only
);
6420 gimplify_seq_add_stmt (pre_p
, wce
);
6424 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
6426 static enum gimplify_status
6427 gimplify_target_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
6429 tree targ
= *expr_p
;
6430 tree temp
= TARGET_EXPR_SLOT (targ
);
6431 tree init
= TARGET_EXPR_INITIAL (targ
);
6432 enum gimplify_status ret
;
6434 bool unpoison_empty_seq
= false;
6435 gimple_stmt_iterator unpoison_it
;
6439 tree cleanup
= NULL_TREE
;
6441 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
6442 to the temps list. Handle also variable length TARGET_EXPRs. */
6443 if (TREE_CODE (DECL_SIZE (temp
)) != INTEGER_CST
)
6445 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (temp
)))
6446 gimplify_type_sizes (TREE_TYPE (temp
), pre_p
);
6447 gimplify_vla_decl (temp
, pre_p
);
6451 /* Save location where we need to place unpoisoning. It's possible
6452 that a variable will be converted to needs_to_live_in_memory. */
6453 unpoison_it
= gsi_last (*pre_p
);
6454 unpoison_empty_seq
= gsi_end_p (unpoison_it
);
6456 gimple_add_tmp_var (temp
);
6459 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
6460 expression is supposed to initialize the slot. */
6461 if (VOID_TYPE_P (TREE_TYPE (init
)))
6462 ret
= gimplify_expr (&init
, pre_p
, post_p
, is_gimple_stmt
, fb_none
);
6465 tree init_expr
= build2 (INIT_EXPR
, void_type_node
, temp
, init
);
6467 ret
= gimplify_expr (&init
, pre_p
, post_p
, is_gimple_stmt
, fb_none
);
6469 ggc_free (init_expr
);
6471 if (ret
== GS_ERROR
)
6473 /* PR c++/28266 Make sure this is expanded only once. */
6474 TARGET_EXPR_INITIAL (targ
) = NULL_TREE
;
6478 gimplify_and_add (init
, pre_p
);
6480 /* If needed, push the cleanup for the temp. */
6481 if (TARGET_EXPR_CLEANUP (targ
))
6483 if (CLEANUP_EH_ONLY (targ
))
6484 gimple_push_cleanup (temp
, TARGET_EXPR_CLEANUP (targ
),
6485 CLEANUP_EH_ONLY (targ
), pre_p
);
6487 cleanup
= TARGET_EXPR_CLEANUP (targ
);
6490 /* Add a clobber for the temporary going out of scope, like
6491 gimplify_bind_expr. */
6492 if (gimplify_ctxp
->in_cleanup_point_expr
6493 && needs_to_live_in_memory (temp
))
6495 if (flag_stack_reuse
== SR_ALL
)
6497 tree clobber
= build_constructor (TREE_TYPE (temp
),
6499 TREE_THIS_VOLATILE (clobber
) = true;
6500 clobber
= build2 (MODIFY_EXPR
, TREE_TYPE (temp
), temp
, clobber
);
6501 gimple_push_cleanup (temp
, clobber
, false, pre_p
, true);
6503 if (asan_poisoned_variables
&& dbg_cnt (asan_use_after_scope
))
6505 tree asan_cleanup
= build_asan_poison_call_expr (temp
);
6508 if (unpoison_empty_seq
)
6509 unpoison_it
= gsi_start (*pre_p
);
6511 asan_poison_variable (temp
, false, &unpoison_it
,
6512 unpoison_empty_seq
);
6513 gimple_push_cleanup (temp
, asan_cleanup
, false, pre_p
);
6518 gimple_push_cleanup (temp
, cleanup
, false, pre_p
);
6520 /* Only expand this once. */
6521 TREE_OPERAND (targ
, 3) = init
;
6522 TARGET_EXPR_INITIAL (targ
) = NULL_TREE
;
6525 /* We should have expanded this before. */
6526 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp
));
6532 /* Gimplification of expression trees. */
6534 /* Gimplify an expression which appears at statement context. The
6535 corresponding GIMPLE statements are added to *SEQ_P. If *SEQ_P is
6536 NULL, a new sequence is allocated.
6538 Return true if we actually added a statement to the queue. */
6541 gimplify_stmt (tree
*stmt_p
, gimple_seq
*seq_p
)
6543 gimple_seq_node last
;
6545 last
= gimple_seq_last (*seq_p
);
6546 gimplify_expr (stmt_p
, seq_p
, NULL
, is_gimple_stmt
, fb_none
);
6547 return last
!= gimple_seq_last (*seq_p
);
6550 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
6551 to CTX. If entries already exist, force them to be some flavor of private.
6552 If there is no enclosing parallel, do nothing. */
6555 omp_firstprivatize_variable (struct gimplify_omp_ctx
*ctx
, tree decl
)
6559 if (decl
== NULL
|| !DECL_P (decl
) || ctx
->region_type
== ORT_NONE
)
6564 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
6567 if (n
->value
& GOVD_SHARED
)
6568 n
->value
= GOVD_FIRSTPRIVATE
| (n
->value
& GOVD_SEEN
);
6569 else if (n
->value
& GOVD_MAP
)
6570 n
->value
|= GOVD_MAP_TO_ONLY
;
6574 else if ((ctx
->region_type
& ORT_TARGET
) != 0)
6576 if (ctx
->target_map_scalars_firstprivate
)
6577 omp_add_variable (ctx
, decl
, GOVD_FIRSTPRIVATE
);
6579 omp_add_variable (ctx
, decl
, GOVD_MAP
| GOVD_MAP_TO_ONLY
);
6581 else if (ctx
->region_type
!= ORT_WORKSHARE
6582 && ctx
->region_type
!= ORT_SIMD
6583 && ctx
->region_type
!= ORT_ACC
6584 && !(ctx
->region_type
& ORT_TARGET_DATA
))
6585 omp_add_variable (ctx
, decl
, GOVD_FIRSTPRIVATE
);
6587 ctx
= ctx
->outer_context
;
6592 /* Similarly for each of the type sizes of TYPE. */
6595 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx
*ctx
, tree type
)
6597 if (type
== NULL
|| type
== error_mark_node
)
6599 type
= TYPE_MAIN_VARIANT (type
);
6601 if (ctx
->privatized_types
->add (type
))
6604 switch (TREE_CODE (type
))
6610 case FIXED_POINT_TYPE
:
6611 omp_firstprivatize_variable (ctx
, TYPE_MIN_VALUE (type
));
6612 omp_firstprivatize_variable (ctx
, TYPE_MAX_VALUE (type
));
6616 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (type
));
6617 omp_firstprivatize_type_sizes (ctx
, TYPE_DOMAIN (type
));
6622 case QUAL_UNION_TYPE
:
6625 for (field
= TYPE_FIELDS (type
); field
; field
= DECL_CHAIN (field
))
6626 if (TREE_CODE (field
) == FIELD_DECL
)
6628 omp_firstprivatize_variable (ctx
, DECL_FIELD_OFFSET (field
));
6629 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (field
));
6635 case REFERENCE_TYPE
:
6636 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (type
));
6643 omp_firstprivatize_variable (ctx
, TYPE_SIZE (type
));
6644 omp_firstprivatize_variable (ctx
, TYPE_SIZE_UNIT (type
));
6645 lang_hooks
.types
.omp_firstprivatize_type_sizes (ctx
, type
);
6648 /* Add an entry for DECL in the OMP context CTX with FLAGS. */
6651 omp_add_variable (struct gimplify_omp_ctx
*ctx
, tree decl
, unsigned int flags
)
6654 unsigned int nflags
;
6657 if (error_operand_p (decl
) || ctx
->region_type
== ORT_NONE
)
6660 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
6661 there are constructors involved somewhere. Exception is a shared clause,
6662 there is nothing privatized in that case. */
6663 if ((flags
& GOVD_SHARED
) == 0
6664 && (TREE_ADDRESSABLE (TREE_TYPE (decl
))
6665 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl
))))
6668 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
6669 if (n
!= NULL
&& (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
6671 /* We shouldn't be re-adding the decl with the same data
6673 gcc_assert ((n
->value
& GOVD_DATA_SHARE_CLASS
& flags
) == 0);
6674 nflags
= n
->value
| flags
;
6675 /* The only combination of data sharing classes we should see is
6676 FIRSTPRIVATE and LASTPRIVATE. However, OpenACC permits
6677 reduction variables to be used in data sharing clauses. */
6678 gcc_assert ((ctx
->region_type
& ORT_ACC
) != 0
6679 || ((nflags
& GOVD_DATA_SHARE_CLASS
)
6680 == (GOVD_FIRSTPRIVATE
| GOVD_LASTPRIVATE
))
6681 || (flags
& GOVD_DATA_SHARE_CLASS
) == 0);
6686 /* When adding a variable-sized variable, we have to handle all sorts
6687 of additional bits of data: the pointer replacement variable, and
6688 the parameters of the type. */
6689 if (DECL_SIZE (decl
) && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
6691 /* Add the pointer replacement variable as PRIVATE if the variable
6692 replacement is private, else FIRSTPRIVATE since we'll need the
6693 address of the original variable either for SHARED, or for the
6694 copy into or out of the context. */
6695 if (!(flags
& GOVD_LOCAL
))
6697 if (flags
& GOVD_MAP
)
6698 nflags
= GOVD_MAP
| GOVD_MAP_TO_ONLY
| GOVD_EXPLICIT
;
6699 else if (flags
& GOVD_PRIVATE
)
6700 nflags
= GOVD_PRIVATE
;
6701 else if ((ctx
->region_type
& (ORT_TARGET
| ORT_TARGET_DATA
)) != 0
6702 && (flags
& GOVD_FIRSTPRIVATE
))
6703 nflags
= GOVD_PRIVATE
| GOVD_EXPLICIT
;
6705 nflags
= GOVD_FIRSTPRIVATE
;
6706 nflags
|= flags
& GOVD_SEEN
;
6707 t
= DECL_VALUE_EXPR (decl
);
6708 gcc_assert (TREE_CODE (t
) == INDIRECT_REF
);
6709 t
= TREE_OPERAND (t
, 0);
6710 gcc_assert (DECL_P (t
));
6711 omp_add_variable (ctx
, t
, nflags
);
6714 /* Add all of the variable and type parameters (which should have
6715 been gimplified to a formal temporary) as FIRSTPRIVATE. */
6716 omp_firstprivatize_variable (ctx
, DECL_SIZE_UNIT (decl
));
6717 omp_firstprivatize_variable (ctx
, DECL_SIZE (decl
));
6718 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (decl
));
6720 /* The variable-sized variable itself is never SHARED, only some form
6721 of PRIVATE. The sharing would take place via the pointer variable
6722 which we remapped above. */
6723 if (flags
& GOVD_SHARED
)
6724 flags
= GOVD_SHARED
| GOVD_DEBUG_PRIVATE
6725 | (flags
& (GOVD_SEEN
| GOVD_EXPLICIT
));
6727 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
6728 alloca statement we generate for the variable, so make sure it
6729 is available. This isn't automatically needed for the SHARED
6730 case, since we won't be allocating local storage then.
6731 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
6732 in this case omp_notice_variable will be called later
6733 on when it is gimplified. */
6734 else if (! (flags
& (GOVD_LOCAL
| GOVD_MAP
))
6735 && DECL_P (TYPE_SIZE_UNIT (TREE_TYPE (decl
))))
6736 omp_notice_variable (ctx
, TYPE_SIZE_UNIT (TREE_TYPE (decl
)), true);
6738 else if ((flags
& (GOVD_MAP
| GOVD_LOCAL
)) == 0
6739 && lang_hooks
.decls
.omp_privatize_by_reference (decl
))
6741 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (decl
));
6743 /* Similar to the direct variable sized case above, we'll need the
6744 size of references being privatized. */
6745 if ((flags
& GOVD_SHARED
) == 0)
6747 t
= TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
)));
6749 omp_notice_variable (ctx
, t
, true);
6756 splay_tree_insert (ctx
->variables
, (splay_tree_key
)decl
, flags
);
6758 /* For reductions clauses in OpenACC loop directives, by default create a
6759 copy clause on the enclosing parallel construct for carrying back the
6761 if (ctx
->region_type
== ORT_ACC
&& (flags
& GOVD_REDUCTION
))
6763 struct gimplify_omp_ctx
*outer_ctx
= ctx
->outer_context
;
6766 n
= splay_tree_lookup (outer_ctx
->variables
, (splay_tree_key
)decl
);
6769 /* Ignore local variables and explicitly declared clauses. */
6770 if (n
->value
& (GOVD_LOCAL
| GOVD_EXPLICIT
))
6772 else if (outer_ctx
->region_type
== ORT_ACC_KERNELS
)
6774 /* According to the OpenACC spec, such a reduction variable
6775 should already have a copy map on a kernels construct,
6776 verify that here. */
6777 gcc_assert (!(n
->value
& GOVD_FIRSTPRIVATE
)
6778 && (n
->value
& GOVD_MAP
));
6780 else if (outer_ctx
->region_type
== ORT_ACC_PARALLEL
)
6782 /* Remove firstprivate and make it a copy map. */
6783 n
->value
&= ~GOVD_FIRSTPRIVATE
;
6784 n
->value
|= GOVD_MAP
;
6787 else if (outer_ctx
->region_type
== ORT_ACC_PARALLEL
)
6789 splay_tree_insert (outer_ctx
->variables
, (splay_tree_key
)decl
,
6790 GOVD_MAP
| GOVD_SEEN
);
6793 outer_ctx
= outer_ctx
->outer_context
;
6798 /* Notice a threadprivate variable DECL used in OMP context CTX.
6799 This just prints out diagnostics about threadprivate variable uses
6800 in untied tasks. If DECL2 is non-NULL, prevent this warning
6801 on that variable. */
6804 omp_notice_threadprivate_variable (struct gimplify_omp_ctx
*ctx
, tree decl
,
6808 struct gimplify_omp_ctx
*octx
;
6810 for (octx
= ctx
; octx
; octx
= octx
->outer_context
)
6811 if ((octx
->region_type
& ORT_TARGET
) != 0)
6813 n
= splay_tree_lookup (octx
->variables
, (splay_tree_key
)decl
);
6816 error ("threadprivate variable %qE used in target region",
6818 error_at (octx
->location
, "enclosing target region");
6819 splay_tree_insert (octx
->variables
, (splay_tree_key
)decl
, 0);
6822 splay_tree_insert (octx
->variables
, (splay_tree_key
)decl2
, 0);
6825 if (ctx
->region_type
!= ORT_UNTIED_TASK
)
6827 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
6830 error ("threadprivate variable %qE used in untied task",
6832 error_at (ctx
->location
, "enclosing task");
6833 splay_tree_insert (ctx
->variables
, (splay_tree_key
)decl
, 0);
6836 splay_tree_insert (ctx
->variables
, (splay_tree_key
)decl2
, 0);
6840 /* Return true if global var DECL is device resident. */
6843 device_resident_p (tree decl
)
6845 tree attr
= lookup_attribute ("oacc declare target", DECL_ATTRIBUTES (decl
));
6850 for (tree t
= TREE_VALUE (attr
); t
; t
= TREE_PURPOSE (t
))
6852 tree c
= TREE_VALUE (t
);
6853 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_DEVICE_RESIDENT
)
6860 /* Return true if DECL has an ACC DECLARE attribute. */
6863 is_oacc_declared (tree decl
)
6865 tree t
= TREE_CODE (decl
) == MEM_REF
? TREE_OPERAND (decl
, 0) : decl
;
6866 tree declared
= lookup_attribute ("oacc declare target", DECL_ATTRIBUTES (t
));
6867 return declared
!= NULL_TREE
;
6870 /* Determine outer default flags for DECL mentioned in an OMP region
6871 but not declared in an enclosing clause.
6873 ??? Some compiler-generated variables (like SAVE_EXPRs) could be
6874 remapped firstprivate instead of shared. To some extent this is
6875 addressed in omp_firstprivatize_type_sizes, but not
6879 omp_default_clause (struct gimplify_omp_ctx
*ctx
, tree decl
,
6880 bool in_code
, unsigned flags
)
6882 enum omp_clause_default_kind default_kind
= ctx
->default_kind
;
6883 enum omp_clause_default_kind kind
;
6885 kind
= lang_hooks
.decls
.omp_predetermined_sharing (decl
);
6886 if (kind
!= OMP_CLAUSE_DEFAULT_UNSPECIFIED
)
6887 default_kind
= kind
;
6889 switch (default_kind
)
6891 case OMP_CLAUSE_DEFAULT_NONE
:
6895 if (ctx
->region_type
& ORT_PARALLEL
)
6897 else if (ctx
->region_type
& ORT_TASK
)
6899 else if (ctx
->region_type
& ORT_TEAMS
)
6904 error ("%qE not specified in enclosing %qs",
6905 DECL_NAME (lang_hooks
.decls
.omp_report_decl (decl
)), rtype
);
6906 error_at (ctx
->location
, "enclosing %qs", rtype
);
6909 case OMP_CLAUSE_DEFAULT_SHARED
:
6910 flags
|= GOVD_SHARED
;
6912 case OMP_CLAUSE_DEFAULT_PRIVATE
:
6913 flags
|= GOVD_PRIVATE
;
6915 case OMP_CLAUSE_DEFAULT_FIRSTPRIVATE
:
6916 flags
|= GOVD_FIRSTPRIVATE
;
6918 case OMP_CLAUSE_DEFAULT_UNSPECIFIED
:
6919 /* decl will be either GOVD_FIRSTPRIVATE or GOVD_SHARED. */
6920 gcc_assert ((ctx
->region_type
& ORT_TASK
) != 0);
6921 if (struct gimplify_omp_ctx
*octx
= ctx
->outer_context
)
6923 omp_notice_variable (octx
, decl
, in_code
);
6924 for (; octx
; octx
= octx
->outer_context
)
6928 n2
= splay_tree_lookup (octx
->variables
, (splay_tree_key
) decl
);
6929 if ((octx
->region_type
& (ORT_TARGET_DATA
| ORT_TARGET
)) != 0
6930 && (n2
== NULL
|| (n2
->value
& GOVD_DATA_SHARE_CLASS
) == 0))
6932 if (n2
&& (n2
->value
& GOVD_DATA_SHARE_CLASS
) != GOVD_SHARED
)
6934 flags
|= GOVD_FIRSTPRIVATE
;
6937 if ((octx
->region_type
& (ORT_PARALLEL
| ORT_TEAMS
)) != 0)
6939 flags
|= GOVD_SHARED
;
6945 if (TREE_CODE (decl
) == PARM_DECL
6946 || (!is_global_var (decl
)
6947 && DECL_CONTEXT (decl
) == current_function_decl
))
6948 flags
|= GOVD_FIRSTPRIVATE
;
6950 flags
|= GOVD_SHARED
;
6962 /* Determine outer default flags for DECL mentioned in an OACC region
6963 but not declared in an enclosing clause. */
6966 oacc_default_clause (struct gimplify_omp_ctx
*ctx
, tree decl
, unsigned flags
)
6969 bool on_device
= false;
6970 bool declared
= is_oacc_declared (decl
);
6971 tree type
= TREE_TYPE (decl
);
6973 if (lang_hooks
.decls
.omp_privatize_by_reference (decl
))
6974 type
= TREE_TYPE (type
);
6976 if ((ctx
->region_type
& (ORT_ACC_PARALLEL
| ORT_ACC_KERNELS
)) != 0
6977 && is_global_var (decl
)
6978 && device_resident_p (decl
))
6981 flags
|= GOVD_MAP_TO_ONLY
;
6984 switch (ctx
->region_type
)
6986 case ORT_ACC_KERNELS
:
6989 if (AGGREGATE_TYPE_P (type
))
6991 /* Aggregates default to 'present_or_copy', or 'present'. */
6992 if (ctx
->default_kind
!= OMP_CLAUSE_DEFAULT_PRESENT
)
6995 flags
|= GOVD_MAP
| GOVD_MAP_FORCE_PRESENT
;
6998 /* Scalars default to 'copy'. */
6999 flags
|= GOVD_MAP
| GOVD_MAP_FORCE
;
7003 case ORT_ACC_PARALLEL
:
7006 if (on_device
|| declared
)
7008 else if (AGGREGATE_TYPE_P (type
))
7010 /* Aggregates default to 'present_or_copy', or 'present'. */
7011 if (ctx
->default_kind
!= OMP_CLAUSE_DEFAULT_PRESENT
)
7014 flags
|= GOVD_MAP
| GOVD_MAP_FORCE_PRESENT
;
7017 /* Scalars default to 'firstprivate'. */
7018 flags
|= GOVD_FIRSTPRIVATE
;
7026 if (DECL_ARTIFICIAL (decl
))
7027 ; /* We can get compiler-generated decls, and should not complain
7029 else if (ctx
->default_kind
== OMP_CLAUSE_DEFAULT_NONE
)
7031 error ("%qE not specified in enclosing OpenACC %qs construct",
7032 DECL_NAME (lang_hooks
.decls
.omp_report_decl (decl
)), rkind
);
7033 inform (ctx
->location
, "enclosing OpenACC %qs construct", rkind
);
7035 else if (ctx
->default_kind
== OMP_CLAUSE_DEFAULT_PRESENT
)
7036 ; /* Handled above. */
7038 gcc_checking_assert (ctx
->default_kind
== OMP_CLAUSE_DEFAULT_SHARED
);
7043 /* Record the fact that DECL was used within the OMP context CTX.
7044 IN_CODE is true when real code uses DECL, and false when we should
7045 merely emit default(none) errors. Return true if DECL is going to
7046 be remapped and thus DECL shouldn't be gimplified into its
7047 DECL_VALUE_EXPR (if any). */
7050 omp_notice_variable (struct gimplify_omp_ctx
*ctx
, tree decl
, bool in_code
)
7053 unsigned flags
= in_code
? GOVD_SEEN
: 0;
7054 bool ret
= false, shared
;
7056 if (error_operand_p (decl
))
7059 if (ctx
->region_type
== ORT_NONE
)
7060 return lang_hooks
.decls
.omp_disregard_value_expr (decl
, false);
7062 if (is_global_var (decl
))
7064 /* Threadprivate variables are predetermined. */
7065 if (DECL_THREAD_LOCAL_P (decl
))
7066 return omp_notice_threadprivate_variable (ctx
, decl
, NULL_TREE
);
7068 if (DECL_HAS_VALUE_EXPR_P (decl
))
7070 tree value
= get_base_address (DECL_VALUE_EXPR (decl
));
7072 if (value
&& DECL_P (value
) && DECL_THREAD_LOCAL_P (value
))
7073 return omp_notice_threadprivate_variable (ctx
, decl
, value
);
7076 if (gimplify_omp_ctxp
->outer_context
== NULL
7078 && oacc_get_fn_attrib (current_function_decl
))
7080 location_t loc
= DECL_SOURCE_LOCATION (decl
);
7082 if (lookup_attribute ("omp declare target link",
7083 DECL_ATTRIBUTES (decl
)))
7086 "%qE with %<link%> clause used in %<routine%> function",
7090 else if (!lookup_attribute ("omp declare target",
7091 DECL_ATTRIBUTES (decl
)))
7094 "%qE requires a %<declare%> directive for use "
7095 "in a %<routine%> function", DECL_NAME (decl
));
7101 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
7102 if ((ctx
->region_type
& ORT_TARGET
) != 0)
7104 ret
= lang_hooks
.decls
.omp_disregard_value_expr (decl
, true);
7107 unsigned nflags
= flags
;
7108 if (ctx
->target_map_pointers_as_0len_arrays
7109 || ctx
->target_map_scalars_firstprivate
)
7111 bool is_declare_target
= false;
7112 bool is_scalar
= false;
7113 if (is_global_var (decl
)
7114 && varpool_node::get_create (decl
)->offloadable
)
7116 struct gimplify_omp_ctx
*octx
;
7117 for (octx
= ctx
->outer_context
;
7118 octx
; octx
= octx
->outer_context
)
7120 n
= splay_tree_lookup (octx
->variables
,
7121 (splay_tree_key
)decl
);
7123 && (n
->value
& GOVD_DATA_SHARE_CLASS
) != GOVD_SHARED
7124 && (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
7127 is_declare_target
= octx
== NULL
;
7129 if (!is_declare_target
&& ctx
->target_map_scalars_firstprivate
)
7130 is_scalar
= lang_hooks
.decls
.omp_scalar_p (decl
);
7131 if (is_declare_target
)
7133 else if (ctx
->target_map_pointers_as_0len_arrays
7134 && (TREE_CODE (TREE_TYPE (decl
)) == POINTER_TYPE
7135 || (TREE_CODE (TREE_TYPE (decl
)) == REFERENCE_TYPE
7136 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl
)))
7138 nflags
|= GOVD_MAP
| GOVD_MAP_0LEN_ARRAY
;
7140 nflags
|= GOVD_FIRSTPRIVATE
;
7143 struct gimplify_omp_ctx
*octx
= ctx
->outer_context
;
7144 if ((ctx
->region_type
& ORT_ACC
) && octx
)
7146 /* Look in outer OpenACC contexts, to see if there's a
7147 data attribute for this variable. */
7148 omp_notice_variable (octx
, decl
, in_code
);
7150 for (; octx
; octx
= octx
->outer_context
)
7152 if (!(octx
->region_type
& (ORT_TARGET_DATA
| ORT_TARGET
)))
7155 = splay_tree_lookup (octx
->variables
,
7156 (splay_tree_key
) decl
);
7159 if (octx
->region_type
== ORT_ACC_HOST_DATA
)
7160 error ("variable %qE declared in enclosing "
7161 "%<host_data%> region", DECL_NAME (decl
));
7163 if (octx
->region_type
== ORT_ACC_DATA
7164 && (n2
->value
& GOVD_MAP_0LEN_ARRAY
))
7165 nflags
|= GOVD_MAP_0LEN_ARRAY
;
7172 tree type
= TREE_TYPE (decl
);
7175 && gimplify_omp_ctxp
->target_firstprivatize_array_bases
7176 && lang_hooks
.decls
.omp_privatize_by_reference (decl
))
7177 type
= TREE_TYPE (type
);
7179 && !lang_hooks
.types
.omp_mappable_type (type
))
7181 error ("%qD referenced in target region does not have "
7182 "a mappable type", decl
);
7183 nflags
|= GOVD_MAP
| GOVD_EXPLICIT
;
7185 else if (nflags
== flags
)
7187 if ((ctx
->region_type
& ORT_ACC
) != 0)
7188 nflags
= oacc_default_clause (ctx
, decl
, flags
);
7194 omp_add_variable (ctx
, decl
, nflags
);
7198 /* If nothing changed, there's nothing left to do. */
7199 if ((n
->value
& flags
) == flags
)
7209 if (ctx
->region_type
== ORT_WORKSHARE
7210 || ctx
->region_type
== ORT_SIMD
7211 || ctx
->region_type
== ORT_ACC
7212 || (ctx
->region_type
& ORT_TARGET_DATA
) != 0)
7215 flags
= omp_default_clause (ctx
, decl
, in_code
, flags
);
7217 if ((flags
& GOVD_PRIVATE
)
7218 && lang_hooks
.decls
.omp_private_outer_ref (decl
))
7219 flags
|= GOVD_PRIVATE_OUTER_REF
;
7221 omp_add_variable (ctx
, decl
, flags
);
7223 shared
= (flags
& GOVD_SHARED
) != 0;
7224 ret
= lang_hooks
.decls
.omp_disregard_value_expr (decl
, shared
);
7228 if ((n
->value
& (GOVD_SEEN
| GOVD_LOCAL
)) == 0
7229 && (flags
& (GOVD_SEEN
| GOVD_LOCAL
)) == GOVD_SEEN
7230 && DECL_SIZE (decl
))
7232 if (TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
7235 tree t
= DECL_VALUE_EXPR (decl
);
7236 gcc_assert (TREE_CODE (t
) == INDIRECT_REF
);
7237 t
= TREE_OPERAND (t
, 0);
7238 gcc_assert (DECL_P (t
));
7239 n2
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) t
);
7240 n2
->value
|= GOVD_SEEN
;
7242 else if (lang_hooks
.decls
.omp_privatize_by_reference (decl
)
7243 && TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
)))
7244 && (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
))))
7248 tree t
= TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
)));
7249 gcc_assert (DECL_P (t
));
7250 n2
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) t
);
7252 omp_notice_variable (ctx
, t
, true);
7256 shared
= ((flags
| n
->value
) & GOVD_SHARED
) != 0;
7257 ret
= lang_hooks
.decls
.omp_disregard_value_expr (decl
, shared
);
7259 /* If nothing changed, there's nothing left to do. */
7260 if ((n
->value
& flags
) == flags
)
7266 /* If the variable is private in the current context, then we don't
7267 need to propagate anything to an outer context. */
7268 if ((flags
& GOVD_PRIVATE
) && !(flags
& GOVD_PRIVATE_OUTER_REF
))
7270 if ((flags
& (GOVD_LINEAR
| GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
7271 == (GOVD_LINEAR
| GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
7273 if ((flags
& (GOVD_FIRSTPRIVATE
| GOVD_LASTPRIVATE
7274 | GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
7275 == (GOVD_LASTPRIVATE
| GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
7277 if (ctx
->outer_context
7278 && omp_notice_variable (ctx
->outer_context
, decl
, in_code
))
7283 /* Verify that DECL is private within CTX. If there's specific information
7284 to the contrary in the innermost scope, generate an error. */
7287 omp_is_private (struct gimplify_omp_ctx
*ctx
, tree decl
, int simd
)
7291 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
7294 if (n
->value
& GOVD_SHARED
)
7296 if (ctx
== gimplify_omp_ctxp
)
7299 error ("iteration variable %qE is predetermined linear",
7302 error ("iteration variable %qE should be private",
7304 n
->value
= GOVD_PRIVATE
;
7310 else if ((n
->value
& GOVD_EXPLICIT
) != 0
7311 && (ctx
== gimplify_omp_ctxp
7312 || (ctx
->region_type
== ORT_COMBINED_PARALLEL
7313 && gimplify_omp_ctxp
->outer_context
== ctx
)))
7315 if ((n
->value
& GOVD_FIRSTPRIVATE
) != 0)
7316 error ("iteration variable %qE should not be firstprivate",
7318 else if ((n
->value
& GOVD_REDUCTION
) != 0)
7319 error ("iteration variable %qE should not be reduction",
7321 else if (simd
== 0 && (n
->value
& GOVD_LINEAR
) != 0)
7322 error ("iteration variable %qE should not be linear",
7324 else if (simd
== 1 && (n
->value
& GOVD_LASTPRIVATE
) != 0)
7325 error ("iteration variable %qE should not be lastprivate",
7327 else if (simd
&& (n
->value
& GOVD_PRIVATE
) != 0)
7328 error ("iteration variable %qE should not be private",
7330 else if (simd
== 2 && (n
->value
& GOVD_LINEAR
) != 0)
7331 error ("iteration variable %qE is predetermined linear",
7334 return (ctx
== gimplify_omp_ctxp
7335 || (ctx
->region_type
== ORT_COMBINED_PARALLEL
7336 && gimplify_omp_ctxp
->outer_context
== ctx
));
7339 if (ctx
->region_type
!= ORT_WORKSHARE
7340 && ctx
->region_type
!= ORT_SIMD
7341 && ctx
->region_type
!= ORT_ACC
)
7343 else if (ctx
->outer_context
)
7344 return omp_is_private (ctx
->outer_context
, decl
, simd
);
7348 /* Return true if DECL is private within a parallel region
7349 that binds to the current construct's context or in parallel
7350 region's REDUCTION clause. */
7353 omp_check_private (struct gimplify_omp_ctx
*ctx
, tree decl
, bool copyprivate
)
7359 ctx
= ctx
->outer_context
;
7362 if (is_global_var (decl
))
7365 /* References might be private, but might be shared too,
7366 when checking for copyprivate, assume they might be
7367 private, otherwise assume they might be shared. */
7371 if (lang_hooks
.decls
.omp_privatize_by_reference (decl
))
7374 /* Treat C++ privatized non-static data members outside
7375 of the privatization the same. */
7376 if (omp_member_access_dummy_var (decl
))
7382 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7384 if ((ctx
->region_type
& (ORT_TARGET
| ORT_TARGET_DATA
)) != 0
7385 && (n
== NULL
|| (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0))
7390 if ((n
->value
& GOVD_LOCAL
) != 0
7391 && omp_member_access_dummy_var (decl
))
7393 return (n
->value
& GOVD_SHARED
) == 0;
7396 while (ctx
->region_type
== ORT_WORKSHARE
7397 || ctx
->region_type
== ORT_SIMD
7398 || ctx
->region_type
== ORT_ACC
);
7402 /* Callback for walk_tree to find a DECL_EXPR for the given DECL. */
7405 find_decl_expr (tree
*tp
, int *walk_subtrees
, void *data
)
7409 /* If this node has been visited, unmark it and keep looking. */
7410 if (TREE_CODE (t
) == DECL_EXPR
&& DECL_EXPR_DECL (t
) == (tree
) data
)
7413 if (IS_TYPE_OR_DECL_P (t
))
7418 /* Scan the OMP clauses in *LIST_P, installing mappings into a new
7419 and previous omp contexts. */
7422 gimplify_scan_omp_clauses (tree
*list_p
, gimple_seq
*pre_p
,
7423 enum omp_region_type region_type
,
7424 enum tree_code code
)
7426 struct gimplify_omp_ctx
*ctx
, *outer_ctx
;
7428 hash_map
<tree
, tree
> *struct_map_to_clause
= NULL
;
7429 tree
*prev_list_p
= NULL
;
7431 ctx
= new_omp_context (region_type
);
7432 outer_ctx
= ctx
->outer_context
;
7433 if (code
== OMP_TARGET
)
7435 if (!lang_GNU_Fortran ())
7436 ctx
->target_map_pointers_as_0len_arrays
= true;
7437 ctx
->target_map_scalars_firstprivate
= true;
7439 if (!lang_GNU_Fortran ())
7443 case OMP_TARGET_DATA
:
7444 case OMP_TARGET_ENTER_DATA
:
7445 case OMP_TARGET_EXIT_DATA
:
7447 case OACC_HOST_DATA
:
7448 ctx
->target_firstprivatize_array_bases
= true;
7453 while ((c
= *list_p
) != NULL
)
7455 bool remove
= false;
7456 bool notice_outer
= true;
7457 const char *check_non_private
= NULL
;
7461 switch (OMP_CLAUSE_CODE (c
))
7463 case OMP_CLAUSE_PRIVATE
:
7464 flags
= GOVD_PRIVATE
| GOVD_EXPLICIT
;
7465 if (lang_hooks
.decls
.omp_private_outer_ref (OMP_CLAUSE_DECL (c
)))
7467 flags
|= GOVD_PRIVATE_OUTER_REF
;
7468 OMP_CLAUSE_PRIVATE_OUTER_REF (c
) = 1;
7471 notice_outer
= false;
7473 case OMP_CLAUSE_SHARED
:
7474 flags
= GOVD_SHARED
| GOVD_EXPLICIT
;
7476 case OMP_CLAUSE_FIRSTPRIVATE
:
7477 flags
= GOVD_FIRSTPRIVATE
| GOVD_EXPLICIT
;
7478 check_non_private
= "firstprivate";
7480 case OMP_CLAUSE_LASTPRIVATE
:
7481 flags
= GOVD_LASTPRIVATE
| GOVD_SEEN
| GOVD_EXPLICIT
;
7482 check_non_private
= "lastprivate";
7483 decl
= OMP_CLAUSE_DECL (c
);
7484 if (error_operand_p (decl
))
7487 && (outer_ctx
->region_type
== ORT_COMBINED_PARALLEL
7488 || outer_ctx
->region_type
== ORT_COMBINED_TEAMS
)
7489 && splay_tree_lookup (outer_ctx
->variables
,
7490 (splay_tree_key
) decl
) == NULL
)
7492 omp_add_variable (outer_ctx
, decl
, GOVD_SHARED
| GOVD_SEEN
);
7493 if (outer_ctx
->outer_context
)
7494 omp_notice_variable (outer_ctx
->outer_context
, decl
, true);
7497 && (outer_ctx
->region_type
& ORT_TASK
) != 0
7498 && outer_ctx
->combined_loop
7499 && splay_tree_lookup (outer_ctx
->variables
,
7500 (splay_tree_key
) decl
) == NULL
)
7502 omp_add_variable (outer_ctx
, decl
, GOVD_LASTPRIVATE
| GOVD_SEEN
);
7503 if (outer_ctx
->outer_context
)
7504 omp_notice_variable (outer_ctx
->outer_context
, decl
, true);
7507 && (outer_ctx
->region_type
== ORT_WORKSHARE
7508 || outer_ctx
->region_type
== ORT_ACC
)
7509 && outer_ctx
->combined_loop
7510 && splay_tree_lookup (outer_ctx
->variables
,
7511 (splay_tree_key
) decl
) == NULL
7512 && !omp_check_private (outer_ctx
, decl
, false))
7514 omp_add_variable (outer_ctx
, decl
, GOVD_LASTPRIVATE
| GOVD_SEEN
);
7515 if (outer_ctx
->outer_context
7516 && (outer_ctx
->outer_context
->region_type
7517 == ORT_COMBINED_PARALLEL
)
7518 && splay_tree_lookup (outer_ctx
->outer_context
->variables
,
7519 (splay_tree_key
) decl
) == NULL
)
7521 struct gimplify_omp_ctx
*octx
= outer_ctx
->outer_context
;
7522 omp_add_variable (octx
, decl
, GOVD_SHARED
| GOVD_SEEN
);
7523 if (octx
->outer_context
)
7525 octx
= octx
->outer_context
;
7526 if (octx
->region_type
== ORT_WORKSHARE
7527 && octx
->combined_loop
7528 && splay_tree_lookup (octx
->variables
,
7529 (splay_tree_key
) decl
) == NULL
7530 && !omp_check_private (octx
, decl
, false))
7532 omp_add_variable (octx
, decl
,
7533 GOVD_LASTPRIVATE
| GOVD_SEEN
);
7534 octx
= octx
->outer_context
;
7536 && octx
->region_type
== ORT_COMBINED_TEAMS
7537 && (splay_tree_lookup (octx
->variables
,
7538 (splay_tree_key
) decl
)
7541 omp_add_variable (octx
, decl
,
7542 GOVD_SHARED
| GOVD_SEEN
);
7543 octx
= octx
->outer_context
;
7547 omp_notice_variable (octx
, decl
, true);
7550 else if (outer_ctx
->outer_context
)
7551 omp_notice_variable (outer_ctx
->outer_context
, decl
, true);
7554 case OMP_CLAUSE_REDUCTION
:
7555 flags
= GOVD_REDUCTION
| GOVD_SEEN
| GOVD_EXPLICIT
;
7556 /* OpenACC permits reductions on private variables. */
7557 if (!(region_type
& ORT_ACC
))
7558 check_non_private
= "reduction";
7559 decl
= OMP_CLAUSE_DECL (c
);
7560 if (TREE_CODE (decl
) == MEM_REF
)
7562 tree type
= TREE_TYPE (decl
);
7563 if (gimplify_expr (&TYPE_MAX_VALUE (TYPE_DOMAIN (type
)), pre_p
,
7564 NULL
, is_gimple_val
, fb_rvalue
, false)
7570 tree v
= TYPE_MAX_VALUE (TYPE_DOMAIN (type
));
7573 omp_firstprivatize_variable (ctx
, v
);
7574 omp_notice_variable (ctx
, v
, true);
7576 decl
= TREE_OPERAND (decl
, 0);
7577 if (TREE_CODE (decl
) == POINTER_PLUS_EXPR
)
7579 if (gimplify_expr (&TREE_OPERAND (decl
, 1), pre_p
,
7580 NULL
, is_gimple_val
, fb_rvalue
, false)
7586 v
= TREE_OPERAND (decl
, 1);
7589 omp_firstprivatize_variable (ctx
, v
);
7590 omp_notice_variable (ctx
, v
, true);
7592 decl
= TREE_OPERAND (decl
, 0);
7594 if (TREE_CODE (decl
) == ADDR_EXPR
7595 || TREE_CODE (decl
) == INDIRECT_REF
)
7596 decl
= TREE_OPERAND (decl
, 0);
7599 case OMP_CLAUSE_LINEAR
:
7600 if (gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c
), pre_p
, NULL
,
7601 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7608 if (code
== OMP_SIMD
7609 && !OMP_CLAUSE_LINEAR_NO_COPYIN (c
))
7611 struct gimplify_omp_ctx
*octx
= outer_ctx
;
7613 && octx
->region_type
== ORT_WORKSHARE
7614 && octx
->combined_loop
7615 && !octx
->distribute
)
7617 if (octx
->outer_context
7618 && (octx
->outer_context
->region_type
7619 == ORT_COMBINED_PARALLEL
))
7620 octx
= octx
->outer_context
->outer_context
;
7622 octx
= octx
->outer_context
;
7625 && octx
->region_type
== ORT_WORKSHARE
7626 && octx
->combined_loop
7627 && octx
->distribute
)
7629 error_at (OMP_CLAUSE_LOCATION (c
),
7630 "%<linear%> clause for variable other than "
7631 "loop iterator specified on construct "
7632 "combined with %<distribute%>");
7637 /* For combined #pragma omp parallel for simd, need to put
7638 lastprivate and perhaps firstprivate too on the
7639 parallel. Similarly for #pragma omp for simd. */
7640 struct gimplify_omp_ctx
*octx
= outer_ctx
;
7644 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c
)
7645 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
7647 decl
= OMP_CLAUSE_DECL (c
);
7648 if (error_operand_p (decl
))
7654 if (!OMP_CLAUSE_LINEAR_NO_COPYIN (c
))
7655 flags
|= GOVD_FIRSTPRIVATE
;
7656 if (!OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
7657 flags
|= GOVD_LASTPRIVATE
;
7659 && octx
->region_type
== ORT_WORKSHARE
7660 && octx
->combined_loop
)
7662 if (octx
->outer_context
7663 && (octx
->outer_context
->region_type
7664 == ORT_COMBINED_PARALLEL
))
7665 octx
= octx
->outer_context
;
7666 else if (omp_check_private (octx
, decl
, false))
7670 && (octx
->region_type
& ORT_TASK
) != 0
7671 && octx
->combined_loop
)
7674 && octx
->region_type
== ORT_COMBINED_PARALLEL
7675 && ctx
->region_type
== ORT_WORKSHARE
7676 && octx
== outer_ctx
)
7677 flags
= GOVD_SEEN
| GOVD_SHARED
;
7679 && octx
->region_type
== ORT_COMBINED_TEAMS
)
7680 flags
= GOVD_SEEN
| GOVD_SHARED
;
7682 && octx
->region_type
== ORT_COMBINED_TARGET
)
7684 flags
&= ~GOVD_LASTPRIVATE
;
7685 if (flags
== GOVD_SEEN
)
7691 = splay_tree_lookup (octx
->variables
,
7692 (splay_tree_key
) decl
);
7693 if (on
&& (on
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
7698 omp_add_variable (octx
, decl
, flags
);
7699 if (octx
->outer_context
== NULL
)
7701 octx
= octx
->outer_context
;
7706 && (!OMP_CLAUSE_LINEAR_NO_COPYIN (c
)
7707 || !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
)))
7708 omp_notice_variable (octx
, decl
, true);
7710 flags
= GOVD_LINEAR
| GOVD_EXPLICIT
;
7711 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c
)
7712 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
7714 notice_outer
= false;
7715 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
7719 case OMP_CLAUSE_MAP
:
7720 decl
= OMP_CLAUSE_DECL (c
);
7721 if (error_operand_p (decl
))
7728 if (TREE_CODE (TREE_TYPE (decl
)) != ARRAY_TYPE
)
7731 case OMP_TARGET_DATA
:
7732 case OMP_TARGET_ENTER_DATA
:
7733 case OMP_TARGET_EXIT_DATA
:
7734 case OACC_ENTER_DATA
:
7735 case OACC_EXIT_DATA
:
7736 case OACC_HOST_DATA
:
7737 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
7738 || (OMP_CLAUSE_MAP_KIND (c
)
7739 == GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
7740 /* For target {,enter ,exit }data only the array slice is
7741 mapped, but not the pointer to it. */
7749 if (DECL_P (decl
) && outer_ctx
&& (region_type
& ORT_ACC
))
7751 struct gimplify_omp_ctx
*octx
;
7752 for (octx
= outer_ctx
; octx
; octx
= octx
->outer_context
)
7754 if (octx
->region_type
!= ORT_ACC_HOST_DATA
)
7757 = splay_tree_lookup (octx
->variables
,
7758 (splay_tree_key
) decl
);
7760 error_at (OMP_CLAUSE_LOCATION (c
), "variable %qE "
7761 "declared in enclosing %<host_data%> region",
7765 if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
7766 OMP_CLAUSE_SIZE (c
) = DECL_P (decl
) ? DECL_SIZE_UNIT (decl
)
7767 : TYPE_SIZE_UNIT (TREE_TYPE (decl
));
7768 if (gimplify_expr (&OMP_CLAUSE_SIZE (c
), pre_p
,
7769 NULL
, is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7774 else if ((OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
7775 || (OMP_CLAUSE_MAP_KIND (c
)
7776 == GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
7777 && TREE_CODE (OMP_CLAUSE_SIZE (c
)) != INTEGER_CST
)
7780 = get_initialized_tmp_var (OMP_CLAUSE_SIZE (c
), pre_p
, NULL
,
7782 omp_add_variable (ctx
, OMP_CLAUSE_SIZE (c
),
7783 GOVD_FIRSTPRIVATE
| GOVD_SEEN
);
7788 if (TREE_CODE (d
) == ARRAY_REF
)
7790 while (TREE_CODE (d
) == ARRAY_REF
)
7791 d
= TREE_OPERAND (d
, 0);
7792 if (TREE_CODE (d
) == COMPONENT_REF
7793 && TREE_CODE (TREE_TYPE (d
)) == ARRAY_TYPE
)
7796 pd
= &OMP_CLAUSE_DECL (c
);
7798 && TREE_CODE (decl
) == INDIRECT_REF
7799 && TREE_CODE (TREE_OPERAND (decl
, 0)) == COMPONENT_REF
7800 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl
, 0)))
7803 pd
= &TREE_OPERAND (decl
, 0);
7804 decl
= TREE_OPERAND (decl
, 0);
7806 if (TREE_CODE (decl
) == COMPONENT_REF
)
7808 while (TREE_CODE (decl
) == COMPONENT_REF
)
7809 decl
= TREE_OPERAND (decl
, 0);
7810 if (TREE_CODE (decl
) == INDIRECT_REF
7811 && DECL_P (TREE_OPERAND (decl
, 0))
7812 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl
, 0)))
7814 decl
= TREE_OPERAND (decl
, 0);
7816 if (gimplify_expr (pd
, pre_p
, NULL
, is_gimple_lvalue
, fb_lvalue
)
7824 if (error_operand_p (decl
))
7830 tree stype
= TREE_TYPE (decl
);
7831 if (TREE_CODE (stype
) == REFERENCE_TYPE
)
7832 stype
= TREE_TYPE (stype
);
7833 if (TYPE_SIZE_UNIT (stype
) == NULL
7834 || TREE_CODE (TYPE_SIZE_UNIT (stype
)) != INTEGER_CST
)
7836 error_at (OMP_CLAUSE_LOCATION (c
),
7837 "mapping field %qE of variable length "
7838 "structure", OMP_CLAUSE_DECL (c
));
7843 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_POINTER
)
7845 /* Error recovery. */
7846 if (prev_list_p
== NULL
)
7851 if (OMP_CLAUSE_CHAIN (*prev_list_p
) != c
)
7853 tree ch
= OMP_CLAUSE_CHAIN (*prev_list_p
);
7854 if (ch
== NULL_TREE
|| OMP_CLAUSE_CHAIN (ch
) != c
)
7863 HOST_WIDE_INT bitsize
, bitpos
;
7865 int unsignedp
, reversep
, volatilep
= 0;
7866 tree base
= OMP_CLAUSE_DECL (c
);
7867 while (TREE_CODE (base
) == ARRAY_REF
)
7868 base
= TREE_OPERAND (base
, 0);
7869 if (TREE_CODE (base
) == INDIRECT_REF
)
7870 base
= TREE_OPERAND (base
, 0);
7871 base
= get_inner_reference (base
, &bitsize
, &bitpos
, &offset
,
7872 &mode
, &unsignedp
, &reversep
,
7874 tree orig_base
= base
;
7875 if ((TREE_CODE (base
) == INDIRECT_REF
7876 || (TREE_CODE (base
) == MEM_REF
7877 && integer_zerop (TREE_OPERAND (base
, 1))))
7878 && DECL_P (TREE_OPERAND (base
, 0))
7879 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (base
, 0)))
7881 base
= TREE_OPERAND (base
, 0);
7882 gcc_assert (base
== decl
7883 && (offset
== NULL_TREE
7884 || TREE_CODE (offset
) == INTEGER_CST
));
7887 = splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
7888 bool ptr
= (OMP_CLAUSE_MAP_KIND (c
)
7889 == GOMP_MAP_ALWAYS_POINTER
);
7890 if (n
== NULL
|| (n
->value
& GOVD_MAP
) == 0)
7892 tree l
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7894 OMP_CLAUSE_SET_MAP_KIND (l
, GOMP_MAP_STRUCT
);
7895 if (orig_base
!= base
)
7896 OMP_CLAUSE_DECL (l
) = unshare_expr (orig_base
);
7898 OMP_CLAUSE_DECL (l
) = decl
;
7899 OMP_CLAUSE_SIZE (l
) = size_int (1);
7900 if (struct_map_to_clause
== NULL
)
7901 struct_map_to_clause
= new hash_map
<tree
, tree
>;
7902 struct_map_to_clause
->put (decl
, l
);
7905 enum gomp_map_kind mkind
7906 = code
== OMP_TARGET_EXIT_DATA
7907 ? GOMP_MAP_RELEASE
: GOMP_MAP_ALLOC
;
7908 tree c2
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7910 OMP_CLAUSE_SET_MAP_KIND (c2
, mkind
);
7911 OMP_CLAUSE_DECL (c2
)
7912 = unshare_expr (OMP_CLAUSE_DECL (c
));
7913 OMP_CLAUSE_CHAIN (c2
) = *prev_list_p
;
7914 OMP_CLAUSE_SIZE (c2
)
7915 = TYPE_SIZE_UNIT (ptr_type_node
);
7916 OMP_CLAUSE_CHAIN (l
) = c2
;
7917 if (OMP_CLAUSE_CHAIN (*prev_list_p
) != c
)
7919 tree c4
= OMP_CLAUSE_CHAIN (*prev_list_p
);
7921 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7923 OMP_CLAUSE_SET_MAP_KIND (c3
, mkind
);
7924 OMP_CLAUSE_DECL (c3
)
7925 = unshare_expr (OMP_CLAUSE_DECL (c4
));
7926 OMP_CLAUSE_SIZE (c3
)
7927 = TYPE_SIZE_UNIT (ptr_type_node
);
7928 OMP_CLAUSE_CHAIN (c3
) = *prev_list_p
;
7929 OMP_CLAUSE_CHAIN (c2
) = c3
;
7936 OMP_CLAUSE_CHAIN (l
) = c
;
7938 list_p
= &OMP_CLAUSE_CHAIN (l
);
7940 if (orig_base
!= base
&& code
== OMP_TARGET
)
7942 tree c2
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7944 enum gomp_map_kind mkind
7945 = GOMP_MAP_FIRSTPRIVATE_REFERENCE
;
7946 OMP_CLAUSE_SET_MAP_KIND (c2
, mkind
);
7947 OMP_CLAUSE_DECL (c2
) = decl
;
7948 OMP_CLAUSE_SIZE (c2
) = size_zero_node
;
7949 OMP_CLAUSE_CHAIN (c2
) = OMP_CLAUSE_CHAIN (l
);
7950 OMP_CLAUSE_CHAIN (l
) = c2
;
7952 flags
= GOVD_MAP
| GOVD_EXPLICIT
;
7953 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c
)) || ptr
)
7959 tree
*osc
= struct_map_to_clause
->get (decl
);
7960 tree
*sc
= NULL
, *scp
= NULL
;
7961 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c
)) || ptr
)
7962 n
->value
|= GOVD_SEEN
;
7965 o1
= wi::to_offset (offset
);
7969 o1
= o1
+ bitpos
/ BITS_PER_UNIT
;
7970 sc
= &OMP_CLAUSE_CHAIN (*osc
);
7972 && (OMP_CLAUSE_MAP_KIND (*sc
)
7973 == GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
7974 sc
= &OMP_CLAUSE_CHAIN (*sc
);
7975 for (; *sc
!= c
; sc
= &OMP_CLAUSE_CHAIN (*sc
))
7976 if (ptr
&& sc
== prev_list_p
)
7978 else if (TREE_CODE (OMP_CLAUSE_DECL (*sc
))
7980 && (TREE_CODE (OMP_CLAUSE_DECL (*sc
))
7982 && (TREE_CODE (OMP_CLAUSE_DECL (*sc
))
7988 HOST_WIDE_INT bitsize2
, bitpos2
;
7989 base
= OMP_CLAUSE_DECL (*sc
);
7990 if (TREE_CODE (base
) == ARRAY_REF
)
7992 while (TREE_CODE (base
) == ARRAY_REF
)
7993 base
= TREE_OPERAND (base
, 0);
7994 if (TREE_CODE (base
) != COMPONENT_REF
7995 || (TREE_CODE (TREE_TYPE (base
))
7999 else if (TREE_CODE (base
) == INDIRECT_REF
8000 && (TREE_CODE (TREE_OPERAND (base
, 0))
8002 && (TREE_CODE (TREE_TYPE
8003 (TREE_OPERAND (base
, 0)))
8005 base
= TREE_OPERAND (base
, 0);
8006 base
= get_inner_reference (base
, &bitsize2
,
8009 &reversep
, &volatilep
);
8010 if ((TREE_CODE (base
) == INDIRECT_REF
8011 || (TREE_CODE (base
) == MEM_REF
8012 && integer_zerop (TREE_OPERAND (base
,
8014 && DECL_P (TREE_OPERAND (base
, 0))
8015 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (base
,
8018 base
= TREE_OPERAND (base
, 0);
8023 gcc_assert (offset
== NULL_TREE
8024 || TREE_CODE (offset
) == INTEGER_CST
);
8025 tree d1
= OMP_CLAUSE_DECL (*sc
);
8026 tree d2
= OMP_CLAUSE_DECL (c
);
8027 while (TREE_CODE (d1
) == ARRAY_REF
)
8028 d1
= TREE_OPERAND (d1
, 0);
8029 while (TREE_CODE (d2
) == ARRAY_REF
)
8030 d2
= TREE_OPERAND (d2
, 0);
8031 if (TREE_CODE (d1
) == INDIRECT_REF
)
8032 d1
= TREE_OPERAND (d1
, 0);
8033 if (TREE_CODE (d2
) == INDIRECT_REF
)
8034 d2
= TREE_OPERAND (d2
, 0);
8035 while (TREE_CODE (d1
) == COMPONENT_REF
)
8036 if (TREE_CODE (d2
) == COMPONENT_REF
8037 && TREE_OPERAND (d1
, 1)
8038 == TREE_OPERAND (d2
, 1))
8040 d1
= TREE_OPERAND (d1
, 0);
8041 d2
= TREE_OPERAND (d2
, 0);
8047 error_at (OMP_CLAUSE_LOCATION (c
),
8048 "%qE appears more than once in map "
8049 "clauses", OMP_CLAUSE_DECL (c
));
8054 o2
= wi::to_offset (offset2
);
8058 o2
= o2
+ bitpos2
/ BITS_PER_UNIT
;
8059 if (wi::ltu_p (o1
, o2
)
8060 || (wi::eq_p (o1
, o2
) && bitpos
< bitpos2
))
8070 OMP_CLAUSE_SIZE (*osc
)
8071 = size_binop (PLUS_EXPR
, OMP_CLAUSE_SIZE (*osc
),
8075 tree c2
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
8077 tree cl
= NULL_TREE
;
8078 enum gomp_map_kind mkind
8079 = code
== OMP_TARGET_EXIT_DATA
8080 ? GOMP_MAP_RELEASE
: GOMP_MAP_ALLOC
;
8081 OMP_CLAUSE_SET_MAP_KIND (c2
, mkind
);
8082 OMP_CLAUSE_DECL (c2
)
8083 = unshare_expr (OMP_CLAUSE_DECL (c
));
8084 OMP_CLAUSE_CHAIN (c2
) = scp
? *scp
: *prev_list_p
;
8085 OMP_CLAUSE_SIZE (c2
)
8086 = TYPE_SIZE_UNIT (ptr_type_node
);
8087 cl
= scp
? *prev_list_p
: c2
;
8088 if (OMP_CLAUSE_CHAIN (*prev_list_p
) != c
)
8090 tree c4
= OMP_CLAUSE_CHAIN (*prev_list_p
);
8092 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
8094 OMP_CLAUSE_SET_MAP_KIND (c3
, mkind
);
8095 OMP_CLAUSE_DECL (c3
)
8096 = unshare_expr (OMP_CLAUSE_DECL (c4
));
8097 OMP_CLAUSE_SIZE (c3
)
8098 = TYPE_SIZE_UNIT (ptr_type_node
);
8099 OMP_CLAUSE_CHAIN (c3
) = *prev_list_p
;
8101 OMP_CLAUSE_CHAIN (c2
) = c3
;
8107 if (sc
== prev_list_p
)
8114 *prev_list_p
= OMP_CLAUSE_CHAIN (c
);
8115 list_p
= prev_list_p
;
8117 OMP_CLAUSE_CHAIN (c
) = *sc
;
8124 *list_p
= OMP_CLAUSE_CHAIN (c
);
8125 OMP_CLAUSE_CHAIN (c
) = *sc
;
8132 && OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_ALWAYS_POINTER
8133 && OMP_CLAUSE_CHAIN (c
)
8134 && OMP_CLAUSE_CODE (OMP_CLAUSE_CHAIN (c
)) == OMP_CLAUSE_MAP
8135 && (OMP_CLAUSE_MAP_KIND (OMP_CLAUSE_CHAIN (c
))
8136 == GOMP_MAP_ALWAYS_POINTER
))
8137 prev_list_p
= list_p
;
8140 flags
= GOVD_MAP
| GOVD_EXPLICIT
;
8141 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_TO
8142 || OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_TOFROM
)
8143 flags
|= GOVD_MAP_ALWAYS_TO
;
8146 case OMP_CLAUSE_DEPEND
:
8147 if (OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SINK
)
8149 tree deps
= OMP_CLAUSE_DECL (c
);
8150 while (deps
&& TREE_CODE (deps
) == TREE_LIST
)
8152 if (TREE_CODE (TREE_PURPOSE (deps
)) == TRUNC_DIV_EXPR
8153 && DECL_P (TREE_OPERAND (TREE_PURPOSE (deps
), 1)))
8154 gimplify_expr (&TREE_OPERAND (TREE_PURPOSE (deps
), 1),
8155 pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
8156 deps
= TREE_CHAIN (deps
);
8160 else if (OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SOURCE
)
8162 if (TREE_CODE (OMP_CLAUSE_DECL (c
)) == COMPOUND_EXPR
)
8164 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (c
), 0), pre_p
,
8165 NULL
, is_gimple_val
, fb_rvalue
);
8166 OMP_CLAUSE_DECL (c
) = TREE_OPERAND (OMP_CLAUSE_DECL (c
), 1);
8168 if (error_operand_p (OMP_CLAUSE_DECL (c
)))
8173 OMP_CLAUSE_DECL (c
) = build_fold_addr_expr (OMP_CLAUSE_DECL (c
));
8174 if (gimplify_expr (&OMP_CLAUSE_DECL (c
), pre_p
, NULL
,
8175 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
8183 case OMP_CLAUSE_FROM
:
8184 case OMP_CLAUSE__CACHE_
:
8185 decl
= OMP_CLAUSE_DECL (c
);
8186 if (error_operand_p (decl
))
8191 if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
8192 OMP_CLAUSE_SIZE (c
) = DECL_P (decl
) ? DECL_SIZE_UNIT (decl
)
8193 : TYPE_SIZE_UNIT (TREE_TYPE (decl
));
8194 if (gimplify_expr (&OMP_CLAUSE_SIZE (c
), pre_p
,
8195 NULL
, is_gimple_val
, fb_rvalue
) == GS_ERROR
)
8202 if (gimplify_expr (&OMP_CLAUSE_DECL (c
), pre_p
,
8203 NULL
, is_gimple_lvalue
, fb_lvalue
)
8213 case OMP_CLAUSE_USE_DEVICE_PTR
:
8214 flags
= GOVD_FIRSTPRIVATE
| GOVD_EXPLICIT
;
8216 case OMP_CLAUSE_IS_DEVICE_PTR
:
8217 flags
= GOVD_FIRSTPRIVATE
| GOVD_EXPLICIT
;
8221 decl
= OMP_CLAUSE_DECL (c
);
8223 if (error_operand_p (decl
))
8228 if (DECL_NAME (decl
) == NULL_TREE
&& (flags
& GOVD_SHARED
) == 0)
8230 tree t
= omp_member_access_dummy_var (decl
);
8233 tree v
= DECL_VALUE_EXPR (decl
);
8234 DECL_NAME (decl
) = DECL_NAME (TREE_OPERAND (v
, 1));
8236 omp_notice_variable (outer_ctx
, t
, true);
8239 if (code
== OACC_DATA
8240 && OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_MAP
8241 && OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
)
8242 flags
|= GOVD_MAP_0LEN_ARRAY
;
8243 omp_add_variable (ctx
, decl
, flags
);
8244 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_REDUCTION
8245 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c
))
8247 omp_add_variable (ctx
, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c
),
8248 GOVD_LOCAL
| GOVD_SEEN
);
8249 if (OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c
)
8250 && walk_tree (&OMP_CLAUSE_REDUCTION_INIT (c
),
8252 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c
),
8254 omp_add_variable (ctx
,
8255 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c
),
8256 GOVD_LOCAL
| GOVD_SEEN
);
8257 gimplify_omp_ctxp
= ctx
;
8258 push_gimplify_context ();
8260 OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c
) = NULL
;
8261 OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c
) = NULL
;
8263 gimplify_and_add (OMP_CLAUSE_REDUCTION_INIT (c
),
8264 &OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c
));
8265 pop_gimplify_context
8266 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c
)));
8267 push_gimplify_context ();
8268 gimplify_and_add (OMP_CLAUSE_REDUCTION_MERGE (c
),
8269 &OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c
));
8270 pop_gimplify_context
8271 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c
)));
8272 OMP_CLAUSE_REDUCTION_INIT (c
) = NULL_TREE
;
8273 OMP_CLAUSE_REDUCTION_MERGE (c
) = NULL_TREE
;
8275 gimplify_omp_ctxp
= outer_ctx
;
8277 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
8278 && OMP_CLAUSE_LASTPRIVATE_STMT (c
))
8280 gimplify_omp_ctxp
= ctx
;
8281 push_gimplify_context ();
8282 if (TREE_CODE (OMP_CLAUSE_LASTPRIVATE_STMT (c
)) != BIND_EXPR
)
8284 tree bind
= build3 (BIND_EXPR
, void_type_node
, NULL
,
8286 TREE_SIDE_EFFECTS (bind
) = 1;
8287 BIND_EXPR_BODY (bind
) = OMP_CLAUSE_LASTPRIVATE_STMT (c
);
8288 OMP_CLAUSE_LASTPRIVATE_STMT (c
) = bind
;
8290 gimplify_and_add (OMP_CLAUSE_LASTPRIVATE_STMT (c
),
8291 &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
));
8292 pop_gimplify_context
8293 (gimple_seq_first_stmt (OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
)));
8294 OMP_CLAUSE_LASTPRIVATE_STMT (c
) = NULL_TREE
;
8296 gimplify_omp_ctxp
= outer_ctx
;
8298 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
8299 && OMP_CLAUSE_LINEAR_STMT (c
))
8301 gimplify_omp_ctxp
= ctx
;
8302 push_gimplify_context ();
8303 if (TREE_CODE (OMP_CLAUSE_LINEAR_STMT (c
)) != BIND_EXPR
)
8305 tree bind
= build3 (BIND_EXPR
, void_type_node
, NULL
,
8307 TREE_SIDE_EFFECTS (bind
) = 1;
8308 BIND_EXPR_BODY (bind
) = OMP_CLAUSE_LINEAR_STMT (c
);
8309 OMP_CLAUSE_LINEAR_STMT (c
) = bind
;
8311 gimplify_and_add (OMP_CLAUSE_LINEAR_STMT (c
),
8312 &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
));
8313 pop_gimplify_context
8314 (gimple_seq_first_stmt (OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
)));
8315 OMP_CLAUSE_LINEAR_STMT (c
) = NULL_TREE
;
8317 gimplify_omp_ctxp
= outer_ctx
;
8323 case OMP_CLAUSE_COPYIN
:
8324 case OMP_CLAUSE_COPYPRIVATE
:
8325 decl
= OMP_CLAUSE_DECL (c
);
8326 if (error_operand_p (decl
))
8331 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_COPYPRIVATE
8333 && !omp_check_private (ctx
, decl
, true))
8336 if (is_global_var (decl
))
8338 if (DECL_THREAD_LOCAL_P (decl
))
8340 else if (DECL_HAS_VALUE_EXPR_P (decl
))
8342 tree value
= get_base_address (DECL_VALUE_EXPR (decl
));
8346 && DECL_THREAD_LOCAL_P (value
))
8351 error_at (OMP_CLAUSE_LOCATION (c
),
8352 "copyprivate variable %qE is not threadprivate"
8353 " or private in outer context", DECL_NAME (decl
));
8357 omp_notice_variable (outer_ctx
, decl
, true);
8358 if (check_non_private
8359 && region_type
== ORT_WORKSHARE
8360 && (OMP_CLAUSE_CODE (c
) != OMP_CLAUSE_REDUCTION
8361 || decl
== OMP_CLAUSE_DECL (c
)
8362 || (TREE_CODE (OMP_CLAUSE_DECL (c
)) == MEM_REF
8363 && (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c
), 0))
8365 || (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c
), 0))
8366 == POINTER_PLUS_EXPR
8367 && (TREE_CODE (TREE_OPERAND (TREE_OPERAND
8368 (OMP_CLAUSE_DECL (c
), 0), 0))
8370 && omp_check_private (ctx
, decl
, false))
8372 error ("%s variable %qE is private in outer context",
8373 check_non_private
, DECL_NAME (decl
));
8379 if (OMP_CLAUSE_IF_MODIFIER (c
) != ERROR_MARK
8380 && OMP_CLAUSE_IF_MODIFIER (c
) != code
)
8383 for (int i
= 0; i
< 2; i
++)
8384 switch (i
? OMP_CLAUSE_IF_MODIFIER (c
) : code
)
8386 case OMP_PARALLEL
: p
[i
] = "parallel"; break;
8387 case OMP_TASK
: p
[i
] = "task"; break;
8388 case OMP_TASKLOOP
: p
[i
] = "taskloop"; break;
8389 case OMP_TARGET_DATA
: p
[i
] = "target data"; break;
8390 case OMP_TARGET
: p
[i
] = "target"; break;
8391 case OMP_TARGET_UPDATE
: p
[i
] = "target update"; break;
8392 case OMP_TARGET_ENTER_DATA
:
8393 p
[i
] = "target enter data"; break;
8394 case OMP_TARGET_EXIT_DATA
: p
[i
] = "target exit data"; break;
8395 default: gcc_unreachable ();
8397 error_at (OMP_CLAUSE_LOCATION (c
),
8398 "expected %qs %<if%> clause modifier rather than %qs",
8404 case OMP_CLAUSE_FINAL
:
8405 OMP_CLAUSE_OPERAND (c
, 0)
8406 = gimple_boolify (OMP_CLAUSE_OPERAND (c
, 0));
8409 case OMP_CLAUSE_SCHEDULE
:
8410 case OMP_CLAUSE_NUM_THREADS
:
8411 case OMP_CLAUSE_NUM_TEAMS
:
8412 case OMP_CLAUSE_THREAD_LIMIT
:
8413 case OMP_CLAUSE_DIST_SCHEDULE
:
8414 case OMP_CLAUSE_DEVICE
:
8415 case OMP_CLAUSE_PRIORITY
:
8416 case OMP_CLAUSE_GRAINSIZE
:
8417 case OMP_CLAUSE_NUM_TASKS
:
8418 case OMP_CLAUSE_HINT
:
8419 case OMP_CLAUSE__CILK_FOR_COUNT_
:
8420 case OMP_CLAUSE_ASYNC
:
8421 case OMP_CLAUSE_WAIT
:
8422 case OMP_CLAUSE_NUM_GANGS
:
8423 case OMP_CLAUSE_NUM_WORKERS
:
8424 case OMP_CLAUSE_VECTOR_LENGTH
:
8425 case OMP_CLAUSE_WORKER
:
8426 case OMP_CLAUSE_VECTOR
:
8427 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c
, 0), pre_p
, NULL
,
8428 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
8432 case OMP_CLAUSE_GANG
:
8433 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c
, 0), pre_p
, NULL
,
8434 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
8436 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c
, 1), pre_p
, NULL
,
8437 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
8441 case OMP_CLAUSE_NOWAIT
:
8442 case OMP_CLAUSE_ORDERED
:
8443 case OMP_CLAUSE_UNTIED
:
8444 case OMP_CLAUSE_COLLAPSE
:
8445 case OMP_CLAUSE_TILE
:
8446 case OMP_CLAUSE_AUTO
:
8447 case OMP_CLAUSE_SEQ
:
8448 case OMP_CLAUSE_INDEPENDENT
:
8449 case OMP_CLAUSE_MERGEABLE
:
8450 case OMP_CLAUSE_PROC_BIND
:
8451 case OMP_CLAUSE_SAFELEN
:
8452 case OMP_CLAUSE_SIMDLEN
:
8453 case OMP_CLAUSE_NOGROUP
:
8454 case OMP_CLAUSE_THREADS
:
8455 case OMP_CLAUSE_SIMD
:
8458 case OMP_CLAUSE_DEFAULTMAP
:
8459 ctx
->target_map_scalars_firstprivate
= false;
8462 case OMP_CLAUSE_ALIGNED
:
8463 decl
= OMP_CLAUSE_DECL (c
);
8464 if (error_operand_p (decl
))
8469 if (gimplify_expr (&OMP_CLAUSE_ALIGNED_ALIGNMENT (c
), pre_p
, NULL
,
8470 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
8475 if (!is_global_var (decl
)
8476 && TREE_CODE (TREE_TYPE (decl
)) == POINTER_TYPE
)
8477 omp_add_variable (ctx
, decl
, GOVD_ALIGNED
);
8480 case OMP_CLAUSE_DEFAULT
:
8481 ctx
->default_kind
= OMP_CLAUSE_DEFAULT_KIND (c
);
8488 if (code
== OACC_DATA
8489 && OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_MAP
8490 && OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
)
8493 *list_p
= OMP_CLAUSE_CHAIN (c
);
8495 list_p
= &OMP_CLAUSE_CHAIN (c
);
8498 gimplify_omp_ctxp
= ctx
;
8499 if (struct_map_to_clause
)
8500 delete struct_map_to_clause
;
8503 /* Return true if DECL is a candidate for shared to firstprivate
8504 optimization. We only consider non-addressable scalars, not
8505 too big, and not references. */
8508 omp_shared_to_firstprivate_optimizable_decl_p (tree decl
)
8510 if (TREE_ADDRESSABLE (decl
))
8512 tree type
= TREE_TYPE (decl
);
8513 if (!is_gimple_reg_type (type
)
8514 || TREE_CODE (type
) == REFERENCE_TYPE
8515 || TREE_ADDRESSABLE (type
))
8517 /* Don't optimize too large decls, as each thread/task will have
8519 HOST_WIDE_INT len
= int_size_in_bytes (type
);
8520 if (len
== -1 || len
> 4 * POINTER_SIZE
/ BITS_PER_UNIT
)
8522 if (lang_hooks
.decls
.omp_privatize_by_reference (decl
))
8527 /* Helper function of omp_find_stores_op and gimplify_adjust_omp_clauses*.
8528 For omp_shared_to_firstprivate_optimizable_decl_p decl mark it as
8529 GOVD_WRITTEN in outer contexts. */
8532 omp_mark_stores (struct gimplify_omp_ctx
*ctx
, tree decl
)
8534 for (; ctx
; ctx
= ctx
->outer_context
)
8536 splay_tree_node n
= splay_tree_lookup (ctx
->variables
,
8537 (splay_tree_key
) decl
);
8540 else if (n
->value
& GOVD_SHARED
)
8542 n
->value
|= GOVD_WRITTEN
;
8545 else if (n
->value
& GOVD_DATA_SHARE_CLASS
)
8550 /* Helper callback for walk_gimple_seq to discover possible stores
8551 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
8552 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
8556 omp_find_stores_op (tree
*tp
, int *walk_subtrees
, void *data
)
8558 struct walk_stmt_info
*wi
= (struct walk_stmt_info
*) data
;
8567 if (handled_component_p (op
))
8568 op
= TREE_OPERAND (op
, 0);
8569 else if ((TREE_CODE (op
) == MEM_REF
|| TREE_CODE (op
) == TARGET_MEM_REF
)
8570 && TREE_CODE (TREE_OPERAND (op
, 0)) == ADDR_EXPR
)
8571 op
= TREE_OPERAND (TREE_OPERAND (op
, 0), 0);
8576 if (!DECL_P (op
) || !omp_shared_to_firstprivate_optimizable_decl_p (op
))
8579 omp_mark_stores (gimplify_omp_ctxp
, op
);
8583 /* Helper callback for walk_gimple_seq to discover possible stores
8584 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
8585 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
8589 omp_find_stores_stmt (gimple_stmt_iterator
*gsi_p
,
8590 bool *handled_ops_p
,
8591 struct walk_stmt_info
*wi
)
8593 gimple
*stmt
= gsi_stmt (*gsi_p
);
8594 switch (gimple_code (stmt
))
8596 /* Don't recurse on OpenMP constructs for which
8597 gimplify_adjust_omp_clauses already handled the bodies,
8598 except handle gimple_omp_for_pre_body. */
8599 case GIMPLE_OMP_FOR
:
8600 *handled_ops_p
= true;
8601 if (gimple_omp_for_pre_body (stmt
))
8602 walk_gimple_seq (gimple_omp_for_pre_body (stmt
),
8603 omp_find_stores_stmt
, omp_find_stores_op
, wi
);
8605 case GIMPLE_OMP_PARALLEL
:
8606 case GIMPLE_OMP_TASK
:
8607 case GIMPLE_OMP_SECTIONS
:
8608 case GIMPLE_OMP_SINGLE
:
8609 case GIMPLE_OMP_TARGET
:
8610 case GIMPLE_OMP_TEAMS
:
8611 case GIMPLE_OMP_CRITICAL
:
8612 *handled_ops_p
= true;
8620 struct gimplify_adjust_omp_clauses_data
8626 /* For all variables that were not actually used within the context,
8627 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
8630 gimplify_adjust_omp_clauses_1 (splay_tree_node n
, void *data
)
8632 tree
*list_p
= ((struct gimplify_adjust_omp_clauses_data
*) data
)->list_p
;
8634 = ((struct gimplify_adjust_omp_clauses_data
*) data
)->pre_p
;
8635 tree decl
= (tree
) n
->key
;
8636 unsigned flags
= n
->value
;
8637 enum omp_clause_code code
;
8641 if (flags
& (GOVD_EXPLICIT
| GOVD_LOCAL
))
8643 if ((flags
& GOVD_SEEN
) == 0)
8645 if (flags
& GOVD_DEBUG_PRIVATE
)
8647 gcc_assert ((flags
& GOVD_DATA_SHARE_CLASS
) == GOVD_SHARED
);
8648 private_debug
= true;
8650 else if (flags
& GOVD_MAP
)
8651 private_debug
= false;
8654 = lang_hooks
.decls
.omp_private_debug_clause (decl
,
8655 !!(flags
& GOVD_SHARED
));
8657 code
= OMP_CLAUSE_PRIVATE
;
8658 else if (flags
& GOVD_MAP
)
8660 code
= OMP_CLAUSE_MAP
;
8661 if ((gimplify_omp_ctxp
->region_type
& ORT_ACC
) == 0
8662 && TYPE_ATOMIC (strip_array_types (TREE_TYPE (decl
))))
8664 error ("%<_Atomic%> %qD in implicit %<map%> clause", decl
);
8668 else if (flags
& GOVD_SHARED
)
8670 if (is_global_var (decl
))
8672 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
->outer_context
;
8676 = splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
8677 if (on
&& (on
->value
& (GOVD_FIRSTPRIVATE
| GOVD_LASTPRIVATE
8678 | GOVD_PRIVATE
| GOVD_REDUCTION
8679 | GOVD_LINEAR
| GOVD_MAP
)) != 0)
8681 ctx
= ctx
->outer_context
;
8686 code
= OMP_CLAUSE_SHARED
;
8688 else if (flags
& GOVD_PRIVATE
)
8689 code
= OMP_CLAUSE_PRIVATE
;
8690 else if (flags
& GOVD_FIRSTPRIVATE
)
8692 code
= OMP_CLAUSE_FIRSTPRIVATE
;
8693 if ((gimplify_omp_ctxp
->region_type
& ORT_TARGET
)
8694 && (gimplify_omp_ctxp
->region_type
& ORT_ACC
) == 0
8695 && TYPE_ATOMIC (strip_array_types (TREE_TYPE (decl
))))
8697 error ("%<_Atomic%> %qD in implicit %<firstprivate%> clause on "
8698 "%<target%> construct", decl
);
8702 else if (flags
& GOVD_LASTPRIVATE
)
8703 code
= OMP_CLAUSE_LASTPRIVATE
;
8704 else if (flags
& GOVD_ALIGNED
)
8709 if (((flags
& GOVD_LASTPRIVATE
)
8710 || (code
== OMP_CLAUSE_SHARED
&& (flags
& GOVD_WRITTEN
)))
8711 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
8712 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
8714 tree chain
= *list_p
;
8715 clause
= build_omp_clause (input_location
, code
);
8716 OMP_CLAUSE_DECL (clause
) = decl
;
8717 OMP_CLAUSE_CHAIN (clause
) = chain
;
8719 OMP_CLAUSE_PRIVATE_DEBUG (clause
) = 1;
8720 else if (code
== OMP_CLAUSE_PRIVATE
&& (flags
& GOVD_PRIVATE_OUTER_REF
))
8721 OMP_CLAUSE_PRIVATE_OUTER_REF (clause
) = 1;
8722 else if (code
== OMP_CLAUSE_SHARED
8723 && (flags
& GOVD_WRITTEN
) == 0
8724 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
8725 OMP_CLAUSE_SHARED_READONLY (clause
) = 1;
8726 else if (code
== OMP_CLAUSE_FIRSTPRIVATE
&& (flags
& GOVD_EXPLICIT
) == 0)
8727 OMP_CLAUSE_FIRSTPRIVATE_IMPLICIT (clause
) = 1;
8728 else if (code
== OMP_CLAUSE_MAP
&& (flags
& GOVD_MAP_0LEN_ARRAY
) != 0)
8730 tree nc
= build_omp_clause (input_location
, OMP_CLAUSE_MAP
);
8731 OMP_CLAUSE_DECL (nc
) = decl
;
8732 if (TREE_CODE (TREE_TYPE (decl
)) == REFERENCE_TYPE
8733 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl
))) == POINTER_TYPE
)
8734 OMP_CLAUSE_DECL (clause
)
8735 = build_simple_mem_ref_loc (input_location
, decl
);
8736 OMP_CLAUSE_DECL (clause
)
8737 = build2 (MEM_REF
, char_type_node
, OMP_CLAUSE_DECL (clause
),
8738 build_int_cst (build_pointer_type (char_type_node
), 0));
8739 OMP_CLAUSE_SIZE (clause
) = size_zero_node
;
8740 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
8741 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_ALLOC
);
8742 OMP_CLAUSE_MAP_MAYBE_ZERO_LENGTH_ARRAY_SECTION (clause
) = 1;
8743 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_FIRSTPRIVATE_POINTER
);
8744 OMP_CLAUSE_CHAIN (nc
) = chain
;
8745 OMP_CLAUSE_CHAIN (clause
) = nc
;
8746 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
8747 gimplify_omp_ctxp
= ctx
->outer_context
;
8748 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (clause
), 0),
8749 pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
8750 gimplify_omp_ctxp
= ctx
;
8752 else if (code
== OMP_CLAUSE_MAP
)
8755 /* Not all combinations of these GOVD_MAP flags are actually valid. */
8756 switch (flags
& (GOVD_MAP_TO_ONLY
8758 | GOVD_MAP_FORCE_PRESENT
))
8761 kind
= GOMP_MAP_TOFROM
;
8763 case GOVD_MAP_FORCE
:
8764 kind
= GOMP_MAP_TOFROM
| GOMP_MAP_FLAG_FORCE
;
8766 case GOVD_MAP_TO_ONLY
:
8769 case GOVD_MAP_TO_ONLY
| GOVD_MAP_FORCE
:
8770 kind
= GOMP_MAP_TO
| GOMP_MAP_FLAG_FORCE
;
8772 case GOVD_MAP_FORCE_PRESENT
:
8773 kind
= GOMP_MAP_FORCE_PRESENT
;
8778 OMP_CLAUSE_SET_MAP_KIND (clause
, kind
);
8779 if (DECL_SIZE (decl
)
8780 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
8782 tree decl2
= DECL_VALUE_EXPR (decl
);
8783 gcc_assert (TREE_CODE (decl2
) == INDIRECT_REF
);
8784 decl2
= TREE_OPERAND (decl2
, 0);
8785 gcc_assert (DECL_P (decl2
));
8786 tree mem
= build_simple_mem_ref (decl2
);
8787 OMP_CLAUSE_DECL (clause
) = mem
;
8788 OMP_CLAUSE_SIZE (clause
) = TYPE_SIZE_UNIT (TREE_TYPE (decl
));
8789 if (gimplify_omp_ctxp
->outer_context
)
8791 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
->outer_context
;
8792 omp_notice_variable (ctx
, decl2
, true);
8793 omp_notice_variable (ctx
, OMP_CLAUSE_SIZE (clause
), true);
8795 tree nc
= build_omp_clause (OMP_CLAUSE_LOCATION (clause
),
8797 OMP_CLAUSE_DECL (nc
) = decl
;
8798 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
8799 if (gimplify_omp_ctxp
->target_firstprivatize_array_bases
)
8800 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_FIRSTPRIVATE_POINTER
);
8802 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_POINTER
);
8803 OMP_CLAUSE_CHAIN (nc
) = OMP_CLAUSE_CHAIN (clause
);
8804 OMP_CLAUSE_CHAIN (clause
) = nc
;
8806 else if (gimplify_omp_ctxp
->target_firstprivatize_array_bases
8807 && lang_hooks
.decls
.omp_privatize_by_reference (decl
))
8809 OMP_CLAUSE_DECL (clause
) = build_simple_mem_ref (decl
);
8810 OMP_CLAUSE_SIZE (clause
)
8811 = unshare_expr (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
))));
8812 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
8813 gimplify_omp_ctxp
= ctx
->outer_context
;
8814 gimplify_expr (&OMP_CLAUSE_SIZE (clause
),
8815 pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
8816 gimplify_omp_ctxp
= ctx
;
8817 tree nc
= build_omp_clause (OMP_CLAUSE_LOCATION (clause
),
8819 OMP_CLAUSE_DECL (nc
) = decl
;
8820 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
8821 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_FIRSTPRIVATE_REFERENCE
);
8822 OMP_CLAUSE_CHAIN (nc
) = OMP_CLAUSE_CHAIN (clause
);
8823 OMP_CLAUSE_CHAIN (clause
) = nc
;
8826 OMP_CLAUSE_SIZE (clause
) = DECL_SIZE_UNIT (decl
);
8828 if (code
== OMP_CLAUSE_FIRSTPRIVATE
&& (flags
& GOVD_LASTPRIVATE
) != 0)
8830 tree nc
= build_omp_clause (input_location
, OMP_CLAUSE_LASTPRIVATE
);
8831 OMP_CLAUSE_DECL (nc
) = decl
;
8832 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (nc
) = 1;
8833 OMP_CLAUSE_CHAIN (nc
) = chain
;
8834 OMP_CLAUSE_CHAIN (clause
) = nc
;
8835 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
8836 gimplify_omp_ctxp
= ctx
->outer_context
;
8837 lang_hooks
.decls
.omp_finish_clause (nc
, pre_p
);
8838 gimplify_omp_ctxp
= ctx
;
8841 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
8842 gimplify_omp_ctxp
= ctx
->outer_context
;
8843 lang_hooks
.decls
.omp_finish_clause (clause
, pre_p
);
8844 if (gimplify_omp_ctxp
)
8845 for (; clause
!= chain
; clause
= OMP_CLAUSE_CHAIN (clause
))
8846 if (OMP_CLAUSE_CODE (clause
) == OMP_CLAUSE_MAP
8847 && DECL_P (OMP_CLAUSE_SIZE (clause
)))
8848 omp_notice_variable (gimplify_omp_ctxp
, OMP_CLAUSE_SIZE (clause
),
8850 gimplify_omp_ctxp
= ctx
;
8855 gimplify_adjust_omp_clauses (gimple_seq
*pre_p
, gimple_seq body
, tree
*list_p
,
8856 enum tree_code code
)
8858 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
8863 struct gimplify_omp_ctx
*octx
;
8864 for (octx
= ctx
; octx
; octx
= octx
->outer_context
)
8865 if ((octx
->region_type
& (ORT_PARALLEL
| ORT_TASK
| ORT_TEAMS
)) != 0)
8869 struct walk_stmt_info wi
;
8870 memset (&wi
, 0, sizeof (wi
));
8871 walk_gimple_seq (body
, omp_find_stores_stmt
,
8872 omp_find_stores_op
, &wi
);
8875 while ((c
= *list_p
) != NULL
)
8878 bool remove
= false;
8880 switch (OMP_CLAUSE_CODE (c
))
8882 case OMP_CLAUSE_FIRSTPRIVATE
:
8883 if ((ctx
->region_type
& ORT_TARGET
)
8884 && (ctx
->region_type
& ORT_ACC
) == 0
8885 && TYPE_ATOMIC (strip_array_types
8886 (TREE_TYPE (OMP_CLAUSE_DECL (c
)))))
8888 error_at (OMP_CLAUSE_LOCATION (c
),
8889 "%<_Atomic%> %qD in %<firstprivate%> clause on "
8890 "%<target%> construct", OMP_CLAUSE_DECL (c
));
8895 case OMP_CLAUSE_PRIVATE
:
8896 case OMP_CLAUSE_SHARED
:
8897 case OMP_CLAUSE_LINEAR
:
8898 decl
= OMP_CLAUSE_DECL (c
);
8899 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
8900 remove
= !(n
->value
& GOVD_SEEN
);
8903 bool shared
= OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_SHARED
;
8904 if ((n
->value
& GOVD_DEBUG_PRIVATE
)
8905 || lang_hooks
.decls
.omp_private_debug_clause (decl
, shared
))
8907 gcc_assert ((n
->value
& GOVD_DEBUG_PRIVATE
) == 0
8908 || ((n
->value
& GOVD_DATA_SHARE_CLASS
)
8910 OMP_CLAUSE_SET_CODE (c
, OMP_CLAUSE_PRIVATE
);
8911 OMP_CLAUSE_PRIVATE_DEBUG (c
) = 1;
8913 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_SHARED
8914 && (n
->value
& GOVD_WRITTEN
) == 0
8916 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
8917 OMP_CLAUSE_SHARED_READONLY (c
) = 1;
8918 else if (DECL_P (decl
)
8919 && ((OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_SHARED
8920 && (n
->value
& GOVD_WRITTEN
) != 1)
8921 || (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
8922 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
)))
8923 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
8924 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
8928 case OMP_CLAUSE_LASTPRIVATE
:
8929 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
8930 accurately reflect the presence of a FIRSTPRIVATE clause. */
8931 decl
= OMP_CLAUSE_DECL (c
);
8932 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
8933 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
)
8934 = (n
->value
& GOVD_FIRSTPRIVATE
) != 0;
8935 if (code
== OMP_DISTRIBUTE
8936 && OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
))
8939 error_at (OMP_CLAUSE_LOCATION (c
),
8940 "same variable used in %<firstprivate%> and "
8941 "%<lastprivate%> clauses on %<distribute%> "
8945 && OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
8947 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
8948 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
8951 case OMP_CLAUSE_ALIGNED
:
8952 decl
= OMP_CLAUSE_DECL (c
);
8953 if (!is_global_var (decl
))
8955 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
8956 remove
= n
== NULL
|| !(n
->value
& GOVD_SEEN
);
8957 if (!remove
&& TREE_CODE (TREE_TYPE (decl
)) == POINTER_TYPE
)
8959 struct gimplify_omp_ctx
*octx
;
8961 && (n
->value
& (GOVD_DATA_SHARE_CLASS
8962 & ~GOVD_FIRSTPRIVATE
)))
8965 for (octx
= ctx
->outer_context
; octx
;
8966 octx
= octx
->outer_context
)
8968 n
= splay_tree_lookup (octx
->variables
,
8969 (splay_tree_key
) decl
);
8972 if (n
->value
& GOVD_LOCAL
)
8974 /* We have to avoid assigning a shared variable
8975 to itself when trying to add
8976 __builtin_assume_aligned. */
8977 if (n
->value
& GOVD_SHARED
)
8985 else if (TREE_CODE (TREE_TYPE (decl
)) == ARRAY_TYPE
)
8987 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
8988 if (n
!= NULL
&& (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
8993 case OMP_CLAUSE_MAP
:
8994 if (code
== OMP_TARGET_EXIT_DATA
8995 && OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_POINTER
)
9000 decl
= OMP_CLAUSE_DECL (c
);
9001 /* Data clauses associated with acc parallel reductions must be
9002 compatible with present_or_copy. Warn and adjust the clause
9003 if that is not the case. */
9004 if (ctx
->region_type
== ORT_ACC_PARALLEL
)
9006 tree t
= DECL_P (decl
) ? decl
: TREE_OPERAND (decl
, 0);
9010 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) t
);
9012 if (n
&& (n
->value
& GOVD_REDUCTION
))
9014 enum gomp_map_kind kind
= OMP_CLAUSE_MAP_KIND (c
);
9016 OMP_CLAUSE_MAP_IN_REDUCTION (c
) = 1;
9017 if ((kind
& GOMP_MAP_TOFROM
) != GOMP_MAP_TOFROM
9018 && kind
!= GOMP_MAP_FORCE_PRESENT
9019 && kind
!= GOMP_MAP_POINTER
)
9021 warning_at (OMP_CLAUSE_LOCATION (c
), 0,
9022 "incompatible data clause with reduction "
9023 "on %qE; promoting to present_or_copy",
9025 OMP_CLAUSE_SET_MAP_KIND (c
, GOMP_MAP_TOFROM
);
9031 if ((ctx
->region_type
& ORT_TARGET
) != 0
9032 && OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
)
9034 if (TREE_CODE (decl
) == INDIRECT_REF
9035 && TREE_CODE (TREE_OPERAND (decl
, 0)) == COMPONENT_REF
9036 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl
, 0)))
9038 decl
= TREE_OPERAND (decl
, 0);
9039 if (TREE_CODE (decl
) == COMPONENT_REF
)
9041 while (TREE_CODE (decl
) == COMPONENT_REF
)
9042 decl
= TREE_OPERAND (decl
, 0);
9045 n
= splay_tree_lookup (ctx
->variables
,
9046 (splay_tree_key
) decl
);
9047 if (!(n
->value
& GOVD_SEEN
))
9054 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
9055 if ((ctx
->region_type
& ORT_TARGET
) != 0
9056 && !(n
->value
& GOVD_SEEN
)
9057 && GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c
)) == 0
9058 && (!is_global_var (decl
)
9059 || !lookup_attribute ("omp declare target link",
9060 DECL_ATTRIBUTES (decl
))))
9063 /* For struct element mapping, if struct is never referenced
9064 in target block and none of the mapping has always modifier,
9065 remove all the struct element mappings, which immediately
9066 follow the GOMP_MAP_STRUCT map clause. */
9067 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_STRUCT
)
9069 HOST_WIDE_INT cnt
= tree_to_shwi (OMP_CLAUSE_SIZE (c
));
9071 OMP_CLAUSE_CHAIN (c
)
9072 = OMP_CLAUSE_CHAIN (OMP_CLAUSE_CHAIN (c
));
9075 else if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_STRUCT
9076 && code
== OMP_TARGET_EXIT_DATA
)
9078 else if (DECL_SIZE (decl
)
9079 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
9080 && OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_POINTER
9081 && OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_FIRSTPRIVATE_POINTER
9082 && (OMP_CLAUSE_MAP_KIND (c
)
9083 != GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
9085 /* For GOMP_MAP_FORCE_DEVICEPTR, we'll never enter here, because
9086 for these, TREE_CODE (DECL_SIZE (decl)) will always be
9088 gcc_assert (OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_FORCE_DEVICEPTR
);
9090 tree decl2
= DECL_VALUE_EXPR (decl
);
9091 gcc_assert (TREE_CODE (decl2
) == INDIRECT_REF
);
9092 decl2
= TREE_OPERAND (decl2
, 0);
9093 gcc_assert (DECL_P (decl2
));
9094 tree mem
= build_simple_mem_ref (decl2
);
9095 OMP_CLAUSE_DECL (c
) = mem
;
9096 OMP_CLAUSE_SIZE (c
) = TYPE_SIZE_UNIT (TREE_TYPE (decl
));
9097 if (ctx
->outer_context
)
9099 omp_notice_variable (ctx
->outer_context
, decl2
, true);
9100 omp_notice_variable (ctx
->outer_context
,
9101 OMP_CLAUSE_SIZE (c
), true);
9103 if (((ctx
->region_type
& ORT_TARGET
) != 0
9104 || !ctx
->target_firstprivatize_array_bases
)
9105 && ((n
->value
& GOVD_SEEN
) == 0
9106 || (n
->value
& (GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
)) == 0))
9108 tree nc
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
9110 OMP_CLAUSE_DECL (nc
) = decl
;
9111 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
9112 if (ctx
->target_firstprivatize_array_bases
)
9113 OMP_CLAUSE_SET_MAP_KIND (nc
,
9114 GOMP_MAP_FIRSTPRIVATE_POINTER
);
9116 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_POINTER
);
9117 OMP_CLAUSE_CHAIN (nc
) = OMP_CLAUSE_CHAIN (c
);
9118 OMP_CLAUSE_CHAIN (c
) = nc
;
9124 if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
9125 OMP_CLAUSE_SIZE (c
) = DECL_SIZE_UNIT (decl
);
9126 gcc_assert ((n
->value
& GOVD_SEEN
) == 0
9127 || ((n
->value
& (GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
))
9133 case OMP_CLAUSE_FROM
:
9134 case OMP_CLAUSE__CACHE_
:
9135 decl
= OMP_CLAUSE_DECL (c
);
9138 if (DECL_SIZE (decl
)
9139 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
9141 tree decl2
= DECL_VALUE_EXPR (decl
);
9142 gcc_assert (TREE_CODE (decl2
) == INDIRECT_REF
);
9143 decl2
= TREE_OPERAND (decl2
, 0);
9144 gcc_assert (DECL_P (decl2
));
9145 tree mem
= build_simple_mem_ref (decl2
);
9146 OMP_CLAUSE_DECL (c
) = mem
;
9147 OMP_CLAUSE_SIZE (c
) = TYPE_SIZE_UNIT (TREE_TYPE (decl
));
9148 if (ctx
->outer_context
)
9150 omp_notice_variable (ctx
->outer_context
, decl2
, true);
9151 omp_notice_variable (ctx
->outer_context
,
9152 OMP_CLAUSE_SIZE (c
), true);
9155 else if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
9156 OMP_CLAUSE_SIZE (c
) = DECL_SIZE_UNIT (decl
);
9159 case OMP_CLAUSE_REDUCTION
:
9160 decl
= OMP_CLAUSE_DECL (c
);
9161 /* OpenACC reductions need a present_or_copy data clause.
9162 Add one if necessary. Error is the reduction is private. */
9163 if (ctx
->region_type
== ORT_ACC_PARALLEL
)
9165 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
9166 if (n
->value
& (GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
))
9167 error_at (OMP_CLAUSE_LOCATION (c
), "invalid private "
9168 "reduction on %qE", DECL_NAME (decl
));
9169 else if ((n
->value
& GOVD_MAP
) == 0)
9171 tree next
= OMP_CLAUSE_CHAIN (c
);
9172 tree nc
= build_omp_clause (UNKNOWN_LOCATION
, OMP_CLAUSE_MAP
);
9173 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_TOFROM
);
9174 OMP_CLAUSE_DECL (nc
) = decl
;
9175 OMP_CLAUSE_CHAIN (c
) = nc
;
9176 lang_hooks
.decls
.omp_finish_clause (nc
, pre_p
);
9179 OMP_CLAUSE_MAP_IN_REDUCTION (nc
) = 1;
9180 if (OMP_CLAUSE_CHAIN (nc
) == NULL
)
9182 nc
= OMP_CLAUSE_CHAIN (nc
);
9184 OMP_CLAUSE_CHAIN (nc
) = next
;
9185 n
->value
|= GOVD_MAP
;
9189 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
9190 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
9192 case OMP_CLAUSE_COPYIN
:
9193 case OMP_CLAUSE_COPYPRIVATE
:
9195 case OMP_CLAUSE_NUM_THREADS
:
9196 case OMP_CLAUSE_NUM_TEAMS
:
9197 case OMP_CLAUSE_THREAD_LIMIT
:
9198 case OMP_CLAUSE_DIST_SCHEDULE
:
9199 case OMP_CLAUSE_DEVICE
:
9200 case OMP_CLAUSE_SCHEDULE
:
9201 case OMP_CLAUSE_NOWAIT
:
9202 case OMP_CLAUSE_ORDERED
:
9203 case OMP_CLAUSE_DEFAULT
:
9204 case OMP_CLAUSE_UNTIED
:
9205 case OMP_CLAUSE_COLLAPSE
:
9206 case OMP_CLAUSE_FINAL
:
9207 case OMP_CLAUSE_MERGEABLE
:
9208 case OMP_CLAUSE_PROC_BIND
:
9209 case OMP_CLAUSE_SAFELEN
:
9210 case OMP_CLAUSE_SIMDLEN
:
9211 case OMP_CLAUSE_DEPEND
:
9212 case OMP_CLAUSE_PRIORITY
:
9213 case OMP_CLAUSE_GRAINSIZE
:
9214 case OMP_CLAUSE_NUM_TASKS
:
9215 case OMP_CLAUSE_NOGROUP
:
9216 case OMP_CLAUSE_THREADS
:
9217 case OMP_CLAUSE_SIMD
:
9218 case OMP_CLAUSE_HINT
:
9219 case OMP_CLAUSE_DEFAULTMAP
:
9220 case OMP_CLAUSE_USE_DEVICE_PTR
:
9221 case OMP_CLAUSE_IS_DEVICE_PTR
:
9222 case OMP_CLAUSE__CILK_FOR_COUNT_
:
9223 case OMP_CLAUSE_ASYNC
:
9224 case OMP_CLAUSE_WAIT
:
9225 case OMP_CLAUSE_INDEPENDENT
:
9226 case OMP_CLAUSE_NUM_GANGS
:
9227 case OMP_CLAUSE_NUM_WORKERS
:
9228 case OMP_CLAUSE_VECTOR_LENGTH
:
9229 case OMP_CLAUSE_GANG
:
9230 case OMP_CLAUSE_WORKER
:
9231 case OMP_CLAUSE_VECTOR
:
9232 case OMP_CLAUSE_AUTO
:
9233 case OMP_CLAUSE_SEQ
:
9234 case OMP_CLAUSE_TILE
:
9242 *list_p
= OMP_CLAUSE_CHAIN (c
);
9244 list_p
= &OMP_CLAUSE_CHAIN (c
);
9247 /* Add in any implicit data sharing. */
9248 struct gimplify_adjust_omp_clauses_data data
;
9249 data
.list_p
= list_p
;
9251 splay_tree_foreach (ctx
->variables
, gimplify_adjust_omp_clauses_1
, &data
);
9253 gimplify_omp_ctxp
= ctx
->outer_context
;
9254 delete_omp_context (ctx
);
9257 /* Gimplify OACC_CACHE. */
9260 gimplify_oacc_cache (tree
*expr_p
, gimple_seq
*pre_p
)
9262 tree expr
= *expr_p
;
9264 gimplify_scan_omp_clauses (&OACC_CACHE_CLAUSES (expr
), pre_p
, ORT_ACC
,
9266 gimplify_adjust_omp_clauses (pre_p
, NULL
, &OACC_CACHE_CLAUSES (expr
),
9269 /* TODO: Do something sensible with this information. */
9271 *expr_p
= NULL_TREE
;
9274 /* Helper function of gimplify_oacc_declare. The helper's purpose is to,
9275 if required, translate 'kind' in CLAUSE into an 'entry' kind and 'exit'
9276 kind. The entry kind will replace the one in CLAUSE, while the exit
9277 kind will be used in a new omp_clause and returned to the caller. */
9280 gimplify_oacc_declare_1 (tree clause
)
9282 HOST_WIDE_INT kind
, new_op
;
9286 kind
= OMP_CLAUSE_MAP_KIND (clause
);
9290 case GOMP_MAP_ALLOC
:
9291 case GOMP_MAP_FORCE_ALLOC
:
9292 case GOMP_MAP_FORCE_TO
:
9293 new_op
= GOMP_MAP_DELETE
;
9297 case GOMP_MAP_FORCE_FROM
:
9298 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_FORCE_ALLOC
);
9299 new_op
= GOMP_MAP_FORCE_FROM
;
9303 case GOMP_MAP_FORCE_TOFROM
:
9304 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_FORCE_TO
);
9305 new_op
= GOMP_MAP_FORCE_FROM
;
9310 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_FORCE_ALLOC
);
9311 new_op
= GOMP_MAP_FROM
;
9315 case GOMP_MAP_TOFROM
:
9316 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_TO
);
9317 new_op
= GOMP_MAP_FROM
;
9321 case GOMP_MAP_DEVICE_RESIDENT
:
9322 case GOMP_MAP_FORCE_DEVICEPTR
:
9323 case GOMP_MAP_FORCE_PRESENT
:
9325 case GOMP_MAP_POINTER
:
9336 c
= build_omp_clause (OMP_CLAUSE_LOCATION (clause
), OMP_CLAUSE_MAP
);
9337 OMP_CLAUSE_SET_MAP_KIND (c
, new_op
);
9338 OMP_CLAUSE_DECL (c
) = OMP_CLAUSE_DECL (clause
);
9344 /* Gimplify OACC_DECLARE. */
9347 gimplify_oacc_declare (tree
*expr_p
, gimple_seq
*pre_p
)
9349 tree expr
= *expr_p
;
9351 tree clauses
, t
, decl
;
9353 clauses
= OACC_DECLARE_CLAUSES (expr
);
9355 gimplify_scan_omp_clauses (&clauses
, pre_p
, ORT_TARGET_DATA
, OACC_DECLARE
);
9356 gimplify_adjust_omp_clauses (pre_p
, NULL
, &clauses
, OACC_DECLARE
);
9358 for (t
= clauses
; t
; t
= OMP_CLAUSE_CHAIN (t
))
9360 decl
= OMP_CLAUSE_DECL (t
);
9362 if (TREE_CODE (decl
) == MEM_REF
)
9363 decl
= TREE_OPERAND (decl
, 0);
9365 if (VAR_P (decl
) && !is_oacc_declared (decl
))
9367 tree attr
= get_identifier ("oacc declare target");
9368 DECL_ATTRIBUTES (decl
) = tree_cons (attr
, NULL_TREE
,
9369 DECL_ATTRIBUTES (decl
));
9373 && !is_global_var (decl
)
9374 && DECL_CONTEXT (decl
) == current_function_decl
)
9376 tree c
= gimplify_oacc_declare_1 (t
);
9379 if (oacc_declare_returns
== NULL
)
9380 oacc_declare_returns
= new hash_map
<tree
, tree
>;
9382 oacc_declare_returns
->put (decl
, c
);
9386 if (gimplify_omp_ctxp
)
9387 omp_add_variable (gimplify_omp_ctxp
, decl
, GOVD_SEEN
);
9390 stmt
= gimple_build_omp_target (NULL
, GF_OMP_TARGET_KIND_OACC_DECLARE
,
9393 gimplify_seq_add_stmt (pre_p
, stmt
);
9395 *expr_p
= NULL_TREE
;
9398 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
9399 gimplification of the body, as well as scanning the body for used
9400 variables. We need to do this scan now, because variable-sized
9401 decls will be decomposed during gimplification. */
9404 gimplify_omp_parallel (tree
*expr_p
, gimple_seq
*pre_p
)
9406 tree expr
= *expr_p
;
9408 gimple_seq body
= NULL
;
9410 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr
), pre_p
,
9411 OMP_PARALLEL_COMBINED (expr
)
9412 ? ORT_COMBINED_PARALLEL
9413 : ORT_PARALLEL
, OMP_PARALLEL
);
9415 push_gimplify_context ();
9417 g
= gimplify_and_return_first (OMP_PARALLEL_BODY (expr
), &body
);
9418 if (gimple_code (g
) == GIMPLE_BIND
)
9419 pop_gimplify_context (g
);
9421 pop_gimplify_context (NULL
);
9423 gimplify_adjust_omp_clauses (pre_p
, body
, &OMP_PARALLEL_CLAUSES (expr
),
9426 g
= gimple_build_omp_parallel (body
,
9427 OMP_PARALLEL_CLAUSES (expr
),
9428 NULL_TREE
, NULL_TREE
);
9429 if (OMP_PARALLEL_COMBINED (expr
))
9430 gimple_omp_set_subcode (g
, GF_OMP_PARALLEL_COMBINED
);
9431 gimplify_seq_add_stmt (pre_p
, g
);
9432 *expr_p
= NULL_TREE
;
9435 /* Gimplify the contents of an OMP_TASK statement. This involves
9436 gimplification of the body, as well as scanning the body for used
9437 variables. We need to do this scan now, because variable-sized
9438 decls will be decomposed during gimplification. */
9441 gimplify_omp_task (tree
*expr_p
, gimple_seq
*pre_p
)
9443 tree expr
= *expr_p
;
9445 gimple_seq body
= NULL
;
9447 gimplify_scan_omp_clauses (&OMP_TASK_CLAUSES (expr
), pre_p
,
9448 omp_find_clause (OMP_TASK_CLAUSES (expr
),
9450 ? ORT_UNTIED_TASK
: ORT_TASK
, OMP_TASK
);
9452 push_gimplify_context ();
9454 g
= gimplify_and_return_first (OMP_TASK_BODY (expr
), &body
);
9455 if (gimple_code (g
) == GIMPLE_BIND
)
9456 pop_gimplify_context (g
);
9458 pop_gimplify_context (NULL
);
9460 gimplify_adjust_omp_clauses (pre_p
, body
, &OMP_TASK_CLAUSES (expr
),
9463 g
= gimple_build_omp_task (body
,
9464 OMP_TASK_CLAUSES (expr
),
9465 NULL_TREE
, NULL_TREE
,
9466 NULL_TREE
, NULL_TREE
, NULL_TREE
);
9467 gimplify_seq_add_stmt (pre_p
, g
);
9468 *expr_p
= NULL_TREE
;
9471 /* Helper function of gimplify_omp_for, find OMP_FOR resp. OMP_SIMD
9472 with non-NULL OMP_FOR_INIT. */
9475 find_combined_omp_for (tree
*tp
, int *walk_subtrees
, void *)
9478 switch (TREE_CODE (*tp
))
9484 if (OMP_FOR_INIT (*tp
) != NULL_TREE
)
9488 case STATEMENT_LIST
:
9498 /* Gimplify the gross structure of an OMP_FOR statement. */
9500 static enum gimplify_status
9501 gimplify_omp_for (tree
*expr_p
, gimple_seq
*pre_p
)
9503 tree for_stmt
, orig_for_stmt
, inner_for_stmt
= NULL_TREE
, decl
, var
, t
;
9504 enum gimplify_status ret
= GS_ALL_DONE
;
9505 enum gimplify_status tret
;
9507 gimple_seq for_body
, for_pre_body
;
9509 bitmap has_decl_expr
= NULL
;
9510 enum omp_region_type ort
= ORT_WORKSHARE
;
9512 orig_for_stmt
= for_stmt
= *expr_p
;
9514 switch (TREE_CODE (for_stmt
))
9518 case OMP_DISTRIBUTE
:
9524 if (omp_find_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_UNTIED
))
9525 ort
= ORT_UNTIED_TASK
;
9537 /* Set OMP_CLAUSE_LINEAR_NO_COPYIN flag on explicit linear
9538 clause for the IV. */
9539 if (ort
== ORT_SIMD
&& TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) == 1)
9541 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), 0);
9542 gcc_assert (TREE_CODE (t
) == MODIFY_EXPR
);
9543 decl
= TREE_OPERAND (t
, 0);
9544 for (tree c
= OMP_FOR_CLAUSES (for_stmt
); c
; c
= OMP_CLAUSE_CHAIN (c
))
9545 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
9546 && OMP_CLAUSE_DECL (c
) == decl
)
9548 OMP_CLAUSE_LINEAR_NO_COPYIN (c
) = 1;
9553 if (OMP_FOR_INIT (for_stmt
) == NULL_TREE
)
9555 gcc_assert (TREE_CODE (for_stmt
) != OACC_LOOP
);
9556 inner_for_stmt
= walk_tree (&OMP_FOR_BODY (for_stmt
),
9557 find_combined_omp_for
, NULL
, NULL
);
9558 if (inner_for_stmt
== NULL_TREE
)
9560 gcc_assert (seen_error ());
9561 *expr_p
= NULL_TREE
;
9566 if (TREE_CODE (for_stmt
) != OMP_TASKLOOP
)
9567 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt
), pre_p
, ort
,
9568 TREE_CODE (for_stmt
));
9570 if (TREE_CODE (for_stmt
) == OMP_DISTRIBUTE
)
9571 gimplify_omp_ctxp
->distribute
= true;
9573 /* Handle OMP_FOR_INIT. */
9574 for_pre_body
= NULL
;
9575 if (ort
== ORT_SIMD
&& OMP_FOR_PRE_BODY (for_stmt
))
9577 has_decl_expr
= BITMAP_ALLOC (NULL
);
9578 if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt
)) == DECL_EXPR
9579 && TREE_CODE (DECL_EXPR_DECL (OMP_FOR_PRE_BODY (for_stmt
)))
9582 t
= OMP_FOR_PRE_BODY (for_stmt
);
9583 bitmap_set_bit (has_decl_expr
, DECL_UID (DECL_EXPR_DECL (t
)));
9585 else if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt
)) == STATEMENT_LIST
)
9587 tree_stmt_iterator si
;
9588 for (si
= tsi_start (OMP_FOR_PRE_BODY (for_stmt
)); !tsi_end_p (si
);
9592 if (TREE_CODE (t
) == DECL_EXPR
9593 && TREE_CODE (DECL_EXPR_DECL (t
)) == VAR_DECL
)
9594 bitmap_set_bit (has_decl_expr
, DECL_UID (DECL_EXPR_DECL (t
)));
9598 if (OMP_FOR_PRE_BODY (for_stmt
))
9600 if (TREE_CODE (for_stmt
) != OMP_TASKLOOP
|| gimplify_omp_ctxp
)
9601 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt
), &for_pre_body
);
9604 struct gimplify_omp_ctx ctx
;
9605 memset (&ctx
, 0, sizeof (ctx
));
9606 ctx
.region_type
= ORT_NONE
;
9607 gimplify_omp_ctxp
= &ctx
;
9608 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt
), &for_pre_body
);
9609 gimplify_omp_ctxp
= NULL
;
9612 OMP_FOR_PRE_BODY (for_stmt
) = NULL_TREE
;
9614 if (OMP_FOR_INIT (for_stmt
) == NULL_TREE
)
9615 for_stmt
= inner_for_stmt
;
9617 /* For taskloop, need to gimplify the start, end and step before the
9618 taskloop, outside of the taskloop omp context. */
9619 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
9621 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
9623 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
9624 if (!is_gimple_constant (TREE_OPERAND (t
, 1)))
9627 = get_initialized_tmp_var (TREE_OPERAND (t
, 1),
9628 pre_p
, NULL
, false);
9629 tree c
= build_omp_clause (input_location
,
9630 OMP_CLAUSE_FIRSTPRIVATE
);
9631 OMP_CLAUSE_DECL (c
) = TREE_OPERAND (t
, 1);
9632 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (orig_for_stmt
);
9633 OMP_FOR_CLAUSES (orig_for_stmt
) = c
;
9636 /* Handle OMP_FOR_COND. */
9637 t
= TREE_VEC_ELT (OMP_FOR_COND (for_stmt
), i
);
9638 if (!is_gimple_constant (TREE_OPERAND (t
, 1)))
9641 = get_initialized_tmp_var (TREE_OPERAND (t
, 1),
9642 gimple_seq_empty_p (for_pre_body
)
9643 ? pre_p
: &for_pre_body
, NULL
,
9645 tree c
= build_omp_clause (input_location
,
9646 OMP_CLAUSE_FIRSTPRIVATE
);
9647 OMP_CLAUSE_DECL (c
) = TREE_OPERAND (t
, 1);
9648 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (orig_for_stmt
);
9649 OMP_FOR_CLAUSES (orig_for_stmt
) = c
;
9652 /* Handle OMP_FOR_INCR. */
9653 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
9654 if (TREE_CODE (t
) == MODIFY_EXPR
)
9656 decl
= TREE_OPERAND (t
, 0);
9657 t
= TREE_OPERAND (t
, 1);
9658 tree
*tp
= &TREE_OPERAND (t
, 1);
9659 if (TREE_CODE (t
) == PLUS_EXPR
&& *tp
== decl
)
9660 tp
= &TREE_OPERAND (t
, 0);
9662 if (!is_gimple_constant (*tp
))
9664 gimple_seq
*seq
= gimple_seq_empty_p (for_pre_body
)
9665 ? pre_p
: &for_pre_body
;
9666 *tp
= get_initialized_tmp_var (*tp
, seq
, NULL
, false);
9667 tree c
= build_omp_clause (input_location
,
9668 OMP_CLAUSE_FIRSTPRIVATE
);
9669 OMP_CLAUSE_DECL (c
) = *tp
;
9670 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (orig_for_stmt
);
9671 OMP_FOR_CLAUSES (orig_for_stmt
) = c
;
9676 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (orig_for_stmt
), pre_p
, ort
,
9680 if (orig_for_stmt
!= for_stmt
)
9681 gimplify_omp_ctxp
->combined_loop
= true;
9684 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
))
9685 == TREE_VEC_LENGTH (OMP_FOR_COND (for_stmt
)));
9686 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
))
9687 == TREE_VEC_LENGTH (OMP_FOR_INCR (for_stmt
)));
9689 tree c
= omp_find_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_ORDERED
);
9690 bool is_doacross
= false;
9691 if (c
&& OMP_CLAUSE_ORDERED_EXPR (c
))
9694 gimplify_omp_ctxp
->loop_iter_var
.create (TREE_VEC_LENGTH
9695 (OMP_FOR_INIT (for_stmt
))
9698 int collapse
= 1, tile
= 0;
9699 c
= omp_find_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_COLLAPSE
);
9701 collapse
= tree_to_shwi (OMP_CLAUSE_COLLAPSE_EXPR (c
));
9702 c
= omp_find_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_TILE
);
9704 tile
= list_length (OMP_CLAUSE_TILE_LIST (c
));
9705 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
9707 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
9708 gcc_assert (TREE_CODE (t
) == MODIFY_EXPR
);
9709 decl
= TREE_OPERAND (t
, 0);
9710 gcc_assert (DECL_P (decl
));
9711 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl
))
9712 || POINTER_TYPE_P (TREE_TYPE (decl
)));
9715 if (TREE_CODE (for_stmt
) == OMP_FOR
&& OMP_FOR_ORIG_DECLS (for_stmt
))
9716 gimplify_omp_ctxp
->loop_iter_var
.quick_push
9717 (TREE_VEC_ELT (OMP_FOR_ORIG_DECLS (for_stmt
), i
));
9719 gimplify_omp_ctxp
->loop_iter_var
.quick_push (decl
);
9720 gimplify_omp_ctxp
->loop_iter_var
.quick_push (decl
);
9723 /* Make sure the iteration variable is private. */
9725 tree c2
= NULL_TREE
;
9726 if (orig_for_stmt
!= for_stmt
)
9727 /* Do this only on innermost construct for combined ones. */;
9728 else if (ort
== ORT_SIMD
)
9730 splay_tree_node n
= splay_tree_lookup (gimplify_omp_ctxp
->variables
,
9731 (splay_tree_key
) decl
);
9732 omp_is_private (gimplify_omp_ctxp
, decl
,
9733 1 + (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
))
9735 if (n
!= NULL
&& (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
9736 omp_notice_variable (gimplify_omp_ctxp
, decl
, true);
9737 else if (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) == 1)
9739 c
= build_omp_clause (input_location
, OMP_CLAUSE_LINEAR
);
9740 OMP_CLAUSE_LINEAR_NO_COPYIN (c
) = 1;
9741 unsigned int flags
= GOVD_LINEAR
| GOVD_EXPLICIT
| GOVD_SEEN
;
9743 && bitmap_bit_p (has_decl_expr
, DECL_UID (decl
)))
9745 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
9746 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
9748 struct gimplify_omp_ctx
*outer
9749 = gimplify_omp_ctxp
->outer_context
;
9750 if (outer
&& !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
9752 if (outer
->region_type
== ORT_WORKSHARE
9753 && outer
->combined_loop
)
9755 n
= splay_tree_lookup (outer
->variables
,
9756 (splay_tree_key
)decl
);
9757 if (n
!= NULL
&& (n
->value
& GOVD_LOCAL
) != 0)
9759 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
9760 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
9764 struct gimplify_omp_ctx
*octx
= outer
->outer_context
;
9766 && octx
->region_type
== ORT_COMBINED_PARALLEL
9767 && octx
->outer_context
9768 && (octx
->outer_context
->region_type
9770 && octx
->outer_context
->combined_loop
)
9772 octx
= octx
->outer_context
;
9773 n
= splay_tree_lookup (octx
->variables
,
9774 (splay_tree_key
)decl
);
9775 if (n
!= NULL
&& (n
->value
& GOVD_LOCAL
) != 0)
9777 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
9778 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
9785 OMP_CLAUSE_DECL (c
) = decl
;
9786 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (for_stmt
);
9787 OMP_FOR_CLAUSES (for_stmt
) = c
;
9788 omp_add_variable (gimplify_omp_ctxp
, decl
, flags
);
9789 if (outer
&& !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
9791 if (outer
->region_type
== ORT_WORKSHARE
9792 && outer
->combined_loop
)
9794 if (outer
->outer_context
9795 && (outer
->outer_context
->region_type
9796 == ORT_COMBINED_PARALLEL
))
9797 outer
= outer
->outer_context
;
9798 else if (omp_check_private (outer
, decl
, false))
9801 else if (((outer
->region_type
& ORT_TASK
) != 0)
9802 && outer
->combined_loop
9803 && !omp_check_private (gimplify_omp_ctxp
,
9806 else if (outer
->region_type
!= ORT_COMBINED_PARALLEL
)
9808 omp_notice_variable (outer
, decl
, true);
9813 n
= splay_tree_lookup (outer
->variables
,
9814 (splay_tree_key
)decl
);
9815 if (n
== NULL
|| (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
9817 omp_add_variable (outer
, decl
,
9818 GOVD_LASTPRIVATE
| GOVD_SEEN
);
9819 if (outer
->region_type
== ORT_COMBINED_PARALLEL
9820 && outer
->outer_context
9821 && (outer
->outer_context
->region_type
9823 && outer
->outer_context
->combined_loop
)
9825 outer
= outer
->outer_context
;
9826 n
= splay_tree_lookup (outer
->variables
,
9827 (splay_tree_key
)decl
);
9828 if (omp_check_private (outer
, decl
, false))
9831 || ((n
->value
& GOVD_DATA_SHARE_CLASS
)
9833 omp_add_variable (outer
, decl
,
9839 if (outer
&& outer
->outer_context
9840 && (outer
->outer_context
->region_type
9841 == ORT_COMBINED_TEAMS
))
9843 outer
= outer
->outer_context
;
9844 n
= splay_tree_lookup (outer
->variables
,
9845 (splay_tree_key
)decl
);
9847 || (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
9848 omp_add_variable (outer
, decl
,
9849 GOVD_SHARED
| GOVD_SEEN
);
9853 if (outer
&& outer
->outer_context
)
9854 omp_notice_variable (outer
->outer_context
, decl
,
9864 || !bitmap_bit_p (has_decl_expr
, DECL_UID (decl
)));
9865 struct gimplify_omp_ctx
*outer
9866 = gimplify_omp_ctxp
->outer_context
;
9867 if (outer
&& lastprivate
)
9869 if (outer
->region_type
== ORT_WORKSHARE
9870 && outer
->combined_loop
)
9872 n
= splay_tree_lookup (outer
->variables
,
9873 (splay_tree_key
)decl
);
9874 if (n
!= NULL
&& (n
->value
& GOVD_LOCAL
) != 0)
9876 lastprivate
= false;
9879 else if (outer
->outer_context
9880 && (outer
->outer_context
->region_type
9881 == ORT_COMBINED_PARALLEL
))
9882 outer
= outer
->outer_context
;
9883 else if (omp_check_private (outer
, decl
, false))
9886 else if (((outer
->region_type
& ORT_TASK
) != 0)
9887 && outer
->combined_loop
9888 && !omp_check_private (gimplify_omp_ctxp
,
9891 else if (outer
->region_type
!= ORT_COMBINED_PARALLEL
)
9893 omp_notice_variable (outer
, decl
, true);
9898 n
= splay_tree_lookup (outer
->variables
,
9899 (splay_tree_key
)decl
);
9900 if (n
== NULL
|| (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
9902 omp_add_variable (outer
, decl
,
9903 GOVD_LASTPRIVATE
| GOVD_SEEN
);
9904 if (outer
->region_type
== ORT_COMBINED_PARALLEL
9905 && outer
->outer_context
9906 && (outer
->outer_context
->region_type
9908 && outer
->outer_context
->combined_loop
)
9910 outer
= outer
->outer_context
;
9911 n
= splay_tree_lookup (outer
->variables
,
9912 (splay_tree_key
)decl
);
9913 if (omp_check_private (outer
, decl
, false))
9916 || ((n
->value
& GOVD_DATA_SHARE_CLASS
)
9918 omp_add_variable (outer
, decl
,
9924 if (outer
&& outer
->outer_context
9925 && (outer
->outer_context
->region_type
9926 == ORT_COMBINED_TEAMS
))
9928 outer
= outer
->outer_context
;
9929 n
= splay_tree_lookup (outer
->variables
,
9930 (splay_tree_key
)decl
);
9932 || (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
9933 omp_add_variable (outer
, decl
,
9934 GOVD_SHARED
| GOVD_SEEN
);
9938 if (outer
&& outer
->outer_context
)
9939 omp_notice_variable (outer
->outer_context
, decl
,
9945 c
= build_omp_clause (input_location
,
9946 lastprivate
? OMP_CLAUSE_LASTPRIVATE
9947 : OMP_CLAUSE_PRIVATE
);
9948 OMP_CLAUSE_DECL (c
) = decl
;
9949 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (for_stmt
);
9950 OMP_FOR_CLAUSES (for_stmt
) = c
;
9951 omp_add_variable (gimplify_omp_ctxp
, decl
,
9952 (lastprivate
? GOVD_LASTPRIVATE
: GOVD_PRIVATE
)
9953 | GOVD_EXPLICIT
| GOVD_SEEN
);
9957 else if (omp_is_private (gimplify_omp_ctxp
, decl
, 0))
9958 omp_notice_variable (gimplify_omp_ctxp
, decl
, true);
9960 omp_add_variable (gimplify_omp_ctxp
, decl
, GOVD_PRIVATE
| GOVD_SEEN
);
9962 /* If DECL is not a gimple register, create a temporary variable to act
9963 as an iteration counter. This is valid, since DECL cannot be
9964 modified in the body of the loop. Similarly for any iteration vars
9965 in simd with collapse > 1 where the iterator vars must be
9967 if (orig_for_stmt
!= for_stmt
)
9969 else if (!is_gimple_reg (decl
)
9971 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) > 1))
9973 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
9974 /* Make sure omp_add_variable is not called on it prematurely.
9975 We call it ourselves a few lines later. */
9976 gimplify_omp_ctxp
= NULL
;
9977 var
= create_tmp_var (TREE_TYPE (decl
), get_name (decl
));
9978 gimplify_omp_ctxp
= ctx
;
9979 TREE_OPERAND (t
, 0) = var
;
9981 gimplify_seq_add_stmt (&for_body
, gimple_build_assign (decl
, var
));
9984 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) == 1)
9986 c2
= build_omp_clause (input_location
, OMP_CLAUSE_LINEAR
);
9987 OMP_CLAUSE_LINEAR_NO_COPYIN (c2
) = 1;
9988 OMP_CLAUSE_LINEAR_NO_COPYOUT (c2
) = 1;
9989 OMP_CLAUSE_DECL (c2
) = var
;
9990 OMP_CLAUSE_CHAIN (c2
) = OMP_FOR_CLAUSES (for_stmt
);
9991 OMP_FOR_CLAUSES (for_stmt
) = c2
;
9992 omp_add_variable (gimplify_omp_ctxp
, var
,
9993 GOVD_LINEAR
| GOVD_EXPLICIT
| GOVD_SEEN
);
10001 omp_add_variable (gimplify_omp_ctxp
, var
,
10002 GOVD_PRIVATE
| GOVD_SEEN
);
10007 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), &for_pre_body
, NULL
,
10008 is_gimple_val
, fb_rvalue
, false);
10009 ret
= MIN (ret
, tret
);
10010 if (ret
== GS_ERROR
)
10013 /* Handle OMP_FOR_COND. */
10014 t
= TREE_VEC_ELT (OMP_FOR_COND (for_stmt
), i
);
10015 gcc_assert (COMPARISON_CLASS_P (t
));
10016 gcc_assert (TREE_OPERAND (t
, 0) == decl
);
10018 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), &for_pre_body
, NULL
,
10019 is_gimple_val
, fb_rvalue
, false);
10020 ret
= MIN (ret
, tret
);
10022 /* Handle OMP_FOR_INCR. */
10023 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
10024 switch (TREE_CODE (t
))
10026 case PREINCREMENT_EXPR
:
10027 case POSTINCREMENT_EXPR
:
10029 tree decl
= TREE_OPERAND (t
, 0);
10030 /* c_omp_for_incr_canonicalize_ptr() should have been
10031 called to massage things appropriately. */
10032 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl
)));
10034 if (orig_for_stmt
!= for_stmt
)
10036 t
= build_int_cst (TREE_TYPE (decl
), 1);
10038 OMP_CLAUSE_LINEAR_STEP (c
) = t
;
10039 t
= build2 (PLUS_EXPR
, TREE_TYPE (decl
), var
, t
);
10040 t
= build2 (MODIFY_EXPR
, TREE_TYPE (var
), var
, t
);
10041 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
) = t
;
10045 case PREDECREMENT_EXPR
:
10046 case POSTDECREMENT_EXPR
:
10047 /* c_omp_for_incr_canonicalize_ptr() should have been
10048 called to massage things appropriately. */
10049 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl
)));
10050 if (orig_for_stmt
!= for_stmt
)
10052 t
= build_int_cst (TREE_TYPE (decl
), -1);
10054 OMP_CLAUSE_LINEAR_STEP (c
) = t
;
10055 t
= build2 (PLUS_EXPR
, TREE_TYPE (decl
), var
, t
);
10056 t
= build2 (MODIFY_EXPR
, TREE_TYPE (var
), var
, t
);
10057 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
) = t
;
10061 gcc_assert (TREE_OPERAND (t
, 0) == decl
);
10062 TREE_OPERAND (t
, 0) = var
;
10064 t
= TREE_OPERAND (t
, 1);
10065 switch (TREE_CODE (t
))
10068 if (TREE_OPERAND (t
, 1) == decl
)
10070 TREE_OPERAND (t
, 1) = TREE_OPERAND (t
, 0);
10071 TREE_OPERAND (t
, 0) = var
;
10077 case POINTER_PLUS_EXPR
:
10078 gcc_assert (TREE_OPERAND (t
, 0) == decl
);
10079 TREE_OPERAND (t
, 0) = var
;
10082 gcc_unreachable ();
10085 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), &for_pre_body
, NULL
,
10086 is_gimple_val
, fb_rvalue
, false);
10087 ret
= MIN (ret
, tret
);
10090 tree step
= TREE_OPERAND (t
, 1);
10091 tree stept
= TREE_TYPE (decl
);
10092 if (POINTER_TYPE_P (stept
))
10094 step
= fold_convert (stept
, step
);
10095 if (TREE_CODE (t
) == MINUS_EXPR
)
10096 step
= fold_build1 (NEGATE_EXPR
, stept
, step
);
10097 OMP_CLAUSE_LINEAR_STEP (c
) = step
;
10098 if (step
!= TREE_OPERAND (t
, 1))
10100 tret
= gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c
),
10101 &for_pre_body
, NULL
,
10102 is_gimple_val
, fb_rvalue
, false);
10103 ret
= MIN (ret
, tret
);
10109 gcc_unreachable ();
10115 OMP_CLAUSE_LINEAR_STEP (c2
) = OMP_CLAUSE_LINEAR_STEP (c
);
10118 if ((var
!= decl
|| collapse
> 1 || tile
) && orig_for_stmt
== for_stmt
)
10120 for (c
= OMP_FOR_CLAUSES (for_stmt
); c
; c
= OMP_CLAUSE_CHAIN (c
))
10121 if (((OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
10122 && OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
) == NULL
)
10123 || (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
10124 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
)
10125 && OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
) == NULL
))
10126 && OMP_CLAUSE_DECL (c
) == decl
)
10128 if (is_doacross
&& (collapse
== 1 || i
>= collapse
))
10132 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
10133 gcc_assert (TREE_CODE (t
) == MODIFY_EXPR
);
10134 gcc_assert (TREE_OPERAND (t
, 0) == var
);
10135 t
= TREE_OPERAND (t
, 1);
10136 gcc_assert (TREE_CODE (t
) == PLUS_EXPR
10137 || TREE_CODE (t
) == MINUS_EXPR
10138 || TREE_CODE (t
) == POINTER_PLUS_EXPR
);
10139 gcc_assert (TREE_OPERAND (t
, 0) == var
);
10140 t
= build2 (TREE_CODE (t
), TREE_TYPE (decl
),
10141 is_doacross
? var
: decl
,
10142 TREE_OPERAND (t
, 1));
10145 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
)
10146 seq
= &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
);
10148 seq
= &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
);
10149 gimplify_assign (decl
, t
, seq
);
10154 BITMAP_FREE (has_decl_expr
);
10156 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
10158 push_gimplify_context ();
10159 if (TREE_CODE (OMP_FOR_BODY (orig_for_stmt
)) != BIND_EXPR
)
10161 OMP_FOR_BODY (orig_for_stmt
)
10162 = build3 (BIND_EXPR
, void_type_node
, NULL
,
10163 OMP_FOR_BODY (orig_for_stmt
), NULL
);
10164 TREE_SIDE_EFFECTS (OMP_FOR_BODY (orig_for_stmt
)) = 1;
10168 gimple
*g
= gimplify_and_return_first (OMP_FOR_BODY (orig_for_stmt
),
10171 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
10173 if (gimple_code (g
) == GIMPLE_BIND
)
10174 pop_gimplify_context (g
);
10176 pop_gimplify_context (NULL
);
10179 if (orig_for_stmt
!= for_stmt
)
10180 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
10182 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
10183 decl
= TREE_OPERAND (t
, 0);
10184 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
10185 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
10186 gimplify_omp_ctxp
= ctx
->outer_context
;
10187 var
= create_tmp_var (TREE_TYPE (decl
), get_name (decl
));
10188 gimplify_omp_ctxp
= ctx
;
10189 omp_add_variable (gimplify_omp_ctxp
, var
, GOVD_PRIVATE
| GOVD_SEEN
);
10190 TREE_OPERAND (t
, 0) = var
;
10191 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
10192 TREE_OPERAND (t
, 1) = copy_node (TREE_OPERAND (t
, 1));
10193 TREE_OPERAND (TREE_OPERAND (t
, 1), 0) = var
;
10196 gimplify_adjust_omp_clauses (pre_p
, for_body
,
10197 &OMP_FOR_CLAUSES (orig_for_stmt
),
10198 TREE_CODE (orig_for_stmt
));
10201 switch (TREE_CODE (orig_for_stmt
))
10203 case OMP_FOR
: kind
= GF_OMP_FOR_KIND_FOR
; break;
10204 case OMP_SIMD
: kind
= GF_OMP_FOR_KIND_SIMD
; break;
10205 case CILK_SIMD
: kind
= GF_OMP_FOR_KIND_CILKSIMD
; break;
10206 case CILK_FOR
: kind
= GF_OMP_FOR_KIND_CILKFOR
; break;
10207 case OMP_DISTRIBUTE
: kind
= GF_OMP_FOR_KIND_DISTRIBUTE
; break;
10208 case OMP_TASKLOOP
: kind
= GF_OMP_FOR_KIND_TASKLOOP
; break;
10209 case OACC_LOOP
: kind
= GF_OMP_FOR_KIND_OACC_LOOP
; break;
10211 gcc_unreachable ();
10213 gfor
= gimple_build_omp_for (for_body
, kind
, OMP_FOR_CLAUSES (orig_for_stmt
),
10214 TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)),
10216 if (orig_for_stmt
!= for_stmt
)
10217 gimple_omp_for_set_combined_p (gfor
, true);
10218 if (gimplify_omp_ctxp
10219 && (gimplify_omp_ctxp
->combined_loop
10220 || (gimplify_omp_ctxp
->region_type
== ORT_COMBINED_PARALLEL
10221 && gimplify_omp_ctxp
->outer_context
10222 && gimplify_omp_ctxp
->outer_context
->combined_loop
)))
10224 gimple_omp_for_set_combined_into_p (gfor
, true);
10225 if (gimplify_omp_ctxp
->combined_loop
)
10226 gcc_assert (TREE_CODE (orig_for_stmt
) == OMP_SIMD
);
10228 gcc_assert (TREE_CODE (orig_for_stmt
) == OMP_FOR
);
10231 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
10233 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
10234 gimple_omp_for_set_index (gfor
, i
, TREE_OPERAND (t
, 0));
10235 gimple_omp_for_set_initial (gfor
, i
, TREE_OPERAND (t
, 1));
10236 t
= TREE_VEC_ELT (OMP_FOR_COND (for_stmt
), i
);
10237 gimple_omp_for_set_cond (gfor
, i
, TREE_CODE (t
));
10238 gimple_omp_for_set_final (gfor
, i
, TREE_OPERAND (t
, 1));
10239 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
10240 gimple_omp_for_set_incr (gfor
, i
, TREE_OPERAND (t
, 1));
10243 /* OMP_TASKLOOP is gimplified as two GIMPLE_OMP_FOR taskloop
10244 constructs with GIMPLE_OMP_TASK sandwiched in between them.
10245 The outer taskloop stands for computing the number of iterations,
10246 counts for collapsed loops and holding taskloop specific clauses.
10247 The task construct stands for the effect of data sharing on the
10248 explicit task it creates and the inner taskloop stands for expansion
10249 of the static loop inside of the explicit task construct. */
10250 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
10252 tree
*gfor_clauses_ptr
= gimple_omp_for_clauses_ptr (gfor
);
10253 tree task_clauses
= NULL_TREE
;
10254 tree c
= *gfor_clauses_ptr
;
10255 tree
*gtask_clauses_ptr
= &task_clauses
;
10256 tree outer_for_clauses
= NULL_TREE
;
10257 tree
*gforo_clauses_ptr
= &outer_for_clauses
;
10258 for (; c
; c
= OMP_CLAUSE_CHAIN (c
))
10259 switch (OMP_CLAUSE_CODE (c
))
10261 /* These clauses are allowed on task, move them there. */
10262 case OMP_CLAUSE_SHARED
:
10263 case OMP_CLAUSE_FIRSTPRIVATE
:
10264 case OMP_CLAUSE_DEFAULT
:
10265 case OMP_CLAUSE_IF
:
10266 case OMP_CLAUSE_UNTIED
:
10267 case OMP_CLAUSE_FINAL
:
10268 case OMP_CLAUSE_MERGEABLE
:
10269 case OMP_CLAUSE_PRIORITY
:
10270 *gtask_clauses_ptr
= c
;
10271 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
10273 case OMP_CLAUSE_PRIVATE
:
10274 if (OMP_CLAUSE_PRIVATE_TASKLOOP_IV (c
))
10276 /* We want private on outer for and firstprivate
10279 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
10280 OMP_CLAUSE_FIRSTPRIVATE
);
10281 OMP_CLAUSE_DECL (*gtask_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
10282 lang_hooks
.decls
.omp_finish_clause (*gtask_clauses_ptr
, NULL
);
10283 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr
);
10284 *gforo_clauses_ptr
= c
;
10285 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
10289 *gtask_clauses_ptr
= c
;
10290 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
10293 /* These clauses go into outer taskloop clauses. */
10294 case OMP_CLAUSE_GRAINSIZE
:
10295 case OMP_CLAUSE_NUM_TASKS
:
10296 case OMP_CLAUSE_NOGROUP
:
10297 *gforo_clauses_ptr
= c
;
10298 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
10300 /* Taskloop clause we duplicate on both taskloops. */
10301 case OMP_CLAUSE_COLLAPSE
:
10302 *gfor_clauses_ptr
= c
;
10303 gfor_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
10304 *gforo_clauses_ptr
= copy_node (c
);
10305 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr
);
10307 /* For lastprivate, keep the clause on inner taskloop, and add
10308 a shared clause on task. If the same decl is also firstprivate,
10309 add also firstprivate clause on the inner taskloop. */
10310 case OMP_CLAUSE_LASTPRIVATE
:
10311 if (OMP_CLAUSE_LASTPRIVATE_TASKLOOP_IV (c
))
10313 /* For taskloop C++ lastprivate IVs, we want:
10314 1) private on outer taskloop
10315 2) firstprivate and shared on task
10316 3) lastprivate on inner taskloop */
10318 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
10319 OMP_CLAUSE_FIRSTPRIVATE
);
10320 OMP_CLAUSE_DECL (*gtask_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
10321 lang_hooks
.decls
.omp_finish_clause (*gtask_clauses_ptr
, NULL
);
10322 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr
);
10323 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
) = 1;
10324 *gforo_clauses_ptr
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
10325 OMP_CLAUSE_PRIVATE
);
10326 OMP_CLAUSE_DECL (*gforo_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
10327 OMP_CLAUSE_PRIVATE_TASKLOOP_IV (*gforo_clauses_ptr
) = 1;
10328 TREE_TYPE (*gforo_clauses_ptr
) = TREE_TYPE (c
);
10329 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr
);
10331 *gfor_clauses_ptr
= c
;
10332 gfor_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
10334 = build_omp_clause (OMP_CLAUSE_LOCATION (c
), OMP_CLAUSE_SHARED
);
10335 OMP_CLAUSE_DECL (*gtask_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
10336 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
))
10337 OMP_CLAUSE_SHARED_FIRSTPRIVATE (*gtask_clauses_ptr
) = 1;
10339 = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr
);
10342 gcc_unreachable ();
10344 *gfor_clauses_ptr
= NULL_TREE
;
10345 *gtask_clauses_ptr
= NULL_TREE
;
10346 *gforo_clauses_ptr
= NULL_TREE
;
10347 g
= gimple_build_bind (NULL_TREE
, gfor
, NULL_TREE
);
10348 g
= gimple_build_omp_task (g
, task_clauses
, NULL_TREE
, NULL_TREE
,
10349 NULL_TREE
, NULL_TREE
, NULL_TREE
);
10350 gimple_omp_task_set_taskloop_p (g
, true);
10351 g
= gimple_build_bind (NULL_TREE
, g
, NULL_TREE
);
10353 = gimple_build_omp_for (g
, GF_OMP_FOR_KIND_TASKLOOP
, outer_for_clauses
,
10354 gimple_omp_for_collapse (gfor
),
10355 gimple_omp_for_pre_body (gfor
));
10356 gimple_omp_for_set_pre_body (gfor
, NULL
);
10357 gimple_omp_for_set_combined_p (gforo
, true);
10358 gimple_omp_for_set_combined_into_p (gfor
, true);
10359 for (i
= 0; i
< (int) gimple_omp_for_collapse (gfor
); i
++)
10361 tree type
= TREE_TYPE (gimple_omp_for_index (gfor
, i
));
10362 tree v
= create_tmp_var (type
);
10363 gimple_omp_for_set_index (gforo
, i
, v
);
10364 t
= unshare_expr (gimple_omp_for_initial (gfor
, i
));
10365 gimple_omp_for_set_initial (gforo
, i
, t
);
10366 gimple_omp_for_set_cond (gforo
, i
,
10367 gimple_omp_for_cond (gfor
, i
));
10368 t
= unshare_expr (gimple_omp_for_final (gfor
, i
));
10369 gimple_omp_for_set_final (gforo
, i
, t
);
10370 t
= unshare_expr (gimple_omp_for_incr (gfor
, i
));
10371 gcc_assert (TREE_OPERAND (t
, 0) == gimple_omp_for_index (gfor
, i
));
10372 TREE_OPERAND (t
, 0) = v
;
10373 gimple_omp_for_set_incr (gforo
, i
, t
);
10374 t
= build_omp_clause (input_location
, OMP_CLAUSE_PRIVATE
);
10375 OMP_CLAUSE_DECL (t
) = v
;
10376 OMP_CLAUSE_CHAIN (t
) = gimple_omp_for_clauses (gforo
);
10377 gimple_omp_for_set_clauses (gforo
, t
);
10379 gimplify_seq_add_stmt (pre_p
, gforo
);
10382 gimplify_seq_add_stmt (pre_p
, gfor
);
10383 if (ret
!= GS_ALL_DONE
)
10385 *expr_p
= NULL_TREE
;
10386 return GS_ALL_DONE
;
10389 /* Helper function of optimize_target_teams, find OMP_TEAMS inside
10390 of OMP_TARGET's body. */
10393 find_omp_teams (tree
*tp
, int *walk_subtrees
, void *)
10395 *walk_subtrees
= 0;
10396 switch (TREE_CODE (*tp
))
10401 case STATEMENT_LIST
:
10402 *walk_subtrees
= 1;
10410 /* Helper function of optimize_target_teams, determine if the expression
10411 can be computed safely before the target construct on the host. */
10414 computable_teams_clause (tree
*tp
, int *walk_subtrees
, void *)
10420 *walk_subtrees
= 0;
10423 switch (TREE_CODE (*tp
))
10428 *walk_subtrees
= 0;
10429 if (error_operand_p (*tp
)
10430 || !INTEGRAL_TYPE_P (TREE_TYPE (*tp
))
10431 || DECL_HAS_VALUE_EXPR_P (*tp
)
10432 || DECL_THREAD_LOCAL_P (*tp
)
10433 || TREE_SIDE_EFFECTS (*tp
)
10434 || TREE_THIS_VOLATILE (*tp
))
10436 if (is_global_var (*tp
)
10437 && (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (*tp
))
10438 || lookup_attribute ("omp declare target link",
10439 DECL_ATTRIBUTES (*tp
))))
10442 && !DECL_SEEN_IN_BIND_EXPR_P (*tp
)
10443 && !is_global_var (*tp
)
10444 && decl_function_context (*tp
) == current_function_decl
)
10446 n
= splay_tree_lookup (gimplify_omp_ctxp
->variables
,
10447 (splay_tree_key
) *tp
);
10450 if (gimplify_omp_ctxp
->target_map_scalars_firstprivate
)
10454 else if (n
->value
& GOVD_LOCAL
)
10456 else if (n
->value
& GOVD_FIRSTPRIVATE
)
10458 else if ((n
->value
& (GOVD_MAP
| GOVD_MAP_ALWAYS_TO
))
10459 == (GOVD_MAP
| GOVD_MAP_ALWAYS_TO
))
10463 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp
)))
10467 if (TARGET_EXPR_INITIAL (*tp
)
10468 || TREE_CODE (TARGET_EXPR_SLOT (*tp
)) != VAR_DECL
)
10470 return computable_teams_clause (&TARGET_EXPR_SLOT (*tp
),
10471 walk_subtrees
, NULL
);
10472 /* Allow some reasonable subset of integral arithmetics. */
10476 case TRUNC_DIV_EXPR
:
10477 case CEIL_DIV_EXPR
:
10478 case FLOOR_DIV_EXPR
:
10479 case ROUND_DIV_EXPR
:
10480 case TRUNC_MOD_EXPR
:
10481 case CEIL_MOD_EXPR
:
10482 case FLOOR_MOD_EXPR
:
10483 case ROUND_MOD_EXPR
:
10485 case EXACT_DIV_EXPR
:
10496 case NON_LVALUE_EXPR
:
10498 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp
)))
10501 /* And disallow anything else, except for comparisons. */
10503 if (COMPARISON_CLASS_P (*tp
))
10509 /* Try to determine if the num_teams and/or thread_limit expressions
10510 can have their values determined already before entering the
10512 INTEGER_CSTs trivially are,
10513 integral decls that are firstprivate (explicitly or implicitly)
10514 or explicitly map(always, to:) or map(always, tofrom:) on the target
10515 region too, and expressions involving simple arithmetics on those
10516 too, function calls are not ok, dereferencing something neither etc.
10517 Add NUM_TEAMS and THREAD_LIMIT clauses to the OMP_CLAUSES of
10518 EXPR based on what we find:
10519 0 stands for clause not specified at all, use implementation default
10520 -1 stands for value that can't be determined easily before entering
10521 the target construct.
10522 If teams construct is not present at all, use 1 for num_teams
10523 and 0 for thread_limit (only one team is involved, and the thread
10524 limit is implementation defined. */
10527 optimize_target_teams (tree target
, gimple_seq
*pre_p
)
10529 tree body
= OMP_BODY (target
);
10530 tree teams
= walk_tree (&body
, find_omp_teams
, NULL
, NULL
);
10531 tree num_teams
= integer_zero_node
;
10532 tree thread_limit
= integer_zero_node
;
10533 location_t num_teams_loc
= EXPR_LOCATION (target
);
10534 location_t thread_limit_loc
= EXPR_LOCATION (target
);
10536 struct gimplify_omp_ctx
*target_ctx
= gimplify_omp_ctxp
;
10538 if (teams
== NULL_TREE
)
10539 num_teams
= integer_one_node
;
10541 for (c
= OMP_TEAMS_CLAUSES (teams
); c
; c
= OMP_CLAUSE_CHAIN (c
))
10543 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_NUM_TEAMS
)
10546 num_teams_loc
= OMP_CLAUSE_LOCATION (c
);
10548 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_THREAD_LIMIT
)
10551 thread_limit_loc
= OMP_CLAUSE_LOCATION (c
);
10555 expr
= OMP_CLAUSE_OPERAND (c
, 0);
10556 if (TREE_CODE (expr
) == INTEGER_CST
)
10561 if (walk_tree (&expr
, computable_teams_clause
, NULL
, NULL
))
10563 *p
= integer_minus_one_node
;
10567 gimplify_omp_ctxp
= gimplify_omp_ctxp
->outer_context
;
10568 if (gimplify_expr (p
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
, false)
10571 gimplify_omp_ctxp
= target_ctx
;
10572 *p
= integer_minus_one_node
;
10575 gimplify_omp_ctxp
= target_ctx
;
10576 if (!DECL_P (expr
) && TREE_CODE (expr
) != TARGET_EXPR
)
10577 OMP_CLAUSE_OPERAND (c
, 0) = *p
;
10579 c
= build_omp_clause (thread_limit_loc
, OMP_CLAUSE_THREAD_LIMIT
);
10580 OMP_CLAUSE_THREAD_LIMIT_EXPR (c
) = thread_limit
;
10581 OMP_CLAUSE_CHAIN (c
) = OMP_TARGET_CLAUSES (target
);
10582 OMP_TARGET_CLAUSES (target
) = c
;
10583 c
= build_omp_clause (num_teams_loc
, OMP_CLAUSE_NUM_TEAMS
);
10584 OMP_CLAUSE_NUM_TEAMS_EXPR (c
) = num_teams
;
10585 OMP_CLAUSE_CHAIN (c
) = OMP_TARGET_CLAUSES (target
);
10586 OMP_TARGET_CLAUSES (target
) = c
;
10589 /* Gimplify the gross structure of several OMP constructs. */
10592 gimplify_omp_workshare (tree
*expr_p
, gimple_seq
*pre_p
)
10594 tree expr
= *expr_p
;
10596 gimple_seq body
= NULL
;
10597 enum omp_region_type ort
;
10599 switch (TREE_CODE (expr
))
10603 ort
= ORT_WORKSHARE
;
10606 ort
= OMP_TARGET_COMBINED (expr
) ? ORT_COMBINED_TARGET
: ORT_TARGET
;
10609 ort
= ORT_ACC_KERNELS
;
10611 case OACC_PARALLEL
:
10612 ort
= ORT_ACC_PARALLEL
;
10615 ort
= ORT_ACC_DATA
;
10617 case OMP_TARGET_DATA
:
10618 ort
= ORT_TARGET_DATA
;
10621 ort
= OMP_TEAMS_COMBINED (expr
) ? ORT_COMBINED_TEAMS
: ORT_TEAMS
;
10623 case OACC_HOST_DATA
:
10624 ort
= ORT_ACC_HOST_DATA
;
10627 gcc_unreachable ();
10629 gimplify_scan_omp_clauses (&OMP_CLAUSES (expr
), pre_p
, ort
,
10631 if (TREE_CODE (expr
) == OMP_TARGET
)
10632 optimize_target_teams (expr
, pre_p
);
10633 if ((ort
& (ORT_TARGET
| ORT_TARGET_DATA
)) != 0)
10635 push_gimplify_context ();
10636 gimple
*g
= gimplify_and_return_first (OMP_BODY (expr
), &body
);
10637 if (gimple_code (g
) == GIMPLE_BIND
)
10638 pop_gimplify_context (g
);
10640 pop_gimplify_context (NULL
);
10641 if ((ort
& ORT_TARGET_DATA
) != 0)
10643 enum built_in_function end_ix
;
10644 switch (TREE_CODE (expr
))
10647 case OACC_HOST_DATA
:
10648 end_ix
= BUILT_IN_GOACC_DATA_END
;
10650 case OMP_TARGET_DATA
:
10651 end_ix
= BUILT_IN_GOMP_TARGET_END_DATA
;
10654 gcc_unreachable ();
10656 tree fn
= builtin_decl_explicit (end_ix
);
10657 g
= gimple_build_call (fn
, 0);
10658 gimple_seq cleanup
= NULL
;
10659 gimple_seq_add_stmt (&cleanup
, g
);
10660 g
= gimple_build_try (body
, cleanup
, GIMPLE_TRY_FINALLY
);
10662 gimple_seq_add_stmt (&body
, g
);
10666 gimplify_and_add (OMP_BODY (expr
), &body
);
10667 gimplify_adjust_omp_clauses (pre_p
, body
, &OMP_CLAUSES (expr
),
10670 switch (TREE_CODE (expr
))
10673 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_DATA
,
10674 OMP_CLAUSES (expr
));
10677 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_KERNELS
,
10678 OMP_CLAUSES (expr
));
10680 case OACC_HOST_DATA
:
10681 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_HOST_DATA
,
10682 OMP_CLAUSES (expr
));
10684 case OACC_PARALLEL
:
10685 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_PARALLEL
,
10686 OMP_CLAUSES (expr
));
10689 stmt
= gimple_build_omp_sections (body
, OMP_CLAUSES (expr
));
10692 stmt
= gimple_build_omp_single (body
, OMP_CLAUSES (expr
));
10695 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_REGION
,
10696 OMP_CLAUSES (expr
));
10698 case OMP_TARGET_DATA
:
10699 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_DATA
,
10700 OMP_CLAUSES (expr
));
10703 stmt
= gimple_build_omp_teams (body
, OMP_CLAUSES (expr
));
10706 gcc_unreachable ();
10709 gimplify_seq_add_stmt (pre_p
, stmt
);
10710 *expr_p
= NULL_TREE
;
10713 /* Gimplify the gross structure of OpenACC enter/exit data, update, and OpenMP
10714 target update constructs. */
10717 gimplify_omp_target_update (tree
*expr_p
, gimple_seq
*pre_p
)
10719 tree expr
= *expr_p
;
10722 enum omp_region_type ort
= ORT_WORKSHARE
;
10724 switch (TREE_CODE (expr
))
10726 case OACC_ENTER_DATA
:
10727 case OACC_EXIT_DATA
:
10728 kind
= GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA
;
10732 kind
= GF_OMP_TARGET_KIND_OACC_UPDATE
;
10735 case OMP_TARGET_UPDATE
:
10736 kind
= GF_OMP_TARGET_KIND_UPDATE
;
10738 case OMP_TARGET_ENTER_DATA
:
10739 kind
= GF_OMP_TARGET_KIND_ENTER_DATA
;
10741 case OMP_TARGET_EXIT_DATA
:
10742 kind
= GF_OMP_TARGET_KIND_EXIT_DATA
;
10745 gcc_unreachable ();
10747 gimplify_scan_omp_clauses (&OMP_STANDALONE_CLAUSES (expr
), pre_p
,
10748 ort
, TREE_CODE (expr
));
10749 gimplify_adjust_omp_clauses (pre_p
, NULL
, &OMP_STANDALONE_CLAUSES (expr
),
10751 stmt
= gimple_build_omp_target (NULL
, kind
, OMP_STANDALONE_CLAUSES (expr
));
10753 gimplify_seq_add_stmt (pre_p
, stmt
);
10754 *expr_p
= NULL_TREE
;
10757 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
10758 stabilized the lhs of the atomic operation as *ADDR. Return true if
10759 EXPR is this stabilized form. */
10762 goa_lhs_expr_p (tree expr
, tree addr
)
10764 /* Also include casts to other type variants. The C front end is fond
10765 of adding these for e.g. volatile variables. This is like
10766 STRIP_TYPE_NOPS but includes the main variant lookup. */
10767 STRIP_USELESS_TYPE_CONVERSION (expr
);
10769 if (TREE_CODE (expr
) == INDIRECT_REF
)
10771 expr
= TREE_OPERAND (expr
, 0);
10772 while (expr
!= addr
10773 && (CONVERT_EXPR_P (expr
)
10774 || TREE_CODE (expr
) == NON_LVALUE_EXPR
)
10775 && TREE_CODE (expr
) == TREE_CODE (addr
)
10776 && types_compatible_p (TREE_TYPE (expr
), TREE_TYPE (addr
)))
10778 expr
= TREE_OPERAND (expr
, 0);
10779 addr
= TREE_OPERAND (addr
, 0);
10783 return (TREE_CODE (addr
) == ADDR_EXPR
10784 && TREE_CODE (expr
) == ADDR_EXPR
10785 && TREE_OPERAND (addr
, 0) == TREE_OPERAND (expr
, 0));
10787 if (TREE_CODE (addr
) == ADDR_EXPR
&& expr
== TREE_OPERAND (addr
, 0))
10792 /* Walk *EXPR_P and replace appearances of *LHS_ADDR with LHS_VAR. If an
10793 expression does not involve the lhs, evaluate it into a temporary.
10794 Return 1 if the lhs appeared as a subexpression, 0 if it did not,
10795 or -1 if an error was encountered. */
10798 goa_stabilize_expr (tree
*expr_p
, gimple_seq
*pre_p
, tree lhs_addr
,
10801 tree expr
= *expr_p
;
10804 if (goa_lhs_expr_p (expr
, lhs_addr
))
10809 if (is_gimple_val (expr
))
10813 switch (TREE_CODE_CLASS (TREE_CODE (expr
)))
10816 case tcc_comparison
:
10817 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 1), pre_p
, lhs_addr
,
10821 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 0), pre_p
, lhs_addr
,
10824 case tcc_expression
:
10825 switch (TREE_CODE (expr
))
10827 case TRUTH_ANDIF_EXPR
:
10828 case TRUTH_ORIF_EXPR
:
10829 case TRUTH_AND_EXPR
:
10830 case TRUTH_OR_EXPR
:
10831 case TRUTH_XOR_EXPR
:
10832 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 1), pre_p
,
10833 lhs_addr
, lhs_var
);
10835 case TRUTH_NOT_EXPR
:
10836 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 0), pre_p
,
10837 lhs_addr
, lhs_var
);
10839 case COMPOUND_EXPR
:
10840 /* Break out any preevaluations from cp_build_modify_expr. */
10841 for (; TREE_CODE (expr
) == COMPOUND_EXPR
;
10842 expr
= TREE_OPERAND (expr
, 1))
10843 gimplify_stmt (&TREE_OPERAND (expr
, 0), pre_p
);
10845 return goa_stabilize_expr (expr_p
, pre_p
, lhs_addr
, lhs_var
);
10856 enum gimplify_status gs
;
10857 gs
= gimplify_expr (expr_p
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
10858 if (gs
!= GS_ALL_DONE
)
10865 /* Gimplify an OMP_ATOMIC statement. */
10867 static enum gimplify_status
10868 gimplify_omp_atomic (tree
*expr_p
, gimple_seq
*pre_p
)
10870 tree addr
= TREE_OPERAND (*expr_p
, 0);
10871 tree rhs
= TREE_CODE (*expr_p
) == OMP_ATOMIC_READ
10872 ? NULL
: TREE_OPERAND (*expr_p
, 1);
10873 tree type
= TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr
)));
10875 gomp_atomic_load
*loadstmt
;
10876 gomp_atomic_store
*storestmt
;
10878 tmp_load
= create_tmp_reg (type
);
10879 if (rhs
&& goa_stabilize_expr (&rhs
, pre_p
, addr
, tmp_load
) < 0)
10882 if (gimplify_expr (&addr
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
)
10886 loadstmt
= gimple_build_omp_atomic_load (tmp_load
, addr
);
10887 gimplify_seq_add_stmt (pre_p
, loadstmt
);
10888 if (rhs
&& gimplify_expr (&rhs
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
)
10892 if (TREE_CODE (*expr_p
) == OMP_ATOMIC_READ
)
10894 storestmt
= gimple_build_omp_atomic_store (rhs
);
10895 gimplify_seq_add_stmt (pre_p
, storestmt
);
10896 if (OMP_ATOMIC_SEQ_CST (*expr_p
))
10898 gimple_omp_atomic_set_seq_cst (loadstmt
);
10899 gimple_omp_atomic_set_seq_cst (storestmt
);
10901 switch (TREE_CODE (*expr_p
))
10903 case OMP_ATOMIC_READ
:
10904 case OMP_ATOMIC_CAPTURE_OLD
:
10905 *expr_p
= tmp_load
;
10906 gimple_omp_atomic_set_need_value (loadstmt
);
10908 case OMP_ATOMIC_CAPTURE_NEW
:
10910 gimple_omp_atomic_set_need_value (storestmt
);
10917 return GS_ALL_DONE
;
10920 /* Gimplify a TRANSACTION_EXPR. This involves gimplification of the
10921 body, and adding some EH bits. */
10923 static enum gimplify_status
10924 gimplify_transaction (tree
*expr_p
, gimple_seq
*pre_p
)
10926 tree expr
= *expr_p
, temp
, tbody
= TRANSACTION_EXPR_BODY (expr
);
10928 gtransaction
*trans_stmt
;
10929 gimple_seq body
= NULL
;
10932 /* Wrap the transaction body in a BIND_EXPR so we have a context
10933 where to put decls for OMP. */
10934 if (TREE_CODE (tbody
) != BIND_EXPR
)
10936 tree bind
= build3 (BIND_EXPR
, void_type_node
, NULL
, tbody
, NULL
);
10937 TREE_SIDE_EFFECTS (bind
) = 1;
10938 SET_EXPR_LOCATION (bind
, EXPR_LOCATION (tbody
));
10939 TRANSACTION_EXPR_BODY (expr
) = bind
;
10942 push_gimplify_context ();
10943 temp
= voidify_wrapper_expr (*expr_p
, NULL
);
10945 body_stmt
= gimplify_and_return_first (TRANSACTION_EXPR_BODY (expr
), &body
);
10946 pop_gimplify_context (body_stmt
);
10948 trans_stmt
= gimple_build_transaction (body
);
10949 if (TRANSACTION_EXPR_OUTER (expr
))
10950 subcode
= GTMA_IS_OUTER
;
10951 else if (TRANSACTION_EXPR_RELAXED (expr
))
10952 subcode
= GTMA_IS_RELAXED
;
10953 gimple_transaction_set_subcode (trans_stmt
, subcode
);
10955 gimplify_seq_add_stmt (pre_p
, trans_stmt
);
10963 *expr_p
= NULL_TREE
;
10964 return GS_ALL_DONE
;
10967 /* Gimplify an OMP_ORDERED construct. EXPR is the tree version. BODY
10968 is the OMP_BODY of the original EXPR (which has already been
10969 gimplified so it's not present in the EXPR).
10971 Return the gimplified GIMPLE_OMP_ORDERED tuple. */
10974 gimplify_omp_ordered (tree expr
, gimple_seq body
)
10979 tree source_c
= NULL_TREE
;
10980 tree sink_c
= NULL_TREE
;
10982 if (gimplify_omp_ctxp
)
10984 for (c
= OMP_ORDERED_CLAUSES (expr
); c
; c
= OMP_CLAUSE_CHAIN (c
))
10985 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_DEPEND
10986 && gimplify_omp_ctxp
->loop_iter_var
.is_empty ()
10987 && (OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SINK
10988 || OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SOURCE
))
10990 error_at (OMP_CLAUSE_LOCATION (c
),
10991 "%<ordered%> construct with %<depend%> clause must be "
10992 "closely nested inside a loop with %<ordered%> clause "
10993 "with a parameter");
10996 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_DEPEND
10997 && OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SINK
)
11000 for (decls
= OMP_CLAUSE_DECL (c
), i
= 0;
11001 decls
&& TREE_CODE (decls
) == TREE_LIST
;
11002 decls
= TREE_CHAIN (decls
), ++i
)
11003 if (i
>= gimplify_omp_ctxp
->loop_iter_var
.length () / 2)
11005 else if (TREE_VALUE (decls
)
11006 != gimplify_omp_ctxp
->loop_iter_var
[2 * i
])
11008 error_at (OMP_CLAUSE_LOCATION (c
),
11009 "variable %qE is not an iteration "
11010 "of outermost loop %d, expected %qE",
11011 TREE_VALUE (decls
), i
+ 1,
11012 gimplify_omp_ctxp
->loop_iter_var
[2 * i
]);
11018 = gimplify_omp_ctxp
->loop_iter_var
[2 * i
+ 1];
11019 if (!fail
&& i
!= gimplify_omp_ctxp
->loop_iter_var
.length () / 2)
11021 error_at (OMP_CLAUSE_LOCATION (c
),
11022 "number of variables in %<depend(sink)%> "
11023 "clause does not match number of "
11024 "iteration variables");
11029 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_DEPEND
11030 && OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SOURCE
)
11034 error_at (OMP_CLAUSE_LOCATION (c
),
11035 "more than one %<depend(source)%> clause on an "
11036 "%<ordered%> construct");
11043 if (source_c
&& sink_c
)
11045 error_at (OMP_CLAUSE_LOCATION (source_c
),
11046 "%<depend(source)%> clause specified together with "
11047 "%<depend(sink:)%> clauses on the same construct");
11052 return gimple_build_nop ();
11053 return gimple_build_omp_ordered (body
, OMP_ORDERED_CLAUSES (expr
));
11056 /* Convert the GENERIC expression tree *EXPR_P to GIMPLE. If the
11057 expression produces a value to be used as an operand inside a GIMPLE
11058 statement, the value will be stored back in *EXPR_P. This value will
11059 be a tree of class tcc_declaration, tcc_constant, tcc_reference or
11060 an SSA_NAME. The corresponding sequence of GIMPLE statements is
11061 emitted in PRE_P and POST_P.
11063 Additionally, this process may overwrite parts of the input
11064 expression during gimplification. Ideally, it should be
11065 possible to do non-destructive gimplification.
11067 EXPR_P points to the GENERIC expression to convert to GIMPLE. If
11068 the expression needs to evaluate to a value to be used as
11069 an operand in a GIMPLE statement, this value will be stored in
11070 *EXPR_P on exit. This happens when the caller specifies one
11071 of fb_lvalue or fb_rvalue fallback flags.
11073 PRE_P will contain the sequence of GIMPLE statements corresponding
11074 to the evaluation of EXPR and all the side-effects that must
11075 be executed before the main expression. On exit, the last
11076 statement of PRE_P is the core statement being gimplified. For
11077 instance, when gimplifying 'if (++a)' the last statement in
11078 PRE_P will be 'if (t.1)' where t.1 is the result of
11079 pre-incrementing 'a'.
11081 POST_P will contain the sequence of GIMPLE statements corresponding
11082 to the evaluation of all the side-effects that must be executed
11083 after the main expression. If this is NULL, the post
11084 side-effects are stored at the end of PRE_P.
11086 The reason why the output is split in two is to handle post
11087 side-effects explicitly. In some cases, an expression may have
11088 inner and outer post side-effects which need to be emitted in
11089 an order different from the one given by the recursive
11090 traversal. For instance, for the expression (*p--)++ the post
11091 side-effects of '--' must actually occur *after* the post
11092 side-effects of '++'. However, gimplification will first visit
11093 the inner expression, so if a separate POST sequence was not
11094 used, the resulting sequence would be:
11101 However, the post-decrement operation in line #2 must not be
11102 evaluated until after the store to *p at line #4, so the
11103 correct sequence should be:
11110 So, by specifying a separate post queue, it is possible
11111 to emit the post side-effects in the correct order.
11112 If POST_P is NULL, an internal queue will be used. Before
11113 returning to the caller, the sequence POST_P is appended to
11114 the main output sequence PRE_P.
11116 GIMPLE_TEST_F points to a function that takes a tree T and
11117 returns nonzero if T is in the GIMPLE form requested by the
11118 caller. The GIMPLE predicates are in gimple.c.
11120 FALLBACK tells the function what sort of a temporary we want if
11121 gimplification cannot produce an expression that complies with
11124 fb_none means that no temporary should be generated
11125 fb_rvalue means that an rvalue is OK to generate
11126 fb_lvalue means that an lvalue is OK to generate
11127 fb_either means that either is OK, but an lvalue is preferable.
11128 fb_mayfail means that gimplification may fail (in which case
11129 GS_ERROR will be returned)
11131 The return value is either GS_ERROR or GS_ALL_DONE, since this
11132 function iterates until EXPR is completely gimplified or an error
11135 enum gimplify_status
11136 gimplify_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
11137 bool (*gimple_test_f
) (tree
), fallback_t fallback
)
11140 gimple_seq internal_pre
= NULL
;
11141 gimple_seq internal_post
= NULL
;
11144 location_t saved_location
;
11145 enum gimplify_status ret
;
11146 gimple_stmt_iterator pre_last_gsi
, post_last_gsi
;
11149 save_expr
= *expr_p
;
11150 if (save_expr
== NULL_TREE
)
11151 return GS_ALL_DONE
;
11153 /* If we are gimplifying a top-level statement, PRE_P must be valid. */
11154 is_statement
= gimple_test_f
== is_gimple_stmt
;
11156 gcc_assert (pre_p
);
11158 /* Consistency checks. */
11159 if (gimple_test_f
== is_gimple_reg
)
11160 gcc_assert (fallback
& (fb_rvalue
| fb_lvalue
));
11161 else if (gimple_test_f
== is_gimple_val
11162 || gimple_test_f
== is_gimple_call_addr
11163 || gimple_test_f
== is_gimple_condexpr
11164 || gimple_test_f
== is_gimple_mem_rhs
11165 || gimple_test_f
== is_gimple_mem_rhs_or_call
11166 || gimple_test_f
== is_gimple_reg_rhs
11167 || gimple_test_f
== is_gimple_reg_rhs_or_call
11168 || gimple_test_f
== is_gimple_asm_val
11169 || gimple_test_f
== is_gimple_mem_ref_addr
)
11170 gcc_assert (fallback
& fb_rvalue
);
11171 else if (gimple_test_f
== is_gimple_min_lval
11172 || gimple_test_f
== is_gimple_lvalue
)
11173 gcc_assert (fallback
& fb_lvalue
);
11174 else if (gimple_test_f
== is_gimple_addressable
)
11175 gcc_assert (fallback
& fb_either
);
11176 else if (gimple_test_f
== is_gimple_stmt
)
11177 gcc_assert (fallback
== fb_none
);
11180 /* We should have recognized the GIMPLE_TEST_F predicate to
11181 know what kind of fallback to use in case a temporary is
11182 needed to hold the value or address of *EXPR_P. */
11183 gcc_unreachable ();
11186 /* We used to check the predicate here and return immediately if it
11187 succeeds. This is wrong; the design is for gimplification to be
11188 idempotent, and for the predicates to only test for valid forms, not
11189 whether they are fully simplified. */
11191 pre_p
= &internal_pre
;
11193 if (post_p
== NULL
)
11194 post_p
= &internal_post
;
11196 /* Remember the last statements added to PRE_P and POST_P. Every
11197 new statement added by the gimplification helpers needs to be
11198 annotated with location information. To centralize the
11199 responsibility, we remember the last statement that had been
11200 added to both queues before gimplifying *EXPR_P. If
11201 gimplification produces new statements in PRE_P and POST_P, those
11202 statements will be annotated with the same location information
11204 pre_last_gsi
= gsi_last (*pre_p
);
11205 post_last_gsi
= gsi_last (*post_p
);
11207 saved_location
= input_location
;
11208 if (save_expr
!= error_mark_node
11209 && EXPR_HAS_LOCATION (*expr_p
))
11210 input_location
= EXPR_LOCATION (*expr_p
);
11212 /* Loop over the specific gimplifiers until the toplevel node
11213 remains the same. */
11216 /* Strip away as many useless type conversions as possible
11217 at the toplevel. */
11218 STRIP_USELESS_TYPE_CONVERSION (*expr_p
);
11220 /* Remember the expr. */
11221 save_expr
= *expr_p
;
11223 /* Die, die, die, my darling. */
11224 if (save_expr
== error_mark_node
11225 || (TREE_TYPE (save_expr
)
11226 && TREE_TYPE (save_expr
) == error_mark_node
))
11232 /* Do any language-specific gimplification. */
11233 ret
= ((enum gimplify_status
)
11234 lang_hooks
.gimplify_expr (expr_p
, pre_p
, post_p
));
11237 if (*expr_p
== NULL_TREE
)
11239 if (*expr_p
!= save_expr
)
11242 else if (ret
!= GS_UNHANDLED
)
11245 /* Make sure that all the cases set 'ret' appropriately. */
11246 ret
= GS_UNHANDLED
;
11247 switch (TREE_CODE (*expr_p
))
11249 /* First deal with the special cases. */
11251 case POSTINCREMENT_EXPR
:
11252 case POSTDECREMENT_EXPR
:
11253 case PREINCREMENT_EXPR
:
11254 case PREDECREMENT_EXPR
:
11255 ret
= gimplify_self_mod_expr (expr_p
, pre_p
, post_p
,
11256 fallback
!= fb_none
,
11257 TREE_TYPE (*expr_p
));
11260 case VIEW_CONVERT_EXPR
:
11261 if (is_gimple_reg_type (TREE_TYPE (*expr_p
))
11262 && is_gimple_reg_type (TREE_TYPE (TREE_OPERAND (*expr_p
, 0))))
11264 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
11265 post_p
, is_gimple_val
, fb_rvalue
);
11266 recalculate_side_effects (*expr_p
);
11272 case ARRAY_RANGE_REF
:
11273 case REALPART_EXPR
:
11274 case IMAGPART_EXPR
:
11275 case COMPONENT_REF
:
11276 ret
= gimplify_compound_lval (expr_p
, pre_p
, post_p
,
11277 fallback
? fallback
: fb_rvalue
);
11281 ret
= gimplify_cond_expr (expr_p
, pre_p
, fallback
);
11283 /* C99 code may assign to an array in a structure value of a
11284 conditional expression, and this has undefined behavior
11285 only on execution, so create a temporary if an lvalue is
11287 if (fallback
== fb_lvalue
)
11289 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, post_p
, false);
11290 mark_addressable (*expr_p
);
11296 ret
= gimplify_call_expr (expr_p
, pre_p
, fallback
!= fb_none
);
11298 /* C99 code may assign to an array in a structure returned
11299 from a function, and this has undefined behavior only on
11300 execution, so create a temporary if an lvalue is
11302 if (fallback
== fb_lvalue
)
11304 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, post_p
, false);
11305 mark_addressable (*expr_p
);
11311 gcc_unreachable ();
11313 case COMPOUND_EXPR
:
11314 ret
= gimplify_compound_expr (expr_p
, pre_p
, fallback
!= fb_none
);
11317 case COMPOUND_LITERAL_EXPR
:
11318 ret
= gimplify_compound_literal_expr (expr_p
, pre_p
,
11319 gimple_test_f
, fallback
);
11324 ret
= gimplify_modify_expr (expr_p
, pre_p
, post_p
,
11325 fallback
!= fb_none
);
11328 case TRUTH_ANDIF_EXPR
:
11329 case TRUTH_ORIF_EXPR
:
11331 /* Preserve the original type of the expression and the
11332 source location of the outer expression. */
11333 tree org_type
= TREE_TYPE (*expr_p
);
11334 *expr_p
= gimple_boolify (*expr_p
);
11335 *expr_p
= build3_loc (input_location
, COND_EXPR
,
11339 org_type
, boolean_true_node
),
11342 org_type
, boolean_false_node
));
11347 case TRUTH_NOT_EXPR
:
11349 tree type
= TREE_TYPE (*expr_p
);
11350 /* The parsers are careful to generate TRUTH_NOT_EXPR
11351 only with operands that are always zero or one.
11352 We do not fold here but handle the only interesting case
11353 manually, as fold may re-introduce the TRUTH_NOT_EXPR. */
11354 *expr_p
= gimple_boolify (*expr_p
);
11355 if (TYPE_PRECISION (TREE_TYPE (*expr_p
)) == 1)
11356 *expr_p
= build1_loc (input_location
, BIT_NOT_EXPR
,
11357 TREE_TYPE (*expr_p
),
11358 TREE_OPERAND (*expr_p
, 0));
11360 *expr_p
= build2_loc (input_location
, BIT_XOR_EXPR
,
11361 TREE_TYPE (*expr_p
),
11362 TREE_OPERAND (*expr_p
, 0),
11363 build_int_cst (TREE_TYPE (*expr_p
), 1));
11364 if (!useless_type_conversion_p (type
, TREE_TYPE (*expr_p
)))
11365 *expr_p
= fold_convert_loc (input_location
, type
, *expr_p
);
11371 ret
= gimplify_addr_expr (expr_p
, pre_p
, post_p
);
11374 case ANNOTATE_EXPR
:
11376 tree cond
= TREE_OPERAND (*expr_p
, 0);
11377 tree kind
= TREE_OPERAND (*expr_p
, 1);
11378 tree type
= TREE_TYPE (cond
);
11379 if (!INTEGRAL_TYPE_P (type
))
11385 tree tmp
= create_tmp_var (type
);
11386 gimplify_arg (&cond
, pre_p
, EXPR_LOCATION (*expr_p
));
11388 = gimple_build_call_internal (IFN_ANNOTATE
, 2, cond
, kind
);
11389 gimple_call_set_lhs (call
, tmp
);
11390 gimplify_seq_add_stmt (pre_p
, call
);
11397 ret
= gimplify_va_arg_expr (expr_p
, pre_p
, post_p
);
11401 if (IS_EMPTY_STMT (*expr_p
))
11407 if (VOID_TYPE_P (TREE_TYPE (*expr_p
))
11408 || fallback
== fb_none
)
11410 /* Just strip a conversion to void (or in void context) and
11412 *expr_p
= TREE_OPERAND (*expr_p
, 0);
11417 ret
= gimplify_conversion (expr_p
);
11418 if (ret
== GS_ERROR
)
11420 if (*expr_p
!= save_expr
)
11424 case FIX_TRUNC_EXPR
:
11425 /* unary_expr: ... | '(' cast ')' val | ... */
11426 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
11427 is_gimple_val
, fb_rvalue
);
11428 recalculate_side_effects (*expr_p
);
11433 bool volatilep
= TREE_THIS_VOLATILE (*expr_p
);
11434 bool notrap
= TREE_THIS_NOTRAP (*expr_p
);
11435 tree saved_ptr_type
= TREE_TYPE (TREE_OPERAND (*expr_p
, 0));
11437 *expr_p
= fold_indirect_ref_loc (input_location
, *expr_p
);
11438 if (*expr_p
!= save_expr
)
11444 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
11445 is_gimple_reg
, fb_rvalue
);
11446 if (ret
== GS_ERROR
)
11449 recalculate_side_effects (*expr_p
);
11450 *expr_p
= fold_build2_loc (input_location
, MEM_REF
,
11451 TREE_TYPE (*expr_p
),
11452 TREE_OPERAND (*expr_p
, 0),
11453 build_int_cst (saved_ptr_type
, 0));
11454 TREE_THIS_VOLATILE (*expr_p
) = volatilep
;
11455 TREE_THIS_NOTRAP (*expr_p
) = notrap
;
11460 /* We arrive here through the various re-gimplifcation paths. */
11462 /* First try re-folding the whole thing. */
11463 tmp
= fold_binary (MEM_REF
, TREE_TYPE (*expr_p
),
11464 TREE_OPERAND (*expr_p
, 0),
11465 TREE_OPERAND (*expr_p
, 1));
11468 REF_REVERSE_STORAGE_ORDER (tmp
)
11469 = REF_REVERSE_STORAGE_ORDER (*expr_p
);
11471 recalculate_side_effects (*expr_p
);
11475 /* Avoid re-gimplifying the address operand if it is already
11476 in suitable form. Re-gimplifying would mark the address
11477 operand addressable. Always gimplify when not in SSA form
11478 as we still may have to gimplify decls with value-exprs. */
11479 if (!gimplify_ctxp
|| !gimple_in_ssa_p (cfun
)
11480 || !is_gimple_mem_ref_addr (TREE_OPERAND (*expr_p
, 0)))
11482 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
11483 is_gimple_mem_ref_addr
, fb_rvalue
);
11484 if (ret
== GS_ERROR
)
11487 recalculate_side_effects (*expr_p
);
11491 /* Constants need not be gimplified. */
11498 /* Drop the overflow flag on constants, we do not want
11499 that in the GIMPLE IL. */
11500 if (TREE_OVERFLOW_P (*expr_p
))
11501 *expr_p
= drop_tree_overflow (*expr_p
);
11506 /* If we require an lvalue, such as for ADDR_EXPR, retain the
11507 CONST_DECL node. Otherwise the decl is replaceable by its
11509 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
11510 if (fallback
& fb_lvalue
)
11514 *expr_p
= DECL_INITIAL (*expr_p
);
11520 ret
= gimplify_decl_expr (expr_p
, pre_p
);
11524 ret
= gimplify_bind_expr (expr_p
, pre_p
);
11528 ret
= gimplify_loop_expr (expr_p
, pre_p
);
11532 ret
= gimplify_switch_expr (expr_p
, pre_p
);
11536 ret
= gimplify_exit_expr (expr_p
);
11540 /* If the target is not LABEL, then it is a computed jump
11541 and the target needs to be gimplified. */
11542 if (TREE_CODE (GOTO_DESTINATION (*expr_p
)) != LABEL_DECL
)
11544 ret
= gimplify_expr (&GOTO_DESTINATION (*expr_p
), pre_p
,
11545 NULL
, is_gimple_val
, fb_rvalue
);
11546 if (ret
== GS_ERROR
)
11549 gimplify_seq_add_stmt (pre_p
,
11550 gimple_build_goto (GOTO_DESTINATION (*expr_p
)));
11555 gimplify_seq_add_stmt (pre_p
,
11556 gimple_build_predict (PREDICT_EXPR_PREDICTOR (*expr_p
),
11557 PREDICT_EXPR_OUTCOME (*expr_p
)));
11562 ret
= gimplify_label_expr (expr_p
, pre_p
);
11563 label
= LABEL_EXPR_LABEL (*expr_p
);
11564 gcc_assert (decl_function_context (label
) == current_function_decl
);
11566 /* If the label is used in a goto statement, or address of the label
11567 is taken, we need to unpoison all variables that were seen so far.
11568 Doing so would prevent us from reporting a false positives. */
11569 if (asan_poisoned_variables
11570 && asan_used_labels
!= NULL
11571 && asan_used_labels
->contains (label
))
11572 asan_poison_variables (asan_poisoned_variables
, false, pre_p
);
11575 case CASE_LABEL_EXPR
:
11576 ret
= gimplify_case_label_expr (expr_p
, pre_p
);
11578 if (gimplify_ctxp
->live_switch_vars
)
11579 asan_poison_variables (gimplify_ctxp
->live_switch_vars
, false,
11584 ret
= gimplify_return_expr (*expr_p
, pre_p
);
11588 /* Don't reduce this in place; let gimplify_init_constructor work its
11589 magic. Buf if we're just elaborating this for side effects, just
11590 gimplify any element that has side-effects. */
11591 if (fallback
== fb_none
)
11593 unsigned HOST_WIDE_INT ix
;
11595 tree temp
= NULL_TREE
;
11596 FOR_EACH_CONSTRUCTOR_VALUE (CONSTRUCTOR_ELTS (*expr_p
), ix
, val
)
11597 if (TREE_SIDE_EFFECTS (val
))
11598 append_to_statement_list (val
, &temp
);
11601 ret
= temp
? GS_OK
: GS_ALL_DONE
;
11603 /* C99 code may assign to an array in a constructed
11604 structure or union, and this has undefined behavior only
11605 on execution, so create a temporary if an lvalue is
11607 else if (fallback
== fb_lvalue
)
11609 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, post_p
, false);
11610 mark_addressable (*expr_p
);
11617 /* The following are special cases that are not handled by the
11618 original GIMPLE grammar. */
11620 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
11623 ret
= gimplify_save_expr (expr_p
, pre_p
, post_p
);
11626 case BIT_FIELD_REF
:
11627 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
11628 post_p
, is_gimple_lvalue
, fb_either
);
11629 recalculate_side_effects (*expr_p
);
11632 case TARGET_MEM_REF
:
11634 enum gimplify_status r0
= GS_ALL_DONE
, r1
= GS_ALL_DONE
;
11636 if (TMR_BASE (*expr_p
))
11637 r0
= gimplify_expr (&TMR_BASE (*expr_p
), pre_p
,
11638 post_p
, is_gimple_mem_ref_addr
, fb_either
);
11639 if (TMR_INDEX (*expr_p
))
11640 r1
= gimplify_expr (&TMR_INDEX (*expr_p
), pre_p
,
11641 post_p
, is_gimple_val
, fb_rvalue
);
11642 if (TMR_INDEX2 (*expr_p
))
11643 r1
= gimplify_expr (&TMR_INDEX2 (*expr_p
), pre_p
,
11644 post_p
, is_gimple_val
, fb_rvalue
);
11645 /* TMR_STEP and TMR_OFFSET are always integer constants. */
11646 ret
= MIN (r0
, r1
);
11650 case NON_LVALUE_EXPR
:
11651 /* This should have been stripped above. */
11652 gcc_unreachable ();
11655 ret
= gimplify_asm_expr (expr_p
, pre_p
, post_p
);
11658 case TRY_FINALLY_EXPR
:
11659 case TRY_CATCH_EXPR
:
11661 gimple_seq eval
, cleanup
;
11664 /* Calls to destructors are generated automatically in FINALLY/CATCH
11665 block. They should have location as UNKNOWN_LOCATION. However,
11666 gimplify_call_expr will reset these call stmts to input_location
11667 if it finds stmt's location is unknown. To prevent resetting for
11668 destructors, we set the input_location to unknown.
11669 Note that this only affects the destructor calls in FINALLY/CATCH
11670 block, and will automatically reset to its original value by the
11671 end of gimplify_expr. */
11672 input_location
= UNKNOWN_LOCATION
;
11673 eval
= cleanup
= NULL
;
11674 gimplify_and_add (TREE_OPERAND (*expr_p
, 0), &eval
);
11675 gimplify_and_add (TREE_OPERAND (*expr_p
, 1), &cleanup
);
11676 /* Don't create bogus GIMPLE_TRY with empty cleanup. */
11677 if (gimple_seq_empty_p (cleanup
))
11679 gimple_seq_add_seq (pre_p
, eval
);
11683 try_
= gimple_build_try (eval
, cleanup
,
11684 TREE_CODE (*expr_p
) == TRY_FINALLY_EXPR
11685 ? GIMPLE_TRY_FINALLY
11686 : GIMPLE_TRY_CATCH
);
11687 if (EXPR_HAS_LOCATION (save_expr
))
11688 gimple_set_location (try_
, EXPR_LOCATION (save_expr
));
11689 else if (LOCATION_LOCUS (saved_location
) != UNKNOWN_LOCATION
)
11690 gimple_set_location (try_
, saved_location
);
11691 if (TREE_CODE (*expr_p
) == TRY_CATCH_EXPR
)
11692 gimple_try_set_catch_is_cleanup (try_
,
11693 TRY_CATCH_IS_CLEANUP (*expr_p
));
11694 gimplify_seq_add_stmt (pre_p
, try_
);
11699 case CLEANUP_POINT_EXPR
:
11700 ret
= gimplify_cleanup_point_expr (expr_p
, pre_p
);
11704 ret
= gimplify_target_expr (expr_p
, pre_p
, post_p
);
11710 gimple_seq handler
= NULL
;
11711 gimplify_and_add (CATCH_BODY (*expr_p
), &handler
);
11712 c
= gimple_build_catch (CATCH_TYPES (*expr_p
), handler
);
11713 gimplify_seq_add_stmt (pre_p
, c
);
11718 case EH_FILTER_EXPR
:
11721 gimple_seq failure
= NULL
;
11723 gimplify_and_add (EH_FILTER_FAILURE (*expr_p
), &failure
);
11724 ehf
= gimple_build_eh_filter (EH_FILTER_TYPES (*expr_p
), failure
);
11725 gimple_set_no_warning (ehf
, TREE_NO_WARNING (*expr_p
));
11726 gimplify_seq_add_stmt (pre_p
, ehf
);
11733 enum gimplify_status r0
, r1
;
11734 r0
= gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p
), pre_p
,
11735 post_p
, is_gimple_val
, fb_rvalue
);
11736 r1
= gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p
), pre_p
,
11737 post_p
, is_gimple_val
, fb_rvalue
);
11738 TREE_SIDE_EFFECTS (*expr_p
) = 0;
11739 ret
= MIN (r0
, r1
);
11744 /* We get here when taking the address of a label. We mark
11745 the label as "forced"; meaning it can never be removed and
11746 it is a potential target for any computed goto. */
11747 FORCED_LABEL (*expr_p
) = 1;
11751 case STATEMENT_LIST
:
11752 ret
= gimplify_statement_list (expr_p
, pre_p
);
11755 case WITH_SIZE_EXPR
:
11757 gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
11758 post_p
== &internal_post
? NULL
: post_p
,
11759 gimple_test_f
, fallback
);
11760 gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
, post_p
,
11761 is_gimple_val
, fb_rvalue
);
11768 ret
= gimplify_var_or_parm_decl (expr_p
);
11772 /* When within an OMP context, notice uses of variables. */
11773 if (gimplify_omp_ctxp
)
11774 omp_notice_variable (gimplify_omp_ctxp
, *expr_p
, true);
11779 /* Allow callbacks into the gimplifier during optimization. */
11784 gimplify_omp_parallel (expr_p
, pre_p
);
11789 gimplify_omp_task (expr_p
, pre_p
);
11797 case OMP_DISTRIBUTE
:
11800 ret
= gimplify_omp_for (expr_p
, pre_p
);
11804 gimplify_oacc_cache (expr_p
, pre_p
);
11809 gimplify_oacc_declare (expr_p
, pre_p
);
11813 case OACC_HOST_DATA
:
11816 case OACC_PARALLEL
:
11820 case OMP_TARGET_DATA
:
11822 gimplify_omp_workshare (expr_p
, pre_p
);
11826 case OACC_ENTER_DATA
:
11827 case OACC_EXIT_DATA
:
11829 case OMP_TARGET_UPDATE
:
11830 case OMP_TARGET_ENTER_DATA
:
11831 case OMP_TARGET_EXIT_DATA
:
11832 gimplify_omp_target_update (expr_p
, pre_p
);
11838 case OMP_TASKGROUP
:
11842 gimple_seq body
= NULL
;
11845 gimplify_and_add (OMP_BODY (*expr_p
), &body
);
11846 switch (TREE_CODE (*expr_p
))
11849 g
= gimple_build_omp_section (body
);
11852 g
= gimple_build_omp_master (body
);
11854 case OMP_TASKGROUP
:
11856 gimple_seq cleanup
= NULL
;
11858 = builtin_decl_explicit (BUILT_IN_GOMP_TASKGROUP_END
);
11859 g
= gimple_build_call (fn
, 0);
11860 gimple_seq_add_stmt (&cleanup
, g
);
11861 g
= gimple_build_try (body
, cleanup
, GIMPLE_TRY_FINALLY
);
11863 gimple_seq_add_stmt (&body
, g
);
11864 g
= gimple_build_omp_taskgroup (body
);
11868 g
= gimplify_omp_ordered (*expr_p
, body
);
11871 gimplify_scan_omp_clauses (&OMP_CRITICAL_CLAUSES (*expr_p
),
11872 pre_p
, ORT_WORKSHARE
, OMP_CRITICAL
);
11873 gimplify_adjust_omp_clauses (pre_p
, body
,
11874 &OMP_CRITICAL_CLAUSES (*expr_p
),
11876 g
= gimple_build_omp_critical (body
,
11877 OMP_CRITICAL_NAME (*expr_p
),
11878 OMP_CRITICAL_CLAUSES (*expr_p
));
11881 gcc_unreachable ();
11883 gimplify_seq_add_stmt (pre_p
, g
);
11889 case OMP_ATOMIC_READ
:
11890 case OMP_ATOMIC_CAPTURE_OLD
:
11891 case OMP_ATOMIC_CAPTURE_NEW
:
11892 ret
= gimplify_omp_atomic (expr_p
, pre_p
);
11895 case TRANSACTION_EXPR
:
11896 ret
= gimplify_transaction (expr_p
, pre_p
);
11899 case TRUTH_AND_EXPR
:
11900 case TRUTH_OR_EXPR
:
11901 case TRUTH_XOR_EXPR
:
11903 tree orig_type
= TREE_TYPE (*expr_p
);
11904 tree new_type
, xop0
, xop1
;
11905 *expr_p
= gimple_boolify (*expr_p
);
11906 new_type
= TREE_TYPE (*expr_p
);
11907 if (!useless_type_conversion_p (orig_type
, new_type
))
11909 *expr_p
= fold_convert_loc (input_location
, orig_type
, *expr_p
);
11914 /* Boolified binary truth expressions are semantically equivalent
11915 to bitwise binary expressions. Canonicalize them to the
11916 bitwise variant. */
11917 switch (TREE_CODE (*expr_p
))
11919 case TRUTH_AND_EXPR
:
11920 TREE_SET_CODE (*expr_p
, BIT_AND_EXPR
);
11922 case TRUTH_OR_EXPR
:
11923 TREE_SET_CODE (*expr_p
, BIT_IOR_EXPR
);
11925 case TRUTH_XOR_EXPR
:
11926 TREE_SET_CODE (*expr_p
, BIT_XOR_EXPR
);
11931 /* Now make sure that operands have compatible type to
11932 expression's new_type. */
11933 xop0
= TREE_OPERAND (*expr_p
, 0);
11934 xop1
= TREE_OPERAND (*expr_p
, 1);
11935 if (!useless_type_conversion_p (new_type
, TREE_TYPE (xop0
)))
11936 TREE_OPERAND (*expr_p
, 0) = fold_convert_loc (input_location
,
11939 if (!useless_type_conversion_p (new_type
, TREE_TYPE (xop1
)))
11940 TREE_OPERAND (*expr_p
, 1) = fold_convert_loc (input_location
,
11943 /* Continue classified as tcc_binary. */
11947 case VEC_COND_EXPR
:
11949 enum gimplify_status r0
, r1
, r2
;
11951 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
11952 post_p
, is_gimple_condexpr
, fb_rvalue
);
11953 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
11954 post_p
, is_gimple_val
, fb_rvalue
);
11955 r2
= gimplify_expr (&TREE_OPERAND (*expr_p
, 2), pre_p
,
11956 post_p
, is_gimple_val
, fb_rvalue
);
11958 ret
= MIN (MIN (r0
, r1
), r2
);
11959 recalculate_side_effects (*expr_p
);
11964 case VEC_PERM_EXPR
:
11965 /* Classified as tcc_expression. */
11968 case BIT_INSERT_EXPR
:
11969 /* Argument 3 is a constant. */
11972 case POINTER_PLUS_EXPR
:
11974 enum gimplify_status r0
, r1
;
11975 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
11976 post_p
, is_gimple_val
, fb_rvalue
);
11977 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
11978 post_p
, is_gimple_val
, fb_rvalue
);
11979 recalculate_side_effects (*expr_p
);
11980 ret
= MIN (r0
, r1
);
11984 case CILK_SYNC_STMT
:
11986 if (!fn_contains_cilk_spawn_p (cfun
))
11988 error_at (EXPR_LOCATION (*expr_p
),
11989 "expected %<_Cilk_spawn%> before %<_Cilk_sync%>");
11994 gimplify_cilk_sync (expr_p
, pre_p
);
12001 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p
)))
12003 case tcc_comparison
:
12004 /* Handle comparison of objects of non scalar mode aggregates
12005 with a call to memcmp. It would be nice to only have to do
12006 this for variable-sized objects, but then we'd have to allow
12007 the same nest of reference nodes we allow for MODIFY_EXPR and
12008 that's too complex.
12010 Compare scalar mode aggregates as scalar mode values. Using
12011 memcmp for them would be very inefficient at best, and is
12012 plain wrong if bitfields are involved. */
12014 tree type
= TREE_TYPE (TREE_OPERAND (*expr_p
, 1));
12016 /* Vector comparisons need no boolification. */
12017 if (TREE_CODE (type
) == VECTOR_TYPE
)
12019 else if (!AGGREGATE_TYPE_P (type
))
12021 tree org_type
= TREE_TYPE (*expr_p
);
12022 *expr_p
= gimple_boolify (*expr_p
);
12023 if (!useless_type_conversion_p (org_type
,
12024 TREE_TYPE (*expr_p
)))
12026 *expr_p
= fold_convert_loc (input_location
,
12027 org_type
, *expr_p
);
12033 else if (TYPE_MODE (type
) != BLKmode
)
12034 ret
= gimplify_scalar_mode_aggregate_compare (expr_p
);
12036 ret
= gimplify_variable_sized_compare (expr_p
);
12041 /* If *EXPR_P does not need to be special-cased, handle it
12042 according to its class. */
12044 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
12045 post_p
, is_gimple_val
, fb_rvalue
);
12051 enum gimplify_status r0
, r1
;
12053 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
12054 post_p
, is_gimple_val
, fb_rvalue
);
12055 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
12056 post_p
, is_gimple_val
, fb_rvalue
);
12058 ret
= MIN (r0
, r1
);
12064 enum gimplify_status r0
, r1
, r2
;
12066 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
12067 post_p
, is_gimple_val
, fb_rvalue
);
12068 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
12069 post_p
, is_gimple_val
, fb_rvalue
);
12070 r2
= gimplify_expr (&TREE_OPERAND (*expr_p
, 2), pre_p
,
12071 post_p
, is_gimple_val
, fb_rvalue
);
12073 ret
= MIN (MIN (r0
, r1
), r2
);
12077 case tcc_declaration
:
12080 goto dont_recalculate
;
12083 gcc_unreachable ();
12086 recalculate_side_effects (*expr_p
);
12092 gcc_assert (*expr_p
|| ret
!= GS_OK
);
12094 while (ret
== GS_OK
);
12096 /* If we encountered an error_mark somewhere nested inside, either
12097 stub out the statement or propagate the error back out. */
12098 if (ret
== GS_ERROR
)
12105 /* This was only valid as a return value from the langhook, which
12106 we handled. Make sure it doesn't escape from any other context. */
12107 gcc_assert (ret
!= GS_UNHANDLED
);
12109 if (fallback
== fb_none
&& *expr_p
&& !is_gimple_stmt (*expr_p
))
12111 /* We aren't looking for a value, and we don't have a valid
12112 statement. If it doesn't have side-effects, throw it away.
12113 We can also get here with code such as "*&&L;", where L is
12114 a LABEL_DECL that is marked as FORCED_LABEL. */
12115 if (TREE_CODE (*expr_p
) == LABEL_DECL
12116 || !TREE_SIDE_EFFECTS (*expr_p
))
12118 else if (!TREE_THIS_VOLATILE (*expr_p
))
12120 /* This is probably a _REF that contains something nested that
12121 has side effects. Recurse through the operands to find it. */
12122 enum tree_code code
= TREE_CODE (*expr_p
);
12126 case COMPONENT_REF
:
12127 case REALPART_EXPR
:
12128 case IMAGPART_EXPR
:
12129 case VIEW_CONVERT_EXPR
:
12130 gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
12131 gimple_test_f
, fallback
);
12135 case ARRAY_RANGE_REF
:
12136 gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
12137 gimple_test_f
, fallback
);
12138 gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
, post_p
,
12139 gimple_test_f
, fallback
);
12143 /* Anything else with side-effects must be converted to
12144 a valid statement before we get here. */
12145 gcc_unreachable ();
12150 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p
))
12151 && TYPE_MODE (TREE_TYPE (*expr_p
)) != BLKmode
)
12153 /* Historically, the compiler has treated a bare reference
12154 to a non-BLKmode volatile lvalue as forcing a load. */
12155 tree type
= TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p
));
12157 /* Normally, we do not want to create a temporary for a
12158 TREE_ADDRESSABLE type because such a type should not be
12159 copied by bitwise-assignment. However, we make an
12160 exception here, as all we are doing here is ensuring that
12161 we read the bytes that make up the type. We use
12162 create_tmp_var_raw because create_tmp_var will abort when
12163 given a TREE_ADDRESSABLE type. */
12164 tree tmp
= create_tmp_var_raw (type
, "vol");
12165 gimple_add_tmp_var (tmp
);
12166 gimplify_assign (tmp
, *expr_p
, pre_p
);
12170 /* We can't do anything useful with a volatile reference to
12171 an incomplete type, so just throw it away. Likewise for
12172 a BLKmode type, since any implicit inner load should
12173 already have been turned into an explicit one by the
12174 gimplification process. */
12178 /* If we are gimplifying at the statement level, we're done. Tack
12179 everything together and return. */
12180 if (fallback
== fb_none
|| is_statement
)
12182 /* Since *EXPR_P has been converted into a GIMPLE tuple, clear
12183 it out for GC to reclaim it. */
12184 *expr_p
= NULL_TREE
;
12186 if (!gimple_seq_empty_p (internal_pre
)
12187 || !gimple_seq_empty_p (internal_post
))
12189 gimplify_seq_add_seq (&internal_pre
, internal_post
);
12190 gimplify_seq_add_seq (pre_p
, internal_pre
);
12193 /* The result of gimplifying *EXPR_P is going to be the last few
12194 statements in *PRE_P and *POST_P. Add location information
12195 to all the statements that were added by the gimplification
12197 if (!gimple_seq_empty_p (*pre_p
))
12198 annotate_all_with_location_after (*pre_p
, pre_last_gsi
, input_location
);
12200 if (!gimple_seq_empty_p (*post_p
))
12201 annotate_all_with_location_after (*post_p
, post_last_gsi
,
12207 #ifdef ENABLE_GIMPLE_CHECKING
12210 enum tree_code code
= TREE_CODE (*expr_p
);
12211 /* These expressions should already be in gimple IR form. */
12212 gcc_assert (code
!= MODIFY_EXPR
12213 && code
!= ASM_EXPR
12214 && code
!= BIND_EXPR
12215 && code
!= CATCH_EXPR
12216 && (code
!= COND_EXPR
|| gimplify_ctxp
->allow_rhs_cond_expr
)
12217 && code
!= EH_FILTER_EXPR
12218 && code
!= GOTO_EXPR
12219 && code
!= LABEL_EXPR
12220 && code
!= LOOP_EXPR
12221 && code
!= SWITCH_EXPR
12222 && code
!= TRY_FINALLY_EXPR
12223 && code
!= OACC_PARALLEL
12224 && code
!= OACC_KERNELS
12225 && code
!= OACC_DATA
12226 && code
!= OACC_HOST_DATA
12227 && code
!= OACC_DECLARE
12228 && code
!= OACC_UPDATE
12229 && code
!= OACC_ENTER_DATA
12230 && code
!= OACC_EXIT_DATA
12231 && code
!= OACC_CACHE
12232 && code
!= OMP_CRITICAL
12234 && code
!= OACC_LOOP
12235 && code
!= OMP_MASTER
12236 && code
!= OMP_TASKGROUP
12237 && code
!= OMP_ORDERED
12238 && code
!= OMP_PARALLEL
12239 && code
!= OMP_SECTIONS
12240 && code
!= OMP_SECTION
12241 && code
!= OMP_SINGLE
);
12245 /* Otherwise we're gimplifying a subexpression, so the resulting
12246 value is interesting. If it's a valid operand that matches
12247 GIMPLE_TEST_F, we're done. Unless we are handling some
12248 post-effects internally; if that's the case, we need to copy into
12249 a temporary before adding the post-effects to POST_P. */
12250 if (gimple_seq_empty_p (internal_post
) && (*gimple_test_f
) (*expr_p
))
12253 /* Otherwise, we need to create a new temporary for the gimplified
12256 /* We can't return an lvalue if we have an internal postqueue. The
12257 object the lvalue refers to would (probably) be modified by the
12258 postqueue; we need to copy the value out first, which means an
12260 if ((fallback
& fb_lvalue
)
12261 && gimple_seq_empty_p (internal_post
)
12262 && is_gimple_addressable (*expr_p
))
12264 /* An lvalue will do. Take the address of the expression, store it
12265 in a temporary, and replace the expression with an INDIRECT_REF of
12267 tmp
= build_fold_addr_expr_loc (input_location
, *expr_p
);
12268 gimplify_expr (&tmp
, pre_p
, post_p
, is_gimple_reg
, fb_rvalue
);
12269 *expr_p
= build_simple_mem_ref (tmp
);
12271 else if ((fallback
& fb_rvalue
) && is_gimple_reg_rhs_or_call (*expr_p
))
12273 /* An rvalue will do. Assign the gimplified expression into a
12274 new temporary TMP and replace the original expression with
12275 TMP. First, make sure that the expression has a type so that
12276 it can be assigned into a temporary. */
12277 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p
)));
12278 *expr_p
= get_formal_tmp_var (*expr_p
, pre_p
);
12282 #ifdef ENABLE_GIMPLE_CHECKING
12283 if (!(fallback
& fb_mayfail
))
12285 fprintf (stderr
, "gimplification failed:\n");
12286 print_generic_expr (stderr
, *expr_p
);
12287 debug_tree (*expr_p
);
12288 internal_error ("gimplification failed");
12291 gcc_assert (fallback
& fb_mayfail
);
12293 /* If this is an asm statement, and the user asked for the
12294 impossible, don't die. Fail and let gimplify_asm_expr
12300 /* Make sure the temporary matches our predicate. */
12301 gcc_assert ((*gimple_test_f
) (*expr_p
));
12303 if (!gimple_seq_empty_p (internal_post
))
12305 annotate_all_with_location (internal_post
, input_location
);
12306 gimplify_seq_add_seq (pre_p
, internal_post
);
12310 input_location
= saved_location
;
12314 /* Like gimplify_expr but make sure the gimplified result is not itself
12315 a SSA name (but a decl if it were). Temporaries required by
12316 evaluating *EXPR_P may be still SSA names. */
12318 static enum gimplify_status
12319 gimplify_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
12320 bool (*gimple_test_f
) (tree
), fallback_t fallback
,
12323 bool was_ssa_name_p
= TREE_CODE (*expr_p
) == SSA_NAME
;
12324 enum gimplify_status ret
= gimplify_expr (expr_p
, pre_p
, post_p
,
12325 gimple_test_f
, fallback
);
12327 && TREE_CODE (*expr_p
) == SSA_NAME
)
12329 tree name
= *expr_p
;
12330 if (was_ssa_name_p
)
12331 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, NULL
, false);
12334 /* Avoid the extra copy if possible. */
12335 *expr_p
= create_tmp_reg (TREE_TYPE (name
));
12336 gimple_set_lhs (SSA_NAME_DEF_STMT (name
), *expr_p
);
12337 release_ssa_name (name
);
12343 /* Look through TYPE for variable-sized objects and gimplify each such
12344 size that we find. Add to LIST_P any statements generated. */
12347 gimplify_type_sizes (tree type
, gimple_seq
*list_p
)
12351 if (type
== NULL
|| type
== error_mark_node
)
12354 /* We first do the main variant, then copy into any other variants. */
12355 type
= TYPE_MAIN_VARIANT (type
);
12357 /* Avoid infinite recursion. */
12358 if (TYPE_SIZES_GIMPLIFIED (type
))
12361 TYPE_SIZES_GIMPLIFIED (type
) = 1;
12363 switch (TREE_CODE (type
))
12366 case ENUMERAL_TYPE
:
12369 case FIXED_POINT_TYPE
:
12370 gimplify_one_sizepos (&TYPE_MIN_VALUE (type
), list_p
);
12371 gimplify_one_sizepos (&TYPE_MAX_VALUE (type
), list_p
);
12373 for (t
= TYPE_NEXT_VARIANT (type
); t
; t
= TYPE_NEXT_VARIANT (t
))
12375 TYPE_MIN_VALUE (t
) = TYPE_MIN_VALUE (type
);
12376 TYPE_MAX_VALUE (t
) = TYPE_MAX_VALUE (type
);
12381 /* These types may not have declarations, so handle them here. */
12382 gimplify_type_sizes (TREE_TYPE (type
), list_p
);
12383 gimplify_type_sizes (TYPE_DOMAIN (type
), list_p
);
12384 /* Ensure VLA bounds aren't removed, for -O0 they should be variables
12385 with assigned stack slots, for -O1+ -g they should be tracked
12387 if (!(TYPE_NAME (type
)
12388 && TREE_CODE (TYPE_NAME (type
)) == TYPE_DECL
12389 && DECL_IGNORED_P (TYPE_NAME (type
)))
12390 && TYPE_DOMAIN (type
)
12391 && INTEGRAL_TYPE_P (TYPE_DOMAIN (type
)))
12393 t
= TYPE_MIN_VALUE (TYPE_DOMAIN (type
));
12394 if (t
&& VAR_P (t
) && DECL_ARTIFICIAL (t
))
12395 DECL_IGNORED_P (t
) = 0;
12396 t
= TYPE_MAX_VALUE (TYPE_DOMAIN (type
));
12397 if (t
&& VAR_P (t
) && DECL_ARTIFICIAL (t
))
12398 DECL_IGNORED_P (t
) = 0;
12404 case QUAL_UNION_TYPE
:
12405 for (field
= TYPE_FIELDS (type
); field
; field
= DECL_CHAIN (field
))
12406 if (TREE_CODE (field
) == FIELD_DECL
)
12408 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field
), list_p
);
12409 gimplify_one_sizepos (&DECL_SIZE (field
), list_p
);
12410 gimplify_one_sizepos (&DECL_SIZE_UNIT (field
), list_p
);
12411 gimplify_type_sizes (TREE_TYPE (field
), list_p
);
12416 case REFERENCE_TYPE
:
12417 /* We used to recurse on the pointed-to type here, which turned out to
12418 be incorrect because its definition might refer to variables not
12419 yet initialized at this point if a forward declaration is involved.
12421 It was actually useful for anonymous pointed-to types to ensure
12422 that the sizes evaluation dominates every possible later use of the
12423 values. Restricting to such types here would be safe since there
12424 is no possible forward declaration around, but would introduce an
12425 undesirable middle-end semantic to anonymity. We then defer to
12426 front-ends the responsibility of ensuring that the sizes are
12427 evaluated both early and late enough, e.g. by attaching artificial
12428 type declarations to the tree. */
12435 gimplify_one_sizepos (&TYPE_SIZE (type
), list_p
);
12436 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type
), list_p
);
12438 for (t
= TYPE_NEXT_VARIANT (type
); t
; t
= TYPE_NEXT_VARIANT (t
))
12440 TYPE_SIZE (t
) = TYPE_SIZE (type
);
12441 TYPE_SIZE_UNIT (t
) = TYPE_SIZE_UNIT (type
);
12442 TYPE_SIZES_GIMPLIFIED (t
) = 1;
12446 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
12447 a size or position, has had all of its SAVE_EXPRs evaluated.
12448 We add any required statements to *STMT_P. */
12451 gimplify_one_sizepos (tree
*expr_p
, gimple_seq
*stmt_p
)
12453 tree expr
= *expr_p
;
12455 /* We don't do anything if the value isn't there, is constant, or contains
12456 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
12457 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
12458 will want to replace it with a new variable, but that will cause problems
12459 if this type is from outside the function. It's OK to have that here. */
12460 if (is_gimple_sizepos (expr
))
12463 *expr_p
= unshare_expr (expr
);
12465 /* SSA names in decl/type fields are a bad idea - they'll get reclaimed
12466 if the def vanishes. */
12467 gimplify_expr (expr_p
, stmt_p
, NULL
, is_gimple_val
, fb_rvalue
, false);
12470 /* Gimplify the body of statements of FNDECL and return a GIMPLE_BIND node
12471 containing the sequence of corresponding GIMPLE statements. If DO_PARMS
12472 is true, also gimplify the parameters. */
12475 gimplify_body (tree fndecl
, bool do_parms
)
12477 location_t saved_location
= input_location
;
12478 gimple_seq parm_stmts
, seq
;
12479 gimple
*outer_stmt
;
12481 struct cgraph_node
*cgn
;
12483 timevar_push (TV_TREE_GIMPLIFY
);
12485 init_tree_ssa (cfun
);
12487 /* Initialize for optimize_insn_for_s{ize,peed}_p possibly called during
12489 default_rtl_profile ();
12491 gcc_assert (gimplify_ctxp
== NULL
);
12492 push_gimplify_context (true);
12494 if (flag_openacc
|| flag_openmp
)
12496 gcc_assert (gimplify_omp_ctxp
== NULL
);
12497 if (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (fndecl
)))
12498 gimplify_omp_ctxp
= new_omp_context (ORT_TARGET
);
12501 /* Unshare most shared trees in the body and in that of any nested functions.
12502 It would seem we don't have to do this for nested functions because
12503 they are supposed to be output and then the outer function gimplified
12504 first, but the g++ front end doesn't always do it that way. */
12505 unshare_body (fndecl
);
12506 unvisit_body (fndecl
);
12508 cgn
= cgraph_node::get (fndecl
);
12509 if (cgn
&& cgn
->origin
)
12510 nonlocal_vlas
= new hash_set
<tree
>;
12512 /* Make sure input_location isn't set to something weird. */
12513 input_location
= DECL_SOURCE_LOCATION (fndecl
);
12515 /* Resolve callee-copies. This has to be done before processing
12516 the body so that DECL_VALUE_EXPR gets processed correctly. */
12517 parm_stmts
= do_parms
? gimplify_parameters () : NULL
;
12519 /* Gimplify the function's body. */
12521 gimplify_stmt (&DECL_SAVED_TREE (fndecl
), &seq
);
12522 outer_stmt
= gimple_seq_first_stmt (seq
);
12525 outer_stmt
= gimple_build_nop ();
12526 gimplify_seq_add_stmt (&seq
, outer_stmt
);
12529 /* The body must contain exactly one statement, a GIMPLE_BIND. If this is
12530 not the case, wrap everything in a GIMPLE_BIND to make it so. */
12531 if (gimple_code (outer_stmt
) == GIMPLE_BIND
12532 && gimple_seq_first (seq
) == gimple_seq_last (seq
))
12533 outer_bind
= as_a
<gbind
*> (outer_stmt
);
12535 outer_bind
= gimple_build_bind (NULL_TREE
, seq
, NULL
);
12537 DECL_SAVED_TREE (fndecl
) = NULL_TREE
;
12539 /* If we had callee-copies statements, insert them at the beginning
12540 of the function and clear DECL_VALUE_EXPR_P on the parameters. */
12541 if (!gimple_seq_empty_p (parm_stmts
))
12545 gimplify_seq_add_seq (&parm_stmts
, gimple_bind_body (outer_bind
));
12546 gimple_bind_set_body (outer_bind
, parm_stmts
);
12548 for (parm
= DECL_ARGUMENTS (current_function_decl
);
12549 parm
; parm
= DECL_CHAIN (parm
))
12550 if (DECL_HAS_VALUE_EXPR_P (parm
))
12552 DECL_HAS_VALUE_EXPR_P (parm
) = 0;
12553 DECL_IGNORED_P (parm
) = 0;
12559 if (nonlocal_vla_vars
)
12561 /* tree-nested.c may later on call declare_vars (..., true);
12562 which relies on BLOCK_VARS chain to be the tail of the
12563 gimple_bind_vars chain. Ensure we don't violate that
12565 if (gimple_bind_block (outer_bind
)
12566 == DECL_INITIAL (current_function_decl
))
12567 declare_vars (nonlocal_vla_vars
, outer_bind
, true);
12569 BLOCK_VARS (DECL_INITIAL (current_function_decl
))
12570 = chainon (BLOCK_VARS (DECL_INITIAL (current_function_decl
)),
12571 nonlocal_vla_vars
);
12572 nonlocal_vla_vars
= NULL_TREE
;
12574 delete nonlocal_vlas
;
12575 nonlocal_vlas
= NULL
;
12578 if ((flag_openacc
|| flag_openmp
|| flag_openmp_simd
)
12579 && gimplify_omp_ctxp
)
12581 delete_omp_context (gimplify_omp_ctxp
);
12582 gimplify_omp_ctxp
= NULL
;
12585 pop_gimplify_context (outer_bind
);
12586 gcc_assert (gimplify_ctxp
== NULL
);
12588 if (flag_checking
&& !seen_error ())
12589 verify_gimple_in_seq (gimple_bind_body (outer_bind
));
12591 timevar_pop (TV_TREE_GIMPLIFY
);
12592 input_location
= saved_location
;
12597 typedef char *char_p
; /* For DEF_VEC_P. */
12599 /* Return whether we should exclude FNDECL from instrumentation. */
12602 flag_instrument_functions_exclude_p (tree fndecl
)
12606 v
= (vec
<char_p
> *) flag_instrument_functions_exclude_functions
;
12607 if (v
&& v
->length () > 0)
12613 name
= lang_hooks
.decl_printable_name (fndecl
, 0);
12614 FOR_EACH_VEC_ELT (*v
, i
, s
)
12615 if (strstr (name
, s
) != NULL
)
12619 v
= (vec
<char_p
> *) flag_instrument_functions_exclude_files
;
12620 if (v
&& v
->length () > 0)
12626 name
= DECL_SOURCE_FILE (fndecl
);
12627 FOR_EACH_VEC_ELT (*v
, i
, s
)
12628 if (strstr (name
, s
) != NULL
)
12635 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
12636 node for the function we want to gimplify.
12638 Return the sequence of GIMPLE statements corresponding to the body
12642 gimplify_function_tree (tree fndecl
)
12648 gcc_assert (!gimple_body (fndecl
));
12650 if (DECL_STRUCT_FUNCTION (fndecl
))
12651 push_cfun (DECL_STRUCT_FUNCTION (fndecl
));
12653 push_struct_function (fndecl
);
12655 /* Tentatively set PROP_gimple_lva here, and reset it in gimplify_va_arg_expr
12657 cfun
->curr_properties
|= PROP_gimple_lva
;
12659 for (parm
= DECL_ARGUMENTS (fndecl
); parm
; parm
= DECL_CHAIN (parm
))
12661 /* Preliminarily mark non-addressed complex variables as eligible
12662 for promotion to gimple registers. We'll transform their uses
12663 as we find them. */
12664 if ((TREE_CODE (TREE_TYPE (parm
)) == COMPLEX_TYPE
12665 || TREE_CODE (TREE_TYPE (parm
)) == VECTOR_TYPE
)
12666 && !TREE_THIS_VOLATILE (parm
)
12667 && !needs_to_live_in_memory (parm
))
12668 DECL_GIMPLE_REG_P (parm
) = 1;
12671 ret
= DECL_RESULT (fndecl
);
12672 if ((TREE_CODE (TREE_TYPE (ret
)) == COMPLEX_TYPE
12673 || TREE_CODE (TREE_TYPE (ret
)) == VECTOR_TYPE
)
12674 && !needs_to_live_in_memory (ret
))
12675 DECL_GIMPLE_REG_P (ret
) = 1;
12677 if (asan_sanitize_use_after_scope () && sanitize_flags_p (SANITIZE_ADDRESS
))
12678 asan_poisoned_variables
= new hash_set
<tree
> ();
12679 bind
= gimplify_body (fndecl
, true);
12680 if (asan_poisoned_variables
)
12682 delete asan_poisoned_variables
;
12683 asan_poisoned_variables
= NULL
;
12686 /* The tree body of the function is no longer needed, replace it
12687 with the new GIMPLE body. */
12689 gimple_seq_add_stmt (&seq
, bind
);
12690 gimple_set_body (fndecl
, seq
);
12692 /* If we're instrumenting function entry/exit, then prepend the call to
12693 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
12694 catch the exit hook. */
12695 /* ??? Add some way to ignore exceptions for this TFE. */
12696 if (flag_instrument_function_entry_exit
12697 && !DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl
)
12698 /* Do not instrument extern inline functions. */
12699 && !(DECL_DECLARED_INLINE_P (fndecl
)
12700 && DECL_EXTERNAL (fndecl
)
12701 && DECL_DISREGARD_INLINE_LIMITS (fndecl
))
12702 && !flag_instrument_functions_exclude_p (fndecl
))
12707 gimple_seq cleanup
= NULL
, body
= NULL
;
12711 x
= builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS
);
12712 call
= gimple_build_call (x
, 1, integer_zero_node
);
12713 tmp_var
= create_tmp_var (ptr_type_node
, "return_addr");
12714 gimple_call_set_lhs (call
, tmp_var
);
12715 gimplify_seq_add_stmt (&cleanup
, call
);
12716 x
= builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_EXIT
);
12717 call
= gimple_build_call (x
, 2,
12718 build_fold_addr_expr (current_function_decl
),
12720 gimplify_seq_add_stmt (&cleanup
, call
);
12721 tf
= gimple_build_try (seq
, cleanup
, GIMPLE_TRY_FINALLY
);
12723 x
= builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS
);
12724 call
= gimple_build_call (x
, 1, integer_zero_node
);
12725 tmp_var
= create_tmp_var (ptr_type_node
, "return_addr");
12726 gimple_call_set_lhs (call
, tmp_var
);
12727 gimplify_seq_add_stmt (&body
, call
);
12728 x
= builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_ENTER
);
12729 call
= gimple_build_call (x
, 2,
12730 build_fold_addr_expr (current_function_decl
),
12732 gimplify_seq_add_stmt (&body
, call
);
12733 gimplify_seq_add_stmt (&body
, tf
);
12734 new_bind
= gimple_build_bind (NULL
, body
, NULL
);
12736 /* Replace the current function body with the body
12737 wrapped in the try/finally TF. */
12739 gimple_seq_add_stmt (&seq
, new_bind
);
12740 gimple_set_body (fndecl
, seq
);
12744 if (sanitize_flags_p (SANITIZE_THREAD
))
12746 gcall
*call
= gimple_build_call_internal (IFN_TSAN_FUNC_EXIT
, 0);
12747 gimple
*tf
= gimple_build_try (seq
, call
, GIMPLE_TRY_FINALLY
);
12748 gbind
*new_bind
= gimple_build_bind (NULL
, tf
, NULL
);
12749 /* Replace the current function body with the body
12750 wrapped in the try/finally TF. */
12752 gimple_seq_add_stmt (&seq
, new_bind
);
12753 gimple_set_body (fndecl
, seq
);
12756 DECL_SAVED_TREE (fndecl
) = NULL_TREE
;
12757 cfun
->curr_properties
|= PROP_gimple_any
;
12761 dump_function (TDI_gimple
, fndecl
);
12764 /* Return a dummy expression of type TYPE in order to keep going after an
12768 dummy_object (tree type
)
12770 tree t
= build_int_cst (build_pointer_type (type
), 0);
12771 return build2 (MEM_REF
, type
, t
, t
);
12774 /* Gimplify __builtin_va_arg, aka VA_ARG_EXPR, which is not really a
12775 builtin function, but a very special sort of operator. */
12777 enum gimplify_status
12778 gimplify_va_arg_expr (tree
*expr_p
, gimple_seq
*pre_p
,
12779 gimple_seq
*post_p ATTRIBUTE_UNUSED
)
12781 tree promoted_type
, have_va_type
;
12782 tree valist
= TREE_OPERAND (*expr_p
, 0);
12783 tree type
= TREE_TYPE (*expr_p
);
12784 tree t
, tag
, aptag
;
12785 location_t loc
= EXPR_LOCATION (*expr_p
);
12787 /* Verify that valist is of the proper type. */
12788 have_va_type
= TREE_TYPE (valist
);
12789 if (have_va_type
== error_mark_node
)
12791 have_va_type
= targetm
.canonical_va_list_type (have_va_type
);
12792 if (have_va_type
== NULL_TREE
12793 && POINTER_TYPE_P (TREE_TYPE (valist
)))
12794 /* Handle 'Case 1: Not an array type' from c-common.c/build_va_arg. */
12796 = targetm
.canonical_va_list_type (TREE_TYPE (TREE_TYPE (valist
)));
12797 gcc_assert (have_va_type
!= NULL_TREE
);
12799 /* Generate a diagnostic for requesting data of a type that cannot
12800 be passed through `...' due to type promotion at the call site. */
12801 if ((promoted_type
= lang_hooks
.types
.type_promotes_to (type
))
12804 static bool gave_help
;
12806 /* Use the expansion point to handle cases such as passing bool (defined
12807 in a system header) through `...'. */
12808 source_location xloc
12809 = expansion_point_location_if_in_system_header (loc
);
12811 /* Unfortunately, this is merely undefined, rather than a constraint
12812 violation, so we cannot make this an error. If this call is never
12813 executed, the program is still strictly conforming. */
12814 warned
= warning_at (xloc
, 0,
12815 "%qT is promoted to %qT when passed through %<...%>",
12816 type
, promoted_type
);
12817 if (!gave_help
&& warned
)
12820 inform (xloc
, "(so you should pass %qT not %qT to %<va_arg%>)",
12821 promoted_type
, type
);
12824 /* We can, however, treat "undefined" any way we please.
12825 Call abort to encourage the user to fix the program. */
12827 inform (xloc
, "if this code is reached, the program will abort");
12828 /* Before the abort, allow the evaluation of the va_list
12829 expression to exit or longjmp. */
12830 gimplify_and_add (valist
, pre_p
);
12831 t
= build_call_expr_loc (loc
,
12832 builtin_decl_implicit (BUILT_IN_TRAP
), 0);
12833 gimplify_and_add (t
, pre_p
);
12835 /* This is dead code, but go ahead and finish so that the
12836 mode of the result comes out right. */
12837 *expr_p
= dummy_object (type
);
12838 return GS_ALL_DONE
;
12841 tag
= build_int_cst (build_pointer_type (type
), 0);
12842 aptag
= build_int_cst (TREE_TYPE (valist
), 0);
12844 *expr_p
= build_call_expr_internal_loc (loc
, IFN_VA_ARG
, type
, 3,
12845 valist
, tag
, aptag
);
12847 /* Clear the tentatively set PROP_gimple_lva, to indicate that IFN_VA_ARG
12848 needs to be expanded. */
12849 cfun
->curr_properties
&= ~PROP_gimple_lva
;
12854 /* Build a new GIMPLE_ASSIGN tuple and append it to the end of *SEQ_P.
12856 DST/SRC are the destination and source respectively. You can pass
12857 ungimplified trees in DST or SRC, in which case they will be
12858 converted to a gimple operand if necessary.
12860 This function returns the newly created GIMPLE_ASSIGN tuple. */
12863 gimplify_assign (tree dst
, tree src
, gimple_seq
*seq_p
)
12865 tree t
= build2 (MODIFY_EXPR
, TREE_TYPE (dst
), dst
, src
);
12866 gimplify_and_add (t
, seq_p
);
12868 return gimple_seq_last_stmt (*seq_p
);
12872 gimplify_hasher::hash (const elt_t
*p
)
12875 return iterative_hash_expr (t
, 0);
12879 gimplify_hasher::equal (const elt_t
*p1
, const elt_t
*p2
)
12883 enum tree_code code
= TREE_CODE (t1
);
12885 if (TREE_CODE (t2
) != code
12886 || TREE_TYPE (t1
) != TREE_TYPE (t2
))
12889 if (!operand_equal_p (t1
, t2
, 0))
12892 /* Only allow them to compare equal if they also hash equal; otherwise
12893 results are nondeterminate, and we fail bootstrap comparison. */
12894 gcc_checking_assert (hash (p1
) == hash (p2
));