1 /* Functions related to building classes and their related objects.
2 Copyright (C) 1987, 1992, 1993, 1994, 1995, 1996, 1997, 1998,
3 1999, 2000, 2001, 2002, 2003, 2004, 2005 Free Software Foundation, Inc.
4 Contributed by Michael Tiemann (tiemann@cygnus.com)
6 This file is part of GCC.
8 GCC is free software; you can redistribute it and/or modify
9 it under the terms of the GNU General Public License as published by
10 the Free Software Foundation; either version 2, or (at your option)
13 GCC is distributed in the hope that it will be useful,
14 but WITHOUT ANY WARRANTY; without even the implied warranty of
15 MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
16 GNU General Public License for more details.
18 You should have received a copy of the GNU General Public License
19 along with GCC; see the file COPYING. If not, write to
20 the Free Software Foundation, 51 Franklin Street, Fifth Floor,
21 Boston, MA 02110-1301, USA. */
24 /* High-level class interface. */
28 #include "coretypes.h"
39 #include "tree-dump.h"
41 /* The number of nested classes being processed. If we are not in the
42 scope of any class, this is zero. */
44 int current_class_depth;
46 /* In order to deal with nested classes, we keep a stack of classes.
47 The topmost entry is the innermost class, and is the entry at index
48 CURRENT_CLASS_DEPTH */
50 typedef struct class_stack_node {
51 /* The name of the class. */
54 /* The _TYPE node for the class. */
57 /* The access specifier pending for new declarations in the scope of
61 /* If were defining TYPE, the names used in this class. */
62 splay_tree names_used;
64 /* Nonzero if this class is no longer open, because of a call to
67 }* class_stack_node_t;
69 typedef struct vtbl_init_data_s
71 /* The base for which we're building initializers. */
73 /* The type of the most-derived type. */
75 /* The binfo for the dynamic type. This will be TYPE_BINFO (derived),
76 unless ctor_vtbl_p is true. */
78 /* The negative-index vtable initializers built up so far. These
79 are in order from least negative index to most negative index. */
81 /* The last (i.e., most negative) entry in INITS. */
83 /* The binfo for the virtual base for which we're building
84 vcall offset initializers. */
86 /* The functions in vbase for which we have already provided vcall
89 /* The vtable index of the next vcall or vbase offset. */
91 /* Nonzero if we are building the initializer for the primary
94 /* Nonzero if we are building the initializer for a construction
97 /* True when adding vcall offset entries to the vtable. False when
98 merely computing the indices. */
99 bool generate_vcall_entries;
102 /* The type of a function passed to walk_subobject_offsets. */
103 typedef int (*subobject_offset_fn) (tree, tree, splay_tree);
105 /* The stack itself. This is a dynamically resized array. The
106 number of elements allocated is CURRENT_CLASS_STACK_SIZE. */
107 static int current_class_stack_size;
108 static class_stack_node_t current_class_stack;
110 /* The size of the largest empty class seen in this translation unit. */
111 static GTY (()) tree sizeof_biggest_empty_class;
113 /* An array of all local classes present in this translation unit, in
114 declaration order. */
115 VEC(tree,gc) *local_classes;
117 static tree get_vfield_name (tree);
118 static void finish_struct_anon (tree);
119 static tree get_vtable_name (tree);
120 static tree get_basefndecls (tree, tree);
121 static int build_primary_vtable (tree, tree);
122 static int build_secondary_vtable (tree);
123 static void finish_vtbls (tree);
124 static void modify_vtable_entry (tree, tree, tree, tree, tree *);
125 static void finish_struct_bits (tree);
126 static int alter_access (tree, tree, tree);
127 static void handle_using_decl (tree, tree);
128 static tree dfs_modify_vtables (tree, void *);
129 static tree modify_all_vtables (tree, tree);
130 static void determine_primary_bases (tree);
131 static void finish_struct_methods (tree);
132 static void maybe_warn_about_overly_private_class (tree);
133 static int method_name_cmp (const void *, const void *);
134 static int resort_method_name_cmp (const void *, const void *);
135 static void add_implicitly_declared_members (tree, int, int);
136 static tree fixed_type_or_null (tree, int *, int *);
137 static tree resolve_address_of_overloaded_function (tree, tree, tsubst_flags_t,
139 static tree build_simple_base_path (tree expr, tree binfo);
140 static tree build_vtbl_ref_1 (tree, tree);
141 static tree build_vtbl_initializer (tree, tree, tree, tree, int *);
142 static int count_fields (tree);
143 static int add_fields_to_record_type (tree, struct sorted_fields_type*, int);
144 static void check_bitfield_decl (tree);
145 static void check_field_decl (tree, tree, int *, int *, int *);
146 static void check_field_decls (tree, tree *, int *, int *);
147 static tree *build_base_field (record_layout_info, tree, splay_tree, tree *);
148 static void build_base_fields (record_layout_info, splay_tree, tree *);
149 static void check_methods (tree);
150 static void remove_zero_width_bit_fields (tree);
151 static void check_bases (tree, int *, int *);
152 static void check_bases_and_members (tree);
153 static tree create_vtable_ptr (tree, tree *);
154 static void include_empty_classes (record_layout_info);
155 static void layout_class_type (tree, tree *);
156 static void fixup_pending_inline (tree);
157 static void fixup_inline_methods (tree);
158 static void propagate_binfo_offsets (tree, tree);
159 static void layout_virtual_bases (record_layout_info, splay_tree);
160 static void build_vbase_offset_vtbl_entries (tree, vtbl_init_data *);
161 static void add_vcall_offset_vtbl_entries_r (tree, vtbl_init_data *);
162 static void add_vcall_offset_vtbl_entries_1 (tree, vtbl_init_data *);
163 static void build_vcall_offset_vtbl_entries (tree, vtbl_init_data *);
164 static void add_vcall_offset (tree, tree, vtbl_init_data *);
165 static void layout_vtable_decl (tree, int);
166 static tree dfs_find_final_overrider_pre (tree, void *);
167 static tree dfs_find_final_overrider_post (tree, void *);
168 static tree find_final_overrider (tree, tree, tree);
169 static int make_new_vtable (tree, tree);
170 static tree get_primary_binfo (tree);
171 static int maybe_indent_hierarchy (FILE *, int, int);
172 static tree dump_class_hierarchy_r (FILE *, int, tree, tree, int);
173 static void dump_class_hierarchy (tree);
174 static void dump_class_hierarchy_1 (FILE *, int, tree);
175 static void dump_array (FILE *, tree);
176 static void dump_vtable (tree, tree, tree);
177 static void dump_vtt (tree, tree);
178 static void dump_thunk (FILE *, int, tree);
179 static tree build_vtable (tree, tree, tree);
180 static void initialize_vtable (tree, tree);
181 static void layout_nonempty_base_or_field (record_layout_info,
182 tree, tree, splay_tree);
183 static tree end_of_class (tree, int);
184 static bool layout_empty_base (tree, tree, splay_tree);
185 static void accumulate_vtbl_inits (tree, tree, tree, tree, tree);
186 static tree dfs_accumulate_vtbl_inits (tree, tree, tree, tree,
188 static void build_rtti_vtbl_entries (tree, vtbl_init_data *);
189 static void build_vcall_and_vbase_vtbl_entries (tree, vtbl_init_data *);
190 static void clone_constructors_and_destructors (tree);
191 static tree build_clone (tree, tree);
192 static void update_vtable_entry_for_fn (tree, tree, tree, tree *, unsigned);
193 static void build_ctor_vtbl_group (tree, tree);
194 static void build_vtt (tree);
195 static tree binfo_ctor_vtable (tree);
196 static tree *build_vtt_inits (tree, tree, tree *, tree *);
197 static tree dfs_build_secondary_vptr_vtt_inits (tree, void *);
198 static tree dfs_fixup_binfo_vtbls (tree, void *);
199 static int record_subobject_offset (tree, tree, splay_tree);
200 static int check_subobject_offset (tree, tree, splay_tree);
201 static int walk_subobject_offsets (tree, subobject_offset_fn,
202 tree, splay_tree, tree, int);
203 static void record_subobject_offsets (tree, tree, splay_tree, bool);
204 static int layout_conflict_p (tree, tree, splay_tree, int);
205 static int splay_tree_compare_integer_csts (splay_tree_key k1,
207 static void warn_about_ambiguous_bases (tree);
208 static bool type_requires_array_cookie (tree);
209 static bool contains_empty_class_p (tree);
210 static bool base_derived_from (tree, tree);
211 static int empty_base_at_nonzero_offset_p (tree, tree, splay_tree);
212 static tree end_of_base (tree);
213 static tree get_vcall_index (tree, tree);
215 /* Variables shared between class.c and call.c. */
217 #ifdef GATHER_STATISTICS
219 int n_vtable_entries = 0;
220 int n_vtable_searches = 0;
221 int n_vtable_elems = 0;
222 int n_convert_harshness = 0;
223 int n_compute_conversion_costs = 0;
224 int n_inner_fields_searched = 0;
227 /* Convert to or from a base subobject. EXPR is an expression of type
228 `A' or `A*', an expression of type `B' or `B*' is returned. To
229 convert A to a base B, CODE is PLUS_EXPR and BINFO is the binfo for
230 the B base instance within A. To convert base A to derived B, CODE
231 is MINUS_EXPR and BINFO is the binfo for the A instance within B.
232 In this latter case, A must not be a morally virtual base of B.
233 NONNULL is true if EXPR is known to be non-NULL (this is only
234 needed when EXPR is of pointer type). CV qualifiers are preserved
238 build_base_path (enum tree_code code,
243 tree v_binfo = NULL_TREE;
244 tree d_binfo = NULL_TREE;
248 tree null_test = NULL;
249 tree ptr_target_type;
251 int want_pointer = TREE_CODE (TREE_TYPE (expr)) == POINTER_TYPE;
252 bool has_empty = false;
255 if (expr == error_mark_node || binfo == error_mark_node || !binfo)
256 return error_mark_node;
258 for (probe = binfo; probe; probe = BINFO_INHERITANCE_CHAIN (probe))
261 if (is_empty_class (BINFO_TYPE (probe)))
263 if (!v_binfo && BINFO_VIRTUAL_P (probe))
267 probe = TYPE_MAIN_VARIANT (TREE_TYPE (expr));
269 probe = TYPE_MAIN_VARIANT (TREE_TYPE (probe));
271 gcc_assert ((code == MINUS_EXPR
272 && SAME_BINFO_TYPE_P (BINFO_TYPE (binfo), probe))
273 || (code == PLUS_EXPR
274 && SAME_BINFO_TYPE_P (BINFO_TYPE (d_binfo), probe)));
276 if (binfo == d_binfo)
280 if (code == MINUS_EXPR && v_binfo)
282 error ("cannot convert from base %qT to derived type %qT via virtual base %qT",
283 BINFO_TYPE (binfo), BINFO_TYPE (d_binfo), BINFO_TYPE (v_binfo));
284 return error_mark_node;
288 /* This must happen before the call to save_expr. */
289 expr = build_unary_op (ADDR_EXPR, expr, 0);
291 offset = BINFO_OFFSET (binfo);
292 fixed_type_p = resolves_to_fixed_type_p (expr, &nonnull);
293 target_type = code == PLUS_EXPR ? BINFO_TYPE (binfo) : BINFO_TYPE (d_binfo);
295 /* Do we need to look in the vtable for the real offset? */
296 virtual_access = (v_binfo && fixed_type_p <= 0);
298 /* Do we need to check for a null pointer? */
299 if (want_pointer && !nonnull)
301 /* If we know the conversion will not actually change the value
302 of EXPR, then we can avoid testing the expression for NULL.
303 We have to avoid generating a COMPONENT_REF for a base class
304 field, because other parts of the compiler know that such
305 expressions are always non-NULL. */
306 if (!virtual_access && integer_zerop (offset))
307 return build_nop (build_pointer_type (target_type), expr);
308 null_test = error_mark_node;
311 /* Protect against multiple evaluation if necessary. */
312 if (TREE_SIDE_EFFECTS (expr) && (null_test || virtual_access))
313 expr = save_expr (expr);
315 /* Now that we've saved expr, build the real null test. */
318 tree zero = cp_convert (TREE_TYPE (expr), integer_zero_node);
319 null_test = fold_build2 (NE_EXPR, boolean_type_node,
323 /* If this is a simple base reference, express it as a COMPONENT_REF. */
324 if (code == PLUS_EXPR && !virtual_access
325 /* We don't build base fields for empty bases, and they aren't very
326 interesting to the optimizers anyway. */
329 expr = build_indirect_ref (expr, NULL);
330 expr = build_simple_base_path (expr, binfo);
332 expr = build_address (expr);
333 target_type = TREE_TYPE (expr);
339 /* Going via virtual base V_BINFO. We need the static offset
340 from V_BINFO to BINFO, and the dynamic offset from D_BINFO to
341 V_BINFO. That offset is an entry in D_BINFO's vtable. */
344 if (fixed_type_p < 0 && in_base_initializer)
346 /* In a base member initializer, we cannot rely on the
347 vtable being set up. We have to indirect via the
351 t = TREE_TYPE (TYPE_VFIELD (current_class_type));
352 t = build_pointer_type (t);
353 v_offset = convert (t, current_vtt_parm);
354 v_offset = build_indirect_ref (v_offset, NULL);
357 v_offset = build_vfield_ref (build_indirect_ref (expr, NULL),
358 TREE_TYPE (TREE_TYPE (expr)));
360 v_offset = build2 (PLUS_EXPR, TREE_TYPE (v_offset),
361 v_offset, BINFO_VPTR_FIELD (v_binfo));
362 v_offset = build1 (NOP_EXPR,
363 build_pointer_type (ptrdiff_type_node),
365 v_offset = build_indirect_ref (v_offset, NULL);
366 TREE_CONSTANT (v_offset) = 1;
367 TREE_INVARIANT (v_offset) = 1;
369 offset = convert_to_integer (ptrdiff_type_node,
371 BINFO_OFFSET (v_binfo)));
373 if (!integer_zerop (offset))
374 v_offset = build2 (code, ptrdiff_type_node, v_offset, offset);
376 if (fixed_type_p < 0)
377 /* Negative fixed_type_p means this is a constructor or destructor;
378 virtual base layout is fixed in in-charge [cd]tors, but not in
380 offset = build3 (COND_EXPR, ptrdiff_type_node,
381 build2 (EQ_EXPR, boolean_type_node,
382 current_in_charge_parm, integer_zero_node),
384 convert_to_integer (ptrdiff_type_node,
385 BINFO_OFFSET (binfo)));
390 target_type = cp_build_qualified_type
391 (target_type, cp_type_quals (TREE_TYPE (TREE_TYPE (expr))));
392 ptr_target_type = build_pointer_type (target_type);
394 target_type = ptr_target_type;
396 expr = build1 (NOP_EXPR, ptr_target_type, expr);
398 if (!integer_zerop (offset))
399 expr = build2 (code, ptr_target_type, expr, offset);
404 expr = build_indirect_ref (expr, NULL);
408 expr = fold_build3 (COND_EXPR, target_type, null_test, expr,
409 fold_build1 (NOP_EXPR, target_type,
415 /* Subroutine of build_base_path; EXPR and BINFO are as in that function.
416 Perform a derived-to-base conversion by recursively building up a
417 sequence of COMPONENT_REFs to the appropriate base fields. */
420 build_simple_base_path (tree expr, tree binfo)
422 tree type = BINFO_TYPE (binfo);
423 tree d_binfo = BINFO_INHERITANCE_CHAIN (binfo);
426 if (d_binfo == NULL_TREE)
430 gcc_assert (TYPE_MAIN_VARIANT (TREE_TYPE (expr)) == type);
432 /* Transform `(a, b).x' into `(*(a, &b)).x', `(a ? b : c).x'
433 into `(*(a ? &b : &c)).x', and so on. A COND_EXPR is only
434 an lvalue in the frontend; only _DECLs and _REFs are lvalues
436 temp = unary_complex_lvalue (ADDR_EXPR, expr);
438 expr = build_indirect_ref (temp, NULL);
444 expr = build_simple_base_path (expr, d_binfo);
446 for (field = TYPE_FIELDS (BINFO_TYPE (d_binfo));
447 field; field = TREE_CHAIN (field))
448 /* Is this the base field created by build_base_field? */
449 if (TREE_CODE (field) == FIELD_DECL
450 && DECL_FIELD_IS_BASE (field)
451 && TREE_TYPE (field) == type)
453 /* We don't use build_class_member_access_expr here, as that
454 has unnecessary checks, and more importantly results in
455 recursive calls to dfs_walk_once. */
456 int type_quals = cp_type_quals (TREE_TYPE (expr));
458 expr = build3 (COMPONENT_REF,
459 cp_build_qualified_type (type, type_quals),
460 expr, field, NULL_TREE);
461 expr = fold_if_not_in_template (expr);
463 /* Mark the expression const or volatile, as appropriate.
464 Even though we've dealt with the type above, we still have
465 to mark the expression itself. */
466 if (type_quals & TYPE_QUAL_CONST)
467 TREE_READONLY (expr) = 1;
468 if (type_quals & TYPE_QUAL_VOLATILE)
469 TREE_THIS_VOLATILE (expr) = 1;
474 /* Didn't find the base field?!? */
478 /* Convert OBJECT to the base TYPE. OBJECT is an expression whose
479 type is a class type or a pointer to a class type. In the former
480 case, TYPE is also a class type; in the latter it is another
481 pointer type. If CHECK_ACCESS is true, an error message is emitted
482 if TYPE is inaccessible. If OBJECT has pointer type, the value is
483 assumed to be non-NULL. */
486 convert_to_base (tree object, tree type, bool check_access, bool nonnull)
491 if (TYPE_PTR_P (TREE_TYPE (object)))
493 object_type = TREE_TYPE (TREE_TYPE (object));
494 type = TREE_TYPE (type);
497 object_type = TREE_TYPE (object);
499 binfo = lookup_base (object_type, type,
500 check_access ? ba_check : ba_unique,
502 if (!binfo || binfo == error_mark_node)
503 return error_mark_node;
505 return build_base_path (PLUS_EXPR, object, binfo, nonnull);
508 /* EXPR is an expression with unqualified class type. BASE is a base
509 binfo of that class type. Returns EXPR, converted to the BASE
510 type. This function assumes that EXPR is the most derived class;
511 therefore virtual bases can be found at their static offsets. */
514 convert_to_base_statically (tree expr, tree base)
518 expr_type = TREE_TYPE (expr);
519 if (!SAME_BINFO_TYPE_P (BINFO_TYPE (base), expr_type))
523 pointer_type = build_pointer_type (expr_type);
524 expr = build_unary_op (ADDR_EXPR, expr, /*noconvert=*/1);
525 if (!integer_zerop (BINFO_OFFSET (base)))
526 expr = build2 (PLUS_EXPR, pointer_type, expr,
527 build_nop (pointer_type, BINFO_OFFSET (base)));
528 expr = build_nop (build_pointer_type (BINFO_TYPE (base)), expr);
529 expr = build1 (INDIRECT_REF, BINFO_TYPE (base), expr);
537 build_vfield_ref (tree datum, tree type)
539 tree vfield, vcontext;
541 if (datum == error_mark_node)
542 return error_mark_node;
544 /* First, convert to the requested type. */
545 if (!same_type_ignoring_top_level_qualifiers_p (TREE_TYPE (datum), type))
546 datum = convert_to_base (datum, type, /*check_access=*/false,
549 /* Second, the requested type may not be the owner of its own vptr.
550 If not, convert to the base class that owns it. We cannot use
551 convert_to_base here, because VCONTEXT may appear more than once
552 in the inheritance hierarchy of TYPE, and thus direct conversion
553 between the types may be ambiguous. Following the path back up
554 one step at a time via primary bases avoids the problem. */
555 vfield = TYPE_VFIELD (type);
556 vcontext = DECL_CONTEXT (vfield);
557 while (!same_type_ignoring_top_level_qualifiers_p (vcontext, type))
559 datum = build_simple_base_path (datum, CLASSTYPE_PRIMARY_BINFO (type));
560 type = TREE_TYPE (datum);
563 return build3 (COMPONENT_REF, TREE_TYPE (vfield), datum, vfield, NULL_TREE);
566 /* Given an object INSTANCE, return an expression which yields the
567 vtable element corresponding to INDEX. There are many special
568 cases for INSTANCE which we take care of here, mainly to avoid
569 creating extra tree nodes when we don't have to. */
572 build_vtbl_ref_1 (tree instance, tree idx)
575 tree vtbl = NULL_TREE;
577 /* Try to figure out what a reference refers to, and
578 access its virtual function table directly. */
581 tree fixed_type = fixed_type_or_null (instance, NULL, &cdtorp);
583 tree basetype = non_reference (TREE_TYPE (instance));
585 if (fixed_type && !cdtorp)
587 tree binfo = lookup_base (fixed_type, basetype,
588 ba_unique | ba_quiet, NULL);
590 vtbl = unshare_expr (BINFO_VTABLE (binfo));
594 vtbl = build_vfield_ref (instance, basetype);
596 assemble_external (vtbl);
598 aref = build_array_ref (vtbl, idx);
599 TREE_CONSTANT (aref) |= TREE_CONSTANT (vtbl) && TREE_CONSTANT (idx);
600 TREE_INVARIANT (aref) = TREE_CONSTANT (aref);
606 build_vtbl_ref (tree instance, tree idx)
608 tree aref = build_vtbl_ref_1 (instance, idx);
613 /* Given a stable object pointer INSTANCE_PTR, return an expression which
614 yields a function pointer corresponding to vtable element INDEX. */
617 build_vfn_ref (tree instance_ptr, tree idx)
621 aref = build_vtbl_ref_1 (build_indirect_ref (instance_ptr, 0), idx);
623 /* When using function descriptors, the address of the
624 vtable entry is treated as a function pointer. */
625 if (TARGET_VTABLE_USES_DESCRIPTORS)
626 aref = build1 (NOP_EXPR, TREE_TYPE (aref),
627 build_unary_op (ADDR_EXPR, aref, /*noconvert=*/1));
629 /* Remember this as a method reference, for later devirtualization. */
630 aref = build3 (OBJ_TYPE_REF, TREE_TYPE (aref), aref, instance_ptr, idx);
635 /* Return the name of the virtual function table (as an IDENTIFIER_NODE)
636 for the given TYPE. */
639 get_vtable_name (tree type)
641 return mangle_vtbl_for_type (type);
644 /* DECL is an entity associated with TYPE, like a virtual table or an
645 implicitly generated constructor. Determine whether or not DECL
646 should have external or internal linkage at the object file
647 level. This routine does not deal with COMDAT linkage and other
648 similar complexities; it simply sets TREE_PUBLIC if it possible for
649 entities in other translation units to contain copies of DECL, in
653 set_linkage_according_to_type (tree type, tree decl)
655 /* If TYPE involves a local class in a function with internal
656 linkage, then DECL should have internal linkage too. Other local
657 classes have no linkage -- but if their containing functions
658 have external linkage, it makes sense for DECL to have external
659 linkage too. That will allow template definitions to be merged,
661 if (no_linkage_check (type, /*relaxed_p=*/true))
663 TREE_PUBLIC (decl) = 0;
664 DECL_INTERFACE_KNOWN (decl) = 1;
667 TREE_PUBLIC (decl) = 1;
670 /* Create a VAR_DECL for a primary or secondary vtable for CLASS_TYPE.
671 (For a secondary vtable for B-in-D, CLASS_TYPE should be D, not B.)
672 Use NAME for the name of the vtable, and VTABLE_TYPE for its type. */
675 build_vtable (tree class_type, tree name, tree vtable_type)
679 decl = build_lang_decl (VAR_DECL, name, vtable_type);
680 /* vtable names are already mangled; give them their DECL_ASSEMBLER_NAME
681 now to avoid confusion in mangle_decl. */
682 SET_DECL_ASSEMBLER_NAME (decl, name);
683 DECL_CONTEXT (decl) = class_type;
684 DECL_ARTIFICIAL (decl) = 1;
685 TREE_STATIC (decl) = 1;
686 TREE_READONLY (decl) = 1;
687 DECL_VIRTUAL_P (decl) = 1;
688 DECL_ALIGN (decl) = TARGET_VTABLE_ENTRY_ALIGN;
689 DECL_VTABLE_OR_VTT_P (decl) = 1;
690 /* At one time the vtable info was grabbed 2 words at a time. This
691 fails on sparc unless you have 8-byte alignment. (tiemann) */
692 DECL_ALIGN (decl) = MAX (TYPE_ALIGN (double_type_node),
694 set_linkage_according_to_type (class_type, decl);
695 /* The vtable has not been defined -- yet. */
696 DECL_EXTERNAL (decl) = 1;
697 DECL_NOT_REALLY_EXTERN (decl) = 1;
699 /* Mark the VAR_DECL node representing the vtable itself as a
700 "gratuitous" one, thereby forcing dwarfout.c to ignore it. It
701 is rather important that such things be ignored because any
702 effort to actually generate DWARF for them will run into
703 trouble when/if we encounter code like:
706 struct S { virtual void member (); };
708 because the artificial declaration of the vtable itself (as
709 manufactured by the g++ front end) will say that the vtable is
710 a static member of `S' but only *after* the debug output for
711 the definition of `S' has already been output. This causes
712 grief because the DWARF entry for the definition of the vtable
713 will try to refer back to an earlier *declaration* of the
714 vtable as a static member of `S' and there won't be one. We
715 might be able to arrange to have the "vtable static member"
716 attached to the member list for `S' before the debug info for
717 `S' get written (which would solve the problem) but that would
718 require more intrusive changes to the g++ front end. */
719 DECL_IGNORED_P (decl) = 1;
724 /* Get the VAR_DECL of the vtable for TYPE. TYPE need not be polymorphic,
725 or even complete. If this does not exist, create it. If COMPLETE is
726 nonzero, then complete the definition of it -- that will render it
727 impossible to actually build the vtable, but is useful to get at those
728 which are known to exist in the runtime. */
731 get_vtable_decl (tree type, int complete)
735 if (CLASSTYPE_VTABLES (type))
736 return CLASSTYPE_VTABLES (type);
738 decl = build_vtable (type, get_vtable_name (type), vtbl_type_node);
739 CLASSTYPE_VTABLES (type) = decl;
743 DECL_EXTERNAL (decl) = 1;
744 finish_decl (decl, NULL_TREE, NULL_TREE);
750 /* Build the primary virtual function table for TYPE. If BINFO is
751 non-NULL, build the vtable starting with the initial approximation
752 that it is the same as the one which is the head of the association
753 list. Returns a nonzero value if a new vtable is actually
757 build_primary_vtable (tree binfo, tree type)
762 decl = get_vtable_decl (type, /*complete=*/0);
766 if (BINFO_NEW_VTABLE_MARKED (binfo))
767 /* We have already created a vtable for this base, so there's
768 no need to do it again. */
771 virtuals = copy_list (BINFO_VIRTUALS (binfo));
772 TREE_TYPE (decl) = TREE_TYPE (get_vtbl_decl_for_binfo (binfo));
773 DECL_SIZE (decl) = TYPE_SIZE (TREE_TYPE (decl));
774 DECL_SIZE_UNIT (decl) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
778 gcc_assert (TREE_TYPE (decl) == vtbl_type_node);
779 virtuals = NULL_TREE;
782 #ifdef GATHER_STATISTICS
784 n_vtable_elems += list_length (virtuals);
787 /* Initialize the association list for this type, based
788 on our first approximation. */
789 BINFO_VTABLE (TYPE_BINFO (type)) = decl;
790 BINFO_VIRTUALS (TYPE_BINFO (type)) = virtuals;
791 SET_BINFO_NEW_VTABLE_MARKED (TYPE_BINFO (type));
795 /* Give BINFO a new virtual function table which is initialized
796 with a skeleton-copy of its original initialization. The only
797 entry that changes is the `delta' entry, so we can really
798 share a lot of structure.
800 FOR_TYPE is the most derived type which caused this table to
803 Returns nonzero if we haven't met BINFO before.
805 The order in which vtables are built (by calling this function) for
806 an object must remain the same, otherwise a binary incompatibility
810 build_secondary_vtable (tree binfo)
812 if (BINFO_NEW_VTABLE_MARKED (binfo))
813 /* We already created a vtable for this base. There's no need to
817 /* Remember that we've created a vtable for this BINFO, so that we
818 don't try to do so again. */
819 SET_BINFO_NEW_VTABLE_MARKED (binfo);
821 /* Make fresh virtual list, so we can smash it later. */
822 BINFO_VIRTUALS (binfo) = copy_list (BINFO_VIRTUALS (binfo));
824 /* Secondary vtables are laid out as part of the same structure as
825 the primary vtable. */
826 BINFO_VTABLE (binfo) = NULL_TREE;
830 /* Create a new vtable for BINFO which is the hierarchy dominated by
831 T. Return nonzero if we actually created a new vtable. */
834 make_new_vtable (tree t, tree binfo)
836 if (binfo == TYPE_BINFO (t))
837 /* In this case, it is *type*'s vtable we are modifying. We start
838 with the approximation that its vtable is that of the
839 immediate base class. */
840 return build_primary_vtable (binfo, t);
842 /* This is our very own copy of `basetype' to play with. Later,
843 we will fill in all the virtual functions that override the
844 virtual functions in these base classes which are not defined
845 by the current type. */
846 return build_secondary_vtable (binfo);
849 /* Make *VIRTUALS, an entry on the BINFO_VIRTUALS list for BINFO
850 (which is in the hierarchy dominated by T) list FNDECL as its
851 BV_FN. DELTA is the required constant adjustment from the `this'
852 pointer where the vtable entry appears to the `this' required when
853 the function is actually called. */
856 modify_vtable_entry (tree t,
866 if (fndecl != BV_FN (v)
867 || !tree_int_cst_equal (delta, BV_DELTA (v)))
869 /* We need a new vtable for BINFO. */
870 if (make_new_vtable (t, binfo))
872 /* If we really did make a new vtable, we also made a copy
873 of the BINFO_VIRTUALS list. Now, we have to find the
874 corresponding entry in that list. */
875 *virtuals = BINFO_VIRTUALS (binfo);
876 while (BV_FN (*virtuals) != BV_FN (v))
877 *virtuals = TREE_CHAIN (*virtuals);
881 BV_DELTA (v) = delta;
882 BV_VCALL_INDEX (v) = NULL_TREE;
888 /* Add method METHOD to class TYPE. If USING_DECL is non-null, it is
889 the USING_DECL naming METHOD. Returns true if the method could be
890 added to the method vec. */
893 add_method (tree type, tree method, tree using_decl)
897 bool template_conv_p = false;
899 VEC(tree,gc) *method_vec;
901 bool insert_p = false;
904 if (method == error_mark_node)
907 complete_p = COMPLETE_TYPE_P (type);
908 conv_p = DECL_CONV_FN_P (method);
910 template_conv_p = (TREE_CODE (method) == TEMPLATE_DECL
911 && DECL_TEMPLATE_CONV_FN_P (method));
913 method_vec = CLASSTYPE_METHOD_VEC (type);
916 /* Make a new method vector. We start with 8 entries. We must
917 allocate at least two (for constructors and destructors), and
918 we're going to end up with an assignment operator at some
920 method_vec = VEC_alloc (tree, gc, 8);
921 /* Create slots for constructors and destructors. */
922 VEC_quick_push (tree, method_vec, NULL_TREE);
923 VEC_quick_push (tree, method_vec, NULL_TREE);
924 CLASSTYPE_METHOD_VEC (type) = method_vec;
927 /* Maintain TYPE_HAS_CONSTRUCTOR, etc. */
928 grok_special_member_properties (method);
930 /* Constructors and destructors go in special slots. */
931 if (DECL_MAYBE_IN_CHARGE_CONSTRUCTOR_P (method))
932 slot = CLASSTYPE_CONSTRUCTOR_SLOT;
933 else if (DECL_MAYBE_IN_CHARGE_DESTRUCTOR_P (method))
935 slot = CLASSTYPE_DESTRUCTOR_SLOT;
937 if (TYPE_FOR_JAVA (type))
939 if (!DECL_ARTIFICIAL (method))
940 error ("Java class %qT cannot have a destructor", type);
941 else if (TYPE_HAS_NONTRIVIAL_DESTRUCTOR (type))
942 error ("Java class %qT cannot have an implicit non-trivial "
952 /* See if we already have an entry with this name. */
953 for (slot = CLASSTYPE_FIRST_CONVERSION_SLOT;
954 VEC_iterate (tree, method_vec, slot, m);
960 if (TREE_CODE (m) == TEMPLATE_DECL
961 && DECL_TEMPLATE_CONV_FN_P (m))
965 if (conv_p && !DECL_CONV_FN_P (m))
967 if (DECL_NAME (m) == DECL_NAME (method))
973 && !DECL_CONV_FN_P (m)
974 && DECL_NAME (m) > DECL_NAME (method))
978 current_fns = insert_p ? NULL_TREE : VEC_index (tree, method_vec, slot);
980 if (processing_template_decl)
981 /* TYPE is a template class. Don't issue any errors now; wait
982 until instantiation time to complain. */
988 /* Check to see if we've already got this method. */
989 for (fns = current_fns; fns; fns = OVL_NEXT (fns))
991 tree fn = OVL_CURRENT (fns);
997 if (TREE_CODE (fn) != TREE_CODE (method))
1000 /* [over.load] Member function declarations with the
1001 same name and the same parameter types cannot be
1002 overloaded if any of them is a static member
1003 function declaration.
1005 [namespace.udecl] When a using-declaration brings names
1006 from a base class into a derived class scope, member
1007 functions in the derived class override and/or hide member
1008 functions with the same name and parameter types in a base
1009 class (rather than conflicting). */
1010 fn_type = TREE_TYPE (fn);
1011 method_type = TREE_TYPE (method);
1012 parms1 = TYPE_ARG_TYPES (fn_type);
1013 parms2 = TYPE_ARG_TYPES (method_type);
1015 /* Compare the quals on the 'this' parm. Don't compare
1016 the whole types, as used functions are treated as
1017 coming from the using class in overload resolution. */
1018 if (! DECL_STATIC_FUNCTION_P (fn)
1019 && ! DECL_STATIC_FUNCTION_P (method)
1020 && (TYPE_QUALS (TREE_TYPE (TREE_VALUE (parms1)))
1021 != TYPE_QUALS (TREE_TYPE (TREE_VALUE (parms2)))))
1024 /* For templates, the return type and template parameters
1025 must be identical. */
1026 if (TREE_CODE (fn) == TEMPLATE_DECL
1027 && (!same_type_p (TREE_TYPE (fn_type),
1028 TREE_TYPE (method_type))
1029 || !comp_template_parms (DECL_TEMPLATE_PARMS (fn),
1030 DECL_TEMPLATE_PARMS (method))))
1033 if (! DECL_STATIC_FUNCTION_P (fn))
1034 parms1 = TREE_CHAIN (parms1);
1035 if (! DECL_STATIC_FUNCTION_P (method))
1036 parms2 = TREE_CHAIN (parms2);
1038 if (compparms (parms1, parms2)
1039 && (!DECL_CONV_FN_P (fn)
1040 || same_type_p (TREE_TYPE (fn_type),
1041 TREE_TYPE (method_type))))
1045 if (DECL_CONTEXT (fn) == type)
1046 /* Defer to the local function. */
1048 if (DECL_CONTEXT (fn) == DECL_CONTEXT (method))
1049 error ("repeated using declaration %q+D", using_decl);
1051 error ("using declaration %q+D conflicts with a previous using declaration",
1056 error ("%q+#D cannot be overloaded", method);
1057 error ("with %q+#D", fn);
1060 /* We don't call duplicate_decls here to merge the
1061 declarations because that will confuse things if the
1062 methods have inline definitions. In particular, we
1063 will crash while processing the definitions. */
1069 /* A class should never have more than one destructor. */
1070 if (current_fns && DECL_MAYBE_IN_CHARGE_DESTRUCTOR_P (method))
1073 /* Add the new binding. */
1074 overload = build_overload (method, current_fns);
1077 TYPE_HAS_CONVERSION (type) = 1;
1078 else if (slot >= CLASSTYPE_FIRST_CONVERSION_SLOT && !complete_p)
1079 push_class_level_binding (DECL_NAME (method), overload);
1083 /* We only expect to add few methods in the COMPLETE_P case, so
1084 just make room for one more method in that case. */
1085 if (VEC_reserve (tree, gc, method_vec, complete_p ? -1 : 1))
1086 CLASSTYPE_METHOD_VEC (type) = method_vec;
1087 if (slot == VEC_length (tree, method_vec))
1088 VEC_quick_push (tree, method_vec, overload);
1090 VEC_quick_insert (tree, method_vec, slot, overload);
1093 /* Replace the current slot. */
1094 VEC_replace (tree, method_vec, slot, overload);
1098 /* Subroutines of finish_struct. */
1100 /* Change the access of FDECL to ACCESS in T. Return 1 if change was
1101 legit, otherwise return 0. */
1104 alter_access (tree t, tree fdecl, tree access)
1108 if (!DECL_LANG_SPECIFIC (fdecl))
1109 retrofit_lang_decl (fdecl);
1111 gcc_assert (!DECL_DISCRIMINATOR_P (fdecl));
1113 elem = purpose_member (t, DECL_ACCESS (fdecl));
1116 if (TREE_VALUE (elem) != access)
1118 if (TREE_CODE (TREE_TYPE (fdecl)) == FUNCTION_DECL)
1119 error ("conflicting access specifications for method"
1120 " %q+D, ignored", TREE_TYPE (fdecl));
1122 error ("conflicting access specifications for field %qE, ignored",
1127 /* They're changing the access to the same thing they changed
1128 it to before. That's OK. */
1134 perform_or_defer_access_check (TYPE_BINFO (t), fdecl);
1135 DECL_ACCESS (fdecl) = tree_cons (t, access, DECL_ACCESS (fdecl));
1141 /* Process the USING_DECL, which is a member of T. */
1144 handle_using_decl (tree using_decl, tree t)
1146 tree decl = USING_DECL_DECLS (using_decl);
1147 tree name = DECL_NAME (using_decl);
1149 = TREE_PRIVATE (using_decl) ? access_private_node
1150 : TREE_PROTECTED (using_decl) ? access_protected_node
1151 : access_public_node;
1152 tree flist = NULL_TREE;
1155 gcc_assert (!processing_template_decl && decl);
1157 old_value = lookup_member (t, name, /*protect=*/0, /*want_type=*/false);
1160 if (is_overloaded_fn (old_value))
1161 old_value = OVL_CURRENT (old_value);
1163 if (DECL_P (old_value) && DECL_CONTEXT (old_value) == t)
1166 old_value = NULL_TREE;
1169 cp_emit_debug_info_for_using (decl, USING_DECL_SCOPE (using_decl));
1171 if (is_overloaded_fn (decl))
1176 else if (is_overloaded_fn (old_value))
1179 /* It's OK to use functions from a base when there are functions with
1180 the same name already present in the current class. */;
1183 error ("%q+D invalid in %q#T", using_decl, t);
1184 error (" because of local method %q+#D with same name",
1185 OVL_CURRENT (old_value));
1189 else if (!DECL_ARTIFICIAL (old_value))
1191 error ("%q+D invalid in %q#T", using_decl, t);
1192 error (" because of local member %q+#D with same name", old_value);
1196 /* Make type T see field decl FDECL with access ACCESS. */
1198 for (; flist; flist = OVL_NEXT (flist))
1200 add_method (t, OVL_CURRENT (flist), using_decl);
1201 alter_access (t, OVL_CURRENT (flist), access);
1204 alter_access (t, decl, access);
1207 /* Run through the base classes of T, updating CANT_HAVE_CONST_CTOR_P,
1208 and NO_CONST_ASN_REF_P. Also set flag bits in T based on
1209 properties of the bases. */
1212 check_bases (tree t,
1213 int* cant_have_const_ctor_p,
1214 int* no_const_asn_ref_p)
1217 int seen_non_virtual_nearly_empty_base_p;
1221 seen_non_virtual_nearly_empty_base_p = 0;
1223 for (binfo = TYPE_BINFO (t), i = 0;
1224 BINFO_BASE_ITERATE (binfo, i, base_binfo); i++)
1226 tree basetype = TREE_TYPE (base_binfo);
1228 gcc_assert (COMPLETE_TYPE_P (basetype));
1230 /* Effective C++ rule 14. We only need to check TYPE_POLYMORPHIC_P
1231 here because the case of virtual functions but non-virtual
1232 dtor is handled in finish_struct_1. */
1233 if (!TYPE_POLYMORPHIC_P (basetype))
1234 warning (OPT_Weffc__,
1235 "base class %q#T has a non-virtual destructor", basetype);
1237 /* If the base class doesn't have copy constructors or
1238 assignment operators that take const references, then the
1239 derived class cannot have such a member automatically
1241 if (! TYPE_HAS_CONST_INIT_REF (basetype))
1242 *cant_have_const_ctor_p = 1;
1243 if (TYPE_HAS_ASSIGN_REF (basetype)
1244 && !TYPE_HAS_CONST_ASSIGN_REF (basetype))
1245 *no_const_asn_ref_p = 1;
1247 if (BINFO_VIRTUAL_P (base_binfo))
1248 /* A virtual base does not effect nearly emptiness. */
1250 else if (CLASSTYPE_NEARLY_EMPTY_P (basetype))
1252 if (seen_non_virtual_nearly_empty_base_p)
1253 /* And if there is more than one nearly empty base, then the
1254 derived class is not nearly empty either. */
1255 CLASSTYPE_NEARLY_EMPTY_P (t) = 0;
1257 /* Remember we've seen one. */
1258 seen_non_virtual_nearly_empty_base_p = 1;
1260 else if (!is_empty_class (basetype))
1261 /* If the base class is not empty or nearly empty, then this
1262 class cannot be nearly empty. */
1263 CLASSTYPE_NEARLY_EMPTY_P (t) = 0;
1265 /* A lot of properties from the bases also apply to the derived
1267 TYPE_NEEDS_CONSTRUCTING (t) |= TYPE_NEEDS_CONSTRUCTING (basetype);
1268 TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t)
1269 |= TYPE_HAS_NONTRIVIAL_DESTRUCTOR (basetype);
1270 TYPE_HAS_COMPLEX_ASSIGN_REF (t)
1271 |= TYPE_HAS_COMPLEX_ASSIGN_REF (basetype);
1272 TYPE_HAS_COMPLEX_INIT_REF (t) |= TYPE_HAS_COMPLEX_INIT_REF (basetype);
1273 TYPE_POLYMORPHIC_P (t) |= TYPE_POLYMORPHIC_P (basetype);
1274 CLASSTYPE_CONTAINS_EMPTY_CLASS_P (t)
1275 |= CLASSTYPE_CONTAINS_EMPTY_CLASS_P (basetype);
1279 /* Determine all the primary bases within T. Sets BINFO_PRIMARY_BASE_P for
1280 those that are primaries. Sets BINFO_LOST_PRIMARY_P for those
1281 that have had a nearly-empty virtual primary base stolen by some
1282 other base in the hierarchy. Determines CLASSTYPE_PRIMARY_BASE for
1286 determine_primary_bases (tree t)
1289 tree primary = NULL_TREE;
1290 tree type_binfo = TYPE_BINFO (t);
1293 /* Determine the primary bases of our bases. */
1294 for (base_binfo = TREE_CHAIN (type_binfo); base_binfo;
1295 base_binfo = TREE_CHAIN (base_binfo))
1297 tree primary = CLASSTYPE_PRIMARY_BINFO (BINFO_TYPE (base_binfo));
1299 /* See if we're the non-virtual primary of our inheritance
1301 if (!BINFO_VIRTUAL_P (base_binfo))
1303 tree parent = BINFO_INHERITANCE_CHAIN (base_binfo);
1304 tree parent_primary = CLASSTYPE_PRIMARY_BINFO (BINFO_TYPE (parent));
1307 && SAME_BINFO_TYPE_P (BINFO_TYPE (base_binfo),
1308 BINFO_TYPE (parent_primary)))
1309 /* We are the primary binfo. */
1310 BINFO_PRIMARY_P (base_binfo) = 1;
1312 /* Determine if we have a virtual primary base, and mark it so.
1314 if (primary && BINFO_VIRTUAL_P (primary))
1316 tree this_primary = copied_binfo (primary, base_binfo);
1318 if (BINFO_PRIMARY_P (this_primary))
1319 /* Someone already claimed this base. */
1320 BINFO_LOST_PRIMARY_P (base_binfo) = 1;
1325 BINFO_PRIMARY_P (this_primary) = 1;
1326 BINFO_INHERITANCE_CHAIN (this_primary) = base_binfo;
1328 /* A virtual binfo might have been copied from within
1329 another hierarchy. As we're about to use it as a
1330 primary base, make sure the offsets match. */
1331 delta = size_diffop (convert (ssizetype,
1332 BINFO_OFFSET (base_binfo)),
1334 BINFO_OFFSET (this_primary)));
1336 propagate_binfo_offsets (this_primary, delta);
1341 /* First look for a dynamic direct non-virtual base. */
1342 for (i = 0; BINFO_BASE_ITERATE (type_binfo, i, base_binfo); i++)
1344 tree basetype = BINFO_TYPE (base_binfo);
1346 if (TYPE_CONTAINS_VPTR_P (basetype) && !BINFO_VIRTUAL_P (base_binfo))
1348 primary = base_binfo;
1353 /* A "nearly-empty" virtual base class can be the primary base
1354 class, if no non-virtual polymorphic base can be found. Look for
1355 a nearly-empty virtual dynamic base that is not already a primary
1356 base of something in the hierarchy. If there is no such base,
1357 just pick the first nearly-empty virtual base. */
1359 for (base_binfo = TREE_CHAIN (type_binfo); base_binfo;
1360 base_binfo = TREE_CHAIN (base_binfo))
1361 if (BINFO_VIRTUAL_P (base_binfo)
1362 && CLASSTYPE_NEARLY_EMPTY_P (BINFO_TYPE (base_binfo)))
1364 if (!BINFO_PRIMARY_P (base_binfo))
1366 /* Found one that is not primary. */
1367 primary = base_binfo;
1371 /* Remember the first candidate. */
1372 primary = base_binfo;
1376 /* If we've got a primary base, use it. */
1379 tree basetype = BINFO_TYPE (primary);
1381 CLASSTYPE_PRIMARY_BINFO (t) = primary;
1382 if (BINFO_PRIMARY_P (primary))
1383 /* We are stealing a primary base. */
1384 BINFO_LOST_PRIMARY_P (BINFO_INHERITANCE_CHAIN (primary)) = 1;
1385 BINFO_PRIMARY_P (primary) = 1;
1386 if (BINFO_VIRTUAL_P (primary))
1390 BINFO_INHERITANCE_CHAIN (primary) = type_binfo;
1391 /* A virtual binfo might have been copied from within
1392 another hierarchy. As we're about to use it as a primary
1393 base, make sure the offsets match. */
1394 delta = size_diffop (ssize_int (0),
1395 convert (ssizetype, BINFO_OFFSET (primary)));
1397 propagate_binfo_offsets (primary, delta);
1400 primary = TYPE_BINFO (basetype);
1402 TYPE_VFIELD (t) = TYPE_VFIELD (basetype);
1403 BINFO_VTABLE (type_binfo) = BINFO_VTABLE (primary);
1404 BINFO_VIRTUALS (type_binfo) = BINFO_VIRTUALS (primary);
1408 /* Set memoizing fields and bits of T (and its variants) for later
1412 finish_struct_bits (tree t)
1416 /* Fix up variants (if any). */
1417 for (variants = TYPE_NEXT_VARIANT (t);
1419 variants = TYPE_NEXT_VARIANT (variants))
1421 /* These fields are in the _TYPE part of the node, not in
1422 the TYPE_LANG_SPECIFIC component, so they are not shared. */
1423 TYPE_HAS_CONSTRUCTOR (variants) = TYPE_HAS_CONSTRUCTOR (t);
1424 TYPE_NEEDS_CONSTRUCTING (variants) = TYPE_NEEDS_CONSTRUCTING (t);
1425 TYPE_HAS_NONTRIVIAL_DESTRUCTOR (variants)
1426 = TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t);
1428 TYPE_POLYMORPHIC_P (variants) = TYPE_POLYMORPHIC_P (t);
1430 TYPE_BINFO (variants) = TYPE_BINFO (t);
1432 /* Copy whatever these are holding today. */
1433 TYPE_VFIELD (variants) = TYPE_VFIELD (t);
1434 TYPE_METHODS (variants) = TYPE_METHODS (t);
1435 TYPE_FIELDS (variants) = TYPE_FIELDS (t);
1438 if (BINFO_N_BASE_BINFOS (TYPE_BINFO (t)) && TYPE_POLYMORPHIC_P (t))
1439 /* For a class w/o baseclasses, 'finish_struct' has set
1440 CLASSTYPE_PURE_VIRTUALS correctly (by definition).
1441 Similarly for a class whose base classes do not have vtables.
1442 When neither of these is true, we might have removed abstract
1443 virtuals (by providing a definition), added some (by declaring
1444 new ones), or redeclared ones from a base class. We need to
1445 recalculate what's really an abstract virtual at this point (by
1446 looking in the vtables). */
1447 get_pure_virtuals (t);
1449 /* If this type has a copy constructor or a destructor, force its
1450 mode to be BLKmode, and force its TREE_ADDRESSABLE bit to be
1451 nonzero. This will cause it to be passed by invisible reference
1452 and prevent it from being returned in a register. */
1453 if (! TYPE_HAS_TRIVIAL_INIT_REF (t) || TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t))
1456 DECL_MODE (TYPE_MAIN_DECL (t)) = BLKmode;
1457 for (variants = t; variants; variants = TYPE_NEXT_VARIANT (variants))
1459 TYPE_MODE (variants) = BLKmode;
1460 TREE_ADDRESSABLE (variants) = 1;
1465 /* Issue warnings about T having private constructors, but no friends,
1468 HAS_NONPRIVATE_METHOD is nonzero if T has any non-private methods or
1469 static members. HAS_NONPRIVATE_STATIC_FN is nonzero if T has any
1470 non-private static member functions. */
1473 maybe_warn_about_overly_private_class (tree t)
1475 int has_member_fn = 0;
1476 int has_nonprivate_method = 0;
1479 if (!warn_ctor_dtor_privacy
1480 /* If the class has friends, those entities might create and
1481 access instances, so we should not warn. */
1482 || (CLASSTYPE_FRIEND_CLASSES (t)
1483 || DECL_FRIENDLIST (TYPE_MAIN_DECL (t)))
1484 /* We will have warned when the template was declared; there's
1485 no need to warn on every instantiation. */
1486 || CLASSTYPE_TEMPLATE_INSTANTIATION (t))
1487 /* There's no reason to even consider warning about this
1491 /* We only issue one warning, if more than one applies, because
1492 otherwise, on code like:
1495 // Oops - forgot `public:'
1501 we warn several times about essentially the same problem. */
1503 /* Check to see if all (non-constructor, non-destructor) member
1504 functions are private. (Since there are no friends or
1505 non-private statics, we can't ever call any of the private member
1507 for (fn = TYPE_METHODS (t); fn; fn = TREE_CHAIN (fn))
1508 /* We're not interested in compiler-generated methods; they don't
1509 provide any way to call private members. */
1510 if (!DECL_ARTIFICIAL (fn))
1512 if (!TREE_PRIVATE (fn))
1514 if (DECL_STATIC_FUNCTION_P (fn))
1515 /* A non-private static member function is just like a
1516 friend; it can create and invoke private member
1517 functions, and be accessed without a class
1521 has_nonprivate_method = 1;
1522 /* Keep searching for a static member function. */
1524 else if (!DECL_CONSTRUCTOR_P (fn) && !DECL_DESTRUCTOR_P (fn))
1528 if (!has_nonprivate_method && has_member_fn)
1530 /* There are no non-private methods, and there's at least one
1531 private member function that isn't a constructor or
1532 destructor. (If all the private members are
1533 constructors/destructors we want to use the code below that
1534 issues error messages specifically referring to
1535 constructors/destructors.) */
1537 tree binfo = TYPE_BINFO (t);
1539 for (i = 0; i != BINFO_N_BASE_BINFOS (binfo); i++)
1540 if (BINFO_BASE_ACCESS (binfo, i) != access_private_node)
1542 has_nonprivate_method = 1;
1545 if (!has_nonprivate_method)
1547 warning (OPT_Wctor_dtor_privacy,
1548 "all member functions in class %qT are private", t);
1553 /* Even if some of the member functions are non-private, the class
1554 won't be useful for much if all the constructors or destructors
1555 are private: such an object can never be created or destroyed. */
1556 fn = CLASSTYPE_DESTRUCTORS (t);
1557 if (fn && TREE_PRIVATE (fn))
1559 warning (OPT_Wctor_dtor_privacy,
1560 "%q#T only defines a private destructor and has no friends",
1565 if (TYPE_HAS_CONSTRUCTOR (t)
1566 /* Implicitly generated constructors are always public. */
1567 && (!CLASSTYPE_LAZY_DEFAULT_CTOR (t)
1568 || !CLASSTYPE_LAZY_COPY_CTOR (t)))
1570 int nonprivate_ctor = 0;
1572 /* If a non-template class does not define a copy
1573 constructor, one is defined for it, enabling it to avoid
1574 this warning. For a template class, this does not
1575 happen, and so we would normally get a warning on:
1577 template <class T> class C { private: C(); };
1579 To avoid this asymmetry, we check TYPE_HAS_INIT_REF. All
1580 complete non-template or fully instantiated classes have this
1582 if (!TYPE_HAS_INIT_REF (t))
1583 nonprivate_ctor = 1;
1585 for (fn = CLASSTYPE_CONSTRUCTORS (t); fn; fn = OVL_NEXT (fn))
1587 tree ctor = OVL_CURRENT (fn);
1588 /* Ideally, we wouldn't count copy constructors (or, in
1589 fact, any constructor that takes an argument of the
1590 class type as a parameter) because such things cannot
1591 be used to construct an instance of the class unless
1592 you already have one. But, for now at least, we're
1594 if (! TREE_PRIVATE (ctor))
1596 nonprivate_ctor = 1;
1601 if (nonprivate_ctor == 0)
1603 warning (OPT_Wctor_dtor_privacy,
1604 "%q#T only defines private constructors and has no friends",
1612 gt_pointer_operator new_value;
1616 /* Comparison function to compare two TYPE_METHOD_VEC entries by name. */
1619 method_name_cmp (const void* m1_p, const void* m2_p)
1621 const tree *const m1 = (const tree *) m1_p;
1622 const tree *const m2 = (const tree *) m2_p;
1624 if (*m1 == NULL_TREE && *m2 == NULL_TREE)
1626 if (*m1 == NULL_TREE)
1628 if (*m2 == NULL_TREE)
1630 if (DECL_NAME (OVL_CURRENT (*m1)) < DECL_NAME (OVL_CURRENT (*m2)))
1635 /* This routine compares two fields like method_name_cmp but using the
1636 pointer operator in resort_field_decl_data. */
1639 resort_method_name_cmp (const void* m1_p, const void* m2_p)
1641 const tree *const m1 = (const tree *) m1_p;
1642 const tree *const m2 = (const tree *) m2_p;
1643 if (*m1 == NULL_TREE && *m2 == NULL_TREE)
1645 if (*m1 == NULL_TREE)
1647 if (*m2 == NULL_TREE)
1650 tree d1 = DECL_NAME (OVL_CURRENT (*m1));
1651 tree d2 = DECL_NAME (OVL_CURRENT (*m2));
1652 resort_data.new_value (&d1, resort_data.cookie);
1653 resort_data.new_value (&d2, resort_data.cookie);
1660 /* Resort TYPE_METHOD_VEC because pointers have been reordered. */
1663 resort_type_method_vec (void* obj,
1664 void* orig_obj ATTRIBUTE_UNUSED ,
1665 gt_pointer_operator new_value,
1668 VEC(tree,gc) *method_vec = (VEC(tree,gc) *) obj;
1669 int len = VEC_length (tree, method_vec);
1673 /* The type conversion ops have to live at the front of the vec, so we
1675 for (slot = CLASSTYPE_FIRST_CONVERSION_SLOT;
1676 VEC_iterate (tree, method_vec, slot, fn);
1678 if (!DECL_CONV_FN_P (OVL_CURRENT (fn)))
1683 resort_data.new_value = new_value;
1684 resort_data.cookie = cookie;
1685 qsort (VEC_address (tree, method_vec) + slot, len - slot, sizeof (tree),
1686 resort_method_name_cmp);
1690 /* Warn about duplicate methods in fn_fields.
1692 Sort methods that are not special (i.e., constructors, destructors,
1693 and type conversion operators) so that we can find them faster in
1697 finish_struct_methods (tree t)
1700 VEC(tree,gc) *method_vec;
1703 method_vec = CLASSTYPE_METHOD_VEC (t);
1707 len = VEC_length (tree, method_vec);
1709 /* Clear DECL_IN_AGGR_P for all functions. */
1710 for (fn_fields = TYPE_METHODS (t); fn_fields;
1711 fn_fields = TREE_CHAIN (fn_fields))
1712 DECL_IN_AGGR_P (fn_fields) = 0;
1714 /* Issue warnings about private constructors and such. If there are
1715 no methods, then some public defaults are generated. */
1716 maybe_warn_about_overly_private_class (t);
1718 /* The type conversion ops have to live at the front of the vec, so we
1720 for (slot = CLASSTYPE_FIRST_CONVERSION_SLOT;
1721 VEC_iterate (tree, method_vec, slot, fn_fields);
1723 if (!DECL_CONV_FN_P (OVL_CURRENT (fn_fields)))
1726 qsort (VEC_address (tree, method_vec) + slot,
1727 len-slot, sizeof (tree), method_name_cmp);
1730 /* Make BINFO's vtable have N entries, including RTTI entries,
1731 vbase and vcall offsets, etc. Set its type and call the backend
1735 layout_vtable_decl (tree binfo, int n)
1740 atype = build_cplus_array_type (vtable_entry_type,
1741 build_index_type (size_int (n - 1)));
1742 layout_type (atype);
1744 /* We may have to grow the vtable. */
1745 vtable = get_vtbl_decl_for_binfo (binfo);
1746 if (!same_type_p (TREE_TYPE (vtable), atype))
1748 TREE_TYPE (vtable) = atype;
1749 DECL_SIZE (vtable) = DECL_SIZE_UNIT (vtable) = NULL_TREE;
1750 layout_decl (vtable, 0);
1754 /* True iff FNDECL and BASE_FNDECL (both non-static member functions)
1755 have the same signature. */
1758 same_signature_p (tree fndecl, tree base_fndecl)
1760 /* One destructor overrides another if they are the same kind of
1762 if (DECL_DESTRUCTOR_P (base_fndecl) && DECL_DESTRUCTOR_P (fndecl)
1763 && special_function_p (base_fndecl) == special_function_p (fndecl))
1765 /* But a non-destructor never overrides a destructor, nor vice
1766 versa, nor do different kinds of destructors override
1767 one-another. For example, a complete object destructor does not
1768 override a deleting destructor. */
1769 if (DECL_DESTRUCTOR_P (base_fndecl) || DECL_DESTRUCTOR_P (fndecl))
1772 if (DECL_NAME (fndecl) == DECL_NAME (base_fndecl)
1773 || (DECL_CONV_FN_P (fndecl)
1774 && DECL_CONV_FN_P (base_fndecl)
1775 && same_type_p (DECL_CONV_FN_TYPE (fndecl),
1776 DECL_CONV_FN_TYPE (base_fndecl))))
1778 tree types, base_types;
1779 types = TYPE_ARG_TYPES (TREE_TYPE (fndecl));
1780 base_types = TYPE_ARG_TYPES (TREE_TYPE (base_fndecl));
1781 if ((TYPE_QUALS (TREE_TYPE (TREE_VALUE (base_types)))
1782 == TYPE_QUALS (TREE_TYPE (TREE_VALUE (types))))
1783 && compparms (TREE_CHAIN (base_types), TREE_CHAIN (types)))
1789 /* Returns TRUE if DERIVED is a binfo containing the binfo BASE as a
1793 base_derived_from (tree derived, tree base)
1797 for (probe = base; probe; probe = BINFO_INHERITANCE_CHAIN (probe))
1799 if (probe == derived)
1801 else if (BINFO_VIRTUAL_P (probe))
1802 /* If we meet a virtual base, we can't follow the inheritance
1803 any more. See if the complete type of DERIVED contains
1804 such a virtual base. */
1805 return (binfo_for_vbase (BINFO_TYPE (probe), BINFO_TYPE (derived))
1811 typedef struct find_final_overrider_data_s {
1812 /* The function for which we are trying to find a final overrider. */
1814 /* The base class in which the function was declared. */
1815 tree declaring_base;
1816 /* The candidate overriders. */
1818 /* Path to most derived. */
1819 VEC(tree,heap) *path;
1820 } find_final_overrider_data;
1822 /* Add the overrider along the current path to FFOD->CANDIDATES.
1823 Returns true if an overrider was found; false otherwise. */
1826 dfs_find_final_overrider_1 (tree binfo,
1827 find_final_overrider_data *ffod,
1832 /* If BINFO is not the most derived type, try a more derived class.
1833 A definition there will overrider a definition here. */
1837 if (dfs_find_final_overrider_1
1838 (VEC_index (tree, ffod->path, depth), ffod, depth))
1842 method = look_for_overrides_here (BINFO_TYPE (binfo), ffod->fn);
1845 tree *candidate = &ffod->candidates;
1847 /* Remove any candidates overridden by this new function. */
1850 /* If *CANDIDATE overrides METHOD, then METHOD
1851 cannot override anything else on the list. */
1852 if (base_derived_from (TREE_VALUE (*candidate), binfo))
1854 /* If METHOD overrides *CANDIDATE, remove *CANDIDATE. */
1855 if (base_derived_from (binfo, TREE_VALUE (*candidate)))
1856 *candidate = TREE_CHAIN (*candidate);
1858 candidate = &TREE_CHAIN (*candidate);
1861 /* Add the new function. */
1862 ffod->candidates = tree_cons (method, binfo, ffod->candidates);
1869 /* Called from find_final_overrider via dfs_walk. */
1872 dfs_find_final_overrider_pre (tree binfo, void *data)
1874 find_final_overrider_data *ffod = (find_final_overrider_data *) data;
1876 if (binfo == ffod->declaring_base)
1877 dfs_find_final_overrider_1 (binfo, ffod, VEC_length (tree, ffod->path));
1878 VEC_safe_push (tree, heap, ffod->path, binfo);
1884 dfs_find_final_overrider_post (tree binfo ATTRIBUTE_UNUSED, void *data)
1886 find_final_overrider_data *ffod = (find_final_overrider_data *) data;
1887 VEC_pop (tree, ffod->path);
1892 /* Returns a TREE_LIST whose TREE_PURPOSE is the final overrider for
1893 FN and whose TREE_VALUE is the binfo for the base where the
1894 overriding occurs. BINFO (in the hierarchy dominated by the binfo
1895 DERIVED) is the base object in which FN is declared. */
1898 find_final_overrider (tree derived, tree binfo, tree fn)
1900 find_final_overrider_data ffod;
1902 /* Getting this right is a little tricky. This is valid:
1904 struct S { virtual void f (); };
1905 struct T { virtual void f (); };
1906 struct U : public S, public T { };
1908 even though calling `f' in `U' is ambiguous. But,
1910 struct R { virtual void f(); };
1911 struct S : virtual public R { virtual void f (); };
1912 struct T : virtual public R { virtual void f (); };
1913 struct U : public S, public T { };
1915 is not -- there's no way to decide whether to put `S::f' or
1916 `T::f' in the vtable for `R'.
1918 The solution is to look at all paths to BINFO. If we find
1919 different overriders along any two, then there is a problem. */
1920 if (DECL_THUNK_P (fn))
1921 fn = THUNK_TARGET (fn);
1923 /* Determine the depth of the hierarchy. */
1925 ffod.declaring_base = binfo;
1926 ffod.candidates = NULL_TREE;
1927 ffod.path = VEC_alloc (tree, heap, 30);
1929 dfs_walk_all (derived, dfs_find_final_overrider_pre,
1930 dfs_find_final_overrider_post, &ffod);
1932 VEC_free (tree, heap, ffod.path);
1934 /* If there was no winner, issue an error message. */
1935 if (!ffod.candidates || TREE_CHAIN (ffod.candidates))
1936 return error_mark_node;
1938 return ffod.candidates;
1941 /* Return the index of the vcall offset for FN when TYPE is used as a
1945 get_vcall_index (tree fn, tree type)
1947 VEC(tree_pair_s,gc) *indices = CLASSTYPE_VCALL_INDICES (type);
1951 for (ix = 0; VEC_iterate (tree_pair_s, indices, ix, p); ix++)
1952 if ((DECL_DESTRUCTOR_P (fn) && DECL_DESTRUCTOR_P (p->purpose))
1953 || same_signature_p (fn, p->purpose))
1956 /* There should always be an appropriate index. */
1960 /* Update an entry in the vtable for BINFO, which is in the hierarchy
1961 dominated by T. FN has been overridden in BINFO; VIRTUALS points to the
1962 corresponding position in the BINFO_VIRTUALS list. */
1965 update_vtable_entry_for_fn (tree t, tree binfo, tree fn, tree* virtuals,
1973 tree overrider_fn, overrider_target;
1974 tree target_fn = DECL_THUNK_P (fn) ? THUNK_TARGET (fn) : fn;
1975 tree over_return, base_return;
1978 /* Find the nearest primary base (possibly binfo itself) which defines
1979 this function; this is the class the caller will convert to when
1980 calling FN through BINFO. */
1981 for (b = binfo; ; b = get_primary_binfo (b))
1984 if (look_for_overrides_here (BINFO_TYPE (b), target_fn))
1987 /* The nearest definition is from a lost primary. */
1988 if (BINFO_LOST_PRIMARY_P (b))
1993 /* Find the final overrider. */
1994 overrider = find_final_overrider (TYPE_BINFO (t), b, target_fn);
1995 if (overrider == error_mark_node)
1997 error ("no unique final overrider for %qD in %qT", target_fn, t);
2000 overrider_target = overrider_fn = TREE_PURPOSE (overrider);
2002 /* Check for adjusting covariant return types. */
2003 over_return = TREE_TYPE (TREE_TYPE (overrider_target));
2004 base_return = TREE_TYPE (TREE_TYPE (target_fn));
2006 if (POINTER_TYPE_P (over_return)
2007 && TREE_CODE (over_return) == TREE_CODE (base_return)
2008 && CLASS_TYPE_P (TREE_TYPE (over_return))
2009 && CLASS_TYPE_P (TREE_TYPE (base_return))
2010 /* If the overrider is invalid, don't even try. */
2011 && !DECL_INVALID_OVERRIDER_P (overrider_target))
2013 /* If FN is a covariant thunk, we must figure out the adjustment
2014 to the final base FN was converting to. As OVERRIDER_TARGET might
2015 also be converting to the return type of FN, we have to
2016 combine the two conversions here. */
2017 tree fixed_offset, virtual_offset;
2019 over_return = TREE_TYPE (over_return);
2020 base_return = TREE_TYPE (base_return);
2022 if (DECL_THUNK_P (fn))
2024 gcc_assert (DECL_RESULT_THUNK_P (fn));
2025 fixed_offset = ssize_int (THUNK_FIXED_OFFSET (fn));
2026 virtual_offset = THUNK_VIRTUAL_OFFSET (fn);
2029 fixed_offset = virtual_offset = NULL_TREE;
2032 /* Find the equivalent binfo within the return type of the
2033 overriding function. We will want the vbase offset from
2035 virtual_offset = binfo_for_vbase (BINFO_TYPE (virtual_offset),
2037 else if (!same_type_ignoring_top_level_qualifiers_p
2038 (over_return, base_return))
2040 /* There was no existing virtual thunk (which takes
2041 precedence). So find the binfo of the base function's
2042 return type within the overriding function's return type.
2043 We cannot call lookup base here, because we're inside a
2044 dfs_walk, and will therefore clobber the BINFO_MARKED
2045 flags. Fortunately we know the covariancy is valid (it
2046 has already been checked), so we can just iterate along
2047 the binfos, which have been chained in inheritance graph
2048 order. Of course it is lame that we have to repeat the
2049 search here anyway -- we should really be caching pieces
2050 of the vtable and avoiding this repeated work. */
2051 tree thunk_binfo, base_binfo;
2053 /* Find the base binfo within the overriding function's
2054 return type. We will always find a thunk_binfo, except
2055 when the covariancy is invalid (which we will have
2056 already diagnosed). */
2057 for (base_binfo = TYPE_BINFO (base_return),
2058 thunk_binfo = TYPE_BINFO (over_return);
2060 thunk_binfo = TREE_CHAIN (thunk_binfo))
2061 if (SAME_BINFO_TYPE_P (BINFO_TYPE (thunk_binfo),
2062 BINFO_TYPE (base_binfo)))
2065 /* See if virtual inheritance is involved. */
2066 for (virtual_offset = thunk_binfo;
2068 virtual_offset = BINFO_INHERITANCE_CHAIN (virtual_offset))
2069 if (BINFO_VIRTUAL_P (virtual_offset))
2073 || (thunk_binfo && !BINFO_OFFSET_ZEROP (thunk_binfo)))
2075 tree offset = convert (ssizetype, BINFO_OFFSET (thunk_binfo));
2079 /* We convert via virtual base. Adjust the fixed
2080 offset to be from there. */
2081 offset = size_diffop
2083 (ssizetype, BINFO_OFFSET (virtual_offset)));
2086 /* There was an existing fixed offset, this must be
2087 from the base just converted to, and the base the
2088 FN was thunking to. */
2089 fixed_offset = size_binop (PLUS_EXPR, fixed_offset, offset);
2091 fixed_offset = offset;
2095 if (fixed_offset || virtual_offset)
2096 /* Replace the overriding function with a covariant thunk. We
2097 will emit the overriding function in its own slot as
2099 overrider_fn = make_thunk (overrider_target, /*this_adjusting=*/0,
2100 fixed_offset, virtual_offset);
2103 gcc_assert (!DECL_THUNK_P (fn));
2105 /* Assume that we will produce a thunk that convert all the way to
2106 the final overrider, and not to an intermediate virtual base. */
2107 virtual_base = NULL_TREE;
2109 /* See if we can convert to an intermediate virtual base first, and then
2110 use the vcall offset located there to finish the conversion. */
2111 for (; b; b = BINFO_INHERITANCE_CHAIN (b))
2113 /* If we find the final overrider, then we can stop
2115 if (SAME_BINFO_TYPE_P (BINFO_TYPE (b),
2116 BINFO_TYPE (TREE_VALUE (overrider))))
2119 /* If we find a virtual base, and we haven't yet found the
2120 overrider, then there is a virtual base between the
2121 declaring base (first_defn) and the final overrider. */
2122 if (BINFO_VIRTUAL_P (b))
2129 if (overrider_fn != overrider_target && !virtual_base)
2131 /* The ABI specifies that a covariant thunk includes a mangling
2132 for a this pointer adjustment. This-adjusting thunks that
2133 override a function from a virtual base have a vcall
2134 adjustment. When the virtual base in question is a primary
2135 virtual base, we know the adjustments are zero, (and in the
2136 non-covariant case, we would not use the thunk).
2137 Unfortunately we didn't notice this could happen, when
2138 designing the ABI and so never mandated that such a covariant
2139 thunk should be emitted. Because we must use the ABI mandated
2140 name, we must continue searching from the binfo where we
2141 found the most recent definition of the function, towards the
2142 primary binfo which first introduced the function into the
2143 vtable. If that enters a virtual base, we must use a vcall
2144 this-adjusting thunk. Bleah! */
2145 tree probe = first_defn;
2147 while ((probe = get_primary_binfo (probe))
2148 && (unsigned) list_length (BINFO_VIRTUALS (probe)) > ix)
2149 if (BINFO_VIRTUAL_P (probe))
2150 virtual_base = probe;
2153 /* Even if we find a virtual base, the correct delta is
2154 between the overrider and the binfo we're building a vtable
2156 goto virtual_covariant;
2159 /* Compute the constant adjustment to the `this' pointer. The
2160 `this' pointer, when this function is called, will point at BINFO
2161 (or one of its primary bases, which are at the same offset). */
2163 /* The `this' pointer needs to be adjusted from the declaration to
2164 the nearest virtual base. */
2165 delta = size_diffop (convert (ssizetype, BINFO_OFFSET (virtual_base)),
2166 convert (ssizetype, BINFO_OFFSET (first_defn)));
2168 /* If the nearest definition is in a lost primary, we don't need an
2169 entry in our vtable. Except possibly in a constructor vtable,
2170 if we happen to get our primary back. In that case, the offset
2171 will be zero, as it will be a primary base. */
2172 delta = size_zero_node;
2174 /* The `this' pointer needs to be adjusted from pointing to
2175 BINFO to pointing at the base where the final overrider
2178 delta = size_diffop (convert (ssizetype,
2179 BINFO_OFFSET (TREE_VALUE (overrider))),
2180 convert (ssizetype, BINFO_OFFSET (binfo)));
2182 modify_vtable_entry (t, binfo, overrider_fn, delta, virtuals);
2185 BV_VCALL_INDEX (*virtuals)
2186 = get_vcall_index (overrider_target, BINFO_TYPE (virtual_base));
2188 BV_VCALL_INDEX (*virtuals) = NULL_TREE;
2191 /* Called from modify_all_vtables via dfs_walk. */
2194 dfs_modify_vtables (tree binfo, void* data)
2196 tree t = (tree) data;
2201 if (!TYPE_CONTAINS_VPTR_P (BINFO_TYPE (binfo)))
2202 /* A base without a vtable needs no modification, and its bases
2203 are uninteresting. */
2204 return dfs_skip_bases;
2206 if (SAME_BINFO_TYPE_P (BINFO_TYPE (binfo), t)
2207 && !CLASSTYPE_HAS_PRIMARY_BASE_P (t))
2208 /* Don't do the primary vtable, if it's new. */
2211 if (BINFO_PRIMARY_P (binfo) && !BINFO_VIRTUAL_P (binfo))
2212 /* There's no need to modify the vtable for a non-virtual primary
2213 base; we're not going to use that vtable anyhow. We do still
2214 need to do this for virtual primary bases, as they could become
2215 non-primary in a construction vtable. */
2218 make_new_vtable (t, binfo);
2220 /* Now, go through each of the virtual functions in the virtual
2221 function table for BINFO. Find the final overrider, and update
2222 the BINFO_VIRTUALS list appropriately. */
2223 for (ix = 0, virtuals = BINFO_VIRTUALS (binfo),
2224 old_virtuals = BINFO_VIRTUALS (TYPE_BINFO (BINFO_TYPE (binfo)));
2226 ix++, virtuals = TREE_CHAIN (virtuals),
2227 old_virtuals = TREE_CHAIN (old_virtuals))
2228 update_vtable_entry_for_fn (t,
2230 BV_FN (old_virtuals),
2236 /* Update all of the primary and secondary vtables for T. Create new
2237 vtables as required, and initialize their RTTI information. Each
2238 of the functions in VIRTUALS is declared in T and may override a
2239 virtual function from a base class; find and modify the appropriate
2240 entries to point to the overriding functions. Returns a list, in
2241 declaration order, of the virtual functions that are declared in T,
2242 but do not appear in the primary base class vtable, and which
2243 should therefore be appended to the end of the vtable for T. */
2246 modify_all_vtables (tree t, tree virtuals)
2248 tree binfo = TYPE_BINFO (t);
2251 /* Update all of the vtables. */
2252 dfs_walk_once (binfo, dfs_modify_vtables, NULL, t);
2254 /* Add virtual functions not already in our primary vtable. These
2255 will be both those introduced by this class, and those overridden
2256 from secondary bases. It does not include virtuals merely
2257 inherited from secondary bases. */
2258 for (fnsp = &virtuals; *fnsp; )
2260 tree fn = TREE_VALUE (*fnsp);
2262 if (!value_member (fn, BINFO_VIRTUALS (binfo))
2263 || DECL_VINDEX (fn) == error_mark_node)
2265 /* We don't need to adjust the `this' pointer when
2266 calling this function. */
2267 BV_DELTA (*fnsp) = integer_zero_node;
2268 BV_VCALL_INDEX (*fnsp) = NULL_TREE;
2270 /* This is a function not already in our vtable. Keep it. */
2271 fnsp = &TREE_CHAIN (*fnsp);
2274 /* We've already got an entry for this function. Skip it. */
2275 *fnsp = TREE_CHAIN (*fnsp);
2281 /* Get the base virtual function declarations in T that have the
2285 get_basefndecls (tree name, tree t)
2288 tree base_fndecls = NULL_TREE;
2289 int n_baseclasses = BINFO_N_BASE_BINFOS (TYPE_BINFO (t));
2292 /* Find virtual functions in T with the indicated NAME. */
2293 i = lookup_fnfields_1 (t, name);
2295 for (methods = VEC_index (tree, CLASSTYPE_METHOD_VEC (t), i);
2297 methods = OVL_NEXT (methods))
2299 tree method = OVL_CURRENT (methods);
2301 if (TREE_CODE (method) == FUNCTION_DECL
2302 && DECL_VINDEX (method))
2303 base_fndecls = tree_cons (NULL_TREE, method, base_fndecls);
2307 return base_fndecls;
2309 for (i = 0; i < n_baseclasses; i++)
2311 tree basetype = BINFO_TYPE (BINFO_BASE_BINFO (TYPE_BINFO (t), i));
2312 base_fndecls = chainon (get_basefndecls (name, basetype),
2316 return base_fndecls;
2319 /* If this declaration supersedes the declaration of
2320 a method declared virtual in the base class, then
2321 mark this field as being virtual as well. */
2324 check_for_override (tree decl, tree ctype)
2326 if (TREE_CODE (decl) == TEMPLATE_DECL)
2327 /* In [temp.mem] we have:
2329 A specialization of a member function template does not
2330 override a virtual function from a base class. */
2332 if ((DECL_DESTRUCTOR_P (decl)
2333 || IDENTIFIER_VIRTUAL_P (DECL_NAME (decl))
2334 || DECL_CONV_FN_P (decl))
2335 && look_for_overrides (ctype, decl)
2336 && !DECL_STATIC_FUNCTION_P (decl))
2337 /* Set DECL_VINDEX to a value that is neither an INTEGER_CST nor
2338 the error_mark_node so that we know it is an overriding
2340 DECL_VINDEX (decl) = decl;
2342 if (DECL_VIRTUAL_P (decl))
2344 if (!DECL_VINDEX (decl))
2345 DECL_VINDEX (decl) = error_mark_node;
2346 IDENTIFIER_VIRTUAL_P (DECL_NAME (decl)) = 1;
2350 /* Warn about hidden virtual functions that are not overridden in t.
2351 We know that constructors and destructors don't apply. */
2354 warn_hidden (tree t)
2356 VEC(tree,gc) *method_vec = CLASSTYPE_METHOD_VEC (t);
2360 /* We go through each separately named virtual function. */
2361 for (i = CLASSTYPE_FIRST_CONVERSION_SLOT;
2362 VEC_iterate (tree, method_vec, i, fns);
2373 /* All functions in this slot in the CLASSTYPE_METHOD_VEC will
2374 have the same name. Figure out what name that is. */
2375 name = DECL_NAME (OVL_CURRENT (fns));
2376 /* There are no possibly hidden functions yet. */
2377 base_fndecls = NULL_TREE;
2378 /* Iterate through all of the base classes looking for possibly
2379 hidden functions. */
2380 for (binfo = TYPE_BINFO (t), j = 0;
2381 BINFO_BASE_ITERATE (binfo, j, base_binfo); j++)
2383 tree basetype = BINFO_TYPE (base_binfo);
2384 base_fndecls = chainon (get_basefndecls (name, basetype),
2388 /* If there are no functions to hide, continue. */
2392 /* Remove any overridden functions. */
2393 for (fn = fns; fn; fn = OVL_NEXT (fn))
2395 fndecl = OVL_CURRENT (fn);
2396 if (DECL_VINDEX (fndecl))
2398 tree *prev = &base_fndecls;
2401 /* If the method from the base class has the same
2402 signature as the method from the derived class, it
2403 has been overridden. */
2404 if (same_signature_p (fndecl, TREE_VALUE (*prev)))
2405 *prev = TREE_CHAIN (*prev);
2407 prev = &TREE_CHAIN (*prev);
2411 /* Now give a warning for all base functions without overriders,
2412 as they are hidden. */
2413 while (base_fndecls)
2415 /* Here we know it is a hider, and no overrider exists. */
2416 warning (0, "%q+D was hidden", TREE_VALUE (base_fndecls));
2417 warning (0, " by %q+D", fns);
2418 base_fndecls = TREE_CHAIN (base_fndecls);
2423 /* Check for things that are invalid. There are probably plenty of other
2424 things we should check for also. */
2427 finish_struct_anon (tree t)
2431 for (field = TYPE_FIELDS (t); field; field = TREE_CHAIN (field))
2433 if (TREE_STATIC (field))
2435 if (TREE_CODE (field) != FIELD_DECL)
2438 if (DECL_NAME (field) == NULL_TREE
2439 && ANON_AGGR_TYPE_P (TREE_TYPE (field)))
2441 tree elt = TYPE_FIELDS (TREE_TYPE (field));
2442 for (; elt; elt = TREE_CHAIN (elt))
2444 /* We're generally only interested in entities the user
2445 declared, but we also find nested classes by noticing
2446 the TYPE_DECL that we create implicitly. You're
2447 allowed to put one anonymous union inside another,
2448 though, so we explicitly tolerate that. We use
2449 TYPE_ANONYMOUS_P rather than ANON_AGGR_TYPE_P so that
2450 we also allow unnamed types used for defining fields. */
2451 if (DECL_ARTIFICIAL (elt)
2452 && (!DECL_IMPLICIT_TYPEDEF_P (elt)
2453 || TYPE_ANONYMOUS_P (TREE_TYPE (elt))))
2456 if (TREE_CODE (elt) != FIELD_DECL)
2458 pedwarn ("%q+#D invalid; an anonymous union can "
2459 "only have non-static data members", elt);
2463 if (TREE_PRIVATE (elt))
2464 pedwarn ("private member %q+#D in anonymous union", elt);
2465 else if (TREE_PROTECTED (elt))
2466 pedwarn ("protected member %q+#D in anonymous union", elt);
2468 TREE_PRIVATE (elt) = TREE_PRIVATE (field);
2469 TREE_PROTECTED (elt) = TREE_PROTECTED (field);
2475 /* Add T to CLASSTYPE_DECL_LIST of current_class_type which
2476 will be used later during class template instantiation.
2477 When FRIEND_P is zero, T can be a static member data (VAR_DECL),
2478 a non-static member data (FIELD_DECL), a member function
2479 (FUNCTION_DECL), a nested type (RECORD_TYPE, ENUM_TYPE),
2480 a typedef (TYPE_DECL) or a member class template (TEMPLATE_DECL)
2481 When FRIEND_P is nonzero, T is either a friend class
2482 (RECORD_TYPE, TEMPLATE_DECL) or a friend function
2483 (FUNCTION_DECL, TEMPLATE_DECL). */
2486 maybe_add_class_template_decl_list (tree type, tree t, int friend_p)
2488 /* Save some memory by not creating TREE_LIST if TYPE is not template. */
2489 if (CLASSTYPE_TEMPLATE_INFO (type))
2490 CLASSTYPE_DECL_LIST (type)
2491 = tree_cons (friend_p ? NULL_TREE : type,
2492 t, CLASSTYPE_DECL_LIST (type));
2495 /* Create default constructors, assignment operators, and so forth for
2496 the type indicated by T, if they are needed. CANT_HAVE_CONST_CTOR,
2497 and CANT_HAVE_CONST_ASSIGNMENT are nonzero if, for whatever reason,
2498 the class cannot have a default constructor, copy constructor
2499 taking a const reference argument, or an assignment operator taking
2500 a const reference, respectively. */
2503 add_implicitly_declared_members (tree t,
2504 int cant_have_const_cctor,
2505 int cant_have_const_assignment)
2508 if (!CLASSTYPE_DESTRUCTORS (t))
2510 /* In general, we create destructors lazily. */
2511 CLASSTYPE_LAZY_DESTRUCTOR (t) = 1;
2512 /* However, if the implicit destructor is non-trivial
2513 destructor, we sometimes have to create it at this point. */
2514 if (TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t))
2518 if (TYPE_FOR_JAVA (t))
2519 /* If this a Java class, any non-trivial destructor is
2520 invalid, even if compiler-generated. Therefore, if the
2521 destructor is non-trivial we create it now. */
2529 /* If the implicit destructor will be virtual, then we must
2530 generate it now because (unfortunately) we do not
2531 generate virtual tables lazily. */
2532 binfo = TYPE_BINFO (t);
2533 for (ix = 0; BINFO_BASE_ITERATE (binfo, ix, base_binfo); ix++)
2538 base_type = BINFO_TYPE (base_binfo);
2539 dtor = CLASSTYPE_DESTRUCTORS (base_type);
2540 if (dtor && DECL_VIRTUAL_P (dtor))
2548 /* If we can't get away with being lazy, generate the destructor
2551 lazily_declare_fn (sfk_destructor, t);
2555 /* Default constructor. */
2556 if (! TYPE_HAS_CONSTRUCTOR (t))
2558 TYPE_HAS_DEFAULT_CONSTRUCTOR (t) = 1;
2559 CLASSTYPE_LAZY_DEFAULT_CTOR (t) = 1;
2562 /* Copy constructor. */
2563 if (! TYPE_HAS_INIT_REF (t) && ! TYPE_FOR_JAVA (t))
2565 TYPE_HAS_INIT_REF (t) = 1;
2566 TYPE_HAS_CONST_INIT_REF (t) = !cant_have_const_cctor;
2567 CLASSTYPE_LAZY_COPY_CTOR (t) = 1;
2568 TYPE_HAS_CONSTRUCTOR (t) = 1;
2571 /* If there is no assignment operator, one will be created if and
2572 when it is needed. For now, just record whether or not the type
2573 of the parameter to the assignment operator will be a const or
2574 non-const reference. */
2575 if (!TYPE_HAS_ASSIGN_REF (t) && !TYPE_FOR_JAVA (t))
2577 TYPE_HAS_ASSIGN_REF (t) = 1;
2578 TYPE_HAS_CONST_ASSIGN_REF (t) = !cant_have_const_assignment;
2579 CLASSTYPE_LAZY_ASSIGNMENT_OP (t) = 1;
2583 /* Subroutine of finish_struct_1. Recursively count the number of fields
2584 in TYPE, including anonymous union members. */
2587 count_fields (tree fields)
2591 for (x = fields; x; x = TREE_CHAIN (x))
2593 if (TREE_CODE (x) == FIELD_DECL && ANON_AGGR_TYPE_P (TREE_TYPE (x)))
2594 n_fields += count_fields (TYPE_FIELDS (TREE_TYPE (x)));
2601 /* Subroutine of finish_struct_1. Recursively add all the fields in the
2602 TREE_LIST FIELDS to the SORTED_FIELDS_TYPE elts, starting at offset IDX. */
2605 add_fields_to_record_type (tree fields, struct sorted_fields_type *field_vec, int idx)
2608 for (x = fields; x; x = TREE_CHAIN (x))
2610 if (TREE_CODE (x) == FIELD_DECL && ANON_AGGR_TYPE_P (TREE_TYPE (x)))
2611 idx = add_fields_to_record_type (TYPE_FIELDS (TREE_TYPE (x)), field_vec, idx);
2613 field_vec->elts[idx++] = x;
2618 /* FIELD is a bit-field. We are finishing the processing for its
2619 enclosing type. Issue any appropriate messages and set appropriate
2623 check_bitfield_decl (tree field)
2625 tree type = TREE_TYPE (field);
2628 /* Extract the declared width of the bitfield, which has been
2629 temporarily stashed in DECL_INITIAL. */
2630 w = DECL_INITIAL (field);
2631 gcc_assert (w != NULL_TREE);
2632 /* Remove the bit-field width indicator so that the rest of the
2633 compiler does not treat that value as an initializer. */
2634 DECL_INITIAL (field) = NULL_TREE;
2636 /* Detect invalid bit-field type. */
2637 if (!INTEGRAL_TYPE_P (type))
2639 error ("bit-field %q+#D with non-integral type", field);
2640 TREE_TYPE (field) = error_mark_node;
2641 w = error_mark_node;
2645 /* Avoid the non_lvalue wrapper added by fold for PLUS_EXPRs. */
2648 /* detect invalid field size. */
2649 w = integral_constant_value (w);
2651 if (TREE_CODE (w) != INTEGER_CST)
2653 error ("bit-field %q+D width not an integer constant", field);
2654 w = error_mark_node;
2656 else if (tree_int_cst_sgn (w) < 0)
2658 error ("negative width in bit-field %q+D", field);
2659 w = error_mark_node;
2661 else if (integer_zerop (w) && DECL_NAME (field) != 0)
2663 error ("zero width for bit-field %q+D", field);
2664 w = error_mark_node;
2666 else if (compare_tree_int (w, TYPE_PRECISION (type)) > 0
2667 && TREE_CODE (type) != ENUMERAL_TYPE
2668 && TREE_CODE (type) != BOOLEAN_TYPE)
2669 warning (0, "width of %q+D exceeds its type", field);
2670 else if (TREE_CODE (type) == ENUMERAL_TYPE
2671 && (0 > compare_tree_int (w,
2672 min_precision (TYPE_MIN_VALUE (type),
2673 TYPE_UNSIGNED (type)))
2674 || 0 > compare_tree_int (w,
2676 (TYPE_MAX_VALUE (type),
2677 TYPE_UNSIGNED (type)))))
2678 warning (0, "%q+D is too small to hold all values of %q#T", field, type);
2681 if (w != error_mark_node)
2683 DECL_SIZE (field) = convert (bitsizetype, w);
2684 DECL_BIT_FIELD (field) = 1;
2688 /* Non-bit-fields are aligned for their type. */
2689 DECL_BIT_FIELD (field) = 0;
2690 CLEAR_DECL_C_BIT_FIELD (field);
2694 /* FIELD is a non bit-field. We are finishing the processing for its
2695 enclosing type T. Issue any appropriate messages and set appropriate
2699 check_field_decl (tree field,
2701 int* cant_have_const_ctor,
2702 int* no_const_asn_ref,
2703 int* any_default_members)
2705 tree type = strip_array_types (TREE_TYPE (field));
2707 /* An anonymous union cannot contain any fields which would change
2708 the settings of CANT_HAVE_CONST_CTOR and friends. */
2709 if (ANON_UNION_TYPE_P (type))
2711 /* And, we don't set TYPE_HAS_CONST_INIT_REF, etc., for anonymous
2712 structs. So, we recurse through their fields here. */
2713 else if (ANON_AGGR_TYPE_P (type))
2717 for (fields = TYPE_FIELDS (type); fields; fields = TREE_CHAIN (fields))
2718 if (TREE_CODE (fields) == FIELD_DECL && !DECL_C_BIT_FIELD (field))
2719 check_field_decl (fields, t, cant_have_const_ctor,
2720 no_const_asn_ref, any_default_members);
2722 /* Check members with class type for constructors, destructors,
2724 else if (CLASS_TYPE_P (type))
2726 /* Never let anything with uninheritable virtuals
2727 make it through without complaint. */
2728 abstract_virtuals_error (field, type);
2730 if (TREE_CODE (t) == UNION_TYPE)
2732 if (TYPE_NEEDS_CONSTRUCTING (type))
2733 error ("member %q+#D with constructor not allowed in union",
2735 if (TYPE_HAS_NONTRIVIAL_DESTRUCTOR (type))
2736 error ("member %q+#D with destructor not allowed in union", field);
2737 if (TYPE_HAS_COMPLEX_ASSIGN_REF (type))
2738 error ("member %q+#D with copy assignment operator not allowed in union",
2743 TYPE_NEEDS_CONSTRUCTING (t) |= TYPE_NEEDS_CONSTRUCTING (type);
2744 TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t)
2745 |= TYPE_HAS_NONTRIVIAL_DESTRUCTOR (type);
2746 TYPE_HAS_COMPLEX_ASSIGN_REF (t) |= TYPE_HAS_COMPLEX_ASSIGN_REF (type);
2747 TYPE_HAS_COMPLEX_INIT_REF (t) |= TYPE_HAS_COMPLEX_INIT_REF (type);
2750 if (!TYPE_HAS_CONST_INIT_REF (type))
2751 *cant_have_const_ctor = 1;
2753 if (!TYPE_HAS_CONST_ASSIGN_REF (type))
2754 *no_const_asn_ref = 1;
2756 if (DECL_INITIAL (field) != NULL_TREE)
2758 /* `build_class_init_list' does not recognize
2760 if (TREE_CODE (t) == UNION_TYPE && any_default_members != 0)
2761 error ("multiple fields in union %qT initialized", t);
2762 *any_default_members = 1;
2766 /* Check the data members (both static and non-static), class-scoped
2767 typedefs, etc., appearing in the declaration of T. Issue
2768 appropriate diagnostics. Sets ACCESS_DECLS to a list (in
2769 declaration order) of access declarations; each TREE_VALUE in this
2770 list is a USING_DECL.
2772 In addition, set the following flags:
2775 The class is empty, i.e., contains no non-static data members.
2777 CANT_HAVE_CONST_CTOR_P
2778 This class cannot have an implicitly generated copy constructor
2779 taking a const reference.
2781 CANT_HAVE_CONST_ASN_REF
2782 This class cannot have an implicitly generated assignment
2783 operator taking a const reference.
2785 All of these flags should be initialized before calling this
2788 Returns a pointer to the end of the TYPE_FIELDs chain; additional
2789 fields can be added by adding to this chain. */
2792 check_field_decls (tree t, tree *access_decls,
2793 int *cant_have_const_ctor_p,
2794 int *no_const_asn_ref_p)
2799 int any_default_members;
2801 /* Assume there are no access declarations. */
2802 *access_decls = NULL_TREE;
2803 /* Assume this class has no pointer members. */
2804 has_pointers = false;
2805 /* Assume none of the members of this class have default
2807 any_default_members = 0;
2809 for (field = &TYPE_FIELDS (t); *field; field = next)
2812 tree type = TREE_TYPE (x);
2814 next = &TREE_CHAIN (x);
2816 if (TREE_CODE (x) == USING_DECL)
2818 /* Prune the access declaration from the list of fields. */
2819 *field = TREE_CHAIN (x);
2821 /* Save the access declarations for our caller. */
2822 *access_decls = tree_cons (NULL_TREE, x, *access_decls);
2824 /* Since we've reset *FIELD there's no reason to skip to the
2830 if (TREE_CODE (x) == TYPE_DECL
2831 || TREE_CODE (x) == TEMPLATE_DECL)
2834 /* If we've gotten this far, it's a data member, possibly static,
2835 or an enumerator. */
2836 DECL_CONTEXT (x) = t;
2838 /* When this goes into scope, it will be a non-local reference. */
2839 DECL_NONLOCAL (x) = 1;
2841 if (TREE_CODE (t) == UNION_TYPE)
2845 If a union contains a static data member, or a member of
2846 reference type, the program is ill-formed. */
2847 if (TREE_CODE (x) == VAR_DECL)
2849 error ("%q+D may not be static because it is a member of a union", x);
2852 if (TREE_CODE (type) == REFERENCE_TYPE)
2854 error ("%q+D may not have reference type %qT because"
2855 " it is a member of a union",
2861 /* ``A local class cannot have static data members.'' ARM 9.4 */
2862 if (current_function_decl && TREE_STATIC (x))
2863 error ("field %q+D in local class cannot be static", x);
2865 /* Perform error checking that did not get done in
2867 if (TREE_CODE (type) == FUNCTION_TYPE)
2869 error ("field %q+D invalidly declared function type", x);
2870 type = build_pointer_type (type);
2871 TREE_TYPE (x) = type;
2873 else if (TREE_CODE (type) == METHOD_TYPE)
2875 error ("field %q+D invalidly declared method type", x);
2876 type = build_pointer_type (type);
2877 TREE_TYPE (x) = type;
2880 if (type == error_mark_node)
2883 if (TREE_CODE (x) == CONST_DECL || TREE_CODE (x) == VAR_DECL)
2886 /* Now it can only be a FIELD_DECL. */
2888 if (TREE_PRIVATE (x) || TREE_PROTECTED (x))
2889 CLASSTYPE_NON_AGGREGATE (t) = 1;
2891 /* If this is of reference type, check if it needs an init.
2892 Also do a little ANSI jig if necessary. */
2893 if (TREE_CODE (type) == REFERENCE_TYPE)
2895 CLASSTYPE_NON_POD_P (t) = 1;
2896 if (DECL_INITIAL (x) == NULL_TREE)
2897 SET_CLASSTYPE_REF_FIELDS_NEED_INIT (t, 1);
2899 /* ARM $12.6.2: [A member initializer list] (or, for an
2900 aggregate, initialization by a brace-enclosed list) is the
2901 only way to initialize nonstatic const and reference
2903 TYPE_HAS_COMPLEX_ASSIGN_REF (t) = 1;
2905 if (! TYPE_HAS_CONSTRUCTOR (t) && CLASSTYPE_NON_AGGREGATE (t)
2907 warning (OPT_Wextra, "non-static reference %q+#D in class without a constructor", x);
2910 type = strip_array_types (type);
2912 if (TYPE_PACKED (t))
2914 if (!pod_type_p (type) && !TYPE_PACKED (type))
2917 "ignoring packed attribute on unpacked non-POD field %q+#D",
2919 else if (TYPE_ALIGN (TREE_TYPE (x)) > BITS_PER_UNIT)
2920 DECL_PACKED (x) = 1;
2923 if (DECL_C_BIT_FIELD (x) && integer_zerop (DECL_INITIAL (x)))
2924 /* We don't treat zero-width bitfields as making a class
2929 /* The class is non-empty. */
2930 CLASSTYPE_EMPTY_P (t) = 0;
2931 /* The class is not even nearly empty. */
2932 CLASSTYPE_NEARLY_EMPTY_P (t) = 0;
2933 /* If one of the data members contains an empty class,
2935 if (CLASS_TYPE_P (type)
2936 && CLASSTYPE_CONTAINS_EMPTY_CLASS_P (type))
2937 CLASSTYPE_CONTAINS_EMPTY_CLASS_P (t) = 1;
2940 /* This is used by -Weffc++ (see below). Warn only for pointers
2941 to members which might hold dynamic memory. So do not warn
2942 for pointers to functions or pointers to members. */
2943 if (TYPE_PTR_P (type)
2944 && !TYPE_PTRFN_P (type)
2945 && !TYPE_PTR_TO_MEMBER_P (type))
2946 has_pointers = true;
2948 if (CLASS_TYPE_P (type))
2950 if (CLASSTYPE_REF_FIELDS_NEED_INIT (type))
2951 SET_CLASSTYPE_REF_FIELDS_NEED_INIT (t, 1);
2952 if (CLASSTYPE_READONLY_FIELDS_NEED_INIT (type))
2953 SET_CLASSTYPE_READONLY_FIELDS_NEED_INIT (t, 1);
2956 if (DECL_MUTABLE_P (x) || TYPE_HAS_MUTABLE_P (type))
2957 CLASSTYPE_HAS_MUTABLE (t) = 1;
2959 if (! pod_type_p (type))
2960 /* DR 148 now allows pointers to members (which are POD themselves),
2961 to be allowed in POD structs. */
2962 CLASSTYPE_NON_POD_P (t) = 1;
2964 if (! zero_init_p (type))
2965 CLASSTYPE_NON_ZERO_INIT_P (t) = 1;
2967 /* If any field is const, the structure type is pseudo-const. */
2968 if (CP_TYPE_CONST_P (type))
2970 C_TYPE_FIELDS_READONLY (t) = 1;
2971 if (DECL_INITIAL (x) == NULL_TREE)
2972 SET_CLASSTYPE_READONLY_FIELDS_NEED_INIT (t, 1);
2974 /* ARM $12.6.2: [A member initializer list] (or, for an
2975 aggregate, initialization by a brace-enclosed list) is the
2976 only way to initialize nonstatic const and reference
2978 TYPE_HAS_COMPLEX_ASSIGN_REF (t) = 1;
2980 if (! TYPE_HAS_CONSTRUCTOR (t) && CLASSTYPE_NON_AGGREGATE (t)
2982 warning (OPT_Wextra, "non-static const member %q+#D in class without a constructor", x);
2984 /* A field that is pseudo-const makes the structure likewise. */
2985 else if (CLASS_TYPE_P (type))
2987 C_TYPE_FIELDS_READONLY (t) |= C_TYPE_FIELDS_READONLY (type);
2988 SET_CLASSTYPE_READONLY_FIELDS_NEED_INIT (t,
2989 CLASSTYPE_READONLY_FIELDS_NEED_INIT (t)
2990 | CLASSTYPE_READONLY_FIELDS_NEED_INIT (type));
2993 /* Core issue 80: A nonstatic data member is required to have a
2994 different name from the class iff the class has a
2995 user-defined constructor. */
2996 if (constructor_name_p (DECL_NAME (x), t) && TYPE_HAS_CONSTRUCTOR (t))
2997 pedwarn ("field %q+#D with same name as class", x);
2999 /* We set DECL_C_BIT_FIELD in grokbitfield.
3000 If the type and width are valid, we'll also set DECL_BIT_FIELD. */
3001 if (DECL_C_BIT_FIELD (x))
3002 check_bitfield_decl (x);
3004 check_field_decl (x, t,
3005 cant_have_const_ctor_p,
3007 &any_default_members);
3010 /* Effective C++ rule 11: if a class has dynamic memory held by pointers,
3011 it should also define a copy constructor and an assignment operator to
3012 implement the correct copy semantic (deep vs shallow, etc.). As it is
3013 not feasible to check whether the constructors do allocate dynamic memory
3014 and store it within members, we approximate the warning like this:
3016 -- Warn only if there are members which are pointers
3017 -- Warn only if there is a non-trivial constructor (otherwise,
3018 there cannot be memory allocated).
3019 -- Warn only if there is a non-trivial destructor. We assume that the
3020 user at least implemented the cleanup correctly, and a destructor
3021 is needed to free dynamic memory.
3023 This seems enough for practical purposes. */
3026 && TYPE_HAS_CONSTRUCTOR (t)
3027 && TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t)
3028 && !(TYPE_HAS_INIT_REF (t) && TYPE_HAS_ASSIGN_REF (t)))
3030 warning (OPT_Weffc__, "%q#T has pointer data members", t);
3032 if (! TYPE_HAS_INIT_REF (t))
3034 warning (OPT_Weffc__,
3035 " but does not override %<%T(const %T&)%>", t, t);
3036 if (!TYPE_HAS_ASSIGN_REF (t))
3037 warning (OPT_Weffc__, " or %<operator=(const %T&)%>", t);
3039 else if (! TYPE_HAS_ASSIGN_REF (t))
3040 warning (OPT_Weffc__,
3041 " but does not override %<operator=(const %T&)%>", t);
3045 /* Check anonymous struct/anonymous union fields. */
3046 finish_struct_anon (t);
3048 /* We've built up the list of access declarations in reverse order.
3050 *access_decls = nreverse (*access_decls);
3053 /* If TYPE is an empty class type, records its OFFSET in the table of
3057 record_subobject_offset (tree type, tree offset, splay_tree offsets)
3061 if (!is_empty_class (type))
3064 /* Record the location of this empty object in OFFSETS. */
3065 n = splay_tree_lookup (offsets, (splay_tree_key) offset);
3067 n = splay_tree_insert (offsets,
3068 (splay_tree_key) offset,
3069 (splay_tree_value) NULL_TREE);
3070 n->value = ((splay_tree_value)
3071 tree_cons (NULL_TREE,
3078 /* Returns nonzero if TYPE is an empty class type and there is
3079 already an entry in OFFSETS for the same TYPE as the same OFFSET. */
3082 check_subobject_offset (tree type, tree offset, splay_tree offsets)
3087 if (!is_empty_class (type))
3090 /* Record the location of this empty object in OFFSETS. */
3091 n = splay_tree_lookup (offsets, (splay_tree_key) offset);
3095 for (t = (tree) n->value; t; t = TREE_CHAIN (t))
3096 if (same_type_p (TREE_VALUE (t), type))
3102 /* Walk through all the subobjects of TYPE (located at OFFSET). Call
3103 F for every subobject, passing it the type, offset, and table of
3104 OFFSETS. If VBASES_P is one, then virtual non-primary bases should
3107 If MAX_OFFSET is non-NULL, then subobjects with an offset greater
3108 than MAX_OFFSET will not be walked.
3110 If F returns a nonzero value, the traversal ceases, and that value
3111 is returned. Otherwise, returns zero. */
3114 walk_subobject_offsets (tree type,
3115 subobject_offset_fn f,
3122 tree type_binfo = NULL_TREE;
3124 /* If this OFFSET is bigger than the MAX_OFFSET, then we should
3126 if (max_offset && INT_CST_LT (max_offset, offset))
3129 if (type == error_mark_node)
3134 if (abi_version_at_least (2))
3136 type = BINFO_TYPE (type);
3139 if (CLASS_TYPE_P (type))
3145 /* Avoid recursing into objects that are not interesting. */
3146 if (!CLASSTYPE_CONTAINS_EMPTY_CLASS_P (type))
3149 /* Record the location of TYPE. */
3150 r = (*f) (type, offset, offsets);
3154 /* Iterate through the direct base classes of TYPE. */
3156 type_binfo = TYPE_BINFO (type);
3157 for (i = 0; BINFO_BASE_ITERATE (type_binfo, i, binfo); i++)
3161 if (abi_version_at_least (2)
3162 && BINFO_VIRTUAL_P (binfo))
3166 && BINFO_VIRTUAL_P (binfo)
3167 && !BINFO_PRIMARY_P (binfo))
3170 if (!abi_version_at_least (2))
3171 binfo_offset = size_binop (PLUS_EXPR,
3173 BINFO_OFFSET (binfo));
3177 /* We cannot rely on BINFO_OFFSET being set for the base
3178 class yet, but the offsets for direct non-virtual
3179 bases can be calculated by going back to the TYPE. */
3180 orig_binfo = BINFO_BASE_BINFO (TYPE_BINFO (type), i);
3181 binfo_offset = size_binop (PLUS_EXPR,
3183 BINFO_OFFSET (orig_binfo));
3186 r = walk_subobject_offsets (binfo,
3191 (abi_version_at_least (2)
3192 ? /*vbases_p=*/0 : vbases_p));
3197 if (abi_version_at_least (2) && CLASSTYPE_VBASECLASSES (type))
3200 VEC(tree,gc) *vbases;
3202 /* Iterate through the virtual base classes of TYPE. In G++
3203 3.2, we included virtual bases in the direct base class
3204 loop above, which results in incorrect results; the
3205 correct offsets for virtual bases are only known when
3206 working with the most derived type. */
3208 for (vbases = CLASSTYPE_VBASECLASSES (type), ix = 0;
3209 VEC_iterate (tree, vbases, ix, binfo); ix++)
3211 r = walk_subobject_offsets (binfo,
3213 size_binop (PLUS_EXPR,
3215 BINFO_OFFSET (binfo)),
3224 /* We still have to walk the primary base, if it is
3225 virtual. (If it is non-virtual, then it was walked
3227 tree vbase = get_primary_binfo (type_binfo);
3229 if (vbase && BINFO_VIRTUAL_P (vbase)
3230 && BINFO_PRIMARY_P (vbase)
3231 && BINFO_INHERITANCE_CHAIN (vbase) == type_binfo)
3233 r = (walk_subobject_offsets
3235 offsets, max_offset, /*vbases_p=*/0));
3242 /* Iterate through the fields of TYPE. */
3243 for (field = TYPE_FIELDS (type); field; field = TREE_CHAIN (field))
3244 if (TREE_CODE (field) == FIELD_DECL && !DECL_ARTIFICIAL (field))
3248 if (abi_version_at_least (2))
3249 field_offset = byte_position (field);
3251 /* In G++ 3.2, DECL_FIELD_OFFSET was used. */
3252 field_offset = DECL_FIELD_OFFSET (field);
3254 r = walk_subobject_offsets (TREE_TYPE (field),
3256 size_binop (PLUS_EXPR,
3266 else if (TREE_CODE (type) == ARRAY_TYPE)
3268 tree element_type = strip_array_types (type);
3269 tree domain = TYPE_DOMAIN (type);
3272 /* Avoid recursing into objects that are not interesting. */
3273 if (!CLASS_TYPE_P (element_type)
3274 || !CLASSTYPE_CONTAINS_EMPTY_CLASS_P (element_type))
3277 /* Step through each of the elements in the array. */
3278 for (index = size_zero_node;
3279 /* G++ 3.2 had an off-by-one error here. */
3280 (abi_version_at_least (2)
3281 ? !INT_CST_LT (TYPE_MAX_VALUE (domain), index)
3282 : INT_CST_LT (index, TYPE_MAX_VALUE (domain)));
3283 index = size_binop (PLUS_EXPR, index, size_one_node))
3285 r = walk_subobject_offsets (TREE_TYPE (type),
3293 offset = size_binop (PLUS_EXPR, offset,
3294 TYPE_SIZE_UNIT (TREE_TYPE (type)));
3295 /* If this new OFFSET is bigger than the MAX_OFFSET, then
3296 there's no point in iterating through the remaining
3297 elements of the array. */
3298 if (max_offset && INT_CST_LT (max_offset, offset))
3306 /* Record all of the empty subobjects of TYPE (either a type or a
3307 binfo). If IS_DATA_MEMBER is true, then a non-static data member
3308 is being placed at OFFSET; otherwise, it is a base class that is
3309 being placed at OFFSET. */
3312 record_subobject_offsets (tree type,
3315 bool is_data_member)
3318 /* If recording subobjects for a non-static data member or a
3319 non-empty base class , we do not need to record offsets beyond
3320 the size of the biggest empty class. Additional data members
3321 will go at the end of the class. Additional base classes will go
3322 either at offset zero (if empty, in which case they cannot
3323 overlap with offsets past the size of the biggest empty class) or
3324 at the end of the class.
3326 However, if we are placing an empty base class, then we must record
3327 all offsets, as either the empty class is at offset zero (where
3328 other empty classes might later be placed) or at the end of the
3329 class (where other objects might then be placed, so other empty
3330 subobjects might later overlap). */
3332 || !is_empty_class (BINFO_TYPE (type)))
3333 max_offset = sizeof_biggest_empty_class;
3335 max_offset = NULL_TREE;
3336 walk_subobject_offsets (type, record_subobject_offset, offset,
3337 offsets, max_offset, is_data_member);
3340 /* Returns nonzero if any of the empty subobjects of TYPE (located at
3341 OFFSET) conflict with entries in OFFSETS. If VBASES_P is nonzero,
3342 virtual bases of TYPE are examined. */
3345 layout_conflict_p (tree type,
3350 splay_tree_node max_node;
3352 /* Get the node in OFFSETS that indicates the maximum offset where
3353 an empty subobject is located. */
3354 max_node = splay_tree_max (offsets);
3355 /* If there aren't any empty subobjects, then there's no point in
3356 performing this check. */
3360 return walk_subobject_offsets (type, check_subobject_offset, offset,
3361 offsets, (tree) (max_node->key),
3365 /* DECL is a FIELD_DECL corresponding either to a base subobject of a
3366 non-static data member of the type indicated by RLI. BINFO is the
3367 binfo corresponding to the base subobject, OFFSETS maps offsets to
3368 types already located at those offsets. This function determines
3369 the position of the DECL. */
3372 layout_nonempty_base_or_field (record_layout_info rli,
3377 tree offset = NULL_TREE;
3383 /* For the purposes of determining layout conflicts, we want to
3384 use the class type of BINFO; TREE_TYPE (DECL) will be the
3385 CLASSTYPE_AS_BASE version, which does not contain entries for
3386 zero-sized bases. */
3387 type = TREE_TYPE (binfo);
3392 type = TREE_TYPE (decl);
3396 /* Try to place the field. It may take more than one try if we have
3397 a hard time placing the field without putting two objects of the
3398 same type at the same address. */
3401 struct record_layout_info_s old_rli = *rli;
3403 /* Place this field. */
3404 place_field (rli, decl);
3405 offset = byte_position (decl);
3407 /* We have to check to see whether or not there is already
3408 something of the same type at the offset we're about to use.
3409 For example, consider:
3412 struct T : public S { int i; };
3413 struct U : public S, public T {};
3415 Here, we put S at offset zero in U. Then, we can't put T at
3416 offset zero -- its S component would be at the same address
3417 as the S we already allocated. So, we have to skip ahead.
3418 Since all data members, including those whose type is an
3419 empty class, have nonzero size, any overlap can happen only
3420 with a direct or indirect base-class -- it can't happen with
3422 /* In a union, overlap is permitted; all members are placed at
3424 if (TREE_CODE (rli->t) == UNION_TYPE)
3426 /* G++ 3.2 did not check for overlaps when placing a non-empty
3428 if (!abi_version_at_least (2) && binfo && BINFO_VIRTUAL_P (binfo))
3430 if (layout_conflict_p (field_p ? type : binfo, offset,
3433 /* Strip off the size allocated to this field. That puts us
3434 at the first place we could have put the field with
3435 proper alignment. */
3438 /* Bump up by the alignment required for the type. */
3440 = size_binop (PLUS_EXPR, rli->bitpos,
3442 ? CLASSTYPE_ALIGN (type)
3443 : TYPE_ALIGN (type)));
3444 normalize_rli (rli);
3447 /* There was no conflict. We're done laying out this field. */
3451 /* Now that we know where it will be placed, update its
3453 if (binfo && CLASS_TYPE_P (BINFO_TYPE (binfo)))
3454 /* Indirect virtual bases may have a nonzero BINFO_OFFSET at
3455 this point because their BINFO_OFFSET is copied from another
3456 hierarchy. Therefore, we may not need to add the entire
3458 propagate_binfo_offsets (binfo,
3459 size_diffop (convert (ssizetype, offset),
3461 BINFO_OFFSET (binfo))));
3464 /* Returns true if TYPE is empty and OFFSET is nonzero. */
3467 empty_base_at_nonzero_offset_p (tree type,
3469 splay_tree offsets ATTRIBUTE_UNUSED)
3471 return is_empty_class (type) && !integer_zerop (offset);
3474 /* Layout the empty base BINFO. EOC indicates the byte currently just
3475 past the end of the class, and should be correctly aligned for a
3476 class of the type indicated by BINFO; OFFSETS gives the offsets of
3477 the empty bases allocated so far. T is the most derived
3478 type. Return nonzero iff we added it at the end. */
3481 layout_empty_base (tree binfo, tree eoc, splay_tree offsets)
3484 tree basetype = BINFO_TYPE (binfo);
3487 /* This routine should only be used for empty classes. */
3488 gcc_assert (is_empty_class (basetype));
3489 alignment = ssize_int (CLASSTYPE_ALIGN_UNIT (basetype));
3491 if (!integer_zerop (BINFO_OFFSET (binfo)))
3493 if (abi_version_at_least (2))
3494 propagate_binfo_offsets
3495 (binfo, size_diffop (size_zero_node, BINFO_OFFSET (binfo)));
3498 "offset of empty base %qT may not be ABI-compliant and may"
3499 "change in a future version of GCC",
3500 BINFO_TYPE (binfo));
3503 /* This is an empty base class. We first try to put it at offset
3505 if (layout_conflict_p (binfo,
3506 BINFO_OFFSET (binfo),
3510 /* That didn't work. Now, we move forward from the next
3511 available spot in the class. */
3513 propagate_binfo_offsets (binfo, convert (ssizetype, eoc));
3516 if (!layout_conflict_p (binfo,
3517 BINFO_OFFSET (binfo),
3520 /* We finally found a spot where there's no overlap. */
3523 /* There's overlap here, too. Bump along to the next spot. */
3524 propagate_binfo_offsets (binfo, alignment);
3530 /* Layout the base given by BINFO in the class indicated by RLI.
3531 *BASE_ALIGN is a running maximum of the alignments of
3532 any base class. OFFSETS gives the location of empty base
3533 subobjects. T is the most derived type. Return nonzero if the new
3534 object cannot be nearly-empty. A new FIELD_DECL is inserted at
3535 *NEXT_FIELD, unless BINFO is for an empty base class.
3537 Returns the location at which the next field should be inserted. */
3540 build_base_field (record_layout_info rli, tree binfo,
3541 splay_tree offsets, tree *next_field)
3544 tree basetype = BINFO_TYPE (binfo);
3546 if (!COMPLETE_TYPE_P (basetype))
3547 /* This error is now reported in xref_tag, thus giving better
3548 location information. */
3551 /* Place the base class. */
3552 if (!is_empty_class (basetype))
3556 /* The containing class is non-empty because it has a non-empty
3558 CLASSTYPE_EMPTY_P (t) = 0;
3560 /* Create the FIELD_DECL. */
3561 decl = build_decl (FIELD_DECL, NULL_TREE, CLASSTYPE_AS_BASE (basetype));
3562 DECL_ARTIFICIAL (decl) = 1;
3563 DECL_IGNORED_P (decl) = 1;
3564 DECL_FIELD_CONTEXT (decl) = t;
3565 DECL_SIZE (decl) = CLASSTYPE_SIZE (basetype);
3566 DECL_SIZE_UNIT (decl) = CLASSTYPE_SIZE_UNIT (basetype);
3567 DECL_ALIGN (decl) = CLASSTYPE_ALIGN (basetype);
3568 DECL_USER_ALIGN (decl) = CLASSTYPE_USER_ALIGN (basetype);
3569 DECL_MODE (decl) = TYPE_MODE (basetype);
3570 DECL_FIELD_IS_BASE (decl) = 1;
3572 /* Try to place the field. It may take more than one try if we
3573 have a hard time placing the field without putting two
3574 objects of the same type at the same address. */
3575 layout_nonempty_base_or_field (rli, decl, binfo, offsets);
3576 /* Add the new FIELD_DECL to the list of fields for T. */
3577 TREE_CHAIN (decl) = *next_field;
3579 next_field = &TREE_CHAIN (decl);
3586 /* On some platforms (ARM), even empty classes will not be
3588 eoc = round_up (rli_size_unit_so_far (rli),
3589 CLASSTYPE_ALIGN_UNIT (basetype));
3590 atend = layout_empty_base (binfo, eoc, offsets);
3591 /* A nearly-empty class "has no proper base class that is empty,
3592 not morally virtual, and at an offset other than zero." */
3593 if (!BINFO_VIRTUAL_P (binfo) && CLASSTYPE_NEARLY_EMPTY_P (t))
3596 CLASSTYPE_NEARLY_EMPTY_P (t) = 0;
3597 /* The check above (used in G++ 3.2) is insufficient because
3598 an empty class placed at offset zero might itself have an
3599 empty base at a nonzero offset. */
3600 else if (walk_subobject_offsets (basetype,
3601 empty_base_at_nonzero_offset_p,
3604 /*max_offset=*/NULL_TREE,
3607 if (abi_version_at_least (2))
3608 CLASSTYPE_NEARLY_EMPTY_P (t) = 0;
3611 "class %qT will be considered nearly empty in a "
3612 "future version of GCC", t);
3616 /* We do not create a FIELD_DECL for empty base classes because
3617 it might overlap some other field. We want to be able to
3618 create CONSTRUCTORs for the class by iterating over the
3619 FIELD_DECLs, and the back end does not handle overlapping
3622 /* An empty virtual base causes a class to be non-empty
3623 -- but in that case we do not need to clear CLASSTYPE_EMPTY_P
3624 here because that was already done when the virtual table
3625 pointer was created. */
3628 /* Record the offsets of BINFO and its base subobjects. */
3629 record_subobject_offsets (binfo,
3630 BINFO_OFFSET (binfo),
3632 /*is_data_member=*/false);
3637 /* Layout all of the non-virtual base classes. Record empty
3638 subobjects in OFFSETS. T is the most derived type. Return nonzero
3639 if the type cannot be nearly empty. The fields created
3640 corresponding to the base classes will be inserted at
3644 build_base_fields (record_layout_info rli,
3645 splay_tree offsets, tree *next_field)
3647 /* Chain to hold all the new FIELD_DECLs which stand in for base class
3650 int n_baseclasses = BINFO_N_BASE_BINFOS (TYPE_BINFO (t));
3653 /* The primary base class is always allocated first. */
3654 if (CLASSTYPE_HAS_PRIMARY_BASE_P (t))
3655 next_field = build_base_field (rli, CLASSTYPE_PRIMARY_BINFO (t),
3656 offsets, next_field);
3658 /* Now allocate the rest of the bases. */
3659 for (i = 0; i < n_baseclasses; ++i)
3663 base_binfo = BINFO_BASE_BINFO (TYPE_BINFO (t), i);
3665 /* The primary base was already allocated above, so we don't
3666 need to allocate it again here. */
3667 if (base_binfo == CLASSTYPE_PRIMARY_BINFO (t))
3670 /* Virtual bases are added at the end (a primary virtual base
3671 will have already been added). */
3672 if (BINFO_VIRTUAL_P (base_binfo))
3675 next_field = build_base_field (rli, base_binfo,
3676 offsets, next_field);
3680 /* Go through the TYPE_METHODS of T issuing any appropriate
3681 diagnostics, figuring out which methods override which other
3682 methods, and so forth. */
3685 check_methods (tree t)
3689 for (x = TYPE_METHODS (t); x; x = TREE_CHAIN (x))
3691 check_for_override (x, t);
3692 if (DECL_PURE_VIRTUAL_P (x) && ! DECL_VINDEX (x))
3693 error ("initializer specified for non-virtual method %q+D", x);
3694 /* The name of the field is the original field name
3695 Save this in auxiliary field for later overloading. */
3696 if (DECL_VINDEX (x))
3698 TYPE_POLYMORPHIC_P (t) = 1;
3699 if (DECL_PURE_VIRTUAL_P (x))
3700 VEC_safe_push (tree, gc, CLASSTYPE_PURE_VIRTUALS (t), x);
3702 /* All user-declared destructors are non-trivial. */
3703 if (DECL_DESTRUCTOR_P (x))
3704 TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t) = 1;
3708 /* FN is a constructor or destructor. Clone the declaration to create
3709 a specialized in-charge or not-in-charge version, as indicated by
3713 build_clone (tree fn, tree name)
3718 /* Copy the function. */
3719 clone = copy_decl (fn);
3720 /* Remember where this function came from. */
3721 DECL_CLONED_FUNCTION (clone) = fn;
3722 DECL_ABSTRACT_ORIGIN (clone) = fn;
3723 /* Reset the function name. */
3724 DECL_NAME (clone) = name;
3725 SET_DECL_ASSEMBLER_NAME (clone, NULL_TREE);
3726 /* There's no pending inline data for this function. */
3727 DECL_PENDING_INLINE_INFO (clone) = NULL;
3728 DECL_PENDING_INLINE_P (clone) = 0;
3729 /* And it hasn't yet been deferred. */
3730 DECL_DEFERRED_FN (clone) = 0;
3732 /* The base-class destructor is not virtual. */
3733 if (name == base_dtor_identifier)
3735 DECL_VIRTUAL_P (clone) = 0;
3736 if (TREE_CODE (clone) != TEMPLATE_DECL)
3737 DECL_VINDEX (clone) = NULL_TREE;
3740 /* If there was an in-charge parameter, drop it from the function
3742 if (DECL_HAS_IN_CHARGE_PARM_P (clone))
3748 exceptions = TYPE_RAISES_EXCEPTIONS (TREE_TYPE (clone));
3749 basetype = TYPE_METHOD_BASETYPE (TREE_TYPE (clone));
3750 parmtypes = TYPE_ARG_TYPES (TREE_TYPE (clone));
3751 /* Skip the `this' parameter. */
3752 parmtypes = TREE_CHAIN (parmtypes);
3753 /* Skip the in-charge parameter. */
3754 parmtypes = TREE_CHAIN (parmtypes);
3755 /* And the VTT parm, in a complete [cd]tor. */
3756 if (DECL_HAS_VTT_PARM_P (fn)
3757 && ! DECL_NEEDS_VTT_PARM_P (clone))
3758 parmtypes = TREE_CHAIN (parmtypes);
3759 /* If this is subobject constructor or destructor, add the vtt
3762 = build_method_type_directly (basetype,
3763 TREE_TYPE (TREE_TYPE (clone)),
3766 TREE_TYPE (clone) = build_exception_variant (TREE_TYPE (clone),
3769 = cp_build_type_attribute_variant (TREE_TYPE (clone),
3770 TYPE_ATTRIBUTES (TREE_TYPE (fn)));
3773 /* Copy the function parameters. But, DECL_ARGUMENTS on a TEMPLATE_DECL
3774 aren't function parameters; those are the template parameters. */
3775 if (TREE_CODE (clone) != TEMPLATE_DECL)
3777 DECL_ARGUMENTS (clone) = copy_list (DECL_ARGUMENTS (clone));
3778 /* Remove the in-charge parameter. */
3779 if (DECL_HAS_IN_CHARGE_PARM_P (clone))
3781 TREE_CHAIN (DECL_ARGUMENTS (clone))
3782 = TREE_CHAIN (TREE_CHAIN (DECL_ARGUMENTS (clone)));
3783 DECL_HAS_IN_CHARGE_PARM_P (clone) = 0;
3785 /* And the VTT parm, in a complete [cd]tor. */
3786 if (DECL_HAS_VTT_PARM_P (fn))
3788 if (DECL_NEEDS_VTT_PARM_P (clone))
3789 DECL_HAS_VTT_PARM_P (clone) = 1;
3792 TREE_CHAIN (DECL_ARGUMENTS (clone))
3793 = TREE_CHAIN (TREE_CHAIN (DECL_ARGUMENTS (clone)));
3794 DECL_HAS_VTT_PARM_P (clone) = 0;
3798 for (parms = DECL_ARGUMENTS (clone); parms; parms = TREE_CHAIN (parms))
3800 DECL_CONTEXT (parms) = clone;
3801 cxx_dup_lang_specific_decl (parms);
3805 /* Create the RTL for this function. */
3806 SET_DECL_RTL (clone, NULL_RTX);
3807 rest_of_decl_compilation (clone, /*top_level=*/1, at_eof);
3809 /* Make it easy to find the CLONE given the FN. */
3810 TREE_CHAIN (clone) = TREE_CHAIN (fn);
3811 TREE_CHAIN (fn) = clone;
3813 /* If this is a template, handle the DECL_TEMPLATE_RESULT as well. */
3814 if (TREE_CODE (clone) == TEMPLATE_DECL)
3818 DECL_TEMPLATE_RESULT (clone)
3819 = build_clone (DECL_TEMPLATE_RESULT (clone), name);
3820 result = DECL_TEMPLATE_RESULT (clone);
3821 DECL_TEMPLATE_INFO (result) = copy_node (DECL_TEMPLATE_INFO (result));
3822 DECL_TI_TEMPLATE (result) = clone;
3825 note_decl_for_pch (clone);
3830 /* Produce declarations for all appropriate clones of FN. If
3831 UPDATE_METHOD_VEC_P is nonzero, the clones are added to the
3832 CLASTYPE_METHOD_VEC as well. */
3835 clone_function_decl (tree fn, int update_method_vec_p)
3839 /* Avoid inappropriate cloning. */
3841 && DECL_CLONED_FUNCTION (TREE_CHAIN (fn)))
3844 if (DECL_MAYBE_IN_CHARGE_CONSTRUCTOR_P (fn))
3846 /* For each constructor, we need two variants: an in-charge version
3847 and a not-in-charge version. */
3848 clone = build_clone (fn, complete_ctor_identifier);
3849 if (update_method_vec_p)
3850 add_method (DECL_CONTEXT (clone), clone, NULL_TREE);
3851 clone = build_clone (fn, base_ctor_identifier);
3852 if (update_method_vec_p)
3853 add_method (DECL_CONTEXT (clone), clone, NULL_TREE);
3857 gcc_assert (DECL_MAYBE_IN_CHARGE_DESTRUCTOR_P (fn));
3859 /* For each destructor, we need three variants: an in-charge
3860 version, a not-in-charge version, and an in-charge deleting
3861 version. We clone the deleting version first because that
3862 means it will go second on the TYPE_METHODS list -- and that
3863 corresponds to the correct layout order in the virtual
3866 For a non-virtual destructor, we do not build a deleting
3868 if (DECL_VIRTUAL_P (fn))
3870 clone = build_clone (fn, deleting_dtor_identifier);
3871 if (update_method_vec_p)
3872 add_method (DECL_CONTEXT (clone), clone, NULL_TREE);
3874 clone = build_clone (fn, complete_dtor_identifier);
3875 if (update_method_vec_p)
3876 add_method (DECL_CONTEXT (clone), clone, NULL_TREE);
3877 clone = build_clone (fn, base_dtor_identifier);
3878 if (update_method_vec_p)
3879 add_method (DECL_CONTEXT (clone), clone, NULL_TREE);
3882 /* Note that this is an abstract function that is never emitted. */
3883 DECL_ABSTRACT (fn) = 1;
3886 /* DECL is an in charge constructor, which is being defined. This will
3887 have had an in class declaration, from whence clones were
3888 declared. An out-of-class definition can specify additional default
3889 arguments. As it is the clones that are involved in overload
3890 resolution, we must propagate the information from the DECL to its
3894 adjust_clone_args (tree decl)
3898 for (clone = TREE_CHAIN (decl); clone && DECL_CLONED_FUNCTION (clone);
3899 clone = TREE_CHAIN (clone))
3901 tree orig_clone_parms = TYPE_ARG_TYPES (TREE_TYPE (clone));
3902 tree orig_decl_parms = TYPE_ARG_TYPES (TREE_TYPE (decl));
3903 tree decl_parms, clone_parms;
3905 clone_parms = orig_clone_parms;
3907 /* Skip the 'this' parameter. */
3908 orig_clone_parms = TREE_CHAIN (orig_clone_parms);
3909 orig_decl_parms = TREE_CHAIN (orig_decl_parms);
3911 if (DECL_HAS_IN_CHARGE_PARM_P (decl))
3912 orig_decl_parms = TREE_CHAIN (orig_decl_parms);
3913 if (DECL_HAS_VTT_PARM_P (decl))
3914 orig_decl_parms = TREE_CHAIN (orig_decl_parms);
3916 clone_parms = orig_clone_parms;
3917 if (DECL_HAS_VTT_PARM_P (clone))
3918 clone_parms = TREE_CHAIN (clone_parms);
3920 for (decl_parms = orig_decl_parms; decl_parms;
3921 decl_parms = TREE_CHAIN (decl_parms),
3922 clone_parms = TREE_CHAIN (clone_parms))
3924 gcc_assert (same_type_p (TREE_TYPE (decl_parms),
3925 TREE_TYPE (clone_parms)));
3927 if (TREE_PURPOSE (decl_parms) && !TREE_PURPOSE (clone_parms))
3929 /* A default parameter has been added. Adjust the
3930 clone's parameters. */
3931 tree exceptions = TYPE_RAISES_EXCEPTIONS (TREE_TYPE (clone));
3932 tree basetype = TYPE_METHOD_BASETYPE (TREE_TYPE (clone));
3935 clone_parms = orig_decl_parms;
3937 if (DECL_HAS_VTT_PARM_P (clone))
3939 clone_parms = tree_cons (TREE_PURPOSE (orig_clone_parms),
3940 TREE_VALUE (orig_clone_parms),
3942 TREE_TYPE (clone_parms) = TREE_TYPE (orig_clone_parms);
3944 type = build_method_type_directly (basetype,
3945 TREE_TYPE (TREE_TYPE (clone)),
3948 type = build_exception_variant (type, exceptions);
3949 TREE_TYPE (clone) = type;
3951 clone_parms = NULL_TREE;
3955 gcc_assert (!clone_parms);
3959 /* For each of the constructors and destructors in T, create an
3960 in-charge and not-in-charge variant. */
3963 clone_constructors_and_destructors (tree t)
3967 /* If for some reason we don't have a CLASSTYPE_METHOD_VEC, we bail
3969 if (!CLASSTYPE_METHOD_VEC (t))
3972 for (fns = CLASSTYPE_CONSTRUCTORS (t); fns; fns = OVL_NEXT (fns))
3973 clone_function_decl (OVL_CURRENT (fns), /*update_method_vec_p=*/1);
3974 for (fns = CLASSTYPE_DESTRUCTORS (t); fns; fns = OVL_NEXT (fns))
3975 clone_function_decl (OVL_CURRENT (fns), /*update_method_vec_p=*/1);
3978 /* Remove all zero-width bit-fields from T. */
3981 remove_zero_width_bit_fields (tree t)
3985 fieldsp = &TYPE_FIELDS (t);
3988 if (TREE_CODE (*fieldsp) == FIELD_DECL
3989 && DECL_C_BIT_FIELD (*fieldsp)
3990 && DECL_INITIAL (*fieldsp))
3991 *fieldsp = TREE_CHAIN (*fieldsp);
3993 fieldsp = &TREE_CHAIN (*fieldsp);
3997 /* Returns TRUE iff we need a cookie when dynamically allocating an
3998 array whose elements have the indicated class TYPE. */
4001 type_requires_array_cookie (tree type)
4004 bool has_two_argument_delete_p = false;
4006 gcc_assert (CLASS_TYPE_P (type));
4008 /* If there's a non-trivial destructor, we need a cookie. In order
4009 to iterate through the array calling the destructor for each
4010 element, we'll have to know how many elements there are. */
4011 if (TYPE_HAS_NONTRIVIAL_DESTRUCTOR (type))
4014 /* If the usual deallocation function is a two-argument whose second
4015 argument is of type `size_t', then we have to pass the size of
4016 the array to the deallocation function, so we will need to store
4018 fns = lookup_fnfields (TYPE_BINFO (type),
4019 ansi_opname (VEC_DELETE_EXPR),
4021 /* If there are no `operator []' members, or the lookup is
4022 ambiguous, then we don't need a cookie. */
4023 if (!fns || fns == error_mark_node)
4025 /* Loop through all of the functions. */
4026 for (fns = BASELINK_FUNCTIONS (fns); fns; fns = OVL_NEXT (fns))
4031 /* Select the current function. */
4032 fn = OVL_CURRENT (fns);
4033 /* See if this function is a one-argument delete function. If
4034 it is, then it will be the usual deallocation function. */
4035 second_parm = TREE_CHAIN (TYPE_ARG_TYPES (TREE_TYPE (fn)));
4036 if (second_parm == void_list_node)
4038 /* Otherwise, if we have a two-argument function and the second
4039 argument is `size_t', it will be the usual deallocation
4040 function -- unless there is one-argument function, too. */
4041 if (TREE_CHAIN (second_parm) == void_list_node
4042 && same_type_p (TREE_VALUE (second_parm), sizetype))
4043 has_two_argument_delete_p = true;
4046 return has_two_argument_delete_p;
4049 /* Check the validity of the bases and members declared in T. Add any
4050 implicitly-generated functions (like copy-constructors and
4051 assignment operators). Compute various flag bits (like
4052 CLASSTYPE_NON_POD_T) for T. This routine works purely at the C++
4053 level: i.e., independently of the ABI in use. */
4056 check_bases_and_members (tree t)
4058 /* Nonzero if the implicitly generated copy constructor should take
4059 a non-const reference argument. */
4060 int cant_have_const_ctor;
4061 /* Nonzero if the implicitly generated assignment operator
4062 should take a non-const reference argument. */
4063 int no_const_asn_ref;