GCC Middle and Back End API Reference
var-tracking.c File Reference

Data Structures

struct  micro_operation_def
struct  attrs_def
struct  location_chain_def
struct  loc_exp_dep_s
struct  expand_depth_struct
struct  onepart_aux
struct  variable_part_def
union  variable_part_def::variable_aux
struct  variable_def
struct  variable_hasher
struct  emit_note_data_def
struct  shared_hash_def
struct  dataflow_set_def
struct  variable_tracking_info_def
struct  parm_reg
struct  adjust_mem_data
struct  overlapping_mems
struct  variable_union_info
struct  dfset_merge
struct  dfset_post_merge
struct  count_use_info
struct  expand_loc_callback_data

Typedefs

typedef struct micro_operation_def micro_operation
typedef void * decl_or_value
typedef struct attrs_defattrs
typedef struct location_chain_deflocation_chain
typedef struct loc_exp_dep_s loc_exp_dep
typedef struct expand_depth_struct expand_depth
typedef struct variable_part_def variable_part
typedef enum onepart_enum onepart_enum_t
typedef struct variable_defvariable
typedef struct variable_defconst_variable
typedef unsigned int dvuid
typedef hash_table
< variable_hasher
variable_table_type
typedef
variable_table_type::iterator 
variable_iterator_type
typedef struct emit_note_data_def emit_note_data
typedef struct shared_hash_defshared_hash
typedef struct dataflow_set_def dataflow_set
typedef struct
variable_tracking_info_def
variable_tracking_info
typedef struct parm_reg parm_reg_t

Enumerations

enum  micro_operation_type {
  MO_USE, MO_USE_NO_VAR, MO_VAL_USE, MO_VAL_LOC,
  MO_VAL_SET, MO_SET, MO_COPY, MO_CLOBBER,
  MO_CALL, MO_ADJUST
}
enum  emit_note_where { EMIT_NOTE_BEFORE_INSN, EMIT_NOTE_AFTER_INSN, EMIT_NOTE_AFTER_CALL_INSN }
enum  onepart_enum { NOT_ONEPART = 0, ONEPART_VDECL = 1, ONEPART_DEXPR = 2, ONEPART_VALUE = 3 }

Functions

static bool dv_is_decl_p ()
static bool dv_is_value_p ()
static tree dv_as_decl ()
static rtx dv_as_value ()
static void * dv_as_opaque ()
static dvuid dv_uid ()
static hashval_t dv_uid2hash ()
static hashval_t dv_htab_hash ()
static void variable_htab_free (void *)
static void stack_adjust_offset_pre_post (rtx, HOST_WIDE_INT *, HOST_WIDE_INT *)
static void insn_stack_adjust_offset_pre_post (rtx, HOST_WIDE_INT *, HOST_WIDE_INT *)
static bool vt_stack_adjustments (void)
static void init_attrs_list_set (attrs *)
static void attrs_list_clear (attrs *)
static attrs attrs_list_member (attrs, decl_or_value, HOST_WIDE_INT)
static void attrs_list_insert (attrs *, decl_or_value, HOST_WIDE_INT, rtx)
static void attrs_list_copy (attrs *, attrs)
static void attrs_list_union (attrs *, attrs)
static variable_def ** unshare_variable (dataflow_set *set, variable_def **slot, variable var, enum var_init_status)
static void vars_copy (variable_table_type, variable_table_type)
static tree var_debug_decl (tree)
static void var_reg_set (dataflow_set *, rtx, enum var_init_status, rtx)
static void var_reg_delete_and_set (dataflow_set *, rtx, bool, enum var_init_status, rtx)
static void var_reg_delete (dataflow_set *, rtx, bool)
static void var_regno_delete (dataflow_set *, int)
static void var_mem_set (dataflow_set *, rtx, enum var_init_status, rtx)
static void var_mem_delete_and_set (dataflow_set *, rtx, bool, enum var_init_status, rtx)
static void var_mem_delete (dataflow_set *, rtx, bool)
static void dataflow_set_init (dataflow_set *)
static void dataflow_set_clear (dataflow_set *)
static void dataflow_set_copy (dataflow_set *, dataflow_set *)
static int variable_union_info_cmp_pos (const void *, const void *)
static void dataflow_set_union (dataflow_set *, dataflow_set *)
static location_chain find_loc_in_1pdv (rtx, variable, variable_table_type)
static bool canon_value_cmp (rtx, rtx)
static int loc_cmp (rtx, rtx)
static bool variable_part_different_p (variable_part *, variable_part *)
static bool onepart_variable_different_p (variable, variable)
static bool variable_different_p (variable, variable)
static bool dataflow_set_different (dataflow_set *, dataflow_set *)
static void dataflow_set_destroy (dataflow_set *)
static bool contains_symbol_ref (rtx)
static bool track_expr_p (tree, bool)
static bool same_variable_part_p (rtx, tree, HOST_WIDE_INT)
static int add_uses (rtx *, void *)
static void add_uses_1 (rtx *, void *)
static void add_stores (rtx, const_rtx, void *)
static bool compute_bb_dataflow (basic_block)
static bool vt_find_locations (void)
static void dump_attrs_list (attrs)
static void dump_var (variable)
static void dump_vars (variable_table_type)
static void dump_dataflow_set (dataflow_set *)
static void dump_dataflow_sets (void)
static void set_dv_changed (decl_or_value, bool)
static void variable_was_changed (variable, dataflow_set *)
static variable_def ** set_slot_part (dataflow_set *, rtx, variable_def **, decl_or_value, HOST_WIDE_INT, enum var_init_status, rtx)
static void set_variable_part (dataflow_set *, rtx, decl_or_value, HOST_WIDE_INT, enum var_init_status, rtx, enum insert_option)
static variable_def ** clobber_slot_part (dataflow_set *, rtx, variable_def **, HOST_WIDE_INT, rtx)
static void clobber_variable_part (dataflow_set *, rtx, decl_or_value, HOST_WIDE_INT, rtx)
static variable_def ** delete_slot_part (dataflow_set *, rtx, variable_def **, HOST_WIDE_INT)
static void delete_variable_part (dataflow_set *, rtx, decl_or_value, HOST_WIDE_INT)
static void emit_notes_in_bb (basic_block, dataflow_set *)
static void vt_emit_notes (void)
static bool vt_get_decl_and_offset (rtx, tree *, HOST_WIDE_INT *)
static void vt_add_function_parameters (void)
static bool vt_initialize (void)
static void vt_finalize (void)
static rtx compute_cfa_pointer ()
static int use_narrower_mode_test ()
static rtx use_narrower_mode ()
static rtx adjust_mems ()
static void adjust_mem_uses ()
static void adjust_mem_stores ()
static void adjust_insn ()
static rtx dv_as_rtx ()
static onepart_enum_t dv_onepart_p ()
static alloc_pool onepart_pool ()
static decl_or_value dv_from_decl ()
static decl_or_value dv_from_value ()
static decl_or_value dv_from_rtx ()
void debug_dv (decl_or_value dv)
DEBUG_FUNCTION void debug_dv ()
static void loc_exp_dep_clear (variable var)
static void variable_htab_free ()
static void init_attrs_list_set ()
static void attrs_list_clear ()
static attrs attrs_list_member ()
static void attrs_list_copy ()
static void attrs_list_union ()
static void attrs_list_mpdv_union ()
static bool shared_hash_shared ()
static variable_table_type shared_hash_htab ()
static bool shared_var_p ()
static shared_hash shared_hash_unshare ()
static shared_hash shared_hash_copy ()
static void shared_hash_destroy ()
static variable_def ** shared_hash_find_slot_unshare_1 (shared_hash *pvars, decl_or_value dv, hashval_t dvhash, enum insert_option ins)
static variable_def ** shared_hash_find_slot_unshare (shared_hash *pvars, decl_or_value dv, enum insert_option ins)
static variable_def ** shared_hash_find_slot_1 ()
static variable_def ** shared_hash_find_slot ()
static variable_def ** shared_hash_find_slot_noinsert_1 (shared_hash vars, decl_or_value dv, hashval_t dvhash)
static variable_def ** shared_hash_find_slot_noinsert ()
static variable shared_hash_find_1 ()
static variable shared_hash_find ()
static bool canon_value_cmp ()
static void vars_copy ()
static tree var_debug_decl ()
static void var_reg_decl_set (dataflow_set *set, rtx loc, enum var_init_status initialized, decl_or_value dv, HOST_WIDE_INT offset, rtx set_src, enum insert_option iopt)
static enum var_init_status get_init_value ()
static void var_reg_delete ()
static void var_regno_delete ()
static bool negative_power_of_two_p ()
static rtx vt_get_canonicalize_base ()
static rtx vt_canonicalize_addr (dataflow_set *, rtx)
static rtx get_addr_from_global_cache ()
static rtx get_addr_from_local_cache ()
static rtx vt_canonicalize_addr ()
static bool vt_canon_true_dep ()
int drop_overlapping_mem_locs ()
static void clobber_overlapping_mems ()
static void var_mem_decl_set (dataflow_set *set, rtx loc, enum var_init_status initialized, decl_or_value dv, HOST_WIDE_INT offset, rtx set_src, enum insert_option iopt)
static void var_mem_delete ()
static bool unsuitable_loc ()
static void val_bind ()
static void val_store ()
static bool local_get_addr_clear_given_value (const void *v, void **slot, void *x)
static void val_reset ()
static void val_resolve ()
static void dataflow_set_init ()
static void dataflow_set_clear ()
static void dataflow_set_copy ()
static int variable_union_info_cmp_pos ()
static int variable_union ()
static void dataflow_set_union ()
static void set_dv_changed ()
static bool dv_changed_p ()
static location_chain find_loc_in_1pdv ()
static void insert_into_intersection (location_chain *nodep, rtx loc, enum var_init_status status)
static void intersect_loc_chains (rtx val, location_chain *dest, struct dfset_merge *dsm, location_chain s1node, variable s2var)
static int loc_cmp ()
int canonicalize_loc_order_check (variable_def **slot, dataflow_set *data)
int canonicalize_values_mark ()
int canonicalize_values_star ()
int canonicalize_vars_star ()
static int variable_merge_over_cur ()
static int variable_merge_over_src ()
static void dataflow_set_merge ()
static void dataflow_set_equiv_regs ()
static void remove_duplicate_values ()
int variable_post_merge_new_vals ()
int variable_post_merge_perm_vals ()
static void dataflow_post_merge_adjust ()
static location_chain find_mem_expr_in_1pdv ()
static bool mem_dies_at_call ()
int dataflow_set_preserve_mem_locs ()
int dataflow_set_remove_mem_locs ()
static void dataflow_set_clear_at_call ()
static bool variable_part_different_p ()
static bool onepart_variable_different_p ()
static bool variable_different_p ()
static bool dataflow_set_different ()
static void dataflow_set_destroy ()
static bool contains_symbol_ref ()
static bool track_expr_p ()
static bool same_variable_part_p ()
static bool track_loc_p (rtx loc, tree expr, HOST_WIDE_INT offset, bool store_reg_p, enum machine_mode *mode_out, HOST_WIDE_INT *offset_out)
static rtx var_lowpart ()
static cselib_valfind_use_val ()
static rtx replace_expr_with_values ()
static int rtx_debug_expr_p ()
static enum micro_operation_type use_type ()
static void log_op_type (rtx x, basic_block bb, rtx insn, enum micro_operation_type mopt, FILE *out)
static void preserve_value ()
static int non_suitable_const ()
static int add_uses ()
static void add_uses_1 ()
static void reverse_op ()
static void add_stores ()
static void prepare_call_arguments ()
static void add_with_sets ()
static enum var_init_status find_src_status ()
static rtx find_src_set_src ()
static bool compute_bb_dataflow ()
static void dump_attrs_list ()
int dump_var_tracking_slot ()
static void dump_var ()
static void dump_vars ()
static void dump_dataflow_set ()
static variable variable_from_dropped ()
static struct onepart_auxrecover_dropped_1paux ()
static void variable_was_changed ()
static int find_variable_location_part (variable var, HOST_WIDE_INT offset, int *insertion_point)
static void loc_exp_dep_alloc ()
static void loc_exp_dep_clear ()
static void loc_exp_insert_dep ()
static bool loc_exp_dep_set (variable var, rtx result, rtx *value, int count, variable_table_type vars)
static void notify_dependents_of_resolved_value ()
static rtx vt_expand_loc_callback (rtx x, bitmap regs, int max_depth, void *data)
static expand_depth update_depth ()
static rtx vt_expand_var_loc_chain ()
static void resolve_expansions_pending_recursion ()
static rtx vt_expand_loc ()
static rtx vt_expand_1pvar ()
int emit_note_insn_var_location ()
int var_track_values_to_stack (variable_def **slot, vec< rtx, va_stack > *changed_values_stack)
static void remove_value_from_changed_variables ()
static void notify_dependents_of_changed_value (rtx val, variable_table_type htab, vec< rtx, va_stack > *changed_values_stack)
static void process_changed_values ()
static void emit_notes_for_changes (rtx insn, enum emit_note_where where, shared_hash vars)
int emit_notes_for_differences_1 ()
int emit_notes_for_differences_2 ()
static void emit_notes_for_differences (rtx insn, dataflow_set *old_set, dataflow_set *new_set)
static rtx next_non_note_insn_var_location ()
static void emit_notes_in_bb ()
static bool vt_get_decl_and_offset ()
static void record_entry_value ()
static void vt_add_function_parameter ()
static void vt_init_cfa_base ()
static void delete_debug_insns ()
static void vt_debug_insns_local ()
static unsigned int variable_tracking_main_1 ()
unsigned int variable_tracking_main ()
static bool gate_handle_var_tracking ()
rtl_opt_passmake_pass_variable_tracking ()

Variables

char check_value_val [(int) VALUE==(int) IDENTIFIER_NODE?1:-1]
static const char *const micro_operation_type_name []
static alloc_pool attrs_pool
static alloc_pool var_pool
static alloc_pool valvar_pool
static alloc_pool loc_chain_pool
static alloc_pool shared_hash_pool
static alloc_pool loc_exp_dep_pool
static variable_table_type changed_variables
static bool emit_notes
static variable_table_type dropped_values
static shared_hash empty_shared_hash
static bitmap scratch_regs = NULL
static vec< parm_reg_t, va_gc > * windowed_parm_regs = NULL
static bool cselib_hook_called
static rtx cfa_base_rtx
static HOST_WIDE_INT cfa_base_offset
static HOST_WIDE_INT hard_frame_pointer_adjustment = -1
static bool dst_can_be_shared
static struct pointer_map_tglobal_get_addr_cache
static struct pointer_map_tlocal_get_addr_cache
static struct variable_union_infovui_vec
static int vui_allocated
static vec< rtxpreserved_values
static rtx call_arguments
static int debug_label_num = 1

Typedef Documentation

typedef struct attrs_def * attrs
Description of location of a part of a variable.  The content of a physical
   register is described by a chain of these structures.
   The chains are pretty short (usually 1 or 2 elements) and thus
   chain is the best data structure.   
typedef struct variable_def* const_variable
Structure holding the IN or OUT set for a basic block.   
typedef void* decl_or_value
A declaration of a variable, or an RTL value being handled like a
   declaration.   
typedef unsigned int dvuid
Structure for passing some other parameters to function
   emit_note_insn_var_location.   
This data structure holds information about the depth of a variable
   expansion.   
typedef struct loc_exp_dep_s loc_exp_dep
A vector of loc_exp_dep holds the active dependencies of a one-part
   DV on VALUEs, i.e., the VALUEs expanded so as to form the current
   location of DV.  Each entry is also part of VALUE' s linked-list of
   backlinks back to DV.   
Structure for chaining the locations.   
Structure holding information about micro operation.   
Enumeration type used to discriminate various types of one-part
   variables.   
typedef struct parm_reg parm_reg_t
typedef struct shared_hash_def * shared_hash
Structure holding a refcounted hash table.  If refcount > 1,
   it must be first unshared before modified.   
typedef struct variable_def * variable
Structure describing where the variable is located.   
typedef variable_table_type::iterator variable_iterator_type
Structure describing one part of variable.   
The structure (one for each basic block) containing the information
   needed for variable tracking.   

Enumeration Type Documentation

Where shall the note be emitted?  BEFORE or AFTER the instruction.
   Notes emitted as AFTER_CALL are to take effect during the call,
   rather than after the call.   
Enumerator:
EMIT_NOTE_BEFORE_INSN 
EMIT_NOTE_AFTER_INSN 
EMIT_NOTE_AFTER_CALL_INSN 
Type of micro operation.   
Enumerator:
MO_USE 
MO_USE_NO_VAR 
MO_VAL_USE 
MO_VAL_LOC 
MO_VAL_SET 
MO_SET 
MO_COPY 
MO_CLOBBER 
MO_CALL 
MO_ADJUST 
Enumeration type used to discriminate various types of one-part
   variables.   
Enumerator:
NOT_ONEPART 
ONEPART_VDECL 
ONEPART_DEXPR 
ONEPART_VALUE 

Function Documentation

static void add_stores ( rtx  ,
const_rtx  ,
void *   
)
static

Referenced by add_with_sets().

static int add_uses ( rtx ,
void *   
)
static

Referenced by add_uses_1().

static void add_uses_1 ( rtx ,
void *   
)
static

Referenced by add_with_sets().

static void add_uses_1 ( )
static
Helper function for finding all uses of REG/MEM in X in insn INSN.   

References add_uses(), and for_each_rtx().

static void add_with_sets ( )
static
Callback for cselib_record_sets_hook, that records as micro
   operations uses and stores in an insn after cselib_record_sets has
   analyzed the sets in an insn, but before it modifies the stored
   values in the internal tables, unless cselib_record_sets doesn't
   call it directly (perhaps because we're not doing cselib in the
   first place, in which case sets and n_sets will be 0).   

References add_stores(), add_uses_1(), count_use_info::bb, call_arguments, cselib_hook_called, dump_file, dump_flags, micro_operation_def::insn, count_use_info::insn, micro_operation_def::loc, log_op_type(), MO_CALL, MO_CLOBBER, MO_USE, MO_VAL_LOC, MO_VAL_USE, count_use_info::n_sets, note_stores(), note_uses(), count_use_info::sets, count_use_info::store_p, micro_operation_def::type, and micro_operation_def::u.

Referenced by vt_initialize().

static void adjust_insn ( )
static
static void adjust_mem_stores ( )
static
Helper function for replacement of stores.   

References adjust_mems(), simplify_replace_fn_rtx(), and validate_change().

Referenced by adjust_insn().

static void adjust_mem_uses ( )
static
Helper function for replacement of uses.   

References adjust_mems(), simplify_replace_fn_rtx(), and validate_change().

Referenced by adjust_insn().

static void attrs_list_clear ( attrs )
static
static void attrs_list_clear ( )
static
Make the list *LISTP empty.   

References attrs_pool, attrs_def::next, and pool_free().

static void attrs_list_copy ( attrs ,
attrs   
)
static

Referenced by dataflow_set_copy().

static void attrs_list_copy ( )
static
Copy all nodes from SRC and create a list *DSTP of the copies.   

References attrs_list_clear(), attrs_pool, attrs_def::dv, attrs_def::loc, attrs_def::next, attrs_def::offset, and pool_alloc().

static void attrs_list_insert ( attrs listp,
decl_or_value  dv,
HOST_WIDE_INT  offset,
rtx  loc 
)
static
static attrs attrs_list_member ( attrs  ,
decl_or_value  ,
HOST_WIDE_INT   
)
static
static attrs attrs_list_member ( )
static
Return true if the pair of DECL and OFFSET is the member of the LIST.   

References attrs_def::dv, dv_as_opaque(), attrs_def::next, and attrs_def::offset.

static void attrs_list_mpdv_union ( )
static
Combine nodes that are not onepart nodes from SRC and SRC2 into
   *DSTP.   

References attrs_list_insert(), attrs_list_member(), attrs_def::dv, dv_onepart_p(), attrs_def::loc, attrs_def::next, and attrs_def::offset.

Referenced by dataflow_set_merge().

static void attrs_list_union ( attrs ,
attrs   
)
static

Referenced by dataflow_set_union().

static void attrs_list_union ( )
static
Add all nodes from SRC which are not in *DSTP to *DSTP.   

References attrs_list_insert(), attrs_list_member(), attrs_def::dv, attrs_def::loc, attrs_def::next, and attrs_def::offset.

static bool canon_value_cmp ( )
inlinestatic
Return true if TVAL is better than CVAL as a canonival value.  We
   choose lowest-numbered VALUEs, using the RTX address as a
   tie-breaker.  The idea is to arrange them into a star topology,
   such that all of them are at most one step away from the canonical
   value, and the canonical value has backlinks to all of them, in
   addition to all the actual locations.  We don't enforce this
   topology throughout the entire dataflow analysis, though.
int canonicalize_loc_order_check ( variable_def **  slot,
dataflow_set data 
)
Check the order of entries in one-part variables.    

References location_chain_def::loc, loc_cmp(), variable_def::n_var_parts, and location_chain_def::next.

Referenced by compute_bb_dataflow(), and vt_find_locations().

int canonicalize_values_mark ( )
Mark with VALUE_RECURSED_INTO values that have neighbors that are
   more likely to be chosen as canonical for an equivalence set.
   Ensure less likely values can reach more likely neighbors, making
   the connections bidirectional.   

References canon_value_cmp(), variable_def::dv, dv_as_value(), dv_from_value(), dv_is_value_p(), location_chain_def::init, location_chain_def::loc, variable_def::n_var_parts, location_chain_def::next, set_slot_part(), and shared_hash_find_slot_noinsert().

Referenced by compute_bb_dataflow().

int canonicalize_vars_star ( )
Bind one-part variables to the canonical value in an equivalence
   set.  Not doing this causes dataflow convergence failure in rare
   circumstances, see PR42873.  Unfortunately we can't do this
   efficiently as part of canonicalize_values_star, since we may not
   have determined or even seen the canonical value of a set when we
   get to a variable that references another member of the set.   

References canon_value_cmp(), clobber_slot_part(), variable_def::dv, dv_from_value(), location_chain_def::init, location_chain_def::loc, variable_def::n_var_parts, location_chain_def::next, ONEPART_VALUE, set_slot_part(), location_chain_def::set_src, and shared_hash_find_slot_noinsert().

Referenced by dataflow_post_merge_adjust().

static variable_def ** clobber_slot_part ( dataflow_set set,
rtx  loc,
variable_def **  slot,
HOST_WIDE_INT  offset,
rtx  set_src 
)
static
Remove all recorded register locations for the given variable part
   from dataflow set SET, except for those that are identical to loc.
   The variable part is specified by variable's declaration or value
   DV and offset OFFSET.   

References attrs_pool, delete_slot_part(), attrs_def::dv, variable_def::dv, dv_as_opaque(), find_variable_location_part(), location_chain_def::loc, attrs_def::next, location_chain_def::next, attrs_def::offset, pool_free(), rtx_equal_p(), and location_chain_def::set_src.

Referenced by canonicalize_values_star(), canonicalize_vars_star(), and clobber_variable_part().

static void clobber_variable_part ( dataflow_set set,
rtx  loc,
decl_or_value  dv,
HOST_WIDE_INT  offset,
rtx  set_src 
)
static
Remove all recorded register locations for the given variable part
   from dataflow set SET, except for those that are identical to loc.
   The variable part is specified by variable's declaration or value
   DV and offset OFFSET.   

References clobber_slot_part(), dv_as_decl(), dv_as_opaque(), dv_is_value_p(), and shared_hash_find_slot_noinsert().

Referenced by canonicalize_values_star(), compute_bb_dataflow(), emit_notes_in_bb(), val_reset(), var_mem_delete(), var_mem_delete_and_set(), var_reg_delete(), and var_reg_delete_and_set().

static bool compute_bb_dataflow ( basic_block  )
static

Referenced by vt_find_locations().

static rtx compute_cfa_pointer ( )
inlinestatic
Compute a CFA-based value for an ADJUSTMENT made to stack_pointer_rtx
   or hard_frame_pointer_rtx.   

References cfa_base_offset, cfa_base_rtx, and plus_constant().

Referenced by adjust_mems().

static bool contains_symbol_ref ( rtx  )
static
static bool contains_symbol_ref ( )
static
Return true if RTL X contains a SYMBOL_REF.   

References contains_symbol_ref().

static void dataflow_post_merge_adjust ( )
static
static void dataflow_set_clear ( dataflow_set )
static
static void dataflow_set_clear ( )
static
Delete the contents of dataflow set SET.   

References attrs_list_clear(), empty_shared_hash, shared_hash_copy(), and shared_hash_destroy().

static void dataflow_set_clear_at_call ( )
static
Remove all variable-location information about call-clobbered
   registers, as well as associations between MEMs and VALUEs.   

References dataflow_set_preserve_mem_locs(), dataflow_set_remove_mem_locs(), shared_hash_htab(), hash_table< Descriptor, Allocator >::traverse(), and var_regno_delete().

Referenced by compute_bb_dataflow(), and emit_notes_in_bb().

static void dataflow_set_copy ( dataflow_set ,
dataflow_set  
)
static
static void dataflow_set_copy ( )
static
static void dataflow_set_destroy ( dataflow_set )
static
static void dataflow_set_destroy ( )
static
Free the contents of dataflow set SET.   

References attrs_list_clear(), and shared_hash_destroy().

static bool dataflow_set_different ( dataflow_set ,
dataflow_set  
)
static

Referenced by compute_bb_dataflow().

static void dataflow_set_init ( )
static
Initialize dataflow set SET to be empty.
   VARS_SIZE is the initial size of hash table VARS.   

References empty_shared_hash, init_attrs_list_set(), and shared_hash_copy().

int dataflow_set_preserve_mem_locs ( )
int dataflow_set_remove_mem_locs ( )
static void dataflow_set_union ( dataflow_set ,
dataflow_set  
)
static

Referenced by vt_find_locations().

static void dataflow_set_union ( )
static
void debug_dv ( decl_or_value  dv)
DEBUG_FUNCTION void debug_dv ( )
static void delete_debug_insns ( )
static
Get rid of all debug insns from the insn stream.   

References debug_label_num, and delete_insn().

Referenced by variable_tracking_main_1(), and vt_debug_insns_local().

static variable_def ** delete_slot_part ( dataflow_set set,
rtx  loc,
variable_def **  slot,
HOST_WIDE_INT  offset 
)
static
Delete the part of variable's location from dataflow set SET.  The
   variable part is specified by its SET->vars slot SLOT and offset
   OFFSET and the part's location by LOC.   

References changed, find_variable_location_part(), location_chain_def::loc, loc_chain_pool, variable_def::n_var_parts, location_chain_def::next, pool_free(), rtx_equal_p(), shared_var_p(), unshare_variable(), VAR_INIT_STATUS_UNKNOWN, and variable_was_changed().

Referenced by clobber_slot_part(), delete_variable_part(), and variable_merge_over_cur().

static void delete_variable_part ( dataflow_set set,
rtx  loc,
decl_or_value  dv,
HOST_WIDE_INT  offset 
)
static
Delete the part of variable's location from dataflow set SET.  The
   variable part is specified by variable's declaration or value DV
   and offset OFFSET and the part's location by LOC.   

References delete_slot_part(), and shared_hash_find_slot_noinsert().

Referenced by val_reset(), var_mem_delete(), var_reg_delete(), var_reg_delete_and_set(), and var_regno_delete().

int drop_overlapping_mem_locs ( )
Remove all MEMs that overlap with COMS->LOC from the location list
   of a hash table entry for a value.  COMS->ADDR must be a
   canonicalized form of COMS->LOC's address, and COMS->LOC must be
   canonicalized itself.   

References overlapping_mems::addr, changed, location_chain_def::loc, overlapping_mems::loc, loc_chain_pool, variable_def::n_var_parts, location_chain_def::next, ONEPART_VALUE, pool_free(), overlapping_mems::set, shared_var_p(), unshare_variable(), VAR_INIT_STATUS_UNKNOWN, variable_was_changed(), and vt_canon_true_dep().

Referenced by clobber_overlapping_mems().

static void dump_attrs_list ( attrs  )
static

Referenced by dump_dataflow_set().

static void dump_attrs_list ( )
static
static void dump_dataflow_set ( dataflow_set )
static
static void dump_dataflow_set ( )
static
Print the dataflow set SET to dump file.   

References dump_attrs_list(), dump_file, dump_vars(), HOST_WIDE_INT_PRINT_DEC, and shared_hash_htab().

static void dump_dataflow_sets ( )
static
Print the IN and OUT sets for each basic block to dump file.   

References count_use_info::bb, dump_dataflow_set(), dump_file, and basic_block_def::index.

Referenced by variable_tracking_main_1().

static void dump_var ( variable  )
static
int dump_var_tracking_slot ( )
Print the information about variable *SLOT to dump file.   

References dump_var().

Referenced by dump_vars().

static void dump_vars ( variable_table_type  )
static

Referenced by dump_dataflow_set().

static void dump_vars ( )
static
Print the information about variables from hash table VARS to dump file.   

References dump_file, dump_var_tracking_slot(), hash_table< Descriptor, Allocator >::elements(), and hash_table< Descriptor, Allocator >::traverse().

static rtx dv_as_rtx ( )
inlinestatic
Return the DEBUG_EXPR of a DEBUG_EXPR_DECL or the VALUE in DV.   

References dv_as_decl(), dv_as_value(), and dv_is_value_p().

Referenced by notify_dependents_of_changed_value().

static bool dv_changed_p ( )
inlinestatic
static bool dv_is_decl_p ( )
inlinestatic
static onepart_enum_t dv_onepart_p ( )
inlinestatic
Return nonzero if a decl_or_value must not have more than one
   variable part.  The returned value discriminates among various
   kinds of one-part DVs ccording to enum onepart_enum.   

References dv_as_decl(), dv_is_value_p(), NOT_ONEPART, ONEPART_DEXPR, ONEPART_VALUE, ONEPART_VDECL, and target_for_debug_bind().

Referenced by attrs_list_mpdv_union(), dataflow_set_equiv_regs(), notify_dependents_of_changed_value(), notify_dependents_of_resolved_value(), set_dv_changed(), set_slot_part(), var_reg_delete(), and variable_from_dropped().

static dvuid dv_uid ( )
inlinestatic
Return the uid of DV.   

References dv_as_decl(), dv_as_value(), and dv_is_value_p().

Referenced by dv_htab_hash().

static hashval_t dv_uid2hash ( )
inlinestatic
Compute the hash from the uid.   

Referenced by dv_htab_hash().

static void emit_notes_for_changes ( rtx  insn,
enum emit_note_where  where,
shared_hash  vars 
)
static
Emit NOTE_INSN_VAR_LOCATION note for each variable from a chain
   CHANGED_VARIABLES and delete this chain.  WHERE specifies whether
   the notes shall be emitted before of after instruction INSN.   

References changed_variables, hash_table< Descriptor, Allocator >::elements(), emit_note_insn_var_location(), emit_note_data_def::insn, process_changed_values(), shared_hash_htab(), hash_table< Descriptor, Allocator >::traverse(), emit_note_data_def::vars, and emit_note_data_def::where.

Referenced by emit_notes_for_differences(), and emit_notes_in_bb().

static void emit_notes_for_differences ( rtx  insn,
dataflow_set old_set,
dataflow_set new_set 
)
static
int emit_notes_for_differences_1 ( )
int emit_notes_for_differences_2 ( )
Add variable *SLOT to the chain CHANGED_VARIABLES if it is not in hash
   table DATA.   

References variable_def::dv, dv_htab_hash(), hash_table< Descriptor, Allocator >::find_with_hash(), variable_def::n_var_parts, and variable_was_changed().

Referenced by emit_notes_for_differences().

static void emit_notes_in_bb ( basic_block  ,
dataflow_set  
)
static

Referenced by vt_emit_notes().

static location_chain find_loc_in_1pdv ( rtx  ,
variable  ,
variable_table_type   
)
static
static location_chain find_loc_in_1pdv ( )
static
Return a location list node whose loc is rtx_equal to LOC, in the
   location list of a one-part variable or value VAR, or in that of
   any values recursively mentioned in the location lists.  VARS must
   be in star-canonical form.   

References canon_value_cmp(), variable_def::dv, dv_as_opaque(), dv_as_value(), dv_from_value(), dv_htab_hash(), dv_is_value_p(), find_loc_in_1pdv(), hash_table< Descriptor, Allocator >::find_with_hash(), location_chain_def::loc, variable_def::n_var_parts, location_chain_def::next, and rtx_equal_p().

static location_chain find_mem_expr_in_1pdv ( )
static
Return a node whose loc is a MEM that refers to EXPR in the
   location list of a one-part variable or value VAR, or in that of
   any values recursively mentioned in the location lists.   

References variable_def::dv, dv_from_value(), dv_htab_hash(), hash_table< Descriptor, Allocator >::find_with_hash(), location_chain_def::loc, variable_def::n_var_parts, and location_chain_def::next.

Referenced by dataflow_set_preserve_mem_locs().

static rtx find_src_set_src ( )
static
SRC is the source of an assignment.  Use SET to try to find what
   was ultimately assigned to SRC.  Return that value if known,
   otherwise return SRC itself.   

References variable_def::dv, dv_from_decl(), location_chain_def::loc, variable_def::n_var_parts, location_chain_def::next, rtx_equal_p(), location_chain_def::set_src, shared_hash_find(), and var_debug_decl().

Referenced by compute_bb_dataflow(), and emit_notes_in_bb().

static cselib_val* find_use_val ( )
inlinestatic
static int find_variable_location_part ( variable  var,
HOST_WIDE_INT  offset,
int *  insertion_point 
)
inlinestatic
Look for the index in VAR->var_part corresponding to OFFSET.
   Return -1 if not found.  If INSERTION_POINT is non-NULL, the
   referenced int will be set to the index that the part has or should
   have, if it should be inserted.   

References variable_def::n_var_parts, and offset.

Referenced by clobber_slot_part(), delete_slot_part(), and set_slot_part().

static bool gate_handle_var_tracking ( )
static

References targetm.

static rtx get_addr_from_global_cache ( )
static
Return the canonical address for LOC, that must be a VALUE, using a
   cached global equivalence or computing it and storing it in the
   global cache.   

References canon_rtx(), get_addr(), global_get_addr_cache, pointer_map_contains(), pointer_map_insert(), and vt_canonicalize_addr().

Referenced by get_addr_from_local_cache(), and vt_canonicalize_addr().

static rtx get_addr_from_local_cache ( )
static
Return the canonical address for LOC, that must be a VALUE, using a
   cached local equivalence or computing it and storing it in the
   local cache.   

References canon_value_cmp(), variable_def::dv, dv_from_rtx(), get_addr_from_global_cache(), location_chain_def::loc, local_get_addr_cache, location_chain_def::next, pointer_map_contains(), pointer_map_insert(), shared_hash_find(), vt_canonicalize_addr(), and vt_get_canonicalize_base().

Referenced by vt_canonicalize_addr().

static void init_attrs_list_set ( attrs )
static

Referenced by dataflow_set_init().

static void init_attrs_list_set ( )
static
Initialize the set (array) SET of attrs to empty lists.   
static void insert_into_intersection ( location_chain nodep,
rtx  loc,
enum var_init_status  status 
)
static
Insert LOC in *DNODE, if it's not there yet.  The list must be in
   loc_cmp order, and it is maintained as such.   

References location_chain_def::init, location_chain_def::loc, loc_chain_pool, loc_cmp(), location_chain_def::next, pool_alloc(), and location_chain_def::set_src.

Referenced by intersect_loc_chains().

static void insn_stack_adjust_offset_pre_post ( rtx  insn,
HOST_WIDE_INT pre,
HOST_WIDE_INT post 
)
static
Given an INSN, calculate the amount of stack adjustment it contains
   PRE- and POST-modifying stack pointer.   

References find_reg_note(), SET, and stack_adjust_offset_pre_post().

Referenced by vt_initialize(), and vt_stack_adjustments().

static void intersect_loc_chains ( rtx  val,
location_chain dest,
struct dfset_merge dsm,
location_chain  s1node,
variable  s2var 
)
static
Insert in DEST the intersection of the locations present in both
   S1NODE and S2VAR, directly or indirectly.  S1NODE is from a
   variable in DSM->cur, whereas S2VAR is from DSM->src.  dvar is in
   DSM->dst.   

References dfset_merge::cur, variable_def::dv, dv_from_value(), find_loc_in_1pdv(), location_chain_def::init, insert_into_intersection(), location_chain_def::loc, variable_def::n_var_parts, location_chain_def::next, shared_hash_find(), shared_hash_htab(), dfset_merge::src, and dataflow_set_def::vars.

Referenced by variable_merge_over_cur().

static int loc_cmp ( )
static
Return -1 if X should be before Y in a location list for a 1-part
   variable, 1 if Y should be before X, and 0 if they're equivalent
   and should not appear in the list.   

References canon_value_cmp(), and loc_cmp().

static void loc_exp_dep_alloc ( )
static
Allocate the one-part auxiliary data structure for VAR, with enough
   room for COUNT dependencies.   

References deps, and is_empty().

Referenced by loc_exp_dep_set(), and loc_exp_insert_dep().

static void loc_exp_dep_clear ( variable  var)
static
static void loc_exp_dep_clear ( )
static
Remove all entries from the vector of active dependencies of VAR,
   removing them from the back-links lists too.   

References is_empty(), loc_exp_dep_s::next, and loc_exp_dep_s::pprev.

static bool loc_exp_dep_set ( variable  var,
rtx  result,
rtx value,
int  count,
variable_table_type  vars 
)
static
Create active dependencies of VAR on COUNT values starting at
   VALUE, and corresponding back-links to the entries in VARS.  Return
   true if we found any pending-recursion results.   

References is_empty(), loc_exp_dep_alloc(), and loc_exp_insert_dep().

Referenced by vt_expand_var_loc_chain().

static void loc_exp_insert_dep ( )
static
Insert an active dependency from VAR on X to the vector of
   dependencies, and add the corresponding back-link to X's list of
   back-links in VARS.   

References loc_exp_dep_s::dv, variable_def::dv, dv_from_rtx(), dv_htab_hash(), hash_table< Descriptor, Allocator >::find_with_hash(), loc_exp_dep_alloc(), loc_exp_dep_pool, memset(), loc_exp_dep_s::next, NOT_ONEPART, pool_alloc(), loc_exp_dep_s::pprev, loc_exp_dep_s::value, and variable_from_dropped().

Referenced by emit_note_insn_var_location(), and loc_exp_dep_set().

static bool local_get_addr_clear_given_value ( const void *  v,
void **  slot,
void *  x 
)
static
Clear (canonical address) slots that reference X.   

References vt_get_canonicalize_base().

Referenced by val_reset().

static void log_op_type ( rtx  x,
basic_block  bb,
rtx  insn,
enum micro_operation_type  mopt,
FILE *  out 
)
inlinestatic
Log to OUT information about micro-operation MOPT involving X in
   INSN of BB.   

References basic_block_def::index, micro_operation_type_name, and print_inline_rtx().

Referenced by add_stores(), add_uses(), add_with_sets(), and vt_initialize().

rtl_opt_pass* make_pass_variable_tracking ( )
static bool mem_dies_at_call ( )
static
Return TRUE if the value of MEM may vary across a call.   

References get_base_address(), is_global_var(), and may_be_aliased().

Referenced by dataflow_set_preserve_mem_locs(), and dataflow_set_remove_mem_locs().

static bool negative_power_of_two_p ( )
static
Return true if I is the negated value of a power of two.   

References HOST_WIDE_INT.

Referenced by vt_canonicalize_addr(), and vt_get_canonicalize_base().

static rtx next_non_note_insn_var_location ( )
static
Return the next insn after INSN that is not a NOTE_INSN_VAR_LOCATION.   

Referenced by emit_notes_in_bb().

static int non_suitable_const ( )
static
Helper function for MO_VAL_LOC handling.  Return non-zero if
   any rtxes not suitable for CONST use not replaced by VALUEs
   are discovered.   

Referenced by add_uses().

static void notify_dependents_of_changed_value ( rtx  val,
variable_table_type  htab,
vec< rtx, va_stack > *  changed_values_stack 
)
static
If VAL (a value or debug_expr) has backlinks to variables actively
   dependent on it in HTAB or in CHANGED_VARIABLES, mark them as
   changed, adding to CHANGED_VALUES_STACK any dependencies that may
   have dependencies of their own to notify.   

References changed_variables, dropped_values, loc_exp_dep_s::dv, variable_def::dv, dv_as_rtx(), dv_changed_p(), dv_from_rtx(), dv_htab_hash(), dv_onepart_p(), hash_table< Descriptor, Allocator >::find_slot_with_hash(), hash_table< Descriptor, Allocator >::find_with_hash(), loc_exp_dep_pool, variable_def::n_var_parts, loc_exp_dep_s::next, NOT_ONEPART, ONEPART_DEXPR, ONEPART_VALUE, ONEPART_VDECL, pool_free(), loc_exp_dep_s::pprev, set_dv_changed(), and variable_was_changed().

Referenced by process_changed_values().

static void notify_dependents_of_resolved_value ( )
static
Notify the back-links of IVAR that are pending recursion that we
   have found a non-NIL value for it, so they are cleared for another
   attempt to compute a current location.   

References loc_exp_dep_s::dv, variable_def::dv, dv_as_value(), dv_changed_p(), dv_htab_hash(), dv_is_value_p(), dv_onepart_p(), hash_table< Descriptor, Allocator >::find_with_hash(), loc_exp_dep_s::next, NOT_ONEPART, loc_exp_dep_s::pprev, and variable_from_dropped().

Referenced by vt_expand_loc_callback().

static alloc_pool onepart_pool ( )
inlinestatic
static bool onepart_variable_different_p ( variable  ,
variable   
)
static
static bool onepart_variable_different_p ( )
static
Return true if one-part variables VAR1 and VAR2 are different.
   They must be in canonical order.   

References location_chain_def::loc, loc_cmp(), variable_def::n_var_parts, and location_chain_def::next.

static void preserve_value ( )
static
Ensure VAL is preserved and remember it in a vector for vt_emit_notes.   

References cselib_preserve_value(), preserved_values, and cselib_val_struct::val_rtx.

Referenced by add_stores(), add_uses(), vt_add_function_parameter(), vt_init_cfa_base(), and vt_initialize().

static void process_changed_values ( )
static
Take out of changed_variables any entries that don't refer to use
   variables.  Back-propagate change notifications from values and
   debug_exprs to their active dependencies in HTAB or in
   CHANGED_VARIABLES.   

References changed_variables, notify_dependents_of_changed_value(), remove_value_from_changed_variables(), hash_table< Descriptor, Allocator >::traverse(), and var_track_values_to_stack().

Referenced by emit_notes_for_changes().

static void record_entry_value ( )
static
Record the value for the ENTRY_VALUE of RTL as a global equivalence
   of VAL.   

References cselib_add_permanent_equiv(), and get_insns().

Referenced by vt_add_function_parameter().

static struct onepart_aux* recover_dropped_1paux ( )
staticread
Recover the one-part aux from dropped_values.   

References variable_def::dv, ONEPART_VDECL, and variable_from_dropped().

Referenced by variable_was_changed().

static void remove_duplicate_values ( )
static
Remove any redundant values in the location list of VAR, which must
   be unshared and 1-part.   

References location_chain_def::loc, loc_chain_pool, variable_def::n_var_parts, location_chain_def::next, pool_free(), and variable_def::refcount.

Referenced by variable_post_merge_new_vals().

static void remove_value_from_changed_variables ( )
static
Remove from changed_variables the entry whose DV corresponds to
   value or debug_expr VAL.   

References changed_variables, hash_table< Descriptor, Allocator >::clear_slot(), variable_def::dv, dv_from_rtx(), dv_htab_hash(), and hash_table< Descriptor, Allocator >::find_slot_with_hash().

Referenced by process_changed_values().

static rtx replace_expr_with_values ( )
static
Replace all registers and addresses in an expression with VALUE
   expressions that map back to them, unless the expression is a
   register.  If no mapping is or can be performed, returns NULL.   

References cselib_lookup(), cselib_subst_to_values(), get_address_mode(), replace_equiv_address_nv(), and cselib_val_struct::val_rtx.

Referenced by add_stores(), and add_uses().

static void resolve_expansions_pending_recursion ( )
static
While expanding variables, we may encounter recursion cycles
   because of mutual (possibly indirect) dependencies between two
   particular variables (or values), say A and B.  If we're trying to
   expand A when we get to B, which in turn attempts to expand A, if
   we can't find any other expansion for B, we'll add B to this
   pending-recursion stack, and tentatively return NULL for its
   location.  This tentative value will be used for any other
   occurrences of B, unless A gets some other location, in which case
   it will notify B that it is worth another try at computing a
   location for it, and it will use the location computed for A then.
   At the end of the expansion, the tentative NULL locations become
   final for all members of PENDING that didn't get a notification.
   This function performs this finalization of NULL locations.   

References variable_def::dv, dv_changed_p(), dv_from_rtx(), and set_dv_changed().

static void reverse_op ( )
static
Attempt to reverse the EXPR operation in the debug info and record
   it in the cselib table.  Say for reg1 = reg2 + 6 even when reg2 is
   no longer live we can express its value as VAL - 6.   

References canonical_cselib_val(), cfa_base_rtx, count, cselib_add_permanent_equiv(), cselib_expand_value_rtx(), cselib_lookup(), cselib_preserved_value_p(), gen_lowpart_SUBREG(), elt_loc_list::loc, cselib_val_struct::locs, elt_loc_list::next, references_value_p(), scratch_regs, SET, simplify_gen_binary(), and cselib_val_struct::val_rtx.

Referenced by add_stores().

static int rtx_debug_expr_p ( )
static
Return true if *X is a DEBUG_EXPR.  Usable as an argument to
   for_each_rtx to tell whether there are any DEBUG_EXPRs within
   RTX.   

Referenced by use_type().

static bool same_variable_part_p ( rtx  ,
tree  ,
HOST_WIDE_INT   
)
static

Referenced by add_stores().

static bool same_variable_part_p ( )
static
Determine whether a given LOC refers to the same variable part as
   EXPR+OFFSET.   

References HOST_WIDE_INT, and var_debug_decl().

static void set_dv_changed ( )
inlinestatic
Record (if NEWV) that DV needs to have its cur_loc recomputed.  For
   user DECLs, this means they're in changed_variables.  Values and
   debug exprs may be left with this flag set if no user variable
   requires them to be evaluated.   

References dv_as_decl(), dv_as_value(), dv_onepart_p(), ONEPART_DEXPR, and ONEPART_VALUE.

static void set_variable_part ( dataflow_set set,
rtx  loc,
decl_or_value  dv,
HOST_WIDE_INT  offset,
enum var_init_status  initialized,
rtx  set_src,
enum insert_option  iopt 
)
static
Set the part of variable's location in the dataflow set SET.  The
   variable part is specified by variable's declaration in DV and
   offset OFFSET and the part's location by LOC.  IOPT should be
   NO_INSERT if the variable is known to be in SET already and the
   variable hash table must not be resized, and INSERT otherwise.   

References set_slot_part(), shared_hash_find_slot(), shared_hash_find_slot_noinsert(), and shared_hash_find_slot_unshare().

Referenced by canonicalize_values_star(), compute_bb_dataflow(), dataflow_set_equiv_regs(), emit_notes_in_bb(), val_bind(), val_reset(), val_resolve(), var_mem_decl_set(), var_reg_decl_set(), variable_merge_over_cur(), variable_post_merge_perm_vals(), and vt_add_function_parameter().

static shared_hash shared_hash_copy ( )
inlinestatic
Increment reference counter on VARS and return it.   

References shared_hash_def::refcount.

Referenced by dataflow_set_clear(), dataflow_set_copy(), dataflow_set_init(), dataflow_set_union(), and vt_find_locations().

static void shared_hash_destroy ( )
static
static variable shared_hash_find_1 ( )
inlinestatic
Return variable for DV or NULL if not already present in the hash
   table.   

References hash_table< Descriptor, Allocator >::find_with_hash(), and shared_hash_htab().

Referenced by shared_hash_find(), and variable_merge_over_cur().

static variable_def** shared_hash_find_slot ( )
inlinestatic
static variable_def** shared_hash_find_slot_1 ( )
inlinestatic
Return slot for DV, if it is already present in the hash table.
   If it is not present, insert it only VARS is not shared, otherwise
   return NULL.   

References hash_table< Descriptor, Allocator >::find_slot_with_hash(), shared_hash_htab(), and shared_hash_shared().

Referenced by shared_hash_find_slot().

static variable_def** shared_hash_find_slot_noinsert_1 ( shared_hash  vars,
decl_or_value  dv,
hashval_t  dvhash 
)
inlinestatic
Return slot for DV only if it is already present in the hash table.   

References hash_table< Descriptor, Allocator >::find_slot_with_hash(), and shared_hash_htab().

Referenced by shared_hash_find_slot_noinsert(), and variable_merge_over_cur().

static variable_def** shared_hash_find_slot_unshare ( shared_hash pvars,
decl_or_value  dv,
enum insert_option  ins 
)
inlinestatic
static variable_def** shared_hash_find_slot_unshare_1 ( shared_hash pvars,
decl_or_value  dv,
hashval_t  dvhash,
enum insert_option  ins 
)
inlinestatic
Unshare *PVARS if shared and return slot for DV.  If INS is
   INSERT, insert it if not already present.   

References hash_table< Descriptor, Allocator >::find_slot_with_hash(), shared_hash_htab(), shared_hash_shared(), and shared_hash_unshare().

Referenced by shared_hash_find_slot_unshare(), and variable_merge_over_cur().

static bool shared_hash_shared ( )
inlinestatic
static bool shared_var_p ( )
inlinestatic
static void stack_adjust_offset_pre_post ( rtx  pattern,
HOST_WIDE_INT pre,
HOST_WIDE_INT post 
)
static
Local function prototypes.   
Given a SET, calculate the amount of stack adjustment it contains
   PRE- and POST-modifying stack pointer.
   This function is similar to stack_adjust_offset.   

Referenced by insn_stack_adjust_offset_pre_post().

static bool track_expr_p ( tree  ,
bool   
)
static

Referenced by track_loc_p(), and use_type().

static bool track_expr_p ( )
static
static bool track_loc_p ( rtx  loc,
tree  expr,
HOST_WIDE_INT  offset,
bool  store_reg_p,
enum machine_mode *  mode_out,
HOST_WIDE_INT offset_out 
)
static
LOC is a REG or MEM that we would like to track if possible.
   If EXPR is null, we don't know what expression LOC refers to,
   otherwise it refers to EXPR + OFFSET.  STORE_REG_P is true if
   LOC is an lvalue register.

   Return true if EXPR is nonnull and if LOC, or some lowpart of it,
   is something we can track.  When returning true, store the mode of
   the lowpart we can track in *MODE_OUT (if nonnull) and its offset
   from EXPR in *OFFSET_OUT (if nonnull).   

References byte_lowpart_offset(), offset, and track_expr_p().

Referenced by use_type(), and vt_add_function_parameter().

static bool unsuitable_loc ( )
inlinestatic
Return true if LOC should not be expanded for location expressions,
   or used in them.   

Referenced by add_stores(), add_uses(), val_resolve(), val_store(), and vt_expand_var_loc_chain().

static expand_depth update_depth ( )
inlinestatic
Return the combined depth, when one sub-expression evaluated to
   BEST_DEPTH and the previous known depth was SAVED_DEPTH.   

References expand_depth_struct::complexity, and expand_depth_struct::entryvals.

Referenced by vt_expand_loc_callback(), and vt_expand_var_loc_chain().

static rtx use_narrower_mode ( )
static
Transform X into narrower mode MODE from wider mode WMODE.   

References lowpart_subreg(), and simplify_gen_binary().

Referenced by adjust_mems().

static int use_narrower_mode_test ( )
static
Helper for adjust_mems.  Return 1 if *loc is unsuitable for
   transformation of wider mode arithmetics to narrower mode,
   -1 if it is suitable and subexpressions shouldn't be
   traversed and 0 if it is suitable and subexpressions should
   be traversed.  Called through for_each_rtx.   

References cselib_lookup(), for_each_rtx(), subreg_lowpart_offset(), and validate_subreg().

Referenced by adjust_mems().

static void val_bind ( )
inlinestatic
static void val_resolve ( )
static
Find the values in a given location and map the val to another
   value, if it is unique, or add the location as one holding the
   value.   

References dump_file, dump_flags, attrs_def::dv, variable_def::dv, dv_as_value(), dv_from_value(), dv_is_value_p(), attrs_def::next, attrs_def::offset, print_inline_rtx(), set_variable_part(), unsuitable_loc(), val_bind(), val_reset(), and VAR_INIT_STATUS_INITIALIZED.

Referenced by compute_bb_dataflow(), and emit_notes_in_bb().

static void val_store ( )
static
Bind a value to a location it was just stored in.  If MODIFIED
   holds, assume the location was modified, detaching it from any
   values bound to it.   

References cselib_preserved_value_p(), dump_file, elt_loc_list::loc, cselib_val_struct::locs, elt_loc_list::next, print_inline_rtx(), elt_loc_list::setting_insn, unsuitable_loc(), and val_bind().

Referenced by compute_bb_dataflow(), and emit_notes_in_bb().

static tree var_debug_decl ( )
inlinestatic
Map a decl to its main debug decl.   
static rtx var_lowpart ( )
static
Return the MODE lowpart of LOC, or null if LOC is not something we
   want to track.  When returning nonnull, make sure that the attributes
   on the returned value are updated.   

References byte_lowpart_offset(), gen_rtx_REG_offset(), offset, reg_offset, subreg_lowpart_offset(), and subreg_regno_offset().

Referenced by add_stores(), add_uses(), and vt_add_function_parameter().

static void var_mem_decl_set ( dataflow_set set,
rtx  loc,
enum var_init_status  initialized,
decl_or_value  dv,
HOST_WIDE_INT  offset,
rtx  set_src,
enum insert_option  iopt 
)
static
Set the location of DV, OFFSET as the MEM LOC.   

References dv_as_decl(), dv_from_decl(), dv_is_decl_p(), set_variable_part(), and var_debug_decl().

Referenced by val_bind(), val_reset(), and var_mem_set().

static void var_mem_delete ( dataflow_set ,
rtx  ,
bool   
)
static
static void var_mem_delete ( )
static
Delete the location part LOC from dataflow set SET.  If CLOBBER is
   true, also delete any other live copies of the same variable part.
   Adjust the address first if it is stack pointer based.   

References clobber_overlapping_mems(), clobber_variable_part(), delete_variable_part(), dv_from_decl(), HOST_WIDE_INT, offset, and var_debug_decl().

static void var_mem_delete_and_set ( dataflow_set set,
rtx  loc,
bool  modify,
enum var_init_status  initialized,
rtx  set_src 
)
static
Delete and set the location part of variable MEM_EXPR (LOC) in
   dataflow set SET to LOC.  If MODIFY is true, any other live copies
   of the same variable part are also deleted from the dataflow set,
   otherwise the variable part is assumed to be copied from another
   location holding the same part.
   Adjust the address first if it is stack pointer based.   

References clobber_overlapping_mems(), clobber_variable_part(), dv_from_decl(), get_init_value(), HOST_WIDE_INT, offset, var_debug_decl(), VAR_INIT_STATUS_UNKNOWN, and var_mem_set().

Referenced by compute_bb_dataflow(), and emit_notes_in_bb().

static void var_mem_set ( dataflow_set set,
rtx  loc,
enum var_init_status  initialized,
rtx  set_src 
)
static
Set the location part of variable MEM_EXPR (LOC) in dataflow set
   SET to LOC.
   Adjust the address first if it is stack pointer based.   

References dv_from_decl(), HOST_WIDE_INT, offset, and var_mem_decl_set().

Referenced by compute_bb_dataflow(), emit_notes_in_bb(), and var_mem_delete_and_set().

static void var_reg_decl_set ( dataflow_set set,
rtx  loc,
enum var_init_status  initialized,
decl_or_value  dv,
HOST_WIDE_INT  offset,
rtx  set_src,
enum insert_option  iopt 
)
static
static void var_reg_delete ( dataflow_set ,
rtx  ,
bool   
)
static
static void var_reg_delete ( )
static
Delete the association of register LOC in dataflow set SET with any
   variables that aren't onepart.  If CLOBBER is true, also delete any
   other live copies of the same variable part, and delete the
   association with onepart dvs too.   

References attrs_pool, clobber_variable_part(), delete_variable_part(), attrs_def::dv, dv_from_decl(), dv_onepart_p(), HOST_WIDE_INT, attrs_def::loc, attrs_def::next, attrs_def::offset, offset, pool_free(), and var_debug_decl().

static void var_reg_delete_and_set ( dataflow_set set,
rtx  loc,
bool  modify,
enum var_init_status  initialized,
rtx  set_src 
)
static
Delete current content of register LOC in dataflow set SET and set
   the register to contain REG_EXPR (LOC), REG_OFFSET (LOC).  If
   MODIFY is true, any other live copies of the same variable part are
   also deleted from the dataflow set, otherwise the variable part is
   assumed to be copied from another location holding the same
   part.   

References attrs_pool, clobber_variable_part(), delete_variable_part(), attrs_def::dv, dv_as_opaque(), dv_from_decl(), get_init_value(), HOST_WIDE_INT, attrs_def::loc, attrs_def::next, attrs_def::offset, offset, pool_free(), var_debug_decl(), VAR_INIT_STATUS_UNKNOWN, and var_reg_set().

Referenced by compute_bb_dataflow(), and emit_notes_in_bb().

static void var_reg_set ( dataflow_set set,
rtx  loc,
enum var_init_status  initialized,
rtx  set_src 
)
static
Set the register to contain REG_EXPR (LOC), REG_OFFSET (LOC).   

References dv_from_decl(), HOST_WIDE_INT, offset, and var_reg_decl_set().

Referenced by compute_bb_dataflow(), emit_notes_in_bb(), and var_reg_delete_and_set().

static void var_regno_delete ( dataflow_set ,
int   
)
static
static void var_regno_delete ( )
static
Delete content of register with number REGNO in dataflow set SET.   

References attrs_pool, delete_variable_part(), attrs_def::dv, attrs_def::loc, attrs_def::next, attrs_def::offset, and pool_free().

int var_track_values_to_stack ( variable_def **  slot,
vec< rtx, va_stack > *  changed_values_stack 
)
While traversing changed_variables, push onto DATA (a stack of RTX
   values) entries that aren't user variables.   

References variable_def::dv, dv_as_decl(), dv_as_value(), ONEPART_DEXPR, and ONEPART_VALUE.

Referenced by process_changed_values().

static bool variable_different_p ( variable  ,
variable   
)
static
static bool variable_different_p ( )
static
Return true if variables VAR1 and VAR2 are different.   

References variable_def::dv, dv_as_opaque(), variable_def::n_var_parts, onepart_variable_different_p(), and variable_part_different_p().

static void variable_htab_free ( void *  )
static
static void variable_htab_free ( )
static
static int variable_merge_over_src ( )
static
Copy s2slot (in DSM->src) to DSM->dst if the variable is a
   multi-part variable.  Unions of multi-part variables and
   intersections of one-part ones will be handled in
   variable_merge_over_cur().   

References dfset_merge::dst, variable_def::dv, variable_def::refcount, shared_hash_find_slot(), dfset_merge::src_onepart_cnt, and dataflow_set_def::vars.

Referenced by dataflow_set_merge().

static bool variable_part_different_p ( variable_part ,
variable_part  
)
static

Referenced by variable_different_p().

static bool variable_part_different_p ( )
static
unsigned int variable_tracking_main ( void  )
In var-tracking.c  

References variable_tracking_main_1().

static unsigned int variable_tracking_main_1 ( )
inlinestatic
static int variable_union ( )
static
Compute union of location parts of variable *SLOT and the same variable
   from hash table DATA.  Compute "sorted" union of the location chains
   for common offsets, i.e. the locations of a variable part are sorted by
   a priority where the priority is the sum of the positions in the 2 chains
   (if a location is only in one list the position in the second list is
   defined to be larger than the length of the chains).
   When we are updating the location parts the newest location is in the
   beginning of the chain, so when we do the described "sorted" union
   we keep the newest locations in the beginning.   

References dst_can_be_shared, variable_def::dv, location_chain_def::init, variable_union_info::lc, location_chain_def::loc, loc_chain_pool, loc_cmp(), variable_def::n_var_parts, location_chain_def::next, pool_alloc(), variable_union_info::pos, variable_union_info::pos_dst, variable_def::refcount, rtx_equal_p(), location_chain_def::set_src, shared_hash_find_slot(), shared_hash_find_slot_unshare(), shared_var_p(), unshare_variable(), VAR_INIT_STATUS_INITIALIZED, VAR_INIT_STATUS_UNKNOWN, variable_union_info_cmp_pos(), vui_allocated, and vui_vec.

Referenced by dataflow_set_union(), variable_merge_over_cur(), and variable_post_merge_perm_vals().

static int variable_union_info_cmp_pos ( const void *  ,
const void *   
)
static

Referenced by variable_union().

static int variable_union_info_cmp_pos ( )
static
Compare function for qsort, order the structures by POS element.   

References i1, i2, variable_union_info::pos, and variable_union_info::pos_dst.

static void vars_copy ( variable_table_type  ,
variable_table_type   
)
static

Referenced by shared_hash_unshare().

static void vars_copy ( )
static
Copy all variables from hash table SRC to hash table DST.   

References variable_def::dv, dv_htab_hash(), hash_table< Descriptor, Allocator >::find_slot_with_hash(), and variable_def::refcount.

static void vt_add_function_parameters ( )
static
Insert function parameters to IN and OUT sets of ENTRY_BLOCK.   

References current_function_decl, and vt_add_function_parameter().

Referenced by vt_initialize().

static bool vt_canon_true_dep ( )
inlinestatic
Return true iff there's a true dependence between MLOC and LOC.
   MADDR must be a canonicalized version of MLOC's address.   

References canon_true_dependence(), and vt_canonicalize_addr().

Referenced by drop_overlapping_mem_locs().

static rtx vt_canonicalize_addr ( )
static
Canonicalize LOC using equivalences from SET in addition to those
   in the cselib static table.  It expects a VALUE-based expression,
   and it will only substitute VALUEs with other VALUEs or
   function-global equivalences, so that, if two addresses have base
   VALUEs that are locally or globally related in ways that
   memrefs_conflict_p cares about, they will both canonicalize to
   expressions that have the same base VALUE.

   The use of VALUEs as canonical base addresses enables the canonical
   RTXs to remain unchanged globally, if they resolve to a constant,
   or throughout a basic block otherwise, so that they can be cached
   and the cache needs not be invalidated when REGs, MEMs or such
   change.   

References canon_rtx(), get_addr_from_global_cache(), get_addr_from_local_cache(), HOST_WIDE_INT, negative_power_of_two_p(), plus_constant(), and vt_canonicalize_addr().

static void vt_debug_insns_local ( )
static
Run a fast, BB-local only version of var tracking, to take care of
   information that we don't do global analysis on, such that not all
   information is lost.  If SKIPPED holds, we're skipping the global
   pass entirely, so we should try to use information it would have
   handled as well..   

References delete_debug_insns().

Referenced by variable_tracking_main_1().

static rtx vt_expand_1pvar ( )
static
Expand the one-part VARiable to a location, using the equivalences
   in VARS, updating their CUR_LOCs in the process.   

References variable_def::dv, dv_changed_p(), expand_loc_callback_data::expanding, variable_def::n_var_parts, scratch_regs, and vt_expand_var_loc_chain().

Referenced by emit_note_insn_var_location().

static rtx vt_expand_loc ( )
static
Expand VALUEs and DEBUG_EXPRs in LOC to a location, using the
   equivalences in VARS, updating their CUR_LOCs in the process.   

References cselib_expand_value_rtx_cb(), scratch_regs, and vt_expand_loc_callback().

Referenced by emit_note_insn_var_location(), and emit_notes_in_bb().

static rtx vt_expand_loc_callback ( rtx  x,
bitmap  regs,
int  max_depth,
void *  data 
)
static
static rtx vt_expand_var_loc_chain ( )
inlinestatic
static rtx vt_get_canonicalize_base ( )
static
Strip constant offsets and alignments off of LOC.  Return the base
   expression.   

References negative_power_of_two_p().

Referenced by get_addr_from_local_cache(), and local_get_addr_clear_given_value().

static bool vt_get_decl_and_offset ( rtx  ,
tree ,
HOST_WIDE_INT  
)
static
static bool vt_get_decl_and_offset ( )
static
If there is a declaration and offset associated with register/memory RTL
   assign declaration to *DECLP and offset to *OFFSETP, and return true.   
static void vt_init_cfa_base ( )
static
Initialize cfa_base_rtx, create a preserved VALUE for it and
   ensure it isn't flushed during cselib_reset_table.
   Can be called only if frame_pointer_rtx resp. arg_pointer_rtx
   has been eliminated.   

References cfa_base_offset, cfa_base_rtx, cselib_lookup_from_insn(), cselib_preserve_cfa_base_value(), current_function_decl, get_insns(), preserve_value(), and vt_equate_reg_base_value().

Referenced by vt_initialize().

static bool vt_initialize ( )
static
Allocate and initialize the data structures for variable tracking
   and parse the RTL to get the micro operations.   

References add_with_sets(), micro_operation_def::adjust, adjust_insn(), alloc_aux_for_blocks(), attrs_pool, cancel_changes(), cfa_base_rtx, changed_variables, hash_table< Descriptor, Allocator >::create(), create_alloc_pool(), cselib_add_permanent_equiv(), cselib_get_next_uid(), cselib_hook_called, cselib_init(), cselib_invalidate_rtx(), cselib_lookup(), cselib_lookup_from_insn(), cselib_preserve_cfa_base_value(), CSELIB_PRESERVE_CONSTANTS, cselib_preserve_only_values(), cselib_preserved_value_p(), cselib_process_insn(), CSELIB_RECORD_MEMORY, cselib_record_sets_hook, cselib_reset_table(), cselib_set_value_sp_based(), current_function_decl, dataflow_set_init(), dump_cselib_table(), dump_file, dump_flags, eliminate_regs(), empty_shared_hash, find_edge(), edge_def::flags, fp_setter_insn(), get_insns(), global_get_addr_cache, hard_frame_pointer_adjustment, HOST_WIDE_INT, shared_hash_def::htab, micro_operation_def::insn, insn_stack_adjust_offset_pre_post(), last_bb, loc_chain_pool, log_op_type(), MO_ADJUST, basic_block_def::next_bb, offset, plus_constant(), pointer_map_create(), pool_alloc(), prepare_call_arguments(), preserve_value(), preserved_values, print_rtl_single(), shared_hash_def::refcount, scratch_regs, shared_hash_pool, single_pred_p(), micro_operation_def::type, micro_operation_def::u, valvar_pool, var_pool, vt_add_function_parameters(), vt_init_cfa_base(), and vt_stack_adjustments().

Referenced by variable_tracking_main_1().

static bool vt_stack_adjustments ( )
static
Compute stack adjustments for all blocks by traversing DFS tree.
   Return true when the adjustments on all incoming edges are consistent.
   Heavily borrowed from pre_and_rev_post_order_compute.   

References edge_def::dest, ei_edge(), ei_next(), ei_one_before_end_p(), free(), HOST_WIDE_INT, insn_stack_adjust_offset_pre_post(), offset, edge_def::src, stack, basic_block_def::succs, and visited.

Referenced by vt_initialize().


Variable Documentation

rtx call_arguments
static
Arguments to the call.   

Referenced by add_with_sets(), and prepare_call_arguments().

HOST_WIDE_INT cfa_base_offset
static
rtx cfa_base_rtx
static
arg_pointer_rtx resp. frame_pointer_rtx if stack_pointer_rtx or
   hard_frame_pointer_rtx is being mapped to it and offset for it.   

Referenced by add_stores(), adjust_mems(), compute_cfa_pointer(), reverse_op(), use_type(), vt_init_cfa_base(), and vt_initialize().

char check_value_val[(int) VALUE==(int) IDENTIFIER_NODE?1:-1]
Variable tracking routines for the GNU compiler.
   Copyright (C) 2002-2013 Free Software Foundation, Inc.

   This file is part of GCC.

   GCC is free software; you can redistribute it and/or modify it
   under the terms of the GNU General Public License as published by
   the Free Software Foundation; either version 3, or (at your option)
   any later version.

   GCC is distributed in the hope that it will be useful, but WITHOUT
   ANY WARRANTY; without even the implied warranty of MERCHANTABILITY
   or FITNESS FOR A PARTICULAR PURPOSE.  See the GNU General Public
   License for more details.

   You should have received a copy of the GNU General Public License
   along with GCC; see the file COPYING3.  If not see
   <http://www.gnu.org/licenses/>.   
This file contains the variable tracking pass.  It computes where
   variables are located (which registers or where in memory) at each position
   in instruction stream and emits notes describing the locations.
   Debug information (DWARF2 location lists) is finally generated from
   these notes.
   With this debug information, it is possible to show variables
   even when debugging optimized code.

   How does the variable tracking pass work?

   First, it scans RTL code for uses, stores and clobbers (register/memory
   references in instructions), for call insns and for stack adjustments
   separately for each basic block and saves them to an array of micro
   operations.
   The micro operations of one instruction are ordered so that
   pre-modifying stack adjustment < use < use with no var < call insn <
     < clobber < set < post-modifying stack adjustment

   Then, a forward dataflow analysis is performed to find out how locations
   of variables change through code and to propagate the variable locations
   along control flow graph.
   The IN set for basic block BB is computed as a union of OUT sets of BB's
   predecessors, the OUT set for BB is copied from the IN set for BB and
   is changed according to micro operations in BB.

   The IN and OUT sets for basic blocks consist of a current stack adjustment
   (used for adjusting offset of variables addressed using stack pointer),
   the table of structures describing the locations of parts of a variable
   and for each physical register a linked list for each physical register.
   The linked list is a list of variable parts stored in the register,
   i.e. it is a list of triplets (reg, decl, offset) where decl is
   REG_EXPR (reg) and offset is REG_OFFSET (reg).  The linked list is used for
   effective deleting appropriate variable parts when we set or clobber the
   register.

   There may be more than one variable part in a register.  The linked lists
   should be pretty short so it is a good data structure here.
   For example in the following code, register allocator may assign same
   register to variables A and B, and both of them are stored in the same
   register in CODE:

     if (cond)
       set A;
     else
       set B;
     CODE;
     if (cond)
       use A;
     else
       use B;

   Finally, the NOTE_INSN_VAR_LOCATION notes describing the variable locations
   are emitted to appropriate positions in RTL code.  Each such a note describes
   the location of one variable at the point in instruction stream where the
   note is.  There is no need to emit a note for each variable before each
   instruction, we only emit these notes where the location of variable changes
   (this means that we also emit notes for changes between the OUT set of the
   previous block and the IN set of the current block).

   The notes consist of two parts:
   1. the declaration (from REG_EXPR or MEM_EXPR)
   2. the location of a variable - it is either a simple register/memory
      reference (for simple variables, for example int),
      or a parallel of register/memory references (for a large variables
      which consist of several parts, for example long long).
var-tracking.c assumes that tree code with the same value as VALUE rtx code
   has no chance to appear in REG_EXPR/MEM_EXPRs and isn't a decl.
   Currently the value is the same as IDENTIFIER_NODE, which has such
   a property.  If this compile time assertion ever fails, make sure that
   the new tree code that equals (int) VALUE has the same property.   
bool cselib_hook_called
static
Variable used to tell whether cselib_process_insn called our hook.   

Referenced by add_with_sets(), and vt_initialize().

int debug_label_num = 1
static
This is *not* reset after each function.  It gives each
   NOTE_INSN_DELETED_DEBUG_LABEL in the entire compilation
   a unique label number.   

Referenced by delete_debug_insns().

variable_table_type dropped_values
static
Values whose dynamic location lists have gone empty, but whose
   cselib location lists are still usable.  Use this to hold the
   current location, the backlinks, etc, during emit_notes.   

Referenced by notify_dependents_of_changed_value(), variable_from_dropped(), variable_was_changed(), and vt_emit_notes().

bool emit_notes
static
shared_hash empty_shared_hash
static
struct pointer_map_t* global_get_addr_cache
static
This caches canonicalized addresses for VALUEs, computed using
   information in the global cselib table.   

Referenced by get_addr_from_global_cache(), vt_finalize(), and vt_initialize().

HOST_WIDE_INT hard_frame_pointer_adjustment = -1
static
Adjustment for hard_frame_pointer_rtx to cfa base reg,
   or -1 if the replacement shouldn't be done.   

Referenced by add_stores(), adjust_mems(), and vt_initialize().

alloc_pool loc_exp_dep_pool
static
Alloc pool for struct loc_exp_dep_s for NOT_ONEPART variables.   

Referenced by loc_exp_insert_dep(), notify_dependents_of_changed_value(), vt_emit_notes(), and vt_finalize().

struct pointer_map_t* local_get_addr_cache
static
This caches canonicalized addresses for VALUEs, computed using
   information from the global cache and information pertaining to a
   basic block being analyzed.   

Referenced by compute_bb_dataflow(), get_addr_from_local_cache(), val_reset(), and vt_emit_notes().

const char* const micro_operation_type_name[]
static
Initial value:
{
"MO_USE",
"MO_USE_NO_VAR",
"MO_VAL_USE",
"MO_VAL_LOC",
"MO_VAL_SET",
"MO_SET",
"MO_COPY",
"MO_CLOBBER",
"MO_CALL",
"MO_ADJUST"
}

Referenced by log_op_type().

vec<rtx> preserved_values
static
All preserved VALUEs.   

Referenced by preserve_value(), vt_finalize(), and vt_initialize().

bitmap scratch_regs = NULL
static
Scratch register bitmap used by cselib_expand_value_rtx.   

Referenced by reverse_op(), vt_expand_1pvar(), vt_expand_loc(), vt_finalize(), and vt_initialize().

alloc_pool shared_hash_pool
static
Alloc pool for struct shared_hash_def.   

Referenced by dataflow_set_merge(), shared_hash_destroy(), shared_hash_unshare(), vt_finalize(), and vt_initialize().

alloc_pool valvar_pool
static
Alloc pool for struct variable_def with a single var_part entry.   

Referenced by onepart_pool(), vt_finalize(), and vt_initialize().

alloc_pool var_pool
static
Alloc pool for struct variable_def with MAX_VAR_PARTS entries.   

Referenced by onepart_pool(), vt_finalize(), and vt_initialize().

int vui_allocated
static

Referenced by variable_union(), and vt_finalize().

struct variable_union_info* vui_vec
static
Buffer for location list sorting and its allocated size.   

Referenced by variable_union(), and vt_finalize().

vec<parm_reg_t, va_gc>* windowed_parm_regs = NULL
static
Vector of windowed parameter registers, if any.   

Referenced by adjust_insn(), vt_add_function_parameter(), and vt_finalize().