1 /* Tree lowering pass. This pass converts the GENERIC functions-as-trees
2 tree representation into the GIMPLE form.
3 Copyright (C) 2002-2016 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"
55 #include "gimple-low.h"
57 #include "gomp-constants.h"
58 #include "tree-dump.h"
59 #include "gimple-walk.h"
60 #include "langhooks-def.h" /* FIXME: for lhd_set_decl_assembler_name */
63 enum gimplify_omp_var_data
69 GOVD_FIRSTPRIVATE
= 16,
70 GOVD_LASTPRIVATE
= 32,
74 GOVD_DEBUG_PRIVATE
= 512,
75 GOVD_PRIVATE_OUTER_REF
= 1024,
79 /* Flag for GOVD_MAP: don't copy back. */
80 GOVD_MAP_TO_ONLY
= 8192,
82 /* Flag for GOVD_LINEAR or GOVD_LASTPRIVATE: no outer reference. */
83 GOVD_LINEAR_LASTPRIVATE_NO_OUTER
= 16384,
85 GOVD_MAP_0LEN_ARRAY
= 32768,
87 /* Flag for GOVD_MAP, if it is always, to or always, tofrom mapping. */
88 GOVD_MAP_ALWAYS_TO
= 65536,
90 /* Flag for shared vars that are or might be stored to in the region. */
91 GOVD_WRITTEN
= 131072,
93 /* Flag for GOVD_MAP, if it is a forced mapping. */
94 GOVD_MAP_FORCE
= 262144,
96 GOVD_DATA_SHARE_CLASS
= (GOVD_SHARED
| GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
97 | GOVD_LASTPRIVATE
| GOVD_REDUCTION
| GOVD_LINEAR
104 ORT_WORKSHARE
= 0x00,
108 ORT_COMBINED_PARALLEL
= 0x03,
111 ORT_UNTIED_TASK
= 0x05,
114 ORT_COMBINED_TEAMS
= 0x09,
117 ORT_TARGET_DATA
= 0x10,
119 /* Data region with offloading. */
121 ORT_COMBINED_TARGET
= 0x21,
123 /* OpenACC variants. */
124 ORT_ACC
= 0x40, /* A generic OpenACC region. */
125 ORT_ACC_DATA
= ORT_ACC
| ORT_TARGET_DATA
, /* Data construct. */
126 ORT_ACC_PARALLEL
= ORT_ACC
| ORT_TARGET
, /* Parallel construct */
127 ORT_ACC_KERNELS
= ORT_ACC
| ORT_TARGET
| 0x80, /* Kernels construct. */
128 ORT_ACC_HOST_DATA
= ORT_ACC
| ORT_TARGET_DATA
| 0x80, /* Host data. */
130 /* Dummy OpenMP region, used to disable expansion of
131 DECL_VALUE_EXPRs in taskloop pre body. */
135 /* Gimplify hashtable helper. */
137 struct gimplify_hasher
: free_ptr_hash
<elt_t
>
139 static inline hashval_t
hash (const elt_t
*);
140 static inline bool equal (const elt_t
*, const elt_t
*);
145 struct gimplify_ctx
*prev_context
;
147 vec
<gbind
*> bind_expr_stack
;
149 gimple_seq conditional_cleanups
;
153 vec
<tree
> case_labels
;
154 /* The formal temporary table. Should this be persistent? */
155 hash_table
<gimplify_hasher
> *temp_htab
;
158 unsigned into_ssa
: 1;
159 unsigned allow_rhs_cond_expr
: 1;
160 unsigned in_cleanup_point_expr
: 1;
161 unsigned keep_stack
: 1;
162 unsigned save_stack
: 1;
165 struct gimplify_omp_ctx
167 struct gimplify_omp_ctx
*outer_context
;
168 splay_tree variables
;
169 hash_set
<tree
> *privatized_types
;
170 /* Iteration variables in an OMP_FOR. */
171 vec
<tree
> loop_iter_var
;
173 enum omp_clause_default_kind default_kind
;
174 enum omp_region_type region_type
;
177 bool target_map_scalars_firstprivate
;
178 bool target_map_pointers_as_0len_arrays
;
179 bool target_firstprivatize_array_bases
;
182 static struct gimplify_ctx
*gimplify_ctxp
;
183 static struct gimplify_omp_ctx
*gimplify_omp_ctxp
;
185 /* Forward declaration. */
186 static enum gimplify_status
gimplify_compound_expr (tree
*, gimple_seq
*, bool);
187 static hash_map
<tree
, tree
> *oacc_declare_returns
;
189 /* Shorter alias name for the above function for use in gimplify.c
193 gimplify_seq_add_stmt (gimple_seq
*seq_p
, gimple
*gs
)
195 gimple_seq_add_stmt_without_update (seq_p
, gs
);
198 /* Append sequence SRC to the end of sequence *DST_P. If *DST_P is
199 NULL, a new sequence is allocated. This function is
200 similar to gimple_seq_add_seq, but does not scan the operands.
201 During gimplification, we need to manipulate statement sequences
202 before the def/use vectors have been constructed. */
205 gimplify_seq_add_seq (gimple_seq
*dst_p
, gimple_seq src
)
207 gimple_stmt_iterator si
;
212 si
= gsi_last (*dst_p
);
213 gsi_insert_seq_after_without_update (&si
, src
, GSI_NEW_STMT
);
217 /* Pointer to a list of allocated gimplify_ctx structs to be used for pushing
218 and popping gimplify contexts. */
220 static struct gimplify_ctx
*ctx_pool
= NULL
;
222 /* Return a gimplify context struct from the pool. */
224 static inline struct gimplify_ctx
*
227 struct gimplify_ctx
* c
= ctx_pool
;
230 ctx_pool
= c
->prev_context
;
232 c
= XNEW (struct gimplify_ctx
);
234 memset (c
, '\0', sizeof (*c
));
238 /* Put gimplify context C back into the pool. */
241 ctx_free (struct gimplify_ctx
*c
)
243 c
->prev_context
= ctx_pool
;
247 /* Free allocated ctx stack memory. */
250 free_gimplify_stack (void)
252 struct gimplify_ctx
*c
;
254 while ((c
= ctx_pool
))
256 ctx_pool
= c
->prev_context
;
262 /* Set up a context for the gimplifier. */
265 push_gimplify_context (bool in_ssa
, bool rhs_cond_ok
)
267 struct gimplify_ctx
*c
= ctx_alloc ();
269 c
->prev_context
= gimplify_ctxp
;
271 gimplify_ctxp
->into_ssa
= in_ssa
;
272 gimplify_ctxp
->allow_rhs_cond_expr
= rhs_cond_ok
;
275 /* Tear down a context for the gimplifier. If BODY is non-null, then
276 put the temporaries into the outer BIND_EXPR. Otherwise, put them
279 BODY is not a sequence, but the first tuple in a sequence. */
282 pop_gimplify_context (gimple
*body
)
284 struct gimplify_ctx
*c
= gimplify_ctxp
;
287 && (!c
->bind_expr_stack
.exists ()
288 || c
->bind_expr_stack
.is_empty ()));
289 c
->bind_expr_stack
.release ();
290 gimplify_ctxp
= c
->prev_context
;
293 declare_vars (c
->temps
, body
, false);
295 record_vars (c
->temps
);
302 /* Push a GIMPLE_BIND tuple onto the stack of bindings. */
305 gimple_push_bind_expr (gbind
*bind_stmt
)
307 gimplify_ctxp
->bind_expr_stack
.reserve (8);
308 gimplify_ctxp
->bind_expr_stack
.safe_push (bind_stmt
);
311 /* Pop the first element off the stack of bindings. */
314 gimple_pop_bind_expr (void)
316 gimplify_ctxp
->bind_expr_stack
.pop ();
319 /* Return the first element of the stack of bindings. */
322 gimple_current_bind_expr (void)
324 return gimplify_ctxp
->bind_expr_stack
.last ();
327 /* Return the stack of bindings created during gimplification. */
330 gimple_bind_expr_stack (void)
332 return gimplify_ctxp
->bind_expr_stack
;
335 /* Return true iff there is a COND_EXPR between us and the innermost
336 CLEANUP_POINT_EXPR. This info is used by gimple_push_cleanup. */
339 gimple_conditional_context (void)
341 return gimplify_ctxp
->conditions
> 0;
344 /* Note that we've entered a COND_EXPR. */
347 gimple_push_condition (void)
349 #ifdef ENABLE_GIMPLE_CHECKING
350 if (gimplify_ctxp
->conditions
== 0)
351 gcc_assert (gimple_seq_empty_p (gimplify_ctxp
->conditional_cleanups
));
353 ++(gimplify_ctxp
->conditions
);
356 /* Note that we've left a COND_EXPR. If we're back at unconditional scope
357 now, add any conditional cleanups we've seen to the prequeue. */
360 gimple_pop_condition (gimple_seq
*pre_p
)
362 int conds
= --(gimplify_ctxp
->conditions
);
364 gcc_assert (conds
>= 0);
367 gimplify_seq_add_seq (pre_p
, gimplify_ctxp
->conditional_cleanups
);
368 gimplify_ctxp
->conditional_cleanups
= NULL
;
372 /* A stable comparison routine for use with splay trees and DECLs. */
375 splay_tree_compare_decl_uid (splay_tree_key xa
, splay_tree_key xb
)
380 return DECL_UID (a
) - DECL_UID (b
);
383 /* Create a new omp construct that deals with variable remapping. */
385 static struct gimplify_omp_ctx
*
386 new_omp_context (enum omp_region_type region_type
)
388 struct gimplify_omp_ctx
*c
;
390 c
= XCNEW (struct gimplify_omp_ctx
);
391 c
->outer_context
= gimplify_omp_ctxp
;
392 c
->variables
= splay_tree_new (splay_tree_compare_decl_uid
, 0, 0);
393 c
->privatized_types
= new hash_set
<tree
>;
394 c
->location
= input_location
;
395 c
->region_type
= region_type
;
396 if ((region_type
& ORT_TASK
) == 0)
397 c
->default_kind
= OMP_CLAUSE_DEFAULT_SHARED
;
399 c
->default_kind
= OMP_CLAUSE_DEFAULT_UNSPECIFIED
;
404 /* Destroy an omp construct that deals with variable remapping. */
407 delete_omp_context (struct gimplify_omp_ctx
*c
)
409 splay_tree_delete (c
->variables
);
410 delete c
->privatized_types
;
411 c
->loop_iter_var
.release ();
415 static void omp_add_variable (struct gimplify_omp_ctx
*, tree
, unsigned int);
416 static bool omp_notice_variable (struct gimplify_omp_ctx
*, tree
, bool);
418 /* Both gimplify the statement T and append it to *SEQ_P. This function
419 behaves exactly as gimplify_stmt, but you don't have to pass T as a
423 gimplify_and_add (tree t
, gimple_seq
*seq_p
)
425 gimplify_stmt (&t
, seq_p
);
428 /* Gimplify statement T into sequence *SEQ_P, and return the first
429 tuple in the sequence of generated tuples for this statement.
430 Return NULL if gimplifying T produced no tuples. */
433 gimplify_and_return_first (tree t
, gimple_seq
*seq_p
)
435 gimple_stmt_iterator last
= gsi_last (*seq_p
);
437 gimplify_and_add (t
, seq_p
);
439 if (!gsi_end_p (last
))
442 return gsi_stmt (last
);
445 return gimple_seq_first_stmt (*seq_p
);
448 /* Returns true iff T is a valid RHS for an assignment to an un-renamed
449 LHS, or for a call argument. */
452 is_gimple_mem_rhs (tree t
)
454 /* If we're dealing with a renamable type, either source or dest must be
455 a renamed variable. */
456 if (is_gimple_reg_type (TREE_TYPE (t
)))
457 return is_gimple_val (t
);
459 return is_gimple_val (t
) || is_gimple_lvalue (t
);
462 /* Return true if T is a CALL_EXPR or an expression that can be
463 assigned to a temporary. Note that this predicate should only be
464 used during gimplification. See the rationale for this in
465 gimplify_modify_expr. */
468 is_gimple_reg_rhs_or_call (tree t
)
470 return (get_gimple_rhs_class (TREE_CODE (t
)) != GIMPLE_INVALID_RHS
471 || TREE_CODE (t
) == CALL_EXPR
);
474 /* Return true if T is a valid memory RHS or a CALL_EXPR. Note that
475 this predicate should only be used during gimplification. See the
476 rationale for this in gimplify_modify_expr. */
479 is_gimple_mem_rhs_or_call (tree t
)
481 /* If we're dealing with a renamable type, either source or dest must be
482 a renamed variable. */
483 if (is_gimple_reg_type (TREE_TYPE (t
)))
484 return is_gimple_val (t
);
486 return (is_gimple_val (t
) || is_gimple_lvalue (t
)
487 || TREE_CODE (t
) == CALL_EXPR
);
490 /* Create a temporary with a name derived from VAL. Subroutine of
491 lookup_tmp_var; nobody else should call this function. */
494 create_tmp_from_val (tree val
)
496 /* Drop all qualifiers and address-space information from the value type. */
497 tree type
= TYPE_MAIN_VARIANT (TREE_TYPE (val
));
498 tree var
= create_tmp_var (type
, get_name (val
));
499 if (TREE_CODE (TREE_TYPE (var
)) == COMPLEX_TYPE
500 || TREE_CODE (TREE_TYPE (var
)) == VECTOR_TYPE
)
501 DECL_GIMPLE_REG_P (var
) = 1;
505 /* Create a temporary to hold the value of VAL. If IS_FORMAL, try to reuse
506 an existing expression temporary. */
509 lookup_tmp_var (tree val
, bool is_formal
)
513 /* If not optimizing, never really reuse a temporary. local-alloc
514 won't allocate any variable that is used in more than one basic
515 block, which means it will go into memory, causing much extra
516 work in reload and final and poorer code generation, outweighing
517 the extra memory allocation here. */
518 if (!optimize
|| !is_formal
|| TREE_SIDE_EFFECTS (val
))
519 ret
= create_tmp_from_val (val
);
526 if (!gimplify_ctxp
->temp_htab
)
527 gimplify_ctxp
->temp_htab
= new hash_table
<gimplify_hasher
> (1000);
528 slot
= gimplify_ctxp
->temp_htab
->find_slot (&elt
, INSERT
);
531 elt_p
= XNEW (elt_t
);
533 elt_p
->temp
= ret
= create_tmp_from_val (val
);
546 /* Helper for get_formal_tmp_var and get_initialized_tmp_var. */
549 internal_get_tmp_var (tree val
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
554 /* Notice that we explicitly allow VAL to be a CALL_EXPR so that we
555 can create an INIT_EXPR and convert it into a GIMPLE_CALL below. */
556 gimplify_expr (&val
, pre_p
, post_p
, is_gimple_reg_rhs_or_call
,
559 if (gimplify_ctxp
->into_ssa
560 && is_gimple_reg_type (TREE_TYPE (val
)))
561 t
= make_ssa_name (TYPE_MAIN_VARIANT (TREE_TYPE (val
)));
563 t
= lookup_tmp_var (val
, is_formal
);
565 mod
= build2 (INIT_EXPR
, TREE_TYPE (t
), t
, unshare_expr (val
));
567 SET_EXPR_LOCATION (mod
, EXPR_LOC_OR_LOC (val
, input_location
));
569 /* gimplify_modify_expr might want to reduce this further. */
570 gimplify_and_add (mod
, pre_p
);
576 /* Return a formal temporary variable initialized with VAL. PRE_P is as
577 in gimplify_expr. Only use this function if:
579 1) The value of the unfactored expression represented by VAL will not
580 change between the initialization and use of the temporary, and
581 2) The temporary will not be otherwise modified.
583 For instance, #1 means that this is inappropriate for SAVE_EXPR temps,
584 and #2 means it is inappropriate for && temps.
586 For other cases, use get_initialized_tmp_var instead. */
589 get_formal_tmp_var (tree val
, gimple_seq
*pre_p
)
591 return internal_get_tmp_var (val
, pre_p
, NULL
, true);
594 /* Return a temporary variable initialized with VAL. PRE_P and POST_P
595 are as in gimplify_expr. */
598 get_initialized_tmp_var (tree val
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
600 return internal_get_tmp_var (val
, pre_p
, post_p
, false);
603 /* Declare all the variables in VARS in SCOPE. If DEBUG_INFO is true,
604 generate debug info for them; otherwise don't. */
607 declare_vars (tree vars
, gimple
*gs
, bool debug_info
)
614 gbind
*scope
= as_a
<gbind
*> (gs
);
616 temps
= nreverse (last
);
618 block
= gimple_bind_block (scope
);
619 gcc_assert (!block
|| TREE_CODE (block
) == BLOCK
);
620 if (!block
|| !debug_info
)
622 DECL_CHAIN (last
) = gimple_bind_vars (scope
);
623 gimple_bind_set_vars (scope
, temps
);
627 /* We need to attach the nodes both to the BIND_EXPR and to its
628 associated BLOCK for debugging purposes. The key point here
629 is that the BLOCK_VARS of the BIND_EXPR_BLOCK of a BIND_EXPR
630 is a subchain of the BIND_EXPR_VARS of the BIND_EXPR. */
631 if (BLOCK_VARS (block
))
632 BLOCK_VARS (block
) = chainon (BLOCK_VARS (block
), temps
);
635 gimple_bind_set_vars (scope
,
636 chainon (gimple_bind_vars (scope
), temps
));
637 BLOCK_VARS (block
) = temps
;
643 /* For VAR a VAR_DECL of variable size, try to find a constant upper bound
644 for the size and adjust DECL_SIZE/DECL_SIZE_UNIT accordingly. Abort if
645 no such upper bound can be obtained. */
648 force_constant_size (tree var
)
650 /* The only attempt we make is by querying the maximum size of objects
651 of the variable's type. */
653 HOST_WIDE_INT max_size
;
655 gcc_assert (TREE_CODE (var
) == VAR_DECL
);
657 max_size
= max_int_size_in_bytes (TREE_TYPE (var
));
659 gcc_assert (max_size
>= 0);
662 = build_int_cst (TREE_TYPE (DECL_SIZE_UNIT (var
)), max_size
);
664 = build_int_cst (TREE_TYPE (DECL_SIZE (var
)), max_size
* BITS_PER_UNIT
);
667 /* Push the temporary variable TMP into the current binding. */
670 gimple_add_tmp_var_fn (struct function
*fn
, tree tmp
)
672 gcc_assert (!DECL_CHAIN (tmp
) && !DECL_SEEN_IN_BIND_EXPR_P (tmp
));
674 /* Later processing assumes that the object size is constant, which might
675 not be true at this point. Force the use of a constant upper bound in
677 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp
)))
678 force_constant_size (tmp
);
680 DECL_CONTEXT (tmp
) = fn
->decl
;
681 DECL_SEEN_IN_BIND_EXPR_P (tmp
) = 1;
683 record_vars_into (tmp
, fn
->decl
);
686 /* Push the temporary variable TMP into the current binding. */
689 gimple_add_tmp_var (tree tmp
)
691 gcc_assert (!DECL_CHAIN (tmp
) && !DECL_SEEN_IN_BIND_EXPR_P (tmp
));
693 /* Later processing assumes that the object size is constant, which might
694 not be true at this point. Force the use of a constant upper bound in
696 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp
)))
697 force_constant_size (tmp
);
699 DECL_CONTEXT (tmp
) = current_function_decl
;
700 DECL_SEEN_IN_BIND_EXPR_P (tmp
) = 1;
704 DECL_CHAIN (tmp
) = gimplify_ctxp
->temps
;
705 gimplify_ctxp
->temps
= tmp
;
707 /* Mark temporaries local within the nearest enclosing parallel. */
708 if (gimplify_omp_ctxp
)
710 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
712 && (ctx
->region_type
== ORT_WORKSHARE
713 || ctx
->region_type
== ORT_SIMD
714 || ctx
->region_type
== ORT_ACC
))
715 ctx
= ctx
->outer_context
;
717 omp_add_variable (ctx
, tmp
, GOVD_LOCAL
| GOVD_SEEN
);
726 /* This case is for nested functions. We need to expose the locals
728 body_seq
= gimple_body (current_function_decl
);
729 declare_vars (tmp
, gimple_seq_first_stmt (body_seq
), false);
735 /* This page contains routines to unshare tree nodes, i.e. to duplicate tree
736 nodes that are referenced more than once in GENERIC functions. This is
737 necessary because gimplification (translation into GIMPLE) is performed
738 by modifying tree nodes in-place, so gimplication of a shared node in a
739 first context could generate an invalid GIMPLE form in a second context.
741 This is achieved with a simple mark/copy/unmark algorithm that walks the
742 GENERIC representation top-down, marks nodes with TREE_VISITED the first
743 time it encounters them, duplicates them if they already have TREE_VISITED
744 set, and finally removes the TREE_VISITED marks it has set.
746 The algorithm works only at the function level, i.e. it generates a GENERIC
747 representation of a function with no nodes shared within the function when
748 passed a GENERIC function (except for nodes that are allowed to be shared).
750 At the global level, it is also necessary to unshare tree nodes that are
751 referenced in more than one function, for the same aforementioned reason.
752 This requires some cooperation from the front-end. There are 2 strategies:
754 1. Manual unsharing. The front-end needs to call unshare_expr on every
755 expression that might end up being shared across functions.
757 2. Deep unsharing. This is an extension of regular unsharing. Instead
758 of calling unshare_expr on expressions that might be shared across
759 functions, the front-end pre-marks them with TREE_VISITED. This will
760 ensure that they are unshared on the first reference within functions
761 when the regular unsharing algorithm runs. The counterpart is that
762 this algorithm must look deeper than for manual unsharing, which is
763 specified by LANG_HOOKS_DEEP_UNSHARING.
765 If there are only few specific cases of node sharing across functions, it is
766 probably easier for a front-end to unshare the expressions manually. On the
767 contrary, if the expressions generated at the global level are as widespread
768 as expressions generated within functions, deep unsharing is very likely the
771 /* Similar to copy_tree_r but do not copy SAVE_EXPR or TARGET_EXPR nodes.
772 These nodes model computations that must be done once. If we were to
773 unshare something like SAVE_EXPR(i++), the gimplification process would
774 create wrong code. However, if DATA is non-null, it must hold a pointer
775 set that is used to unshare the subtrees of these nodes. */
778 mostly_copy_tree_r (tree
*tp
, int *walk_subtrees
, void *data
)
781 enum tree_code code
= TREE_CODE (t
);
783 /* Do not copy SAVE_EXPR, TARGET_EXPR or BIND_EXPR nodes themselves, but
784 copy their subtrees if we can make sure to do it only once. */
785 if (code
== SAVE_EXPR
|| code
== TARGET_EXPR
|| code
== BIND_EXPR
)
787 if (data
&& !((hash_set
<tree
> *)data
)->add (t
))
793 /* Stop at types, decls, constants like copy_tree_r. */
794 else if (TREE_CODE_CLASS (code
) == tcc_type
795 || TREE_CODE_CLASS (code
) == tcc_declaration
796 || TREE_CODE_CLASS (code
) == tcc_constant
797 /* We can't do anything sensible with a BLOCK used as an
798 expression, but we also can't just die when we see it
799 because of non-expression uses. So we avert our eyes
800 and cross our fingers. Silly Java. */
804 /* Cope with the statement expression extension. */
805 else if (code
== STATEMENT_LIST
)
808 /* Leave the bulk of the work to copy_tree_r itself. */
810 copy_tree_r (tp
, walk_subtrees
, NULL
);
815 /* Callback for walk_tree to unshare most of the shared trees rooted at *TP.
816 If *TP has been visited already, then *TP is deeply copied by calling
817 mostly_copy_tree_r. DATA is passed to mostly_copy_tree_r unmodified. */
820 copy_if_shared_r (tree
*tp
, int *walk_subtrees
, void *data
)
823 enum tree_code code
= TREE_CODE (t
);
825 /* Skip types, decls, and constants. But we do want to look at their
826 types and the bounds of types. Mark them as visited so we properly
827 unmark their subtrees on the unmark pass. If we've already seen them,
828 don't look down further. */
829 if (TREE_CODE_CLASS (code
) == tcc_type
830 || TREE_CODE_CLASS (code
) == tcc_declaration
831 || TREE_CODE_CLASS (code
) == tcc_constant
)
833 if (TREE_VISITED (t
))
836 TREE_VISITED (t
) = 1;
839 /* If this node has been visited already, unshare it and don't look
841 else if (TREE_VISITED (t
))
843 walk_tree (tp
, mostly_copy_tree_r
, data
, NULL
);
847 /* Otherwise, mark the node as visited and keep looking. */
849 TREE_VISITED (t
) = 1;
854 /* Unshare most of the shared trees rooted at *TP. DATA is passed to the
855 copy_if_shared_r callback unmodified. */
858 copy_if_shared (tree
*tp
, void *data
)
860 walk_tree (tp
, copy_if_shared_r
, data
, NULL
);
863 /* Unshare all the trees in the body of FNDECL, as well as in the bodies of
864 any nested functions. */
867 unshare_body (tree fndecl
)
869 struct cgraph_node
*cgn
= cgraph_node::get (fndecl
);
870 /* If the language requires deep unsharing, we need a pointer set to make
871 sure we don't repeatedly unshare subtrees of unshareable nodes. */
872 hash_set
<tree
> *visited
873 = lang_hooks
.deep_unsharing
? new hash_set
<tree
> : NULL
;
875 copy_if_shared (&DECL_SAVED_TREE (fndecl
), visited
);
876 copy_if_shared (&DECL_SIZE (DECL_RESULT (fndecl
)), visited
);
877 copy_if_shared (&DECL_SIZE_UNIT (DECL_RESULT (fndecl
)), visited
);
882 for (cgn
= cgn
->nested
; cgn
; cgn
= cgn
->next_nested
)
883 unshare_body (cgn
->decl
);
886 /* Callback for walk_tree to unmark the visited trees rooted at *TP.
887 Subtrees are walked until the first unvisited node is encountered. */
890 unmark_visited_r (tree
*tp
, int *walk_subtrees
, void *data ATTRIBUTE_UNUSED
)
894 /* If this node has been visited, unmark it and keep looking. */
895 if (TREE_VISITED (t
))
896 TREE_VISITED (t
) = 0;
898 /* Otherwise, don't look any deeper. */
905 /* Unmark the visited trees rooted at *TP. */
908 unmark_visited (tree
*tp
)
910 walk_tree (tp
, unmark_visited_r
, NULL
, NULL
);
913 /* Likewise, but mark all trees as not visited. */
916 unvisit_body (tree fndecl
)
918 struct cgraph_node
*cgn
= cgraph_node::get (fndecl
);
920 unmark_visited (&DECL_SAVED_TREE (fndecl
));
921 unmark_visited (&DECL_SIZE (DECL_RESULT (fndecl
)));
922 unmark_visited (&DECL_SIZE_UNIT (DECL_RESULT (fndecl
)));
925 for (cgn
= cgn
->nested
; cgn
; cgn
= cgn
->next_nested
)
926 unvisit_body (cgn
->decl
);
929 /* Unconditionally make an unshared copy of EXPR. This is used when using
930 stored expressions which span multiple functions, such as BINFO_VTABLE,
931 as the normal unsharing process can't tell that they're shared. */
934 unshare_expr (tree expr
)
936 walk_tree (&expr
, mostly_copy_tree_r
, NULL
, NULL
);
940 /* Worker for unshare_expr_without_location. */
943 prune_expr_location (tree
*tp
, int *walk_subtrees
, void *)
946 SET_EXPR_LOCATION (*tp
, UNKNOWN_LOCATION
);
952 /* Similar to unshare_expr but also prune all expression locations
956 unshare_expr_without_location (tree expr
)
958 walk_tree (&expr
, mostly_copy_tree_r
, NULL
, NULL
);
960 walk_tree (&expr
, prune_expr_location
, NULL
, NULL
);
964 /* WRAPPER is a code such as BIND_EXPR or CLEANUP_POINT_EXPR which can both
965 contain statements and have a value. Assign its value to a temporary
966 and give it void_type_node. Return the temporary, or NULL_TREE if
967 WRAPPER was already void. */
970 voidify_wrapper_expr (tree wrapper
, tree temp
)
972 tree type
= TREE_TYPE (wrapper
);
973 if (type
&& !VOID_TYPE_P (type
))
977 /* Set p to point to the body of the wrapper. Loop until we find
978 something that isn't a wrapper. */
979 for (p
= &wrapper
; p
&& *p
; )
981 switch (TREE_CODE (*p
))
984 TREE_SIDE_EFFECTS (*p
) = 1;
985 TREE_TYPE (*p
) = void_type_node
;
986 /* For a BIND_EXPR, the body is operand 1. */
987 p
= &BIND_EXPR_BODY (*p
);
990 case CLEANUP_POINT_EXPR
:
991 case TRY_FINALLY_EXPR
:
993 TREE_SIDE_EFFECTS (*p
) = 1;
994 TREE_TYPE (*p
) = void_type_node
;
995 p
= &TREE_OPERAND (*p
, 0);
1000 tree_stmt_iterator i
= tsi_last (*p
);
1001 TREE_SIDE_EFFECTS (*p
) = 1;
1002 TREE_TYPE (*p
) = void_type_node
;
1003 p
= tsi_end_p (i
) ? NULL
: tsi_stmt_ptr (i
);
1008 /* Advance to the last statement. Set all container types to
1010 for (; TREE_CODE (*p
) == COMPOUND_EXPR
; p
= &TREE_OPERAND (*p
, 1))
1012 TREE_SIDE_EFFECTS (*p
) = 1;
1013 TREE_TYPE (*p
) = void_type_node
;
1017 case TRANSACTION_EXPR
:
1018 TREE_SIDE_EFFECTS (*p
) = 1;
1019 TREE_TYPE (*p
) = void_type_node
;
1020 p
= &TRANSACTION_EXPR_BODY (*p
);
1024 /* Assume that any tree upon which voidify_wrapper_expr is
1025 directly called is a wrapper, and that its body is op0. */
1028 TREE_SIDE_EFFECTS (*p
) = 1;
1029 TREE_TYPE (*p
) = void_type_node
;
1030 p
= &TREE_OPERAND (*p
, 0);
1038 if (p
== NULL
|| IS_EMPTY_STMT (*p
))
1042 /* The wrapper is on the RHS of an assignment that we're pushing
1044 gcc_assert (TREE_CODE (temp
) == INIT_EXPR
1045 || TREE_CODE (temp
) == MODIFY_EXPR
);
1046 TREE_OPERAND (temp
, 1) = *p
;
1051 temp
= create_tmp_var (type
, "retval");
1052 *p
= build2 (INIT_EXPR
, type
, temp
, *p
);
1061 /* Prepare calls to builtins to SAVE and RESTORE the stack as well as
1062 a temporary through which they communicate. */
1065 build_stack_save_restore (gcall
**save
, gcall
**restore
)
1069 *save
= gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_SAVE
), 0);
1070 tmp_var
= create_tmp_var (ptr_type_node
, "saved_stack");
1071 gimple_call_set_lhs (*save
, tmp_var
);
1074 = gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_RESTORE
),
1078 /* Gimplify a BIND_EXPR. Just voidify and recurse. */
1080 static enum gimplify_status
1081 gimplify_bind_expr (tree
*expr_p
, gimple_seq
*pre_p
)
1083 tree bind_expr
= *expr_p
;
1084 bool old_keep_stack
= gimplify_ctxp
->keep_stack
;
1085 bool old_save_stack
= gimplify_ctxp
->save_stack
;
1088 gimple_seq body
, cleanup
;
1090 location_t start_locus
= 0, end_locus
= 0;
1091 tree ret_clauses
= NULL
;
1093 tree temp
= voidify_wrapper_expr (bind_expr
, NULL
);
1095 /* Mark variables seen in this bind expr. */
1096 for (t
= BIND_EXPR_VARS (bind_expr
); t
; t
= DECL_CHAIN (t
))
1098 if (TREE_CODE (t
) == VAR_DECL
)
1100 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
1102 /* Mark variable as local. */
1103 if (ctx
&& ctx
->region_type
!= ORT_NONE
&& !DECL_EXTERNAL (t
)
1104 && (! DECL_SEEN_IN_BIND_EXPR_P (t
)
1105 || splay_tree_lookup (ctx
->variables
,
1106 (splay_tree_key
) t
) == NULL
))
1108 if (ctx
->region_type
== ORT_SIMD
1109 && TREE_ADDRESSABLE (t
)
1110 && !TREE_STATIC (t
))
1111 omp_add_variable (ctx
, t
, GOVD_PRIVATE
| GOVD_SEEN
);
1113 omp_add_variable (ctx
, t
, GOVD_LOCAL
| GOVD_SEEN
);
1116 DECL_SEEN_IN_BIND_EXPR_P (t
) = 1;
1118 if (DECL_HARD_REGISTER (t
) && !is_global_var (t
) && cfun
)
1119 cfun
->has_local_explicit_reg_vars
= true;
1122 /* Preliminarily mark non-addressed complex variables as eligible
1123 for promotion to gimple registers. We'll transform their uses
1125 if ((TREE_CODE (TREE_TYPE (t
)) == COMPLEX_TYPE
1126 || TREE_CODE (TREE_TYPE (t
)) == VECTOR_TYPE
)
1127 && !TREE_THIS_VOLATILE (t
)
1128 && (TREE_CODE (t
) == VAR_DECL
&& !DECL_HARD_REGISTER (t
))
1129 && !needs_to_live_in_memory (t
))
1130 DECL_GIMPLE_REG_P (t
) = 1;
1133 bind_stmt
= gimple_build_bind (BIND_EXPR_VARS (bind_expr
), NULL
,
1134 BIND_EXPR_BLOCK (bind_expr
));
1135 gimple_push_bind_expr (bind_stmt
);
1137 gimplify_ctxp
->keep_stack
= false;
1138 gimplify_ctxp
->save_stack
= false;
1140 /* Gimplify the body into the GIMPLE_BIND tuple's body. */
1142 gimplify_stmt (&BIND_EXPR_BODY (bind_expr
), &body
);
1143 gimple_bind_set_body (bind_stmt
, body
);
1145 /* Source location wise, the cleanup code (stack_restore and clobbers)
1146 belongs to the end of the block, so propagate what we have. The
1147 stack_save operation belongs to the beginning of block, which we can
1148 infer from the bind_expr directly if the block has no explicit
1150 if (BIND_EXPR_BLOCK (bind_expr
))
1152 end_locus
= BLOCK_SOURCE_END_LOCATION (BIND_EXPR_BLOCK (bind_expr
));
1153 start_locus
= BLOCK_SOURCE_LOCATION (BIND_EXPR_BLOCK (bind_expr
));
1155 if (start_locus
== 0)
1156 start_locus
= EXPR_LOCATION (bind_expr
);
1161 /* If the code both contains VLAs and calls alloca, then we cannot reclaim
1162 the stack space allocated to the VLAs. */
1163 if (gimplify_ctxp
->save_stack
&& !gimplify_ctxp
->keep_stack
)
1165 gcall
*stack_restore
;
1167 /* Save stack on entry and restore it on exit. Add a try_finally
1168 block to achieve this. */
1169 build_stack_save_restore (&stack_save
, &stack_restore
);
1171 gimple_set_location (stack_save
, start_locus
);
1172 gimple_set_location (stack_restore
, end_locus
);
1174 gimplify_seq_add_stmt (&cleanup
, stack_restore
);
1177 /* Add clobbers for all variables that go out of scope. */
1178 for (t
= BIND_EXPR_VARS (bind_expr
); t
; t
= DECL_CHAIN (t
))
1180 if (TREE_CODE (t
) == VAR_DECL
1181 && !is_global_var (t
)
1182 && DECL_CONTEXT (t
) == current_function_decl
1183 && !DECL_HARD_REGISTER (t
)
1184 && !TREE_THIS_VOLATILE (t
)
1185 && !DECL_HAS_VALUE_EXPR_P (t
)
1186 /* Only care for variables that have to be in memory. Others
1187 will be rewritten into SSA names, hence moved to the top-level. */
1188 && !is_gimple_reg (t
)
1189 && flag_stack_reuse
!= SR_NONE
)
1191 tree clobber
= build_constructor (TREE_TYPE (t
), NULL
);
1192 gimple
*clobber_stmt
;
1193 TREE_THIS_VOLATILE (clobber
) = 1;
1194 clobber_stmt
= gimple_build_assign (t
, clobber
);
1195 gimple_set_location (clobber_stmt
, end_locus
);
1196 gimplify_seq_add_stmt (&cleanup
, clobber_stmt
);
1198 if (flag_openacc
&& oacc_declare_returns
!= NULL
)
1200 tree
*c
= oacc_declare_returns
->get (t
);
1204 OMP_CLAUSE_CHAIN (*c
) = ret_clauses
;
1208 oacc_declare_returns
->remove (t
);
1210 if (oacc_declare_returns
->elements () == 0)
1212 delete oacc_declare_returns
;
1213 oacc_declare_returns
= NULL
;
1223 gimple_stmt_iterator si
= gsi_start (cleanup
);
1225 stmt
= gimple_build_omp_target (NULL
, GF_OMP_TARGET_KIND_OACC_DECLARE
,
1227 gsi_insert_seq_before_without_update (&si
, stmt
, GSI_NEW_STMT
);
1233 gimple_seq new_body
;
1236 gs
= gimple_build_try (gimple_bind_body (bind_stmt
), cleanup
,
1237 GIMPLE_TRY_FINALLY
);
1240 gimplify_seq_add_stmt (&new_body
, stack_save
);
1241 gimplify_seq_add_stmt (&new_body
, gs
);
1242 gimple_bind_set_body (bind_stmt
, new_body
);
1245 /* keep_stack propagates all the way up to the outermost BIND_EXPR. */
1246 if (!gimplify_ctxp
->keep_stack
)
1247 gimplify_ctxp
->keep_stack
= old_keep_stack
;
1248 gimplify_ctxp
->save_stack
= old_save_stack
;
1250 gimple_pop_bind_expr ();
1252 gimplify_seq_add_stmt (pre_p
, bind_stmt
);
1260 *expr_p
= NULL_TREE
;
1264 /* Gimplify a RETURN_EXPR. If the expression to be returned is not a
1265 GIMPLE value, it is assigned to a new temporary and the statement is
1266 re-written to return the temporary.
1268 PRE_P points to the sequence where side effects that must happen before
1269 STMT should be stored. */
1271 static enum gimplify_status
1272 gimplify_return_expr (tree stmt
, gimple_seq
*pre_p
)
1275 tree ret_expr
= TREE_OPERAND (stmt
, 0);
1276 tree result_decl
, result
;
1278 if (ret_expr
== error_mark_node
)
1281 /* Implicit _Cilk_sync must be inserted right before any return statement
1282 if there is a _Cilk_spawn in the function. If the user has provided a
1283 _Cilk_sync, the optimizer should remove this duplicate one. */
1284 if (fn_contains_cilk_spawn_p (cfun
))
1286 tree impl_sync
= build0 (CILK_SYNC_STMT
, void_type_node
);
1287 gimplify_and_add (impl_sync
, pre_p
);
1291 || TREE_CODE (ret_expr
) == RESULT_DECL
1292 || ret_expr
== error_mark_node
)
1294 greturn
*ret
= gimple_build_return (ret_expr
);
1295 gimple_set_no_warning (ret
, TREE_NO_WARNING (stmt
));
1296 gimplify_seq_add_stmt (pre_p
, ret
);
1300 if (VOID_TYPE_P (TREE_TYPE (TREE_TYPE (current_function_decl
))))
1301 result_decl
= NULL_TREE
;
1304 result_decl
= TREE_OPERAND (ret_expr
, 0);
1306 /* See through a return by reference. */
1307 if (TREE_CODE (result_decl
) == INDIRECT_REF
)
1308 result_decl
= TREE_OPERAND (result_decl
, 0);
1310 gcc_assert ((TREE_CODE (ret_expr
) == MODIFY_EXPR
1311 || TREE_CODE (ret_expr
) == INIT_EXPR
)
1312 && TREE_CODE (result_decl
) == RESULT_DECL
);
1315 /* If aggregate_value_p is true, then we can return the bare RESULT_DECL.
1316 Recall that aggregate_value_p is FALSE for any aggregate type that is
1317 returned in registers. If we're returning values in registers, then
1318 we don't want to extend the lifetime of the RESULT_DECL, particularly
1319 across another call. In addition, for those aggregates for which
1320 hard_function_value generates a PARALLEL, we'll die during normal
1321 expansion of structure assignments; there's special code in expand_return
1322 to handle this case that does not exist in expand_expr. */
1325 else if (aggregate_value_p (result_decl
, TREE_TYPE (current_function_decl
)))
1327 if (TREE_CODE (DECL_SIZE (result_decl
)) != INTEGER_CST
)
1329 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (result_decl
)))
1330 gimplify_type_sizes (TREE_TYPE (result_decl
), pre_p
);
1331 /* Note that we don't use gimplify_vla_decl because the RESULT_DECL
1332 should be effectively allocated by the caller, i.e. all calls to
1333 this function must be subject to the Return Slot Optimization. */
1334 gimplify_one_sizepos (&DECL_SIZE (result_decl
), pre_p
);
1335 gimplify_one_sizepos (&DECL_SIZE_UNIT (result_decl
), pre_p
);
1337 result
= result_decl
;
1339 else if (gimplify_ctxp
->return_temp
)
1340 result
= gimplify_ctxp
->return_temp
;
1343 result
= create_tmp_reg (TREE_TYPE (result_decl
));
1345 /* ??? With complex control flow (usually involving abnormal edges),
1346 we can wind up warning about an uninitialized value for this. Due
1347 to how this variable is constructed and initialized, this is never
1348 true. Give up and never warn. */
1349 TREE_NO_WARNING (result
) = 1;
1351 gimplify_ctxp
->return_temp
= result
;
1354 /* Smash the lhs of the MODIFY_EXPR to the temporary we plan to use.
1355 Then gimplify the whole thing. */
1356 if (result
!= result_decl
)
1357 TREE_OPERAND (ret_expr
, 0) = result
;
1359 gimplify_and_add (TREE_OPERAND (stmt
, 0), pre_p
);
1361 ret
= gimple_build_return (result
);
1362 gimple_set_no_warning (ret
, TREE_NO_WARNING (stmt
));
1363 gimplify_seq_add_stmt (pre_p
, ret
);
1368 /* Gimplify a variable-length array DECL. */
1371 gimplify_vla_decl (tree decl
, gimple_seq
*seq_p
)
1373 /* This is a variable-sized decl. Simplify its size and mark it
1374 for deferred expansion. */
1375 tree t
, addr
, ptr_type
;
1377 gimplify_one_sizepos (&DECL_SIZE (decl
), seq_p
);
1378 gimplify_one_sizepos (&DECL_SIZE_UNIT (decl
), seq_p
);
1380 /* Don't mess with a DECL_VALUE_EXPR set by the front-end. */
1381 if (DECL_HAS_VALUE_EXPR_P (decl
))
1384 /* All occurrences of this decl in final gimplified code will be
1385 replaced by indirection. Setting DECL_VALUE_EXPR does two
1386 things: First, it lets the rest of the gimplifier know what
1387 replacement to use. Second, it lets the debug info know
1388 where to find the value. */
1389 ptr_type
= build_pointer_type (TREE_TYPE (decl
));
1390 addr
= create_tmp_var (ptr_type
, get_name (decl
));
1391 DECL_IGNORED_P (addr
) = 0;
1392 t
= build_fold_indirect_ref (addr
);
1393 TREE_THIS_NOTRAP (t
) = 1;
1394 SET_DECL_VALUE_EXPR (decl
, t
);
1395 DECL_HAS_VALUE_EXPR_P (decl
) = 1;
1397 t
= builtin_decl_explicit (BUILT_IN_ALLOCA_WITH_ALIGN
);
1398 t
= build_call_expr (t
, 2, DECL_SIZE_UNIT (decl
),
1399 size_int (DECL_ALIGN (decl
)));
1400 /* The call has been built for a variable-sized object. */
1401 CALL_ALLOCA_FOR_VAR_P (t
) = 1;
1402 t
= fold_convert (ptr_type
, t
);
1403 t
= build2 (MODIFY_EXPR
, TREE_TYPE (addr
), addr
, t
);
1405 gimplify_and_add (t
, seq_p
);
1408 /* A helper function to be called via walk_tree. Mark all labels under *TP
1409 as being forced. To be called for DECL_INITIAL of static variables. */
1412 force_labels_r (tree
*tp
, int *walk_subtrees
, void *data ATTRIBUTE_UNUSED
)
1416 if (TREE_CODE (*tp
) == LABEL_DECL
)
1417 FORCED_LABEL (*tp
) = 1;
1422 /* Gimplify a DECL_EXPR node *STMT_P by making any necessary allocation
1423 and initialization explicit. */
1425 static enum gimplify_status
1426 gimplify_decl_expr (tree
*stmt_p
, gimple_seq
*seq_p
)
1428 tree stmt
= *stmt_p
;
1429 tree decl
= DECL_EXPR_DECL (stmt
);
1431 *stmt_p
= NULL_TREE
;
1433 if (TREE_TYPE (decl
) == error_mark_node
)
1436 if ((TREE_CODE (decl
) == TYPE_DECL
1437 || TREE_CODE (decl
) == VAR_DECL
)
1438 && !TYPE_SIZES_GIMPLIFIED (TREE_TYPE (decl
)))
1439 gimplify_type_sizes (TREE_TYPE (decl
), seq_p
);
1441 /* ??? DECL_ORIGINAL_TYPE is streamed for LTO so it needs to be gimplified
1442 in case its size expressions contain problematic nodes like CALL_EXPR. */
1443 if (TREE_CODE (decl
) == TYPE_DECL
1444 && DECL_ORIGINAL_TYPE (decl
)
1445 && !TYPE_SIZES_GIMPLIFIED (DECL_ORIGINAL_TYPE (decl
)))
1446 gimplify_type_sizes (DECL_ORIGINAL_TYPE (decl
), seq_p
);
1448 if (TREE_CODE (decl
) == VAR_DECL
&& !DECL_EXTERNAL (decl
))
1450 tree init
= DECL_INITIAL (decl
);
1452 if (TREE_CODE (DECL_SIZE_UNIT (decl
)) != INTEGER_CST
1453 || (!TREE_STATIC (decl
)
1454 && flag_stack_check
== GENERIC_STACK_CHECK
1455 && compare_tree_int (DECL_SIZE_UNIT (decl
),
1456 STACK_CHECK_MAX_VAR_SIZE
) > 0))
1457 gimplify_vla_decl (decl
, seq_p
);
1459 /* Some front ends do not explicitly declare all anonymous
1460 artificial variables. We compensate here by declaring the
1461 variables, though it would be better if the front ends would
1462 explicitly declare them. */
1463 if (!DECL_SEEN_IN_BIND_EXPR_P (decl
)
1464 && DECL_ARTIFICIAL (decl
) && DECL_NAME (decl
) == NULL_TREE
)
1465 gimple_add_tmp_var (decl
);
1467 if (init
&& init
!= error_mark_node
)
1469 if (!TREE_STATIC (decl
))
1471 DECL_INITIAL (decl
) = NULL_TREE
;
1472 init
= build2 (INIT_EXPR
, void_type_node
, decl
, init
);
1473 gimplify_and_add (init
, seq_p
);
1477 /* We must still examine initializers for static variables
1478 as they may contain a label address. */
1479 walk_tree (&init
, force_labels_r
, NULL
, NULL
);
1486 /* Gimplify a LOOP_EXPR. Normally this just involves gimplifying the body
1487 and replacing the LOOP_EXPR with goto, but if the loop contains an
1488 EXIT_EXPR, we need to append a label for it to jump to. */
1490 static enum gimplify_status
1491 gimplify_loop_expr (tree
*expr_p
, gimple_seq
*pre_p
)
1493 tree saved_label
= gimplify_ctxp
->exit_label
;
1494 tree start_label
= create_artificial_label (UNKNOWN_LOCATION
);
1496 gimplify_seq_add_stmt (pre_p
, gimple_build_label (start_label
));
1498 gimplify_ctxp
->exit_label
= NULL_TREE
;
1500 gimplify_and_add (LOOP_EXPR_BODY (*expr_p
), pre_p
);
1502 gimplify_seq_add_stmt (pre_p
, gimple_build_goto (start_label
));
1504 if (gimplify_ctxp
->exit_label
)
1505 gimplify_seq_add_stmt (pre_p
,
1506 gimple_build_label (gimplify_ctxp
->exit_label
));
1508 gimplify_ctxp
->exit_label
= saved_label
;
1514 /* Gimplify a statement list onto a sequence. These may be created either
1515 by an enlightened front-end, or by shortcut_cond_expr. */
1517 static enum gimplify_status
1518 gimplify_statement_list (tree
*expr_p
, gimple_seq
*pre_p
)
1520 tree temp
= voidify_wrapper_expr (*expr_p
, NULL
);
1522 tree_stmt_iterator i
= tsi_start (*expr_p
);
1524 while (!tsi_end_p (i
))
1526 gimplify_stmt (tsi_stmt_ptr (i
), pre_p
);
1540 /* Gimplify a SWITCH_EXPR, and collect the vector of labels it can
1543 static enum gimplify_status
1544 gimplify_switch_expr (tree
*expr_p
, gimple_seq
*pre_p
)
1546 tree switch_expr
= *expr_p
;
1547 gimple_seq switch_body_seq
= NULL
;
1548 enum gimplify_status ret
;
1549 tree index_type
= TREE_TYPE (switch_expr
);
1550 if (index_type
== NULL_TREE
)
1551 index_type
= TREE_TYPE (SWITCH_COND (switch_expr
));
1553 ret
= gimplify_expr (&SWITCH_COND (switch_expr
), pre_p
, NULL
, is_gimple_val
,
1555 if (ret
== GS_ERROR
|| ret
== GS_UNHANDLED
)
1558 if (SWITCH_BODY (switch_expr
))
1561 vec
<tree
> saved_labels
;
1562 tree default_case
= NULL_TREE
;
1563 gswitch
*switch_stmt
;
1565 /* If someone can be bothered to fill in the labels, they can
1566 be bothered to null out the body too. */
1567 gcc_assert (!SWITCH_LABELS (switch_expr
));
1569 /* Save old labels, get new ones from body, then restore the old
1570 labels. Save all the things from the switch body to append after. */
1571 saved_labels
= gimplify_ctxp
->case_labels
;
1572 gimplify_ctxp
->case_labels
.create (8);
1574 gimplify_stmt (&SWITCH_BODY (switch_expr
), &switch_body_seq
);
1575 labels
= gimplify_ctxp
->case_labels
;
1576 gimplify_ctxp
->case_labels
= saved_labels
;
1578 preprocess_case_label_vec_for_gimple (labels
, index_type
,
1583 glabel
*new_default
;
1586 = build_case_label (NULL_TREE
, NULL_TREE
,
1587 create_artificial_label (UNKNOWN_LOCATION
));
1588 new_default
= gimple_build_label (CASE_LABEL (default_case
));
1589 gimplify_seq_add_stmt (&switch_body_seq
, new_default
);
1592 switch_stmt
= gimple_build_switch (SWITCH_COND (switch_expr
),
1593 default_case
, labels
);
1594 gimplify_seq_add_stmt (pre_p
, switch_stmt
);
1595 gimplify_seq_add_seq (pre_p
, switch_body_seq
);
1599 gcc_assert (SWITCH_LABELS (switch_expr
));
1604 /* Gimplify the CASE_LABEL_EXPR pointed to by EXPR_P. */
1606 static enum gimplify_status
1607 gimplify_case_label_expr (tree
*expr_p
, gimple_seq
*pre_p
)
1609 struct gimplify_ctx
*ctxp
;
1612 /* Invalid programs can play Duff's Device type games with, for example,
1613 #pragma omp parallel. At least in the C front end, we don't
1614 detect such invalid branches until after gimplification, in the
1615 diagnose_omp_blocks pass. */
1616 for (ctxp
= gimplify_ctxp
; ; ctxp
= ctxp
->prev_context
)
1617 if (ctxp
->case_labels
.exists ())
1620 label_stmt
= gimple_build_label (CASE_LABEL (*expr_p
));
1621 ctxp
->case_labels
.safe_push (*expr_p
);
1622 gimplify_seq_add_stmt (pre_p
, label_stmt
);
1627 /* Build a GOTO to the LABEL_DECL pointed to by LABEL_P, building it first
1631 build_and_jump (tree
*label_p
)
1633 if (label_p
== NULL
)
1634 /* If there's nowhere to jump, just fall through. */
1637 if (*label_p
== NULL_TREE
)
1639 tree label
= create_artificial_label (UNKNOWN_LOCATION
);
1643 return build1 (GOTO_EXPR
, void_type_node
, *label_p
);
1646 /* Gimplify an EXIT_EXPR by converting to a GOTO_EXPR inside a COND_EXPR.
1647 This also involves building a label to jump to and communicating it to
1648 gimplify_loop_expr through gimplify_ctxp->exit_label. */
1650 static enum gimplify_status
1651 gimplify_exit_expr (tree
*expr_p
)
1653 tree cond
= TREE_OPERAND (*expr_p
, 0);
1656 expr
= build_and_jump (&gimplify_ctxp
->exit_label
);
1657 expr
= build3 (COND_EXPR
, void_type_node
, cond
, expr
, NULL_TREE
);
1663 /* *EXPR_P is a COMPONENT_REF being used as an rvalue. If its type is
1664 different from its canonical type, wrap the whole thing inside a
1665 NOP_EXPR and force the type of the COMPONENT_REF to be the canonical
1668 The canonical type of a COMPONENT_REF is the type of the field being
1669 referenced--unless the field is a bit-field which can be read directly
1670 in a smaller mode, in which case the canonical type is the
1671 sign-appropriate type corresponding to that mode. */
1674 canonicalize_component_ref (tree
*expr_p
)
1676 tree expr
= *expr_p
;
1679 gcc_assert (TREE_CODE (expr
) == COMPONENT_REF
);
1681 if (INTEGRAL_TYPE_P (TREE_TYPE (expr
)))
1682 type
= TREE_TYPE (get_unwidened (expr
, NULL_TREE
));
1684 type
= TREE_TYPE (TREE_OPERAND (expr
, 1));
1686 /* One could argue that all the stuff below is not necessary for
1687 the non-bitfield case and declare it a FE error if type
1688 adjustment would be needed. */
1689 if (TREE_TYPE (expr
) != type
)
1691 #ifdef ENABLE_TYPES_CHECKING
1692 tree old_type
= TREE_TYPE (expr
);
1696 /* We need to preserve qualifiers and propagate them from
1698 type_quals
= TYPE_QUALS (type
)
1699 | TYPE_QUALS (TREE_TYPE (TREE_OPERAND (expr
, 0)));
1700 if (TYPE_QUALS (type
) != type_quals
)
1701 type
= build_qualified_type (TYPE_MAIN_VARIANT (type
), type_quals
);
1703 /* Set the type of the COMPONENT_REF to the underlying type. */
1704 TREE_TYPE (expr
) = type
;
1706 #ifdef ENABLE_TYPES_CHECKING
1707 /* It is now a FE error, if the conversion from the canonical
1708 type to the original expression type is not useless. */
1709 gcc_assert (useless_type_conversion_p (old_type
, type
));
1714 /* If a NOP conversion is changing a pointer to array of foo to a pointer
1715 to foo, embed that change in the ADDR_EXPR by converting
1720 where L is the lower bound. For simplicity, only do this for constant
1722 The constraint is that the type of &array[L] is trivially convertible
1726 canonicalize_addr_expr (tree
*expr_p
)
1728 tree expr
= *expr_p
;
1729 tree addr_expr
= TREE_OPERAND (expr
, 0);
1730 tree datype
, ddatype
, pddatype
;
1732 /* We simplify only conversions from an ADDR_EXPR to a pointer type. */
1733 if (!POINTER_TYPE_P (TREE_TYPE (expr
))
1734 || TREE_CODE (addr_expr
) != ADDR_EXPR
)
1737 /* The addr_expr type should be a pointer to an array. */
1738 datype
= TREE_TYPE (TREE_TYPE (addr_expr
));
1739 if (TREE_CODE (datype
) != ARRAY_TYPE
)
1742 /* The pointer to element type shall be trivially convertible to
1743 the expression pointer type. */
1744 ddatype
= TREE_TYPE (datype
);
1745 pddatype
= build_pointer_type (ddatype
);
1746 if (!useless_type_conversion_p (TYPE_MAIN_VARIANT (TREE_TYPE (expr
)),
1750 /* The lower bound and element sizes must be constant. */
1751 if (!TYPE_SIZE_UNIT (ddatype
)
1752 || TREE_CODE (TYPE_SIZE_UNIT (ddatype
)) != INTEGER_CST
1753 || !TYPE_DOMAIN (datype
) || !TYPE_MIN_VALUE (TYPE_DOMAIN (datype
))
1754 || TREE_CODE (TYPE_MIN_VALUE (TYPE_DOMAIN (datype
))) != INTEGER_CST
)
1757 /* All checks succeeded. Build a new node to merge the cast. */
1758 *expr_p
= build4 (ARRAY_REF
, ddatype
, TREE_OPERAND (addr_expr
, 0),
1759 TYPE_MIN_VALUE (TYPE_DOMAIN (datype
)),
1760 NULL_TREE
, NULL_TREE
);
1761 *expr_p
= build1 (ADDR_EXPR
, pddatype
, *expr_p
);
1763 /* We can have stripped a required restrict qualifier above. */
1764 if (!useless_type_conversion_p (TREE_TYPE (expr
), TREE_TYPE (*expr_p
)))
1765 *expr_p
= fold_convert (TREE_TYPE (expr
), *expr_p
);
1768 /* *EXPR_P is a NOP_EXPR or CONVERT_EXPR. Remove it and/or other conversions
1769 underneath as appropriate. */
1771 static enum gimplify_status
1772 gimplify_conversion (tree
*expr_p
)
1774 location_t loc
= EXPR_LOCATION (*expr_p
);
1775 gcc_assert (CONVERT_EXPR_P (*expr_p
));
1777 /* Then strip away all but the outermost conversion. */
1778 STRIP_SIGN_NOPS (TREE_OPERAND (*expr_p
, 0));
1780 /* And remove the outermost conversion if it's useless. */
1781 if (tree_ssa_useless_type_conversion (*expr_p
))
1782 *expr_p
= TREE_OPERAND (*expr_p
, 0);
1784 /* If we still have a conversion at the toplevel,
1785 then canonicalize some constructs. */
1786 if (CONVERT_EXPR_P (*expr_p
))
1788 tree sub
= TREE_OPERAND (*expr_p
, 0);
1790 /* If a NOP conversion is changing the type of a COMPONENT_REF
1791 expression, then canonicalize its type now in order to expose more
1792 redundant conversions. */
1793 if (TREE_CODE (sub
) == COMPONENT_REF
)
1794 canonicalize_component_ref (&TREE_OPERAND (*expr_p
, 0));
1796 /* If a NOP conversion is changing a pointer to array of foo
1797 to a pointer to foo, embed that change in the ADDR_EXPR. */
1798 else if (TREE_CODE (sub
) == ADDR_EXPR
)
1799 canonicalize_addr_expr (expr_p
);
1802 /* If we have a conversion to a non-register type force the
1803 use of a VIEW_CONVERT_EXPR instead. */
1804 if (CONVERT_EXPR_P (*expr_p
) && !is_gimple_reg_type (TREE_TYPE (*expr_p
)))
1805 *expr_p
= fold_build1_loc (loc
, VIEW_CONVERT_EXPR
, TREE_TYPE (*expr_p
),
1806 TREE_OPERAND (*expr_p
, 0));
1808 /* Canonicalize CONVERT_EXPR to NOP_EXPR. */
1809 if (TREE_CODE (*expr_p
) == CONVERT_EXPR
)
1810 TREE_SET_CODE (*expr_p
, NOP_EXPR
);
1815 /* Nonlocal VLAs seen in the current function. */
1816 static hash_set
<tree
> *nonlocal_vlas
;
1818 /* The VAR_DECLs created for nonlocal VLAs for debug info purposes. */
1819 static tree nonlocal_vla_vars
;
1821 /* Gimplify a VAR_DECL or PARM_DECL. Return GS_OK if we expanded a
1822 DECL_VALUE_EXPR, and it's worth re-examining things. */
1824 static enum gimplify_status
1825 gimplify_var_or_parm_decl (tree
*expr_p
)
1827 tree decl
= *expr_p
;
1829 /* ??? If this is a local variable, and it has not been seen in any
1830 outer BIND_EXPR, then it's probably the result of a duplicate
1831 declaration, for which we've already issued an error. It would
1832 be really nice if the front end wouldn't leak these at all.
1833 Currently the only known culprit is C++ destructors, as seen
1834 in g++.old-deja/g++.jason/binding.C. */
1835 if (TREE_CODE (decl
) == VAR_DECL
1836 && !DECL_SEEN_IN_BIND_EXPR_P (decl
)
1837 && !TREE_STATIC (decl
) && !DECL_EXTERNAL (decl
)
1838 && decl_function_context (decl
) == current_function_decl
)
1840 gcc_assert (seen_error ());
1844 /* When within an OMP context, notice uses of variables. */
1845 if (gimplify_omp_ctxp
&& omp_notice_variable (gimplify_omp_ctxp
, decl
, true))
1848 /* If the decl is an alias for another expression, substitute it now. */
1849 if (DECL_HAS_VALUE_EXPR_P (decl
))
1851 tree value_expr
= DECL_VALUE_EXPR (decl
);
1853 /* For referenced nonlocal VLAs add a decl for debugging purposes
1854 to the current function. */
1855 if (TREE_CODE (decl
) == VAR_DECL
1856 && TREE_CODE (DECL_SIZE_UNIT (decl
)) != INTEGER_CST
1857 && nonlocal_vlas
!= NULL
1858 && TREE_CODE (value_expr
) == INDIRECT_REF
1859 && TREE_CODE (TREE_OPERAND (value_expr
, 0)) == VAR_DECL
1860 && decl_function_context (decl
) != current_function_decl
)
1862 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
1864 && (ctx
->region_type
== ORT_WORKSHARE
1865 || ctx
->region_type
== ORT_SIMD
1866 || ctx
->region_type
== ORT_ACC
))
1867 ctx
= ctx
->outer_context
;
1868 if (!ctx
&& !nonlocal_vlas
->add (decl
))
1870 tree copy
= copy_node (decl
);
1872 lang_hooks
.dup_lang_specific_decl (copy
);
1873 SET_DECL_RTL (copy
, 0);
1874 TREE_USED (copy
) = 1;
1875 DECL_CHAIN (copy
) = nonlocal_vla_vars
;
1876 nonlocal_vla_vars
= copy
;
1877 SET_DECL_VALUE_EXPR (copy
, unshare_expr (value_expr
));
1878 DECL_HAS_VALUE_EXPR_P (copy
) = 1;
1882 *expr_p
= unshare_expr (value_expr
);
1889 /* Recalculate the value of the TREE_SIDE_EFFECTS flag for T. */
1892 recalculate_side_effects (tree t
)
1894 enum tree_code code
= TREE_CODE (t
);
1895 int len
= TREE_OPERAND_LENGTH (t
);
1898 switch (TREE_CODE_CLASS (code
))
1900 case tcc_expression
:
1906 case PREDECREMENT_EXPR
:
1907 case PREINCREMENT_EXPR
:
1908 case POSTDECREMENT_EXPR
:
1909 case POSTINCREMENT_EXPR
:
1910 /* All of these have side-effects, no matter what their
1919 case tcc_comparison
: /* a comparison expression */
1920 case tcc_unary
: /* a unary arithmetic expression */
1921 case tcc_binary
: /* a binary arithmetic expression */
1922 case tcc_reference
: /* a reference */
1923 case tcc_vl_exp
: /* a function call */
1924 TREE_SIDE_EFFECTS (t
) = TREE_THIS_VOLATILE (t
);
1925 for (i
= 0; i
< len
; ++i
)
1927 tree op
= TREE_OPERAND (t
, i
);
1928 if (op
&& TREE_SIDE_EFFECTS (op
))
1929 TREE_SIDE_EFFECTS (t
) = 1;
1934 /* No side-effects. */
1942 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
1946 : min_lval '[' val ']'
1948 | compound_lval '[' val ']'
1949 | compound_lval '.' ID
1951 This is not part of the original SIMPLE definition, which separates
1952 array and member references, but it seems reasonable to handle them
1953 together. Also, this way we don't run into problems with union
1954 aliasing; gcc requires that for accesses through a union to alias, the
1955 union reference must be explicit, which was not always the case when we
1956 were splitting up array and member refs.
1958 PRE_P points to the sequence where side effects that must happen before
1959 *EXPR_P should be stored.
1961 POST_P points to the sequence where side effects that must happen after
1962 *EXPR_P should be stored. */
1964 static enum gimplify_status
1965 gimplify_compound_lval (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
1966 fallback_t fallback
)
1969 enum gimplify_status ret
= GS_ALL_DONE
, tret
;
1971 location_t loc
= EXPR_LOCATION (*expr_p
);
1972 tree expr
= *expr_p
;
1974 /* Create a stack of the subexpressions so later we can walk them in
1975 order from inner to outer. */
1976 auto_vec
<tree
, 10> expr_stack
;
1978 /* We can handle anything that get_inner_reference can deal with. */
1979 for (p
= expr_p
; ; p
= &TREE_OPERAND (*p
, 0))
1982 /* Fold INDIRECT_REFs now to turn them into ARRAY_REFs. */
1983 if (TREE_CODE (*p
) == INDIRECT_REF
)
1984 *p
= fold_indirect_ref_loc (loc
, *p
);
1986 if (handled_component_p (*p
))
1988 /* Expand DECL_VALUE_EXPR now. In some cases that may expose
1989 additional COMPONENT_REFs. */
1990 else if ((TREE_CODE (*p
) == VAR_DECL
|| TREE_CODE (*p
) == PARM_DECL
)
1991 && gimplify_var_or_parm_decl (p
) == GS_OK
)
1996 expr_stack
.safe_push (*p
);
1999 gcc_assert (expr_stack
.length ());
2001 /* Now EXPR_STACK is a stack of pointers to all the refs we've
2002 walked through and P points to the innermost expression.
2004 Java requires that we elaborated nodes in source order. That
2005 means we must gimplify the inner expression followed by each of
2006 the indices, in order. But we can't gimplify the inner
2007 expression until we deal with any variable bounds, sizes, or
2008 positions in order to deal with PLACEHOLDER_EXPRs.
2010 So we do this in three steps. First we deal with the annotations
2011 for any variables in the components, then we gimplify the base,
2012 then we gimplify any indices, from left to right. */
2013 for (i
= expr_stack
.length () - 1; i
>= 0; i
--)
2015 tree t
= expr_stack
[i
];
2017 if (TREE_CODE (t
) == ARRAY_REF
|| TREE_CODE (t
) == ARRAY_RANGE_REF
)
2019 /* Gimplify the low bound and element type size and put them into
2020 the ARRAY_REF. If these values are set, they have already been
2022 if (TREE_OPERAND (t
, 2) == NULL_TREE
)
2024 tree low
= unshare_expr (array_ref_low_bound (t
));
2025 if (!is_gimple_min_invariant (low
))
2027 TREE_OPERAND (t
, 2) = low
;
2028 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
,
2029 post_p
, is_gimple_reg
,
2031 ret
= MIN (ret
, tret
);
2036 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
, post_p
,
2037 is_gimple_reg
, fb_rvalue
);
2038 ret
= MIN (ret
, tret
);
2041 if (TREE_OPERAND (t
, 3) == NULL_TREE
)
2043 tree elmt_type
= TREE_TYPE (TREE_TYPE (TREE_OPERAND (t
, 0)));
2044 tree elmt_size
= unshare_expr (array_ref_element_size (t
));
2045 tree factor
= size_int (TYPE_ALIGN_UNIT (elmt_type
));
2047 /* Divide the element size by the alignment of the element
2050 = size_binop_loc (loc
, EXACT_DIV_EXPR
, elmt_size
, factor
);
2052 if (!is_gimple_min_invariant (elmt_size
))
2054 TREE_OPERAND (t
, 3) = elmt_size
;
2055 tret
= gimplify_expr (&TREE_OPERAND (t
, 3), pre_p
,
2056 post_p
, is_gimple_reg
,
2058 ret
= MIN (ret
, tret
);
2063 tret
= gimplify_expr (&TREE_OPERAND (t
, 3), pre_p
, post_p
,
2064 is_gimple_reg
, fb_rvalue
);
2065 ret
= MIN (ret
, tret
);
2068 else if (TREE_CODE (t
) == COMPONENT_REF
)
2070 /* Set the field offset into T and gimplify it. */
2071 if (TREE_OPERAND (t
, 2) == NULL_TREE
)
2073 tree offset
= unshare_expr (component_ref_field_offset (t
));
2074 tree field
= TREE_OPERAND (t
, 1);
2076 = size_int (DECL_OFFSET_ALIGN (field
) / BITS_PER_UNIT
);
2078 /* Divide the offset by its alignment. */
2079 offset
= size_binop_loc (loc
, EXACT_DIV_EXPR
, offset
, factor
);
2081 if (!is_gimple_min_invariant (offset
))
2083 TREE_OPERAND (t
, 2) = offset
;
2084 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
,
2085 post_p
, is_gimple_reg
,
2087 ret
= MIN (ret
, tret
);
2092 tret
= gimplify_expr (&TREE_OPERAND (t
, 2), pre_p
, post_p
,
2093 is_gimple_reg
, fb_rvalue
);
2094 ret
= MIN (ret
, tret
);
2099 /* Step 2 is to gimplify the base expression. Make sure lvalue is set
2100 so as to match the min_lval predicate. Failure to do so may result
2101 in the creation of large aggregate temporaries. */
2102 tret
= gimplify_expr (p
, pre_p
, post_p
, is_gimple_min_lval
,
2103 fallback
| fb_lvalue
);
2104 ret
= MIN (ret
, tret
);
2106 /* And finally, the indices and operands of ARRAY_REF. During this
2107 loop we also remove any useless conversions. */
2108 for (; expr_stack
.length () > 0; )
2110 tree t
= expr_stack
.pop ();
2112 if (TREE_CODE (t
) == ARRAY_REF
|| TREE_CODE (t
) == ARRAY_RANGE_REF
)
2114 /* Gimplify the dimension. */
2115 if (!is_gimple_min_invariant (TREE_OPERAND (t
, 1)))
2117 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), pre_p
, post_p
,
2118 is_gimple_val
, fb_rvalue
);
2119 ret
= MIN (ret
, tret
);
2123 STRIP_USELESS_TYPE_CONVERSION (TREE_OPERAND (t
, 0));
2125 /* The innermost expression P may have originally had
2126 TREE_SIDE_EFFECTS set which would have caused all the outer
2127 expressions in *EXPR_P leading to P to also have had
2128 TREE_SIDE_EFFECTS set. */
2129 recalculate_side_effects (t
);
2132 /* If the outermost expression is a COMPONENT_REF, canonicalize its type. */
2133 if ((fallback
& fb_rvalue
) && TREE_CODE (*expr_p
) == COMPONENT_REF
)
2135 canonicalize_component_ref (expr_p
);
2138 expr_stack
.release ();
2140 gcc_assert (*expr_p
== expr
|| ret
!= GS_ALL_DONE
);
2145 /* Gimplify the self modifying expression pointed to by EXPR_P
2148 PRE_P points to the list where side effects that must happen before
2149 *EXPR_P should be stored.
2151 POST_P points to the list where side effects that must happen after
2152 *EXPR_P should be stored.
2154 WANT_VALUE is nonzero iff we want to use the value of this expression
2155 in another expression.
2157 ARITH_TYPE is the type the computation should be performed in. */
2159 enum gimplify_status
2160 gimplify_self_mod_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
2161 bool want_value
, tree arith_type
)
2163 enum tree_code code
;
2164 tree lhs
, lvalue
, rhs
, t1
;
2165 gimple_seq post
= NULL
, *orig_post_p
= post_p
;
2167 enum tree_code arith_code
;
2168 enum gimplify_status ret
;
2169 location_t loc
= EXPR_LOCATION (*expr_p
);
2171 code
= TREE_CODE (*expr_p
);
2173 gcc_assert (code
== POSTINCREMENT_EXPR
|| code
== POSTDECREMENT_EXPR
2174 || code
== PREINCREMENT_EXPR
|| code
== PREDECREMENT_EXPR
);
2176 /* Prefix or postfix? */
2177 if (code
== POSTINCREMENT_EXPR
|| code
== POSTDECREMENT_EXPR
)
2178 /* Faster to treat as prefix if result is not used. */
2179 postfix
= want_value
;
2183 /* For postfix, make sure the inner expression's post side effects
2184 are executed after side effects from this expression. */
2188 /* Add or subtract? */
2189 if (code
== PREINCREMENT_EXPR
|| code
== POSTINCREMENT_EXPR
)
2190 arith_code
= PLUS_EXPR
;
2192 arith_code
= MINUS_EXPR
;
2194 /* Gimplify the LHS into a GIMPLE lvalue. */
2195 lvalue
= TREE_OPERAND (*expr_p
, 0);
2196 ret
= gimplify_expr (&lvalue
, pre_p
, post_p
, is_gimple_lvalue
, fb_lvalue
);
2197 if (ret
== GS_ERROR
)
2200 /* Extract the operands to the arithmetic operation. */
2202 rhs
= TREE_OPERAND (*expr_p
, 1);
2204 /* For postfix operator, we evaluate the LHS to an rvalue and then use
2205 that as the result value and in the postqueue operation. */
2208 ret
= gimplify_expr (&lhs
, pre_p
, post_p
, is_gimple_val
, fb_rvalue
);
2209 if (ret
== GS_ERROR
)
2212 lhs
= get_initialized_tmp_var (lhs
, pre_p
, NULL
);
2215 /* For POINTERs increment, use POINTER_PLUS_EXPR. */
2216 if (POINTER_TYPE_P (TREE_TYPE (lhs
)))
2218 rhs
= convert_to_ptrofftype_loc (loc
, rhs
);
2219 if (arith_code
== MINUS_EXPR
)
2220 rhs
= fold_build1_loc (loc
, NEGATE_EXPR
, TREE_TYPE (rhs
), rhs
);
2221 t1
= fold_build2 (POINTER_PLUS_EXPR
, TREE_TYPE (*expr_p
), lhs
, rhs
);
2224 t1
= fold_convert (TREE_TYPE (*expr_p
),
2225 fold_build2 (arith_code
, arith_type
,
2226 fold_convert (arith_type
, lhs
),
2227 fold_convert (arith_type
, rhs
)));
2231 gimplify_assign (lvalue
, t1
, pre_p
);
2232 gimplify_seq_add_seq (orig_post_p
, post
);
2238 *expr_p
= build2 (MODIFY_EXPR
, TREE_TYPE (lvalue
), lvalue
, t1
);
2243 /* If *EXPR_P has a variable sized type, wrap it in a WITH_SIZE_EXPR. */
2246 maybe_with_size_expr (tree
*expr_p
)
2248 tree expr
= *expr_p
;
2249 tree type
= TREE_TYPE (expr
);
2252 /* If we've already wrapped this or the type is error_mark_node, we can't do
2254 if (TREE_CODE (expr
) == WITH_SIZE_EXPR
2255 || type
== error_mark_node
)
2258 /* If the size isn't known or is a constant, we have nothing to do. */
2259 size
= TYPE_SIZE_UNIT (type
);
2260 if (!size
|| TREE_CODE (size
) == INTEGER_CST
)
2263 /* Otherwise, make a WITH_SIZE_EXPR. */
2264 size
= unshare_expr (size
);
2265 size
= SUBSTITUTE_PLACEHOLDER_IN_EXPR (size
, expr
);
2266 *expr_p
= build2 (WITH_SIZE_EXPR
, type
, expr
, size
);
2269 /* Helper for gimplify_call_expr. Gimplify a single argument *ARG_P
2270 Store any side-effects in PRE_P. CALL_LOCATION is the location of
2273 enum gimplify_status
2274 gimplify_arg (tree
*arg_p
, gimple_seq
*pre_p
, location_t call_location
)
2276 bool (*test
) (tree
);
2279 /* In general, we allow lvalues for function arguments to avoid
2280 extra overhead of copying large aggregates out of even larger
2281 aggregates into temporaries only to copy the temporaries to
2282 the argument list. Make optimizers happy by pulling out to
2283 temporaries those types that fit in registers. */
2284 if (is_gimple_reg_type (TREE_TYPE (*arg_p
)))
2285 test
= is_gimple_val
, fb
= fb_rvalue
;
2288 test
= is_gimple_lvalue
, fb
= fb_either
;
2289 /* Also strip a TARGET_EXPR that would force an extra copy. */
2290 if (TREE_CODE (*arg_p
) == TARGET_EXPR
)
2292 tree init
= TARGET_EXPR_INITIAL (*arg_p
);
2294 && !VOID_TYPE_P (TREE_TYPE (init
)))
2299 /* If this is a variable sized type, we must remember the size. */
2300 maybe_with_size_expr (arg_p
);
2302 /* FIXME diagnostics: This will mess up gcc.dg/Warray-bounds.c. */
2303 /* Make sure arguments have the same location as the function call
2305 protected_set_expr_location (*arg_p
, call_location
);
2307 /* There is a sequence point before a function call. Side effects in
2308 the argument list must occur before the actual call. So, when
2309 gimplifying arguments, force gimplify_expr to use an internal
2310 post queue which is then appended to the end of PRE_P. */
2311 return gimplify_expr (arg_p
, pre_p
, NULL
, test
, fb
);
2314 /* Don't fold inside offloading or taskreg regions: it can break code by
2315 adding decl references that weren't in the source. We'll do it during
2316 omplower pass instead. */
2319 maybe_fold_stmt (gimple_stmt_iterator
*gsi
)
2321 struct gimplify_omp_ctx
*ctx
;
2322 for (ctx
= gimplify_omp_ctxp
; ctx
; ctx
= ctx
->outer_context
)
2323 if ((ctx
->region_type
& (ORT_TARGET
| ORT_PARALLEL
| ORT_TASK
)) != 0)
2325 return fold_stmt (gsi
);
2328 /* Gimplify the CALL_EXPR node *EXPR_P into the GIMPLE sequence PRE_P.
2329 WANT_VALUE is true if the result of the call is desired. */
2331 static enum gimplify_status
2332 gimplify_call_expr (tree
*expr_p
, gimple_seq
*pre_p
, bool want_value
)
2334 tree fndecl
, parms
, p
, fnptrtype
;
2335 enum gimplify_status ret
;
2338 bool builtin_va_start_p
= false;
2339 location_t loc
= EXPR_LOCATION (*expr_p
);
2341 gcc_assert (TREE_CODE (*expr_p
) == CALL_EXPR
);
2343 /* For reliable diagnostics during inlining, it is necessary that
2344 every call_expr be annotated with file and line. */
2345 if (! EXPR_HAS_LOCATION (*expr_p
))
2346 SET_EXPR_LOCATION (*expr_p
, input_location
);
2348 /* Gimplify internal functions created in the FEs. */
2349 if (CALL_EXPR_FN (*expr_p
) == NULL_TREE
)
2354 nargs
= call_expr_nargs (*expr_p
);
2355 enum internal_fn ifn
= CALL_EXPR_IFN (*expr_p
);
2356 auto_vec
<tree
> vargs (nargs
);
2358 for (i
= 0; i
< nargs
; i
++)
2360 gimplify_arg (&CALL_EXPR_ARG (*expr_p
, i
), pre_p
,
2361 EXPR_LOCATION (*expr_p
));
2362 vargs
.quick_push (CALL_EXPR_ARG (*expr_p
, i
));
2364 gimple
*call
= gimple_build_call_internal_vec (ifn
, vargs
);
2365 gimplify_seq_add_stmt (pre_p
, call
);
2369 /* This may be a call to a builtin function.
2371 Builtin function calls may be transformed into different
2372 (and more efficient) builtin function calls under certain
2373 circumstances. Unfortunately, gimplification can muck things
2374 up enough that the builtin expanders are not aware that certain
2375 transformations are still valid.
2377 So we attempt transformation/gimplification of the call before
2378 we gimplify the CALL_EXPR. At this time we do not manage to
2379 transform all calls in the same manner as the expanders do, but
2380 we do transform most of them. */
2381 fndecl
= get_callee_fndecl (*expr_p
);
2383 && DECL_BUILT_IN_CLASS (fndecl
) == BUILT_IN_NORMAL
)
2384 switch (DECL_FUNCTION_CODE (fndecl
))
2386 case BUILT_IN_ALLOCA
:
2387 case BUILT_IN_ALLOCA_WITH_ALIGN
:
2388 /* If the call has been built for a variable-sized object, then we
2389 want to restore the stack level when the enclosing BIND_EXPR is
2390 exited to reclaim the allocated space; otherwise, we precisely
2391 need to do the opposite and preserve the latest stack level. */
2392 if (CALL_ALLOCA_FOR_VAR_P (*expr_p
))
2393 gimplify_ctxp
->save_stack
= true;
2395 gimplify_ctxp
->keep_stack
= true;
2398 case BUILT_IN_VA_START
:
2400 builtin_va_start_p
= TRUE
;
2401 if (call_expr_nargs (*expr_p
) < 2)
2403 error ("too few arguments to function %<va_start%>");
2404 *expr_p
= build_empty_stmt (EXPR_LOCATION (*expr_p
));
2408 if (fold_builtin_next_arg (*expr_p
, true))
2410 *expr_p
= build_empty_stmt (EXPR_LOCATION (*expr_p
));
2417 *expr_p
= build_int_cst (TREE_TYPE (*expr_p
),
2418 LOCATION_LINE (EXPR_LOCATION (*expr_p
)));
2423 const char *locfile
= LOCATION_FILE (EXPR_LOCATION (*expr_p
));
2424 *expr_p
= build_string_literal (strlen (locfile
) + 1, locfile
);
2427 case BUILT_IN_FUNCTION
:
2429 const char *function
;
2430 function
= IDENTIFIER_POINTER (DECL_NAME (current_function_decl
));
2431 *expr_p
= build_string_literal (strlen (function
) + 1, function
);
2437 if (fndecl
&& DECL_BUILT_IN (fndecl
))
2439 tree new_tree
= fold_call_expr (input_location
, *expr_p
, !want_value
);
2440 if (new_tree
&& new_tree
!= *expr_p
)
2442 /* There was a transformation of this call which computes the
2443 same value, but in a more efficient way. Return and try
2450 /* Remember the original function pointer type. */
2451 fnptrtype
= TREE_TYPE (CALL_EXPR_FN (*expr_p
));
2453 /* There is a sequence point before the call, so any side effects in
2454 the calling expression must occur before the actual call. Force
2455 gimplify_expr to use an internal post queue. */
2456 ret
= gimplify_expr (&CALL_EXPR_FN (*expr_p
), pre_p
, NULL
,
2457 is_gimple_call_addr
, fb_rvalue
);
2459 nargs
= call_expr_nargs (*expr_p
);
2461 /* Get argument types for verification. */
2462 fndecl
= get_callee_fndecl (*expr_p
);
2465 parms
= TYPE_ARG_TYPES (TREE_TYPE (fndecl
));
2467 parms
= TYPE_ARG_TYPES (TREE_TYPE (fnptrtype
));
2469 if (fndecl
&& DECL_ARGUMENTS (fndecl
))
2470 p
= DECL_ARGUMENTS (fndecl
);
2475 for (i
= 0; i
< nargs
&& p
; i
++, p
= TREE_CHAIN (p
))
2478 /* If the last argument is __builtin_va_arg_pack () and it is not
2479 passed as a named argument, decrease the number of CALL_EXPR
2480 arguments and set instead the CALL_EXPR_VA_ARG_PACK flag. */
2483 && TREE_CODE (CALL_EXPR_ARG (*expr_p
, nargs
- 1)) == CALL_EXPR
)
2485 tree last_arg
= CALL_EXPR_ARG (*expr_p
, nargs
- 1);
2486 tree last_arg_fndecl
= get_callee_fndecl (last_arg
);
2489 && TREE_CODE (last_arg_fndecl
) == FUNCTION_DECL
2490 && DECL_BUILT_IN_CLASS (last_arg_fndecl
) == BUILT_IN_NORMAL
2491 && DECL_FUNCTION_CODE (last_arg_fndecl
) == BUILT_IN_VA_ARG_PACK
)
2493 tree call
= *expr_p
;
2496 *expr_p
= build_call_array_loc (loc
, TREE_TYPE (call
),
2497 CALL_EXPR_FN (call
),
2498 nargs
, CALL_EXPR_ARGP (call
));
2500 /* Copy all CALL_EXPR flags, location and block, except
2501 CALL_EXPR_VA_ARG_PACK flag. */
2502 CALL_EXPR_STATIC_CHAIN (*expr_p
) = CALL_EXPR_STATIC_CHAIN (call
);
2503 CALL_EXPR_TAILCALL (*expr_p
) = CALL_EXPR_TAILCALL (call
);
2504 CALL_EXPR_RETURN_SLOT_OPT (*expr_p
)
2505 = CALL_EXPR_RETURN_SLOT_OPT (call
);
2506 CALL_FROM_THUNK_P (*expr_p
) = CALL_FROM_THUNK_P (call
);
2507 SET_EXPR_LOCATION (*expr_p
, EXPR_LOCATION (call
));
2509 /* Set CALL_EXPR_VA_ARG_PACK. */
2510 CALL_EXPR_VA_ARG_PACK (*expr_p
) = 1;
2514 /* Gimplify the function arguments. */
2517 for (i
= (PUSH_ARGS_REVERSED
? nargs
- 1 : 0);
2518 PUSH_ARGS_REVERSED
? i
>= 0 : i
< nargs
;
2519 PUSH_ARGS_REVERSED
? i
-- : i
++)
2521 enum gimplify_status t
;
2523 /* Avoid gimplifying the second argument to va_start, which needs to
2524 be the plain PARM_DECL. */
2525 if ((i
!= 1) || !builtin_va_start_p
)
2527 t
= gimplify_arg (&CALL_EXPR_ARG (*expr_p
, i
), pre_p
,
2528 EXPR_LOCATION (*expr_p
));
2536 /* Gimplify the static chain. */
2537 if (CALL_EXPR_STATIC_CHAIN (*expr_p
))
2539 if (fndecl
&& !DECL_STATIC_CHAIN (fndecl
))
2540 CALL_EXPR_STATIC_CHAIN (*expr_p
) = NULL
;
2543 enum gimplify_status t
;
2544 t
= gimplify_arg (&CALL_EXPR_STATIC_CHAIN (*expr_p
), pre_p
,
2545 EXPR_LOCATION (*expr_p
));
2551 /* Verify the function result. */
2552 if (want_value
&& fndecl
2553 && VOID_TYPE_P (TREE_TYPE (TREE_TYPE (fnptrtype
))))
2555 error_at (loc
, "using result of function returning %<void%>");
2559 /* Try this again in case gimplification exposed something. */
2560 if (ret
!= GS_ERROR
)
2562 tree new_tree
= fold_call_expr (input_location
, *expr_p
, !want_value
);
2564 if (new_tree
&& new_tree
!= *expr_p
)
2566 /* There was a transformation of this call which computes the
2567 same value, but in a more efficient way. Return and try
2575 *expr_p
= error_mark_node
;
2579 /* If the function is "const" or "pure", then clear TREE_SIDE_EFFECTS on its
2580 decl. This allows us to eliminate redundant or useless
2581 calls to "const" functions. */
2582 if (TREE_CODE (*expr_p
) == CALL_EXPR
)
2584 int flags
= call_expr_flags (*expr_p
);
2585 if (flags
& (ECF_CONST
| ECF_PURE
)
2586 /* An infinite loop is considered a side effect. */
2587 && !(flags
& (ECF_LOOPING_CONST_OR_PURE
)))
2588 TREE_SIDE_EFFECTS (*expr_p
) = 0;
2591 /* If the value is not needed by the caller, emit a new GIMPLE_CALL
2592 and clear *EXPR_P. Otherwise, leave *EXPR_P in its gimplified
2593 form and delegate the creation of a GIMPLE_CALL to
2594 gimplify_modify_expr. This is always possible because when
2595 WANT_VALUE is true, the caller wants the result of this call into
2596 a temporary, which means that we will emit an INIT_EXPR in
2597 internal_get_tmp_var which will then be handled by
2598 gimplify_modify_expr. */
2601 /* The CALL_EXPR in *EXPR_P is already in GIMPLE form, so all we
2602 have to do is replicate it as a GIMPLE_CALL tuple. */
2603 gimple_stmt_iterator gsi
;
2604 call
= gimple_build_call_from_tree (*expr_p
);
2605 gimple_call_set_fntype (call
, TREE_TYPE (fnptrtype
));
2606 notice_special_calls (call
);
2607 gimplify_seq_add_stmt (pre_p
, call
);
2608 gsi
= gsi_last (*pre_p
);
2609 maybe_fold_stmt (&gsi
);
2610 *expr_p
= NULL_TREE
;
2613 /* Remember the original function type. */
2614 CALL_EXPR_FN (*expr_p
) = build1 (NOP_EXPR
, fnptrtype
,
2615 CALL_EXPR_FN (*expr_p
));
2620 /* Handle shortcut semantics in the predicate operand of a COND_EXPR by
2621 rewriting it into multiple COND_EXPRs, and possibly GOTO_EXPRs.
2623 TRUE_LABEL_P and FALSE_LABEL_P point to the labels to jump to if the
2624 condition is true or false, respectively. If null, we should generate
2625 our own to skip over the evaluation of this specific expression.
2627 LOCUS is the source location of the COND_EXPR.
2629 This function is the tree equivalent of do_jump.
2631 shortcut_cond_r should only be called by shortcut_cond_expr. */
2634 shortcut_cond_r (tree pred
, tree
*true_label_p
, tree
*false_label_p
,
2637 tree local_label
= NULL_TREE
;
2638 tree t
, expr
= NULL
;
2640 /* OK, it's not a simple case; we need to pull apart the COND_EXPR to
2641 retain the shortcut semantics. Just insert the gotos here;
2642 shortcut_cond_expr will append the real blocks later. */
2643 if (TREE_CODE (pred
) == TRUTH_ANDIF_EXPR
)
2645 location_t new_locus
;
2647 /* Turn if (a && b) into
2649 if (a); else goto no;
2650 if (b) goto yes; else goto no;
2653 if (false_label_p
== NULL
)
2654 false_label_p
= &local_label
;
2656 /* Keep the original source location on the first 'if'. */
2657 t
= shortcut_cond_r (TREE_OPERAND (pred
, 0), NULL
, false_label_p
, locus
);
2658 append_to_statement_list (t
, &expr
);
2660 /* Set the source location of the && on the second 'if'. */
2661 new_locus
= EXPR_HAS_LOCATION (pred
) ? EXPR_LOCATION (pred
) : locus
;
2662 t
= shortcut_cond_r (TREE_OPERAND (pred
, 1), true_label_p
, false_label_p
,
2664 append_to_statement_list (t
, &expr
);
2666 else if (TREE_CODE (pred
) == TRUTH_ORIF_EXPR
)
2668 location_t new_locus
;
2670 /* Turn if (a || b) into
2673 if (b) goto yes; else goto no;
2676 if (true_label_p
== NULL
)
2677 true_label_p
= &local_label
;
2679 /* Keep the original source location on the first 'if'. */
2680 t
= shortcut_cond_r (TREE_OPERAND (pred
, 0), true_label_p
, NULL
, locus
);
2681 append_to_statement_list (t
, &expr
);
2683 /* Set the source location of the || on the second 'if'. */
2684 new_locus
= EXPR_HAS_LOCATION (pred
) ? EXPR_LOCATION (pred
) : locus
;
2685 t
= shortcut_cond_r (TREE_OPERAND (pred
, 1), true_label_p
, false_label_p
,
2687 append_to_statement_list (t
, &expr
);
2689 else if (TREE_CODE (pred
) == COND_EXPR
2690 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred
, 1)))
2691 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred
, 2))))
2693 location_t new_locus
;
2695 /* As long as we're messing with gotos, turn if (a ? b : c) into
2697 if (b) goto yes; else goto no;
2699 if (c) goto yes; else goto no;
2701 Don't do this if one of the arms has void type, which can happen
2702 in C++ when the arm is throw. */
2704 /* Keep the original source location on the first 'if'. Set the source
2705 location of the ? on the second 'if'. */
2706 new_locus
= EXPR_HAS_LOCATION (pred
) ? EXPR_LOCATION (pred
) : locus
;
2707 expr
= build3 (COND_EXPR
, void_type_node
, TREE_OPERAND (pred
, 0),
2708 shortcut_cond_r (TREE_OPERAND (pred
, 1), true_label_p
,
2709 false_label_p
, locus
),
2710 shortcut_cond_r (TREE_OPERAND (pred
, 2), true_label_p
,
2711 false_label_p
, new_locus
));
2715 expr
= build3 (COND_EXPR
, void_type_node
, pred
,
2716 build_and_jump (true_label_p
),
2717 build_and_jump (false_label_p
));
2718 SET_EXPR_LOCATION (expr
, locus
);
2723 t
= build1 (LABEL_EXPR
, void_type_node
, local_label
);
2724 append_to_statement_list (t
, &expr
);
2730 /* Given a conditional expression EXPR with short-circuit boolean
2731 predicates using TRUTH_ANDIF_EXPR or TRUTH_ORIF_EXPR, break the
2732 predicate apart into the equivalent sequence of conditionals. */
2735 shortcut_cond_expr (tree expr
)
2737 tree pred
= TREE_OPERAND (expr
, 0);
2738 tree then_
= TREE_OPERAND (expr
, 1);
2739 tree else_
= TREE_OPERAND (expr
, 2);
2740 tree true_label
, false_label
, end_label
, t
;
2742 tree
*false_label_p
;
2743 bool emit_end
, emit_false
, jump_over_else
;
2744 bool then_se
= then_
&& TREE_SIDE_EFFECTS (then_
);
2745 bool else_se
= else_
&& TREE_SIDE_EFFECTS (else_
);
2747 /* First do simple transformations. */
2750 /* If there is no 'else', turn
2753 if (a) if (b) then c. */
2754 while (TREE_CODE (pred
) == TRUTH_ANDIF_EXPR
)
2756 /* Keep the original source location on the first 'if'. */
2757 location_t locus
= EXPR_LOC_OR_LOC (expr
, input_location
);
2758 TREE_OPERAND (expr
, 0) = TREE_OPERAND (pred
, 1);
2759 /* Set the source location of the && on the second 'if'. */
2760 if (EXPR_HAS_LOCATION (pred
))
2761 SET_EXPR_LOCATION (expr
, EXPR_LOCATION (pred
));
2762 then_
= shortcut_cond_expr (expr
);
2763 then_se
= then_
&& TREE_SIDE_EFFECTS (then_
);
2764 pred
= TREE_OPERAND (pred
, 0);
2765 expr
= build3 (COND_EXPR
, void_type_node
, pred
, then_
, NULL_TREE
);
2766 SET_EXPR_LOCATION (expr
, locus
);
2772 /* If there is no 'then', turn
2775 if (a); else if (b); else d. */
2776 while (TREE_CODE (pred
) == TRUTH_ORIF_EXPR
)
2778 /* Keep the original source location on the first 'if'. */
2779 location_t locus
= EXPR_LOC_OR_LOC (expr
, input_location
);
2780 TREE_OPERAND (expr
, 0) = TREE_OPERAND (pred
, 1);
2781 /* Set the source location of the || on the second 'if'. */
2782 if (EXPR_HAS_LOCATION (pred
))
2783 SET_EXPR_LOCATION (expr
, EXPR_LOCATION (pred
));
2784 else_
= shortcut_cond_expr (expr
);
2785 else_se
= else_
&& TREE_SIDE_EFFECTS (else_
);
2786 pred
= TREE_OPERAND (pred
, 0);
2787 expr
= build3 (COND_EXPR
, void_type_node
, pred
, NULL_TREE
, else_
);
2788 SET_EXPR_LOCATION (expr
, locus
);
2792 /* If we're done, great. */
2793 if (TREE_CODE (pred
) != TRUTH_ANDIF_EXPR
2794 && TREE_CODE (pred
) != TRUTH_ORIF_EXPR
)
2797 /* Otherwise we need to mess with gotos. Change
2800 if (a); else goto no;
2803 and recursively gimplify the condition. */
2805 true_label
= false_label
= end_label
= NULL_TREE
;
2807 /* If our arms just jump somewhere, hijack those labels so we don't
2808 generate jumps to jumps. */
2811 && TREE_CODE (then_
) == GOTO_EXPR
2812 && TREE_CODE (GOTO_DESTINATION (then_
)) == LABEL_DECL
)
2814 true_label
= GOTO_DESTINATION (then_
);
2820 && TREE_CODE (else_
) == GOTO_EXPR
2821 && TREE_CODE (GOTO_DESTINATION (else_
)) == LABEL_DECL
)
2823 false_label
= GOTO_DESTINATION (else_
);
2828 /* If we aren't hijacking a label for the 'then' branch, it falls through. */
2830 true_label_p
= &true_label
;
2832 true_label_p
= NULL
;
2834 /* The 'else' branch also needs a label if it contains interesting code. */
2835 if (false_label
|| else_se
)
2836 false_label_p
= &false_label
;
2838 false_label_p
= NULL
;
2840 /* If there was nothing else in our arms, just forward the label(s). */
2841 if (!then_se
&& !else_se
)
2842 return shortcut_cond_r (pred
, true_label_p
, false_label_p
,
2843 EXPR_LOC_OR_LOC (expr
, input_location
));
2845 /* If our last subexpression already has a terminal label, reuse it. */
2847 t
= expr_last (else_
);
2849 t
= expr_last (then_
);
2852 if (t
&& TREE_CODE (t
) == LABEL_EXPR
)
2853 end_label
= LABEL_EXPR_LABEL (t
);
2855 /* If we don't care about jumping to the 'else' branch, jump to the end
2856 if the condition is false. */
2858 false_label_p
= &end_label
;
2860 /* We only want to emit these labels if we aren't hijacking them. */
2861 emit_end
= (end_label
== NULL_TREE
);
2862 emit_false
= (false_label
== NULL_TREE
);
2864 /* We only emit the jump over the else clause if we have to--if the
2865 then clause may fall through. Otherwise we can wind up with a
2866 useless jump and a useless label at the end of gimplified code,
2867 which will cause us to think that this conditional as a whole
2868 falls through even if it doesn't. If we then inline a function
2869 which ends with such a condition, that can cause us to issue an
2870 inappropriate warning about control reaching the end of a
2871 non-void function. */
2872 jump_over_else
= block_may_fallthru (then_
);
2874 pred
= shortcut_cond_r (pred
, true_label_p
, false_label_p
,
2875 EXPR_LOC_OR_LOC (expr
, input_location
));
2878 append_to_statement_list (pred
, &expr
);
2880 append_to_statement_list (then_
, &expr
);
2885 tree last
= expr_last (expr
);
2886 t
= build_and_jump (&end_label
);
2887 if (EXPR_HAS_LOCATION (last
))
2888 SET_EXPR_LOCATION (t
, EXPR_LOCATION (last
));
2889 append_to_statement_list (t
, &expr
);
2893 t
= build1 (LABEL_EXPR
, void_type_node
, false_label
);
2894 append_to_statement_list (t
, &expr
);
2896 append_to_statement_list (else_
, &expr
);
2898 if (emit_end
&& end_label
)
2900 t
= build1 (LABEL_EXPR
, void_type_node
, end_label
);
2901 append_to_statement_list (t
, &expr
);
2907 /* EXPR is used in a boolean context; make sure it has BOOLEAN_TYPE. */
2910 gimple_boolify (tree expr
)
2912 tree type
= TREE_TYPE (expr
);
2913 location_t loc
= EXPR_LOCATION (expr
);
2915 if (TREE_CODE (expr
) == NE_EXPR
2916 && TREE_CODE (TREE_OPERAND (expr
, 0)) == CALL_EXPR
2917 && integer_zerop (TREE_OPERAND (expr
, 1)))
2919 tree call
= TREE_OPERAND (expr
, 0);
2920 tree fn
= get_callee_fndecl (call
);
2922 /* For __builtin_expect ((long) (x), y) recurse into x as well
2923 if x is truth_value_p. */
2925 && DECL_BUILT_IN_CLASS (fn
) == BUILT_IN_NORMAL
2926 && DECL_FUNCTION_CODE (fn
) == BUILT_IN_EXPECT
2927 && call_expr_nargs (call
) == 2)
2929 tree arg
= CALL_EXPR_ARG (call
, 0);
2932 if (TREE_CODE (arg
) == NOP_EXPR
2933 && TREE_TYPE (arg
) == TREE_TYPE (call
))
2934 arg
= TREE_OPERAND (arg
, 0);
2935 if (truth_value_p (TREE_CODE (arg
)))
2937 arg
= gimple_boolify (arg
);
2938 CALL_EXPR_ARG (call
, 0)
2939 = fold_convert_loc (loc
, TREE_TYPE (call
), arg
);
2945 switch (TREE_CODE (expr
))
2947 case TRUTH_AND_EXPR
:
2949 case TRUTH_XOR_EXPR
:
2950 case TRUTH_ANDIF_EXPR
:
2951 case TRUTH_ORIF_EXPR
:
2952 /* Also boolify the arguments of truth exprs. */
2953 TREE_OPERAND (expr
, 1) = gimple_boolify (TREE_OPERAND (expr
, 1));
2956 case TRUTH_NOT_EXPR
:
2957 TREE_OPERAND (expr
, 0) = gimple_boolify (TREE_OPERAND (expr
, 0));
2959 /* These expressions always produce boolean results. */
2960 if (TREE_CODE (type
) != BOOLEAN_TYPE
)
2961 TREE_TYPE (expr
) = boolean_type_node
;
2965 switch ((enum annot_expr_kind
) TREE_INT_CST_LOW (TREE_OPERAND (expr
, 1)))
2967 case annot_expr_ivdep_kind
:
2968 case annot_expr_no_vector_kind
:
2969 case annot_expr_vector_kind
:
2970 TREE_OPERAND (expr
, 0) = gimple_boolify (TREE_OPERAND (expr
, 0));
2971 if (TREE_CODE (type
) != BOOLEAN_TYPE
)
2972 TREE_TYPE (expr
) = boolean_type_node
;
2979 if (COMPARISON_CLASS_P (expr
))
2981 /* There expressions always prduce boolean results. */
2982 if (TREE_CODE (type
) != BOOLEAN_TYPE
)
2983 TREE_TYPE (expr
) = boolean_type_node
;
2986 /* Other expressions that get here must have boolean values, but
2987 might need to be converted to the appropriate mode. */
2988 if (TREE_CODE (type
) == BOOLEAN_TYPE
)
2990 return fold_convert_loc (loc
, boolean_type_node
, expr
);
2994 /* Given a conditional expression *EXPR_P without side effects, gimplify
2995 its operands. New statements are inserted to PRE_P. */
2997 static enum gimplify_status
2998 gimplify_pure_cond_expr (tree
*expr_p
, gimple_seq
*pre_p
)
3000 tree expr
= *expr_p
, cond
;
3001 enum gimplify_status ret
, tret
;
3002 enum tree_code code
;
3004 cond
= gimple_boolify (COND_EXPR_COND (expr
));
3006 /* We need to handle && and || specially, as their gimplification
3007 creates pure cond_expr, thus leading to an infinite cycle otherwise. */
3008 code
= TREE_CODE (cond
);
3009 if (code
== TRUTH_ANDIF_EXPR
)
3010 TREE_SET_CODE (cond
, TRUTH_AND_EXPR
);
3011 else if (code
== TRUTH_ORIF_EXPR
)
3012 TREE_SET_CODE (cond
, TRUTH_OR_EXPR
);
3013 ret
= gimplify_expr (&cond
, pre_p
, NULL
, is_gimple_condexpr
, fb_rvalue
);
3014 COND_EXPR_COND (*expr_p
) = cond
;
3016 tret
= gimplify_expr (&COND_EXPR_THEN (expr
), pre_p
, NULL
,
3017 is_gimple_val
, fb_rvalue
);
3018 ret
= MIN (ret
, tret
);
3019 tret
= gimplify_expr (&COND_EXPR_ELSE (expr
), pre_p
, NULL
,
3020 is_gimple_val
, fb_rvalue
);
3022 return MIN (ret
, tret
);
3025 /* Return true if evaluating EXPR could trap.
3026 EXPR is GENERIC, while tree_could_trap_p can be called
3030 generic_expr_could_trap_p (tree expr
)
3034 if (!expr
|| is_gimple_val (expr
))
3037 if (!EXPR_P (expr
) || tree_could_trap_p (expr
))
3040 n
= TREE_OPERAND_LENGTH (expr
);
3041 for (i
= 0; i
< n
; i
++)
3042 if (generic_expr_could_trap_p (TREE_OPERAND (expr
, i
)))
3048 /* Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
3057 The second form is used when *EXPR_P is of type void.
3059 PRE_P points to the list where side effects that must happen before
3060 *EXPR_P should be stored. */
3062 static enum gimplify_status
3063 gimplify_cond_expr (tree
*expr_p
, gimple_seq
*pre_p
, fallback_t fallback
)
3065 tree expr
= *expr_p
;
3066 tree type
= TREE_TYPE (expr
);
3067 location_t loc
= EXPR_LOCATION (expr
);
3068 tree tmp
, arm1
, arm2
;
3069 enum gimplify_status ret
;
3070 tree label_true
, label_false
, label_cont
;
3071 bool have_then_clause_p
, have_else_clause_p
;
3073 enum tree_code pred_code
;
3074 gimple_seq seq
= NULL
;
3076 /* If this COND_EXPR has a value, copy the values into a temporary within
3078 if (!VOID_TYPE_P (type
))
3080 tree then_
= TREE_OPERAND (expr
, 1), else_
= TREE_OPERAND (expr
, 2);
3083 /* If either an rvalue is ok or we do not require an lvalue, create the
3084 temporary. But we cannot do that if the type is addressable. */
3085 if (((fallback
& fb_rvalue
) || !(fallback
& fb_lvalue
))
3086 && !TREE_ADDRESSABLE (type
))
3088 if (gimplify_ctxp
->allow_rhs_cond_expr
3089 /* If either branch has side effects or could trap, it can't be
3090 evaluated unconditionally. */
3091 && !TREE_SIDE_EFFECTS (then_
)
3092 && !generic_expr_could_trap_p (then_
)
3093 && !TREE_SIDE_EFFECTS (else_
)
3094 && !generic_expr_could_trap_p (else_
))
3095 return gimplify_pure_cond_expr (expr_p
, pre_p
);
3097 tmp
= create_tmp_var (type
, "iftmp");
3101 /* Otherwise, only create and copy references to the values. */
3104 type
= build_pointer_type (type
);
3106 if (!VOID_TYPE_P (TREE_TYPE (then_
)))
3107 then_
= build_fold_addr_expr_loc (loc
, then_
);
3109 if (!VOID_TYPE_P (TREE_TYPE (else_
)))
3110 else_
= build_fold_addr_expr_loc (loc
, else_
);
3113 = build3 (COND_EXPR
, type
, TREE_OPERAND (expr
, 0), then_
, else_
);
3115 tmp
= create_tmp_var (type
, "iftmp");
3116 result
= build_simple_mem_ref_loc (loc
, tmp
);
3119 /* Build the new then clause, `tmp = then_;'. But don't build the
3120 assignment if the value is void; in C++ it can be if it's a throw. */
3121 if (!VOID_TYPE_P (TREE_TYPE (then_
)))
3122 TREE_OPERAND (expr
, 1) = build2 (MODIFY_EXPR
, type
, tmp
, then_
);
3124 /* Similarly, build the new else clause, `tmp = else_;'. */
3125 if (!VOID_TYPE_P (TREE_TYPE (else_
)))
3126 TREE_OPERAND (expr
, 2) = build2 (MODIFY_EXPR
, type
, tmp
, else_
);
3128 TREE_TYPE (expr
) = void_type_node
;
3129 recalculate_side_effects (expr
);
3131 /* Move the COND_EXPR to the prequeue. */
3132 gimplify_stmt (&expr
, pre_p
);
3138 /* Remove any COMPOUND_EXPR so the following cases will be caught. */
3139 STRIP_TYPE_NOPS (TREE_OPERAND (expr
, 0));
3140 if (TREE_CODE (TREE_OPERAND (expr
, 0)) == COMPOUND_EXPR
)
3141 gimplify_compound_expr (&TREE_OPERAND (expr
, 0), pre_p
, true);
3143 /* Make sure the condition has BOOLEAN_TYPE. */
3144 TREE_OPERAND (expr
, 0) = gimple_boolify (TREE_OPERAND (expr
, 0));
3146 /* Break apart && and || conditions. */
3147 if (TREE_CODE (TREE_OPERAND (expr
, 0)) == TRUTH_ANDIF_EXPR
3148 || TREE_CODE (TREE_OPERAND (expr
, 0)) == TRUTH_ORIF_EXPR
)
3150 expr
= shortcut_cond_expr (expr
);
3152 if (expr
!= *expr_p
)
3156 /* We can't rely on gimplify_expr to re-gimplify the expanded
3157 form properly, as cleanups might cause the target labels to be
3158 wrapped in a TRY_FINALLY_EXPR. To prevent that, we need to
3159 set up a conditional context. */
3160 gimple_push_condition ();
3161 gimplify_stmt (expr_p
, &seq
);
3162 gimple_pop_condition (pre_p
);
3163 gimple_seq_add_seq (pre_p
, seq
);
3169 /* Now do the normal gimplification. */
3171 /* Gimplify condition. */
3172 ret
= gimplify_expr (&TREE_OPERAND (expr
, 0), pre_p
, NULL
, is_gimple_condexpr
,
3174 if (ret
== GS_ERROR
)
3176 gcc_assert (TREE_OPERAND (expr
, 0) != NULL_TREE
);
3178 gimple_push_condition ();
3180 have_then_clause_p
= have_else_clause_p
= false;
3181 if (TREE_OPERAND (expr
, 1) != NULL
3182 && TREE_CODE (TREE_OPERAND (expr
, 1)) == GOTO_EXPR
3183 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr
, 1))) == LABEL_DECL
3184 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr
, 1)))
3185 == current_function_decl
)
3186 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3187 have different locations, otherwise we end up with incorrect
3188 location information on the branches. */
3190 || !EXPR_HAS_LOCATION (expr
)
3191 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr
, 1))
3192 || EXPR_LOCATION (expr
) == EXPR_LOCATION (TREE_OPERAND (expr
, 1))))
3194 label_true
= GOTO_DESTINATION (TREE_OPERAND (expr
, 1));
3195 have_then_clause_p
= true;
3198 label_true
= create_artificial_label (UNKNOWN_LOCATION
);
3199 if (TREE_OPERAND (expr
, 2) != NULL
3200 && TREE_CODE (TREE_OPERAND (expr
, 2)) == GOTO_EXPR
3201 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr
, 2))) == LABEL_DECL
3202 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr
, 2)))
3203 == current_function_decl
)
3204 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3205 have different locations, otherwise we end up with incorrect
3206 location information on the branches. */
3208 || !EXPR_HAS_LOCATION (expr
)
3209 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr
, 2))
3210 || EXPR_LOCATION (expr
) == EXPR_LOCATION (TREE_OPERAND (expr
, 2))))
3212 label_false
= GOTO_DESTINATION (TREE_OPERAND (expr
, 2));
3213 have_else_clause_p
= true;
3216 label_false
= create_artificial_label (UNKNOWN_LOCATION
);
3218 gimple_cond_get_ops_from_tree (COND_EXPR_COND (expr
), &pred_code
, &arm1
,
3220 cond_stmt
= gimple_build_cond (pred_code
, arm1
, arm2
, label_true
,
3222 gimplify_seq_add_stmt (&seq
, cond_stmt
);
3223 gimple_stmt_iterator gsi
= gsi_last (seq
);
3224 maybe_fold_stmt (&gsi
);
3226 label_cont
= NULL_TREE
;
3227 if (!have_then_clause_p
)
3229 /* For if (...) {} else { code; } put label_true after
3231 if (TREE_OPERAND (expr
, 1) == NULL_TREE
3232 && !have_else_clause_p
3233 && TREE_OPERAND (expr
, 2) != NULL_TREE
)
3234 label_cont
= label_true
;
3237 gimplify_seq_add_stmt (&seq
, gimple_build_label (label_true
));
3238 have_then_clause_p
= gimplify_stmt (&TREE_OPERAND (expr
, 1), &seq
);
3239 /* For if (...) { code; } else {} or
3240 if (...) { code; } else goto label; or
3241 if (...) { code; return; } else { ... }
3242 label_cont isn't needed. */
3243 if (!have_else_clause_p
3244 && TREE_OPERAND (expr
, 2) != NULL_TREE
3245 && gimple_seq_may_fallthru (seq
))
3248 label_cont
= create_artificial_label (UNKNOWN_LOCATION
);
3250 g
= gimple_build_goto (label_cont
);
3252 /* GIMPLE_COND's are very low level; they have embedded
3253 gotos. This particular embedded goto should not be marked
3254 with the location of the original COND_EXPR, as it would
3255 correspond to the COND_EXPR's condition, not the ELSE or the
3256 THEN arms. To avoid marking it with the wrong location, flag
3257 it as "no location". */
3258 gimple_set_do_not_emit_location (g
);
3260 gimplify_seq_add_stmt (&seq
, g
);
3264 if (!have_else_clause_p
)
3266 gimplify_seq_add_stmt (&seq
, gimple_build_label (label_false
));
3267 have_else_clause_p
= gimplify_stmt (&TREE_OPERAND (expr
, 2), &seq
);
3270 gimplify_seq_add_stmt (&seq
, gimple_build_label (label_cont
));
3272 gimple_pop_condition (pre_p
);
3273 gimple_seq_add_seq (pre_p
, seq
);
3275 if (ret
== GS_ERROR
)
3277 else if (have_then_clause_p
|| have_else_clause_p
)
3281 /* Both arms are empty; replace the COND_EXPR with its predicate. */
3282 expr
= TREE_OPERAND (expr
, 0);
3283 gimplify_stmt (&expr
, pre_p
);
3290 /* Prepare the node pointed to by EXPR_P, an is_gimple_addressable expression,
3291 to be marked addressable.
3293 We cannot rely on such an expression being directly markable if a temporary
3294 has been created by the gimplification. In this case, we create another
3295 temporary and initialize it with a copy, which will become a store after we
3296 mark it addressable. This can happen if the front-end passed us something
3297 that it could not mark addressable yet, like a Fortran pass-by-reference
3298 parameter (int) floatvar. */
3301 prepare_gimple_addressable (tree
*expr_p
, gimple_seq
*seq_p
)
3303 while (handled_component_p (*expr_p
))
3304 expr_p
= &TREE_OPERAND (*expr_p
, 0);
3305 if (is_gimple_reg (*expr_p
))
3307 tree var
= get_initialized_tmp_var (*expr_p
, seq_p
, NULL
);
3308 DECL_GIMPLE_REG_P (var
) = 0;
3313 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
3314 a call to __builtin_memcpy. */
3316 static enum gimplify_status
3317 gimplify_modify_expr_to_memcpy (tree
*expr_p
, tree size
, bool want_value
,
3320 tree t
, to
, to_ptr
, from
, from_ptr
;
3322 location_t loc
= EXPR_LOCATION (*expr_p
);
3324 to
= TREE_OPERAND (*expr_p
, 0);
3325 from
= TREE_OPERAND (*expr_p
, 1);
3327 /* Mark the RHS addressable. Beware that it may not be possible to do so
3328 directly if a temporary has been created by the gimplification. */
3329 prepare_gimple_addressable (&from
, seq_p
);
3331 mark_addressable (from
);
3332 from_ptr
= build_fold_addr_expr_loc (loc
, from
);
3333 gimplify_arg (&from_ptr
, seq_p
, loc
);
3335 mark_addressable (to
);
3336 to_ptr
= build_fold_addr_expr_loc (loc
, to
);
3337 gimplify_arg (&to_ptr
, seq_p
, loc
);
3339 t
= builtin_decl_implicit (BUILT_IN_MEMCPY
);
3341 gs
= gimple_build_call (t
, 3, to_ptr
, from_ptr
, size
);
3345 /* tmp = memcpy() */
3346 t
= create_tmp_var (TREE_TYPE (to_ptr
));
3347 gimple_call_set_lhs (gs
, t
);
3348 gimplify_seq_add_stmt (seq_p
, gs
);
3350 *expr_p
= build_simple_mem_ref (t
);
3354 gimplify_seq_add_stmt (seq_p
, gs
);
3359 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
3360 a call to __builtin_memset. In this case we know that the RHS is
3361 a CONSTRUCTOR with an empty element list. */
3363 static enum gimplify_status
3364 gimplify_modify_expr_to_memset (tree
*expr_p
, tree size
, bool want_value
,
3367 tree t
, from
, to
, to_ptr
;
3369 location_t loc
= EXPR_LOCATION (*expr_p
);
3371 /* Assert our assumptions, to abort instead of producing wrong code
3372 silently if they are not met. Beware that the RHS CONSTRUCTOR might
3373 not be immediately exposed. */
3374 from
= TREE_OPERAND (*expr_p
, 1);
3375 if (TREE_CODE (from
) == WITH_SIZE_EXPR
)
3376 from
= TREE_OPERAND (from
, 0);
3378 gcc_assert (TREE_CODE (from
) == CONSTRUCTOR
3379 && vec_safe_is_empty (CONSTRUCTOR_ELTS (from
)));
3382 to
= TREE_OPERAND (*expr_p
, 0);
3384 to_ptr
= build_fold_addr_expr_loc (loc
, to
);
3385 gimplify_arg (&to_ptr
, seq_p
, loc
);
3386 t
= builtin_decl_implicit (BUILT_IN_MEMSET
);
3388 gs
= gimple_build_call (t
, 3, to_ptr
, integer_zero_node
, size
);
3392 /* tmp = memset() */
3393 t
= create_tmp_var (TREE_TYPE (to_ptr
));
3394 gimple_call_set_lhs (gs
, t
);
3395 gimplify_seq_add_stmt (seq_p
, gs
);
3397 *expr_p
= build1 (INDIRECT_REF
, TREE_TYPE (to
), t
);
3401 gimplify_seq_add_stmt (seq_p
, gs
);
3406 /* A subroutine of gimplify_init_ctor_preeval. Called via walk_tree,
3407 determine, cautiously, if a CONSTRUCTOR overlaps the lhs of an
3408 assignment. Return non-null if we detect a potential overlap. */
3410 struct gimplify_init_ctor_preeval_data
3412 /* The base decl of the lhs object. May be NULL, in which case we
3413 have to assume the lhs is indirect. */
3416 /* The alias set of the lhs object. */
3417 alias_set_type lhs_alias_set
;
3421 gimplify_init_ctor_preeval_1 (tree
*tp
, int *walk_subtrees
, void *xdata
)
3423 struct gimplify_init_ctor_preeval_data
*data
3424 = (struct gimplify_init_ctor_preeval_data
*) xdata
;
3427 /* If we find the base object, obviously we have overlap. */
3428 if (data
->lhs_base_decl
== t
)
3431 /* If the constructor component is indirect, determine if we have a
3432 potential overlap with the lhs. The only bits of information we
3433 have to go on at this point are addressability and alias sets. */
3434 if ((INDIRECT_REF_P (t
)
3435 || TREE_CODE (t
) == MEM_REF
)
3436 && (!data
->lhs_base_decl
|| TREE_ADDRESSABLE (data
->lhs_base_decl
))
3437 && alias_sets_conflict_p (data
->lhs_alias_set
, get_alias_set (t
)))
3440 /* If the constructor component is a call, determine if it can hide a
3441 potential overlap with the lhs through an INDIRECT_REF like above.
3442 ??? Ugh - this is completely broken. In fact this whole analysis
3443 doesn't look conservative. */
3444 if (TREE_CODE (t
) == CALL_EXPR
)
3446 tree type
, fntype
= TREE_TYPE (TREE_TYPE (CALL_EXPR_FN (t
)));
3448 for (type
= TYPE_ARG_TYPES (fntype
); type
; type
= TREE_CHAIN (type
))
3449 if (POINTER_TYPE_P (TREE_VALUE (type
))
3450 && (!data
->lhs_base_decl
|| TREE_ADDRESSABLE (data
->lhs_base_decl
))
3451 && alias_sets_conflict_p (data
->lhs_alias_set
,
3453 (TREE_TYPE (TREE_VALUE (type
)))))
3457 if (IS_TYPE_OR_DECL_P (t
))
3462 /* A subroutine of gimplify_init_constructor. Pre-evaluate EXPR,
3463 force values that overlap with the lhs (as described by *DATA)
3464 into temporaries. */
3467 gimplify_init_ctor_preeval (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
3468 struct gimplify_init_ctor_preeval_data
*data
)
3470 enum gimplify_status one
;
3472 /* If the value is constant, then there's nothing to pre-evaluate. */
3473 if (TREE_CONSTANT (*expr_p
))
3475 /* Ensure it does not have side effects, it might contain a reference to
3476 the object we're initializing. */
3477 gcc_assert (!TREE_SIDE_EFFECTS (*expr_p
));
3481 /* If the type has non-trivial constructors, we can't pre-evaluate. */
3482 if (TREE_ADDRESSABLE (TREE_TYPE (*expr_p
)))
3485 /* Recurse for nested constructors. */
3486 if (TREE_CODE (*expr_p
) == CONSTRUCTOR
)
3488 unsigned HOST_WIDE_INT ix
;
3489 constructor_elt
*ce
;
3490 vec
<constructor_elt
, va_gc
> *v
= CONSTRUCTOR_ELTS (*expr_p
);
3492 FOR_EACH_VEC_SAFE_ELT (v
, ix
, ce
)
3493 gimplify_init_ctor_preeval (&ce
->value
, pre_p
, post_p
, data
);
3498 /* If this is a variable sized type, we must remember the size. */
3499 maybe_with_size_expr (expr_p
);
3501 /* Gimplify the constructor element to something appropriate for the rhs
3502 of a MODIFY_EXPR. Given that we know the LHS is an aggregate, we know
3503 the gimplifier will consider this a store to memory. Doing this
3504 gimplification now means that we won't have to deal with complicated
3505 language-specific trees, nor trees like SAVE_EXPR that can induce
3506 exponential search behavior. */
3507 one
= gimplify_expr (expr_p
, pre_p
, post_p
, is_gimple_mem_rhs
, fb_rvalue
);
3508 if (one
== GS_ERROR
)
3514 /* If we gimplified to a bare decl, we can be sure that it doesn't overlap
3515 with the lhs, since "a = { .x=a }" doesn't make sense. This will
3516 always be true for all scalars, since is_gimple_mem_rhs insists on a
3517 temporary variable for them. */
3518 if (DECL_P (*expr_p
))
3521 /* If this is of variable size, we have no choice but to assume it doesn't
3522 overlap since we can't make a temporary for it. */
3523 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (*expr_p
))) != INTEGER_CST
)
3526 /* Otherwise, we must search for overlap ... */
3527 if (!walk_tree (expr_p
, gimplify_init_ctor_preeval_1
, data
, NULL
))
3530 /* ... and if found, force the value into a temporary. */
3531 *expr_p
= get_formal_tmp_var (*expr_p
, pre_p
);
3534 /* A subroutine of gimplify_init_ctor_eval. Create a loop for
3535 a RANGE_EXPR in a CONSTRUCTOR for an array.
3539 object[var] = value;
3546 We increment var _after_ the loop exit check because we might otherwise
3547 fail if upper == TYPE_MAX_VALUE (type for upper).
3549 Note that we never have to deal with SAVE_EXPRs here, because this has
3550 already been taken care of for us, in gimplify_init_ctor_preeval(). */
3552 static void gimplify_init_ctor_eval (tree
, vec
<constructor_elt
, va_gc
> *,
3553 gimple_seq
*, bool);
3556 gimplify_init_ctor_eval_range (tree object
, tree lower
, tree upper
,
3557 tree value
, tree array_elt_type
,
3558 gimple_seq
*pre_p
, bool cleared
)
3560 tree loop_entry_label
, loop_exit_label
, fall_thru_label
;
3561 tree var
, var_type
, cref
, tmp
;
3563 loop_entry_label
= create_artificial_label (UNKNOWN_LOCATION
);
3564 loop_exit_label
= create_artificial_label (UNKNOWN_LOCATION
);
3565 fall_thru_label
= create_artificial_label (UNKNOWN_LOCATION
);
3567 /* Create and initialize the index variable. */
3568 var_type
= TREE_TYPE (upper
);
3569 var
= create_tmp_var (var_type
);
3570 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (var
, lower
));
3572 /* Add the loop entry label. */
3573 gimplify_seq_add_stmt (pre_p
, gimple_build_label (loop_entry_label
));
3575 /* Build the reference. */
3576 cref
= build4 (ARRAY_REF
, array_elt_type
, unshare_expr (object
),
3577 var
, NULL_TREE
, NULL_TREE
);
3579 /* If we are a constructor, just call gimplify_init_ctor_eval to do
3580 the store. Otherwise just assign value to the reference. */
3582 if (TREE_CODE (value
) == CONSTRUCTOR
)
3583 /* NB we might have to call ourself recursively through
3584 gimplify_init_ctor_eval if the value is a constructor. */
3585 gimplify_init_ctor_eval (cref
, CONSTRUCTOR_ELTS (value
),
3588 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (cref
, value
));
3590 /* We exit the loop when the index var is equal to the upper bound. */
3591 gimplify_seq_add_stmt (pre_p
,
3592 gimple_build_cond (EQ_EXPR
, var
, upper
,
3593 loop_exit_label
, fall_thru_label
));
3595 gimplify_seq_add_stmt (pre_p
, gimple_build_label (fall_thru_label
));
3597 /* Otherwise, increment the index var... */
3598 tmp
= build2 (PLUS_EXPR
, var_type
, var
,
3599 fold_convert (var_type
, integer_one_node
));
3600 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (var
, tmp
));
3602 /* ...and jump back to the loop entry. */
3603 gimplify_seq_add_stmt (pre_p
, gimple_build_goto (loop_entry_label
));
3605 /* Add the loop exit label. */
3606 gimplify_seq_add_stmt (pre_p
, gimple_build_label (loop_exit_label
));
3609 /* Return true if FDECL is accessing a field that is zero sized. */
3612 zero_sized_field_decl (const_tree fdecl
)
3614 if (TREE_CODE (fdecl
) == FIELD_DECL
&& DECL_SIZE (fdecl
)
3615 && integer_zerop (DECL_SIZE (fdecl
)))
3620 /* Return true if TYPE is zero sized. */
3623 zero_sized_type (const_tree type
)
3625 if (AGGREGATE_TYPE_P (type
) && TYPE_SIZE (type
)
3626 && integer_zerop (TYPE_SIZE (type
)))
3631 /* A subroutine of gimplify_init_constructor. Generate individual
3632 MODIFY_EXPRs for a CONSTRUCTOR. OBJECT is the LHS against which the
3633 assignments should happen. ELTS is the CONSTRUCTOR_ELTS of the
3634 CONSTRUCTOR. CLEARED is true if the entire LHS object has been
3638 gimplify_init_ctor_eval (tree object
, vec
<constructor_elt
, va_gc
> *elts
,
3639 gimple_seq
*pre_p
, bool cleared
)
3641 tree array_elt_type
= NULL
;
3642 unsigned HOST_WIDE_INT ix
;
3643 tree purpose
, value
;
3645 if (TREE_CODE (TREE_TYPE (object
)) == ARRAY_TYPE
)
3646 array_elt_type
= TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (object
)));
3648 FOR_EACH_CONSTRUCTOR_ELT (elts
, ix
, purpose
, value
)
3652 /* NULL values are created above for gimplification errors. */
3656 if (cleared
&& initializer_zerop (value
))
3659 /* ??? Here's to hoping the front end fills in all of the indices,
3660 so we don't have to figure out what's missing ourselves. */
3661 gcc_assert (purpose
);
3663 /* Skip zero-sized fields, unless value has side-effects. This can
3664 happen with calls to functions returning a zero-sized type, which
3665 we shouldn't discard. As a number of downstream passes don't
3666 expect sets of zero-sized fields, we rely on the gimplification of
3667 the MODIFY_EXPR we make below to drop the assignment statement. */
3668 if (! TREE_SIDE_EFFECTS (value
) && zero_sized_field_decl (purpose
))
3671 /* If we have a RANGE_EXPR, we have to build a loop to assign the
3673 if (TREE_CODE (purpose
) == RANGE_EXPR
)
3675 tree lower
= TREE_OPERAND (purpose
, 0);
3676 tree upper
= TREE_OPERAND (purpose
, 1);
3678 /* If the lower bound is equal to upper, just treat it as if
3679 upper was the index. */
3680 if (simple_cst_equal (lower
, upper
))
3684 gimplify_init_ctor_eval_range (object
, lower
, upper
, value
,
3685 array_elt_type
, pre_p
, cleared
);
3692 /* Do not use bitsizetype for ARRAY_REF indices. */
3693 if (TYPE_DOMAIN (TREE_TYPE (object
)))
3695 = fold_convert (TREE_TYPE (TYPE_DOMAIN (TREE_TYPE (object
))),
3697 cref
= build4 (ARRAY_REF
, array_elt_type
, unshare_expr (object
),
3698 purpose
, NULL_TREE
, NULL_TREE
);
3702 gcc_assert (TREE_CODE (purpose
) == FIELD_DECL
);
3703 cref
= build3 (COMPONENT_REF
, TREE_TYPE (purpose
),
3704 unshare_expr (object
), purpose
, NULL_TREE
);
3707 if (TREE_CODE (value
) == CONSTRUCTOR
3708 && TREE_CODE (TREE_TYPE (value
)) != VECTOR_TYPE
)
3709 gimplify_init_ctor_eval (cref
, CONSTRUCTOR_ELTS (value
),
3713 tree init
= build2 (INIT_EXPR
, TREE_TYPE (cref
), cref
, value
);
3714 gimplify_and_add (init
, pre_p
);
3720 /* Return the appropriate RHS predicate for this LHS. */
3723 rhs_predicate_for (tree lhs
)
3725 if (is_gimple_reg (lhs
))
3726 return is_gimple_reg_rhs_or_call
;
3728 return is_gimple_mem_rhs_or_call
;
3731 /* Gimplify a C99 compound literal expression. This just means adding
3732 the DECL_EXPR before the current statement and using its anonymous
3735 static enum gimplify_status
3736 gimplify_compound_literal_expr (tree
*expr_p
, gimple_seq
*pre_p
,
3737 bool (*gimple_test_f
) (tree
),
3738 fallback_t fallback
)
3740 tree decl_s
= COMPOUND_LITERAL_EXPR_DECL_EXPR (*expr_p
);
3741 tree decl
= DECL_EXPR_DECL (decl_s
);
3742 tree init
= DECL_INITIAL (decl
);
3743 /* Mark the decl as addressable if the compound literal
3744 expression is addressable now, otherwise it is marked too late
3745 after we gimplify the initialization expression. */
3746 if (TREE_ADDRESSABLE (*expr_p
))
3747 TREE_ADDRESSABLE (decl
) = 1;
3748 /* Otherwise, if we don't need an lvalue and have a literal directly
3749 substitute it. Check if it matches the gimple predicate, as
3750 otherwise we'd generate a new temporary, and we can as well just
3751 use the decl we already have. */
3752 else if (!TREE_ADDRESSABLE (decl
)
3754 && (fallback
& fb_lvalue
) == 0
3755 && gimple_test_f (init
))
3761 /* Preliminarily mark non-addressed complex variables as eligible
3762 for promotion to gimple registers. We'll transform their uses
3764 if ((TREE_CODE (TREE_TYPE (decl
)) == COMPLEX_TYPE
3765 || TREE_CODE (TREE_TYPE (decl
)) == VECTOR_TYPE
)
3766 && !TREE_THIS_VOLATILE (decl
)
3767 && !needs_to_live_in_memory (decl
))
3768 DECL_GIMPLE_REG_P (decl
) = 1;
3770 /* If the decl is not addressable, then it is being used in some
3771 expression or on the right hand side of a statement, and it can
3772 be put into a readonly data section. */
3773 if (!TREE_ADDRESSABLE (decl
) && (fallback
& fb_lvalue
) == 0)
3774 TREE_READONLY (decl
) = 1;
3776 /* This decl isn't mentioned in the enclosing block, so add it to the
3777 list of temps. FIXME it seems a bit of a kludge to say that
3778 anonymous artificial vars aren't pushed, but everything else is. */
3779 if (DECL_NAME (decl
) == NULL_TREE
&& !DECL_SEEN_IN_BIND_EXPR_P (decl
))
3780 gimple_add_tmp_var (decl
);
3782 gimplify_and_add (decl_s
, pre_p
);
3787 /* Optimize embedded COMPOUND_LITERAL_EXPRs within a CONSTRUCTOR,
3788 return a new CONSTRUCTOR if something changed. */
3791 optimize_compound_literals_in_ctor (tree orig_ctor
)
3793 tree ctor
= orig_ctor
;
3794 vec
<constructor_elt
, va_gc
> *elts
= CONSTRUCTOR_ELTS (ctor
);
3795 unsigned int idx
, num
= vec_safe_length (elts
);
3797 for (idx
= 0; idx
< num
; idx
++)
3799 tree value
= (*elts
)[idx
].value
;
3800 tree newval
= value
;
3801 if (TREE_CODE (value
) == CONSTRUCTOR
)
3802 newval
= optimize_compound_literals_in_ctor (value
);
3803 else if (TREE_CODE (value
) == COMPOUND_LITERAL_EXPR
)
3805 tree decl_s
= COMPOUND_LITERAL_EXPR_DECL_EXPR (value
);
3806 tree decl
= DECL_EXPR_DECL (decl_s
);
3807 tree init
= DECL_INITIAL (decl
);
3809 if (!TREE_ADDRESSABLE (value
)
3810 && !TREE_ADDRESSABLE (decl
)
3812 && TREE_CODE (init
) == CONSTRUCTOR
)
3813 newval
= optimize_compound_literals_in_ctor (init
);
3815 if (newval
== value
)
3818 if (ctor
== orig_ctor
)
3820 ctor
= copy_node (orig_ctor
);
3821 CONSTRUCTOR_ELTS (ctor
) = vec_safe_copy (elts
);
3822 elts
= CONSTRUCTOR_ELTS (ctor
);
3824 (*elts
)[idx
].value
= newval
;
3829 /* A subroutine of gimplify_modify_expr. Break out elements of a
3830 CONSTRUCTOR used as an initializer into separate MODIFY_EXPRs.
3832 Note that we still need to clear any elements that don't have explicit
3833 initializers, so if not all elements are initialized we keep the
3834 original MODIFY_EXPR, we just remove all of the constructor elements.
3836 If NOTIFY_TEMP_CREATION is true, do not gimplify, just return
3837 GS_ERROR if we would have to create a temporary when gimplifying
3838 this constructor. Otherwise, return GS_OK.
3840 If NOTIFY_TEMP_CREATION is false, just do the gimplification. */
3842 static enum gimplify_status
3843 gimplify_init_constructor (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
3844 bool want_value
, bool notify_temp_creation
)
3846 tree object
, ctor
, type
;
3847 enum gimplify_status ret
;
3848 vec
<constructor_elt
, va_gc
> *elts
;
3850 gcc_assert (TREE_CODE (TREE_OPERAND (*expr_p
, 1)) == CONSTRUCTOR
);
3852 if (!notify_temp_creation
)
3854 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
3855 is_gimple_lvalue
, fb_lvalue
);
3856 if (ret
== GS_ERROR
)
3860 object
= TREE_OPERAND (*expr_p
, 0);
3861 ctor
= TREE_OPERAND (*expr_p
, 1) =
3862 optimize_compound_literals_in_ctor (TREE_OPERAND (*expr_p
, 1));
3863 type
= TREE_TYPE (ctor
);
3864 elts
= CONSTRUCTOR_ELTS (ctor
);
3867 switch (TREE_CODE (type
))
3871 case QUAL_UNION_TYPE
:
3874 struct gimplify_init_ctor_preeval_data preeval_data
;
3875 HOST_WIDE_INT num_ctor_elements
, num_nonzero_elements
;
3876 bool cleared
, complete_p
, valid_const_initializer
;
3878 /* Aggregate types must lower constructors to initialization of
3879 individual elements. The exception is that a CONSTRUCTOR node
3880 with no elements indicates zero-initialization of the whole. */
3881 if (vec_safe_is_empty (elts
))
3883 if (notify_temp_creation
)
3888 /* Fetch information about the constructor to direct later processing.
3889 We might want to make static versions of it in various cases, and
3890 can only do so if it known to be a valid constant initializer. */
3891 valid_const_initializer
3892 = categorize_ctor_elements (ctor
, &num_nonzero_elements
,
3893 &num_ctor_elements
, &complete_p
);
3895 /* If a const aggregate variable is being initialized, then it
3896 should never be a lose to promote the variable to be static. */
3897 if (valid_const_initializer
3898 && num_nonzero_elements
> 1
3899 && TREE_READONLY (object
)
3900 && TREE_CODE (object
) == VAR_DECL
3901 && (flag_merge_constants
>= 2 || !TREE_ADDRESSABLE (object
)))
3903 if (notify_temp_creation
)
3905 DECL_INITIAL (object
) = ctor
;
3906 TREE_STATIC (object
) = 1;
3907 if (!DECL_NAME (object
))
3908 DECL_NAME (object
) = create_tmp_var_name ("C");
3909 walk_tree (&DECL_INITIAL (object
), force_labels_r
, NULL
, NULL
);
3911 /* ??? C++ doesn't automatically append a .<number> to the
3912 assembler name, and even when it does, it looks at FE private
3913 data structures to figure out what that number should be,
3914 which are not set for this variable. I suppose this is
3915 important for local statics for inline functions, which aren't
3916 "local" in the object file sense. So in order to get a unique
3917 TU-local symbol, we must invoke the lhd version now. */
3918 lhd_set_decl_assembler_name (object
);
3920 *expr_p
= NULL_TREE
;
3924 /* If there are "lots" of initialized elements, even discounting
3925 those that are not address constants (and thus *must* be
3926 computed at runtime), then partition the constructor into
3927 constant and non-constant parts. Block copy the constant
3928 parts in, then generate code for the non-constant parts. */
3929 /* TODO. There's code in cp/typeck.c to do this. */
3931 if (int_size_in_bytes (TREE_TYPE (ctor
)) < 0)
3932 /* store_constructor will ignore the clearing of variable-sized
3933 objects. Initializers for such objects must explicitly set
3934 every field that needs to be set. */
3936 else if (!complete_p
&& !CONSTRUCTOR_NO_CLEARING (ctor
))
3937 /* If the constructor isn't complete, clear the whole object
3938 beforehand, unless CONSTRUCTOR_NO_CLEARING is set on it.
3940 ??? This ought not to be needed. For any element not present
3941 in the initializer, we should simply set them to zero. Except
3942 we'd need to *find* the elements that are not present, and that
3943 requires trickery to avoid quadratic compile-time behavior in
3944 large cases or excessive memory use in small cases. */
3946 else if (num_ctor_elements
- num_nonzero_elements
3947 > CLEAR_RATIO (optimize_function_for_speed_p (cfun
))
3948 && num_nonzero_elements
< num_ctor_elements
/ 4)
3949 /* If there are "lots" of zeros, it's more efficient to clear
3950 the memory and then set the nonzero elements. */
3955 /* If there are "lots" of initialized elements, and all of them
3956 are valid address constants, then the entire initializer can
3957 be dropped to memory, and then memcpy'd out. Don't do this
3958 for sparse arrays, though, as it's more efficient to follow
3959 the standard CONSTRUCTOR behavior of memset followed by
3960 individual element initialization. Also don't do this for small
3961 all-zero initializers (which aren't big enough to merit
3962 clearing), and don't try to make bitwise copies of
3963 TREE_ADDRESSABLE types.
3965 We cannot apply such transformation when compiling chkp static
3966 initializer because creation of initializer image in the memory
3967 will require static initialization of bounds for it. It should
3968 result in another gimplification of similar initializer and we
3969 may fall into infinite loop. */
3970 if (valid_const_initializer
3971 && !(cleared
|| num_nonzero_elements
== 0)
3972 && !TREE_ADDRESSABLE (type
)
3973 && (!current_function_decl
3974 || !lookup_attribute ("chkp ctor",
3975 DECL_ATTRIBUTES (current_function_decl
))))
3977 HOST_WIDE_INT size
= int_size_in_bytes (type
);
3980 /* ??? We can still get unbounded array types, at least
3981 from the C++ front end. This seems wrong, but attempt
3982 to work around it for now. */
3985 size
= int_size_in_bytes (TREE_TYPE (object
));
3987 TREE_TYPE (ctor
) = type
= TREE_TYPE (object
);
3990 /* Find the maximum alignment we can assume for the object. */
3991 /* ??? Make use of DECL_OFFSET_ALIGN. */
3992 if (DECL_P (object
))
3993 align
= DECL_ALIGN (object
);
3995 align
= TYPE_ALIGN (type
);
3997 /* Do a block move either if the size is so small as to make
3998 each individual move a sub-unit move on average, or if it
3999 is so large as to make individual moves inefficient. */
4001 && num_nonzero_elements
> 1
4002 && (size
< num_nonzero_elements
4003 || !can_move_by_pieces (size
, align
)))
4005 if (notify_temp_creation
)
4008 walk_tree (&ctor
, force_labels_r
, NULL
, NULL
);
4009 ctor
= tree_output_constant_def (ctor
);
4010 if (!useless_type_conversion_p (type
, TREE_TYPE (ctor
)))
4011 ctor
= build1 (VIEW_CONVERT_EXPR
, type
, ctor
);
4012 TREE_OPERAND (*expr_p
, 1) = ctor
;
4014 /* This is no longer an assignment of a CONSTRUCTOR, but
4015 we still may have processing to do on the LHS. So
4016 pretend we didn't do anything here to let that happen. */
4017 return GS_UNHANDLED
;
4021 /* If the target is volatile, we have non-zero elements and more than
4022 one field to assign, initialize the target from a temporary. */
4023 if (TREE_THIS_VOLATILE (object
)
4024 && !TREE_ADDRESSABLE (type
)
4025 && num_nonzero_elements
> 0
4026 && vec_safe_length (elts
) > 1)
4028 tree temp
= create_tmp_var (TYPE_MAIN_VARIANT (type
));
4029 TREE_OPERAND (*expr_p
, 0) = temp
;
4030 *expr_p
= build2 (COMPOUND_EXPR
, TREE_TYPE (*expr_p
),
4032 build2 (MODIFY_EXPR
, void_type_node
,
4037 if (notify_temp_creation
)
4040 /* If there are nonzero elements and if needed, pre-evaluate to capture
4041 elements overlapping with the lhs into temporaries. We must do this
4042 before clearing to fetch the values before they are zeroed-out. */
4043 if (num_nonzero_elements
> 0 && TREE_CODE (*expr_p
) != INIT_EXPR
)
4045 preeval_data
.lhs_base_decl
= get_base_address (object
);
4046 if (!DECL_P (preeval_data
.lhs_base_decl
))
4047 preeval_data
.lhs_base_decl
= NULL
;
4048 preeval_data
.lhs_alias_set
= get_alias_set (object
);
4050 gimplify_init_ctor_preeval (&TREE_OPERAND (*expr_p
, 1),
4051 pre_p
, post_p
, &preeval_data
);
4054 bool ctor_has_side_effects_p
4055 = TREE_SIDE_EFFECTS (TREE_OPERAND (*expr_p
, 1));
4059 /* Zap the CONSTRUCTOR element list, which simplifies this case.
4060 Note that we still have to gimplify, in order to handle the
4061 case of variable sized types. Avoid shared tree structures. */
4062 CONSTRUCTOR_ELTS (ctor
) = NULL
;
4063 TREE_SIDE_EFFECTS (ctor
) = 0;
4064 object
= unshare_expr (object
);
4065 gimplify_stmt (expr_p
, pre_p
);
4068 /* If we have not block cleared the object, or if there are nonzero
4069 elements in the constructor, or if the constructor has side effects,
4070 add assignments to the individual scalar fields of the object. */
4072 || num_nonzero_elements
> 0
4073 || ctor_has_side_effects_p
)
4074 gimplify_init_ctor_eval (object
, elts
, pre_p
, cleared
);
4076 *expr_p
= NULL_TREE
;
4084 if (notify_temp_creation
)
4087 /* Extract the real and imaginary parts out of the ctor. */
4088 gcc_assert (elts
->length () == 2);
4089 r
= (*elts
)[0].value
;
4090 i
= (*elts
)[1].value
;
4091 if (r
== NULL
|| i
== NULL
)
4093 tree zero
= build_zero_cst (TREE_TYPE (type
));
4100 /* Complex types have either COMPLEX_CST or COMPLEX_EXPR to
4101 represent creation of a complex value. */
4102 if (TREE_CONSTANT (r
) && TREE_CONSTANT (i
))
4104 ctor
= build_complex (type
, r
, i
);
4105 TREE_OPERAND (*expr_p
, 1) = ctor
;
4109 ctor
= build2 (COMPLEX_EXPR
, type
, r
, i
);
4110 TREE_OPERAND (*expr_p
, 1) = ctor
;
4111 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1),
4114 rhs_predicate_for (TREE_OPERAND (*expr_p
, 0)),
4122 unsigned HOST_WIDE_INT ix
;
4123 constructor_elt
*ce
;
4125 if (notify_temp_creation
)
4128 /* Go ahead and simplify constant constructors to VECTOR_CST. */
4129 if (TREE_CONSTANT (ctor
))
4131 bool constant_p
= true;
4134 /* Even when ctor is constant, it might contain non-*_CST
4135 elements, such as addresses or trapping values like
4136 1.0/0.0 - 1.0/0.0. Such expressions don't belong
4137 in VECTOR_CST nodes. */
4138 FOR_EACH_CONSTRUCTOR_VALUE (elts
, ix
, value
)
4139 if (!CONSTANT_CLASS_P (value
))
4147 TREE_OPERAND (*expr_p
, 1) = build_vector_from_ctor (type
, elts
);
4151 TREE_CONSTANT (ctor
) = 0;
4154 /* Vector types use CONSTRUCTOR all the way through gimple
4155 compilation as a general initializer. */
4156 FOR_EACH_VEC_SAFE_ELT (elts
, ix
, ce
)
4158 enum gimplify_status tret
;
4159 tret
= gimplify_expr (&ce
->value
, pre_p
, post_p
, is_gimple_val
,
4161 if (tret
== GS_ERROR
)
4164 if (!is_gimple_reg (TREE_OPERAND (*expr_p
, 0)))
4165 TREE_OPERAND (*expr_p
, 1) = get_formal_tmp_var (ctor
, pre_p
);
4170 /* So how did we get a CONSTRUCTOR for a scalar type? */
4174 if (ret
== GS_ERROR
)
4176 else if (want_value
)
4183 /* If we have gimplified both sides of the initializer but have
4184 not emitted an assignment, do so now. */
4187 tree lhs
= TREE_OPERAND (*expr_p
, 0);
4188 tree rhs
= TREE_OPERAND (*expr_p
, 1);
4189 gassign
*init
= gimple_build_assign (lhs
, rhs
);
4190 gimplify_seq_add_stmt (pre_p
, init
);
4198 /* Given a pointer value OP0, return a simplified version of an
4199 indirection through OP0, or NULL_TREE if no simplification is
4200 possible. This may only be applied to a rhs of an expression.
4201 Note that the resulting type may be different from the type pointed
4202 to in the sense that it is still compatible from the langhooks
4206 gimple_fold_indirect_ref_rhs (tree t
)
4208 return gimple_fold_indirect_ref (t
);
4211 /* Subroutine of gimplify_modify_expr to do simplifications of
4212 MODIFY_EXPRs based on the code of the RHS. We loop for as long as
4213 something changes. */
4215 static enum gimplify_status
4216 gimplify_modify_expr_rhs (tree
*expr_p
, tree
*from_p
, tree
*to_p
,
4217 gimple_seq
*pre_p
, gimple_seq
*post_p
,
4220 enum gimplify_status ret
= GS_UNHANDLED
;
4226 switch (TREE_CODE (*from_p
))
4229 /* If we're assigning from a read-only variable initialized with
4230 a constructor, do the direct assignment from the constructor,
4231 but only if neither source nor target are volatile since this
4232 latter assignment might end up being done on a per-field basis. */
4233 if (DECL_INITIAL (*from_p
)
4234 && TREE_READONLY (*from_p
)
4235 && !TREE_THIS_VOLATILE (*from_p
)
4236 && !TREE_THIS_VOLATILE (*to_p
)
4237 && TREE_CODE (DECL_INITIAL (*from_p
)) == CONSTRUCTOR
)
4239 tree old_from
= *from_p
;
4240 enum gimplify_status subret
;
4242 /* Move the constructor into the RHS. */
4243 *from_p
= unshare_expr (DECL_INITIAL (*from_p
));
4245 /* Let's see if gimplify_init_constructor will need to put
4247 subret
= gimplify_init_constructor (expr_p
, NULL
, NULL
,
4249 if (subret
== GS_ERROR
)
4251 /* If so, revert the change. */
4263 /* If we have code like
4267 where the type of "x" is a (possibly cv-qualified variant
4268 of "A"), treat the entire expression as identical to "x".
4269 This kind of code arises in C++ when an object is bound
4270 to a const reference, and if "x" is a TARGET_EXPR we want
4271 to take advantage of the optimization below. */
4272 bool volatile_p
= TREE_THIS_VOLATILE (*from_p
);
4273 tree t
= gimple_fold_indirect_ref_rhs (TREE_OPERAND (*from_p
, 0));
4276 if (TREE_THIS_VOLATILE (t
) != volatile_p
)
4279 t
= build_simple_mem_ref_loc (EXPR_LOCATION (*from_p
),
4280 build_fold_addr_expr (t
));
4281 if (REFERENCE_CLASS_P (t
))
4282 TREE_THIS_VOLATILE (t
) = volatile_p
;
4293 /* If we are initializing something from a TARGET_EXPR, strip the
4294 TARGET_EXPR and initialize it directly, if possible. This can't
4295 be done if the initializer is void, since that implies that the
4296 temporary is set in some non-trivial way.
4298 ??? What about code that pulls out the temp and uses it
4299 elsewhere? I think that such code never uses the TARGET_EXPR as
4300 an initializer. If I'm wrong, we'll die because the temp won't
4301 have any RTL. In that case, I guess we'll need to replace
4302 references somehow. */
4303 tree init
= TARGET_EXPR_INITIAL (*from_p
);
4306 && !VOID_TYPE_P (TREE_TYPE (init
)))
4316 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
4318 gimplify_compound_expr (from_p
, pre_p
, true);
4324 /* If we already made some changes, let the front end have a
4325 crack at this before we break it down. */
4326 if (ret
!= GS_UNHANDLED
)
4328 /* If we're initializing from a CONSTRUCTOR, break this into
4329 individual MODIFY_EXPRs. */
4330 return gimplify_init_constructor (expr_p
, pre_p
, post_p
, want_value
,
4334 /* If we're assigning to a non-register type, push the assignment
4335 down into the branches. This is mandatory for ADDRESSABLE types,
4336 since we cannot generate temporaries for such, but it saves a
4337 copy in other cases as well. */
4338 if (!is_gimple_reg_type (TREE_TYPE (*from_p
)))
4340 /* This code should mirror the code in gimplify_cond_expr. */
4341 enum tree_code code
= TREE_CODE (*expr_p
);
4342 tree cond
= *from_p
;
4343 tree result
= *to_p
;
4345 ret
= gimplify_expr (&result
, pre_p
, post_p
,
4346 is_gimple_lvalue
, fb_lvalue
);
4347 if (ret
!= GS_ERROR
)
4350 if (TREE_TYPE (TREE_OPERAND (cond
, 1)) != void_type_node
)
4351 TREE_OPERAND (cond
, 1)
4352 = build2 (code
, void_type_node
, result
,
4353 TREE_OPERAND (cond
, 1));
4354 if (TREE_TYPE (TREE_OPERAND (cond
, 2)) != void_type_node
)
4355 TREE_OPERAND (cond
, 2)
4356 = build2 (code
, void_type_node
, unshare_expr (result
),
4357 TREE_OPERAND (cond
, 2));
4359 TREE_TYPE (cond
) = void_type_node
;
4360 recalculate_side_effects (cond
);
4364 gimplify_and_add (cond
, pre_p
);
4365 *expr_p
= unshare_expr (result
);
4374 /* For calls that return in memory, give *to_p as the CALL_EXPR's
4375 return slot so that we don't generate a temporary. */
4376 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p
)
4377 && aggregate_value_p (*from_p
, *from_p
))
4381 if (!(rhs_predicate_for (*to_p
))(*from_p
))
4382 /* If we need a temporary, *to_p isn't accurate. */
4384 /* It's OK to use the return slot directly unless it's an NRV. */
4385 else if (TREE_CODE (*to_p
) == RESULT_DECL
4386 && DECL_NAME (*to_p
) == NULL_TREE
4387 && needs_to_live_in_memory (*to_p
))
4389 else if (is_gimple_reg_type (TREE_TYPE (*to_p
))
4390 || (DECL_P (*to_p
) && DECL_REGISTER (*to_p
)))
4391 /* Don't force regs into memory. */
4393 else if (TREE_CODE (*expr_p
) == INIT_EXPR
)
4394 /* It's OK to use the target directly if it's being
4397 else if (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (*to_p
)))
4399 /* Always use the target and thus RSO for variable-sized types.
4400 GIMPLE cannot deal with a variable-sized assignment
4401 embedded in a call statement. */
4403 else if (TREE_CODE (*to_p
) != SSA_NAME
4404 && (!is_gimple_variable (*to_p
)
4405 || needs_to_live_in_memory (*to_p
)))
4406 /* Don't use the original target if it's already addressable;
4407 if its address escapes, and the called function uses the
4408 NRV optimization, a conforming program could see *to_p
4409 change before the called function returns; see c++/19317.
4410 When optimizing, the return_slot pass marks more functions
4411 as safe after we have escape info. */
4418 CALL_EXPR_RETURN_SLOT_OPT (*from_p
) = 1;
4419 mark_addressable (*to_p
);
4424 case WITH_SIZE_EXPR
:
4425 /* Likewise for calls that return an aggregate of non-constant size,
4426 since we would not be able to generate a temporary at all. */
4427 if (TREE_CODE (TREE_OPERAND (*from_p
, 0)) == CALL_EXPR
)
4429 *from_p
= TREE_OPERAND (*from_p
, 0);
4430 /* We don't change ret in this case because the
4431 WITH_SIZE_EXPR might have been added in
4432 gimplify_modify_expr, so returning GS_OK would lead to an
4438 /* If we're initializing from a container, push the initialization
4440 case CLEANUP_POINT_EXPR
:
4442 case STATEMENT_LIST
:
4444 tree wrap
= *from_p
;
4447 ret
= gimplify_expr (to_p
, pre_p
, post_p
, is_gimple_min_lval
,
4449 if (ret
!= GS_ERROR
)
4452 t
= voidify_wrapper_expr (wrap
, *expr_p
);
4453 gcc_assert (t
== *expr_p
);
4457 gimplify_and_add (wrap
, pre_p
);
4458 *expr_p
= unshare_expr (*to_p
);
4465 case COMPOUND_LITERAL_EXPR
:
4467 tree complit
= TREE_OPERAND (*expr_p
, 1);
4468 tree decl_s
= COMPOUND_LITERAL_EXPR_DECL_EXPR (complit
);
4469 tree decl
= DECL_EXPR_DECL (decl_s
);
4470 tree init
= DECL_INITIAL (decl
);
4472 /* struct T x = (struct T) { 0, 1, 2 } can be optimized
4473 into struct T x = { 0, 1, 2 } if the address of the
4474 compound literal has never been taken. */
4475 if (!TREE_ADDRESSABLE (complit
)
4476 && !TREE_ADDRESSABLE (decl
)
4479 *expr_p
= copy_node (*expr_p
);
4480 TREE_OPERAND (*expr_p
, 1) = init
;
4495 /* Return true if T looks like a valid GIMPLE statement. */
4498 is_gimple_stmt (tree t
)
4500 const enum tree_code code
= TREE_CODE (t
);
4505 /* The only valid NOP_EXPR is the empty statement. */
4506 return IS_EMPTY_STMT (t
);
4510 /* These are only valid if they're void. */
4511 return TREE_TYPE (t
) == NULL
|| VOID_TYPE_P (TREE_TYPE (t
));
4517 case CASE_LABEL_EXPR
:
4518 case TRY_CATCH_EXPR
:
4519 case TRY_FINALLY_EXPR
:
4520 case EH_FILTER_EXPR
:
4523 case STATEMENT_LIST
:
4527 case OACC_HOST_DATA
:
4530 case OACC_ENTER_DATA
:
4531 case OACC_EXIT_DATA
:
4537 case OMP_DISTRIBUTE
:
4548 case OMP_TARGET_DATA
:
4549 case OMP_TARGET_UPDATE
:
4550 case OMP_TARGET_ENTER_DATA
:
4551 case OMP_TARGET_EXIT_DATA
:
4554 /* These are always void. */
4560 /* These are valid regardless of their type. */
4569 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
4570 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
4571 DECL_GIMPLE_REG_P set.
4573 IMPORTANT NOTE: This promotion is performed by introducing a load of the
4574 other, unmodified part of the complex object just before the total store.
4575 As a consequence, if the object is still uninitialized, an undefined value
4576 will be loaded into a register, which may result in a spurious exception
4577 if the register is floating-point and the value happens to be a signaling
4578 NaN for example. Then the fully-fledged complex operations lowering pass
4579 followed by a DCE pass are necessary in order to fix things up. */
4581 static enum gimplify_status
4582 gimplify_modify_expr_complex_part (tree
*expr_p
, gimple_seq
*pre_p
,
4585 enum tree_code code
, ocode
;
4586 tree lhs
, rhs
, new_rhs
, other
, realpart
, imagpart
;
4588 lhs
= TREE_OPERAND (*expr_p
, 0);
4589 rhs
= TREE_OPERAND (*expr_p
, 1);
4590 code
= TREE_CODE (lhs
);
4591 lhs
= TREE_OPERAND (lhs
, 0);
4593 ocode
= code
== REALPART_EXPR
? IMAGPART_EXPR
: REALPART_EXPR
;
4594 other
= build1 (ocode
, TREE_TYPE (rhs
), lhs
);
4595 TREE_NO_WARNING (other
) = 1;
4596 other
= get_formal_tmp_var (other
, pre_p
);
4598 realpart
= code
== REALPART_EXPR
? rhs
: other
;
4599 imagpart
= code
== REALPART_EXPR
? other
: rhs
;
4601 if (TREE_CONSTANT (realpart
) && TREE_CONSTANT (imagpart
))
4602 new_rhs
= build_complex (TREE_TYPE (lhs
), realpart
, imagpart
);
4604 new_rhs
= build2 (COMPLEX_EXPR
, TREE_TYPE (lhs
), realpart
, imagpart
);
4606 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (lhs
, new_rhs
));
4607 *expr_p
= (want_value
) ? rhs
: NULL_TREE
;
4612 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
4618 PRE_P points to the list where side effects that must happen before
4619 *EXPR_P should be stored.
4621 POST_P points to the list where side effects that must happen after
4622 *EXPR_P should be stored.
4624 WANT_VALUE is nonzero iff we want to use the value of this expression
4625 in another expression. */
4627 static enum gimplify_status
4628 gimplify_modify_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
4631 tree
*from_p
= &TREE_OPERAND (*expr_p
, 1);
4632 tree
*to_p
= &TREE_OPERAND (*expr_p
, 0);
4633 enum gimplify_status ret
= GS_UNHANDLED
;
4635 location_t loc
= EXPR_LOCATION (*expr_p
);
4636 gimple_stmt_iterator gsi
;
4638 gcc_assert (TREE_CODE (*expr_p
) == MODIFY_EXPR
4639 || TREE_CODE (*expr_p
) == INIT_EXPR
);
4641 /* Trying to simplify a clobber using normal logic doesn't work,
4642 so handle it here. */
4643 if (TREE_CLOBBER_P (*from_p
))
4645 ret
= gimplify_expr (to_p
, pre_p
, post_p
, is_gimple_lvalue
, fb_lvalue
);
4646 if (ret
== GS_ERROR
)
4648 gcc_assert (!want_value
4649 && (TREE_CODE (*to_p
) == VAR_DECL
4650 || TREE_CODE (*to_p
) == MEM_REF
));
4651 gimplify_seq_add_stmt (pre_p
, gimple_build_assign (*to_p
, *from_p
));
4656 /* Insert pointer conversions required by the middle-end that are not
4657 required by the frontend. This fixes middle-end type checking for
4658 for example gcc.dg/redecl-6.c. */
4659 if (POINTER_TYPE_P (TREE_TYPE (*to_p
)))
4661 STRIP_USELESS_TYPE_CONVERSION (*from_p
);
4662 if (!useless_type_conversion_p (TREE_TYPE (*to_p
), TREE_TYPE (*from_p
)))
4663 *from_p
= fold_convert_loc (loc
, TREE_TYPE (*to_p
), *from_p
);
4666 /* See if any simplifications can be done based on what the RHS is. */
4667 ret
= gimplify_modify_expr_rhs (expr_p
, from_p
, to_p
, pre_p
, post_p
,
4669 if (ret
!= GS_UNHANDLED
)
4672 /* For zero sized types only gimplify the left hand side and right hand
4673 side as statements and throw away the assignment. Do this after
4674 gimplify_modify_expr_rhs so we handle TARGET_EXPRs of addressable
4676 if (zero_sized_type (TREE_TYPE (*from_p
)) && !want_value
)
4678 gimplify_stmt (from_p
, pre_p
);
4679 gimplify_stmt (to_p
, pre_p
);
4680 *expr_p
= NULL_TREE
;
4684 /* If the value being copied is of variable width, compute the length
4685 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
4686 before gimplifying any of the operands so that we can resolve any
4687 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
4688 the size of the expression to be copied, not of the destination, so
4689 that is what we must do here. */
4690 maybe_with_size_expr (from_p
);
4692 ret
= gimplify_expr (to_p
, pre_p
, post_p
, is_gimple_lvalue
, fb_lvalue
);
4693 if (ret
== GS_ERROR
)
4696 /* As a special case, we have to temporarily allow for assignments
4697 with a CALL_EXPR on the RHS. Since in GIMPLE a function call is
4698 a toplevel statement, when gimplifying the GENERIC expression
4699 MODIFY_EXPR <a, CALL_EXPR <foo>>, we cannot create the tuple
4700 GIMPLE_ASSIGN <a, GIMPLE_CALL <foo>>.
4702 Instead, we need to create the tuple GIMPLE_CALL <a, foo>. To
4703 prevent gimplify_expr from trying to create a new temporary for
4704 foo's LHS, we tell it that it should only gimplify until it
4705 reaches the CALL_EXPR. On return from gimplify_expr, the newly
4706 created GIMPLE_CALL <foo> will be the last statement in *PRE_P
4707 and all we need to do here is set 'a' to be its LHS. */
4708 ret
= gimplify_expr (from_p
, pre_p
, post_p
, rhs_predicate_for (*to_p
),
4710 if (ret
== GS_ERROR
)
4713 /* In case of va_arg internal fn wrappped in a WITH_SIZE_EXPR, add the type
4714 size as argument to the call. */
4715 if (TREE_CODE (*from_p
) == WITH_SIZE_EXPR
)
4717 tree call
= TREE_OPERAND (*from_p
, 0);
4718 tree vlasize
= TREE_OPERAND (*from_p
, 1);
4720 if (TREE_CODE (call
) == CALL_EXPR
4721 && CALL_EXPR_IFN (call
) == IFN_VA_ARG
)
4723 int nargs
= call_expr_nargs (call
);
4724 tree type
= TREE_TYPE (call
);
4725 tree ap
= CALL_EXPR_ARG (call
, 0);
4726 tree tag
= CALL_EXPR_ARG (call
, 1);
4727 tree aptag
= CALL_EXPR_ARG (call
, 2);
4728 tree newcall
= build_call_expr_internal_loc (EXPR_LOCATION (call
),
4732 TREE_OPERAND (*from_p
, 0) = newcall
;
4736 /* Now see if the above changed *from_p to something we handle specially. */
4737 ret
= gimplify_modify_expr_rhs (expr_p
, from_p
, to_p
, pre_p
, post_p
,
4739 if (ret
!= GS_UNHANDLED
)
4742 /* If we've got a variable sized assignment between two lvalues (i.e. does
4743 not involve a call), then we can make things a bit more straightforward
4744 by converting the assignment to memcpy or memset. */
4745 if (TREE_CODE (*from_p
) == WITH_SIZE_EXPR
)
4747 tree from
= TREE_OPERAND (*from_p
, 0);
4748 tree size
= TREE_OPERAND (*from_p
, 1);
4750 if (TREE_CODE (from
) == CONSTRUCTOR
)
4751 return gimplify_modify_expr_to_memset (expr_p
, size
, want_value
, pre_p
);
4753 if (is_gimple_addressable (from
))
4756 return gimplify_modify_expr_to_memcpy (expr_p
, size
, want_value
,
4761 /* Transform partial stores to non-addressable complex variables into
4762 total stores. This allows us to use real instead of virtual operands
4763 for these variables, which improves optimization. */
4764 if ((TREE_CODE (*to_p
) == REALPART_EXPR
4765 || TREE_CODE (*to_p
) == IMAGPART_EXPR
)
4766 && is_gimple_reg (TREE_OPERAND (*to_p
, 0)))
4767 return gimplify_modify_expr_complex_part (expr_p
, pre_p
, want_value
);
4769 /* Try to alleviate the effects of the gimplification creating artificial
4770 temporaries (see for example is_gimple_reg_rhs) on the debug info, but
4771 make sure not to create DECL_DEBUG_EXPR links across functions. */
4772 if (!gimplify_ctxp
->into_ssa
4773 && TREE_CODE (*from_p
) == VAR_DECL
4774 && DECL_IGNORED_P (*from_p
)
4776 && !DECL_IGNORED_P (*to_p
)
4777 && decl_function_context (*to_p
) == current_function_decl
)
4779 if (!DECL_NAME (*from_p
) && DECL_NAME (*to_p
))
4781 = create_tmp_var_name (IDENTIFIER_POINTER (DECL_NAME (*to_p
)));
4782 DECL_HAS_DEBUG_EXPR_P (*from_p
) = 1;
4783 SET_DECL_DEBUG_EXPR (*from_p
, *to_p
);
4786 if (want_value
&& TREE_THIS_VOLATILE (*to_p
))
4787 *from_p
= get_initialized_tmp_var (*from_p
, pre_p
, post_p
);
4789 if (TREE_CODE (*from_p
) == CALL_EXPR
)
4791 /* Since the RHS is a CALL_EXPR, we need to create a GIMPLE_CALL
4792 instead of a GIMPLE_ASSIGN. */
4794 if (CALL_EXPR_FN (*from_p
) == NULL_TREE
)
4796 /* Gimplify internal functions created in the FEs. */
4797 int nargs
= call_expr_nargs (*from_p
), i
;
4798 enum internal_fn ifn
= CALL_EXPR_IFN (*from_p
);
4799 auto_vec
<tree
> vargs (nargs
);
4801 for (i
= 0; i
< nargs
; i
++)
4803 gimplify_arg (&CALL_EXPR_ARG (*from_p
, i
), pre_p
,
4804 EXPR_LOCATION (*from_p
));
4805 vargs
.quick_push (CALL_EXPR_ARG (*from_p
, i
));
4807 call_stmt
= gimple_build_call_internal_vec (ifn
, vargs
);
4808 gimple_set_location (call_stmt
, EXPR_LOCATION (*expr_p
));
4812 tree fnptrtype
= TREE_TYPE (CALL_EXPR_FN (*from_p
));
4813 CALL_EXPR_FN (*from_p
) = TREE_OPERAND (CALL_EXPR_FN (*from_p
), 0);
4814 STRIP_USELESS_TYPE_CONVERSION (CALL_EXPR_FN (*from_p
));
4815 tree fndecl
= get_callee_fndecl (*from_p
);
4817 && DECL_BUILT_IN_CLASS (fndecl
) == BUILT_IN_NORMAL
4818 && DECL_FUNCTION_CODE (fndecl
) == BUILT_IN_EXPECT
4819 && call_expr_nargs (*from_p
) == 3)
4820 call_stmt
= gimple_build_call_internal (IFN_BUILTIN_EXPECT
, 3,
4821 CALL_EXPR_ARG (*from_p
, 0),
4822 CALL_EXPR_ARG (*from_p
, 1),
4823 CALL_EXPR_ARG (*from_p
, 2));
4826 call_stmt
= gimple_build_call_from_tree (*from_p
);
4827 gimple_call_set_fntype (call_stmt
, TREE_TYPE (fnptrtype
));
4830 notice_special_calls (call_stmt
);
4831 if (!gimple_call_noreturn_p (call_stmt
))
4832 gimple_call_set_lhs (call_stmt
, *to_p
);
4837 assign
= gimple_build_assign (*to_p
, *from_p
);
4838 gimple_set_location (assign
, EXPR_LOCATION (*expr_p
));
4841 if (gimplify_ctxp
->into_ssa
&& is_gimple_reg (*to_p
))
4843 /* We should have got an SSA name from the start. */
4844 gcc_assert (TREE_CODE (*to_p
) == SSA_NAME
);
4847 gimplify_seq_add_stmt (pre_p
, assign
);
4848 gsi
= gsi_last (*pre_p
);
4849 maybe_fold_stmt (&gsi
);
4853 *expr_p
= TREE_THIS_VOLATILE (*to_p
) ? *from_p
: unshare_expr (*to_p
);
4862 /* Gimplify a comparison between two variable-sized objects. Do this
4863 with a call to BUILT_IN_MEMCMP. */
4865 static enum gimplify_status
4866 gimplify_variable_sized_compare (tree
*expr_p
)
4868 location_t loc
= EXPR_LOCATION (*expr_p
);
4869 tree op0
= TREE_OPERAND (*expr_p
, 0);
4870 tree op1
= TREE_OPERAND (*expr_p
, 1);
4871 tree t
, arg
, dest
, src
, expr
;
4873 arg
= TYPE_SIZE_UNIT (TREE_TYPE (op0
));
4874 arg
= unshare_expr (arg
);
4875 arg
= SUBSTITUTE_PLACEHOLDER_IN_EXPR (arg
, op0
);
4876 src
= build_fold_addr_expr_loc (loc
, op1
);
4877 dest
= build_fold_addr_expr_loc (loc
, op0
);
4878 t
= builtin_decl_implicit (BUILT_IN_MEMCMP
);
4879 t
= build_call_expr_loc (loc
, t
, 3, dest
, src
, arg
);
4882 = build2 (TREE_CODE (*expr_p
), TREE_TYPE (*expr_p
), t
, integer_zero_node
);
4883 SET_EXPR_LOCATION (expr
, loc
);
4889 /* Gimplify a comparison between two aggregate objects of integral scalar
4890 mode as a comparison between the bitwise equivalent scalar values. */
4892 static enum gimplify_status
4893 gimplify_scalar_mode_aggregate_compare (tree
*expr_p
)
4895 location_t loc
= EXPR_LOCATION (*expr_p
);
4896 tree op0
= TREE_OPERAND (*expr_p
, 0);
4897 tree op1
= TREE_OPERAND (*expr_p
, 1);
4899 tree type
= TREE_TYPE (op0
);
4900 tree scalar_type
= lang_hooks
.types
.type_for_mode (TYPE_MODE (type
), 1);
4902 op0
= fold_build1_loc (loc
, VIEW_CONVERT_EXPR
, scalar_type
, op0
);
4903 op1
= fold_build1_loc (loc
, VIEW_CONVERT_EXPR
, scalar_type
, op1
);
4906 = fold_build2_loc (loc
, TREE_CODE (*expr_p
), TREE_TYPE (*expr_p
), op0
, op1
);
4911 /* Gimplify an expression sequence. This function gimplifies each
4912 expression and rewrites the original expression with the last
4913 expression of the sequence in GIMPLE form.
4915 PRE_P points to the list where the side effects for all the
4916 expressions in the sequence will be emitted.
4918 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
4920 static enum gimplify_status
4921 gimplify_compound_expr (tree
*expr_p
, gimple_seq
*pre_p
, bool want_value
)
4927 tree
*sub_p
= &TREE_OPERAND (t
, 0);
4929 if (TREE_CODE (*sub_p
) == COMPOUND_EXPR
)
4930 gimplify_compound_expr (sub_p
, pre_p
, false);
4932 gimplify_stmt (sub_p
, pre_p
);
4934 t
= TREE_OPERAND (t
, 1);
4936 while (TREE_CODE (t
) == COMPOUND_EXPR
);
4943 gimplify_stmt (expr_p
, pre_p
);
4948 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
4949 gimplify. After gimplification, EXPR_P will point to a new temporary
4950 that holds the original value of the SAVE_EXPR node.
4952 PRE_P points to the list where side effects that must happen before
4953 *EXPR_P should be stored. */
4955 static enum gimplify_status
4956 gimplify_save_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
4958 enum gimplify_status ret
= GS_ALL_DONE
;
4961 gcc_assert (TREE_CODE (*expr_p
) == SAVE_EXPR
);
4962 val
= TREE_OPERAND (*expr_p
, 0);
4964 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
4965 if (!SAVE_EXPR_RESOLVED_P (*expr_p
))
4967 /* The operand may be a void-valued expression such as SAVE_EXPRs
4968 generated by the Java frontend for class initialization. It is
4969 being executed only for its side-effects. */
4970 if (TREE_TYPE (val
) == void_type_node
)
4972 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
4973 is_gimple_stmt
, fb_none
);
4977 val
= get_initialized_tmp_var (val
, pre_p
, post_p
);
4979 TREE_OPERAND (*expr_p
, 0) = val
;
4980 SAVE_EXPR_RESOLVED_P (*expr_p
) = 1;
4988 /* Rewrite the ADDR_EXPR node pointed to by EXPR_P
4995 PRE_P points to the list where side effects that must happen before
4996 *EXPR_P should be stored.
4998 POST_P points to the list where side effects that must happen after
4999 *EXPR_P should be stored. */
5001 static enum gimplify_status
5002 gimplify_addr_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
5004 tree expr
= *expr_p
;
5005 tree op0
= TREE_OPERAND (expr
, 0);
5006 enum gimplify_status ret
;
5007 location_t loc
= EXPR_LOCATION (*expr_p
);
5009 switch (TREE_CODE (op0
))
5013 /* Check if we are dealing with an expression of the form '&*ptr'.
5014 While the front end folds away '&*ptr' into 'ptr', these
5015 expressions may be generated internally by the compiler (e.g.,
5016 builtins like __builtin_va_end). */
5017 /* Caution: the silent array decomposition semantics we allow for
5018 ADDR_EXPR means we can't always discard the pair. */
5019 /* Gimplification of the ADDR_EXPR operand may drop
5020 cv-qualification conversions, so make sure we add them if
5023 tree op00
= TREE_OPERAND (op0
, 0);
5024 tree t_expr
= TREE_TYPE (expr
);
5025 tree t_op00
= TREE_TYPE (op00
);
5027 if (!useless_type_conversion_p (t_expr
, t_op00
))
5028 op00
= fold_convert_loc (loc
, TREE_TYPE (expr
), op00
);
5034 case VIEW_CONVERT_EXPR
:
5035 /* Take the address of our operand and then convert it to the type of
5038 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
5039 all clear. The impact of this transformation is even less clear. */
5041 /* If the operand is a useless conversion, look through it. Doing so
5042 guarantees that the ADDR_EXPR and its operand will remain of the
5044 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0
, 0)))
5045 op0
= TREE_OPERAND (op0
, 0);
5047 *expr_p
= fold_convert_loc (loc
, TREE_TYPE (expr
),
5048 build_fold_addr_expr_loc (loc
,
5049 TREE_OPERAND (op0
, 0)));
5054 if (integer_zerop (TREE_OPERAND (op0
, 1)))
5055 goto do_indirect_ref
;
5057 /* ... fall through ... */
5060 /* If we see a call to a declared builtin or see its address
5061 being taken (we can unify those cases here) then we can mark
5062 the builtin for implicit generation by GCC. */
5063 if (TREE_CODE (op0
) == FUNCTION_DECL
5064 && DECL_BUILT_IN_CLASS (op0
) == BUILT_IN_NORMAL
5065 && builtin_decl_declared_p (DECL_FUNCTION_CODE (op0
)))
5066 set_builtin_decl_implicit_p (DECL_FUNCTION_CODE (op0
), true);
5068 /* We use fb_either here because the C frontend sometimes takes
5069 the address of a call that returns a struct; see
5070 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
5071 the implied temporary explicit. */
5073 /* Make the operand addressable. */
5074 ret
= gimplify_expr (&TREE_OPERAND (expr
, 0), pre_p
, post_p
,
5075 is_gimple_addressable
, fb_either
);
5076 if (ret
== GS_ERROR
)
5079 /* Then mark it. Beware that it may not be possible to do so directly
5080 if a temporary has been created by the gimplification. */
5081 prepare_gimple_addressable (&TREE_OPERAND (expr
, 0), pre_p
);
5083 op0
= TREE_OPERAND (expr
, 0);
5085 /* For various reasons, the gimplification of the expression
5086 may have made a new INDIRECT_REF. */
5087 if (TREE_CODE (op0
) == INDIRECT_REF
)
5088 goto do_indirect_ref
;
5090 mark_addressable (TREE_OPERAND (expr
, 0));
5092 /* The FEs may end up building ADDR_EXPRs early on a decl with
5093 an incomplete type. Re-build ADDR_EXPRs in canonical form
5095 if (!types_compatible_p (TREE_TYPE (op0
), TREE_TYPE (TREE_TYPE (expr
))))
5096 *expr_p
= build_fold_addr_expr (op0
);
5098 /* Make sure TREE_CONSTANT and TREE_SIDE_EFFECTS are set properly. */
5099 recompute_tree_invariant_for_addr_expr (*expr_p
);
5101 /* If we re-built the ADDR_EXPR add a conversion to the original type
5103 if (!useless_type_conversion_p (TREE_TYPE (expr
), TREE_TYPE (*expr_p
)))
5104 *expr_p
= fold_convert (TREE_TYPE (expr
), *expr_p
);
5112 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
5113 value; output operands should be a gimple lvalue. */
5115 static enum gimplify_status
5116 gimplify_asm_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
5120 const char **oconstraints
;
5123 const char *constraint
;
5124 bool allows_mem
, allows_reg
, is_inout
;
5125 enum gimplify_status ret
, tret
;
5127 vec
<tree
, va_gc
> *inputs
;
5128 vec
<tree
, va_gc
> *outputs
;
5129 vec
<tree
, va_gc
> *clobbers
;
5130 vec
<tree
, va_gc
> *labels
;
5134 noutputs
= list_length (ASM_OUTPUTS (expr
));
5135 oconstraints
= (const char **) alloca ((noutputs
) * sizeof (const char *));
5143 link_next
= NULL_TREE
;
5144 for (i
= 0, link
= ASM_OUTPUTS (expr
); link
; ++i
, link
= link_next
)
5147 size_t constraint_len
;
5149 link_next
= TREE_CHAIN (link
);
5153 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link
)));
5154 constraint_len
= strlen (constraint
);
5155 if (constraint_len
== 0)
5158 ok
= parse_output_constraint (&constraint
, i
, 0, 0,
5159 &allows_mem
, &allows_reg
, &is_inout
);
5166 if (!allows_reg
&& allows_mem
)
5167 mark_addressable (TREE_VALUE (link
));
5169 tret
= gimplify_expr (&TREE_VALUE (link
), pre_p
, post_p
,
5170 is_inout
? is_gimple_min_lval
: is_gimple_lvalue
,
5171 fb_lvalue
| fb_mayfail
);
5172 if (tret
== GS_ERROR
)
5174 error ("invalid lvalue in asm output %d", i
);
5178 vec_safe_push (outputs
, link
);
5179 TREE_CHAIN (link
) = NULL_TREE
;
5183 /* An input/output operand. To give the optimizers more
5184 flexibility, split it into separate input and output
5189 /* Turn the in/out constraint into an output constraint. */
5190 char *p
= xstrdup (constraint
);
5192 TREE_VALUE (TREE_PURPOSE (link
)) = build_string (constraint_len
, p
);
5194 /* And add a matching input constraint. */
5197 sprintf (buf
, "%d", i
);
5199 /* If there are multiple alternatives in the constraint,
5200 handle each of them individually. Those that allow register
5201 will be replaced with operand number, the others will stay
5203 if (strchr (p
, ',') != NULL
)
5205 size_t len
= 0, buflen
= strlen (buf
);
5206 char *beg
, *end
, *str
, *dst
;
5210 end
= strchr (beg
, ',');
5212 end
= strchr (beg
, '\0');
5213 if ((size_t) (end
- beg
) < buflen
)
5216 len
+= end
- beg
+ 1;
5223 str
= (char *) alloca (len
);
5224 for (beg
= p
+ 1, dst
= str
;;)
5227 bool mem_p
, reg_p
, inout_p
;
5229 end
= strchr (beg
, ',');
5234 parse_output_constraint (&tem
, i
, 0, 0,
5235 &mem_p
, ®_p
, &inout_p
);
5240 memcpy (dst
, buf
, buflen
);
5249 memcpy (dst
, beg
, len
);
5258 input
= build_string (dst
- str
, str
);
5261 input
= build_string (strlen (buf
), buf
);
5264 input
= build_string (constraint_len
- 1, constraint
+ 1);
5268 input
= build_tree_list (build_tree_list (NULL_TREE
, input
),
5269 unshare_expr (TREE_VALUE (link
)));
5270 ASM_INPUTS (expr
) = chainon (ASM_INPUTS (expr
), input
);
5274 link_next
= NULL_TREE
;
5275 for (link
= ASM_INPUTS (expr
); link
; ++i
, link
= link_next
)
5277 link_next
= TREE_CHAIN (link
);
5278 constraint
= TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link
)));
5279 parse_input_constraint (&constraint
, 0, 0, noutputs
, 0,
5280 oconstraints
, &allows_mem
, &allows_reg
);
5282 /* If we can't make copies, we can only accept memory. */
5283 if (TREE_ADDRESSABLE (TREE_TYPE (TREE_VALUE (link
))))
5289 error ("impossible constraint in %<asm%>");
5290 error ("non-memory input %d must stay in memory", i
);
5295 /* If the operand is a memory input, it should be an lvalue. */
5296 if (!allows_reg
&& allows_mem
)
5298 tree inputv
= TREE_VALUE (link
);
5299 STRIP_NOPS (inputv
);
5300 if (TREE_CODE (inputv
) == PREDECREMENT_EXPR
5301 || TREE_CODE (inputv
) == PREINCREMENT_EXPR
5302 || TREE_CODE (inputv
) == POSTDECREMENT_EXPR
5303 || TREE_CODE (inputv
) == POSTINCREMENT_EXPR
5304 || TREE_CODE (inputv
) == MODIFY_EXPR
)
5305 TREE_VALUE (link
) = error_mark_node
;
5306 tret
= gimplify_expr (&TREE_VALUE (link
), pre_p
, post_p
,
5307 is_gimple_lvalue
, fb_lvalue
| fb_mayfail
);
5308 mark_addressable (TREE_VALUE (link
));
5309 if (tret
== GS_ERROR
)
5311 if (EXPR_HAS_LOCATION (TREE_VALUE (link
)))
5312 input_location
= EXPR_LOCATION (TREE_VALUE (link
));
5313 error ("memory input %d is not directly addressable", i
);
5319 tret
= gimplify_expr (&TREE_VALUE (link
), pre_p
, post_p
,
5320 is_gimple_asm_val
, fb_rvalue
);
5321 if (tret
== GS_ERROR
)
5325 TREE_CHAIN (link
) = NULL_TREE
;
5326 vec_safe_push (inputs
, link
);
5329 link_next
= NULL_TREE
;
5330 for (link
= ASM_CLOBBERS (expr
); link
; ++i
, link
= link_next
)
5332 link_next
= TREE_CHAIN (link
);
5333 TREE_CHAIN (link
) = NULL_TREE
;
5334 vec_safe_push (clobbers
, link
);
5337 link_next
= NULL_TREE
;
5338 for (link
= ASM_LABELS (expr
); link
; ++i
, link
= link_next
)
5340 link_next
= TREE_CHAIN (link
);
5341 TREE_CHAIN (link
) = NULL_TREE
;
5342 vec_safe_push (labels
, link
);
5345 /* Do not add ASMs with errors to the gimple IL stream. */
5346 if (ret
!= GS_ERROR
)
5348 stmt
= gimple_build_asm_vec (TREE_STRING_POINTER (ASM_STRING (expr
)),
5349 inputs
, outputs
, clobbers
, labels
);
5351 gimple_asm_set_volatile (stmt
, ASM_VOLATILE_P (expr
) || noutputs
== 0);
5352 gimple_asm_set_input (stmt
, ASM_INPUT_P (expr
));
5354 gimplify_seq_add_stmt (pre_p
, stmt
);
5360 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
5361 GIMPLE_WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
5362 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
5363 return to this function.
5365 FIXME should we complexify the prequeue handling instead? Or use flags
5366 for all the cleanups and let the optimizer tighten them up? The current
5367 code seems pretty fragile; it will break on a cleanup within any
5368 non-conditional nesting. But any such nesting would be broken, anyway;
5369 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
5370 and continues out of it. We can do that at the RTL level, though, so
5371 having an optimizer to tighten up try/finally regions would be a Good
5374 static enum gimplify_status
5375 gimplify_cleanup_point_expr (tree
*expr_p
, gimple_seq
*pre_p
)
5377 gimple_stmt_iterator iter
;
5378 gimple_seq body_sequence
= NULL
;
5380 tree temp
= voidify_wrapper_expr (*expr_p
, NULL
);
5382 /* We only care about the number of conditions between the innermost
5383 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
5384 any cleanups collected outside the CLEANUP_POINT_EXPR. */
5385 int old_conds
= gimplify_ctxp
->conditions
;
5386 gimple_seq old_cleanups
= gimplify_ctxp
->conditional_cleanups
;
5387 bool old_in_cleanup_point_expr
= gimplify_ctxp
->in_cleanup_point_expr
;
5388 gimplify_ctxp
->conditions
= 0;
5389 gimplify_ctxp
->conditional_cleanups
= NULL
;
5390 gimplify_ctxp
->in_cleanup_point_expr
= true;
5392 gimplify_stmt (&TREE_OPERAND (*expr_p
, 0), &body_sequence
);
5394 gimplify_ctxp
->conditions
= old_conds
;
5395 gimplify_ctxp
->conditional_cleanups
= old_cleanups
;
5396 gimplify_ctxp
->in_cleanup_point_expr
= old_in_cleanup_point_expr
;
5398 for (iter
= gsi_start (body_sequence
); !gsi_end_p (iter
); )
5400 gimple
*wce
= gsi_stmt (iter
);
5402 if (gimple_code (wce
) == GIMPLE_WITH_CLEANUP_EXPR
)
5404 if (gsi_one_before_end_p (iter
))
5406 /* Note that gsi_insert_seq_before and gsi_remove do not
5407 scan operands, unlike some other sequence mutators. */
5408 if (!gimple_wce_cleanup_eh_only (wce
))
5409 gsi_insert_seq_before_without_update (&iter
,
5410 gimple_wce_cleanup (wce
),
5412 gsi_remove (&iter
, true);
5419 enum gimple_try_flags kind
;
5421 if (gimple_wce_cleanup_eh_only (wce
))
5422 kind
= GIMPLE_TRY_CATCH
;
5424 kind
= GIMPLE_TRY_FINALLY
;
5425 seq
= gsi_split_seq_after (iter
);
5427 gtry
= gimple_build_try (seq
, gimple_wce_cleanup (wce
), kind
);
5428 /* Do not use gsi_replace here, as it may scan operands.
5429 We want to do a simple structural modification only. */
5430 gsi_set_stmt (&iter
, gtry
);
5431 iter
= gsi_start (gtry
->eval
);
5438 gimplify_seq_add_seq (pre_p
, body_sequence
);
5451 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
5452 is the cleanup action required. EH_ONLY is true if the cleanup should
5453 only be executed if an exception is thrown, not on normal exit. */
5456 gimple_push_cleanup (tree var
, tree cleanup
, bool eh_only
, gimple_seq
*pre_p
)
5459 gimple_seq cleanup_stmts
= NULL
;
5461 /* Errors can result in improperly nested cleanups. Which results in
5462 confusion when trying to resolve the GIMPLE_WITH_CLEANUP_EXPR. */
5466 if (gimple_conditional_context ())
5468 /* If we're in a conditional context, this is more complex. We only
5469 want to run the cleanup if we actually ran the initialization that
5470 necessitates it, but we want to run it after the end of the
5471 conditional context. So we wrap the try/finally around the
5472 condition and use a flag to determine whether or not to actually
5473 run the destructor. Thus
5477 becomes (approximately)
5481 if (test) { A::A(temp); flag = 1; val = f(temp); }
5484 if (flag) A::~A(temp);
5488 tree flag
= create_tmp_var (boolean_type_node
, "cleanup");
5489 gassign
*ffalse
= gimple_build_assign (flag
, boolean_false_node
);
5490 gassign
*ftrue
= gimple_build_assign (flag
, boolean_true_node
);
5492 cleanup
= build3 (COND_EXPR
, void_type_node
, flag
, cleanup
, NULL
);
5493 gimplify_stmt (&cleanup
, &cleanup_stmts
);
5494 wce
= gimple_build_wce (cleanup_stmts
);
5496 gimplify_seq_add_stmt (&gimplify_ctxp
->conditional_cleanups
, ffalse
);
5497 gimplify_seq_add_stmt (&gimplify_ctxp
->conditional_cleanups
, wce
);
5498 gimplify_seq_add_stmt (pre_p
, ftrue
);
5500 /* Because of this manipulation, and the EH edges that jump
5501 threading cannot redirect, the temporary (VAR) will appear
5502 to be used uninitialized. Don't warn. */
5503 TREE_NO_WARNING (var
) = 1;
5507 gimplify_stmt (&cleanup
, &cleanup_stmts
);
5508 wce
= gimple_build_wce (cleanup_stmts
);
5509 gimple_wce_set_cleanup_eh_only (wce
, eh_only
);
5510 gimplify_seq_add_stmt (pre_p
, wce
);
5514 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
5516 static enum gimplify_status
5517 gimplify_target_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
)
5519 tree targ
= *expr_p
;
5520 tree temp
= TARGET_EXPR_SLOT (targ
);
5521 tree init
= TARGET_EXPR_INITIAL (targ
);
5522 enum gimplify_status ret
;
5526 tree cleanup
= NULL_TREE
;
5528 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
5529 to the temps list. Handle also variable length TARGET_EXPRs. */
5530 if (TREE_CODE (DECL_SIZE (temp
)) != INTEGER_CST
)
5532 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (temp
)))
5533 gimplify_type_sizes (TREE_TYPE (temp
), pre_p
);
5534 gimplify_vla_decl (temp
, pre_p
);
5537 gimple_add_tmp_var (temp
);
5539 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
5540 expression is supposed to initialize the slot. */
5541 if (VOID_TYPE_P (TREE_TYPE (init
)))
5542 ret
= gimplify_expr (&init
, pre_p
, post_p
, is_gimple_stmt
, fb_none
);
5545 tree init_expr
= build2 (INIT_EXPR
, void_type_node
, temp
, init
);
5547 ret
= gimplify_expr (&init
, pre_p
, post_p
, is_gimple_stmt
, fb_none
);
5549 ggc_free (init_expr
);
5551 if (ret
== GS_ERROR
)
5553 /* PR c++/28266 Make sure this is expanded only once. */
5554 TARGET_EXPR_INITIAL (targ
) = NULL_TREE
;
5558 gimplify_and_add (init
, pre_p
);
5560 /* If needed, push the cleanup for the temp. */
5561 if (TARGET_EXPR_CLEANUP (targ
))
5563 if (CLEANUP_EH_ONLY (targ
))
5564 gimple_push_cleanup (temp
, TARGET_EXPR_CLEANUP (targ
),
5565 CLEANUP_EH_ONLY (targ
), pre_p
);
5567 cleanup
= TARGET_EXPR_CLEANUP (targ
);
5570 /* Add a clobber for the temporary going out of scope, like
5571 gimplify_bind_expr. */
5572 if (gimplify_ctxp
->in_cleanup_point_expr
5573 && needs_to_live_in_memory (temp
)
5574 && flag_stack_reuse
== SR_ALL
)
5576 tree clobber
= build_constructor (TREE_TYPE (temp
),
5578 TREE_THIS_VOLATILE (clobber
) = true;
5579 clobber
= build2 (MODIFY_EXPR
, TREE_TYPE (temp
), temp
, clobber
);
5581 cleanup
= build2 (COMPOUND_EXPR
, void_type_node
, cleanup
,
5588 gimple_push_cleanup (temp
, cleanup
, false, pre_p
);
5590 /* Only expand this once. */
5591 TREE_OPERAND (targ
, 3) = init
;
5592 TARGET_EXPR_INITIAL (targ
) = NULL_TREE
;
5595 /* We should have expanded this before. */
5596 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp
));
5602 /* Gimplification of expression trees. */
5604 /* Gimplify an expression which appears at statement context. The
5605 corresponding GIMPLE statements are added to *SEQ_P. If *SEQ_P is
5606 NULL, a new sequence is allocated.
5608 Return true if we actually added a statement to the queue. */
5611 gimplify_stmt (tree
*stmt_p
, gimple_seq
*seq_p
)
5613 gimple_seq_node last
;
5615 last
= gimple_seq_last (*seq_p
);
5616 gimplify_expr (stmt_p
, seq_p
, NULL
, is_gimple_stmt
, fb_none
);
5617 return last
!= gimple_seq_last (*seq_p
);
5620 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
5621 to CTX. If entries already exist, force them to be some flavor of private.
5622 If there is no enclosing parallel, do nothing. */
5625 omp_firstprivatize_variable (struct gimplify_omp_ctx
*ctx
, tree decl
)
5629 if (decl
== NULL
|| !DECL_P (decl
) || ctx
->region_type
== ORT_NONE
)
5634 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
5637 if (n
->value
& GOVD_SHARED
)
5638 n
->value
= GOVD_FIRSTPRIVATE
| (n
->value
& GOVD_SEEN
);
5639 else if (n
->value
& GOVD_MAP
)
5640 n
->value
|= GOVD_MAP_TO_ONLY
;
5644 else if ((ctx
->region_type
& ORT_TARGET
) != 0)
5646 if (ctx
->target_map_scalars_firstprivate
)
5647 omp_add_variable (ctx
, decl
, GOVD_FIRSTPRIVATE
);
5649 omp_add_variable (ctx
, decl
, GOVD_MAP
| GOVD_MAP_TO_ONLY
);
5651 else if (ctx
->region_type
!= ORT_WORKSHARE
5652 && ctx
->region_type
!= ORT_SIMD
5653 && ctx
->region_type
!= ORT_ACC
5654 && !(ctx
->region_type
& ORT_TARGET_DATA
))
5655 omp_add_variable (ctx
, decl
, GOVD_FIRSTPRIVATE
);
5657 ctx
= ctx
->outer_context
;
5662 /* Similarly for each of the type sizes of TYPE. */
5665 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx
*ctx
, tree type
)
5667 if (type
== NULL
|| type
== error_mark_node
)
5669 type
= TYPE_MAIN_VARIANT (type
);
5671 if (ctx
->privatized_types
->add (type
))
5674 switch (TREE_CODE (type
))
5680 case FIXED_POINT_TYPE
:
5681 omp_firstprivatize_variable (ctx
, TYPE_MIN_VALUE (type
));
5682 omp_firstprivatize_variable (ctx
, TYPE_MAX_VALUE (type
));
5686 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (type
));
5687 omp_firstprivatize_type_sizes (ctx
, TYPE_DOMAIN (type
));
5692 case QUAL_UNION_TYPE
:
5695 for (field
= TYPE_FIELDS (type
); field
; field
= DECL_CHAIN (field
))
5696 if (TREE_CODE (field
) == FIELD_DECL
)
5698 omp_firstprivatize_variable (ctx
, DECL_FIELD_OFFSET (field
));
5699 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (field
));
5705 case REFERENCE_TYPE
:
5706 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (type
));
5713 omp_firstprivatize_variable (ctx
, TYPE_SIZE (type
));
5714 omp_firstprivatize_variable (ctx
, TYPE_SIZE_UNIT (type
));
5715 lang_hooks
.types
.omp_firstprivatize_type_sizes (ctx
, type
);
5718 /* Add an entry for DECL in the OMP context CTX with FLAGS. */
5721 omp_add_variable (struct gimplify_omp_ctx
*ctx
, tree decl
, unsigned int flags
)
5724 unsigned int nflags
;
5727 if (error_operand_p (decl
) || ctx
->region_type
== ORT_NONE
)
5730 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
5731 there are constructors involved somewhere. */
5732 if (TREE_ADDRESSABLE (TREE_TYPE (decl
))
5733 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl
)))
5736 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
5737 if (n
!= NULL
&& (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
5739 /* We shouldn't be re-adding the decl with the same data
5741 gcc_assert ((n
->value
& GOVD_DATA_SHARE_CLASS
& flags
) == 0);
5742 nflags
= n
->value
| flags
;
5743 /* The only combination of data sharing classes we should see is
5744 FIRSTPRIVATE and LASTPRIVATE. However, OpenACC permits
5745 reduction variables to be used in data sharing clauses. */
5746 gcc_assert ((ctx
->region_type
& ORT_ACC
) != 0
5747 || ((nflags
& GOVD_DATA_SHARE_CLASS
)
5748 == (GOVD_FIRSTPRIVATE
| GOVD_LASTPRIVATE
))
5749 || (flags
& GOVD_DATA_SHARE_CLASS
) == 0);
5754 /* When adding a variable-sized variable, we have to handle all sorts
5755 of additional bits of data: the pointer replacement variable, and
5756 the parameters of the type. */
5757 if (DECL_SIZE (decl
) && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
5759 /* Add the pointer replacement variable as PRIVATE if the variable
5760 replacement is private, else FIRSTPRIVATE since we'll need the
5761 address of the original variable either for SHARED, or for the
5762 copy into or out of the context. */
5763 if (!(flags
& GOVD_LOCAL
))
5765 if (flags
& GOVD_MAP
)
5766 nflags
= GOVD_MAP
| GOVD_MAP_TO_ONLY
| GOVD_EXPLICIT
;
5767 else if (flags
& GOVD_PRIVATE
)
5768 nflags
= GOVD_PRIVATE
;
5769 else if ((ctx
->region_type
& (ORT_TARGET
| ORT_TARGET_DATA
)) != 0
5770 && (flags
& GOVD_FIRSTPRIVATE
))
5771 nflags
= GOVD_PRIVATE
| GOVD_EXPLICIT
;
5773 nflags
= GOVD_FIRSTPRIVATE
;
5774 nflags
|= flags
& GOVD_SEEN
;
5775 t
= DECL_VALUE_EXPR (decl
);
5776 gcc_assert (TREE_CODE (t
) == INDIRECT_REF
);
5777 t
= TREE_OPERAND (t
, 0);
5778 gcc_assert (DECL_P (t
));
5779 omp_add_variable (ctx
, t
, nflags
);
5782 /* Add all of the variable and type parameters (which should have
5783 been gimplified to a formal temporary) as FIRSTPRIVATE. */
5784 omp_firstprivatize_variable (ctx
, DECL_SIZE_UNIT (decl
));
5785 omp_firstprivatize_variable (ctx
, DECL_SIZE (decl
));
5786 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (decl
));
5788 /* The variable-sized variable itself is never SHARED, only some form
5789 of PRIVATE. The sharing would take place via the pointer variable
5790 which we remapped above. */
5791 if (flags
& GOVD_SHARED
)
5792 flags
= GOVD_PRIVATE
| GOVD_DEBUG_PRIVATE
5793 | (flags
& (GOVD_SEEN
| GOVD_EXPLICIT
));
5795 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
5796 alloca statement we generate for the variable, so make sure it
5797 is available. This isn't automatically needed for the SHARED
5798 case, since we won't be allocating local storage then.
5799 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
5800 in this case omp_notice_variable will be called later
5801 on when it is gimplified. */
5802 else if (! (flags
& (GOVD_LOCAL
| GOVD_MAP
))
5803 && DECL_P (TYPE_SIZE_UNIT (TREE_TYPE (decl
))))
5804 omp_notice_variable (ctx
, TYPE_SIZE_UNIT (TREE_TYPE (decl
)), true);
5806 else if ((flags
& (GOVD_MAP
| GOVD_LOCAL
)) == 0
5807 && lang_hooks
.decls
.omp_privatize_by_reference (decl
))
5809 omp_firstprivatize_type_sizes (ctx
, TREE_TYPE (decl
));
5811 /* Similar to the direct variable sized case above, we'll need the
5812 size of references being privatized. */
5813 if ((flags
& GOVD_SHARED
) == 0)
5815 t
= TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
)));
5817 omp_notice_variable (ctx
, t
, true);
5824 splay_tree_insert (ctx
->variables
, (splay_tree_key
)decl
, flags
);
5827 /* Notice a threadprivate variable DECL used in OMP context CTX.
5828 This just prints out diagnostics about threadprivate variable uses
5829 in untied tasks. If DECL2 is non-NULL, prevent this warning
5830 on that variable. */
5833 omp_notice_threadprivate_variable (struct gimplify_omp_ctx
*ctx
, tree decl
,
5837 struct gimplify_omp_ctx
*octx
;
5839 for (octx
= ctx
; octx
; octx
= octx
->outer_context
)
5840 if ((octx
->region_type
& ORT_TARGET
) != 0)
5842 n
= splay_tree_lookup (octx
->variables
, (splay_tree_key
)decl
);
5845 error ("threadprivate variable %qE used in target region",
5847 error_at (octx
->location
, "enclosing target region");
5848 splay_tree_insert (octx
->variables
, (splay_tree_key
)decl
, 0);
5851 splay_tree_insert (octx
->variables
, (splay_tree_key
)decl2
, 0);
5854 if (ctx
->region_type
!= ORT_UNTIED_TASK
)
5856 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
5859 error ("threadprivate variable %qE used in untied task",
5861 error_at (ctx
->location
, "enclosing task");
5862 splay_tree_insert (ctx
->variables
, (splay_tree_key
)decl
, 0);
5865 splay_tree_insert (ctx
->variables
, (splay_tree_key
)decl2
, 0);
5869 /* Return true if global var DECL is device resident. */
5872 device_resident_p (tree decl
)
5874 tree attr
= lookup_attribute ("oacc declare target", DECL_ATTRIBUTES (decl
));
5879 for (tree t
= TREE_VALUE (attr
); t
; t
= TREE_PURPOSE (t
))
5881 tree c
= TREE_VALUE (t
);
5882 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_DEVICE_RESIDENT
)
5889 /* Determine outer default flags for DECL mentioned in an OMP region
5890 but not declared in an enclosing clause.
5892 ??? Some compiler-generated variables (like SAVE_EXPRs) could be
5893 remapped firstprivate instead of shared. To some extent this is
5894 addressed in omp_firstprivatize_type_sizes, but not
5898 omp_default_clause (struct gimplify_omp_ctx
*ctx
, tree decl
,
5899 bool in_code
, unsigned flags
)
5901 enum omp_clause_default_kind default_kind
= ctx
->default_kind
;
5902 enum omp_clause_default_kind kind
;
5904 kind
= lang_hooks
.decls
.omp_predetermined_sharing (decl
);
5905 if (kind
!= OMP_CLAUSE_DEFAULT_UNSPECIFIED
)
5906 default_kind
= kind
;
5908 switch (default_kind
)
5910 case OMP_CLAUSE_DEFAULT_NONE
:
5914 if (ctx
->region_type
& ORT_PARALLEL
)
5916 else if (ctx
->region_type
& ORT_TASK
)
5918 else if (ctx
->region_type
& ORT_TEAMS
)
5923 error ("%qE not specified in enclosing %s",
5924 DECL_NAME (lang_hooks
.decls
.omp_report_decl (decl
)), rtype
);
5925 error_at (ctx
->location
, "enclosing %s", rtype
);
5928 case OMP_CLAUSE_DEFAULT_SHARED
:
5929 flags
|= GOVD_SHARED
;
5931 case OMP_CLAUSE_DEFAULT_PRIVATE
:
5932 flags
|= GOVD_PRIVATE
;
5934 case OMP_CLAUSE_DEFAULT_FIRSTPRIVATE
:
5935 flags
|= GOVD_FIRSTPRIVATE
;
5937 case OMP_CLAUSE_DEFAULT_UNSPECIFIED
:
5938 /* decl will be either GOVD_FIRSTPRIVATE or GOVD_SHARED. */
5939 gcc_assert ((ctx
->region_type
& ORT_TASK
) != 0);
5940 if (struct gimplify_omp_ctx
*octx
= ctx
->outer_context
)
5942 omp_notice_variable (octx
, decl
, in_code
);
5943 for (; octx
; octx
= octx
->outer_context
)
5947 n2
= splay_tree_lookup (octx
->variables
, (splay_tree_key
) decl
);
5948 if ((octx
->region_type
& (ORT_TARGET_DATA
| ORT_TARGET
)) != 0
5949 && (n2
== NULL
|| (n2
->value
& GOVD_DATA_SHARE_CLASS
) == 0))
5951 if (n2
&& (n2
->value
& GOVD_DATA_SHARE_CLASS
) != GOVD_SHARED
)
5953 flags
|= GOVD_FIRSTPRIVATE
;
5956 if ((octx
->region_type
& (ORT_PARALLEL
| ORT_TEAMS
)) != 0)
5958 flags
|= GOVD_SHARED
;
5964 if (TREE_CODE (decl
) == PARM_DECL
5965 || (!is_global_var (decl
)
5966 && DECL_CONTEXT (decl
) == current_function_decl
))
5967 flags
|= GOVD_FIRSTPRIVATE
;
5969 flags
|= GOVD_SHARED
;
5981 /* Determine outer default flags for DECL mentioned in an OACC region
5982 but not declared in an enclosing clause. */
5985 oacc_default_clause (struct gimplify_omp_ctx
*ctx
, tree decl
, unsigned flags
)
5988 bool on_device
= false;
5989 tree type
= TREE_TYPE (decl
);
5991 if (lang_hooks
.decls
.omp_privatize_by_reference (decl
))
5992 type
= TREE_TYPE (type
);
5994 if ((ctx
->region_type
& (ORT_ACC_PARALLEL
| ORT_ACC_KERNELS
)) != 0
5995 && is_global_var (decl
)
5996 && device_resident_p (decl
))
5999 flags
|= GOVD_MAP_TO_ONLY
;
6002 switch (ctx
->region_type
)
6007 case ORT_ACC_KERNELS
:
6008 /* Scalars are default 'copy' under kernels, non-scalars are default
6009 'present_or_copy'. */
6011 if (!AGGREGATE_TYPE_P (type
))
6012 flags
|= GOVD_MAP_FORCE
;
6017 case ORT_ACC_PARALLEL
:
6019 if (on_device
|| AGGREGATE_TYPE_P (type
))
6020 /* Aggregates default to 'present_or_copy'. */
6023 /* Scalars default to 'firstprivate'. */
6024 flags
|= GOVD_FIRSTPRIVATE
;
6030 if (DECL_ARTIFICIAL (decl
))
6031 ; /* We can get compiler-generated decls, and should not complain
6033 else if (ctx
->default_kind
== OMP_CLAUSE_DEFAULT_NONE
)
6035 error ("%qE not specified in enclosing OpenACC %qs construct",
6036 DECL_NAME (lang_hooks
.decls
.omp_report_decl (decl
)), rkind
);
6037 inform (ctx
->location
, "enclosing OpenACC %qs construct", rkind
);
6040 gcc_checking_assert (ctx
->default_kind
== OMP_CLAUSE_DEFAULT_SHARED
);
6045 /* Record the fact that DECL was used within the OMP context CTX.
6046 IN_CODE is true when real code uses DECL, and false when we should
6047 merely emit default(none) errors. Return true if DECL is going to
6048 be remapped and thus DECL shouldn't be gimplified into its
6049 DECL_VALUE_EXPR (if any). */
6052 omp_notice_variable (struct gimplify_omp_ctx
*ctx
, tree decl
, bool in_code
)
6055 unsigned flags
= in_code
? GOVD_SEEN
: 0;
6056 bool ret
= false, shared
;
6058 if (error_operand_p (decl
))
6061 if (ctx
->region_type
== ORT_NONE
)
6062 return lang_hooks
.decls
.omp_disregard_value_expr (decl
, false);
6064 /* Threadprivate variables are predetermined. */
6065 if (is_global_var (decl
))
6067 if (DECL_THREAD_LOCAL_P (decl
))
6068 return omp_notice_threadprivate_variable (ctx
, decl
, NULL_TREE
);
6070 if (DECL_HAS_VALUE_EXPR_P (decl
))
6072 tree value
= get_base_address (DECL_VALUE_EXPR (decl
));
6074 if (value
&& DECL_P (value
) && DECL_THREAD_LOCAL_P (value
))
6075 return omp_notice_threadprivate_variable (ctx
, decl
, value
);
6079 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
6080 if ((ctx
->region_type
& ORT_TARGET
) != 0)
6082 ret
= lang_hooks
.decls
.omp_disregard_value_expr (decl
, true);
6085 unsigned nflags
= flags
;
6086 if (ctx
->target_map_pointers_as_0len_arrays
6087 || ctx
->target_map_scalars_firstprivate
)
6089 bool is_declare_target
= false;
6090 bool is_scalar
= false;
6091 if (is_global_var (decl
)
6092 && varpool_node::get_create (decl
)->offloadable
)
6094 struct gimplify_omp_ctx
*octx
;
6095 for (octx
= ctx
->outer_context
;
6096 octx
; octx
= octx
->outer_context
)
6098 n
= splay_tree_lookup (octx
->variables
,
6099 (splay_tree_key
)decl
);
6101 && (n
->value
& GOVD_DATA_SHARE_CLASS
) != GOVD_SHARED
6102 && (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
6105 is_declare_target
= octx
== NULL
;
6107 if (!is_declare_target
&& ctx
->target_map_scalars_firstprivate
)
6109 tree type
= TREE_TYPE (decl
);
6110 if (TREE_CODE (type
) == REFERENCE_TYPE
)
6111 type
= TREE_TYPE (type
);
6112 if (TREE_CODE (type
) == COMPLEX_TYPE
)
6113 type
= TREE_TYPE (type
);
6114 if (INTEGRAL_TYPE_P (type
)
6115 || SCALAR_FLOAT_TYPE_P (type
)
6116 || TREE_CODE (type
) == POINTER_TYPE
)
6119 if (is_declare_target
)
6121 else if (ctx
->target_map_pointers_as_0len_arrays
6122 && (TREE_CODE (TREE_TYPE (decl
)) == POINTER_TYPE
6123 || (TREE_CODE (TREE_TYPE (decl
)) == REFERENCE_TYPE
6124 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl
)))
6126 nflags
|= GOVD_MAP
| GOVD_MAP_0LEN_ARRAY
;
6128 nflags
|= GOVD_FIRSTPRIVATE
;
6131 struct gimplify_omp_ctx
*octx
= ctx
->outer_context
;
6132 if ((ctx
->region_type
& ORT_ACC
) && octx
)
6134 /* Look in outer OpenACC contexts, to see if there's a
6135 data attribute for this variable. */
6136 omp_notice_variable (octx
, decl
, in_code
);
6138 for (; octx
; octx
= octx
->outer_context
)
6140 if (!(octx
->region_type
& (ORT_TARGET_DATA
| ORT_TARGET
)))
6143 = splay_tree_lookup (octx
->variables
,
6144 (splay_tree_key
) decl
);
6147 if (octx
->region_type
== ORT_ACC_HOST_DATA
)
6148 error ("variable %qE declared in enclosing "
6149 "%<host_data%> region", DECL_NAME (decl
));
6157 tree type
= TREE_TYPE (decl
);
6160 && gimplify_omp_ctxp
->target_firstprivatize_array_bases
6161 && lang_hooks
.decls
.omp_privatize_by_reference (decl
))
6162 type
= TREE_TYPE (type
);
6164 && !lang_hooks
.types
.omp_mappable_type (type
))
6166 error ("%qD referenced in target region does not have "
6167 "a mappable type", decl
);
6168 nflags
|= GOVD_MAP
| GOVD_EXPLICIT
;
6170 else if (nflags
== flags
)
6172 if ((ctx
->region_type
& ORT_ACC
) != 0)
6173 nflags
= oacc_default_clause (ctx
, decl
, flags
);
6179 omp_add_variable (ctx
, decl
, nflags
);
6183 /* If nothing changed, there's nothing left to do. */
6184 if ((n
->value
& flags
) == flags
)
6194 if (ctx
->region_type
== ORT_WORKSHARE
6195 || ctx
->region_type
== ORT_SIMD
6196 || ctx
->region_type
== ORT_ACC
6197 || (ctx
->region_type
& ORT_TARGET_DATA
) != 0)
6200 flags
= omp_default_clause (ctx
, decl
, in_code
, flags
);
6202 if ((flags
& GOVD_PRIVATE
)
6203 && lang_hooks
.decls
.omp_private_outer_ref (decl
))
6204 flags
|= GOVD_PRIVATE_OUTER_REF
;
6206 omp_add_variable (ctx
, decl
, flags
);
6208 shared
= (flags
& GOVD_SHARED
) != 0;
6209 ret
= lang_hooks
.decls
.omp_disregard_value_expr (decl
, shared
);
6213 if ((n
->value
& (GOVD_SEEN
| GOVD_LOCAL
)) == 0
6214 && (flags
& (GOVD_SEEN
| GOVD_LOCAL
)) == GOVD_SEEN
6216 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
6219 tree t
= DECL_VALUE_EXPR (decl
);
6220 gcc_assert (TREE_CODE (t
) == INDIRECT_REF
);
6221 t
= TREE_OPERAND (t
, 0);
6222 gcc_assert (DECL_P (t
));
6223 n2
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) t
);
6224 n2
->value
|= GOVD_SEEN
;
6227 shared
= ((flags
| n
->value
) & GOVD_SHARED
) != 0;
6228 ret
= lang_hooks
.decls
.omp_disregard_value_expr (decl
, shared
);
6230 /* If nothing changed, there's nothing left to do. */
6231 if ((n
->value
& flags
) == flags
)
6237 /* If the variable is private in the current context, then we don't
6238 need to propagate anything to an outer context. */
6239 if ((flags
& GOVD_PRIVATE
) && !(flags
& GOVD_PRIVATE_OUTER_REF
))
6241 if ((flags
& (GOVD_LINEAR
| GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
6242 == (GOVD_LINEAR
| GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
6244 if ((flags
& (GOVD_FIRSTPRIVATE
| GOVD_LASTPRIVATE
6245 | GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
6246 == (GOVD_LASTPRIVATE
| GOVD_LINEAR_LASTPRIVATE_NO_OUTER
))
6248 if (ctx
->outer_context
6249 && omp_notice_variable (ctx
->outer_context
, decl
, in_code
))
6254 /* Verify that DECL is private within CTX. If there's specific information
6255 to the contrary in the innermost scope, generate an error. */
6258 omp_is_private (struct gimplify_omp_ctx
*ctx
, tree decl
, int simd
)
6262 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
6265 if (n
->value
& GOVD_SHARED
)
6267 if (ctx
== gimplify_omp_ctxp
)
6270 error ("iteration variable %qE is predetermined linear",
6273 error ("iteration variable %qE should be private",
6275 n
->value
= GOVD_PRIVATE
;
6281 else if ((n
->value
& GOVD_EXPLICIT
) != 0
6282 && (ctx
== gimplify_omp_ctxp
6283 || (ctx
->region_type
== ORT_COMBINED_PARALLEL
6284 && gimplify_omp_ctxp
->outer_context
== ctx
)))
6286 if ((n
->value
& GOVD_FIRSTPRIVATE
) != 0)
6287 error ("iteration variable %qE should not be firstprivate",
6289 else if ((n
->value
& GOVD_REDUCTION
) != 0)
6290 error ("iteration variable %qE should not be reduction",
6292 else if (simd
== 0 && (n
->value
& GOVD_LINEAR
) != 0)
6293 error ("iteration variable %qE should not be linear",
6295 else if (simd
== 1 && (n
->value
& GOVD_LASTPRIVATE
) != 0)
6296 error ("iteration variable %qE should not be lastprivate",
6298 else if (simd
&& (n
->value
& GOVD_PRIVATE
) != 0)
6299 error ("iteration variable %qE should not be private",
6301 else if (simd
== 2 && (n
->value
& GOVD_LINEAR
) != 0)
6302 error ("iteration variable %qE is predetermined linear",
6305 return (ctx
== gimplify_omp_ctxp
6306 || (ctx
->region_type
== ORT_COMBINED_PARALLEL
6307 && gimplify_omp_ctxp
->outer_context
== ctx
));
6310 if (ctx
->region_type
!= ORT_WORKSHARE
6311 && ctx
->region_type
!= ORT_SIMD
6312 && ctx
->region_type
!= ORT_ACC
)
6314 else if (ctx
->outer_context
)
6315 return omp_is_private (ctx
->outer_context
, decl
, simd
);
6319 /* Return true if DECL is private within a parallel region
6320 that binds to the current construct's context or in parallel
6321 region's REDUCTION clause. */
6324 omp_check_private (struct gimplify_omp_ctx
*ctx
, tree decl
, bool copyprivate
)
6330 ctx
= ctx
->outer_context
;
6333 if (is_global_var (decl
))
6336 /* References might be private, but might be shared too,
6337 when checking for copyprivate, assume they might be
6338 private, otherwise assume they might be shared. */
6342 if (lang_hooks
.decls
.omp_privatize_by_reference (decl
))
6345 /* Treat C++ privatized non-static data members outside
6346 of the privatization the same. */
6347 if (omp_member_access_dummy_var (decl
))
6353 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
6355 if ((ctx
->region_type
& (ORT_TARGET
| ORT_TARGET_DATA
)) != 0
6356 && (n
== NULL
|| (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0))
6361 if ((n
->value
& GOVD_LOCAL
) != 0
6362 && omp_member_access_dummy_var (decl
))
6364 return (n
->value
& GOVD_SHARED
) == 0;
6367 while (ctx
->region_type
== ORT_WORKSHARE
6368 || ctx
->region_type
== ORT_SIMD
6369 || ctx
->region_type
== ORT_ACC
);
6373 /* Return true if the CTX is combined with distribute and thus
6374 lastprivate can't be supported. */
6377 omp_no_lastprivate (struct gimplify_omp_ctx
*ctx
)
6381 if (ctx
->outer_context
== NULL
)
6383 ctx
= ctx
->outer_context
;
6384 switch (ctx
->region_type
)
6387 if (!ctx
->combined_loop
)
6389 if (ctx
->distribute
)
6390 return lang_GNU_Fortran ();
6392 case ORT_COMBINED_PARALLEL
:
6394 case ORT_COMBINED_TEAMS
:
6395 return lang_GNU_Fortran ();
6403 /* Callback for walk_tree to find a DECL_EXPR for the given DECL. */
6406 find_decl_expr (tree
*tp
, int *walk_subtrees
, void *data
)
6410 /* If this node has been visited, unmark it and keep looking. */
6411 if (TREE_CODE (t
) == DECL_EXPR
&& DECL_EXPR_DECL (t
) == (tree
) data
)
6414 if (IS_TYPE_OR_DECL_P (t
))
6419 /* Scan the OMP clauses in *LIST_P, installing mappings into a new
6420 and previous omp contexts. */
6423 gimplify_scan_omp_clauses (tree
*list_p
, gimple_seq
*pre_p
,
6424 enum omp_region_type region_type
,
6425 enum tree_code code
)
6427 struct gimplify_omp_ctx
*ctx
, *outer_ctx
;
6429 hash_map
<tree
, tree
> *struct_map_to_clause
= NULL
;
6430 tree
*prev_list_p
= NULL
;
6432 ctx
= new_omp_context (region_type
);
6433 outer_ctx
= ctx
->outer_context
;
6434 if (code
== OMP_TARGET
&& !lang_GNU_Fortran ())
6436 ctx
->target_map_pointers_as_0len_arrays
= true;
6437 /* FIXME: For Fortran we want to set this too, when
6438 the Fortran FE is updated to OpenMP 4.5. */
6439 ctx
->target_map_scalars_firstprivate
= true;
6441 if (!lang_GNU_Fortran ())
6445 case OMP_TARGET_DATA
:
6446 case OMP_TARGET_ENTER_DATA
:
6447 case OMP_TARGET_EXIT_DATA
:
6448 case OACC_HOST_DATA
:
6449 ctx
->target_firstprivatize_array_bases
= true;
6454 while ((c
= *list_p
) != NULL
)
6456 bool remove
= false;
6457 bool notice_outer
= true;
6458 const char *check_non_private
= NULL
;
6462 switch (OMP_CLAUSE_CODE (c
))
6464 case OMP_CLAUSE_PRIVATE
:
6465 flags
= GOVD_PRIVATE
| GOVD_EXPLICIT
;
6466 if (lang_hooks
.decls
.omp_private_outer_ref (OMP_CLAUSE_DECL (c
)))
6468 flags
|= GOVD_PRIVATE_OUTER_REF
;
6469 OMP_CLAUSE_PRIVATE_OUTER_REF (c
) = 1;
6472 notice_outer
= false;
6474 case OMP_CLAUSE_SHARED
:
6475 flags
= GOVD_SHARED
| GOVD_EXPLICIT
;
6477 case OMP_CLAUSE_FIRSTPRIVATE
:
6478 flags
= GOVD_FIRSTPRIVATE
| GOVD_EXPLICIT
;
6479 check_non_private
= "firstprivate";
6481 case OMP_CLAUSE_LASTPRIVATE
:
6482 flags
= GOVD_LASTPRIVATE
| GOVD_SEEN
| GOVD_EXPLICIT
;
6483 check_non_private
= "lastprivate";
6484 decl
= OMP_CLAUSE_DECL (c
);
6485 if (omp_no_lastprivate (ctx
))
6487 notice_outer
= false;
6488 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
6490 else if (error_operand_p (decl
))
6493 && (outer_ctx
->region_type
== ORT_COMBINED_PARALLEL
6494 || outer_ctx
->region_type
== ORT_COMBINED_TEAMS
)
6495 && splay_tree_lookup (outer_ctx
->variables
,
6496 (splay_tree_key
) decl
) == NULL
)
6498 omp_add_variable (outer_ctx
, decl
, GOVD_SHARED
| GOVD_SEEN
);
6499 if (outer_ctx
->outer_context
)
6500 omp_notice_variable (outer_ctx
->outer_context
, decl
, true);
6503 && (outer_ctx
->region_type
& ORT_TASK
) != 0
6504 && outer_ctx
->combined_loop
6505 && splay_tree_lookup (outer_ctx
->variables
,
6506 (splay_tree_key
) decl
) == NULL
)
6508 omp_add_variable (outer_ctx
, decl
, GOVD_LASTPRIVATE
| GOVD_SEEN
);
6509 if (outer_ctx
->outer_context
)
6510 omp_notice_variable (outer_ctx
->outer_context
, decl
, true);
6513 && (outer_ctx
->region_type
== ORT_WORKSHARE
6514 || outer_ctx
->region_type
== ORT_ACC
)
6515 && outer_ctx
->combined_loop
6516 && splay_tree_lookup (outer_ctx
->variables
,
6517 (splay_tree_key
) decl
) == NULL
6518 && !omp_check_private (outer_ctx
, decl
, false))
6520 omp_add_variable (outer_ctx
, decl
, GOVD_LASTPRIVATE
| GOVD_SEEN
);
6521 if (outer_ctx
->outer_context
6522 && (outer_ctx
->outer_context
->region_type
6523 == ORT_COMBINED_PARALLEL
)
6524 && splay_tree_lookup (outer_ctx
->outer_context
->variables
,
6525 (splay_tree_key
) decl
) == NULL
)
6527 struct gimplify_omp_ctx
*octx
= outer_ctx
->outer_context
;
6528 omp_add_variable (octx
, decl
, GOVD_SHARED
| GOVD_SEEN
);
6529 if (octx
->outer_context
)
6530 omp_notice_variable (octx
->outer_context
, decl
, true);
6532 else if (outer_ctx
->outer_context
)
6533 omp_notice_variable (outer_ctx
->outer_context
, decl
, true);
6536 case OMP_CLAUSE_REDUCTION
:
6537 flags
= GOVD_REDUCTION
| GOVD_SEEN
| GOVD_EXPLICIT
;
6538 /* OpenACC permits reductions on private variables. */
6539 if (!(region_type
& ORT_ACC
))
6540 check_non_private
= "reduction";
6541 decl
= OMP_CLAUSE_DECL (c
);
6542 if (TREE_CODE (decl
) == MEM_REF
)
6544 tree type
= TREE_TYPE (decl
);
6545 if (gimplify_expr (&TYPE_MAX_VALUE (TYPE_DOMAIN (type
)), pre_p
,
6546 NULL
, is_gimple_val
, fb_rvalue
) == GS_ERROR
)
6551 tree v
= TYPE_MAX_VALUE (TYPE_DOMAIN (type
));
6554 omp_firstprivatize_variable (ctx
, v
);
6555 omp_notice_variable (ctx
, v
, true);
6557 decl
= TREE_OPERAND (decl
, 0);
6558 if (TREE_CODE (decl
) == POINTER_PLUS_EXPR
)
6560 if (gimplify_expr (&TREE_OPERAND (decl
, 1), pre_p
,
6561 NULL
, is_gimple_val
, fb_rvalue
)
6567 v
= TREE_OPERAND (decl
, 1);
6570 omp_firstprivatize_variable (ctx
, v
);
6571 omp_notice_variable (ctx
, v
, true);
6573 decl
= TREE_OPERAND (decl
, 0);
6575 if (TREE_CODE (decl
) == ADDR_EXPR
6576 || TREE_CODE (decl
) == INDIRECT_REF
)
6577 decl
= TREE_OPERAND (decl
, 0);
6580 case OMP_CLAUSE_LINEAR
:
6581 if (gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c
), pre_p
, NULL
,
6582 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
6589 if (code
== OMP_SIMD
6590 && !OMP_CLAUSE_LINEAR_NO_COPYIN (c
))
6592 struct gimplify_omp_ctx
*octx
= outer_ctx
;
6594 && octx
->region_type
== ORT_WORKSHARE
6595 && octx
->combined_loop
6596 && !octx
->distribute
)
6598 if (octx
->outer_context
6599 && (octx
->outer_context
->region_type
6600 == ORT_COMBINED_PARALLEL
))
6601 octx
= octx
->outer_context
->outer_context
;
6603 octx
= octx
->outer_context
;
6606 && octx
->region_type
== ORT_WORKSHARE
6607 && octx
->combined_loop
6609 && !lang_GNU_Fortran ())
6611 error_at (OMP_CLAUSE_LOCATION (c
),
6612 "%<linear%> clause for variable other than "
6613 "loop iterator specified on construct "
6614 "combined with %<distribute%>");
6619 /* For combined #pragma omp parallel for simd, need to put
6620 lastprivate and perhaps firstprivate too on the
6621 parallel. Similarly for #pragma omp for simd. */
6622 struct gimplify_omp_ctx
*octx
= outer_ctx
;
6624 if (omp_no_lastprivate (ctx
))
6625 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
6628 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c
)
6629 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
6631 decl
= OMP_CLAUSE_DECL (c
);
6632 if (error_operand_p (decl
))
6638 if (!OMP_CLAUSE_LINEAR_NO_COPYIN (c
))
6639 flags
|= GOVD_FIRSTPRIVATE
;
6640 if (!OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
6641 flags
|= GOVD_LASTPRIVATE
;
6643 && octx
->region_type
== ORT_WORKSHARE
6644 && octx
->combined_loop
)
6646 if (octx
->outer_context
6647 && (octx
->outer_context
->region_type
6648 == ORT_COMBINED_PARALLEL
))
6649 octx
= octx
->outer_context
;
6650 else if (omp_check_private (octx
, decl
, false))
6654 && (octx
->region_type
& ORT_TASK
) != 0
6655 && octx
->combined_loop
)
6658 && octx
->region_type
== ORT_COMBINED_PARALLEL
6659 && ctx
->region_type
== ORT_WORKSHARE
6660 && octx
== outer_ctx
)
6661 flags
= GOVD_SEEN
| GOVD_SHARED
;
6663 && octx
->region_type
== ORT_COMBINED_TEAMS
)
6664 flags
= GOVD_SEEN
| GOVD_SHARED
;
6666 && octx
->region_type
== ORT_COMBINED_TARGET
)
6668 flags
&= ~GOVD_LASTPRIVATE
;
6669 if (flags
== GOVD_SEEN
)
6675 = splay_tree_lookup (octx
->variables
,
6676 (splay_tree_key
) decl
);
6677 if (on
&& (on
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
6682 omp_add_variable (octx
, decl
, flags
);
6683 if (octx
->outer_context
== NULL
)
6685 octx
= octx
->outer_context
;
6690 && (!OMP_CLAUSE_LINEAR_NO_COPYIN (c
)
6691 || !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
)))
6692 omp_notice_variable (octx
, decl
, true);
6694 flags
= GOVD_LINEAR
| GOVD_EXPLICIT
;
6695 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c
)
6696 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
6698 notice_outer
= false;
6699 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
6703 case OMP_CLAUSE_MAP
:
6704 decl
= OMP_CLAUSE_DECL (c
);
6705 if (error_operand_p (decl
))
6711 case OMP_TARGET_DATA
:
6712 case OMP_TARGET_ENTER_DATA
:
6713 case OMP_TARGET_EXIT_DATA
:
6714 case OACC_HOST_DATA
:
6715 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
6716 || (OMP_CLAUSE_MAP_KIND (c
)
6717 == GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
6718 /* For target {,enter ,exit }data only the array slice is
6719 mapped, but not the pointer to it. */
6727 if (DECL_P (decl
) && outer_ctx
&& (region_type
& ORT_ACC
))
6729 struct gimplify_omp_ctx
*octx
;
6730 for (octx
= outer_ctx
; octx
; octx
= octx
->outer_context
)
6732 if (octx
->region_type
!= ORT_ACC_HOST_DATA
)
6735 = splay_tree_lookup (octx
->variables
,
6736 (splay_tree_key
) decl
);
6738 error_at (OMP_CLAUSE_LOCATION (c
), "variable %qE "
6739 "declared in enclosing %<host_data%> region",
6743 if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
6744 OMP_CLAUSE_SIZE (c
) = DECL_P (decl
) ? DECL_SIZE_UNIT (decl
)
6745 : TYPE_SIZE_UNIT (TREE_TYPE (decl
));
6746 if (gimplify_expr (&OMP_CLAUSE_SIZE (c
), pre_p
,
6747 NULL
, is_gimple_val
, fb_rvalue
) == GS_ERROR
)
6752 else if ((OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
6753 || (OMP_CLAUSE_MAP_KIND (c
)
6754 == GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
6755 && TREE_CODE (OMP_CLAUSE_SIZE (c
)) != INTEGER_CST
)
6758 = get_initialized_tmp_var (OMP_CLAUSE_SIZE (c
), pre_p
, NULL
);
6759 omp_add_variable (ctx
, OMP_CLAUSE_SIZE (c
),
6760 GOVD_FIRSTPRIVATE
| GOVD_SEEN
);
6765 if (TREE_CODE (d
) == ARRAY_REF
)
6767 while (TREE_CODE (d
) == ARRAY_REF
)
6768 d
= TREE_OPERAND (d
, 0);
6769 if (TREE_CODE (d
) == COMPONENT_REF
6770 && TREE_CODE (TREE_TYPE (d
)) == ARRAY_TYPE
)
6773 pd
= &OMP_CLAUSE_DECL (c
);
6775 && TREE_CODE (decl
) == INDIRECT_REF
6776 && TREE_CODE (TREE_OPERAND (decl
, 0)) == COMPONENT_REF
6777 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl
, 0)))
6780 pd
= &TREE_OPERAND (decl
, 0);
6781 decl
= TREE_OPERAND (decl
, 0);
6783 if (TREE_CODE (decl
) == COMPONENT_REF
)
6785 while (TREE_CODE (decl
) == COMPONENT_REF
)
6786 decl
= TREE_OPERAND (decl
, 0);
6788 if (gimplify_expr (pd
, pre_p
, NULL
, is_gimple_lvalue
, fb_lvalue
)
6796 if (error_operand_p (decl
))
6802 if (TYPE_SIZE_UNIT (TREE_TYPE (decl
)) == NULL
6803 || (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (decl
)))
6806 error_at (OMP_CLAUSE_LOCATION (c
),
6807 "mapping field %qE of variable length "
6808 "structure", OMP_CLAUSE_DECL (c
));
6813 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_POINTER
)
6815 /* Error recovery. */
6816 if (prev_list_p
== NULL
)
6821 if (OMP_CLAUSE_CHAIN (*prev_list_p
) != c
)
6823 tree ch
= OMP_CLAUSE_CHAIN (*prev_list_p
);
6824 if (ch
== NULL_TREE
|| OMP_CLAUSE_CHAIN (ch
) != c
)
6833 HOST_WIDE_INT bitsize
, bitpos
;
6835 int unsignedp
, reversep
, volatilep
= 0;
6836 tree base
= OMP_CLAUSE_DECL (c
);
6837 while (TREE_CODE (base
) == ARRAY_REF
)
6838 base
= TREE_OPERAND (base
, 0);
6839 if (TREE_CODE (base
) == INDIRECT_REF
)
6840 base
= TREE_OPERAND (base
, 0);
6841 base
= get_inner_reference (base
, &bitsize
, &bitpos
, &offset
,
6842 &mode
, &unsignedp
, &reversep
,
6844 gcc_assert (base
== decl
6845 && (offset
== NULL_TREE
6846 || TREE_CODE (offset
) == INTEGER_CST
));
6849 = splay_tree_lookup (ctx
->variables
, (splay_tree_key
)decl
);
6850 bool ptr
= (OMP_CLAUSE_MAP_KIND (c
)
6851 == GOMP_MAP_ALWAYS_POINTER
);
6852 if (n
== NULL
|| (n
->value
& GOVD_MAP
) == 0)
6854 tree l
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
6856 OMP_CLAUSE_SET_MAP_KIND (l
, GOMP_MAP_STRUCT
);
6857 OMP_CLAUSE_DECL (l
) = decl
;
6858 OMP_CLAUSE_SIZE (l
) = size_int (1);
6859 if (struct_map_to_clause
== NULL
)
6860 struct_map_to_clause
= new hash_map
<tree
, tree
>;
6861 struct_map_to_clause
->put (decl
, l
);
6864 enum gomp_map_kind mkind
6865 = code
== OMP_TARGET_EXIT_DATA
6866 ? GOMP_MAP_RELEASE
: GOMP_MAP_ALLOC
;
6867 tree c2
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
6869 OMP_CLAUSE_SET_MAP_KIND (c2
, mkind
);
6870 OMP_CLAUSE_DECL (c2
)
6871 = unshare_expr (OMP_CLAUSE_DECL (c
));
6872 OMP_CLAUSE_CHAIN (c2
) = *prev_list_p
;
6873 OMP_CLAUSE_SIZE (c2
)
6874 = TYPE_SIZE_UNIT (ptr_type_node
);
6875 OMP_CLAUSE_CHAIN (l
) = c2
;
6876 if (OMP_CLAUSE_CHAIN (*prev_list_p
) != c
)
6878 tree c4
= OMP_CLAUSE_CHAIN (*prev_list_p
);
6880 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
6882 OMP_CLAUSE_SET_MAP_KIND (c3
, mkind
);
6883 OMP_CLAUSE_DECL (c3
)
6884 = unshare_expr (OMP_CLAUSE_DECL (c4
));
6885 OMP_CLAUSE_SIZE (c3
)
6886 = TYPE_SIZE_UNIT (ptr_type_node
);
6887 OMP_CLAUSE_CHAIN (c3
) = *prev_list_p
;
6888 OMP_CLAUSE_CHAIN (c2
) = c3
;
6895 OMP_CLAUSE_CHAIN (l
) = c
;
6897 list_p
= &OMP_CLAUSE_CHAIN (l
);
6899 flags
= GOVD_MAP
| GOVD_EXPLICIT
;
6900 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c
)) || ptr
)
6906 tree
*osc
= struct_map_to_clause
->get (decl
);
6907 tree
*sc
= NULL
, *scp
= NULL
;
6908 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c
)) || ptr
)
6909 n
->value
|= GOVD_SEEN
;
6912 o1
= wi::to_offset (offset
);
6916 o1
= o1
+ bitpos
/ BITS_PER_UNIT
;
6917 for (sc
= &OMP_CLAUSE_CHAIN (*osc
);
6918 *sc
!= c
; sc
= &OMP_CLAUSE_CHAIN (*sc
))
6919 if (ptr
&& sc
== prev_list_p
)
6921 else if (TREE_CODE (OMP_CLAUSE_DECL (*sc
))
6923 && (TREE_CODE (OMP_CLAUSE_DECL (*sc
))
6925 && (TREE_CODE (OMP_CLAUSE_DECL (*sc
))
6931 HOST_WIDE_INT bitsize2
, bitpos2
;
6932 base
= OMP_CLAUSE_DECL (*sc
);
6933 if (TREE_CODE (base
) == ARRAY_REF
)
6935 while (TREE_CODE (base
) == ARRAY_REF
)
6936 base
= TREE_OPERAND (base
, 0);
6937 if (TREE_CODE (base
) != COMPONENT_REF
6938 || (TREE_CODE (TREE_TYPE (base
))
6942 else if (TREE_CODE (base
) == INDIRECT_REF
6943 && (TREE_CODE (TREE_OPERAND (base
, 0))
6945 && (TREE_CODE (TREE_TYPE
6946 (TREE_OPERAND (base
, 0)))
6948 base
= TREE_OPERAND (base
, 0);
6949 base
= get_inner_reference (base
, &bitsize2
,
6952 &reversep
, &volatilep
,
6958 gcc_assert (offset
== NULL_TREE
6959 || TREE_CODE (offset
) == INTEGER_CST
);
6960 tree d1
= OMP_CLAUSE_DECL (*sc
);
6961 tree d2
= OMP_CLAUSE_DECL (c
);
6962 while (TREE_CODE (d1
) == ARRAY_REF
)
6963 d1
= TREE_OPERAND (d1
, 0);
6964 while (TREE_CODE (d2
) == ARRAY_REF
)
6965 d2
= TREE_OPERAND (d2
, 0);
6966 if (TREE_CODE (d1
) == INDIRECT_REF
)
6967 d1
= TREE_OPERAND (d1
, 0);
6968 if (TREE_CODE (d2
) == INDIRECT_REF
)
6969 d2
= TREE_OPERAND (d2
, 0);
6970 while (TREE_CODE (d1
) == COMPONENT_REF
)
6971 if (TREE_CODE (d2
) == COMPONENT_REF
6972 && TREE_OPERAND (d1
, 1)
6973 == TREE_OPERAND (d2
, 1))
6975 d1
= TREE_OPERAND (d1
, 0);
6976 d2
= TREE_OPERAND (d2
, 0);
6982 error_at (OMP_CLAUSE_LOCATION (c
),
6983 "%qE appears more than once in map "
6984 "clauses", OMP_CLAUSE_DECL (c
));
6989 o2
= wi::to_offset (offset2
);
6993 o2
= o2
+ bitpos2
/ BITS_PER_UNIT
;
6994 if (wi::ltu_p (o1
, o2
)
6995 || (wi::eq_p (o1
, o2
) && bitpos
< bitpos2
))
7005 OMP_CLAUSE_SIZE (*osc
)
7006 = size_binop (PLUS_EXPR
, OMP_CLAUSE_SIZE (*osc
),
7010 tree c2
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7012 tree cl
= NULL_TREE
;
7013 enum gomp_map_kind mkind
7014 = code
== OMP_TARGET_EXIT_DATA
7015 ? GOMP_MAP_RELEASE
: GOMP_MAP_ALLOC
;
7016 OMP_CLAUSE_SET_MAP_KIND (c2
, mkind
);
7017 OMP_CLAUSE_DECL (c2
)
7018 = unshare_expr (OMP_CLAUSE_DECL (c
));
7019 OMP_CLAUSE_CHAIN (c2
) = scp
? *scp
: *prev_list_p
;
7020 OMP_CLAUSE_SIZE (c2
)
7021 = TYPE_SIZE_UNIT (ptr_type_node
);
7022 cl
= scp
? *prev_list_p
: c2
;
7023 if (OMP_CLAUSE_CHAIN (*prev_list_p
) != c
)
7025 tree c4
= OMP_CLAUSE_CHAIN (*prev_list_p
);
7027 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7029 OMP_CLAUSE_SET_MAP_KIND (c3
, mkind
);
7030 OMP_CLAUSE_DECL (c3
)
7031 = unshare_expr (OMP_CLAUSE_DECL (c4
));
7032 OMP_CLAUSE_SIZE (c3
)
7033 = TYPE_SIZE_UNIT (ptr_type_node
);
7034 OMP_CLAUSE_CHAIN (c3
) = *prev_list_p
;
7036 OMP_CLAUSE_CHAIN (c2
) = c3
;
7042 if (sc
== prev_list_p
)
7049 *prev_list_p
= OMP_CLAUSE_CHAIN (c
);
7050 list_p
= prev_list_p
;
7052 OMP_CLAUSE_CHAIN (c
) = *sc
;
7059 *list_p
= OMP_CLAUSE_CHAIN (c
);
7060 OMP_CLAUSE_CHAIN (c
) = *sc
;
7067 && OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_ALWAYS_POINTER
7068 && OMP_CLAUSE_CHAIN (c
)
7069 && OMP_CLAUSE_CODE (OMP_CLAUSE_CHAIN (c
)) == OMP_CLAUSE_MAP
7070 && (OMP_CLAUSE_MAP_KIND (OMP_CLAUSE_CHAIN (c
))
7071 == GOMP_MAP_ALWAYS_POINTER
))
7072 prev_list_p
= list_p
;
7075 flags
= GOVD_MAP
| GOVD_EXPLICIT
;
7076 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_TO
7077 || OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_TOFROM
)
7078 flags
|= GOVD_MAP_ALWAYS_TO
;
7081 case OMP_CLAUSE_DEPEND
:
7082 if (OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SINK
7083 || OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SOURCE
)
7085 /* Nothing to do. OMP_CLAUSE_DECL will be lowered in
7089 if (TREE_CODE (OMP_CLAUSE_DECL (c
)) == COMPOUND_EXPR
)
7091 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (c
), 0), pre_p
,
7092 NULL
, is_gimple_val
, fb_rvalue
);
7093 OMP_CLAUSE_DECL (c
) = TREE_OPERAND (OMP_CLAUSE_DECL (c
), 1);
7095 if (error_operand_p (OMP_CLAUSE_DECL (c
)))
7100 OMP_CLAUSE_DECL (c
) = build_fold_addr_expr (OMP_CLAUSE_DECL (c
));
7101 if (gimplify_expr (&OMP_CLAUSE_DECL (c
), pre_p
, NULL
,
7102 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7110 case OMP_CLAUSE_FROM
:
7111 case OMP_CLAUSE__CACHE_
:
7112 decl
= OMP_CLAUSE_DECL (c
);
7113 if (error_operand_p (decl
))
7118 if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
7119 OMP_CLAUSE_SIZE (c
) = DECL_P (decl
) ? DECL_SIZE_UNIT (decl
)
7120 : TYPE_SIZE_UNIT (TREE_TYPE (decl
));
7121 if (gimplify_expr (&OMP_CLAUSE_SIZE (c
), pre_p
,
7122 NULL
, is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7129 if (gimplify_expr (&OMP_CLAUSE_DECL (c
), pre_p
,
7130 NULL
, is_gimple_lvalue
, fb_lvalue
)
7140 case OMP_CLAUSE_USE_DEVICE_PTR
:
7141 flags
= GOVD_FIRSTPRIVATE
| GOVD_EXPLICIT
;
7143 case OMP_CLAUSE_IS_DEVICE_PTR
:
7144 flags
= GOVD_FIRSTPRIVATE
| GOVD_EXPLICIT
;
7148 decl
= OMP_CLAUSE_DECL (c
);
7150 if (error_operand_p (decl
))
7155 if (DECL_NAME (decl
) == NULL_TREE
&& (flags
& GOVD_SHARED
) == 0)
7157 tree t
= omp_member_access_dummy_var (decl
);
7160 tree v
= DECL_VALUE_EXPR (decl
);
7161 DECL_NAME (decl
) = DECL_NAME (TREE_OPERAND (v
, 1));
7163 omp_notice_variable (outer_ctx
, t
, true);
7166 omp_add_variable (ctx
, decl
, flags
);
7167 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_REDUCTION
7168 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c
))
7170 omp_add_variable (ctx
, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c
),
7171 GOVD_LOCAL
| GOVD_SEEN
);
7172 if (OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c
)
7173 && walk_tree (&OMP_CLAUSE_REDUCTION_INIT (c
),
7175 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c
),
7177 omp_add_variable (ctx
,
7178 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c
),
7179 GOVD_LOCAL
| GOVD_SEEN
);
7180 gimplify_omp_ctxp
= ctx
;
7181 push_gimplify_context ();
7183 OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c
) = NULL
;
7184 OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c
) = NULL
;
7186 gimplify_and_add (OMP_CLAUSE_REDUCTION_INIT (c
),
7187 &OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c
));
7188 pop_gimplify_context
7189 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c
)));
7190 push_gimplify_context ();
7191 gimplify_and_add (OMP_CLAUSE_REDUCTION_MERGE (c
),
7192 &OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c
));
7193 pop_gimplify_context
7194 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c
)));
7195 OMP_CLAUSE_REDUCTION_INIT (c
) = NULL_TREE
;
7196 OMP_CLAUSE_REDUCTION_MERGE (c
) = NULL_TREE
;
7198 gimplify_omp_ctxp
= outer_ctx
;
7200 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
7201 && OMP_CLAUSE_LASTPRIVATE_STMT (c
))
7203 gimplify_omp_ctxp
= ctx
;
7204 push_gimplify_context ();
7205 if (TREE_CODE (OMP_CLAUSE_LASTPRIVATE_STMT (c
)) != BIND_EXPR
)
7207 tree bind
= build3 (BIND_EXPR
, void_type_node
, NULL
,
7209 TREE_SIDE_EFFECTS (bind
) = 1;
7210 BIND_EXPR_BODY (bind
) = OMP_CLAUSE_LASTPRIVATE_STMT (c
);
7211 OMP_CLAUSE_LASTPRIVATE_STMT (c
) = bind
;
7213 gimplify_and_add (OMP_CLAUSE_LASTPRIVATE_STMT (c
),
7214 &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
));
7215 pop_gimplify_context
7216 (gimple_seq_first_stmt (OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
)));
7217 OMP_CLAUSE_LASTPRIVATE_STMT (c
) = NULL_TREE
;
7219 gimplify_omp_ctxp
= outer_ctx
;
7221 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
7222 && OMP_CLAUSE_LINEAR_STMT (c
))
7224 gimplify_omp_ctxp
= ctx
;
7225 push_gimplify_context ();
7226 if (TREE_CODE (OMP_CLAUSE_LINEAR_STMT (c
)) != BIND_EXPR
)
7228 tree bind
= build3 (BIND_EXPR
, void_type_node
, NULL
,
7230 TREE_SIDE_EFFECTS (bind
) = 1;
7231 BIND_EXPR_BODY (bind
) = OMP_CLAUSE_LINEAR_STMT (c
);
7232 OMP_CLAUSE_LINEAR_STMT (c
) = bind
;
7234 gimplify_and_add (OMP_CLAUSE_LINEAR_STMT (c
),
7235 &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
));
7236 pop_gimplify_context
7237 (gimple_seq_first_stmt (OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
)));
7238 OMP_CLAUSE_LINEAR_STMT (c
) = NULL_TREE
;
7240 gimplify_omp_ctxp
= outer_ctx
;
7246 case OMP_CLAUSE_COPYIN
:
7247 case OMP_CLAUSE_COPYPRIVATE
:
7248 decl
= OMP_CLAUSE_DECL (c
);
7249 if (error_operand_p (decl
))
7254 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_COPYPRIVATE
7256 && !omp_check_private (ctx
, decl
, true))
7259 if (is_global_var (decl
))
7261 if (DECL_THREAD_LOCAL_P (decl
))
7263 else if (DECL_HAS_VALUE_EXPR_P (decl
))
7265 tree value
= get_base_address (DECL_VALUE_EXPR (decl
));
7269 && DECL_THREAD_LOCAL_P (value
))
7274 error_at (OMP_CLAUSE_LOCATION (c
),
7275 "copyprivate variable %qE is not threadprivate"
7276 " or private in outer context", DECL_NAME (decl
));
7280 omp_notice_variable (outer_ctx
, decl
, true);
7281 if (check_non_private
7282 && region_type
== ORT_WORKSHARE
7283 && (OMP_CLAUSE_CODE (c
) != OMP_CLAUSE_REDUCTION
7284 || decl
== OMP_CLAUSE_DECL (c
)
7285 || (TREE_CODE (OMP_CLAUSE_DECL (c
)) == MEM_REF
7286 && (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c
), 0))
7288 || (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c
), 0))
7289 == POINTER_PLUS_EXPR
7290 && (TREE_CODE (TREE_OPERAND (TREE_OPERAND
7291 (OMP_CLAUSE_DECL (c
), 0), 0))
7293 && omp_check_private (ctx
, decl
, false))
7295 error ("%s variable %qE is private in outer context",
7296 check_non_private
, DECL_NAME (decl
));
7302 if (OMP_CLAUSE_IF_MODIFIER (c
) != ERROR_MARK
7303 && OMP_CLAUSE_IF_MODIFIER (c
) != code
)
7306 for (int i
= 0; i
< 2; i
++)
7307 switch (i
? OMP_CLAUSE_IF_MODIFIER (c
) : code
)
7309 case OMP_PARALLEL
: p
[i
] = "parallel"; break;
7310 case OMP_TASK
: p
[i
] = "task"; break;
7311 case OMP_TASKLOOP
: p
[i
] = "taskloop"; break;
7312 case OMP_TARGET_DATA
: p
[i
] = "target data"; break;
7313 case OMP_TARGET
: p
[i
] = "target"; break;
7314 case OMP_TARGET_UPDATE
: p
[i
] = "target update"; break;
7315 case OMP_TARGET_ENTER_DATA
:
7316 p
[i
] = "target enter data"; break;
7317 case OMP_TARGET_EXIT_DATA
: p
[i
] = "target exit data"; break;
7318 default: gcc_unreachable ();
7320 error_at (OMP_CLAUSE_LOCATION (c
),
7321 "expected %qs %<if%> clause modifier rather than %qs",
7327 case OMP_CLAUSE_FINAL
:
7328 OMP_CLAUSE_OPERAND (c
, 0)
7329 = gimple_boolify (OMP_CLAUSE_OPERAND (c
, 0));
7332 case OMP_CLAUSE_SCHEDULE
:
7333 case OMP_CLAUSE_NUM_THREADS
:
7334 case OMP_CLAUSE_NUM_TEAMS
:
7335 case OMP_CLAUSE_THREAD_LIMIT
:
7336 case OMP_CLAUSE_DIST_SCHEDULE
:
7337 case OMP_CLAUSE_DEVICE
:
7338 case OMP_CLAUSE_PRIORITY
:
7339 case OMP_CLAUSE_GRAINSIZE
:
7340 case OMP_CLAUSE_NUM_TASKS
:
7341 case OMP_CLAUSE_HINT
:
7342 case OMP_CLAUSE__CILK_FOR_COUNT_
:
7343 case OMP_CLAUSE_ASYNC
:
7344 case OMP_CLAUSE_WAIT
:
7345 case OMP_CLAUSE_NUM_GANGS
:
7346 case OMP_CLAUSE_NUM_WORKERS
:
7347 case OMP_CLAUSE_VECTOR_LENGTH
:
7348 case OMP_CLAUSE_WORKER
:
7349 case OMP_CLAUSE_VECTOR
:
7350 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c
, 0), pre_p
, NULL
,
7351 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7355 case OMP_CLAUSE_GANG
:
7356 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c
, 0), pre_p
, NULL
,
7357 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7359 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c
, 1), pre_p
, NULL
,
7360 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7364 case OMP_CLAUSE_TILE
:
7365 for (tree list
= OMP_CLAUSE_TILE_LIST (c
); !remove
&& list
;
7366 list
= TREE_CHAIN (list
))
7368 if (gimplify_expr (&TREE_VALUE (list
), pre_p
, NULL
,
7369 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7374 case OMP_CLAUSE_DEVICE_RESIDENT
:
7378 case OMP_CLAUSE_NOWAIT
:
7379 case OMP_CLAUSE_ORDERED
:
7380 case OMP_CLAUSE_UNTIED
:
7381 case OMP_CLAUSE_COLLAPSE
:
7382 case OMP_CLAUSE_AUTO
:
7383 case OMP_CLAUSE_SEQ
:
7384 case OMP_CLAUSE_INDEPENDENT
:
7385 case OMP_CLAUSE_MERGEABLE
:
7386 case OMP_CLAUSE_PROC_BIND
:
7387 case OMP_CLAUSE_SAFELEN
:
7388 case OMP_CLAUSE_SIMDLEN
:
7389 case OMP_CLAUSE_NOGROUP
:
7390 case OMP_CLAUSE_THREADS
:
7391 case OMP_CLAUSE_SIMD
:
7394 case OMP_CLAUSE_DEFAULTMAP
:
7395 ctx
->target_map_scalars_firstprivate
= false;
7398 case OMP_CLAUSE_ALIGNED
:
7399 decl
= OMP_CLAUSE_DECL (c
);
7400 if (error_operand_p (decl
))
7405 if (gimplify_expr (&OMP_CLAUSE_ALIGNED_ALIGNMENT (c
), pre_p
, NULL
,
7406 is_gimple_val
, fb_rvalue
) == GS_ERROR
)
7411 if (!is_global_var (decl
)
7412 && TREE_CODE (TREE_TYPE (decl
)) == POINTER_TYPE
)
7413 omp_add_variable (ctx
, decl
, GOVD_ALIGNED
);
7416 case OMP_CLAUSE_DEFAULT
:
7417 ctx
->default_kind
= OMP_CLAUSE_DEFAULT_KIND (c
);
7425 *list_p
= OMP_CLAUSE_CHAIN (c
);
7427 list_p
= &OMP_CLAUSE_CHAIN (c
);
7430 gimplify_omp_ctxp
= ctx
;
7431 if (struct_map_to_clause
)
7432 delete struct_map_to_clause
;
7435 /* Return true if DECL is a candidate for shared to firstprivate
7436 optimization. We only consider non-addressable scalars, not
7437 too big, and not references. */
7440 omp_shared_to_firstprivate_optimizable_decl_p (tree decl
)
7442 if (TREE_ADDRESSABLE (decl
))
7444 tree type
= TREE_TYPE (decl
);
7445 if (!is_gimple_reg_type (type
)
7446 || TREE_CODE (type
) == REFERENCE_TYPE
7447 || TREE_ADDRESSABLE (type
))
7449 /* Don't optimize too large decls, as each thread/task will have
7451 HOST_WIDE_INT len
= int_size_in_bytes (type
);
7452 if (len
== -1 || len
> 4 * POINTER_SIZE
/ BITS_PER_UNIT
)
7454 if (lang_hooks
.decls
.omp_privatize_by_reference (decl
))
7459 /* Helper function of omp_find_stores_op and gimplify_adjust_omp_clauses*.
7460 For omp_shared_to_firstprivate_optimizable_decl_p decl mark it as
7461 GOVD_WRITTEN in outer contexts. */
7464 omp_mark_stores (struct gimplify_omp_ctx
*ctx
, tree decl
)
7466 for (; ctx
; ctx
= ctx
->outer_context
)
7468 splay_tree_node n
= splay_tree_lookup (ctx
->variables
,
7469 (splay_tree_key
) decl
);
7472 else if (n
->value
& GOVD_SHARED
)
7474 n
->value
|= GOVD_WRITTEN
;
7477 else if (n
->value
& GOVD_DATA_SHARE_CLASS
)
7482 /* Helper callback for walk_gimple_seq to discover possible stores
7483 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
7484 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
7488 omp_find_stores_op (tree
*tp
, int *walk_subtrees
, void *data
)
7490 struct walk_stmt_info
*wi
= (struct walk_stmt_info
*) data
;
7499 if (handled_component_p (op
))
7500 op
= TREE_OPERAND (op
, 0);
7501 else if ((TREE_CODE (op
) == MEM_REF
|| TREE_CODE (op
) == TARGET_MEM_REF
)
7502 && TREE_CODE (TREE_OPERAND (op
, 0)) == ADDR_EXPR
)
7503 op
= TREE_OPERAND (TREE_OPERAND (op
, 0), 0);
7508 if (!DECL_P (op
) || !omp_shared_to_firstprivate_optimizable_decl_p (op
))
7511 omp_mark_stores (gimplify_omp_ctxp
, op
);
7515 /* Helper callback for walk_gimple_seq to discover possible stores
7516 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
7517 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
7521 omp_find_stores_stmt (gimple_stmt_iterator
*gsi_p
,
7522 bool *handled_ops_p
,
7523 struct walk_stmt_info
*wi
)
7525 gimple
*stmt
= gsi_stmt (*gsi_p
);
7526 switch (gimple_code (stmt
))
7528 /* Don't recurse on OpenMP constructs for which
7529 gimplify_adjust_omp_clauses already handled the bodies,
7530 except handle gimple_omp_for_pre_body. */
7531 case GIMPLE_OMP_FOR
:
7532 *handled_ops_p
= true;
7533 if (gimple_omp_for_pre_body (stmt
))
7534 walk_gimple_seq (gimple_omp_for_pre_body (stmt
),
7535 omp_find_stores_stmt
, omp_find_stores_op
, wi
);
7537 case GIMPLE_OMP_PARALLEL
:
7538 case GIMPLE_OMP_TASK
:
7539 case GIMPLE_OMP_SECTIONS
:
7540 case GIMPLE_OMP_SINGLE
:
7541 case GIMPLE_OMP_TARGET
:
7542 case GIMPLE_OMP_TEAMS
:
7543 case GIMPLE_OMP_CRITICAL
:
7544 *handled_ops_p
= true;
7552 struct gimplify_adjust_omp_clauses_data
7558 /* For all variables that were not actually used within the context,
7559 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
7562 gimplify_adjust_omp_clauses_1 (splay_tree_node n
, void *data
)
7564 tree
*list_p
= ((struct gimplify_adjust_omp_clauses_data
*) data
)->list_p
;
7566 = ((struct gimplify_adjust_omp_clauses_data
*) data
)->pre_p
;
7567 tree decl
= (tree
) n
->key
;
7568 unsigned flags
= n
->value
;
7569 enum omp_clause_code code
;
7573 if (flags
& (GOVD_EXPLICIT
| GOVD_LOCAL
))
7575 if ((flags
& GOVD_SEEN
) == 0)
7577 if (flags
& GOVD_DEBUG_PRIVATE
)
7579 gcc_assert ((flags
& GOVD_DATA_SHARE_CLASS
) == GOVD_PRIVATE
);
7580 private_debug
= true;
7582 else if (flags
& GOVD_MAP
)
7583 private_debug
= false;
7586 = lang_hooks
.decls
.omp_private_debug_clause (decl
,
7587 !!(flags
& GOVD_SHARED
));
7589 code
= OMP_CLAUSE_PRIVATE
;
7590 else if (flags
& GOVD_MAP
)
7591 code
= OMP_CLAUSE_MAP
;
7592 else if (flags
& GOVD_SHARED
)
7594 if (is_global_var (decl
))
7596 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
->outer_context
;
7600 = splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7601 if (on
&& (on
->value
& (GOVD_FIRSTPRIVATE
| GOVD_LASTPRIVATE
7602 | GOVD_PRIVATE
| GOVD_REDUCTION
7603 | GOVD_LINEAR
| GOVD_MAP
)) != 0)
7605 ctx
= ctx
->outer_context
;
7610 code
= OMP_CLAUSE_SHARED
;
7612 else if (flags
& GOVD_PRIVATE
)
7613 code
= OMP_CLAUSE_PRIVATE
;
7614 else if (flags
& GOVD_FIRSTPRIVATE
)
7615 code
= OMP_CLAUSE_FIRSTPRIVATE
;
7616 else if (flags
& GOVD_LASTPRIVATE
)
7617 code
= OMP_CLAUSE_LASTPRIVATE
;
7618 else if (flags
& GOVD_ALIGNED
)
7623 if (((flags
& GOVD_LASTPRIVATE
)
7624 || (code
== OMP_CLAUSE_SHARED
&& (flags
& GOVD_WRITTEN
)))
7625 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
7626 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
7628 clause
= build_omp_clause (input_location
, code
);
7629 OMP_CLAUSE_DECL (clause
) = decl
;
7630 OMP_CLAUSE_CHAIN (clause
) = *list_p
;
7632 OMP_CLAUSE_PRIVATE_DEBUG (clause
) = 1;
7633 else if (code
== OMP_CLAUSE_PRIVATE
&& (flags
& GOVD_PRIVATE_OUTER_REF
))
7634 OMP_CLAUSE_PRIVATE_OUTER_REF (clause
) = 1;
7635 else if (code
== OMP_CLAUSE_SHARED
7636 && (flags
& GOVD_WRITTEN
) == 0
7637 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
7638 OMP_CLAUSE_SHARED_READONLY (clause
) = 1;
7639 else if (code
== OMP_CLAUSE_MAP
&& (flags
& GOVD_MAP_0LEN_ARRAY
) != 0)
7641 tree nc
= build_omp_clause (input_location
, OMP_CLAUSE_MAP
);
7642 OMP_CLAUSE_DECL (nc
) = decl
;
7643 if (TREE_CODE (TREE_TYPE (decl
)) == REFERENCE_TYPE
7644 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl
))) == POINTER_TYPE
)
7645 OMP_CLAUSE_DECL (clause
)
7646 = build_simple_mem_ref_loc (input_location
, decl
);
7647 OMP_CLAUSE_DECL (clause
)
7648 = build2 (MEM_REF
, char_type_node
, OMP_CLAUSE_DECL (clause
),
7649 build_int_cst (build_pointer_type (char_type_node
), 0));
7650 OMP_CLAUSE_SIZE (clause
) = size_zero_node
;
7651 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
7652 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_ALLOC
);
7653 OMP_CLAUSE_MAP_MAYBE_ZERO_LENGTH_ARRAY_SECTION (clause
) = 1;
7654 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_FIRSTPRIVATE_POINTER
);
7655 OMP_CLAUSE_CHAIN (nc
) = *list_p
;
7656 OMP_CLAUSE_CHAIN (clause
) = nc
;
7657 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
7658 gimplify_omp_ctxp
= ctx
->outer_context
;
7659 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (clause
), 0),
7660 pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
7661 gimplify_omp_ctxp
= ctx
;
7663 else if (code
== OMP_CLAUSE_MAP
)
7665 int kind
= (flags
& GOVD_MAP_TO_ONLY
7668 if (flags
& GOVD_MAP_FORCE
)
7669 kind
|= GOMP_MAP_FLAG_FORCE
;
7670 OMP_CLAUSE_SET_MAP_KIND (clause
, kind
);
7671 if (DECL_SIZE (decl
)
7672 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
7674 tree decl2
= DECL_VALUE_EXPR (decl
);
7675 gcc_assert (TREE_CODE (decl2
) == INDIRECT_REF
);
7676 decl2
= TREE_OPERAND (decl2
, 0);
7677 gcc_assert (DECL_P (decl2
));
7678 tree mem
= build_simple_mem_ref (decl2
);
7679 OMP_CLAUSE_DECL (clause
) = mem
;
7680 OMP_CLAUSE_SIZE (clause
) = TYPE_SIZE_UNIT (TREE_TYPE (decl
));
7681 if (gimplify_omp_ctxp
->outer_context
)
7683 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
->outer_context
;
7684 omp_notice_variable (ctx
, decl2
, true);
7685 omp_notice_variable (ctx
, OMP_CLAUSE_SIZE (clause
), true);
7687 tree nc
= build_omp_clause (OMP_CLAUSE_LOCATION (clause
),
7689 OMP_CLAUSE_DECL (nc
) = decl
;
7690 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
7691 if (gimplify_omp_ctxp
->target_firstprivatize_array_bases
)
7692 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_FIRSTPRIVATE_POINTER
);
7694 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_POINTER
);
7695 OMP_CLAUSE_CHAIN (nc
) = OMP_CLAUSE_CHAIN (clause
);
7696 OMP_CLAUSE_CHAIN (clause
) = nc
;
7698 else if (gimplify_omp_ctxp
->target_firstprivatize_array_bases
7699 && lang_hooks
.decls
.omp_privatize_by_reference (decl
))
7701 OMP_CLAUSE_DECL (clause
) = build_simple_mem_ref (decl
);
7702 OMP_CLAUSE_SIZE (clause
)
7703 = unshare_expr (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl
))));
7704 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
7705 gimplify_omp_ctxp
= ctx
->outer_context
;
7706 gimplify_expr (&OMP_CLAUSE_SIZE (clause
),
7707 pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
7708 gimplify_omp_ctxp
= ctx
;
7709 tree nc
= build_omp_clause (OMP_CLAUSE_LOCATION (clause
),
7711 OMP_CLAUSE_DECL (nc
) = decl
;
7712 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
7713 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_FIRSTPRIVATE_REFERENCE
);
7714 OMP_CLAUSE_CHAIN (nc
) = OMP_CLAUSE_CHAIN (clause
);
7715 OMP_CLAUSE_CHAIN (clause
) = nc
;
7718 OMP_CLAUSE_SIZE (clause
) = DECL_SIZE_UNIT (decl
);
7720 if (code
== OMP_CLAUSE_FIRSTPRIVATE
&& (flags
& GOVD_LASTPRIVATE
) != 0)
7722 tree nc
= build_omp_clause (input_location
, OMP_CLAUSE_LASTPRIVATE
);
7723 OMP_CLAUSE_DECL (nc
) = decl
;
7724 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (nc
) = 1;
7725 OMP_CLAUSE_CHAIN (nc
) = *list_p
;
7726 OMP_CLAUSE_CHAIN (clause
) = nc
;
7727 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
7728 gimplify_omp_ctxp
= ctx
->outer_context
;
7729 lang_hooks
.decls
.omp_finish_clause (nc
, pre_p
);
7730 gimplify_omp_ctxp
= ctx
;
7733 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
7734 gimplify_omp_ctxp
= ctx
->outer_context
;
7735 lang_hooks
.decls
.omp_finish_clause (clause
, pre_p
);
7736 gimplify_omp_ctxp
= ctx
;
7741 gimplify_adjust_omp_clauses (gimple_seq
*pre_p
, gimple_seq body
, tree
*list_p
,
7742 enum tree_code code
)
7744 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
7749 struct gimplify_omp_ctx
*octx
;
7750 for (octx
= ctx
; octx
; octx
= octx
->outer_context
)
7751 if ((octx
->region_type
& (ORT_PARALLEL
| ORT_TASK
| ORT_TEAMS
)) != 0)
7755 struct walk_stmt_info wi
;
7756 memset (&wi
, 0, sizeof (wi
));
7757 walk_gimple_seq (body
, omp_find_stores_stmt
,
7758 omp_find_stores_op
, &wi
);
7761 while ((c
= *list_p
) != NULL
)
7764 bool remove
= false;
7766 switch (OMP_CLAUSE_CODE (c
))
7768 case OMP_CLAUSE_PRIVATE
:
7769 case OMP_CLAUSE_SHARED
:
7770 case OMP_CLAUSE_FIRSTPRIVATE
:
7771 case OMP_CLAUSE_LINEAR
:
7772 decl
= OMP_CLAUSE_DECL (c
);
7773 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7774 remove
= !(n
->value
& GOVD_SEEN
);
7777 bool shared
= OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_SHARED
;
7778 if ((n
->value
& GOVD_DEBUG_PRIVATE
)
7779 || lang_hooks
.decls
.omp_private_debug_clause (decl
, shared
))
7781 gcc_assert ((n
->value
& GOVD_DEBUG_PRIVATE
) == 0
7782 || ((n
->value
& GOVD_DATA_SHARE_CLASS
)
7784 OMP_CLAUSE_SET_CODE (c
, OMP_CLAUSE_PRIVATE
);
7785 OMP_CLAUSE_PRIVATE_DEBUG (c
) = 1;
7787 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_SHARED
7788 && (n
->value
& GOVD_WRITTEN
) == 0
7790 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
7791 OMP_CLAUSE_SHARED_READONLY (c
) = 1;
7792 else if (DECL_P (decl
)
7793 && ((OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_SHARED
7794 && (n
->value
& GOVD_WRITTEN
) != 1)
7795 || (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
7796 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
)))
7797 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
7798 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
7802 case OMP_CLAUSE_LASTPRIVATE
:
7803 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
7804 accurately reflect the presence of a FIRSTPRIVATE clause. */
7805 decl
= OMP_CLAUSE_DECL (c
);
7806 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7807 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
)
7808 = (n
->value
& GOVD_FIRSTPRIVATE
) != 0;
7809 if (omp_no_lastprivate (ctx
))
7811 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
))
7814 OMP_CLAUSE_CODE (c
) = OMP_CLAUSE_PRIVATE
;
7816 else if (code
== OMP_DISTRIBUTE
7817 && OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
))
7820 error_at (OMP_CLAUSE_LOCATION (c
),
7821 "same variable used in %<firstprivate%> and "
7822 "%<lastprivate%> clauses on %<distribute%> "
7826 && OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
7828 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
7829 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
7832 case OMP_CLAUSE_ALIGNED
:
7833 decl
= OMP_CLAUSE_DECL (c
);
7834 if (!is_global_var (decl
))
7836 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7837 remove
= n
== NULL
|| !(n
->value
& GOVD_SEEN
);
7838 if (!remove
&& TREE_CODE (TREE_TYPE (decl
)) == POINTER_TYPE
)
7840 struct gimplify_omp_ctx
*octx
;
7842 && (n
->value
& (GOVD_DATA_SHARE_CLASS
7843 & ~GOVD_FIRSTPRIVATE
)))
7846 for (octx
= ctx
->outer_context
; octx
;
7847 octx
= octx
->outer_context
)
7849 n
= splay_tree_lookup (octx
->variables
,
7850 (splay_tree_key
) decl
);
7853 if (n
->value
& GOVD_LOCAL
)
7855 /* We have to avoid assigning a shared variable
7856 to itself when trying to add
7857 __builtin_assume_aligned. */
7858 if (n
->value
& GOVD_SHARED
)
7866 else if (TREE_CODE (TREE_TYPE (decl
)) == ARRAY_TYPE
)
7868 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7869 if (n
!= NULL
&& (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
7874 case OMP_CLAUSE_MAP
:
7875 if (code
== OMP_TARGET_EXIT_DATA
7876 && OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_ALWAYS_POINTER
)
7881 decl
= OMP_CLAUSE_DECL (c
);
7884 if ((ctx
->region_type
& ORT_TARGET
) != 0
7885 && OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_FIRSTPRIVATE_POINTER
)
7887 if (TREE_CODE (decl
) == INDIRECT_REF
7888 && TREE_CODE (TREE_OPERAND (decl
, 0)) == COMPONENT_REF
7889 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl
, 0)))
7891 decl
= TREE_OPERAND (decl
, 0);
7892 if (TREE_CODE (decl
) == COMPONENT_REF
)
7894 while (TREE_CODE (decl
) == COMPONENT_REF
)
7895 decl
= TREE_OPERAND (decl
, 0);
7898 n
= splay_tree_lookup (ctx
->variables
,
7899 (splay_tree_key
) decl
);
7900 if (!(n
->value
& GOVD_SEEN
))
7907 n
= splay_tree_lookup (ctx
->variables
, (splay_tree_key
) decl
);
7908 if ((ctx
->region_type
& ORT_TARGET
) != 0
7909 && !(n
->value
& GOVD_SEEN
)
7910 && GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c
)) == 0
7911 && !lookup_attribute ("omp declare target link",
7912 DECL_ATTRIBUTES (decl
)))
7915 /* For struct element mapping, if struct is never referenced
7916 in target block and none of the mapping has always modifier,
7917 remove all the struct element mappings, which immediately
7918 follow the GOMP_MAP_STRUCT map clause. */
7919 if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_STRUCT
)
7921 HOST_WIDE_INT cnt
= tree_to_shwi (OMP_CLAUSE_SIZE (c
));
7923 OMP_CLAUSE_CHAIN (c
)
7924 = OMP_CLAUSE_CHAIN (OMP_CLAUSE_CHAIN (c
));
7927 else if (OMP_CLAUSE_MAP_KIND (c
) == GOMP_MAP_STRUCT
7928 && code
== OMP_TARGET_EXIT_DATA
)
7930 else if (DECL_SIZE (decl
)
7931 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
7932 && OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_POINTER
7933 && OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_FIRSTPRIVATE_POINTER
7934 && (OMP_CLAUSE_MAP_KIND (c
)
7935 != GOMP_MAP_FIRSTPRIVATE_REFERENCE
))
7937 /* For GOMP_MAP_FORCE_DEVICEPTR, we'll never enter here, because
7938 for these, TREE_CODE (DECL_SIZE (decl)) will always be
7940 gcc_assert (OMP_CLAUSE_MAP_KIND (c
) != GOMP_MAP_FORCE_DEVICEPTR
);
7942 tree decl2
= DECL_VALUE_EXPR (decl
);
7943 gcc_assert (TREE_CODE (decl2
) == INDIRECT_REF
);
7944 decl2
= TREE_OPERAND (decl2
, 0);
7945 gcc_assert (DECL_P (decl2
));
7946 tree mem
= build_simple_mem_ref (decl2
);
7947 OMP_CLAUSE_DECL (c
) = mem
;
7948 OMP_CLAUSE_SIZE (c
) = TYPE_SIZE_UNIT (TREE_TYPE (decl
));
7949 if (ctx
->outer_context
)
7951 omp_notice_variable (ctx
->outer_context
, decl2
, true);
7952 omp_notice_variable (ctx
->outer_context
,
7953 OMP_CLAUSE_SIZE (c
), true);
7955 if (((ctx
->region_type
& ORT_TARGET
) != 0
7956 || !ctx
->target_firstprivatize_array_bases
)
7957 && ((n
->value
& GOVD_SEEN
) == 0
7958 || (n
->value
& (GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
)) == 0))
7960 tree nc
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
7962 OMP_CLAUSE_DECL (nc
) = decl
;
7963 OMP_CLAUSE_SIZE (nc
) = size_zero_node
;
7964 if (ctx
->target_firstprivatize_array_bases
)
7965 OMP_CLAUSE_SET_MAP_KIND (nc
,
7966 GOMP_MAP_FIRSTPRIVATE_POINTER
);
7968 OMP_CLAUSE_SET_MAP_KIND (nc
, GOMP_MAP_POINTER
);
7969 OMP_CLAUSE_CHAIN (nc
) = OMP_CLAUSE_CHAIN (c
);
7970 OMP_CLAUSE_CHAIN (c
) = nc
;
7976 if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
7977 OMP_CLAUSE_SIZE (c
) = DECL_SIZE_UNIT (decl
);
7978 gcc_assert ((n
->value
& GOVD_SEEN
) == 0
7979 || ((n
->value
& (GOVD_PRIVATE
| GOVD_FIRSTPRIVATE
))
7985 case OMP_CLAUSE_FROM
:
7986 case OMP_CLAUSE__CACHE_
:
7987 decl
= OMP_CLAUSE_DECL (c
);
7990 if (DECL_SIZE (decl
)
7991 && TREE_CODE (DECL_SIZE (decl
)) != INTEGER_CST
)
7993 tree decl2
= DECL_VALUE_EXPR (decl
);
7994 gcc_assert (TREE_CODE (decl2
) == INDIRECT_REF
);
7995 decl2
= TREE_OPERAND (decl2
, 0);
7996 gcc_assert (DECL_P (decl2
));
7997 tree mem
= build_simple_mem_ref (decl2
);
7998 OMP_CLAUSE_DECL (c
) = mem
;
7999 OMP_CLAUSE_SIZE (c
) = TYPE_SIZE_UNIT (TREE_TYPE (decl
));
8000 if (ctx
->outer_context
)
8002 omp_notice_variable (ctx
->outer_context
, decl2
, true);
8003 omp_notice_variable (ctx
->outer_context
,
8004 OMP_CLAUSE_SIZE (c
), true);
8007 else if (OMP_CLAUSE_SIZE (c
) == NULL_TREE
)
8008 OMP_CLAUSE_SIZE (c
) = DECL_SIZE_UNIT (decl
);
8011 case OMP_CLAUSE_REDUCTION
:
8012 decl
= OMP_CLAUSE_DECL (c
);
8014 && omp_shared_to_firstprivate_optimizable_decl_p (decl
))
8015 omp_mark_stores (gimplify_omp_ctxp
->outer_context
, decl
);
8017 case OMP_CLAUSE_COPYIN
:
8018 case OMP_CLAUSE_COPYPRIVATE
:
8020 case OMP_CLAUSE_NUM_THREADS
:
8021 case OMP_CLAUSE_NUM_TEAMS
:
8022 case OMP_CLAUSE_THREAD_LIMIT
:
8023 case OMP_CLAUSE_DIST_SCHEDULE
:
8024 case OMP_CLAUSE_DEVICE
:
8025 case OMP_CLAUSE_SCHEDULE
:
8026 case OMP_CLAUSE_NOWAIT
:
8027 case OMP_CLAUSE_ORDERED
:
8028 case OMP_CLAUSE_DEFAULT
:
8029 case OMP_CLAUSE_UNTIED
:
8030 case OMP_CLAUSE_COLLAPSE
:
8031 case OMP_CLAUSE_FINAL
:
8032 case OMP_CLAUSE_MERGEABLE
:
8033 case OMP_CLAUSE_PROC_BIND
:
8034 case OMP_CLAUSE_SAFELEN
:
8035 case OMP_CLAUSE_SIMDLEN
:
8036 case OMP_CLAUSE_DEPEND
:
8037 case OMP_CLAUSE_PRIORITY
:
8038 case OMP_CLAUSE_GRAINSIZE
:
8039 case OMP_CLAUSE_NUM_TASKS
:
8040 case OMP_CLAUSE_NOGROUP
:
8041 case OMP_CLAUSE_THREADS
:
8042 case OMP_CLAUSE_SIMD
:
8043 case OMP_CLAUSE_HINT
:
8044 case OMP_CLAUSE_DEFAULTMAP
:
8045 case OMP_CLAUSE_USE_DEVICE_PTR
:
8046 case OMP_CLAUSE_IS_DEVICE_PTR
:
8047 case OMP_CLAUSE__CILK_FOR_COUNT_
:
8048 case OMP_CLAUSE_ASYNC
:
8049 case OMP_CLAUSE_WAIT
:
8050 case OMP_CLAUSE_DEVICE_RESIDENT
:
8051 case OMP_CLAUSE_INDEPENDENT
:
8052 case OMP_CLAUSE_NUM_GANGS
:
8053 case OMP_CLAUSE_NUM_WORKERS
:
8054 case OMP_CLAUSE_VECTOR_LENGTH
:
8055 case OMP_CLAUSE_GANG
:
8056 case OMP_CLAUSE_WORKER
:
8057 case OMP_CLAUSE_VECTOR
:
8058 case OMP_CLAUSE_AUTO
:
8059 case OMP_CLAUSE_SEQ
:
8060 case OMP_CLAUSE_TILE
:
8068 *list_p
= OMP_CLAUSE_CHAIN (c
);
8070 list_p
= &OMP_CLAUSE_CHAIN (c
);
8073 /* Add in any implicit data sharing. */
8074 struct gimplify_adjust_omp_clauses_data data
;
8075 data
.list_p
= list_p
;
8077 splay_tree_foreach (ctx
->variables
, gimplify_adjust_omp_clauses_1
, &data
);
8079 gimplify_omp_ctxp
= ctx
->outer_context
;
8080 delete_omp_context (ctx
);
8083 /* Gimplify OACC_CACHE. */
8086 gimplify_oacc_cache (tree
*expr_p
, gimple_seq
*pre_p
)
8088 tree expr
= *expr_p
;
8090 gimplify_scan_omp_clauses (&OACC_CACHE_CLAUSES (expr
), pre_p
, ORT_ACC
,
8092 gimplify_adjust_omp_clauses (pre_p
, NULL
, &OACC_CACHE_CLAUSES (expr
),
8095 /* TODO: Do something sensible with this information. */
8097 *expr_p
= NULL_TREE
;
8100 /* Helper function of gimplify_oacc_declare. The helper's purpose is to,
8101 if required, translate 'kind' in CLAUSE into an 'entry' kind and 'exit'
8102 kind. The entry kind will replace the one in CLAUSE, while the exit
8103 kind will be used in a new omp_clause and returned to the caller. */
8106 gimplify_oacc_declare_1 (tree clause
)
8108 HOST_WIDE_INT kind
, new_op
;
8112 kind
= OMP_CLAUSE_MAP_KIND (clause
);
8116 case GOMP_MAP_ALLOC
:
8117 case GOMP_MAP_FORCE_ALLOC
:
8118 case GOMP_MAP_FORCE_TO
:
8119 new_op
= GOMP_MAP_FORCE_DEALLOC
;
8123 case GOMP_MAP_FORCE_FROM
:
8124 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_FORCE_ALLOC
);
8125 new_op
= GOMP_MAP_FORCE_FROM
;
8129 case GOMP_MAP_FORCE_TOFROM
:
8130 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_FORCE_TO
);
8131 new_op
= GOMP_MAP_FORCE_FROM
;
8136 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_FORCE_ALLOC
);
8137 new_op
= GOMP_MAP_FROM
;
8141 case GOMP_MAP_TOFROM
:
8142 OMP_CLAUSE_SET_MAP_KIND (clause
, GOMP_MAP_TO
);
8143 new_op
= GOMP_MAP_FROM
;
8147 case GOMP_MAP_DEVICE_RESIDENT
:
8148 case GOMP_MAP_FORCE_DEVICEPTR
:
8149 case GOMP_MAP_FORCE_PRESENT
:
8151 case GOMP_MAP_POINTER
:
8162 c
= build_omp_clause (OMP_CLAUSE_LOCATION (clause
), OMP_CLAUSE_MAP
);
8163 OMP_CLAUSE_SET_MAP_KIND (c
, new_op
);
8164 OMP_CLAUSE_DECL (c
) = OMP_CLAUSE_DECL (clause
);
8170 /* Gimplify OACC_DECLARE. */
8173 gimplify_oacc_declare (tree
*expr_p
, gimple_seq
*pre_p
)
8175 tree expr
= *expr_p
;
8179 clauses
= OACC_DECLARE_CLAUSES (expr
);
8181 gimplify_scan_omp_clauses (&clauses
, pre_p
, ORT_TARGET_DATA
, OACC_DECLARE
);
8183 for (t
= clauses
; t
; t
= OMP_CLAUSE_CHAIN (t
))
8185 tree decl
= OMP_CLAUSE_DECL (t
);
8187 if (TREE_CODE (decl
) == MEM_REF
)
8190 if (TREE_CODE (decl
) == VAR_DECL
8191 && !is_global_var (decl
)
8192 && DECL_CONTEXT (decl
) == current_function_decl
)
8194 tree c
= gimplify_oacc_declare_1 (t
);
8197 if (oacc_declare_returns
== NULL
)
8198 oacc_declare_returns
= new hash_map
<tree
, tree
>;
8200 oacc_declare_returns
->put (decl
, c
);
8204 omp_add_variable (gimplify_omp_ctxp
, decl
, GOVD_SEEN
);
8207 stmt
= gimple_build_omp_target (NULL
, GF_OMP_TARGET_KIND_OACC_DECLARE
,
8210 gimplify_seq_add_stmt (pre_p
, stmt
);
8212 *expr_p
= NULL_TREE
;
8215 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
8216 gimplification of the body, as well as scanning the body for used
8217 variables. We need to do this scan now, because variable-sized
8218 decls will be decomposed during gimplification. */
8221 gimplify_omp_parallel (tree
*expr_p
, gimple_seq
*pre_p
)
8223 tree expr
= *expr_p
;
8225 gimple_seq body
= NULL
;
8227 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr
), pre_p
,
8228 OMP_PARALLEL_COMBINED (expr
)
8229 ? ORT_COMBINED_PARALLEL
8230 : ORT_PARALLEL
, OMP_PARALLEL
);
8232 push_gimplify_context ();
8234 g
= gimplify_and_return_first (OMP_PARALLEL_BODY (expr
), &body
);
8235 if (gimple_code (g
) == GIMPLE_BIND
)
8236 pop_gimplify_context (g
);
8238 pop_gimplify_context (NULL
);
8240 gimplify_adjust_omp_clauses (pre_p
, body
, &OMP_PARALLEL_CLAUSES (expr
),
8243 g
= gimple_build_omp_parallel (body
,
8244 OMP_PARALLEL_CLAUSES (expr
),
8245 NULL_TREE
, NULL_TREE
);
8246 if (OMP_PARALLEL_COMBINED (expr
))
8247 gimple_omp_set_subcode (g
, GF_OMP_PARALLEL_COMBINED
);
8248 gimplify_seq_add_stmt (pre_p
, g
);
8249 *expr_p
= NULL_TREE
;
8252 /* Gimplify the contents of an OMP_TASK statement. This involves
8253 gimplification of the body, as well as scanning the body for used
8254 variables. We need to do this scan now, because variable-sized
8255 decls will be decomposed during gimplification. */
8258 gimplify_omp_task (tree
*expr_p
, gimple_seq
*pre_p
)
8260 tree expr
= *expr_p
;
8262 gimple_seq body
= NULL
;
8264 gimplify_scan_omp_clauses (&OMP_TASK_CLAUSES (expr
), pre_p
,
8265 find_omp_clause (OMP_TASK_CLAUSES (expr
),
8267 ? ORT_UNTIED_TASK
: ORT_TASK
, OMP_TASK
);
8269 push_gimplify_context ();
8271 g
= gimplify_and_return_first (OMP_TASK_BODY (expr
), &body
);
8272 if (gimple_code (g
) == GIMPLE_BIND
)
8273 pop_gimplify_context (g
);
8275 pop_gimplify_context (NULL
);
8277 gimplify_adjust_omp_clauses (pre_p
, body
, &OMP_TASK_CLAUSES (expr
),
8280 g
= gimple_build_omp_task (body
,
8281 OMP_TASK_CLAUSES (expr
),
8282 NULL_TREE
, NULL_TREE
,
8283 NULL_TREE
, NULL_TREE
, NULL_TREE
);
8284 gimplify_seq_add_stmt (pre_p
, g
);
8285 *expr_p
= NULL_TREE
;
8288 /* Helper function of gimplify_omp_for, find OMP_FOR resp. OMP_SIMD
8289 with non-NULL OMP_FOR_INIT. */
8292 find_combined_omp_for (tree
*tp
, int *walk_subtrees
, void *)
8295 switch (TREE_CODE (*tp
))
8301 if (OMP_FOR_INIT (*tp
) != NULL_TREE
)
8305 case STATEMENT_LIST
:
8315 /* Gimplify the gross structure of an OMP_FOR statement. */
8317 static enum gimplify_status
8318 gimplify_omp_for (tree
*expr_p
, gimple_seq
*pre_p
)
8320 tree for_stmt
, orig_for_stmt
, inner_for_stmt
= NULL_TREE
, decl
, var
, t
;
8321 enum gimplify_status ret
= GS_ALL_DONE
;
8322 enum gimplify_status tret
;
8324 gimple_seq for_body
, for_pre_body
;
8326 bitmap has_decl_expr
= NULL
;
8327 enum omp_region_type ort
= ORT_WORKSHARE
;
8329 orig_for_stmt
= for_stmt
= *expr_p
;
8331 switch (TREE_CODE (for_stmt
))
8335 case OMP_DISTRIBUTE
:
8341 if (find_omp_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_UNTIED
))
8342 ort
= ORT_UNTIED_TASK
;
8354 /* Set OMP_CLAUSE_LINEAR_NO_COPYIN flag on explicit linear
8355 clause for the IV. */
8356 if (ort
== ORT_SIMD
&& TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) == 1)
8358 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), 0);
8359 gcc_assert (TREE_CODE (t
) == MODIFY_EXPR
);
8360 decl
= TREE_OPERAND (t
, 0);
8361 for (tree c
= OMP_FOR_CLAUSES (for_stmt
); c
; c
= OMP_CLAUSE_CHAIN (c
))
8362 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
8363 && OMP_CLAUSE_DECL (c
) == decl
)
8365 OMP_CLAUSE_LINEAR_NO_COPYIN (c
) = 1;
8370 if (OMP_FOR_INIT (for_stmt
) == NULL_TREE
)
8372 gcc_assert (TREE_CODE (for_stmt
) != OACC_LOOP
);
8373 inner_for_stmt
= walk_tree (&OMP_FOR_BODY (for_stmt
),
8374 find_combined_omp_for
, NULL
, NULL
);
8375 if (inner_for_stmt
== NULL_TREE
)
8377 gcc_assert (seen_error ());
8378 *expr_p
= NULL_TREE
;
8383 if (TREE_CODE (for_stmt
) != OMP_TASKLOOP
)
8384 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt
), pre_p
, ort
,
8385 TREE_CODE (for_stmt
));
8387 if (TREE_CODE (for_stmt
) == OMP_DISTRIBUTE
)
8388 gimplify_omp_ctxp
->distribute
= true;
8390 /* Handle OMP_FOR_INIT. */
8391 for_pre_body
= NULL
;
8392 if (ort
== ORT_SIMD
&& OMP_FOR_PRE_BODY (for_stmt
))
8394 has_decl_expr
= BITMAP_ALLOC (NULL
);
8395 if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt
)) == DECL_EXPR
8396 && TREE_CODE (DECL_EXPR_DECL (OMP_FOR_PRE_BODY (for_stmt
)))
8399 t
= OMP_FOR_PRE_BODY (for_stmt
);
8400 bitmap_set_bit (has_decl_expr
, DECL_UID (DECL_EXPR_DECL (t
)));
8402 else if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt
)) == STATEMENT_LIST
)
8404 tree_stmt_iterator si
;
8405 for (si
= tsi_start (OMP_FOR_PRE_BODY (for_stmt
)); !tsi_end_p (si
);
8409 if (TREE_CODE (t
) == DECL_EXPR
8410 && TREE_CODE (DECL_EXPR_DECL (t
)) == VAR_DECL
)
8411 bitmap_set_bit (has_decl_expr
, DECL_UID (DECL_EXPR_DECL (t
)));
8415 if (OMP_FOR_PRE_BODY (for_stmt
))
8417 if (TREE_CODE (for_stmt
) != OMP_TASKLOOP
|| gimplify_omp_ctxp
)
8418 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt
), &for_pre_body
);
8421 struct gimplify_omp_ctx ctx
;
8422 memset (&ctx
, 0, sizeof (ctx
));
8423 ctx
.region_type
= ORT_NONE
;
8424 gimplify_omp_ctxp
= &ctx
;
8425 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt
), &for_pre_body
);
8426 gimplify_omp_ctxp
= NULL
;
8429 OMP_FOR_PRE_BODY (for_stmt
) = NULL_TREE
;
8431 if (OMP_FOR_INIT (for_stmt
) == NULL_TREE
)
8432 for_stmt
= inner_for_stmt
;
8434 /* For taskloop, need to gimplify the start, end and step before the
8435 taskloop, outside of the taskloop omp context. */
8436 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
8438 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
8440 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
8441 if (!is_gimple_constant (TREE_OPERAND (t
, 1)))
8444 = get_initialized_tmp_var (TREE_OPERAND (t
, 1),
8446 tree c
= build_omp_clause (input_location
,
8447 OMP_CLAUSE_FIRSTPRIVATE
);
8448 OMP_CLAUSE_DECL (c
) = TREE_OPERAND (t
, 1);
8449 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (orig_for_stmt
);
8450 OMP_FOR_CLAUSES (orig_for_stmt
) = c
;
8453 /* Handle OMP_FOR_COND. */
8454 t
= TREE_VEC_ELT (OMP_FOR_COND (for_stmt
), i
);
8455 if (!is_gimple_constant (TREE_OPERAND (t
, 1)))
8458 = get_initialized_tmp_var (TREE_OPERAND (t
, 1),
8459 gimple_seq_empty_p (for_pre_body
)
8460 ? pre_p
: &for_pre_body
, NULL
);
8461 tree c
= build_omp_clause (input_location
,
8462 OMP_CLAUSE_FIRSTPRIVATE
);
8463 OMP_CLAUSE_DECL (c
) = TREE_OPERAND (t
, 1);
8464 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (orig_for_stmt
);
8465 OMP_FOR_CLAUSES (orig_for_stmt
) = c
;
8468 /* Handle OMP_FOR_INCR. */
8469 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
8470 if (TREE_CODE (t
) == MODIFY_EXPR
)
8472 decl
= TREE_OPERAND (t
, 0);
8473 t
= TREE_OPERAND (t
, 1);
8474 tree
*tp
= &TREE_OPERAND (t
, 1);
8475 if (TREE_CODE (t
) == PLUS_EXPR
&& *tp
== decl
)
8476 tp
= &TREE_OPERAND (t
, 0);
8478 if (!is_gimple_constant (*tp
))
8480 gimple_seq
*seq
= gimple_seq_empty_p (for_pre_body
)
8481 ? pre_p
: &for_pre_body
;
8482 *tp
= get_initialized_tmp_var (*tp
, seq
, NULL
);
8483 tree c
= build_omp_clause (input_location
,
8484 OMP_CLAUSE_FIRSTPRIVATE
);
8485 OMP_CLAUSE_DECL (c
) = *tp
;
8486 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (orig_for_stmt
);
8487 OMP_FOR_CLAUSES (orig_for_stmt
) = c
;
8492 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (orig_for_stmt
), pre_p
, ort
,
8496 if (orig_for_stmt
!= for_stmt
)
8497 gimplify_omp_ctxp
->combined_loop
= true;
8500 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
))
8501 == TREE_VEC_LENGTH (OMP_FOR_COND (for_stmt
)));
8502 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
))
8503 == TREE_VEC_LENGTH (OMP_FOR_INCR (for_stmt
)));
8505 tree c
= find_omp_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_ORDERED
);
8506 bool is_doacross
= false;
8507 if (c
&& OMP_CLAUSE_ORDERED_EXPR (c
))
8510 gimplify_omp_ctxp
->loop_iter_var
.create (TREE_VEC_LENGTH
8511 (OMP_FOR_INIT (for_stmt
))
8515 c
= find_omp_clause (OMP_FOR_CLAUSES (for_stmt
), OMP_CLAUSE_COLLAPSE
);
8517 collapse
= tree_to_shwi (OMP_CLAUSE_COLLAPSE_EXPR (c
));
8518 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
8520 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
8521 gcc_assert (TREE_CODE (t
) == MODIFY_EXPR
);
8522 decl
= TREE_OPERAND (t
, 0);
8523 gcc_assert (DECL_P (decl
));
8524 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl
))
8525 || POINTER_TYPE_P (TREE_TYPE (decl
)));
8528 if (TREE_CODE (for_stmt
) == OMP_FOR
&& OMP_FOR_ORIG_DECLS (for_stmt
))
8529 gimplify_omp_ctxp
->loop_iter_var
.quick_push
8530 (TREE_VEC_ELT (OMP_FOR_ORIG_DECLS (for_stmt
), i
));
8532 gimplify_omp_ctxp
->loop_iter_var
.quick_push (decl
);
8533 gimplify_omp_ctxp
->loop_iter_var
.quick_push (decl
);
8536 /* Make sure the iteration variable is private. */
8538 tree c2
= NULL_TREE
;
8539 if (orig_for_stmt
!= for_stmt
)
8540 /* Do this only on innermost construct for combined ones. */;
8541 else if (ort
== ORT_SIMD
)
8543 splay_tree_node n
= splay_tree_lookup (gimplify_omp_ctxp
->variables
,
8544 (splay_tree_key
) decl
);
8545 omp_is_private (gimplify_omp_ctxp
, decl
,
8546 1 + (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
))
8548 if (n
!= NULL
&& (n
->value
& GOVD_DATA_SHARE_CLASS
) != 0)
8549 omp_notice_variable (gimplify_omp_ctxp
, decl
, true);
8550 else if (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) == 1)
8552 c
= build_omp_clause (input_location
, OMP_CLAUSE_LINEAR
);
8553 OMP_CLAUSE_LINEAR_NO_COPYIN (c
) = 1;
8554 unsigned int flags
= GOVD_LINEAR
| GOVD_EXPLICIT
| GOVD_SEEN
;
8556 && bitmap_bit_p (has_decl_expr
, DECL_UID (decl
)))
8557 || omp_no_lastprivate (gimplify_omp_ctxp
))
8559 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
8560 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
8562 struct gimplify_omp_ctx
*outer
8563 = gimplify_omp_ctxp
->outer_context
;
8564 if (outer
&& !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
8566 if (outer
->region_type
== ORT_WORKSHARE
8567 && outer
->combined_loop
)
8569 n
= splay_tree_lookup (outer
->variables
,
8570 (splay_tree_key
)decl
);
8571 if (n
!= NULL
&& (n
->value
& GOVD_LOCAL
) != 0)
8573 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
8574 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
8578 struct gimplify_omp_ctx
*octx
= outer
->outer_context
;
8580 && octx
->region_type
== ORT_COMBINED_PARALLEL
8581 && octx
->outer_context
8582 && (octx
->outer_context
->region_type
8584 && octx
->outer_context
->combined_loop
)
8586 octx
= octx
->outer_context
;
8587 n
= splay_tree_lookup (octx
->variables
,
8588 (splay_tree_key
)decl
);
8589 if (n
!= NULL
&& (n
->value
& GOVD_LOCAL
) != 0)
8591 OMP_CLAUSE_LINEAR_NO_COPYOUT (c
) = 1;
8592 flags
|= GOVD_LINEAR_LASTPRIVATE_NO_OUTER
;
8599 OMP_CLAUSE_DECL (c
) = decl
;
8600 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (for_stmt
);
8601 OMP_FOR_CLAUSES (for_stmt
) = c
;
8602 omp_add_variable (gimplify_omp_ctxp
, decl
, flags
);
8603 if (outer
&& !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
))
8605 if (outer
->region_type
== ORT_WORKSHARE
8606 && outer
->combined_loop
)
8608 if (outer
->outer_context
8609 && (outer
->outer_context
->region_type
8610 == ORT_COMBINED_PARALLEL
))
8611 outer
= outer
->outer_context
;
8612 else if (omp_check_private (outer
, decl
, false))
8615 else if (((outer
->region_type
& ORT_TASK
) != 0)
8616 && outer
->combined_loop
8617 && !omp_check_private (gimplify_omp_ctxp
,
8620 else if (outer
->region_type
!= ORT_COMBINED_PARALLEL
)
8624 n
= splay_tree_lookup (outer
->variables
,
8625 (splay_tree_key
)decl
);
8626 if (n
== NULL
|| (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
8628 omp_add_variable (outer
, decl
,
8629 GOVD_LASTPRIVATE
| GOVD_SEEN
);
8630 if (outer
->region_type
== ORT_COMBINED_PARALLEL
8631 && outer
->outer_context
8632 && (outer
->outer_context
->region_type
8634 && outer
->outer_context
->combined_loop
)
8636 outer
= outer
->outer_context
;
8637 n
= splay_tree_lookup (outer
->variables
,
8638 (splay_tree_key
)decl
);
8639 if (omp_check_private (outer
, decl
, false))
8642 || ((n
->value
& GOVD_DATA_SHARE_CLASS
)
8644 omp_add_variable (outer
, decl
,
8650 if (outer
&& outer
->outer_context
8651 && (outer
->outer_context
->region_type
8652 == ORT_COMBINED_TEAMS
))
8654 outer
= outer
->outer_context
;
8655 n
= splay_tree_lookup (outer
->variables
,
8656 (splay_tree_key
)decl
);
8658 || (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
8659 omp_add_variable (outer
, decl
,
8660 GOVD_SHARED
| GOVD_SEEN
);
8664 if (outer
&& outer
->outer_context
)
8665 omp_notice_variable (outer
->outer_context
, decl
,
8675 || !bitmap_bit_p (has_decl_expr
, DECL_UID (decl
)))
8676 && !omp_no_lastprivate (gimplify_omp_ctxp
);
8677 struct gimplify_omp_ctx
*outer
8678 = gimplify_omp_ctxp
->outer_context
;
8679 if (outer
&& lastprivate
)
8681 if (outer
->region_type
== ORT_WORKSHARE
8682 && outer
->combined_loop
)
8684 n
= splay_tree_lookup (outer
->variables
,
8685 (splay_tree_key
)decl
);
8686 if (n
!= NULL
&& (n
->value
& GOVD_LOCAL
) != 0)
8688 lastprivate
= false;
8691 else if (outer
->outer_context
8692 && (outer
->outer_context
->region_type
8693 == ORT_COMBINED_PARALLEL
))
8694 outer
= outer
->outer_context
;
8695 else if (omp_check_private (outer
, decl
, false))
8698 else if (((outer
->region_type
& ORT_TASK
) != 0)
8699 && outer
->combined_loop
8700 && !omp_check_private (gimplify_omp_ctxp
,
8703 else if (outer
->region_type
!= ORT_COMBINED_PARALLEL
)
8707 n
= splay_tree_lookup (outer
->variables
,
8708 (splay_tree_key
)decl
);
8709 if (n
== NULL
|| (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
8711 omp_add_variable (outer
, decl
,
8712 GOVD_LASTPRIVATE
| GOVD_SEEN
);
8713 if (outer
->region_type
== ORT_COMBINED_PARALLEL
8714 && outer
->outer_context
8715 && (outer
->outer_context
->region_type
8717 && outer
->outer_context
->combined_loop
)
8719 outer
= outer
->outer_context
;
8720 n
= splay_tree_lookup (outer
->variables
,
8721 (splay_tree_key
)decl
);
8722 if (omp_check_private (outer
, decl
, false))
8725 || ((n
->value
& GOVD_DATA_SHARE_CLASS
)
8727 omp_add_variable (outer
, decl
,
8733 if (outer
&& outer
->outer_context
8734 && (outer
->outer_context
->region_type
8735 == ORT_COMBINED_TEAMS
))
8737 outer
= outer
->outer_context
;
8738 n
= splay_tree_lookup (outer
->variables
,
8739 (splay_tree_key
)decl
);
8741 || (n
->value
& GOVD_DATA_SHARE_CLASS
) == 0)
8742 omp_add_variable (outer
, decl
,
8743 GOVD_SHARED
| GOVD_SEEN
);
8747 if (outer
&& outer
->outer_context
)
8748 omp_notice_variable (outer
->outer_context
, decl
,
8754 c
= build_omp_clause (input_location
,
8755 lastprivate
? OMP_CLAUSE_LASTPRIVATE
8756 : OMP_CLAUSE_PRIVATE
);
8757 OMP_CLAUSE_DECL (c
) = decl
;
8758 OMP_CLAUSE_CHAIN (c
) = OMP_FOR_CLAUSES (for_stmt
);
8759 OMP_FOR_CLAUSES (for_stmt
) = c
;
8760 omp_add_variable (gimplify_omp_ctxp
, decl
,
8761 (lastprivate
? GOVD_LASTPRIVATE
: GOVD_PRIVATE
)
8762 | GOVD_EXPLICIT
| GOVD_SEEN
);
8766 else if (omp_is_private (gimplify_omp_ctxp
, decl
, 0))
8767 omp_notice_variable (gimplify_omp_ctxp
, decl
, true);
8769 omp_add_variable (gimplify_omp_ctxp
, decl
, GOVD_PRIVATE
| GOVD_SEEN
);
8771 /* If DECL is not a gimple register, create a temporary variable to act
8772 as an iteration counter. This is valid, since DECL cannot be
8773 modified in the body of the loop. Similarly for any iteration vars
8774 in simd with collapse > 1 where the iterator vars must be
8776 if (orig_for_stmt
!= for_stmt
)
8778 else if (!is_gimple_reg (decl
)
8780 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) > 1))
8782 var
= create_tmp_var (TREE_TYPE (decl
), get_name (decl
));
8783 TREE_OPERAND (t
, 0) = var
;
8785 gimplify_seq_add_stmt (&for_body
, gimple_build_assign (decl
, var
));
8788 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)) == 1)
8790 c2
= build_omp_clause (input_location
, OMP_CLAUSE_LINEAR
);
8791 OMP_CLAUSE_LINEAR_NO_COPYIN (c2
) = 1;
8792 OMP_CLAUSE_LINEAR_NO_COPYOUT (c2
) = 1;
8793 OMP_CLAUSE_DECL (c2
) = var
;
8794 OMP_CLAUSE_CHAIN (c2
) = OMP_FOR_CLAUSES (for_stmt
);
8795 OMP_FOR_CLAUSES (for_stmt
) = c2
;
8796 omp_add_variable (gimplify_omp_ctxp
, var
,
8797 GOVD_LINEAR
| GOVD_EXPLICIT
| GOVD_SEEN
);
8805 omp_add_variable (gimplify_omp_ctxp
, var
,
8806 GOVD_PRIVATE
| GOVD_SEEN
);
8811 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), &for_pre_body
, NULL
,
8812 is_gimple_val
, fb_rvalue
);
8813 ret
= MIN (ret
, tret
);
8814 if (ret
== GS_ERROR
)
8817 /* Handle OMP_FOR_COND. */
8818 t
= TREE_VEC_ELT (OMP_FOR_COND (for_stmt
), i
);
8819 gcc_assert (COMPARISON_CLASS_P (t
));
8820 gcc_assert (TREE_OPERAND (t
, 0) == decl
);
8822 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), &for_pre_body
, NULL
,
8823 is_gimple_val
, fb_rvalue
);
8824 ret
= MIN (ret
, tret
);
8826 /* Handle OMP_FOR_INCR. */
8827 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
8828 switch (TREE_CODE (t
))
8830 case PREINCREMENT_EXPR
:
8831 case POSTINCREMENT_EXPR
:
8833 tree decl
= TREE_OPERAND (t
, 0);
8834 /* c_omp_for_incr_canonicalize_ptr() should have been
8835 called to massage things appropriately. */
8836 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl
)));
8838 if (orig_for_stmt
!= for_stmt
)
8840 t
= build_int_cst (TREE_TYPE (decl
), 1);
8842 OMP_CLAUSE_LINEAR_STEP (c
) = t
;
8843 t
= build2 (PLUS_EXPR
, TREE_TYPE (decl
), var
, t
);
8844 t
= build2 (MODIFY_EXPR
, TREE_TYPE (var
), var
, t
);
8845 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
) = t
;
8849 case PREDECREMENT_EXPR
:
8850 case POSTDECREMENT_EXPR
:
8851 /* c_omp_for_incr_canonicalize_ptr() should have been
8852 called to massage things appropriately. */
8853 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl
)));
8854 if (orig_for_stmt
!= for_stmt
)
8856 t
= build_int_cst (TREE_TYPE (decl
), -1);
8858 OMP_CLAUSE_LINEAR_STEP (c
) = t
;
8859 t
= build2 (PLUS_EXPR
, TREE_TYPE (decl
), var
, t
);
8860 t
= build2 (MODIFY_EXPR
, TREE_TYPE (var
), var
, t
);
8861 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
) = t
;
8865 gcc_assert (TREE_OPERAND (t
, 0) == decl
);
8866 TREE_OPERAND (t
, 0) = var
;
8868 t
= TREE_OPERAND (t
, 1);
8869 switch (TREE_CODE (t
))
8872 if (TREE_OPERAND (t
, 1) == decl
)
8874 TREE_OPERAND (t
, 1) = TREE_OPERAND (t
, 0);
8875 TREE_OPERAND (t
, 0) = var
;
8881 case POINTER_PLUS_EXPR
:
8882 gcc_assert (TREE_OPERAND (t
, 0) == decl
);
8883 TREE_OPERAND (t
, 0) = var
;
8889 tret
= gimplify_expr (&TREE_OPERAND (t
, 1), &for_pre_body
, NULL
,
8890 is_gimple_val
, fb_rvalue
);
8891 ret
= MIN (ret
, tret
);
8894 tree step
= TREE_OPERAND (t
, 1);
8895 tree stept
= TREE_TYPE (decl
);
8896 if (POINTER_TYPE_P (stept
))
8898 step
= fold_convert (stept
, step
);
8899 if (TREE_CODE (t
) == MINUS_EXPR
)
8900 step
= fold_build1 (NEGATE_EXPR
, stept
, step
);
8901 OMP_CLAUSE_LINEAR_STEP (c
) = step
;
8902 if (step
!= TREE_OPERAND (t
, 1))
8904 tret
= gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c
),
8905 &for_pre_body
, NULL
,
8906 is_gimple_val
, fb_rvalue
);
8907 ret
= MIN (ret
, tret
);
8919 OMP_CLAUSE_LINEAR_STEP (c2
) = OMP_CLAUSE_LINEAR_STEP (c
);
8922 if ((var
!= decl
|| collapse
> 1) && orig_for_stmt
== for_stmt
)
8924 for (c
= OMP_FOR_CLAUSES (for_stmt
); c
; c
= OMP_CLAUSE_CHAIN (c
))
8925 if (((OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
8926 && OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
) == NULL
)
8927 || (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LINEAR
8928 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c
)
8929 && OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
) == NULL
))
8930 && OMP_CLAUSE_DECL (c
) == decl
)
8932 if (is_doacross
&& (collapse
== 1 || i
>= collapse
))
8936 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
8937 gcc_assert (TREE_CODE (t
) == MODIFY_EXPR
);
8938 gcc_assert (TREE_OPERAND (t
, 0) == var
);
8939 t
= TREE_OPERAND (t
, 1);
8940 gcc_assert (TREE_CODE (t
) == PLUS_EXPR
8941 || TREE_CODE (t
) == MINUS_EXPR
8942 || TREE_CODE (t
) == POINTER_PLUS_EXPR
);
8943 gcc_assert (TREE_OPERAND (t
, 0) == var
);
8944 t
= build2 (TREE_CODE (t
), TREE_TYPE (decl
),
8945 is_doacross
? var
: decl
,
8946 TREE_OPERAND (t
, 1));
8949 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_LASTPRIVATE
)
8950 seq
= &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c
);
8952 seq
= &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c
);
8953 gimplify_assign (decl
, t
, seq
);
8958 BITMAP_FREE (has_decl_expr
);
8960 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
8962 push_gimplify_context ();
8963 if (TREE_CODE (OMP_FOR_BODY (orig_for_stmt
)) != BIND_EXPR
)
8965 OMP_FOR_BODY (orig_for_stmt
)
8966 = build3 (BIND_EXPR
, void_type_node
, NULL
,
8967 OMP_FOR_BODY (orig_for_stmt
), NULL
);
8968 TREE_SIDE_EFFECTS (OMP_FOR_BODY (orig_for_stmt
)) = 1;
8972 gimple
*g
= gimplify_and_return_first (OMP_FOR_BODY (orig_for_stmt
),
8975 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
8977 if (gimple_code (g
) == GIMPLE_BIND
)
8978 pop_gimplify_context (g
);
8980 pop_gimplify_context (NULL
);
8983 if (orig_for_stmt
!= for_stmt
)
8984 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
8986 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
8987 decl
= TREE_OPERAND (t
, 0);
8988 struct gimplify_omp_ctx
*ctx
= gimplify_omp_ctxp
;
8989 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
8990 gimplify_omp_ctxp
= ctx
->outer_context
;
8991 var
= create_tmp_var (TREE_TYPE (decl
), get_name (decl
));
8992 gimplify_omp_ctxp
= ctx
;
8993 omp_add_variable (gimplify_omp_ctxp
, var
, GOVD_PRIVATE
| GOVD_SEEN
);
8994 TREE_OPERAND (t
, 0) = var
;
8995 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
8996 TREE_OPERAND (t
, 1) = copy_node (TREE_OPERAND (t
, 1));
8997 TREE_OPERAND (TREE_OPERAND (t
, 1), 0) = var
;
9000 gimplify_adjust_omp_clauses (pre_p
, for_body
,
9001 &OMP_FOR_CLAUSES (orig_for_stmt
),
9002 TREE_CODE (orig_for_stmt
));
9005 switch (TREE_CODE (orig_for_stmt
))
9007 case OMP_FOR
: kind
= GF_OMP_FOR_KIND_FOR
; break;
9008 case OMP_SIMD
: kind
= GF_OMP_FOR_KIND_SIMD
; break;
9009 case CILK_SIMD
: kind
= GF_OMP_FOR_KIND_CILKSIMD
; break;
9010 case CILK_FOR
: kind
= GF_OMP_FOR_KIND_CILKFOR
; break;
9011 case OMP_DISTRIBUTE
: kind
= GF_OMP_FOR_KIND_DISTRIBUTE
; break;
9012 case OMP_TASKLOOP
: kind
= GF_OMP_FOR_KIND_TASKLOOP
; break;
9013 case OACC_LOOP
: kind
= GF_OMP_FOR_KIND_OACC_LOOP
; break;
9017 gfor
= gimple_build_omp_for (for_body
, kind
, OMP_FOR_CLAUSES (orig_for_stmt
),
9018 TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)),
9020 if (orig_for_stmt
!= for_stmt
)
9021 gimple_omp_for_set_combined_p (gfor
, true);
9022 if (gimplify_omp_ctxp
9023 && (gimplify_omp_ctxp
->combined_loop
9024 || (gimplify_omp_ctxp
->region_type
== ORT_COMBINED_PARALLEL
9025 && gimplify_omp_ctxp
->outer_context
9026 && gimplify_omp_ctxp
->outer_context
->combined_loop
)))
9028 gimple_omp_for_set_combined_into_p (gfor
, true);
9029 if (gimplify_omp_ctxp
->combined_loop
)
9030 gcc_assert (TREE_CODE (orig_for_stmt
) == OMP_SIMD
);
9032 gcc_assert (TREE_CODE (orig_for_stmt
) == OMP_FOR
);
9035 for (i
= 0; i
< TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt
)); i
++)
9037 t
= TREE_VEC_ELT (OMP_FOR_INIT (for_stmt
), i
);
9038 gimple_omp_for_set_index (gfor
, i
, TREE_OPERAND (t
, 0));
9039 gimple_omp_for_set_initial (gfor
, i
, TREE_OPERAND (t
, 1));
9040 t
= TREE_VEC_ELT (OMP_FOR_COND (for_stmt
), i
);
9041 gimple_omp_for_set_cond (gfor
, i
, TREE_CODE (t
));
9042 gimple_omp_for_set_final (gfor
, i
, TREE_OPERAND (t
, 1));
9043 t
= TREE_VEC_ELT (OMP_FOR_INCR (for_stmt
), i
);
9044 gimple_omp_for_set_incr (gfor
, i
, TREE_OPERAND (t
, 1));
9047 /* OMP_TASKLOOP is gimplified as two GIMPLE_OMP_FOR taskloop
9048 constructs with GIMPLE_OMP_TASK sandwiched in between them.
9049 The outer taskloop stands for computing the number of iterations,
9050 counts for collapsed loops and holding taskloop specific clauses.
9051 The task construct stands for the effect of data sharing on the
9052 explicit task it creates and the inner taskloop stands for expansion
9053 of the static loop inside of the explicit task construct. */
9054 if (TREE_CODE (orig_for_stmt
) == OMP_TASKLOOP
)
9056 tree
*gfor_clauses_ptr
= gimple_omp_for_clauses_ptr (gfor
);
9057 tree task_clauses
= NULL_TREE
;
9058 tree c
= *gfor_clauses_ptr
;
9059 tree
*gtask_clauses_ptr
= &task_clauses
;
9060 tree outer_for_clauses
= NULL_TREE
;
9061 tree
*gforo_clauses_ptr
= &outer_for_clauses
;
9062 for (; c
; c
= OMP_CLAUSE_CHAIN (c
))
9063 switch (OMP_CLAUSE_CODE (c
))
9065 /* These clauses are allowed on task, move them there. */
9066 case OMP_CLAUSE_SHARED
:
9067 case OMP_CLAUSE_FIRSTPRIVATE
:
9068 case OMP_CLAUSE_DEFAULT
:
9070 case OMP_CLAUSE_UNTIED
:
9071 case OMP_CLAUSE_FINAL
:
9072 case OMP_CLAUSE_MERGEABLE
:
9073 case OMP_CLAUSE_PRIORITY
:
9074 *gtask_clauses_ptr
= c
;
9075 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
9077 case OMP_CLAUSE_PRIVATE
:
9078 if (OMP_CLAUSE_PRIVATE_TASKLOOP_IV (c
))
9080 /* We want private on outer for and firstprivate
9083 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
9084 OMP_CLAUSE_FIRSTPRIVATE
);
9085 OMP_CLAUSE_DECL (*gtask_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
9086 lang_hooks
.decls
.omp_finish_clause (*gtask_clauses_ptr
, NULL
);
9087 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr
);
9088 *gforo_clauses_ptr
= c
;
9089 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
9093 *gtask_clauses_ptr
= c
;
9094 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
9097 /* These clauses go into outer taskloop clauses. */
9098 case OMP_CLAUSE_GRAINSIZE
:
9099 case OMP_CLAUSE_NUM_TASKS
:
9100 case OMP_CLAUSE_NOGROUP
:
9101 *gforo_clauses_ptr
= c
;
9102 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
9104 /* Taskloop clause we duplicate on both taskloops. */
9105 case OMP_CLAUSE_COLLAPSE
:
9106 *gfor_clauses_ptr
= c
;
9107 gfor_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
9108 *gforo_clauses_ptr
= copy_node (c
);
9109 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr
);
9111 /* For lastprivate, keep the clause on inner taskloop, and add
9112 a shared clause on task. If the same decl is also firstprivate,
9113 add also firstprivate clause on the inner taskloop. */
9114 case OMP_CLAUSE_LASTPRIVATE
:
9115 if (OMP_CLAUSE_LASTPRIVATE_TASKLOOP_IV (c
))
9117 /* For taskloop C++ lastprivate IVs, we want:
9118 1) private on outer taskloop
9119 2) firstprivate and shared on task
9120 3) lastprivate on inner taskloop */
9122 = build_omp_clause (OMP_CLAUSE_LOCATION (c
),
9123 OMP_CLAUSE_FIRSTPRIVATE
);
9124 OMP_CLAUSE_DECL (*gtask_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
9125 lang_hooks
.decls
.omp_finish_clause (*gtask_clauses_ptr
, NULL
);
9126 gtask_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr
);
9127 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
) = 1;
9128 *gforo_clauses_ptr
= build_omp_clause (OMP_CLAUSE_LOCATION (c
),
9129 OMP_CLAUSE_PRIVATE
);
9130 OMP_CLAUSE_DECL (*gforo_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
9131 OMP_CLAUSE_PRIVATE_TASKLOOP_IV (*gforo_clauses_ptr
) = 1;
9132 TREE_TYPE (*gforo_clauses_ptr
) = TREE_TYPE (c
);
9133 gforo_clauses_ptr
= &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr
);
9135 *gfor_clauses_ptr
= c
;
9136 gfor_clauses_ptr
= &OMP_CLAUSE_CHAIN (c
);
9138 = build_omp_clause (OMP_CLAUSE_LOCATION (c
), OMP_CLAUSE_SHARED
);
9139 OMP_CLAUSE_DECL (*gtask_clauses_ptr
) = OMP_CLAUSE_DECL (c
);
9140 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c
))
9141 OMP_CLAUSE_SHARED_FIRSTPRIVATE (*gtask_clauses_ptr
) = 1;
9143 = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr
);
9148 *gfor_clauses_ptr
= NULL_TREE
;
9149 *gtask_clauses_ptr
= NULL_TREE
;
9150 *gforo_clauses_ptr
= NULL_TREE
;
9151 g
= gimple_build_bind (NULL_TREE
, gfor
, NULL_TREE
);
9152 g
= gimple_build_omp_task (g
, task_clauses
, NULL_TREE
, NULL_TREE
,
9153 NULL_TREE
, NULL_TREE
, NULL_TREE
);
9154 gimple_omp_task_set_taskloop_p (g
, true);
9155 g
= gimple_build_bind (NULL_TREE
, g
, NULL_TREE
);
9157 = gimple_build_omp_for (g
, GF_OMP_FOR_KIND_TASKLOOP
, outer_for_clauses
,
9158 gimple_omp_for_collapse (gfor
),
9159 gimple_omp_for_pre_body (gfor
));
9160 gimple_omp_for_set_pre_body (gfor
, NULL
);
9161 gimple_omp_for_set_combined_p (gforo
, true);
9162 gimple_omp_for_set_combined_into_p (gfor
, true);
9163 for (i
= 0; i
< (int) gimple_omp_for_collapse (gfor
); i
++)
9165 t
= unshare_expr (gimple_omp_for_index (gfor
, i
));
9166 gimple_omp_for_set_index (gforo
, i
, t
);
9167 t
= unshare_expr (gimple_omp_for_initial (gfor
, i
));
9168 gimple_omp_for_set_initial (gforo
, i
, t
);
9169 gimple_omp_for_set_cond (gforo
, i
,
9170 gimple_omp_for_cond (gfor
, i
));
9171 t
= unshare_expr (gimple_omp_for_final (gfor
, i
));
9172 gimple_omp_for_set_final (gforo
, i
, t
);
9173 t
= unshare_expr (gimple_omp_for_incr (gfor
, i
));
9174 gimple_omp_for_set_incr (gforo
, i
, t
);
9176 gimplify_seq_add_stmt (pre_p
, gforo
);
9179 gimplify_seq_add_stmt (pre_p
, gfor
);
9180 if (ret
!= GS_ALL_DONE
)
9182 *expr_p
= NULL_TREE
;
9186 /* Helper function of optimize_target_teams, find OMP_TEAMS inside
9187 of OMP_TARGET's body. */
9190 find_omp_teams (tree
*tp
, int *walk_subtrees
, void *)
9193 switch (TREE_CODE (*tp
))
9198 case STATEMENT_LIST
:
9207 /* Helper function of optimize_target_teams, determine if the expression
9208 can be computed safely before the target construct on the host. */
9211 computable_teams_clause (tree
*tp
, int *walk_subtrees
, void *)
9220 switch (TREE_CODE (*tp
))
9226 if (error_operand_p (*tp
)
9227 || !INTEGRAL_TYPE_P (TREE_TYPE (*tp
))
9228 || DECL_HAS_VALUE_EXPR_P (*tp
)
9229 || DECL_THREAD_LOCAL_P (*tp
)
9230 || TREE_SIDE_EFFECTS (*tp
)
9231 || TREE_THIS_VOLATILE (*tp
))
9233 if (is_global_var (*tp
)
9234 && (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (*tp
))
9235 || lookup_attribute ("omp declare target link",
9236 DECL_ATTRIBUTES (*tp
))))
9238 n
= splay_tree_lookup (gimplify_omp_ctxp
->variables
,
9239 (splay_tree_key
) *tp
);
9242 if (gimplify_omp_ctxp
->target_map_scalars_firstprivate
)
9246 else if (n
->value
& GOVD_LOCAL
)
9248 else if (n
->value
& GOVD_FIRSTPRIVATE
)
9250 else if ((n
->value
& (GOVD_MAP
| GOVD_MAP_ALWAYS_TO
))
9251 == (GOVD_MAP
| GOVD_MAP_ALWAYS_TO
))
9255 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp
)))
9259 if (TARGET_EXPR_INITIAL (*tp
)
9260 || TREE_CODE (TARGET_EXPR_SLOT (*tp
)) != VAR_DECL
)
9262 return computable_teams_clause (&TARGET_EXPR_SLOT (*tp
),
9263 walk_subtrees
, NULL
);
9264 /* Allow some reasonable subset of integral arithmetics. */
9268 case TRUNC_DIV_EXPR
:
9270 case FLOOR_DIV_EXPR
:
9271 case ROUND_DIV_EXPR
:
9272 case TRUNC_MOD_EXPR
:
9274 case FLOOR_MOD_EXPR
:
9275 case ROUND_MOD_EXPR
:
9277 case EXACT_DIV_EXPR
:
9288 case NON_LVALUE_EXPR
:
9290 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp
)))
9293 /* And disallow anything else, except for comparisons. */
9295 if (COMPARISON_CLASS_P (*tp
))
9301 /* Try to determine if the num_teams and/or thread_limit expressions
9302 can have their values determined already before entering the
9304 INTEGER_CSTs trivially are,
9305 integral decls that are firstprivate (explicitly or implicitly)
9306 or explicitly map(always, to:) or map(always, tofrom:) on the target
9307 region too, and expressions involving simple arithmetics on those
9308 too, function calls are not ok, dereferencing something neither etc.
9309 Add NUM_TEAMS and THREAD_LIMIT clauses to the OMP_CLAUSES of
9310 EXPR based on what we find:
9311 0 stands for clause not specified at all, use implementation default
9312 -1 stands for value that can't be determined easily before entering
9313 the target construct.
9314 If teams construct is not present at all, use 1 for num_teams
9315 and 0 for thread_limit (only one team is involved, and the thread
9316 limit is implementation defined. */
9319 optimize_target_teams (tree target
, gimple_seq
*pre_p
)
9321 tree body
= OMP_BODY (target
);
9322 tree teams
= walk_tree (&body
, find_omp_teams
, NULL
, NULL
);
9323 tree num_teams
= integer_zero_node
;
9324 tree thread_limit
= integer_zero_node
;
9325 location_t num_teams_loc
= EXPR_LOCATION (target
);
9326 location_t thread_limit_loc
= EXPR_LOCATION (target
);
9328 struct gimplify_omp_ctx
*target_ctx
= gimplify_omp_ctxp
;
9330 if (teams
== NULL_TREE
)
9331 num_teams
= integer_one_node
;
9333 for (c
= OMP_TEAMS_CLAUSES (teams
); c
; c
= OMP_CLAUSE_CHAIN (c
))
9335 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_NUM_TEAMS
)
9338 num_teams_loc
= OMP_CLAUSE_LOCATION (c
);
9340 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_THREAD_LIMIT
)
9343 thread_limit_loc
= OMP_CLAUSE_LOCATION (c
);
9347 expr
= OMP_CLAUSE_OPERAND (c
, 0);
9348 if (TREE_CODE (expr
) == INTEGER_CST
)
9353 if (walk_tree (&expr
, computable_teams_clause
, NULL
, NULL
))
9355 *p
= integer_minus_one_node
;
9359 gimplify_omp_ctxp
= gimplify_omp_ctxp
->outer_context
;
9360 if (gimplify_expr (p
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
)
9363 gimplify_omp_ctxp
= target_ctx
;
9364 *p
= integer_minus_one_node
;
9367 gimplify_omp_ctxp
= target_ctx
;
9368 if (!DECL_P (expr
) && TREE_CODE (expr
) != TARGET_EXPR
)
9369 OMP_CLAUSE_OPERAND (c
, 0) = *p
;
9371 c
= build_omp_clause (thread_limit_loc
, OMP_CLAUSE_THREAD_LIMIT
);
9372 OMP_CLAUSE_THREAD_LIMIT_EXPR (c
) = thread_limit
;
9373 OMP_CLAUSE_CHAIN (c
) = OMP_TARGET_CLAUSES (target
);
9374 OMP_TARGET_CLAUSES (target
) = c
;
9375 c
= build_omp_clause (num_teams_loc
, OMP_CLAUSE_NUM_TEAMS
);
9376 OMP_CLAUSE_NUM_TEAMS_EXPR (c
) = num_teams
;
9377 OMP_CLAUSE_CHAIN (c
) = OMP_TARGET_CLAUSES (target
);
9378 OMP_TARGET_CLAUSES (target
) = c
;
9381 /* Gimplify the gross structure of several OMP constructs. */
9384 gimplify_omp_workshare (tree
*expr_p
, gimple_seq
*pre_p
)
9386 tree expr
= *expr_p
;
9388 gimple_seq body
= NULL
;
9389 enum omp_region_type ort
;
9391 switch (TREE_CODE (expr
))
9395 ort
= ORT_WORKSHARE
;
9398 ort
= OMP_TARGET_COMBINED (expr
) ? ORT_COMBINED_TARGET
: ORT_TARGET
;
9401 ort
= ORT_ACC_KERNELS
;
9404 ort
= ORT_ACC_PARALLEL
;
9409 case OMP_TARGET_DATA
:
9410 ort
= ORT_TARGET_DATA
;
9413 ort
= OMP_TEAMS_COMBINED (expr
) ? ORT_COMBINED_TEAMS
: ORT_TEAMS
;
9415 case OACC_HOST_DATA
:
9416 ort
= ORT_ACC_HOST_DATA
;
9421 gimplify_scan_omp_clauses (&OMP_CLAUSES (expr
), pre_p
, ort
,
9423 if (TREE_CODE (expr
) == OMP_TARGET
)
9424 optimize_target_teams (expr
, pre_p
);
9425 if ((ort
& (ORT_TARGET
| ORT_TARGET_DATA
)) != 0)
9427 push_gimplify_context ();
9428 gimple
*g
= gimplify_and_return_first (OMP_BODY (expr
), &body
);
9429 if (gimple_code (g
) == GIMPLE_BIND
)
9430 pop_gimplify_context (g
);
9432 pop_gimplify_context (NULL
);
9433 if ((ort
& ORT_TARGET_DATA
) != 0)
9435 enum built_in_function end_ix
;
9436 switch (TREE_CODE (expr
))
9439 case OACC_HOST_DATA
:
9440 end_ix
= BUILT_IN_GOACC_DATA_END
;
9442 case OMP_TARGET_DATA
:
9443 end_ix
= BUILT_IN_GOMP_TARGET_END_DATA
;
9448 tree fn
= builtin_decl_explicit (end_ix
);
9449 g
= gimple_build_call (fn
, 0);
9450 gimple_seq cleanup
= NULL
;
9451 gimple_seq_add_stmt (&cleanup
, g
);
9452 g
= gimple_build_try (body
, cleanup
, GIMPLE_TRY_FINALLY
);
9454 gimple_seq_add_stmt (&body
, g
);
9458 gimplify_and_add (OMP_BODY (expr
), &body
);
9459 gimplify_adjust_omp_clauses (pre_p
, body
, &OMP_CLAUSES (expr
),
9462 switch (TREE_CODE (expr
))
9465 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_DATA
,
9466 OMP_CLAUSES (expr
));
9469 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_KERNELS
,
9470 OMP_CLAUSES (expr
));
9472 case OACC_HOST_DATA
:
9473 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_HOST_DATA
,
9474 OMP_CLAUSES (expr
));
9477 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_OACC_PARALLEL
,
9478 OMP_CLAUSES (expr
));
9481 stmt
= gimple_build_omp_sections (body
, OMP_CLAUSES (expr
));
9484 stmt
= gimple_build_omp_single (body
, OMP_CLAUSES (expr
));
9487 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_REGION
,
9488 OMP_CLAUSES (expr
));
9490 case OMP_TARGET_DATA
:
9491 stmt
= gimple_build_omp_target (body
, GF_OMP_TARGET_KIND_DATA
,
9492 OMP_CLAUSES (expr
));
9495 stmt
= gimple_build_omp_teams (body
, OMP_CLAUSES (expr
));
9501 gimplify_seq_add_stmt (pre_p
, stmt
);
9502 *expr_p
= NULL_TREE
;
9505 /* Gimplify the gross structure of OpenACC enter/exit data, update, and OpenMP
9506 target update constructs. */
9509 gimplify_omp_target_update (tree
*expr_p
, gimple_seq
*pre_p
)
9511 tree expr
= *expr_p
;
9514 enum omp_region_type ort
= ORT_WORKSHARE
;
9516 switch (TREE_CODE (expr
))
9518 case OACC_ENTER_DATA
:
9519 case OACC_EXIT_DATA
:
9520 kind
= GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA
;
9524 kind
= GF_OMP_TARGET_KIND_OACC_UPDATE
;
9527 case OMP_TARGET_UPDATE
:
9528 kind
= GF_OMP_TARGET_KIND_UPDATE
;
9530 case OMP_TARGET_ENTER_DATA
:
9531 kind
= GF_OMP_TARGET_KIND_ENTER_DATA
;
9533 case OMP_TARGET_EXIT_DATA
:
9534 kind
= GF_OMP_TARGET_KIND_EXIT_DATA
;
9539 gimplify_scan_omp_clauses (&OMP_STANDALONE_CLAUSES (expr
), pre_p
,
9540 ort
, TREE_CODE (expr
));
9541 gimplify_adjust_omp_clauses (pre_p
, NULL
, &OMP_STANDALONE_CLAUSES (expr
),
9543 stmt
= gimple_build_omp_target (NULL
, kind
, OMP_STANDALONE_CLAUSES (expr
));
9545 gimplify_seq_add_stmt (pre_p
, stmt
);
9546 *expr_p
= NULL_TREE
;
9549 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
9550 stabilized the lhs of the atomic operation as *ADDR. Return true if
9551 EXPR is this stabilized form. */
9554 goa_lhs_expr_p (tree expr
, tree addr
)
9556 /* Also include casts to other type variants. The C front end is fond
9557 of adding these for e.g. volatile variables. This is like
9558 STRIP_TYPE_NOPS but includes the main variant lookup. */
9559 STRIP_USELESS_TYPE_CONVERSION (expr
);
9561 if (TREE_CODE (expr
) == INDIRECT_REF
)
9563 expr
= TREE_OPERAND (expr
, 0);
9565 && (CONVERT_EXPR_P (expr
)
9566 || TREE_CODE (expr
) == NON_LVALUE_EXPR
)
9567 && TREE_CODE (expr
) == TREE_CODE (addr
)
9568 && types_compatible_p (TREE_TYPE (expr
), TREE_TYPE (addr
)))
9570 expr
= TREE_OPERAND (expr
, 0);
9571 addr
= TREE_OPERAND (addr
, 0);
9575 return (TREE_CODE (addr
) == ADDR_EXPR
9576 && TREE_CODE (expr
) == ADDR_EXPR
9577 && TREE_OPERAND (addr
, 0) == TREE_OPERAND (expr
, 0));
9579 if (TREE_CODE (addr
) == ADDR_EXPR
&& expr
== TREE_OPERAND (addr
, 0))
9584 /* Walk *EXPR_P and replace appearances of *LHS_ADDR with LHS_VAR. If an
9585 expression does not involve the lhs, evaluate it into a temporary.
9586 Return 1 if the lhs appeared as a subexpression, 0 if it did not,
9587 or -1 if an error was encountered. */
9590 goa_stabilize_expr (tree
*expr_p
, gimple_seq
*pre_p
, tree lhs_addr
,
9593 tree expr
= *expr_p
;
9596 if (goa_lhs_expr_p (expr
, lhs_addr
))
9601 if (is_gimple_val (expr
))
9605 switch (TREE_CODE_CLASS (TREE_CODE (expr
)))
9608 case tcc_comparison
:
9609 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 1), pre_p
, lhs_addr
,
9612 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 0), pre_p
, lhs_addr
,
9615 case tcc_expression
:
9616 switch (TREE_CODE (expr
))
9618 case TRUTH_ANDIF_EXPR
:
9619 case TRUTH_ORIF_EXPR
:
9620 case TRUTH_AND_EXPR
:
9622 case TRUTH_XOR_EXPR
:
9623 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 1), pre_p
,
9625 case TRUTH_NOT_EXPR
:
9626 saw_lhs
|= goa_stabilize_expr (&TREE_OPERAND (expr
, 0), pre_p
,
9630 /* Break out any preevaluations from cp_build_modify_expr. */
9631 for (; TREE_CODE (expr
) == COMPOUND_EXPR
;
9632 expr
= TREE_OPERAND (expr
, 1))
9633 gimplify_stmt (&TREE_OPERAND (expr
, 0), pre_p
);
9635 return goa_stabilize_expr (expr_p
, pre_p
, lhs_addr
, lhs_var
);
9646 enum gimplify_status gs
;
9647 gs
= gimplify_expr (expr_p
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
);
9648 if (gs
!= GS_ALL_DONE
)
9655 /* Gimplify an OMP_ATOMIC statement. */
9657 static enum gimplify_status
9658 gimplify_omp_atomic (tree
*expr_p
, gimple_seq
*pre_p
)
9660 tree addr
= TREE_OPERAND (*expr_p
, 0);
9661 tree rhs
= TREE_CODE (*expr_p
) == OMP_ATOMIC_READ
9662 ? NULL
: TREE_OPERAND (*expr_p
, 1);
9663 tree type
= TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr
)));
9665 gomp_atomic_load
*loadstmt
;
9666 gomp_atomic_store
*storestmt
;
9668 tmp_load
= create_tmp_reg (type
);
9669 if (rhs
&& goa_stabilize_expr (&rhs
, pre_p
, addr
, tmp_load
) < 0)
9672 if (gimplify_expr (&addr
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
)
9676 loadstmt
= gimple_build_omp_atomic_load (tmp_load
, addr
);
9677 gimplify_seq_add_stmt (pre_p
, loadstmt
);
9678 if (rhs
&& gimplify_expr (&rhs
, pre_p
, NULL
, is_gimple_val
, fb_rvalue
)
9682 if (TREE_CODE (*expr_p
) == OMP_ATOMIC_READ
)
9684 storestmt
= gimple_build_omp_atomic_store (rhs
);
9685 gimplify_seq_add_stmt (pre_p
, storestmt
);
9686 if (OMP_ATOMIC_SEQ_CST (*expr_p
))
9688 gimple_omp_atomic_set_seq_cst (loadstmt
);
9689 gimple_omp_atomic_set_seq_cst (storestmt
);
9691 switch (TREE_CODE (*expr_p
))
9693 case OMP_ATOMIC_READ
:
9694 case OMP_ATOMIC_CAPTURE_OLD
:
9696 gimple_omp_atomic_set_need_value (loadstmt
);
9698 case OMP_ATOMIC_CAPTURE_NEW
:
9700 gimple_omp_atomic_set_need_value (storestmt
);
9710 /* Gimplify a TRANSACTION_EXPR. This involves gimplification of the
9711 body, and adding some EH bits. */
9713 static enum gimplify_status
9714 gimplify_transaction (tree
*expr_p
, gimple_seq
*pre_p
)
9716 tree expr
= *expr_p
, temp
, tbody
= TRANSACTION_EXPR_BODY (expr
);
9718 gtransaction
*trans_stmt
;
9719 gimple_seq body
= NULL
;
9722 /* Wrap the transaction body in a BIND_EXPR so we have a context
9723 where to put decls for OMP. */
9724 if (TREE_CODE (tbody
) != BIND_EXPR
)
9726 tree bind
= build3 (BIND_EXPR
, void_type_node
, NULL
, tbody
, NULL
);
9727 TREE_SIDE_EFFECTS (bind
) = 1;
9728 SET_EXPR_LOCATION (bind
, EXPR_LOCATION (tbody
));
9729 TRANSACTION_EXPR_BODY (expr
) = bind
;
9732 push_gimplify_context ();
9733 temp
= voidify_wrapper_expr (*expr_p
, NULL
);
9735 body_stmt
= gimplify_and_return_first (TRANSACTION_EXPR_BODY (expr
), &body
);
9736 pop_gimplify_context (body_stmt
);
9738 trans_stmt
= gimple_build_transaction (body
);
9739 if (TRANSACTION_EXPR_OUTER (expr
))
9740 subcode
= GTMA_IS_OUTER
;
9741 else if (TRANSACTION_EXPR_RELAXED (expr
))
9742 subcode
= GTMA_IS_RELAXED
;
9743 gimple_transaction_set_subcode (trans_stmt
, subcode
);
9745 gimplify_seq_add_stmt (pre_p
, trans_stmt
);
9753 *expr_p
= NULL_TREE
;
9757 /* Gimplify an OMP_ORDERED construct. EXPR is the tree version. BODY
9758 is the OMP_BODY of the original EXPR (which has already been
9759 gimplified so it's not present in the EXPR).
9761 Return the gimplified GIMPLE_OMP_ORDERED tuple. */
9764 gimplify_omp_ordered (tree expr
, gimple_seq body
)
9769 tree source_c
= NULL_TREE
;
9770 tree sink_c
= NULL_TREE
;
9772 if (gimplify_omp_ctxp
)
9773 for (c
= OMP_ORDERED_CLAUSES (expr
); c
; c
= OMP_CLAUSE_CHAIN (c
))
9774 if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_DEPEND
9775 && gimplify_omp_ctxp
->loop_iter_var
.is_empty ()
9776 && (OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SINK
9777 || OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SOURCE
))
9779 error_at (OMP_CLAUSE_LOCATION (c
),
9780 "%<ordered%> construct with %<depend%> clause must be "
9781 "closely nested inside a loop with %<ordered%> clause "
9782 "with a parameter");
9785 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_DEPEND
9786 && OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SINK
)
9789 for (decls
= OMP_CLAUSE_DECL (c
), i
= 0;
9790 decls
&& TREE_CODE (decls
) == TREE_LIST
;
9791 decls
= TREE_CHAIN (decls
), ++i
)
9792 if (i
>= gimplify_omp_ctxp
->loop_iter_var
.length () / 2)
9794 else if (TREE_VALUE (decls
)
9795 != gimplify_omp_ctxp
->loop_iter_var
[2 * i
])
9797 error_at (OMP_CLAUSE_LOCATION (c
),
9798 "variable %qE is not an iteration "
9799 "of outermost loop %d, expected %qE",
9800 TREE_VALUE (decls
), i
+ 1,
9801 gimplify_omp_ctxp
->loop_iter_var
[2 * i
]);
9807 = gimplify_omp_ctxp
->loop_iter_var
[2 * i
+ 1];
9808 if (!fail
&& i
!= gimplify_omp_ctxp
->loop_iter_var
.length () / 2)
9810 error_at (OMP_CLAUSE_LOCATION (c
),
9811 "number of variables in %<depend(sink)%> "
9812 "clause does not match number of "
9813 "iteration variables");
9818 else if (OMP_CLAUSE_CODE (c
) == OMP_CLAUSE_DEPEND
9819 && OMP_CLAUSE_DEPEND_KIND (c
) == OMP_CLAUSE_DEPEND_SOURCE
)
9823 error_at (OMP_CLAUSE_LOCATION (c
),
9824 "more than one %<depend(source)%> clause on an "
9825 "%<ordered%> construct");
9831 if (source_c
&& sink_c
)
9833 error_at (OMP_CLAUSE_LOCATION (source_c
),
9834 "%<depend(source)%> clause specified together with "
9835 "%<depend(sink:)%> clauses on the same construct");
9840 return gimple_build_nop ();
9841 return gimple_build_omp_ordered (body
, OMP_ORDERED_CLAUSES (expr
));
9844 /* Convert the GENERIC expression tree *EXPR_P to GIMPLE. If the
9845 expression produces a value to be used as an operand inside a GIMPLE
9846 statement, the value will be stored back in *EXPR_P. This value will
9847 be a tree of class tcc_declaration, tcc_constant, tcc_reference or
9848 an SSA_NAME. The corresponding sequence of GIMPLE statements is
9849 emitted in PRE_P and POST_P.
9851 Additionally, this process may overwrite parts of the input
9852 expression during gimplification. Ideally, it should be
9853 possible to do non-destructive gimplification.
9855 EXPR_P points to the GENERIC expression to convert to GIMPLE. If
9856 the expression needs to evaluate to a value to be used as
9857 an operand in a GIMPLE statement, this value will be stored in
9858 *EXPR_P on exit. This happens when the caller specifies one
9859 of fb_lvalue or fb_rvalue fallback flags.
9861 PRE_P will contain the sequence of GIMPLE statements corresponding
9862 to the evaluation of EXPR and all the side-effects that must
9863 be executed before the main expression. On exit, the last
9864 statement of PRE_P is the core statement being gimplified. For
9865 instance, when gimplifying 'if (++a)' the last statement in
9866 PRE_P will be 'if (t.1)' where t.1 is the result of
9867 pre-incrementing 'a'.
9869 POST_P will contain the sequence of GIMPLE statements corresponding
9870 to the evaluation of all the side-effects that must be executed
9871 after the main expression. If this is NULL, the post
9872 side-effects are stored at the end of PRE_P.
9874 The reason why the output is split in two is to handle post
9875 side-effects explicitly. In some cases, an expression may have
9876 inner and outer post side-effects which need to be emitted in
9877 an order different from the one given by the recursive
9878 traversal. For instance, for the expression (*p--)++ the post
9879 side-effects of '--' must actually occur *after* the post
9880 side-effects of '++'. However, gimplification will first visit
9881 the inner expression, so if a separate POST sequence was not
9882 used, the resulting sequence would be:
9889 However, the post-decrement operation in line #2 must not be
9890 evaluated until after the store to *p at line #4, so the
9891 correct sequence should be:
9898 So, by specifying a separate post queue, it is possible
9899 to emit the post side-effects in the correct order.
9900 If POST_P is NULL, an internal queue will be used. Before
9901 returning to the caller, the sequence POST_P is appended to
9902 the main output sequence PRE_P.
9904 GIMPLE_TEST_F points to a function that takes a tree T and
9905 returns nonzero if T is in the GIMPLE form requested by the
9906 caller. The GIMPLE predicates are in gimple.c.
9908 FALLBACK tells the function what sort of a temporary we want if
9909 gimplification cannot produce an expression that complies with
9912 fb_none means that no temporary should be generated
9913 fb_rvalue means that an rvalue is OK to generate
9914 fb_lvalue means that an lvalue is OK to generate
9915 fb_either means that either is OK, but an lvalue is preferable.
9916 fb_mayfail means that gimplification may fail (in which case
9917 GS_ERROR will be returned)
9919 The return value is either GS_ERROR or GS_ALL_DONE, since this
9920 function iterates until EXPR is completely gimplified or an error
9923 enum gimplify_status
9924 gimplify_expr (tree
*expr_p
, gimple_seq
*pre_p
, gimple_seq
*post_p
,
9925 bool (*gimple_test_f
) (tree
), fallback_t fallback
)
9928 gimple_seq internal_pre
= NULL
;
9929 gimple_seq internal_post
= NULL
;
9932 location_t saved_location
;
9933 enum gimplify_status ret
;
9934 gimple_stmt_iterator pre_last_gsi
, post_last_gsi
;
9936 save_expr
= *expr_p
;
9937 if (save_expr
== NULL_TREE
)
9940 /* If we are gimplifying a top-level statement, PRE_P must be valid. */
9941 is_statement
= gimple_test_f
== is_gimple_stmt
;
9945 /* Consistency checks. */
9946 if (gimple_test_f
== is_gimple_reg
)
9947 gcc_assert (fallback
& (fb_rvalue
| fb_lvalue
));
9948 else if (gimple_test_f
== is_gimple_val
9949 || gimple_test_f
== is_gimple_call_addr
9950 || gimple_test_f
== is_gimple_condexpr
9951 || gimple_test_f
== is_gimple_mem_rhs
9952 || gimple_test_f
== is_gimple_mem_rhs_or_call
9953 || gimple_test_f
== is_gimple_reg_rhs
9954 || gimple_test_f
== is_gimple_reg_rhs_or_call
9955 || gimple_test_f
== is_gimple_asm_val
9956 || gimple_test_f
== is_gimple_mem_ref_addr
)
9957 gcc_assert (fallback
& fb_rvalue
);
9958 else if (gimple_test_f
== is_gimple_min_lval
9959 || gimple_test_f
== is_gimple_lvalue
)
9960 gcc_assert (fallback
& fb_lvalue
);
9961 else if (gimple_test_f
== is_gimple_addressable
)
9962 gcc_assert (fallback
& fb_either
);
9963 else if (gimple_test_f
== is_gimple_stmt
)
9964 gcc_assert (fallback
== fb_none
);
9967 /* We should have recognized the GIMPLE_TEST_F predicate to
9968 know what kind of fallback to use in case a temporary is
9969 needed to hold the value or address of *EXPR_P. */
9973 /* We used to check the predicate here and return immediately if it
9974 succeeds. This is wrong; the design is for gimplification to be
9975 idempotent, and for the predicates to only test for valid forms, not
9976 whether they are fully simplified. */
9978 pre_p
= &internal_pre
;
9981 post_p
= &internal_post
;
9983 /* Remember the last statements added to PRE_P and POST_P. Every
9984 new statement added by the gimplification helpers needs to be
9985 annotated with location information. To centralize the
9986 responsibility, we remember the last statement that had been
9987 added to both queues before gimplifying *EXPR_P. If
9988 gimplification produces new statements in PRE_P and POST_P, those
9989 statements will be annotated with the same location information
9991 pre_last_gsi
= gsi_last (*pre_p
);
9992 post_last_gsi
= gsi_last (*post_p
);
9994 saved_location
= input_location
;
9995 if (save_expr
!= error_mark_node
9996 && EXPR_HAS_LOCATION (*expr_p
))
9997 input_location
= EXPR_LOCATION (*expr_p
);
9999 /* Loop over the specific gimplifiers until the toplevel node
10000 remains the same. */
10003 /* Strip away as many useless type conversions as possible
10004 at the toplevel. */
10005 STRIP_USELESS_TYPE_CONVERSION (*expr_p
);
10007 /* Remember the expr. */
10008 save_expr
= *expr_p
;
10010 /* Die, die, die, my darling. */
10011 if (save_expr
== error_mark_node
10012 || (TREE_TYPE (save_expr
)
10013 && TREE_TYPE (save_expr
) == error_mark_node
))
10019 /* Do any language-specific gimplification. */
10020 ret
= ((enum gimplify_status
)
10021 lang_hooks
.gimplify_expr (expr_p
, pre_p
, post_p
));
10024 if (*expr_p
== NULL_TREE
)
10026 if (*expr_p
!= save_expr
)
10029 else if (ret
!= GS_UNHANDLED
)
10032 /* Make sure that all the cases set 'ret' appropriately. */
10033 ret
= GS_UNHANDLED
;
10034 switch (TREE_CODE (*expr_p
))
10036 /* First deal with the special cases. */
10038 case POSTINCREMENT_EXPR
:
10039 case POSTDECREMENT_EXPR
:
10040 case PREINCREMENT_EXPR
:
10041 case PREDECREMENT_EXPR
:
10042 ret
= gimplify_self_mod_expr (expr_p
, pre_p
, post_p
,
10043 fallback
!= fb_none
,
10044 TREE_TYPE (*expr_p
));
10047 case VIEW_CONVERT_EXPR
:
10048 if (is_gimple_reg_type (TREE_TYPE (*expr_p
))
10049 && is_gimple_reg_type (TREE_TYPE (TREE_OPERAND (*expr_p
, 0))))
10051 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10052 post_p
, is_gimple_val
, fb_rvalue
);
10053 recalculate_side_effects (*expr_p
);
10059 case ARRAY_RANGE_REF
:
10060 case REALPART_EXPR
:
10061 case IMAGPART_EXPR
:
10062 case COMPONENT_REF
:
10063 ret
= gimplify_compound_lval (expr_p
, pre_p
, post_p
,
10064 fallback
? fallback
: fb_rvalue
);
10068 ret
= gimplify_cond_expr (expr_p
, pre_p
, fallback
);
10070 /* C99 code may assign to an array in a structure value of a
10071 conditional expression, and this has undefined behavior
10072 only on execution, so create a temporary if an lvalue is
10074 if (fallback
== fb_lvalue
)
10076 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, post_p
);
10077 mark_addressable (*expr_p
);
10083 ret
= gimplify_call_expr (expr_p
, pre_p
, fallback
!= fb_none
);
10085 /* C99 code may assign to an array in a structure returned
10086 from a function, and this has undefined behavior only on
10087 execution, so create a temporary if an lvalue is
10089 if (fallback
== fb_lvalue
)
10091 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, post_p
);
10092 mark_addressable (*expr_p
);
10098 gcc_unreachable ();
10100 case COMPOUND_EXPR
:
10101 ret
= gimplify_compound_expr (expr_p
, pre_p
, fallback
!= fb_none
);
10104 case COMPOUND_LITERAL_EXPR
:
10105 ret
= gimplify_compound_literal_expr (expr_p
, pre_p
,
10106 gimple_test_f
, fallback
);
10111 ret
= gimplify_modify_expr (expr_p
, pre_p
, post_p
,
10112 fallback
!= fb_none
);
10115 case TRUTH_ANDIF_EXPR
:
10116 case TRUTH_ORIF_EXPR
:
10118 /* Preserve the original type of the expression and the
10119 source location of the outer expression. */
10120 tree org_type
= TREE_TYPE (*expr_p
);
10121 *expr_p
= gimple_boolify (*expr_p
);
10122 *expr_p
= build3_loc (input_location
, COND_EXPR
,
10126 org_type
, boolean_true_node
),
10129 org_type
, boolean_false_node
));
10134 case TRUTH_NOT_EXPR
:
10136 tree type
= TREE_TYPE (*expr_p
);
10137 /* The parsers are careful to generate TRUTH_NOT_EXPR
10138 only with operands that are always zero or one.
10139 We do not fold here but handle the only interesting case
10140 manually, as fold may re-introduce the TRUTH_NOT_EXPR. */
10141 *expr_p
= gimple_boolify (*expr_p
);
10142 if (TYPE_PRECISION (TREE_TYPE (*expr_p
)) == 1)
10143 *expr_p
= build1_loc (input_location
, BIT_NOT_EXPR
,
10144 TREE_TYPE (*expr_p
),
10145 TREE_OPERAND (*expr_p
, 0));
10147 *expr_p
= build2_loc (input_location
, BIT_XOR_EXPR
,
10148 TREE_TYPE (*expr_p
),
10149 TREE_OPERAND (*expr_p
, 0),
10150 build_int_cst (TREE_TYPE (*expr_p
), 1));
10151 if (!useless_type_conversion_p (type
, TREE_TYPE (*expr_p
)))
10152 *expr_p
= fold_convert_loc (input_location
, type
, *expr_p
);
10158 ret
= gimplify_addr_expr (expr_p
, pre_p
, post_p
);
10161 case ANNOTATE_EXPR
:
10163 tree cond
= TREE_OPERAND (*expr_p
, 0);
10164 tree kind
= TREE_OPERAND (*expr_p
, 1);
10165 tree type
= TREE_TYPE (cond
);
10166 if (!INTEGRAL_TYPE_P (type
))
10172 tree tmp
= create_tmp_var (type
);
10173 gimplify_arg (&cond
, pre_p
, EXPR_LOCATION (*expr_p
));
10175 = gimple_build_call_internal (IFN_ANNOTATE
, 2, cond
, kind
);
10176 gimple_call_set_lhs (call
, tmp
);
10177 gimplify_seq_add_stmt (pre_p
, call
);
10184 ret
= gimplify_va_arg_expr (expr_p
, pre_p
, post_p
);
10188 if (IS_EMPTY_STMT (*expr_p
))
10194 if (VOID_TYPE_P (TREE_TYPE (*expr_p
))
10195 || fallback
== fb_none
)
10197 /* Just strip a conversion to void (or in void context) and
10199 *expr_p
= TREE_OPERAND (*expr_p
, 0);
10204 ret
= gimplify_conversion (expr_p
);
10205 if (ret
== GS_ERROR
)
10207 if (*expr_p
!= save_expr
)
10211 case FIX_TRUNC_EXPR
:
10212 /* unary_expr: ... | '(' cast ')' val | ... */
10213 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
10214 is_gimple_val
, fb_rvalue
);
10215 recalculate_side_effects (*expr_p
);
10220 bool volatilep
= TREE_THIS_VOLATILE (*expr_p
);
10221 bool notrap
= TREE_THIS_NOTRAP (*expr_p
);
10222 tree saved_ptr_type
= TREE_TYPE (TREE_OPERAND (*expr_p
, 0));
10224 *expr_p
= fold_indirect_ref_loc (input_location
, *expr_p
);
10225 if (*expr_p
!= save_expr
)
10231 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
10232 is_gimple_reg
, fb_rvalue
);
10233 if (ret
== GS_ERROR
)
10236 recalculate_side_effects (*expr_p
);
10237 *expr_p
= fold_build2_loc (input_location
, MEM_REF
,
10238 TREE_TYPE (*expr_p
),
10239 TREE_OPERAND (*expr_p
, 0),
10240 build_int_cst (saved_ptr_type
, 0));
10241 TREE_THIS_VOLATILE (*expr_p
) = volatilep
;
10242 TREE_THIS_NOTRAP (*expr_p
) = notrap
;
10247 /* We arrive here through the various re-gimplifcation paths. */
10249 /* First try re-folding the whole thing. */
10250 tmp
= fold_binary (MEM_REF
, TREE_TYPE (*expr_p
),
10251 TREE_OPERAND (*expr_p
, 0),
10252 TREE_OPERAND (*expr_p
, 1));
10255 REF_REVERSE_STORAGE_ORDER (tmp
)
10256 = REF_REVERSE_STORAGE_ORDER (*expr_p
);
10258 recalculate_side_effects (*expr_p
);
10262 /* Avoid re-gimplifying the address operand if it is already
10263 in suitable form. Re-gimplifying would mark the address
10264 operand addressable. Always gimplify when not in SSA form
10265 as we still may have to gimplify decls with value-exprs. */
10266 if (!gimplify_ctxp
|| !gimplify_ctxp
->into_ssa
10267 || !is_gimple_mem_ref_addr (TREE_OPERAND (*expr_p
, 0)))
10269 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
10270 is_gimple_mem_ref_addr
, fb_rvalue
);
10271 if (ret
== GS_ERROR
)
10274 recalculate_side_effects (*expr_p
);
10278 /* Constants need not be gimplified. */
10285 /* Drop the overflow flag on constants, we do not want
10286 that in the GIMPLE IL. */
10287 if (TREE_OVERFLOW_P (*expr_p
))
10288 *expr_p
= drop_tree_overflow (*expr_p
);
10293 /* If we require an lvalue, such as for ADDR_EXPR, retain the
10294 CONST_DECL node. Otherwise the decl is replaceable by its
10296 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
10297 if (fallback
& fb_lvalue
)
10301 *expr_p
= DECL_INITIAL (*expr_p
);
10307 ret
= gimplify_decl_expr (expr_p
, pre_p
);
10311 ret
= gimplify_bind_expr (expr_p
, pre_p
);
10315 ret
= gimplify_loop_expr (expr_p
, pre_p
);
10319 ret
= gimplify_switch_expr (expr_p
, pre_p
);
10323 ret
= gimplify_exit_expr (expr_p
);
10327 /* If the target is not LABEL, then it is a computed jump
10328 and the target needs to be gimplified. */
10329 if (TREE_CODE (GOTO_DESTINATION (*expr_p
)) != LABEL_DECL
)
10331 ret
= gimplify_expr (&GOTO_DESTINATION (*expr_p
), pre_p
,
10332 NULL
, is_gimple_val
, fb_rvalue
);
10333 if (ret
== GS_ERROR
)
10336 gimplify_seq_add_stmt (pre_p
,
10337 gimple_build_goto (GOTO_DESTINATION (*expr_p
)));
10342 gimplify_seq_add_stmt (pre_p
,
10343 gimple_build_predict (PREDICT_EXPR_PREDICTOR (*expr_p
),
10344 PREDICT_EXPR_OUTCOME (*expr_p
)));
10350 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p
))
10351 == current_function_decl
);
10352 gimplify_seq_add_stmt (pre_p
,
10353 gimple_build_label (LABEL_EXPR_LABEL (*expr_p
)));
10356 case CASE_LABEL_EXPR
:
10357 ret
= gimplify_case_label_expr (expr_p
, pre_p
);
10361 ret
= gimplify_return_expr (*expr_p
, pre_p
);
10365 /* Don't reduce this in place; let gimplify_init_constructor work its
10366 magic. Buf if we're just elaborating this for side effects, just
10367 gimplify any element that has side-effects. */
10368 if (fallback
== fb_none
)
10370 unsigned HOST_WIDE_INT ix
;
10372 tree temp
= NULL_TREE
;
10373 FOR_EACH_CONSTRUCTOR_VALUE (CONSTRUCTOR_ELTS (*expr_p
), ix
, val
)
10374 if (TREE_SIDE_EFFECTS (val
))
10375 append_to_statement_list (val
, &temp
);
10378 ret
= temp
? GS_OK
: GS_ALL_DONE
;
10380 /* C99 code may assign to an array in a constructed
10381 structure or union, and this has undefined behavior only
10382 on execution, so create a temporary if an lvalue is
10384 else if (fallback
== fb_lvalue
)
10386 *expr_p
= get_initialized_tmp_var (*expr_p
, pre_p
, post_p
);
10387 mark_addressable (*expr_p
);
10394 /* The following are special cases that are not handled by the
10395 original GIMPLE grammar. */
10397 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
10400 ret
= gimplify_save_expr (expr_p
, pre_p
, post_p
);
10403 case BIT_FIELD_REF
:
10404 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10405 post_p
, is_gimple_lvalue
, fb_either
);
10406 recalculate_side_effects (*expr_p
);
10409 case TARGET_MEM_REF
:
10411 enum gimplify_status r0
= GS_ALL_DONE
, r1
= GS_ALL_DONE
;
10413 if (TMR_BASE (*expr_p
))
10414 r0
= gimplify_expr (&TMR_BASE (*expr_p
), pre_p
,
10415 post_p
, is_gimple_mem_ref_addr
, fb_either
);
10416 if (TMR_INDEX (*expr_p
))
10417 r1
= gimplify_expr (&TMR_INDEX (*expr_p
), pre_p
,
10418 post_p
, is_gimple_val
, fb_rvalue
);
10419 if (TMR_INDEX2 (*expr_p
))
10420 r1
= gimplify_expr (&TMR_INDEX2 (*expr_p
), pre_p
,
10421 post_p
, is_gimple_val
, fb_rvalue
);
10422 /* TMR_STEP and TMR_OFFSET are always integer constants. */
10423 ret
= MIN (r0
, r1
);
10427 case NON_LVALUE_EXPR
:
10428 /* This should have been stripped above. */
10429 gcc_unreachable ();
10432 ret
= gimplify_asm_expr (expr_p
, pre_p
, post_p
);
10435 case TRY_FINALLY_EXPR
:
10436 case TRY_CATCH_EXPR
:
10438 gimple_seq eval
, cleanup
;
10441 /* Calls to destructors are generated automatically in FINALLY/CATCH
10442 block. They should have location as UNKNOWN_LOCATION. However,
10443 gimplify_call_expr will reset these call stmts to input_location
10444 if it finds stmt's location is unknown. To prevent resetting for
10445 destructors, we set the input_location to unknown.
10446 Note that this only affects the destructor calls in FINALLY/CATCH
10447 block, and will automatically reset to its original value by the
10448 end of gimplify_expr. */
10449 input_location
= UNKNOWN_LOCATION
;
10450 eval
= cleanup
= NULL
;
10451 gimplify_and_add (TREE_OPERAND (*expr_p
, 0), &eval
);
10452 gimplify_and_add (TREE_OPERAND (*expr_p
, 1), &cleanup
);
10453 /* Don't create bogus GIMPLE_TRY with empty cleanup. */
10454 if (gimple_seq_empty_p (cleanup
))
10456 gimple_seq_add_seq (pre_p
, eval
);
10460 try_
= gimple_build_try (eval
, cleanup
,
10461 TREE_CODE (*expr_p
) == TRY_FINALLY_EXPR
10462 ? GIMPLE_TRY_FINALLY
10463 : GIMPLE_TRY_CATCH
);
10464 if (EXPR_HAS_LOCATION (save_expr
))
10465 gimple_set_location (try_
, EXPR_LOCATION (save_expr
));
10466 else if (LOCATION_LOCUS (saved_location
) != UNKNOWN_LOCATION
)
10467 gimple_set_location (try_
, saved_location
);
10468 if (TREE_CODE (*expr_p
) == TRY_CATCH_EXPR
)
10469 gimple_try_set_catch_is_cleanup (try_
,
10470 TRY_CATCH_IS_CLEANUP (*expr_p
));
10471 gimplify_seq_add_stmt (pre_p
, try_
);
10476 case CLEANUP_POINT_EXPR
:
10477 ret
= gimplify_cleanup_point_expr (expr_p
, pre_p
);
10481 ret
= gimplify_target_expr (expr_p
, pre_p
, post_p
);
10487 gimple_seq handler
= NULL
;
10488 gimplify_and_add (CATCH_BODY (*expr_p
), &handler
);
10489 c
= gimple_build_catch (CATCH_TYPES (*expr_p
), handler
);
10490 gimplify_seq_add_stmt (pre_p
, c
);
10495 case EH_FILTER_EXPR
:
10498 gimple_seq failure
= NULL
;
10500 gimplify_and_add (EH_FILTER_FAILURE (*expr_p
), &failure
);
10501 ehf
= gimple_build_eh_filter (EH_FILTER_TYPES (*expr_p
), failure
);
10502 gimple_set_no_warning (ehf
, TREE_NO_WARNING (*expr_p
));
10503 gimplify_seq_add_stmt (pre_p
, ehf
);
10510 enum gimplify_status r0
, r1
;
10511 r0
= gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p
), pre_p
,
10512 post_p
, is_gimple_val
, fb_rvalue
);
10513 r1
= gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p
), pre_p
,
10514 post_p
, is_gimple_val
, fb_rvalue
);
10515 TREE_SIDE_EFFECTS (*expr_p
) = 0;
10516 ret
= MIN (r0
, r1
);
10521 /* We get here when taking the address of a label. We mark
10522 the label as "forced"; meaning it can never be removed and
10523 it is a potential target for any computed goto. */
10524 FORCED_LABEL (*expr_p
) = 1;
10528 case STATEMENT_LIST
:
10529 ret
= gimplify_statement_list (expr_p
, pre_p
);
10532 case WITH_SIZE_EXPR
:
10534 gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10535 post_p
== &internal_post
? NULL
: post_p
,
10536 gimple_test_f
, fallback
);
10537 gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
, post_p
,
10538 is_gimple_val
, fb_rvalue
);
10545 ret
= gimplify_var_or_parm_decl (expr_p
);
10549 /* When within an OMP context, notice uses of variables. */
10550 if (gimplify_omp_ctxp
)
10551 omp_notice_variable (gimplify_omp_ctxp
, *expr_p
, true);
10556 /* Allow callbacks into the gimplifier during optimization. */
10561 gimplify_omp_parallel (expr_p
, pre_p
);
10566 gimplify_omp_task (expr_p
, pre_p
);
10574 case OMP_DISTRIBUTE
:
10577 ret
= gimplify_omp_for (expr_p
, pre_p
);
10581 gimplify_oacc_cache (expr_p
, pre_p
);
10586 gimplify_oacc_declare (expr_p
, pre_p
);
10590 case OACC_HOST_DATA
:
10593 case OACC_PARALLEL
:
10597 case OMP_TARGET_DATA
:
10599 gimplify_omp_workshare (expr_p
, pre_p
);
10603 case OACC_ENTER_DATA
:
10604 case OACC_EXIT_DATA
:
10606 case OMP_TARGET_UPDATE
:
10607 case OMP_TARGET_ENTER_DATA
:
10608 case OMP_TARGET_EXIT_DATA
:
10609 gimplify_omp_target_update (expr_p
, pre_p
);
10615 case OMP_TASKGROUP
:
10619 gimple_seq body
= NULL
;
10622 gimplify_and_add (OMP_BODY (*expr_p
), &body
);
10623 switch (TREE_CODE (*expr_p
))
10626 g
= gimple_build_omp_section (body
);
10629 g
= gimple_build_omp_master (body
);
10631 case OMP_TASKGROUP
:
10633 gimple_seq cleanup
= NULL
;
10635 = builtin_decl_explicit (BUILT_IN_GOMP_TASKGROUP_END
);
10636 g
= gimple_build_call (fn
, 0);
10637 gimple_seq_add_stmt (&cleanup
, g
);
10638 g
= gimple_build_try (body
, cleanup
, GIMPLE_TRY_FINALLY
);
10640 gimple_seq_add_stmt (&body
, g
);
10641 g
= gimple_build_omp_taskgroup (body
);
10645 g
= gimplify_omp_ordered (*expr_p
, body
);
10648 gimplify_scan_omp_clauses (&OMP_CRITICAL_CLAUSES (*expr_p
),
10649 pre_p
, ORT_WORKSHARE
, OMP_CRITICAL
);
10650 gimplify_adjust_omp_clauses (pre_p
, body
,
10651 &OMP_CRITICAL_CLAUSES (*expr_p
),
10653 g
= gimple_build_omp_critical (body
,
10654 OMP_CRITICAL_NAME (*expr_p
),
10655 OMP_CRITICAL_CLAUSES (*expr_p
));
10658 gcc_unreachable ();
10660 gimplify_seq_add_stmt (pre_p
, g
);
10666 case OMP_ATOMIC_READ
:
10667 case OMP_ATOMIC_CAPTURE_OLD
:
10668 case OMP_ATOMIC_CAPTURE_NEW
:
10669 ret
= gimplify_omp_atomic (expr_p
, pre_p
);
10672 case TRANSACTION_EXPR
:
10673 ret
= gimplify_transaction (expr_p
, pre_p
);
10676 case TRUTH_AND_EXPR
:
10677 case TRUTH_OR_EXPR
:
10678 case TRUTH_XOR_EXPR
:
10680 tree orig_type
= TREE_TYPE (*expr_p
);
10681 tree new_type
, xop0
, xop1
;
10682 *expr_p
= gimple_boolify (*expr_p
);
10683 new_type
= TREE_TYPE (*expr_p
);
10684 if (!useless_type_conversion_p (orig_type
, new_type
))
10686 *expr_p
= fold_convert_loc (input_location
, orig_type
, *expr_p
);
10691 /* Boolified binary truth expressions are semantically equivalent
10692 to bitwise binary expressions. Canonicalize them to the
10693 bitwise variant. */
10694 switch (TREE_CODE (*expr_p
))
10696 case TRUTH_AND_EXPR
:
10697 TREE_SET_CODE (*expr_p
, BIT_AND_EXPR
);
10699 case TRUTH_OR_EXPR
:
10700 TREE_SET_CODE (*expr_p
, BIT_IOR_EXPR
);
10702 case TRUTH_XOR_EXPR
:
10703 TREE_SET_CODE (*expr_p
, BIT_XOR_EXPR
);
10708 /* Now make sure that operands have compatible type to
10709 expression's new_type. */
10710 xop0
= TREE_OPERAND (*expr_p
, 0);
10711 xop1
= TREE_OPERAND (*expr_p
, 1);
10712 if (!useless_type_conversion_p (new_type
, TREE_TYPE (xop0
)))
10713 TREE_OPERAND (*expr_p
, 0) = fold_convert_loc (input_location
,
10716 if (!useless_type_conversion_p (new_type
, TREE_TYPE (xop1
)))
10717 TREE_OPERAND (*expr_p
, 1) = fold_convert_loc (input_location
,
10720 /* Continue classified as tcc_binary. */
10725 case VEC_COND_EXPR
:
10726 case VEC_PERM_EXPR
:
10727 /* Classified as tcc_expression. */
10730 case POINTER_PLUS_EXPR
:
10732 enum gimplify_status r0
, r1
;
10733 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10734 post_p
, is_gimple_val
, fb_rvalue
);
10735 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
10736 post_p
, is_gimple_val
, fb_rvalue
);
10737 recalculate_side_effects (*expr_p
);
10738 ret
= MIN (r0
, r1
);
10742 case CILK_SYNC_STMT
:
10744 if (!fn_contains_cilk_spawn_p (cfun
))
10746 error_at (EXPR_LOCATION (*expr_p
),
10747 "expected %<_Cilk_spawn%> before %<_Cilk_sync%>");
10752 gimplify_cilk_sync (expr_p
, pre_p
);
10759 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p
)))
10761 case tcc_comparison
:
10762 /* Handle comparison of objects of non scalar mode aggregates
10763 with a call to memcmp. It would be nice to only have to do
10764 this for variable-sized objects, but then we'd have to allow
10765 the same nest of reference nodes we allow for MODIFY_EXPR and
10766 that's too complex.
10768 Compare scalar mode aggregates as scalar mode values. Using
10769 memcmp for them would be very inefficient at best, and is
10770 plain wrong if bitfields are involved. */
10772 tree type
= TREE_TYPE (TREE_OPERAND (*expr_p
, 1));
10774 /* Vector comparisons need no boolification. */
10775 if (TREE_CODE (type
) == VECTOR_TYPE
)
10777 else if (!AGGREGATE_TYPE_P (type
))
10779 tree org_type
= TREE_TYPE (*expr_p
);
10780 *expr_p
= gimple_boolify (*expr_p
);
10781 if (!useless_type_conversion_p (org_type
,
10782 TREE_TYPE (*expr_p
)))
10784 *expr_p
= fold_convert_loc (input_location
,
10785 org_type
, *expr_p
);
10791 else if (TYPE_MODE (type
) != BLKmode
)
10792 ret
= gimplify_scalar_mode_aggregate_compare (expr_p
);
10794 ret
= gimplify_variable_sized_compare (expr_p
);
10799 /* If *EXPR_P does not need to be special-cased, handle it
10800 according to its class. */
10802 ret
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10803 post_p
, is_gimple_val
, fb_rvalue
);
10809 enum gimplify_status r0
, r1
;
10811 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10812 post_p
, is_gimple_val
, fb_rvalue
);
10813 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
10814 post_p
, is_gimple_val
, fb_rvalue
);
10816 ret
= MIN (r0
, r1
);
10822 enum gimplify_status r0
, r1
, r2
;
10824 r0
= gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
,
10825 post_p
, is_gimple_val
, fb_rvalue
);
10826 r1
= gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
,
10827 post_p
, is_gimple_val
, fb_rvalue
);
10828 r2
= gimplify_expr (&TREE_OPERAND (*expr_p
, 2), pre_p
,
10829 post_p
, is_gimple_val
, fb_rvalue
);
10831 ret
= MIN (MIN (r0
, r1
), r2
);
10835 case tcc_declaration
:
10838 goto dont_recalculate
;
10841 gcc_unreachable ();
10844 recalculate_side_effects (*expr_p
);
10850 gcc_assert (*expr_p
|| ret
!= GS_OK
);
10852 while (ret
== GS_OK
);
10854 /* If we encountered an error_mark somewhere nested inside, either
10855 stub out the statement or propagate the error back out. */
10856 if (ret
== GS_ERROR
)
10863 /* This was only valid as a return value from the langhook, which
10864 we handled. Make sure it doesn't escape from any other context. */
10865 gcc_assert (ret
!= GS_UNHANDLED
);
10867 if (fallback
== fb_none
&& *expr_p
&& !is_gimple_stmt (*expr_p
))
10869 /* We aren't looking for a value, and we don't have a valid
10870 statement. If it doesn't have side-effects, throw it away. */
10871 if (!TREE_SIDE_EFFECTS (*expr_p
))
10873 else if (!TREE_THIS_VOLATILE (*expr_p
))
10875 /* This is probably a _REF that contains something nested that
10876 has side effects. Recurse through the operands to find it. */
10877 enum tree_code code
= TREE_CODE (*expr_p
);
10881 case COMPONENT_REF
:
10882 case REALPART_EXPR
:
10883 case IMAGPART_EXPR
:
10884 case VIEW_CONVERT_EXPR
:
10885 gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
10886 gimple_test_f
, fallback
);
10890 case ARRAY_RANGE_REF
:
10891 gimplify_expr (&TREE_OPERAND (*expr_p
, 0), pre_p
, post_p
,
10892 gimple_test_f
, fallback
);
10893 gimplify_expr (&TREE_OPERAND (*expr_p
, 1), pre_p
, post_p
,
10894 gimple_test_f
, fallback
);
10898 /* Anything else with side-effects must be converted to
10899 a valid statement before we get here. */
10900 gcc_unreachable ();
10905 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p
))
10906 && TYPE_MODE (TREE_TYPE (*expr_p
)) != BLKmode
)
10908 /* Historically, the compiler has treated a bare reference
10909 to a non-BLKmode volatile lvalue as forcing a load. */
10910 tree type
= TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p
));
10912 /* Normally, we do not want to create a temporary for a
10913 TREE_ADDRESSABLE type because such a type should not be
10914 copied by bitwise-assignment. However, we make an
10915 exception here, as all we are doing here is ensuring that
10916 we read the bytes that make up the type. We use
10917 create_tmp_var_raw because create_tmp_var will abort when
10918 given a TREE_ADDRESSABLE type. */
10919 tree tmp
= create_tmp_var_raw (type
, "vol");
10920 gimple_add_tmp_var (tmp
);
10921 gimplify_assign (tmp
, *expr_p
, pre_p
);
10925 /* We can't do anything useful with a volatile reference to
10926 an incomplete type, so just throw it away. Likewise for
10927 a BLKmode type, since any implicit inner load should
10928 already have been turned into an explicit one by the
10929 gimplification process. */
10933 /* If we are gimplifying at the statement level, we're done. Tack
10934 everything together and return. */
10935 if (fallback
== fb_none
|| is_statement
)
10937 /* Since *EXPR_P has been converted into a GIMPLE tuple, clear
10938 it out for GC to reclaim it. */
10939 *expr_p
= NULL_TREE
;
10941 if (!gimple_seq_empty_p (internal_pre
)
10942 || !gimple_seq_empty_p (internal_post
))
10944 gimplify_seq_add_seq (&internal_pre
, internal_post
);
10945 gimplify_seq_add_seq (pre_p
, internal_pre
);
10948 /* The result of gimplifying *EXPR_P is going to be the last few
10949 statements in *PRE_P and *POST_P. Add location information
10950 to all the statements that were added by the gimplification
10952 if (!gimple_seq_empty_p (*pre_p
))
10953 annotate_all_with_location_after (*pre_p
, pre_last_gsi
, input_location
);
10955 if (!gimple_seq_empty_p (*post_p
))
10956 annotate_all_with_location_after (*post_p
, post_last_gsi
,
10962 #ifdef ENABLE_GIMPLE_CHECKING
10965 enum tree_code code
= TREE_CODE (*expr_p
);
10966 /* These expressions should already be in gimple IR form. */
10967 gcc_assert (code
!= MODIFY_EXPR
10968 && code
!= ASM_EXPR
10969 && code
!= BIND_EXPR
10970 && code
!= CATCH_EXPR
10971 && (code
!= COND_EXPR
|| gimplify_ctxp
->allow_rhs_cond_expr
)
10972 && code
!= EH_FILTER_EXPR
10973 && code
!= GOTO_EXPR
10974 && code
!= LABEL_EXPR
10975 && code
!= LOOP_EXPR
10976 && code
!= SWITCH_EXPR
10977 && code
!= TRY_FINALLY_EXPR
10978 && code
!= OACC_PARALLEL
10979 && code
!= OACC_KERNELS
10980 && code
!= OACC_DATA
10981 && code
!= OACC_HOST_DATA
10982 && code
!= OACC_DECLARE
10983 && code
!= OACC_UPDATE
10984 && code
!= OACC_ENTER_DATA
10985 && code
!= OACC_EXIT_DATA
10986 && code
!= OACC_CACHE
10987 && code
!= OMP_CRITICAL
10989 && code
!= OACC_LOOP
10990 && code
!= OMP_MASTER
10991 && code
!= OMP_TASKGROUP
10992 && code
!= OMP_ORDERED
10993 && code
!= OMP_PARALLEL
10994 && code
!= OMP_SECTIONS
10995 && code
!= OMP_SECTION
10996 && code
!= OMP_SINGLE
);
11000 /* Otherwise we're gimplifying a subexpression, so the resulting
11001 value is interesting. If it's a valid operand that matches
11002 GIMPLE_TEST_F, we're done. Unless we are handling some
11003 post-effects internally; if that's the case, we need to copy into
11004 a temporary before adding the post-effects to POST_P. */
11005 if (gimple_seq_empty_p (internal_post
) && (*gimple_test_f
) (*expr_p
))
11008 /* Otherwise, we need to create a new temporary for the gimplified
11011 /* We can't return an lvalue if we have an internal postqueue. The
11012 object the lvalue refers to would (probably) be modified by the
11013 postqueue; we need to copy the value out first, which means an
11015 if ((fallback
& fb_lvalue
)
11016 && gimple_seq_empty_p (internal_post
)
11017 && is_gimple_addressable (*expr_p
))
11019 /* An lvalue will do. Take the address of the expression, store it
11020 in a temporary, and replace the expression with an INDIRECT_REF of
11022 tmp
= build_fold_addr_expr_loc (input_location
, *expr_p
);
11023 gimplify_expr (&tmp
, pre_p
, post_p
, is_gimple_reg
, fb_rvalue
);
11024 *expr_p
= build_simple_mem_ref (tmp
);
11026 else if ((fallback
& fb_rvalue
) && is_gimple_reg_rhs_or_call (*expr_p
))
11028 /* An rvalue will do. Assign the gimplified expression into a
11029 new temporary TMP and replace the original expression with
11030 TMP. First, make sure that the expression has a type so that
11031 it can be assigned into a temporary. */
11032 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p
)));
11033 *expr_p
= get_formal_tmp_var (*expr_p
, pre_p
);
11037 #ifdef ENABLE_GIMPLE_CHECKING
11038 if (!(fallback
& fb_mayfail
))
11040 fprintf (stderr
, "gimplification failed:\n");
11041 print_generic_expr (stderr
, *expr_p
, 0);
11042 debug_tree (*expr_p
);
11043 internal_error ("gimplification failed");
11046 gcc_assert (fallback
& fb_mayfail
);
11048 /* If this is an asm statement, and the user asked for the
11049 impossible, don't die. Fail and let gimplify_asm_expr
11055 /* Make sure the temporary matches our predicate. */
11056 gcc_assert ((*gimple_test_f
) (*expr_p
));
11058 if (!gimple_seq_empty_p (internal_post
))
11060 annotate_all_with_location (internal_post
, input_location
);
11061 gimplify_seq_add_seq (pre_p
, internal_post
);
11065 input_location
= saved_location
;
11069 /* Look through TYPE for variable-sized objects and gimplify each such
11070 size that we find. Add to LIST_P any statements generated. */
11073 gimplify_type_sizes (tree type
, gimple_seq
*list_p
)
11077 if (type
== NULL
|| type
== error_mark_node
)
11080 /* We first do the main variant, then copy into any other variants. */
11081 type
= TYPE_MAIN_VARIANT (type
);
11083 /* Avoid infinite recursion. */
11084 if (TYPE_SIZES_GIMPLIFIED (type
))
11087 TYPE_SIZES_GIMPLIFIED (type
) = 1;
11089 switch (TREE_CODE (type
))
11092 case ENUMERAL_TYPE
:
11095 case FIXED_POINT_TYPE
:
11096 gimplify_one_sizepos (&TYPE_MIN_VALUE (type
), list_p
);
11097 gimplify_one_sizepos (&TYPE_MAX_VALUE (type
), list_p
);
11099 for (t
= TYPE_NEXT_VARIANT (type
); t
; t
= TYPE_NEXT_VARIANT (t
))
11101 TYPE_MIN_VALUE (t
) = TYPE_MIN_VALUE (type
);
11102 TYPE_MAX_VALUE (t
) = TYPE_MAX_VALUE (type
);
11107 /* These types may not have declarations, so handle them here. */
11108 gimplify_type_sizes (TREE_TYPE (type
), list_p
);
11109 gimplify_type_sizes (TYPE_DOMAIN (type
), list_p
);
11110 /* Ensure VLA bounds aren't removed, for -O0 they should be variables
11111 with assigned stack slots, for -O1+ -g they should be tracked
11113 if (!(TYPE_NAME (type
)
11114 && TREE_CODE (TYPE_NAME (type
)) == TYPE_DECL
11115 && DECL_IGNORED_P (TYPE_NAME (type
)))
11116 && TYPE_DOMAIN (type
)
11117 && INTEGRAL_TYPE_P (TYPE_DOMAIN (type
)))
11119 t
= TYPE_MIN_VALUE (TYPE_DOMAIN (type
));
11120 if (t
&& TREE_CODE (t
) == VAR_DECL
&& DECL_ARTIFICIAL (t
))
11121 DECL_IGNORED_P (t
) = 0;
11122 t
= TYPE_MAX_VALUE (TYPE_DOMAIN (type
));
11123 if (t
&& TREE_CODE (t
) == VAR_DECL
&& DECL_ARTIFICIAL (t
))
11124 DECL_IGNORED_P (t
) = 0;
11130 case QUAL_UNION_TYPE
:
11131 for (field
= TYPE_FIELDS (type
); field
; field
= DECL_CHAIN (field
))
11132 if (TREE_CODE (field
) == FIELD_DECL
)
11134 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field
), list_p
);
11135 gimplify_one_sizepos (&DECL_SIZE (field
), list_p
);
11136 gimplify_one_sizepos (&DECL_SIZE_UNIT (field
), list_p
);
11137 gimplify_type_sizes (TREE_TYPE (field
), list_p
);
11142 case REFERENCE_TYPE
:
11143 /* We used to recurse on the pointed-to type here, which turned out to
11144 be incorrect because its definition might refer to variables not
11145 yet initialized at this point if a forward declaration is involved.
11147 It was actually useful for anonymous pointed-to types to ensure
11148 that the sizes evaluation dominates every possible later use of the
11149 values. Restricting to such types here would be safe since there
11150 is no possible forward declaration around, but would introduce an
11151 undesirable middle-end semantic to anonymity. We then defer to
11152 front-ends the responsibility of ensuring that the sizes are
11153 evaluated both early and late enough, e.g. by attaching artificial
11154 type declarations to the tree. */
11161 gimplify_one_sizepos (&TYPE_SIZE (type
), list_p
);
11162 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type
), list_p
);
11164 for (t
= TYPE_NEXT_VARIANT (type
); t
; t
= TYPE_NEXT_VARIANT (t
))
11166 TYPE_SIZE (t
) = TYPE_SIZE (type
);
11167 TYPE_SIZE_UNIT (t
) = TYPE_SIZE_UNIT (type
);
11168 TYPE_SIZES_GIMPLIFIED (t
) = 1;
11172 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
11173 a size or position, has had all of its SAVE_EXPRs evaluated.
11174 We add any required statements to *STMT_P. */
11177 gimplify_one_sizepos (tree
*expr_p
, gimple_seq
*stmt_p
)
11179 tree expr
= *expr_p
;
11181 /* We don't do anything if the value isn't there, is constant, or contains
11182 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
11183 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
11184 will want to replace it with a new variable, but that will cause problems
11185 if this type is from outside the function. It's OK to have that here. */
11186 if (is_gimple_sizepos (expr
))
11189 *expr_p
= unshare_expr (expr
);
11191 gimplify_expr (expr_p
, stmt_p
, NULL
, is_gimple_val
, fb_rvalue
);
11194 /* Gimplify the body of statements of FNDECL and return a GIMPLE_BIND node
11195 containing the sequence of corresponding GIMPLE statements. If DO_PARMS
11196 is true, also gimplify the parameters. */
11199 gimplify_body (tree fndecl
, bool do_parms
)
11201 location_t saved_location
= input_location
;
11202 gimple_seq parm_stmts
, seq
;
11203 gimple
*outer_stmt
;
11205 struct cgraph_node
*cgn
;
11207 timevar_push (TV_TREE_GIMPLIFY
);
11209 /* Initialize for optimize_insn_for_s{ize,peed}_p possibly called during
11211 default_rtl_profile ();
11213 gcc_assert (gimplify_ctxp
== NULL
);
11214 push_gimplify_context ();
11216 if (flag_openacc
|| flag_openmp
)
11218 gcc_assert (gimplify_omp_ctxp
== NULL
);
11219 if (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (fndecl
)))
11220 gimplify_omp_ctxp
= new_omp_context (ORT_TARGET
);
11223 /* Unshare most shared trees in the body and in that of any nested functions.
11224 It would seem we don't have to do this for nested functions because
11225 they are supposed to be output and then the outer function gimplified
11226 first, but the g++ front end doesn't always do it that way. */
11227 unshare_body (fndecl
);
11228 unvisit_body (fndecl
);
11230 cgn
= cgraph_node::get (fndecl
);
11231 if (cgn
&& cgn
->origin
)
11232 nonlocal_vlas
= new hash_set
<tree
>;
11234 /* Make sure input_location isn't set to something weird. */
11235 input_location
= DECL_SOURCE_LOCATION (fndecl
);
11237 /* Resolve callee-copies. This has to be done before processing
11238 the body so that DECL_VALUE_EXPR gets processed correctly. */
11239 parm_stmts
= do_parms
? gimplify_parameters () : NULL
;
11241 /* Gimplify the function's body. */
11243 gimplify_stmt (&DECL_SAVED_TREE (fndecl
), &seq
);
11244 outer_stmt
= gimple_seq_first_stmt (seq
);
11247 outer_stmt
= gimple_build_nop ();
11248 gimplify_seq_add_stmt (&seq
, outer_stmt
);
11251 /* The body must contain exactly one statement, a GIMPLE_BIND. If this is
11252 not the case, wrap everything in a GIMPLE_BIND to make it so. */
11253 if (gimple_code (outer_stmt
) == GIMPLE_BIND
11254 && gimple_seq_first (seq
) == gimple_seq_last (seq
))
11255 outer_bind
= as_a
<gbind
*> (outer_stmt
);
11257 outer_bind
= gimple_build_bind (NULL_TREE
, seq
, NULL
);
11259 DECL_SAVED_TREE (fndecl
) = NULL_TREE
;
11261 /* If we had callee-copies statements, insert them at the beginning
11262 of the function and clear DECL_VALUE_EXPR_P on the parameters. */
11263 if (!gimple_seq_empty_p (parm_stmts
))
11267 gimplify_seq_add_seq (&parm_stmts
, gimple_bind_body (outer_bind
));
11268 gimple_bind_set_body (outer_bind
, parm_stmts
);
11270 for (parm
= DECL_ARGUMENTS (current_function_decl
);
11271 parm
; parm
= DECL_CHAIN (parm
))
11272 if (DECL_HAS_VALUE_EXPR_P (parm
))
11274 DECL_HAS_VALUE_EXPR_P (parm
) = 0;
11275 DECL_IGNORED_P (parm
) = 0;
11281 if (nonlocal_vla_vars
)
11283 /* tree-nested.c may later on call declare_vars (..., true);
11284 which relies on BLOCK_VARS chain to be the tail of the
11285 gimple_bind_vars chain. Ensure we don't violate that
11287 if (gimple_bind_block (outer_bind
)
11288 == DECL_INITIAL (current_function_decl
))
11289 declare_vars (nonlocal_vla_vars
, outer_bind
, true);
11291 BLOCK_VARS (DECL_INITIAL (current_function_decl
))
11292 = chainon (BLOCK_VARS (DECL_INITIAL (current_function_decl
)),
11293 nonlocal_vla_vars
);
11294 nonlocal_vla_vars
= NULL_TREE
;
11296 delete nonlocal_vlas
;
11297 nonlocal_vlas
= NULL
;
11300 if ((flag_openacc
|| flag_openmp
|| flag_openmp_simd
)
11301 && gimplify_omp_ctxp
)
11303 delete_omp_context (gimplify_omp_ctxp
);
11304 gimplify_omp_ctxp
= NULL
;
11307 pop_gimplify_context (outer_bind
);
11308 gcc_assert (gimplify_ctxp
== NULL
);
11310 if (flag_checking
&& !seen_error ())
11311 verify_gimple_in_seq (gimple_bind_body (outer_bind
));
11313 timevar_pop (TV_TREE_GIMPLIFY
);
11314 input_location
= saved_location
;
11319 typedef char *char_p
; /* For DEF_VEC_P. */
11321 /* Return whether we should exclude FNDECL from instrumentation. */
11324 flag_instrument_functions_exclude_p (tree fndecl
)
11328 v
= (vec
<char_p
> *) flag_instrument_functions_exclude_functions
;
11329 if (v
&& v
->length () > 0)
11335 name
= lang_hooks
.decl_printable_name (fndecl
, 0);
11336 FOR_EACH_VEC_ELT (*v
, i
, s
)
11337 if (strstr (name
, s
) != NULL
)
11341 v
= (vec
<char_p
> *) flag_instrument_functions_exclude_files
;
11342 if (v
&& v
->length () > 0)
11348 name
= DECL_SOURCE_FILE (fndecl
);
11349 FOR_EACH_VEC_ELT (*v
, i
, s
)
11350 if (strstr (name
, s
) != NULL
)
11357 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
11358 node for the function we want to gimplify.
11360 Return the sequence of GIMPLE statements corresponding to the body
11364 gimplify_function_tree (tree fndecl
)
11370 gcc_assert (!gimple_body (fndecl
));
11372 if (DECL_STRUCT_FUNCTION (fndecl
))
11373 push_cfun (DECL_STRUCT_FUNCTION (fndecl
));
11375 push_struct_function (fndecl
);
11377 /* Tentatively set PROP_gimple_lva here, and reset it in gimplify_va_arg_expr
11379 cfun
->curr_properties
|= PROP_gimple_lva
;
11381 for (parm
= DECL_ARGUMENTS (fndecl
); parm
; parm
= DECL_CHAIN (parm
))
11383 /* Preliminarily mark non-addressed complex variables as eligible
11384 for promotion to gimple registers. We'll transform their uses
11385 as we find them. */
11386 if ((TREE_CODE (TREE_TYPE (parm
)) == COMPLEX_TYPE
11387 || TREE_CODE (TREE_TYPE (parm
)) == VECTOR_TYPE
)
11388 && !TREE_THIS_VOLATILE (parm
)
11389 && !needs_to_live_in_memory (parm
))
11390 DECL_GIMPLE_REG_P (parm
) = 1;
11393 ret
= DECL_RESULT (fndecl
);
11394 if ((TREE_CODE (TREE_TYPE (ret
)) == COMPLEX_TYPE
11395 || TREE_CODE (TREE_TYPE (ret
)) == VECTOR_TYPE
)
11396 && !needs_to_live_in_memory (ret
))
11397 DECL_GIMPLE_REG_P (ret
) = 1;
11399 bind
= gimplify_body (fndecl
, true);
11401 /* The tree body of the function is no longer needed, replace it
11402 with the new GIMPLE body. */
11404 gimple_seq_add_stmt (&seq
, bind
);
11405 gimple_set_body (fndecl
, seq
);
11407 /* If we're instrumenting function entry/exit, then prepend the call to
11408 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
11409 catch the exit hook. */
11410 /* ??? Add some way to ignore exceptions for this TFE. */
11411 if (flag_instrument_function_entry_exit
11412 && !DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl
)
11413 && !flag_instrument_functions_exclude_p (fndecl
))
11418 gimple_seq cleanup
= NULL
, body
= NULL
;
11422 x
= builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS
);
11423 call
= gimple_build_call (x
, 1, integer_zero_node
);
11424 tmp_var
= create_tmp_var (ptr_type_node
, "return_addr");
11425 gimple_call_set_lhs (call
, tmp_var
);
11426 gimplify_seq_add_stmt (&cleanup
, call
);
11427 x
= builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_EXIT
);
11428 call
= gimple_build_call (x
, 2,
11429 build_fold_addr_expr (current_function_decl
),
11431 gimplify_seq_add_stmt (&cleanup
, call
);
11432 tf
= gimple_build_try (seq
, cleanup
, GIMPLE_TRY_FINALLY
);
11434 x
= builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS
);
11435 call
= gimple_build_call (x
, 1, integer_zero_node
);
11436 tmp_var
= create_tmp_var (ptr_type_node
, "return_addr");
11437 gimple_call_set_lhs (call
, tmp_var
);
11438 gimplify_seq_add_stmt (&body
, call
);
11439 x
= builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_ENTER
);
11440 call
= gimple_build_call (x
, 2,
11441 build_fold_addr_expr (current_function_decl
),
11443 gimplify_seq_add_stmt (&body
, call
);
11444 gimplify_seq_add_stmt (&body
, tf
);
11445 new_bind
= gimple_build_bind (NULL
, body
, gimple_bind_block (bind
));
11446 /* Clear the block for BIND, since it is no longer directly inside
11447 the function, but within a try block. */
11448 gimple_bind_set_block (bind
, NULL
);
11450 /* Replace the current function body with the body
11451 wrapped in the try/finally TF. */
11453 gimple_seq_add_stmt (&seq
, new_bind
);
11454 gimple_set_body (fndecl
, seq
);
11458 if ((flag_sanitize
& SANITIZE_THREAD
) != 0
11459 && !lookup_attribute ("no_sanitize_thread", DECL_ATTRIBUTES (fndecl
)))
11461 gcall
*call
= gimple_build_call_internal (IFN_TSAN_FUNC_EXIT
, 0);
11462 gimple
*tf
= gimple_build_try (seq
, call
, GIMPLE_TRY_FINALLY
);
11463 gbind
*new_bind
= gimple_build_bind (NULL
, tf
, gimple_bind_block (bind
));
11464 /* Clear the block for BIND, since it is no longer directly inside
11465 the function, but within a try block. */
11466 gimple_bind_set_block (bind
, NULL
);
11467 /* Replace the current function body with the body
11468 wrapped in the try/finally TF. */
11470 gimple_seq_add_stmt (&seq
, new_bind
);
11471 gimple_set_body (fndecl
, seq
);
11474 DECL_SAVED_TREE (fndecl
) = NULL_TREE
;
11475 cfun
->curr_properties
|= PROP_gimple_any
;
11479 dump_function (TDI_generic
, fndecl
);
11482 /* Return a dummy expression of type TYPE in order to keep going after an
11486 dummy_object (tree type
)
11488 tree t
= build_int_cst (build_pointer_type (type
), 0);
11489 return build2 (MEM_REF
, type
, t
, t
);
11492 /* Gimplify __builtin_va_arg, aka VA_ARG_EXPR, which is not really a
11493 builtin function, but a very special sort of operator. */
11495 enum gimplify_status
11496 gimplify_va_arg_expr (tree
*expr_p
, gimple_seq
*pre_p
,
11497 gimple_seq
*post_p ATTRIBUTE_UNUSED
)
11499 tree promoted_type
, have_va_type
;
11500 tree valist
= TREE_OPERAND (*expr_p
, 0);
11501 tree type
= TREE_TYPE (*expr_p
);
11502 tree t
, tag
, aptag
;
11503 location_t loc
= EXPR_LOCATION (*expr_p
);
11505 /* Verify that valist is of the proper type. */
11506 have_va_type
= TREE_TYPE (valist
);
11507 if (have_va_type
== error_mark_node
)
11509 have_va_type
= targetm
.canonical_va_list_type (have_va_type
);
11511 if (have_va_type
== NULL_TREE
)
11513 error_at (loc
, "first argument to %<va_arg%> not of type %<va_list%>");
11517 /* Generate a diagnostic for requesting data of a type that cannot
11518 be passed through `...' due to type promotion at the call site. */
11519 if ((promoted_type
= lang_hooks
.types
.type_promotes_to (type
))
11522 static bool gave_help
;
11525 /* Unfortunately, this is merely undefined, rather than a constraint
11526 violation, so we cannot make this an error. If this call is never
11527 executed, the program is still strictly conforming. */
11528 warned
= warning_at (loc
, 0,
11529 "%qT is promoted to %qT when passed through %<...%>",
11530 type
, promoted_type
);
11531 if (!gave_help
&& warned
)
11534 inform (loc
, "(so you should pass %qT not %qT to %<va_arg%>)",
11535 promoted_type
, type
);
11538 /* We can, however, treat "undefined" any way we please.
11539 Call abort to encourage the user to fix the program. */
11541 inform (loc
, "if this code is reached, the program will abort");
11542 /* Before the abort, allow the evaluation of the va_list
11543 expression to exit or longjmp. */
11544 gimplify_and_add (valist
, pre_p
);
11545 t
= build_call_expr_loc (loc
,
11546 builtin_decl_implicit (BUILT_IN_TRAP
), 0);
11547 gimplify_and_add (t
, pre_p
);
11549 /* This is dead code, but go ahead and finish so that the
11550 mode of the result comes out right. */
11551 *expr_p
= dummy_object (type
);
11552 return GS_ALL_DONE
;
11555 tag
= build_int_cst (build_pointer_type (type
), 0);
11556 aptag
= build_int_cst (TREE_TYPE (valist
), 0);
11558 *expr_p
= build_call_expr_internal_loc (loc
, IFN_VA_ARG
, type
, 3,
11559 valist
, tag
, aptag
);
11561 /* Clear the tentatively set PROP_gimple_lva, to indicate that IFN_VA_ARG
11562 needs to be expanded. */
11563 cfun
->curr_properties
&= ~PROP_gimple_lva
;
11568 /* Build a new GIMPLE_ASSIGN tuple and append it to the end of *SEQ_P.
11570 DST/SRC are the destination and source respectively. You can pass
11571 ungimplified trees in DST or SRC, in which case they will be
11572 converted to a gimple operand if necessary.
11574 This function returns the newly created GIMPLE_ASSIGN tuple. */
11577 gimplify_assign (tree dst
, tree src
, gimple_seq
*seq_p
)
11579 tree t
= build2 (MODIFY_EXPR
, TREE_TYPE (dst
), dst
, src
);
11580 gimplify_and_add (t
, seq_p
);
11582 return gimple_seq_last_stmt (*seq_p
);
11586 gimplify_hasher::hash (const elt_t
*p
)
11589 return iterative_hash_expr (t
, 0);
11593 gimplify_hasher::equal (const elt_t
*p1
, const elt_t
*p2
)
11597 enum tree_code code
= TREE_CODE (t1
);
11599 if (TREE_CODE (t2
) != code
11600 || TREE_TYPE (t1
) != TREE_TYPE (t2
))
11603 if (!operand_equal_p (t1
, t2
, 0))
11606 /* Only allow them to compare equal if they also hash equal; otherwise
11607 results are nondeterminate, and we fail bootstrap comparison. */
11608 gcc_checking_assert (hash (p1
) == hash (p2
));