tree.c revision 258206
1/* Language-dependent node constructors for parse phase of GNU compiler.
2   Copyright (C) 1987, 1988, 1992, 1993, 1994, 1995, 1996, 1997, 1998,
3   1999, 2000, 2001, 2002, 2003, 2004, 2005 Free Software Foundation, Inc.
4   Hacked by Michael Tiemann (tiemann@cygnus.com)
5
6This file is part of GCC.
7
8GCC is free software; you can redistribute it and/or modify
9it under the terms of the GNU General Public License as published by
10the Free Software Foundation; either version 2, or (at your option)
11any later version.
12
13GCC is distributed in the hope that it will be useful,
14but WITHOUT ANY WARRANTY; without even the implied warranty of
15MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
16GNU General Public License for more details.
17
18You should have received a copy of the GNU General Public License
19along with GCC; see the file COPYING.  If not, write to
20the Free Software Foundation, 51 Franklin Street, Fifth Floor,
21Boston, MA 02110-1301, USA.  */
22
23#include "config.h"
24#include "system.h"
25#include "coretypes.h"
26#include "tm.h"
27#include "tree.h"
28#include "cp-tree.h"
29#include "flags.h"
30#include "real.h"
31#include "rtl.h"
32#include "toplev.h"
33#include "insn-config.h"
34#include "integrate.h"
35#include "tree-inline.h"
36#include "debug.h"
37#include "target.h"
38#include "convert.h"
39
40static tree bot_manip (tree *, int *, void *);
41static tree bot_replace (tree *, int *, void *);
42static tree build_cplus_array_type_1 (tree, tree);
43static int list_hash_eq (const void *, const void *);
44static hashval_t list_hash_pieces (tree, tree, tree);
45static hashval_t list_hash (const void *);
46static cp_lvalue_kind lvalue_p_1 (tree, int);
47static tree build_target_expr (tree, tree);
48static tree count_trees_r (tree *, int *, void *);
49static tree verify_stmt_tree_r (tree *, int *, void *);
50static tree build_local_temp (tree);
51
52static tree handle_java_interface_attribute (tree *, tree, tree, int, bool *);
53static tree handle_com_interface_attribute (tree *, tree, tree, int, bool *);
54static tree handle_init_priority_attribute (tree *, tree, tree, int, bool *);
55
56/* If REF is an lvalue, returns the kind of lvalue that REF is.
57   Otherwise, returns clk_none.  If TREAT_CLASS_RVALUES_AS_LVALUES is
58   nonzero, rvalues of class type are considered lvalues.  */
59
60static cp_lvalue_kind
61lvalue_p_1 (tree ref,
62	    int treat_class_rvalues_as_lvalues)
63{
64  cp_lvalue_kind op1_lvalue_kind = clk_none;
65  cp_lvalue_kind op2_lvalue_kind = clk_none;
66
67  if (TREE_CODE (TREE_TYPE (ref)) == REFERENCE_TYPE)
68    return clk_ordinary;
69
70  if (ref == current_class_ptr)
71    return clk_none;
72
73  switch (TREE_CODE (ref))
74    {
75      /* preincrements and predecrements are valid lvals, provided
76	 what they refer to are valid lvals.  */
77    case PREINCREMENT_EXPR:
78    case PREDECREMENT_EXPR:
79    case SAVE_EXPR:
80    case TRY_CATCH_EXPR:
81    case WITH_CLEANUP_EXPR:
82    case REALPART_EXPR:
83    case IMAGPART_EXPR:
84      return lvalue_p_1 (TREE_OPERAND (ref, 0),
85			 treat_class_rvalues_as_lvalues);
86
87    case COMPONENT_REF:
88      op1_lvalue_kind = lvalue_p_1 (TREE_OPERAND (ref, 0),
89				    treat_class_rvalues_as_lvalues);
90      /* Look at the member designator.  */
91      if (!op1_lvalue_kind
92	  /* The "field" can be a FUNCTION_DECL or an OVERLOAD in some
93	     situations.  */
94	  || TREE_CODE (TREE_OPERAND (ref, 1)) != FIELD_DECL)
95	;
96      else if (DECL_C_BIT_FIELD (TREE_OPERAND (ref, 1)))
97	{
98	  /* Clear the ordinary bit.  If this object was a class
99	     rvalue we want to preserve that information.  */
100	  op1_lvalue_kind &= ~clk_ordinary;
101	  /* The lvalue is for a bitfield.  */
102	  op1_lvalue_kind |= clk_bitfield;
103	}
104      else if (DECL_PACKED (TREE_OPERAND (ref, 1)))
105	op1_lvalue_kind |= clk_packed;
106
107      return op1_lvalue_kind;
108
109    case STRING_CST:
110      return clk_ordinary;
111
112    case CONST_DECL:
113    case VAR_DECL:
114      if (TREE_READONLY (ref) && ! TREE_STATIC (ref)
115	  && DECL_LANG_SPECIFIC (ref)
116	  && DECL_IN_AGGR_P (ref))
117	return clk_none;
118    case INDIRECT_REF:
119    case ARRAY_REF:
120    case PARM_DECL:
121    case RESULT_DECL:
122      if (TREE_CODE (TREE_TYPE (ref)) != METHOD_TYPE)
123	return clk_ordinary;
124      break;
125
126      /* A currently unresolved scope ref.  */
127    case SCOPE_REF:
128      gcc_unreachable ();
129    case MAX_EXPR:
130    case MIN_EXPR:
131      /* Disallow <? and >? as lvalues if either argument side-effects.  */
132      if (TREE_SIDE_EFFECTS (TREE_OPERAND (ref, 0))
133	  || TREE_SIDE_EFFECTS (TREE_OPERAND (ref, 1)))
134	return clk_none;
135      op1_lvalue_kind = lvalue_p_1 (TREE_OPERAND (ref, 0),
136				    treat_class_rvalues_as_lvalues);
137      op2_lvalue_kind = lvalue_p_1 (TREE_OPERAND (ref, 1),
138				    treat_class_rvalues_as_lvalues);
139      break;
140
141    case COND_EXPR:
142      op1_lvalue_kind = lvalue_p_1 (TREE_OPERAND (ref, 1),
143				    treat_class_rvalues_as_lvalues);
144      op2_lvalue_kind = lvalue_p_1 (TREE_OPERAND (ref, 2),
145				    treat_class_rvalues_as_lvalues);
146      break;
147
148    case MODIFY_EXPR:
149      return clk_ordinary;
150
151    case COMPOUND_EXPR:
152      return lvalue_p_1 (TREE_OPERAND (ref, 1),
153			 treat_class_rvalues_as_lvalues);
154
155    case TARGET_EXPR:
156      return treat_class_rvalues_as_lvalues ? clk_class : clk_none;
157
158    case VA_ARG_EXPR:
159      return (treat_class_rvalues_as_lvalues
160	      && CLASS_TYPE_P (TREE_TYPE (ref))
161	      ? clk_class : clk_none);
162
163    case CALL_EXPR:
164      /* Any class-valued call would be wrapped in a TARGET_EXPR.  */
165      return clk_none;
166
167    case FUNCTION_DECL:
168      /* All functions (except non-static-member functions) are
169	 lvalues.  */
170      return (DECL_NONSTATIC_MEMBER_FUNCTION_P (ref)
171	      ? clk_none : clk_ordinary);
172
173    case NON_DEPENDENT_EXPR:
174      /* We must consider NON_DEPENDENT_EXPRs to be lvalues so that
175	 things like "&E" where "E" is an expression with a
176	 non-dependent type work. It is safe to be lenient because an
177	 error will be issued when the template is instantiated if "E"
178	 is not an lvalue.  */
179      return clk_ordinary;
180
181    default:
182      break;
183    }
184
185  /* If one operand is not an lvalue at all, then this expression is
186     not an lvalue.  */
187  if (!op1_lvalue_kind || !op2_lvalue_kind)
188    return clk_none;
189
190  /* Otherwise, it's an lvalue, and it has all the odd properties
191     contributed by either operand.  */
192  op1_lvalue_kind = op1_lvalue_kind | op2_lvalue_kind;
193  /* It's not an ordinary lvalue if it involves either a bit-field or
194     a class rvalue.  */
195  if ((op1_lvalue_kind & ~clk_ordinary) != clk_none)
196    op1_lvalue_kind &= ~clk_ordinary;
197  return op1_lvalue_kind;
198}
199
200/* Returns the kind of lvalue that REF is, in the sense of
201   [basic.lval].  This function should really be named lvalue_p; it
202   computes the C++ definition of lvalue.  */
203
204cp_lvalue_kind
205real_lvalue_p (tree ref)
206{
207  return lvalue_p_1 (ref,
208		     /*treat_class_rvalues_as_lvalues=*/0);
209}
210
211/* This differs from real_lvalue_p in that class rvalues are
212   considered lvalues.  */
213
214int
215lvalue_p (tree ref)
216{
217  return
218    (lvalue_p_1 (ref, /*class rvalue ok*/ 1) != clk_none);
219}
220
221/* Test whether DECL is a builtin that may appear in a
222   constant-expression. */
223
224bool
225builtin_valid_in_constant_expr_p (tree decl)
226{
227  /* At present BUILT_IN_CONSTANT_P is the only builtin we're allowing
228     in constant-expressions.  We may want to add other builtins later. */
229  return DECL_IS_BUILTIN_CONSTANT_P (decl);
230}
231
232/* Build a TARGET_EXPR, initializing the DECL with the VALUE.  */
233
234static tree
235build_target_expr (tree decl, tree value)
236{
237  tree t;
238
239  t = build4 (TARGET_EXPR, TREE_TYPE (decl), decl, value,
240	      cxx_maybe_build_cleanup (decl), NULL_TREE);
241  /* We always set TREE_SIDE_EFFECTS so that expand_expr does not
242     ignore the TARGET_EXPR.  If there really turn out to be no
243     side-effects, then the optimizer should be able to get rid of
244     whatever code is generated anyhow.  */
245  TREE_SIDE_EFFECTS (t) = 1;
246
247  return t;
248}
249
250/* Return an undeclared local temporary of type TYPE for use in building a
251   TARGET_EXPR.  */
252
253static tree
254build_local_temp (tree type)
255{
256  tree slot = build_decl (VAR_DECL, NULL_TREE, type);
257  DECL_ARTIFICIAL (slot) = 1;
258  DECL_IGNORED_P (slot) = 1;
259  DECL_CONTEXT (slot) = current_function_decl;
260  layout_decl (slot, 0);
261  return slot;
262}
263
264/* INIT is a CALL_EXPR which needs info about its target.
265   TYPE is the type that this initialization should appear to have.
266
267   Build an encapsulation of the initialization to perform
268   and return it so that it can be processed by language-independent
269   and language-specific expression expanders.  */
270
271tree
272build_cplus_new (tree type, tree init)
273{
274  tree fn;
275  tree slot;
276  tree rval;
277  int is_ctor;
278
279  /* Make sure that we're not trying to create an instance of an
280     abstract class.  */
281  abstract_virtuals_error (NULL_TREE, type);
282
283  if (TREE_CODE (init) != CALL_EXPR && TREE_CODE (init) != AGGR_INIT_EXPR)
284    return convert (type, init);
285
286  fn = TREE_OPERAND (init, 0);
287  is_ctor = (TREE_CODE (fn) == ADDR_EXPR
288	     && TREE_CODE (TREE_OPERAND (fn, 0)) == FUNCTION_DECL
289	     && DECL_CONSTRUCTOR_P (TREE_OPERAND (fn, 0)));
290
291  slot = build_local_temp (type);
292
293  /* We split the CALL_EXPR into its function and its arguments here.
294     Then, in expand_expr, we put them back together.  The reason for
295     this is that this expression might be a default argument
296     expression.  In that case, we need a new temporary every time the
297     expression is used.  That's what break_out_target_exprs does; it
298     replaces every AGGR_INIT_EXPR with a copy that uses a fresh
299     temporary slot.  Then, expand_expr builds up a call-expression
300     using the new slot.  */
301
302  /* If we don't need to use a constructor to create an object of this
303     type, don't mess with AGGR_INIT_EXPR.  */
304  if (is_ctor || TREE_ADDRESSABLE (type))
305    {
306      rval = build3 (AGGR_INIT_EXPR, void_type_node, fn,
307		     TREE_OPERAND (init, 1), slot);
308      TREE_SIDE_EFFECTS (rval) = 1;
309      AGGR_INIT_VIA_CTOR_P (rval) = is_ctor;
310    }
311  else
312    rval = init;
313
314  rval = build_target_expr (slot, rval);
315  TARGET_EXPR_IMPLICIT_P (rval) = 1;
316
317  return rval;
318}
319
320/* Build a TARGET_EXPR using INIT to initialize a new temporary of the
321   indicated TYPE.  */
322
323tree
324build_target_expr_with_type (tree init, tree type)
325{
326  gcc_assert (!VOID_TYPE_P (type));
327
328  if (TREE_CODE (init) == TARGET_EXPR)
329    return init;
330  else if (CLASS_TYPE_P (type) && !TYPE_HAS_TRIVIAL_INIT_REF (type)
331	   && TREE_CODE (init) != COND_EXPR
332	   && TREE_CODE (init) != CONSTRUCTOR
333	   && TREE_CODE (init) != VA_ARG_EXPR)
334    /* We need to build up a copy constructor call.  COND_EXPR is a special
335       case because we already have copies on the arms and we don't want
336       another one here.  A CONSTRUCTOR is aggregate initialization, which
337       is handled separately.  A VA_ARG_EXPR is magic creation of an
338       aggregate; there's no additional work to be done.  */
339    return force_rvalue (init);
340
341  return force_target_expr (type, init);
342}
343
344/* Like the above function, but without the checking.  This function should
345   only be used by code which is deliberately trying to subvert the type
346   system, such as call_builtin_trap.  */
347
348tree
349force_target_expr (tree type, tree init)
350{
351  tree slot;
352
353  gcc_assert (!VOID_TYPE_P (type));
354
355  slot = build_local_temp (type);
356  return build_target_expr (slot, init);
357}
358
359/* Like build_target_expr_with_type, but use the type of INIT.  */
360
361tree
362get_target_expr (tree init)
363{
364  return build_target_expr_with_type (init, TREE_TYPE (init));
365}
366
367/* If EXPR is a bitfield reference, convert it to the declared type of
368   the bitfield, and return the resulting expression.  Otherwise,
369   return EXPR itself.  */
370
371tree
372convert_bitfield_to_declared_type (tree expr)
373{
374  tree bitfield_type;
375
376  bitfield_type = is_bitfield_expr_with_lowered_type (expr);
377  if (bitfield_type)
378    expr = convert_to_integer (TYPE_MAIN_VARIANT (bitfield_type),
379			       expr);
380  return expr;
381}
382
383/* EXPR is being used in an rvalue context.  Return a version of EXPR
384   that is marked as an rvalue.  */
385
386tree
387rvalue (tree expr)
388{
389  tree type;
390
391  if (error_operand_p (expr))
392    return expr;
393
394  /* [basic.lval]
395
396     Non-class rvalues always have cv-unqualified types.  */
397  type = TREE_TYPE (expr);
398  if (!CLASS_TYPE_P (type) && cp_type_quals (type))
399    type = TYPE_MAIN_VARIANT (type);
400
401  if (!processing_template_decl && real_lvalue_p (expr))
402    expr = build1 (NON_LVALUE_EXPR, type, expr);
403  else if (type != TREE_TYPE (expr))
404    expr = build_nop (type, expr);
405
406  return expr;
407}
408
409
410static tree
411build_cplus_array_type_1 (tree elt_type, tree index_type)
412{
413  tree t;
414
415  if (elt_type == error_mark_node || index_type == error_mark_node)
416    return error_mark_node;
417
418  if (dependent_type_p (elt_type)
419      || (index_type
420	  && value_dependent_expression_p (TYPE_MAX_VALUE (index_type))))
421    {
422      t = make_node (ARRAY_TYPE);
423      TREE_TYPE (t) = elt_type;
424      TYPE_DOMAIN (t) = index_type;
425    }
426  else
427    t = build_array_type (elt_type, index_type);
428
429  /* Push these needs up so that initialization takes place
430     more easily.  */
431  TYPE_NEEDS_CONSTRUCTING (t)
432    = TYPE_NEEDS_CONSTRUCTING (TYPE_MAIN_VARIANT (elt_type));
433  TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t)
434    = TYPE_HAS_NONTRIVIAL_DESTRUCTOR (TYPE_MAIN_VARIANT (elt_type));
435  return t;
436}
437
438tree
439build_cplus_array_type (tree elt_type, tree index_type)
440{
441  tree t;
442  int type_quals = cp_type_quals (elt_type);
443
444  if (type_quals != TYPE_UNQUALIFIED)
445    elt_type = cp_build_qualified_type (elt_type, TYPE_UNQUALIFIED);
446
447  t = build_cplus_array_type_1 (elt_type, index_type);
448
449  if (type_quals != TYPE_UNQUALIFIED)
450    t = cp_build_qualified_type (t, type_quals);
451
452  return t;
453}
454
455/* Make a variant of TYPE, qualified with the TYPE_QUALS.  Handles
456   arrays correctly.  In particular, if TYPE is an array of T's, and
457   TYPE_QUALS is non-empty, returns an array of qualified T's.
458
459   FLAGS determines how to deal with illformed qualifications. If
460   tf_ignore_bad_quals is set, then bad qualifications are dropped
461   (this is permitted if TYPE was introduced via a typedef or template
462   type parameter). If bad qualifications are dropped and tf_warning
463   is set, then a warning is issued for non-const qualifications.  If
464   tf_ignore_bad_quals is not set and tf_error is not set, we
465   return error_mark_node. Otherwise, we issue an error, and ignore
466   the qualifications.
467
468   Qualification of a reference type is valid when the reference came
469   via a typedef or template type argument. [dcl.ref] No such
470   dispensation is provided for qualifying a function type.  [dcl.fct]
471   DR 295 queries this and the proposed resolution brings it into line
472   with qualifying a reference.  We implement the DR.  We also behave
473   in a similar manner for restricting non-pointer types.  */
474
475tree
476cp_build_qualified_type_real (tree type,
477			      int type_quals,
478			      tsubst_flags_t complain)
479{
480  tree result;
481  int bad_quals = TYPE_UNQUALIFIED;
482
483  if (type == error_mark_node)
484    return type;
485
486  if (type_quals == cp_type_quals (type))
487    return type;
488
489  if (TREE_CODE (type) == ARRAY_TYPE)
490    {
491      /* In C++, the qualification really applies to the array element
492	 type.  Obtain the appropriately qualified element type.  */
493      tree t;
494      tree element_type
495	= cp_build_qualified_type_real (TREE_TYPE (type),
496					type_quals,
497					complain);
498
499      if (element_type == error_mark_node)
500	return error_mark_node;
501
502      /* See if we already have an identically qualified type.  */
503      for (t = TYPE_MAIN_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
504	if (cp_type_quals (t) == type_quals
505	    && TYPE_NAME (t) == TYPE_NAME (type)
506	    && TYPE_CONTEXT (t) == TYPE_CONTEXT (type))
507	  break;
508
509      if (!t)
510	{
511	  /* Make a new array type, just like the old one, but with the
512	     appropriately qualified element type.  */
513	  t = build_variant_type_copy (type);
514	  TREE_TYPE (t) = element_type;
515	}
516
517      /* Even if we already had this variant, we update
518	 TYPE_NEEDS_CONSTRUCTING and TYPE_HAS_NONTRIVIAL_DESTRUCTOR in case
519	 they changed since the variant was originally created.
520
521	 This seems hokey; if there is some way to use a previous
522	 variant *without* coming through here,
523	 TYPE_NEEDS_CONSTRUCTING will never be updated.  */
524      TYPE_NEEDS_CONSTRUCTING (t)
525	= TYPE_NEEDS_CONSTRUCTING (TYPE_MAIN_VARIANT (element_type));
526      TYPE_HAS_NONTRIVIAL_DESTRUCTOR (t)
527	= TYPE_HAS_NONTRIVIAL_DESTRUCTOR (TYPE_MAIN_VARIANT (element_type));
528      return t;
529    }
530  else if (TYPE_PTRMEMFUNC_P (type))
531    {
532      /* For a pointer-to-member type, we can't just return a
533	 cv-qualified version of the RECORD_TYPE.  If we do, we
534	 haven't changed the field that contains the actual pointer to
535	 a method, and so TYPE_PTRMEMFUNC_FN_TYPE will be wrong.  */
536      tree t;
537
538      t = TYPE_PTRMEMFUNC_FN_TYPE (type);
539      t = cp_build_qualified_type_real (t, type_quals, complain);
540      return build_ptrmemfunc_type (t);
541    }
542
543  /* A reference or method type shall not be cv qualified.
544     [dcl.ref], [dct.fct]  */
545  if (type_quals & (TYPE_QUAL_CONST | TYPE_QUAL_VOLATILE)
546      && (TREE_CODE (type) == REFERENCE_TYPE
547	  || TREE_CODE (type) == METHOD_TYPE))
548    {
549      bad_quals |= type_quals & (TYPE_QUAL_CONST | TYPE_QUAL_VOLATILE);
550      type_quals &= ~(TYPE_QUAL_CONST | TYPE_QUAL_VOLATILE);
551    }
552
553  /* A restrict-qualified type must be a pointer (or reference)
554     to object or incomplete type, or a function type. */
555  if ((type_quals & TYPE_QUAL_RESTRICT)
556      && TREE_CODE (type) != TEMPLATE_TYPE_PARM
557      && TREE_CODE (type) != TYPENAME_TYPE
558      && TREE_CODE (type) != FUNCTION_TYPE
559      && !POINTER_TYPE_P (type))
560    {
561      bad_quals |= TYPE_QUAL_RESTRICT;
562      type_quals &= ~TYPE_QUAL_RESTRICT;
563    }
564
565  if (bad_quals == TYPE_UNQUALIFIED)
566    /*OK*/;
567  else if (!(complain & (tf_error | tf_ignore_bad_quals)))
568    return error_mark_node;
569  else
570    {
571      if (complain & tf_ignore_bad_quals)
572	/* We're not going to warn about constifying things that can't
573	   be constified.  */
574	bad_quals &= ~TYPE_QUAL_CONST;
575      if (bad_quals)
576	{
577	  tree bad_type = build_qualified_type (ptr_type_node, bad_quals);
578
579	  if (!(complain & tf_ignore_bad_quals))
580	    error ("%qV qualifiers cannot be applied to %qT",
581		   bad_type, type);
582	}
583    }
584
585  /* Retrieve (or create) the appropriately qualified variant.  */
586  result = build_qualified_type (type, type_quals);
587
588  /* If this was a pointer-to-method type, and we just made a copy,
589     then we need to unshare the record that holds the cached
590     pointer-to-member-function type, because these will be distinct
591     between the unqualified and qualified types.  */
592  if (result != type
593      && TREE_CODE (type) == POINTER_TYPE
594      && TREE_CODE (TREE_TYPE (type)) == METHOD_TYPE)
595    TYPE_LANG_SPECIFIC (result) = NULL;
596
597  return result;
598}
599
600/* Returns the canonical version of TYPE.  In other words, if TYPE is
601   a typedef, returns the underlying type.  The cv-qualification of
602   the type returned matches the type input; they will always be
603   compatible types.  */
604
605tree
606canonical_type_variant (tree t)
607{
608  return cp_build_qualified_type (TYPE_MAIN_VARIANT (t), cp_type_quals (t));
609}
610
611/* Makes a copy of BINFO and TYPE, which is to be inherited into a
612   graph dominated by T.  If BINFO is NULL, TYPE is a dependent base,
613   and we do a shallow copy.  If BINFO is non-NULL, we do a deep copy.
614   VIRT indicates whether TYPE is inherited virtually or not.
615   IGO_PREV points at the previous binfo of the inheritance graph
616   order chain.  The newly copied binfo's TREE_CHAIN forms this
617   ordering.
618
619   The CLASSTYPE_VBASECLASSES vector of T is constructed in the
620   correct order. That is in the order the bases themselves should be
621   constructed in.
622
623   The BINFO_INHERITANCE of a virtual base class points to the binfo
624   of the most derived type. ??? We could probably change this so that
625   BINFO_INHERITANCE becomes synonymous with BINFO_PRIMARY, and hence
626   remove a field.  They currently can only differ for primary virtual
627   virtual bases.  */
628
629tree
630copy_binfo (tree binfo, tree type, tree t, tree *igo_prev, int virt)
631{
632  tree new_binfo;
633
634  if (virt)
635    {
636      /* See if we've already made this virtual base.  */
637      new_binfo = binfo_for_vbase (type, t);
638      if (new_binfo)
639	return new_binfo;
640    }
641
642  new_binfo = make_tree_binfo (binfo ? BINFO_N_BASE_BINFOS (binfo) : 0);
643  BINFO_TYPE (new_binfo) = type;
644
645  /* Chain it into the inheritance graph.  */
646  TREE_CHAIN (*igo_prev) = new_binfo;
647  *igo_prev = new_binfo;
648
649  if (binfo)
650    {
651      int ix;
652      tree base_binfo;
653
654      gcc_assert (!BINFO_DEPENDENT_BASE_P (binfo));
655      gcc_assert (SAME_BINFO_TYPE_P (BINFO_TYPE (binfo), type));
656
657      BINFO_OFFSET (new_binfo) = BINFO_OFFSET (binfo);
658      BINFO_VIRTUALS (new_binfo) = BINFO_VIRTUALS (binfo);
659
660      /* We do not need to copy the accesses, as they are read only.  */
661      BINFO_BASE_ACCESSES (new_binfo) = BINFO_BASE_ACCESSES (binfo);
662
663      /* Recursively copy base binfos of BINFO.  */
664      for (ix = 0; BINFO_BASE_ITERATE (binfo, ix, base_binfo); ix++)
665	{
666	  tree new_base_binfo;
667
668	  gcc_assert (!BINFO_DEPENDENT_BASE_P (base_binfo));
669	  new_base_binfo = copy_binfo (base_binfo, BINFO_TYPE (base_binfo),
670				       t, igo_prev,
671				       BINFO_VIRTUAL_P (base_binfo));
672
673	  if (!BINFO_INHERITANCE_CHAIN (new_base_binfo))
674	    BINFO_INHERITANCE_CHAIN (new_base_binfo) = new_binfo;
675	  BINFO_BASE_APPEND (new_binfo, new_base_binfo);
676	}
677    }
678  else
679    BINFO_DEPENDENT_BASE_P (new_binfo) = 1;
680
681  if (virt)
682    {
683      /* Push it onto the list after any virtual bases it contains
684	 will have been pushed.  */
685      VEC_quick_push (tree, CLASSTYPE_VBASECLASSES (t), new_binfo);
686      BINFO_VIRTUAL_P (new_binfo) = 1;
687      BINFO_INHERITANCE_CHAIN (new_binfo) = TYPE_BINFO (t);
688    }
689
690  return new_binfo;
691}
692
693/* Hashing of lists so that we don't make duplicates.
694   The entry point is `list_hash_canon'.  */
695
696/* Now here is the hash table.  When recording a list, it is added
697   to the slot whose index is the hash code mod the table size.
698   Note that the hash table is used for several kinds of lists.
699   While all these live in the same table, they are completely independent,
700   and the hash code is computed differently for each of these.  */
701
702static GTY ((param_is (union tree_node))) htab_t list_hash_table;
703
704struct list_proxy
705{
706  tree purpose;
707  tree value;
708  tree chain;
709};
710
711/* Compare ENTRY (an entry in the hash table) with DATA (a list_proxy
712   for a node we are thinking about adding).  */
713
714static int
715list_hash_eq (const void* entry, const void* data)
716{
717  tree t = (tree) entry;
718  struct list_proxy *proxy = (struct list_proxy *) data;
719
720  return (TREE_VALUE (t) == proxy->value
721	  && TREE_PURPOSE (t) == proxy->purpose
722	  && TREE_CHAIN (t) == proxy->chain);
723}
724
725/* Compute a hash code for a list (chain of TREE_LIST nodes
726   with goodies in the TREE_PURPOSE, TREE_VALUE, and bits of the
727   TREE_COMMON slots), by adding the hash codes of the individual entries.  */
728
729static hashval_t
730list_hash_pieces (tree purpose, tree value, tree chain)
731{
732  hashval_t hashcode = 0;
733
734  if (chain)
735    hashcode += TREE_HASH (chain);
736
737  if (value)
738    hashcode += TREE_HASH (value);
739  else
740    hashcode += 1007;
741  if (purpose)
742    hashcode += TREE_HASH (purpose);
743  else
744    hashcode += 1009;
745  return hashcode;
746}
747
748/* Hash an already existing TREE_LIST.  */
749
750static hashval_t
751list_hash (const void* p)
752{
753  tree t = (tree) p;
754  return list_hash_pieces (TREE_PURPOSE (t),
755			   TREE_VALUE (t),
756			   TREE_CHAIN (t));
757}
758
759/* Given list components PURPOSE, VALUE, AND CHAIN, return the canonical
760   object for an identical list if one already exists.  Otherwise, build a
761   new one, and record it as the canonical object.  */
762
763tree
764hash_tree_cons (tree purpose, tree value, tree chain)
765{
766  int hashcode = 0;
767  void **slot;
768  struct list_proxy proxy;
769
770  /* Hash the list node.  */
771  hashcode = list_hash_pieces (purpose, value, chain);
772  /* Create a proxy for the TREE_LIST we would like to create.  We
773     don't actually create it so as to avoid creating garbage.  */
774  proxy.purpose = purpose;
775  proxy.value = value;
776  proxy.chain = chain;
777  /* See if it is already in the table.  */
778  slot = htab_find_slot_with_hash (list_hash_table, &proxy, hashcode,
779				   INSERT);
780  /* If not, create a new node.  */
781  if (!*slot)
782    *slot = tree_cons (purpose, value, chain);
783  return (tree) *slot;
784}
785
786/* Constructor for hashed lists.  */
787
788tree
789hash_tree_chain (tree value, tree chain)
790{
791  return hash_tree_cons (NULL_TREE, value, chain);
792}
793
794void
795debug_binfo (tree elem)
796{
797  HOST_WIDE_INT n;
798  tree virtuals;
799
800  fprintf (stderr, "type \"%s\", offset = " HOST_WIDE_INT_PRINT_DEC
801	   "\nvtable type:\n",
802	   TYPE_NAME_STRING (BINFO_TYPE (elem)),
803	   TREE_INT_CST_LOW (BINFO_OFFSET (elem)));
804  debug_tree (BINFO_TYPE (elem));
805  if (BINFO_VTABLE (elem))
806    fprintf (stderr, "vtable decl \"%s\"\n",
807	     IDENTIFIER_POINTER (DECL_NAME (get_vtbl_decl_for_binfo (elem))));
808  else
809    fprintf (stderr, "no vtable decl yet\n");
810  fprintf (stderr, "virtuals:\n");
811  virtuals = BINFO_VIRTUALS (elem);
812  n = 0;
813
814  while (virtuals)
815    {
816      tree fndecl = TREE_VALUE (virtuals);
817      fprintf (stderr, "%s [%ld =? %ld]\n",
818	       IDENTIFIER_POINTER (DECL_ASSEMBLER_NAME (fndecl)),
819	       (long) n, (long) TREE_INT_CST_LOW (DECL_VINDEX (fndecl)));
820      ++n;
821      virtuals = TREE_CHAIN (virtuals);
822    }
823}
824
825/* Build a representation for the qualified name SCOPE::NAME.  TYPE is
826   the type of the result expression, if known, or NULL_TREE if the
827   resulting expression is type-dependent.  If TEMPLATE_P is true,
828   NAME is known to be a template because the user explicitly used the
829   "template" keyword after the "::".
830
831   All SCOPE_REFs should be built by use of this function.  */
832
833tree
834build_qualified_name (tree type, tree scope, tree name, bool template_p)
835{
836  tree t;
837  if (type == error_mark_node
838      || scope == error_mark_node
839      || name == error_mark_node)
840    return error_mark_node;
841  t = build2 (SCOPE_REF, type, scope, name);
842  QUALIFIED_NAME_IS_TEMPLATE (t) = template_p;
843  return t;
844}
845
846/* Returns non-zero if X is an expression for a (possibly overloaded)
847   function.  If "f" is a function or function template, "f", "c->f",
848   "c.f", "C::f", and "f<int>" will all be considered possibly
849   overloaded functions.  Returns 2 if the function is actually
850   overloaded, i.e., if it is impossible to know the the type of the
851   function without performing overload resolution.  */
852
853int
854is_overloaded_fn (tree x)
855{
856  /* A baselink is also considered an overloaded function.  */
857  if (TREE_CODE (x) == OFFSET_REF
858      || TREE_CODE (x) == COMPONENT_REF)
859    x = TREE_OPERAND (x, 1);
860  if (BASELINK_P (x))
861    x = BASELINK_FUNCTIONS (x);
862  if (TREE_CODE (x) == TEMPLATE_ID_EXPR
863      || DECL_FUNCTION_TEMPLATE_P (OVL_CURRENT (x))
864      || (TREE_CODE (x) == OVERLOAD && OVL_CHAIN (x)))
865    return 2;
866  return  (TREE_CODE (x) == FUNCTION_DECL
867	   || TREE_CODE (x) == OVERLOAD);
868}
869
870/* Returns true iff X is an expression for an overloaded function
871   whose type cannot be known without performing overload
872   resolution.  */
873
874bool
875really_overloaded_fn (tree x)
876{
877  return is_overloaded_fn (x) == 2;
878}
879
880tree
881get_first_fn (tree from)
882{
883  gcc_assert (is_overloaded_fn (from));
884  /* A baselink is also considered an overloaded function.  */
885  if (TREE_CODE (from) == COMPONENT_REF)
886    from = TREE_OPERAND (from, 1);
887  if (BASELINK_P (from))
888    from = BASELINK_FUNCTIONS (from);
889  return OVL_CURRENT (from);
890}
891
892/* Return a new OVL node, concatenating it with the old one.  */
893
894tree
895ovl_cons (tree decl, tree chain)
896{
897  tree result = make_node (OVERLOAD);
898  TREE_TYPE (result) = unknown_type_node;
899  OVL_FUNCTION (result) = decl;
900  TREE_CHAIN (result) = chain;
901
902  return result;
903}
904
905/* Build a new overloaded function. If this is the first one,
906   just return it; otherwise, ovl_cons the _DECLs */
907
908tree
909build_overload (tree decl, tree chain)
910{
911  if (! chain && TREE_CODE (decl) != TEMPLATE_DECL)
912    return decl;
913  if (chain && TREE_CODE (chain) != OVERLOAD)
914    chain = ovl_cons (chain, NULL_TREE);
915  return ovl_cons (decl, chain);
916}
917
918
919#define PRINT_RING_SIZE 4
920
921const char *
922cxx_printable_name (tree decl, int v)
923{
924  static tree decl_ring[PRINT_RING_SIZE];
925  static char *print_ring[PRINT_RING_SIZE];
926  static int ring_counter;
927  int i;
928
929  /* Only cache functions.  */
930  if (v < 2
931      || TREE_CODE (decl) != FUNCTION_DECL
932      || DECL_LANG_SPECIFIC (decl) == 0)
933    return lang_decl_name (decl, v);
934
935  /* See if this print name is lying around.  */
936  for (i = 0; i < PRINT_RING_SIZE; i++)
937    if (decl_ring[i] == decl)
938      /* yes, so return it.  */
939      return print_ring[i];
940
941  if (++ring_counter == PRINT_RING_SIZE)
942    ring_counter = 0;
943
944  if (current_function_decl != NULL_TREE)
945    {
946      if (decl_ring[ring_counter] == current_function_decl)
947	ring_counter += 1;
948      if (ring_counter == PRINT_RING_SIZE)
949	ring_counter = 0;
950      gcc_assert (decl_ring[ring_counter] != current_function_decl);
951    }
952
953  if (print_ring[ring_counter])
954    free (print_ring[ring_counter]);
955
956  print_ring[ring_counter] = xstrdup (lang_decl_name (decl, v));
957  decl_ring[ring_counter] = decl;
958  return print_ring[ring_counter];
959}
960
961/* Build the FUNCTION_TYPE or METHOD_TYPE which may throw exceptions
962   listed in RAISES.  */
963
964tree
965build_exception_variant (tree type, tree raises)
966{
967  tree v = TYPE_MAIN_VARIANT (type);
968  int type_quals = TYPE_QUALS (type);
969
970  for (; v; v = TYPE_NEXT_VARIANT (v))
971    if (check_qualified_type (v, type, type_quals)
972	&& comp_except_specs (raises, TYPE_RAISES_EXCEPTIONS (v), 1))
973      return v;
974
975  /* Need to build a new variant.  */
976  v = build_variant_type_copy (type);
977  TYPE_RAISES_EXCEPTIONS (v) = raises;
978  return v;
979}
980
981/* Given a TEMPLATE_TEMPLATE_PARM node T, create a new
982   BOUND_TEMPLATE_TEMPLATE_PARM bound with NEWARGS as its template
983   arguments.  */
984
985tree
986bind_template_template_parm (tree t, tree newargs)
987{
988  tree decl = TYPE_NAME (t);
989  tree t2;
990
991  t2 = make_aggr_type (BOUND_TEMPLATE_TEMPLATE_PARM);
992  decl = build_decl (TYPE_DECL, DECL_NAME (decl), NULL_TREE);
993
994  /* These nodes have to be created to reflect new TYPE_DECL and template
995     arguments.  */
996  TEMPLATE_TYPE_PARM_INDEX (t2) = copy_node (TEMPLATE_TYPE_PARM_INDEX (t));
997  TEMPLATE_PARM_DECL (TEMPLATE_TYPE_PARM_INDEX (t2)) = decl;
998  TEMPLATE_TEMPLATE_PARM_TEMPLATE_INFO (t2)
999    = tree_cons (TEMPLATE_TEMPLATE_PARM_TEMPLATE_DECL (t),
1000		 newargs, NULL_TREE);
1001
1002  TREE_TYPE (decl) = t2;
1003  TYPE_NAME (t2) = decl;
1004  TYPE_STUB_DECL (t2) = decl;
1005  TYPE_SIZE (t2) = 0;
1006
1007  return t2;
1008}
1009
1010/* Called from count_trees via walk_tree.  */
1011
1012static tree
1013count_trees_r (tree *tp, int *walk_subtrees, void *data)
1014{
1015  ++*((int *) data);
1016
1017  if (TYPE_P (*tp))
1018    *walk_subtrees = 0;
1019
1020  return NULL_TREE;
1021}
1022
1023/* Debugging function for measuring the rough complexity of a tree
1024   representation.  */
1025
1026int
1027count_trees (tree t)
1028{
1029  int n_trees = 0;
1030  walk_tree_without_duplicates (&t, count_trees_r, &n_trees);
1031  return n_trees;
1032}
1033
1034/* Called from verify_stmt_tree via walk_tree.  */
1035
1036static tree
1037verify_stmt_tree_r (tree* tp,
1038		    int* walk_subtrees ATTRIBUTE_UNUSED ,
1039		    void* data)
1040{
1041  tree t = *tp;
1042  htab_t *statements = (htab_t *) data;
1043  void **slot;
1044
1045  if (!STATEMENT_CODE_P (TREE_CODE (t)))
1046    return NULL_TREE;
1047
1048  /* If this statement is already present in the hash table, then
1049     there is a circularity in the statement tree.  */
1050  gcc_assert (!htab_find (*statements, t));
1051
1052  slot = htab_find_slot (*statements, t, INSERT);
1053  *slot = t;
1054
1055  return NULL_TREE;
1056}
1057
1058/* Debugging function to check that the statement T has not been
1059   corrupted.  For now, this function simply checks that T contains no
1060   circularities.  */
1061
1062void
1063verify_stmt_tree (tree t)
1064{
1065  htab_t statements;
1066  statements = htab_create (37, htab_hash_pointer, htab_eq_pointer, NULL);
1067  walk_tree (&t, verify_stmt_tree_r, &statements, NULL);
1068  htab_delete (statements);
1069}
1070
1071/* Check if the type T depends on a type with no linkage and if so, return
1072   it.  If RELAXED_P then do not consider a class type declared within
1073   a TREE_PUBLIC function to have no linkage.  */
1074
1075tree
1076no_linkage_check (tree t, bool relaxed_p)
1077{
1078  tree r;
1079
1080  /* There's no point in checking linkage on template functions; we
1081     can't know their complete types.  */
1082  if (processing_template_decl)
1083    return NULL_TREE;
1084
1085  switch (TREE_CODE (t))
1086    {
1087      tree fn;
1088
1089    case RECORD_TYPE:
1090      if (TYPE_PTRMEMFUNC_P (t))
1091	goto ptrmem;
1092      /* Fall through.  */
1093    case UNION_TYPE:
1094      if (!CLASS_TYPE_P (t))
1095	return NULL_TREE;
1096      /* Fall through.  */
1097    case ENUMERAL_TYPE:
1098      if (TYPE_ANONYMOUS_P (t))
1099	return t;
1100      fn = decl_function_context (TYPE_MAIN_DECL (t));
1101      if (fn && (!relaxed_p || !TREE_PUBLIC (fn)))
1102	return t;
1103      return NULL_TREE;
1104
1105    case ARRAY_TYPE:
1106    case POINTER_TYPE:
1107    case REFERENCE_TYPE:
1108      return no_linkage_check (TREE_TYPE (t), relaxed_p);
1109
1110    case OFFSET_TYPE:
1111    ptrmem:
1112      r = no_linkage_check (TYPE_PTRMEM_POINTED_TO_TYPE (t),
1113			    relaxed_p);
1114      if (r)
1115	return r;
1116      return no_linkage_check (TYPE_PTRMEM_CLASS_TYPE (t), relaxed_p);
1117
1118    case METHOD_TYPE:
1119      r = no_linkage_check (TYPE_METHOD_BASETYPE (t), relaxed_p);
1120      if (r)
1121	return r;
1122      /* Fall through.  */
1123    case FUNCTION_TYPE:
1124      {
1125	tree parm;
1126	for (parm = TYPE_ARG_TYPES (t);
1127	     parm && parm != void_list_node;
1128	     parm = TREE_CHAIN (parm))
1129	  {
1130	    r = no_linkage_check (TREE_VALUE (parm), relaxed_p);
1131	    if (r)
1132	      return r;
1133	  }
1134	return no_linkage_check (TREE_TYPE (t), relaxed_p);
1135      }
1136
1137    default:
1138      return NULL_TREE;
1139    }
1140}
1141
1142#ifdef GATHER_STATISTICS
1143extern int depth_reached;
1144#endif
1145
1146void
1147cxx_print_statistics (void)
1148{
1149  print_search_statistics ();
1150  print_class_statistics ();
1151#ifdef GATHER_STATISTICS
1152  fprintf (stderr, "maximum template instantiation depth reached: %d\n",
1153	   depth_reached);
1154#endif
1155}
1156
1157/* Return, as an INTEGER_CST node, the number of elements for TYPE
1158   (which is an ARRAY_TYPE).  This counts only elements of the top
1159   array.  */
1160
1161tree
1162array_type_nelts_top (tree type)
1163{
1164  return fold_build2 (PLUS_EXPR, sizetype,
1165		      array_type_nelts (type),
1166		      integer_one_node);
1167}
1168
1169/* Return, as an INTEGER_CST node, the number of elements for TYPE
1170   (which is an ARRAY_TYPE).  This one is a recursive count of all
1171   ARRAY_TYPEs that are clumped together.  */
1172
1173tree
1174array_type_nelts_total (tree type)
1175{
1176  tree sz = array_type_nelts_top (type);
1177  type = TREE_TYPE (type);
1178  while (TREE_CODE (type) == ARRAY_TYPE)
1179    {
1180      tree n = array_type_nelts_top (type);
1181      sz = fold_build2 (MULT_EXPR, sizetype, sz, n);
1182      type = TREE_TYPE (type);
1183    }
1184  return sz;
1185}
1186
1187/* Called from break_out_target_exprs via mapcar.  */
1188
1189static tree
1190bot_manip (tree* tp, int* walk_subtrees, void* data)
1191{
1192  splay_tree target_remap = ((splay_tree) data);
1193  tree t = *tp;
1194
1195  if (!TYPE_P (t) && TREE_CONSTANT (t))
1196    {
1197      /* There can't be any TARGET_EXPRs or their slot variables below
1198	 this point.  We used to check !TREE_SIDE_EFFECTS, but then we
1199	 failed to copy an ADDR_EXPR of the slot VAR_DECL.  */
1200      *walk_subtrees = 0;
1201      return NULL_TREE;
1202    }
1203  if (TREE_CODE (t) == TARGET_EXPR)
1204    {
1205      tree u;
1206
1207      if (TREE_CODE (TREE_OPERAND (t, 1)) == AGGR_INIT_EXPR)
1208	u = build_cplus_new
1209	  (TREE_TYPE (t), break_out_target_exprs (TREE_OPERAND (t, 1)));
1210      else
1211	u = build_target_expr_with_type
1212	  (break_out_target_exprs (TREE_OPERAND (t, 1)), TREE_TYPE (t));
1213
1214      /* Map the old variable to the new one.  */
1215      splay_tree_insert (target_remap,
1216			 (splay_tree_key) TREE_OPERAND (t, 0),
1217			 (splay_tree_value) TREE_OPERAND (u, 0));
1218
1219      /* Replace the old expression with the new version.  */
1220      *tp = u;
1221      /* We don't have to go below this point; the recursive call to
1222	 break_out_target_exprs will have handled anything below this
1223	 point.  */
1224      *walk_subtrees = 0;
1225      return NULL_TREE;
1226    }
1227
1228  /* Make a copy of this node.  */
1229  return copy_tree_r (tp, walk_subtrees, NULL);
1230}
1231
1232/* Replace all remapped VAR_DECLs in T with their new equivalents.
1233   DATA is really a splay-tree mapping old variables to new
1234   variables.  */
1235
1236static tree
1237bot_replace (tree* t,
1238	     int* walk_subtrees ATTRIBUTE_UNUSED ,
1239	     void* data)
1240{
1241  splay_tree target_remap = ((splay_tree) data);
1242
1243  if (TREE_CODE (*t) == VAR_DECL)
1244    {
1245      splay_tree_node n = splay_tree_lookup (target_remap,
1246					     (splay_tree_key) *t);
1247      if (n)
1248	*t = (tree) n->value;
1249    }
1250
1251  return NULL_TREE;
1252}
1253
1254/* When we parse a default argument expression, we may create
1255   temporary variables via TARGET_EXPRs.  When we actually use the
1256   default-argument expression, we make a copy of the expression, but
1257   we must replace the temporaries with appropriate local versions.  */
1258
1259tree
1260break_out_target_exprs (tree t)
1261{
1262  static int target_remap_count;
1263  static splay_tree target_remap;
1264
1265  if (!target_remap_count++)
1266    target_remap = splay_tree_new (splay_tree_compare_pointers,
1267				   /*splay_tree_delete_key_fn=*/NULL,
1268				   /*splay_tree_delete_value_fn=*/NULL);
1269  walk_tree (&t, bot_manip, target_remap, NULL);
1270  walk_tree (&t, bot_replace, target_remap, NULL);
1271
1272  if (!--target_remap_count)
1273    {
1274      splay_tree_delete (target_remap);
1275      target_remap = NULL;
1276    }
1277
1278  return t;
1279}
1280
1281/* Similar to `build_nt', but for template definitions of dependent
1282   expressions  */
1283
1284tree
1285build_min_nt (enum tree_code code, ...)
1286{
1287  tree t;
1288  int length;
1289  int i;
1290  va_list p;
1291
1292  va_start (p, code);
1293
1294  t = make_node (code);
1295  length = TREE_CODE_LENGTH (code);
1296
1297  for (i = 0; i < length; i++)
1298    {
1299      tree x = va_arg (p, tree);
1300      TREE_OPERAND (t, i) = x;
1301    }
1302
1303  va_end (p);
1304  return t;
1305}
1306
1307/* Similar to `build', but for template definitions.  */
1308
1309tree
1310build_min (enum tree_code code, tree tt, ...)
1311{
1312  tree t;
1313  int length;
1314  int i;
1315  va_list p;
1316
1317  va_start (p, tt);
1318
1319  t = make_node (code);
1320  length = TREE_CODE_LENGTH (code);
1321  TREE_TYPE (t) = tt;
1322
1323  for (i = 0; i < length; i++)
1324    {
1325      tree x = va_arg (p, tree);
1326      TREE_OPERAND (t, i) = x;
1327      if (x && !TYPE_P (x) && TREE_SIDE_EFFECTS (x))
1328	TREE_SIDE_EFFECTS (t) = 1;
1329    }
1330
1331  va_end (p);
1332  return t;
1333}
1334
1335/* Similar to `build', but for template definitions of non-dependent
1336   expressions. NON_DEP is the non-dependent expression that has been
1337   built.  */
1338
1339tree
1340build_min_non_dep (enum tree_code code, tree non_dep, ...)
1341{
1342  tree t;
1343  int length;
1344  int i;
1345  va_list p;
1346
1347  va_start (p, non_dep);
1348
1349  t = make_node (code);
1350  length = TREE_CODE_LENGTH (code);
1351  TREE_TYPE (t) = TREE_TYPE (non_dep);
1352  TREE_SIDE_EFFECTS (t) = TREE_SIDE_EFFECTS (non_dep);
1353
1354  for (i = 0; i < length; i++)
1355    {
1356      tree x = va_arg (p, tree);
1357      TREE_OPERAND (t, i) = x;
1358    }
1359
1360  if (code == COMPOUND_EXPR && TREE_CODE (non_dep) != COMPOUND_EXPR)
1361    /* This should not be considered a COMPOUND_EXPR, because it
1362       resolves to an overload.  */
1363    COMPOUND_EXPR_OVERLOADED (t) = 1;
1364
1365  va_end (p);
1366  return t;
1367}
1368
1369tree
1370get_type_decl (tree t)
1371{
1372  if (TREE_CODE (t) == TYPE_DECL)
1373    return t;
1374  if (TYPE_P (t))
1375    return TYPE_STUB_DECL (t);
1376  gcc_assert (t == error_mark_node);
1377  return t;
1378}
1379
1380/* Returns the namespace that contains DECL, whether directly or
1381   indirectly.  */
1382
1383tree
1384decl_namespace_context (tree decl)
1385{
1386  while (1)
1387    {
1388      if (TREE_CODE (decl) == NAMESPACE_DECL)
1389	return decl;
1390      else if (TYPE_P (decl))
1391	decl = CP_DECL_CONTEXT (TYPE_MAIN_DECL (decl));
1392      else
1393	decl = CP_DECL_CONTEXT (decl);
1394    }
1395}
1396
1397/* Returns true if decl is within an anonymous namespace, however deeply
1398   nested, or false otherwise.  */
1399
1400bool
1401decl_anon_ns_mem_p (tree decl)
1402{
1403  while (1)
1404    {
1405      if (decl == NULL_TREE || decl == error_mark_node)
1406	return false;
1407      if (TREE_CODE (decl) == NAMESPACE_DECL
1408	  && DECL_NAME (decl) == NULL_TREE)
1409	return true;
1410      /* Classes and namespaces inside anonymous namespaces have
1411         TREE_PUBLIC == 0, so we can shortcut the search.  */
1412      else if (TYPE_P (decl))
1413	return (TREE_PUBLIC (TYPE_NAME (decl)) == 0);
1414      else if (TREE_CODE (decl) == NAMESPACE_DECL)
1415	return (TREE_PUBLIC (decl) == 0);
1416      else
1417	decl = DECL_CONTEXT (decl);
1418    }
1419}
1420
1421/* Return truthvalue of whether T1 is the same tree structure as T2.
1422   Return 1 if they are the same. Return 0 if they are different.  */
1423
1424bool
1425cp_tree_equal (tree t1, tree t2)
1426{
1427  enum tree_code code1, code2;
1428
1429  if (t1 == t2)
1430    return true;
1431  if (!t1 || !t2)
1432    return false;
1433
1434  for (code1 = TREE_CODE (t1);
1435       code1 == NOP_EXPR || code1 == CONVERT_EXPR
1436	 || code1 == NON_LVALUE_EXPR;
1437       code1 = TREE_CODE (t1))
1438    t1 = TREE_OPERAND (t1, 0);
1439  for (code2 = TREE_CODE (t2);
1440       code2 == NOP_EXPR || code2 == CONVERT_EXPR
1441	 || code1 == NON_LVALUE_EXPR;
1442       code2 = TREE_CODE (t2))
1443    t2 = TREE_OPERAND (t2, 0);
1444
1445  /* They might have become equal now.  */
1446  if (t1 == t2)
1447    return true;
1448
1449  if (code1 != code2)
1450    return false;
1451
1452  switch (code1)
1453    {
1454    case INTEGER_CST:
1455      return TREE_INT_CST_LOW (t1) == TREE_INT_CST_LOW (t2)
1456	&& TREE_INT_CST_HIGH (t1) == TREE_INT_CST_HIGH (t2);
1457
1458    case REAL_CST:
1459      return REAL_VALUES_EQUAL (TREE_REAL_CST (t1), TREE_REAL_CST (t2));
1460
1461    case STRING_CST:
1462      return TREE_STRING_LENGTH (t1) == TREE_STRING_LENGTH (t2)
1463	&& !memcmp (TREE_STRING_POINTER (t1), TREE_STRING_POINTER (t2),
1464		    TREE_STRING_LENGTH (t1));
1465
1466    case COMPLEX_CST:
1467      return cp_tree_equal (TREE_REALPART (t1), TREE_REALPART (t2))
1468	&& cp_tree_equal (TREE_IMAGPART (t1), TREE_IMAGPART (t2));
1469
1470    case CONSTRUCTOR:
1471      /* We need to do this when determining whether or not two
1472	 non-type pointer to member function template arguments
1473	 are the same.  */
1474      if (!(same_type_p (TREE_TYPE (t1), TREE_TYPE (t2))
1475	    /* The first operand is RTL.  */
1476	    && TREE_OPERAND (t1, 0) == TREE_OPERAND (t2, 0)))
1477	return false;
1478      return cp_tree_equal (TREE_OPERAND (t1, 1), TREE_OPERAND (t2, 1));
1479
1480    case TREE_LIST:
1481      if (!cp_tree_equal (TREE_PURPOSE (t1), TREE_PURPOSE (t2)))
1482	return false;
1483      if (!cp_tree_equal (TREE_VALUE (t1), TREE_VALUE (t2)))
1484	return false;
1485      return cp_tree_equal (TREE_CHAIN (t1), TREE_CHAIN (t2));
1486
1487    case SAVE_EXPR:
1488      return cp_tree_equal (TREE_OPERAND (t1, 0), TREE_OPERAND (t2, 0));
1489
1490    case CALL_EXPR:
1491      if (!cp_tree_equal (TREE_OPERAND (t1, 0), TREE_OPERAND (t2, 0)))
1492	return false;
1493      return cp_tree_equal (TREE_OPERAND (t1, 1), TREE_OPERAND (t2, 1));
1494
1495    case TARGET_EXPR:
1496      {
1497	tree o1 = TREE_OPERAND (t1, 0);
1498	tree o2 = TREE_OPERAND (t2, 0);
1499
1500	/* Special case: if either target is an unallocated VAR_DECL,
1501	   it means that it's going to be unified with whatever the
1502	   TARGET_EXPR is really supposed to initialize, so treat it
1503	   as being equivalent to anything.  */
1504	if (TREE_CODE (o1) == VAR_DECL && DECL_NAME (o1) == NULL_TREE
1505	    && !DECL_RTL_SET_P (o1))
1506	  /*Nop*/;
1507	else if (TREE_CODE (o2) == VAR_DECL && DECL_NAME (o2) == NULL_TREE
1508		 && !DECL_RTL_SET_P (o2))
1509	  /*Nop*/;
1510	else if (!cp_tree_equal (o1, o2))
1511	  return false;
1512
1513	return cp_tree_equal (TREE_OPERAND (t1, 1), TREE_OPERAND (t2, 1));
1514      }
1515
1516    case WITH_CLEANUP_EXPR:
1517      if (!cp_tree_equal (TREE_OPERAND (t1, 0), TREE_OPERAND (t2, 0)))
1518	return false;
1519      return cp_tree_equal (TREE_OPERAND (t1, 1), TREE_OPERAND (t1, 1));
1520
1521    case COMPONENT_REF:
1522      if (TREE_OPERAND (t1, 1) != TREE_OPERAND (t2, 1))
1523	return false;
1524      return cp_tree_equal (TREE_OPERAND (t1, 0), TREE_OPERAND (t2, 0));
1525
1526    case VAR_DECL:
1527    case PARM_DECL:
1528    case CONST_DECL:
1529    case FUNCTION_DECL:
1530    case TEMPLATE_DECL:
1531    case IDENTIFIER_NODE:
1532    case SSA_NAME:
1533      return false;
1534
1535    case BASELINK:
1536      return (BASELINK_BINFO (t1) == BASELINK_BINFO (t2)
1537	      && BASELINK_ACCESS_BINFO (t1) == BASELINK_ACCESS_BINFO (t2)
1538	      && cp_tree_equal (BASELINK_FUNCTIONS (t1),
1539				BASELINK_FUNCTIONS (t2)));
1540
1541    case TEMPLATE_PARM_INDEX:
1542      return (TEMPLATE_PARM_IDX (t1) == TEMPLATE_PARM_IDX (t2)
1543	      && TEMPLATE_PARM_LEVEL (t1) == TEMPLATE_PARM_LEVEL (t2)
1544	      && same_type_p (TREE_TYPE (TEMPLATE_PARM_DECL (t1)),
1545			      TREE_TYPE (TEMPLATE_PARM_DECL (t2))));
1546
1547    case TEMPLATE_ID_EXPR:
1548      {
1549	unsigned ix;
1550	tree vec1, vec2;
1551
1552	if (!cp_tree_equal (TREE_OPERAND (t1, 0), TREE_OPERAND (t2, 0)))
1553	  return false;
1554	vec1 = TREE_OPERAND (t1, 1);
1555	vec2 = TREE_OPERAND (t2, 1);
1556
1557	if (!vec1 || !vec2)
1558	  return !vec1 && !vec2;
1559
1560	if (TREE_VEC_LENGTH (vec1) != TREE_VEC_LENGTH (vec2))
1561	  return false;
1562
1563	for (ix = TREE_VEC_LENGTH (vec1); ix--;)
1564	  if (!cp_tree_equal (TREE_VEC_ELT (vec1, ix),
1565			      TREE_VEC_ELT (vec2, ix)))
1566	    return false;
1567
1568	return true;
1569      }
1570
1571    case SIZEOF_EXPR:
1572    case ALIGNOF_EXPR:
1573      {
1574	tree o1 = TREE_OPERAND (t1, 0);
1575	tree o2 = TREE_OPERAND (t2, 0);
1576
1577	if (TREE_CODE (o1) != TREE_CODE (o2))
1578	  return false;
1579	if (TYPE_P (o1))
1580	  return same_type_p (o1, o2);
1581	else
1582	  return cp_tree_equal (o1, o2);
1583      }
1584
1585    case PTRMEM_CST:
1586      /* Two pointer-to-members are the same if they point to the same
1587	 field or function in the same class.  */
1588      if (PTRMEM_CST_MEMBER (t1) != PTRMEM_CST_MEMBER (t2))
1589	return false;
1590
1591      return same_type_p (PTRMEM_CST_CLASS (t1), PTRMEM_CST_CLASS (t2));
1592
1593    case OVERLOAD:
1594      if (OVL_FUNCTION (t1) != OVL_FUNCTION (t2))
1595	return false;
1596      return cp_tree_equal (OVL_CHAIN (t1), OVL_CHAIN (t2));
1597
1598    default:
1599      break;
1600    }
1601
1602  switch (TREE_CODE_CLASS (code1))
1603    {
1604    case tcc_unary:
1605    case tcc_binary:
1606    case tcc_comparison:
1607    case tcc_expression:
1608    case tcc_reference:
1609    case tcc_statement:
1610      {
1611	int i;
1612
1613	for (i = 0; i < TREE_CODE_LENGTH (code1); ++i)
1614	  if (!cp_tree_equal (TREE_OPERAND (t1, i), TREE_OPERAND (t2, i)))
1615	    return false;
1616
1617	return true;
1618      }
1619
1620    case tcc_type:
1621      return same_type_p (t1, t2);
1622    default:
1623      gcc_unreachable ();
1624    }
1625  /* We can get here with --disable-checking.  */
1626  return false;
1627}
1628
1629/* The type of ARG when used as an lvalue.  */
1630
1631tree
1632lvalue_type (tree arg)
1633{
1634  tree type = TREE_TYPE (arg);
1635  return type;
1636}
1637
1638/* The type of ARG for printing error messages; denote lvalues with
1639   reference types.  */
1640
1641tree
1642error_type (tree arg)
1643{
1644  tree type = TREE_TYPE (arg);
1645
1646  if (TREE_CODE (type) == ARRAY_TYPE)
1647    ;
1648  else if (TREE_CODE (type) == ERROR_MARK)
1649    ;
1650  else if (real_lvalue_p (arg))
1651    type = build_reference_type (lvalue_type (arg));
1652  else if (IS_AGGR_TYPE (type))
1653    type = lvalue_type (arg);
1654
1655  return type;
1656}
1657
1658/* Does FUNCTION use a variable-length argument list?  */
1659
1660int
1661varargs_function_p (tree function)
1662{
1663  tree parm = TYPE_ARG_TYPES (TREE_TYPE (function));
1664  for (; parm; parm = TREE_CHAIN (parm))
1665    if (TREE_VALUE (parm) == void_type_node)
1666      return 0;
1667  return 1;
1668}
1669
1670/* Returns 1 if decl is a member of a class.  */
1671
1672int
1673member_p (tree decl)
1674{
1675  const tree ctx = DECL_CONTEXT (decl);
1676  return (ctx && TYPE_P (ctx));
1677}
1678
1679/* Create a placeholder for member access where we don't actually have an
1680   object that the access is against.  */
1681
1682tree
1683build_dummy_object (tree type)
1684{
1685  tree decl = build1 (NOP_EXPR, build_pointer_type (type), void_zero_node);
1686  return build_indirect_ref (decl, NULL);
1687}
1688
1689/* We've gotten a reference to a member of TYPE.  Return *this if appropriate,
1690   or a dummy object otherwise.  If BINFOP is non-0, it is filled with the
1691   binfo path from current_class_type to TYPE, or 0.  */
1692
1693tree
1694maybe_dummy_object (tree type, tree* binfop)
1695{
1696  tree decl, context;
1697  tree binfo;
1698
1699  if (current_class_type
1700      && (binfo = lookup_base (current_class_type, type,
1701			       ba_unique | ba_quiet, NULL)))
1702    context = current_class_type;
1703  else
1704    {
1705      /* Reference from a nested class member function.  */
1706      context = type;
1707      binfo = TYPE_BINFO (type);
1708    }
1709
1710  if (binfop)
1711    *binfop = binfo;
1712
1713  if (current_class_ref && context == current_class_type
1714      /* Kludge: Make sure that current_class_type is actually
1715	 correct.  It might not be if we're in the middle of
1716	 tsubst_default_argument.  */
1717      && same_type_p (TYPE_MAIN_VARIANT (TREE_TYPE (current_class_ref)),
1718		      current_class_type))
1719    decl = current_class_ref;
1720  else
1721    decl = build_dummy_object (context);
1722
1723  return decl;
1724}
1725
1726/* Returns 1 if OB is a placeholder object, or a pointer to one.  */
1727
1728int
1729is_dummy_object (tree ob)
1730{
1731  if (TREE_CODE (ob) == INDIRECT_REF)
1732    ob = TREE_OPERAND (ob, 0);
1733  return (TREE_CODE (ob) == NOP_EXPR
1734	  && TREE_OPERAND (ob, 0) == void_zero_node);
1735}
1736
1737/* Returns 1 iff type T is a POD type, as defined in [basic.types].  */
1738
1739int
1740pod_type_p (tree t)
1741{
1742  t = strip_array_types (t);
1743
1744  if (t == error_mark_node)
1745    return 1;
1746  if (INTEGRAL_TYPE_P (t))
1747    return 1;  /* integral, character or enumeral type */
1748  if (FLOAT_TYPE_P (t))
1749    return 1;
1750  if (TYPE_PTR_P (t))
1751    return 1; /* pointer to non-member */
1752  if (TYPE_PTR_TO_MEMBER_P (t))
1753    return 1; /* pointer to member */
1754
1755  if (TREE_CODE (t) == VECTOR_TYPE)
1756    return 1; /* vectors are (small) arrays of scalars */
1757
1758  if (! CLASS_TYPE_P (t))
1759    return 0; /* other non-class type (reference or function) */
1760  if (CLASSTYPE_NON_POD_P (t))
1761    return 0;
1762  return 1;
1763}
1764
1765/* Nonzero iff type T is a class template implicit specialization.  */
1766
1767bool
1768class_tmpl_impl_spec_p (tree t)
1769{
1770  return CLASS_TYPE_P (t) && CLASSTYPE_TEMPLATE_INSTANTIATION (t);
1771}
1772
1773/* Returns 1 iff zero initialization of type T means actually storing
1774   zeros in it.  */
1775
1776int
1777zero_init_p (tree t)
1778{
1779  t = strip_array_types (t);
1780
1781  if (t == error_mark_node)
1782    return 1;
1783
1784  /* NULL pointers to data members are initialized with -1.  */
1785  if (TYPE_PTRMEM_P (t))
1786    return 0;
1787
1788  /* Classes that contain types that can't be zero-initialized, cannot
1789     be zero-initialized themselves.  */
1790  if (CLASS_TYPE_P (t) && CLASSTYPE_NON_ZERO_INIT_P (t))
1791    return 0;
1792
1793  return 1;
1794}
1795
1796/* Table of valid C++ attributes.  */
1797const struct attribute_spec cxx_attribute_table[] =
1798{
1799  /* { name, min_len, max_len, decl_req, type_req, fn_type_req, handler } */
1800  { "java_interface", 0, 0, false, false, false, handle_java_interface_attribute },
1801  { "com_interface",  0, 0, false, false, false, handle_com_interface_attribute },
1802  { "init_priority",  1, 1, true,  false, false, handle_init_priority_attribute },
1803  { NULL,	      0, 0, false, false, false, NULL }
1804};
1805
1806/* Handle a "java_interface" attribute; arguments as in
1807   struct attribute_spec.handler.  */
1808static tree
1809handle_java_interface_attribute (tree* node,
1810				 tree name,
1811				 tree args ATTRIBUTE_UNUSED ,
1812				 int flags,
1813				 bool* no_add_attrs)
1814{
1815  if (DECL_P (*node)
1816      || !CLASS_TYPE_P (*node)
1817      || !TYPE_FOR_JAVA (*node))
1818    {
1819      error ("%qE attribute can only be applied to Java class definitions",
1820	     name);
1821      *no_add_attrs = true;
1822      return NULL_TREE;
1823    }
1824  if (!(flags & (int) ATTR_FLAG_TYPE_IN_PLACE))
1825    *node = build_variant_type_copy (*node);
1826  TYPE_JAVA_INTERFACE (*node) = 1;
1827
1828  return NULL_TREE;
1829}
1830
1831/* Handle a "com_interface" attribute; arguments as in
1832   struct attribute_spec.handler.  */
1833static tree
1834handle_com_interface_attribute (tree* node,
1835				tree name,
1836				tree args ATTRIBUTE_UNUSED ,
1837				int flags ATTRIBUTE_UNUSED ,
1838				bool* no_add_attrs)
1839{
1840  static int warned;
1841
1842  *no_add_attrs = true;
1843
1844  if (DECL_P (*node)
1845      || !CLASS_TYPE_P (*node)
1846      || *node != TYPE_MAIN_VARIANT (*node))
1847    {
1848      warning (OPT_Wattributes, "%qE attribute can only be applied "
1849	       "to class definitions", name);
1850      return NULL_TREE;
1851    }
1852
1853  if (!warned++)
1854    warning (0, "%qE is obsolete; g++ vtables are now COM-compatible by default",
1855	     name);
1856
1857  return NULL_TREE;
1858}
1859
1860/* Handle an "init_priority" attribute; arguments as in
1861   struct attribute_spec.handler.  */
1862static tree
1863handle_init_priority_attribute (tree* node,
1864				tree name,
1865				tree args,
1866				int flags ATTRIBUTE_UNUSED ,
1867				bool* no_add_attrs)
1868{
1869  tree initp_expr = TREE_VALUE (args);
1870  tree decl = *node;
1871  tree type = TREE_TYPE (decl);
1872  int pri;
1873
1874  STRIP_NOPS (initp_expr);
1875
1876  if (!initp_expr || TREE_CODE (initp_expr) != INTEGER_CST)
1877    {
1878      error ("requested init_priority is not an integer constant");
1879      *no_add_attrs = true;
1880      return NULL_TREE;
1881    }
1882
1883  pri = TREE_INT_CST_LOW (initp_expr);
1884
1885  type = strip_array_types (type);
1886
1887  if (decl == NULL_TREE
1888      || TREE_CODE (decl) != VAR_DECL
1889      || !TREE_STATIC (decl)
1890      || DECL_EXTERNAL (decl)
1891      || (TREE_CODE (type) != RECORD_TYPE
1892	  && TREE_CODE (type) != UNION_TYPE)
1893      /* Static objects in functions are initialized the
1894	 first time control passes through that
1895	 function. This is not precise enough to pin down an
1896	 init_priority value, so don't allow it.  */
1897      || current_function_decl)
1898    {
1899      error ("can only use %qE attribute on file-scope definitions "
1900	     "of objects of class type", name);
1901      *no_add_attrs = true;
1902      return NULL_TREE;
1903    }
1904
1905  if (pri > MAX_INIT_PRIORITY || pri <= 0)
1906    {
1907      error ("requested init_priority is out of range");
1908      *no_add_attrs = true;
1909      return NULL_TREE;
1910    }
1911
1912  /* Check for init_priorities that are reserved for
1913     language and runtime support implementations.*/
1914  if (pri <= MAX_RESERVED_INIT_PRIORITY)
1915    {
1916      warning
1917	(0, "requested init_priority is reserved for internal use");
1918    }
1919
1920  if (SUPPORTS_INIT_PRIORITY)
1921    {
1922      SET_DECL_INIT_PRIORITY (decl, pri);
1923      DECL_HAS_INIT_PRIORITY_P (decl) = 1;
1924      return NULL_TREE;
1925    }
1926  else
1927    {
1928      error ("%qE attribute is not supported on this platform", name);
1929      *no_add_attrs = true;
1930      return NULL_TREE;
1931    }
1932}
1933
1934/* Return a new PTRMEM_CST of the indicated TYPE.  The MEMBER is the
1935   thing pointed to by the constant.  */
1936
1937tree
1938make_ptrmem_cst (tree type, tree member)
1939{
1940  tree ptrmem_cst = make_node (PTRMEM_CST);
1941  TREE_TYPE (ptrmem_cst) = type;
1942  PTRMEM_CST_MEMBER (ptrmem_cst) = member;
1943  return ptrmem_cst;
1944}
1945
1946/* Build a variant of TYPE that has the indicated ATTRIBUTES.  May
1947   return an existing type of an appropriate type already exists.  */
1948
1949tree
1950cp_build_type_attribute_variant (tree type, tree attributes)
1951{
1952  tree new_type;
1953
1954  new_type = build_type_attribute_variant (type, attributes);
1955  if (TREE_CODE (new_type) == FUNCTION_TYPE
1956      && (TYPE_RAISES_EXCEPTIONS (new_type)
1957	  != TYPE_RAISES_EXCEPTIONS (type)))
1958    new_type = build_exception_variant (new_type,
1959					TYPE_RAISES_EXCEPTIONS (type));
1960
1961  /* Making a new main variant of a class type is broken.  */
1962  gcc_assert (!CLASS_TYPE_P (type) || new_type == type);
1963
1964  return new_type;
1965}
1966
1967/* Apply FUNC to all language-specific sub-trees of TP in a pre-order
1968   traversal.  Called from walk_tree.  */
1969
1970tree
1971cp_walk_subtrees (tree *tp, int *walk_subtrees_p, walk_tree_fn func,
1972		  void *data, struct pointer_set_t *pset)
1973{
1974  enum tree_code code = TREE_CODE (*tp);
1975  location_t save_locus;
1976  tree result;
1977
1978#define WALK_SUBTREE(NODE)				\
1979  do							\
1980    {							\
1981      result = walk_tree (&(NODE), func, data, pset);	\
1982      if (result) goto out;				\
1983    }							\
1984  while (0)
1985
1986  /* Set input_location here so we get the right instantiation context
1987     if we call instantiate_decl from inlinable_function_p.  */
1988  save_locus = input_location;
1989  if (EXPR_HAS_LOCATION (*tp))
1990    input_location = EXPR_LOCATION (*tp);
1991
1992  /* Not one of the easy cases.  We must explicitly go through the
1993     children.  */
1994  result = NULL_TREE;
1995  switch (code)
1996    {
1997    case DEFAULT_ARG:
1998    case TEMPLATE_TEMPLATE_PARM:
1999    case BOUND_TEMPLATE_TEMPLATE_PARM:
2000    case UNBOUND_CLASS_TEMPLATE:
2001    case TEMPLATE_PARM_INDEX:
2002    case TEMPLATE_TYPE_PARM:
2003    case TYPENAME_TYPE:
2004    case TYPEOF_TYPE:
2005    case BASELINK:
2006      /* None of these have subtrees other than those already walked
2007	 above.  */
2008      *walk_subtrees_p = 0;
2009      break;
2010
2011    case TINST_LEVEL:
2012      WALK_SUBTREE (TINST_DECL (*tp));
2013      *walk_subtrees_p = 0;
2014      break;
2015
2016    case PTRMEM_CST:
2017      WALK_SUBTREE (TREE_TYPE (*tp));
2018      *walk_subtrees_p = 0;
2019      break;
2020
2021    case TREE_LIST:
2022      WALK_SUBTREE (TREE_PURPOSE (*tp));
2023      break;
2024
2025    case OVERLOAD:
2026      WALK_SUBTREE (OVL_FUNCTION (*tp));
2027      WALK_SUBTREE (OVL_CHAIN (*tp));
2028      *walk_subtrees_p = 0;
2029      break;
2030
2031    case RECORD_TYPE:
2032      if (TYPE_PTRMEMFUNC_P (*tp))
2033	WALK_SUBTREE (TYPE_PTRMEMFUNC_FN_TYPE (*tp));
2034      break;
2035
2036    default:
2037      input_location = save_locus;
2038      return NULL_TREE;
2039    }
2040
2041  /* We didn't find what we were looking for.  */
2042 out:
2043  input_location = save_locus;
2044  return result;
2045
2046#undef WALK_SUBTREE
2047}
2048
2049/* Decide whether there are language-specific reasons to not inline a
2050   function as a tree.  */
2051
2052int
2053cp_cannot_inline_tree_fn (tree* fnp)
2054{
2055  tree fn = *fnp;
2056
2057  /* We can inline a template instantiation only if it's fully
2058     instantiated.  */
2059  if (DECL_TEMPLATE_INFO (fn)
2060      && TI_PENDING_TEMPLATE_FLAG (DECL_TEMPLATE_INFO (fn)))
2061    {
2062      /* Don't instantiate functions that are not going to be
2063	 inlined.  */
2064      if (!DECL_INLINE (DECL_TEMPLATE_RESULT
2065			(template_for_substitution (fn))))
2066	return 1;
2067
2068      fn = *fnp = instantiate_decl (fn, /*defer_ok=*/0, /*undefined_ok=*/0);
2069
2070      if (TI_PENDING_TEMPLATE_FLAG (DECL_TEMPLATE_INFO (fn)))
2071	return 1;
2072    }
2073
2074  if (flag_really_no_inline
2075      && lookup_attribute ("always_inline", DECL_ATTRIBUTES (fn)) == NULL)
2076    return 1;
2077
2078  /* Don't auto-inline functions that might be replaced at link-time
2079     with an alternative definition.  */
2080  if (!DECL_DECLARED_INLINE_P (fn) && DECL_REPLACEABLE_P (fn))
2081    {
2082      DECL_UNINLINABLE (fn) = 1;
2083      return 1;
2084    }
2085
2086  if (varargs_function_p (fn))
2087    {
2088      DECL_UNINLINABLE (fn) = 1;
2089      return 1;
2090    }
2091
2092  if (! function_attribute_inlinable_p (fn))
2093    {
2094      DECL_UNINLINABLE (fn) = 1;
2095      return 1;
2096    }
2097
2098  return 0;
2099}
2100
2101/* Add any pending functions other than the current function (already
2102   handled by the caller), that thus cannot be inlined, to FNS_P, then
2103   return the latest function added to the array, PREV_FN.  */
2104
2105tree
2106cp_add_pending_fn_decls (void* fns_p, tree prev_fn)
2107{
2108  varray_type *fnsp = (varray_type *)fns_p;
2109  struct saved_scope *s;
2110
2111  for (s = scope_chain; s; s = s->prev)
2112    if (s->function_decl && s->function_decl != prev_fn)
2113      {
2114	VARRAY_PUSH_TREE (*fnsp, s->function_decl);
2115	prev_fn = s->function_decl;
2116      }
2117
2118  return prev_fn;
2119}
2120
2121/* Determine whether VAR is a declaration of an automatic variable in
2122   function FN.  */
2123
2124int
2125cp_auto_var_in_fn_p (tree var, tree fn)
2126{
2127  return (DECL_P (var) && DECL_CONTEXT (var) == fn
2128	  && nonstatic_local_decl_p (var));
2129}
2130
2131/* Like save_expr, but for C++.  */
2132
2133tree
2134cp_save_expr (tree expr)
2135{
2136  /* There is no reason to create a SAVE_EXPR within a template; if
2137     needed, we can create the SAVE_EXPR when instantiating the
2138     template.  Furthermore, the middle-end cannot handle C++-specific
2139     tree codes.  */
2140  if (processing_template_decl)
2141    return expr;
2142  return save_expr (expr);
2143}
2144
2145/* Initialize tree.c.  */
2146
2147void
2148init_tree (void)
2149{
2150  list_hash_table = htab_create_ggc (31, list_hash, list_hash_eq, NULL);
2151}
2152
2153/* Returns the kind of special function that DECL (a FUNCTION_DECL)
2154   is.  Note that sfk_none is zero, so this function can be used as a
2155   predicate to test whether or not DECL is a special function.  */
2156
2157special_function_kind
2158special_function_p (tree decl)
2159{
2160  /* Rather than doing all this stuff with magic names, we should
2161     probably have a field of type `special_function_kind' in
2162     DECL_LANG_SPECIFIC.  */
2163  if (DECL_COPY_CONSTRUCTOR_P (decl))
2164    return sfk_copy_constructor;
2165  if (DECL_CONSTRUCTOR_P (decl))
2166    return sfk_constructor;
2167  if (DECL_OVERLOADED_OPERATOR_P (decl) == NOP_EXPR)
2168    return sfk_assignment_operator;
2169  if (DECL_MAYBE_IN_CHARGE_DESTRUCTOR_P (decl))
2170    return sfk_destructor;
2171  if (DECL_COMPLETE_DESTRUCTOR_P (decl))
2172    return sfk_complete_destructor;
2173  if (DECL_BASE_DESTRUCTOR_P (decl))
2174    return sfk_base_destructor;
2175  if (DECL_DELETING_DESTRUCTOR_P (decl))
2176    return sfk_deleting_destructor;
2177  if (DECL_CONV_FN_P (decl))
2178    return sfk_conversion;
2179
2180  return sfk_none;
2181}
2182
2183/* Returns nonzero if TYPE is a character type, including wchar_t.  */
2184
2185int
2186char_type_p (tree type)
2187{
2188  return (same_type_p (type, char_type_node)
2189	  || same_type_p (type, unsigned_char_type_node)
2190	  || same_type_p (type, signed_char_type_node)
2191	  || same_type_p (type, wchar_type_node));
2192}
2193
2194/* Returns the kind of linkage associated with the indicated DECL.  Th
2195   value returned is as specified by the language standard; it is
2196   independent of implementation details regarding template
2197   instantiation, etc.  For example, it is possible that a declaration
2198   to which this function assigns external linkage would not show up
2199   as a global symbol when you run `nm' on the resulting object file.  */
2200
2201linkage_kind
2202decl_linkage (tree decl)
2203{
2204  /* This function doesn't attempt to calculate the linkage from first
2205     principles as given in [basic.link].  Instead, it makes use of
2206     the fact that we have already set TREE_PUBLIC appropriately, and
2207     then handles a few special cases.  Ideally, we would calculate
2208     linkage first, and then transform that into a concrete
2209     implementation.  */
2210
2211  /* Things that don't have names have no linkage.  */
2212  if (!DECL_NAME (decl))
2213    return lk_none;
2214
2215  /* Things that are TREE_PUBLIC have external linkage.  */
2216  if (TREE_PUBLIC (decl))
2217    return lk_external;
2218
2219  if (TREE_CODE (decl) == NAMESPACE_DECL)
2220    return lk_external;
2221
2222  /* Linkage of a CONST_DECL depends on the linkage of the enumeration
2223     type.  */
2224  if (TREE_CODE (decl) == CONST_DECL)
2225    return decl_linkage (TYPE_NAME (TREE_TYPE (decl)));
2226
2227  /* Some things that are not TREE_PUBLIC have external linkage, too.
2228     For example, on targets that don't have weak symbols, we make all
2229     template instantiations have internal linkage (in the object
2230     file), but the symbols should still be treated as having external
2231     linkage from the point of view of the language.  */
2232  if (TREE_CODE (decl) != TYPE_DECL && DECL_LANG_SPECIFIC (decl)
2233      && DECL_COMDAT (decl))
2234    return lk_external;
2235
2236  /* Things in local scope do not have linkage, if they don't have
2237     TREE_PUBLIC set.  */
2238  if (decl_function_context (decl))
2239    return lk_none;
2240
2241  /* Members of the anonymous namespace also have TREE_PUBLIC unset, but
2242     are considered to have external linkage for language purposes.  DECLs
2243     really meant to have internal linkage have DECL_THIS_STATIC set.  */
2244  if (TREE_CODE (decl) == TYPE_DECL
2245      || ((TREE_CODE (decl) == VAR_DECL || TREE_CODE (decl) == FUNCTION_DECL)
2246	  && !DECL_THIS_STATIC (decl)))
2247    return lk_external;
2248
2249  /* Everything else has internal linkage.  */
2250  return lk_internal;
2251}
2252
2253/* EXP is an expression that we want to pre-evaluate.  Returns (in
2254   *INITP) an expression that will perform the pre-evaluation.  The
2255   value returned by this function is a side-effect free expression
2256   equivalent to the pre-evaluated expression.  Callers must ensure
2257   that *INITP is evaluated before EXP.  */
2258
2259tree
2260stabilize_expr (tree exp, tree* initp)
2261{
2262  tree init_expr;
2263
2264  if (!TREE_SIDE_EFFECTS (exp))
2265    init_expr = NULL_TREE;
2266  else if (!real_lvalue_p (exp)
2267	   || !TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (exp)))
2268    {
2269      init_expr = get_target_expr (exp);
2270      exp = TARGET_EXPR_SLOT (init_expr);
2271    }
2272  else
2273    {
2274      exp = build_unary_op (ADDR_EXPR, exp, 1);
2275      init_expr = get_target_expr (exp);
2276      exp = TARGET_EXPR_SLOT (init_expr);
2277      exp = build_indirect_ref (exp, 0);
2278    }
2279  *initp = init_expr;
2280
2281  gcc_assert (!TREE_SIDE_EFFECTS (exp));
2282  return exp;
2283}
2284
2285/* Add NEW, an expression whose value we don't care about, after the
2286   similar expression ORIG.  */
2287
2288tree
2289add_stmt_to_compound (tree orig, tree new)
2290{
2291  if (!new || !TREE_SIDE_EFFECTS (new))
2292    return orig;
2293  if (!orig || !TREE_SIDE_EFFECTS (orig))
2294    return new;
2295  return build2 (COMPOUND_EXPR, void_type_node, orig, new);
2296}
2297
2298/* Like stabilize_expr, but for a call whose arguments we want to
2299   pre-evaluate.  CALL is modified in place to use the pre-evaluated
2300   arguments, while, upon return, *INITP contains an expression to
2301   compute the arguments.  */
2302
2303void
2304stabilize_call (tree call, tree *initp)
2305{
2306  tree inits = NULL_TREE;
2307  tree t;
2308
2309  if (call == error_mark_node)
2310    return;
2311
2312  gcc_assert (TREE_CODE (call) == CALL_EXPR
2313	      || TREE_CODE (call) == AGGR_INIT_EXPR);
2314
2315  for (t = TREE_OPERAND (call, 1); t; t = TREE_CHAIN (t))
2316    if (TREE_SIDE_EFFECTS (TREE_VALUE (t)))
2317      {
2318	tree init;
2319	TREE_VALUE (t) = stabilize_expr (TREE_VALUE (t), &init);
2320	inits = add_stmt_to_compound (inits, init);
2321      }
2322
2323  *initp = inits;
2324}
2325
2326/* Like stabilize_expr, but for an initialization.
2327
2328   If the initialization is for an object of class type, this function
2329   takes care not to introduce additional temporaries.
2330
2331   Returns TRUE iff the expression was successfully pre-evaluated,
2332   i.e., if INIT is now side-effect free, except for, possible, a
2333   single call to a constructor.  */
2334
2335bool
2336stabilize_init (tree init, tree *initp)
2337{
2338  tree t = init;
2339
2340  *initp = NULL_TREE;
2341
2342  if (t == error_mark_node)
2343    return true;
2344
2345  if (TREE_CODE (t) == INIT_EXPR
2346      && TREE_CODE (TREE_OPERAND (t, 1)) != TARGET_EXPR)
2347    {
2348      TREE_OPERAND (t, 1) = stabilize_expr (TREE_OPERAND (t, 1), initp);
2349      return true;
2350    }
2351
2352  if (TREE_CODE (t) == INIT_EXPR)
2353    t = TREE_OPERAND (t, 1);
2354  if (TREE_CODE (t) == TARGET_EXPR)
2355    t = TARGET_EXPR_INITIAL (t);
2356  if (TREE_CODE (t) == COMPOUND_EXPR)
2357    t = expr_last (t);
2358  if (TREE_CODE (t) == CONSTRUCTOR
2359      && EMPTY_CONSTRUCTOR_P (t))
2360    /* Default-initialization.  */
2361    return true;
2362
2363  /* If the initializer is a COND_EXPR, we can't preevaluate
2364     anything.  */
2365  if (TREE_CODE (t) == COND_EXPR)
2366    return false;
2367
2368  if (TREE_CODE (t) == CALL_EXPR
2369      || TREE_CODE (t) == AGGR_INIT_EXPR)
2370    {
2371      stabilize_call (t, initp);
2372      return true;
2373    }
2374
2375  /* The initialization is being performed via a bitwise copy -- and
2376     the item copied may have side effects.  */
2377  return TREE_SIDE_EFFECTS (init);
2378}
2379
2380/* Like "fold", but should be used whenever we might be processing the
2381   body of a template.  */
2382
2383tree
2384fold_if_not_in_template (tree expr)
2385{
2386  /* In the body of a template, there is never any need to call
2387     "fold".  We will call fold later when actually instantiating the
2388     template.  Integral constant expressions in templates will be
2389     evaluated via fold_non_dependent_expr, as necessary.  */
2390  if (processing_template_decl)
2391    return expr;
2392
2393  /* Fold C++ front-end specific tree codes.  */
2394  if (TREE_CODE (expr) == UNARY_PLUS_EXPR)
2395    return fold_convert (TREE_TYPE (expr), TREE_OPERAND (expr, 0));
2396
2397  return fold (expr);
2398}
2399
2400/* Returns true if a cast to TYPE may appear in an integral constant
2401   expression.  */
2402
2403bool
2404cast_valid_in_integral_constant_expression_p (tree type)
2405{
2406  return (INTEGRAL_OR_ENUMERATION_TYPE_P (type)
2407	  || dependent_type_p (type)
2408	  || type == error_mark_node);
2409}
2410
2411
2412#if defined ENABLE_TREE_CHECKING && (GCC_VERSION >= 2007)
2413/* Complain that some language-specific thing hanging off a tree
2414   node has been accessed improperly.  */
2415
2416void
2417lang_check_failed (const char* file, int line, const char* function)
2418{
2419  internal_error ("lang_* check: failed in %s, at %s:%d",
2420		  function, trim_filename (file), line);
2421}
2422#endif /* ENABLE_TREE_CHECKING */
2423
2424#include "gt-cp-tree.h"
2425