]> CyberLeo.Net >> Repos - FreeBSD/FreeBSD.git/blob - contrib/llvm/tools/clang/include/clang/AST/Expr.h
Merge lld trunk r338150, and resolve conflicts.
[FreeBSD/FreeBSD.git] / contrib / llvm / tools / clang / include / clang / AST / Expr.h
1 //===--- Expr.h - Classes for representing expressions ----------*- C++ -*-===//
2 //
3 //                     The LLVM Compiler Infrastructure
4 //
5 // This file is distributed under the University of Illinois Open Source
6 // License. See LICENSE.TXT for details.
7 //
8 //===----------------------------------------------------------------------===//
9 //
10 //  This file defines the Expr interface and subclasses.
11 //
12 //===----------------------------------------------------------------------===//
13
14 #ifndef LLVM_CLANG_AST_EXPR_H
15 #define LLVM_CLANG_AST_EXPR_H
16
17 #include "clang/AST/APValue.h"
18 #include "clang/AST/ASTVector.h"
19 #include "clang/AST/Decl.h"
20 #include "clang/AST/DeclAccessPair.h"
21 #include "clang/AST/OperationKinds.h"
22 #include "clang/AST/Stmt.h"
23 #include "clang/AST/TemplateBase.h"
24 #include "clang/AST/Type.h"
25 #include "clang/Basic/CharInfo.h"
26 #include "clang/Basic/LangOptions.h"
27 #include "clang/Basic/SyncScope.h"
28 #include "clang/Basic/TypeTraits.h"
29 #include "llvm/ADT/APFloat.h"
30 #include "llvm/ADT/APSInt.h"
31 #include "llvm/ADT/SmallVector.h"
32 #include "llvm/ADT/StringRef.h"
33 #include "llvm/Support/AtomicOrdering.h"
34 #include "llvm/Support/Compiler.h"
35
36 namespace clang {
37   class APValue;
38   class ASTContext;
39   class BlockDecl;
40   class CXXBaseSpecifier;
41   class CXXMemberCallExpr;
42   class CXXOperatorCallExpr;
43   class CastExpr;
44   class Decl;
45   class IdentifierInfo;
46   class MaterializeTemporaryExpr;
47   class NamedDecl;
48   class ObjCPropertyRefExpr;
49   class OpaqueValueExpr;
50   class ParmVarDecl;
51   class StringLiteral;
52   class TargetInfo;
53   class ValueDecl;
54
55 /// A simple array of base specifiers.
56 typedef SmallVector<CXXBaseSpecifier*, 4> CXXCastPath;
57
58 /// An adjustment to be made to the temporary created when emitting a
59 /// reference binding, which accesses a particular subobject of that temporary.
60 struct SubobjectAdjustment {
61   enum {
62     DerivedToBaseAdjustment,
63     FieldAdjustment,
64     MemberPointerAdjustment
65   } Kind;
66
67   struct DTB {
68     const CastExpr *BasePath;
69     const CXXRecordDecl *DerivedClass;
70   };
71
72   struct P {
73     const MemberPointerType *MPT;
74     Expr *RHS;
75   };
76
77   union {
78     struct DTB DerivedToBase;
79     FieldDecl *Field;
80     struct P Ptr;
81   };
82
83   SubobjectAdjustment(const CastExpr *BasePath,
84                       const CXXRecordDecl *DerivedClass)
85     : Kind(DerivedToBaseAdjustment) {
86     DerivedToBase.BasePath = BasePath;
87     DerivedToBase.DerivedClass = DerivedClass;
88   }
89
90   SubobjectAdjustment(FieldDecl *Field)
91     : Kind(FieldAdjustment) {
92     this->Field = Field;
93   }
94
95   SubobjectAdjustment(const MemberPointerType *MPT, Expr *RHS)
96     : Kind(MemberPointerAdjustment) {
97     this->Ptr.MPT = MPT;
98     this->Ptr.RHS = RHS;
99   }
100 };
101
102 /// Expr - This represents one expression.  Note that Expr's are subclasses of
103 /// Stmt.  This allows an expression to be transparently used any place a Stmt
104 /// is required.
105 ///
106 class Expr : public Stmt {
107   QualType TR;
108
109 protected:
110   Expr(StmtClass SC, QualType T, ExprValueKind VK, ExprObjectKind OK,
111        bool TD, bool VD, bool ID, bool ContainsUnexpandedParameterPack)
112     : Stmt(SC)
113   {
114     ExprBits.TypeDependent = TD;
115     ExprBits.ValueDependent = VD;
116     ExprBits.InstantiationDependent = ID;
117     ExprBits.ValueKind = VK;
118     ExprBits.ObjectKind = OK;
119     assert(ExprBits.ObjectKind == OK && "truncated kind");
120     ExprBits.ContainsUnexpandedParameterPack = ContainsUnexpandedParameterPack;
121     setType(T);
122   }
123
124   /// Construct an empty expression.
125   explicit Expr(StmtClass SC, EmptyShell) : Stmt(SC) { }
126
127 public:
128   QualType getType() const { return TR; }
129   void setType(QualType t) {
130     // In C++, the type of an expression is always adjusted so that it
131     // will not have reference type (C++ [expr]p6). Use
132     // QualType::getNonReferenceType() to retrieve the non-reference
133     // type. Additionally, inspect Expr::isLvalue to determine whether
134     // an expression that is adjusted in this manner should be
135     // considered an lvalue.
136     assert((t.isNull() || !t->isReferenceType()) &&
137            "Expressions can't have reference type");
138
139     TR = t;
140   }
141
142   /// isValueDependent - Determines whether this expression is
143   /// value-dependent (C++ [temp.dep.constexpr]). For example, the
144   /// array bound of "Chars" in the following example is
145   /// value-dependent.
146   /// @code
147   /// template<int Size, char (&Chars)[Size]> struct meta_string;
148   /// @endcode
149   bool isValueDependent() const { return ExprBits.ValueDependent; }
150
151   /// Set whether this expression is value-dependent or not.
152   void setValueDependent(bool VD) {
153     ExprBits.ValueDependent = VD;
154   }
155
156   /// isTypeDependent - Determines whether this expression is
157   /// type-dependent (C++ [temp.dep.expr]), which means that its type
158   /// could change from one template instantiation to the next. For
159   /// example, the expressions "x" and "x + y" are type-dependent in
160   /// the following code, but "y" is not type-dependent:
161   /// @code
162   /// template<typename T>
163   /// void add(T x, int y) {
164   ///   x + y;
165   /// }
166   /// @endcode
167   bool isTypeDependent() const { return ExprBits.TypeDependent; }
168
169   /// Set whether this expression is type-dependent or not.
170   void setTypeDependent(bool TD) {
171     ExprBits.TypeDependent = TD;
172   }
173
174   /// Whether this expression is instantiation-dependent, meaning that
175   /// it depends in some way on a template parameter, even if neither its type
176   /// nor (constant) value can change due to the template instantiation.
177   ///
178   /// In the following example, the expression \c sizeof(sizeof(T() + T())) is
179   /// instantiation-dependent (since it involves a template parameter \c T), but
180   /// is neither type- nor value-dependent, since the type of the inner
181   /// \c sizeof is known (\c std::size_t) and therefore the size of the outer
182   /// \c sizeof is known.
183   ///
184   /// \code
185   /// template<typename T>
186   /// void f(T x, T y) {
187   ///   sizeof(sizeof(T() + T());
188   /// }
189   /// \endcode
190   ///
191   bool isInstantiationDependent() const {
192     return ExprBits.InstantiationDependent;
193   }
194
195   /// Set whether this expression is instantiation-dependent or not.
196   void setInstantiationDependent(bool ID) {
197     ExprBits.InstantiationDependent = ID;
198   }
199
200   /// Whether this expression contains an unexpanded parameter
201   /// pack (for C++11 variadic templates).
202   ///
203   /// Given the following function template:
204   ///
205   /// \code
206   /// template<typename F, typename ...Types>
207   /// void forward(const F &f, Types &&...args) {
208   ///   f(static_cast<Types&&>(args)...);
209   /// }
210   /// \endcode
211   ///
212   /// The expressions \c args and \c static_cast<Types&&>(args) both
213   /// contain parameter packs.
214   bool containsUnexpandedParameterPack() const {
215     return ExprBits.ContainsUnexpandedParameterPack;
216   }
217
218   /// Set the bit that describes whether this expression
219   /// contains an unexpanded parameter pack.
220   void setContainsUnexpandedParameterPack(bool PP = true) {
221     ExprBits.ContainsUnexpandedParameterPack = PP;
222   }
223
224   /// getExprLoc - Return the preferred location for the arrow when diagnosing
225   /// a problem with a generic expression.
226   SourceLocation getExprLoc() const LLVM_READONLY;
227
228   /// isUnusedResultAWarning - Return true if this immediate expression should
229   /// be warned about if the result is unused.  If so, fill in expr, location,
230   /// and ranges with expr to warn on and source locations/ranges appropriate
231   /// for a warning.
232   bool isUnusedResultAWarning(const Expr *&WarnExpr, SourceLocation &Loc,
233                               SourceRange &R1, SourceRange &R2,
234                               ASTContext &Ctx) const;
235
236   /// isLValue - True if this expression is an "l-value" according to
237   /// the rules of the current language.  C and C++ give somewhat
238   /// different rules for this concept, but in general, the result of
239   /// an l-value expression identifies a specific object whereas the
240   /// result of an r-value expression is a value detached from any
241   /// specific storage.
242   ///
243   /// C++11 divides the concept of "r-value" into pure r-values
244   /// ("pr-values") and so-called expiring values ("x-values"), which
245   /// identify specific objects that can be safely cannibalized for
246   /// their resources.  This is an unfortunate abuse of terminology on
247   /// the part of the C++ committee.  In Clang, when we say "r-value",
248   /// we generally mean a pr-value.
249   bool isLValue() const { return getValueKind() == VK_LValue; }
250   bool isRValue() const { return getValueKind() == VK_RValue; }
251   bool isXValue() const { return getValueKind() == VK_XValue; }
252   bool isGLValue() const { return getValueKind() != VK_RValue; }
253
254   enum LValueClassification {
255     LV_Valid,
256     LV_NotObjectType,
257     LV_IncompleteVoidType,
258     LV_DuplicateVectorComponents,
259     LV_InvalidExpression,
260     LV_InvalidMessageExpression,
261     LV_MemberFunction,
262     LV_SubObjCPropertySetting,
263     LV_ClassTemporary,
264     LV_ArrayTemporary
265   };
266   /// Reasons why an expression might not be an l-value.
267   LValueClassification ClassifyLValue(ASTContext &Ctx) const;
268
269   enum isModifiableLvalueResult {
270     MLV_Valid,
271     MLV_NotObjectType,
272     MLV_IncompleteVoidType,
273     MLV_DuplicateVectorComponents,
274     MLV_InvalidExpression,
275     MLV_LValueCast,           // Specialized form of MLV_InvalidExpression.
276     MLV_IncompleteType,
277     MLV_ConstQualified,
278     MLV_ConstQualifiedField,
279     MLV_ConstAddrSpace,
280     MLV_ArrayType,
281     MLV_NoSetterProperty,
282     MLV_MemberFunction,
283     MLV_SubObjCPropertySetting,
284     MLV_InvalidMessageExpression,
285     MLV_ClassTemporary,
286     MLV_ArrayTemporary
287   };
288   /// isModifiableLvalue - C99 6.3.2.1: an lvalue that does not have array type,
289   /// does not have an incomplete type, does not have a const-qualified type,
290   /// and if it is a structure or union, does not have any member (including,
291   /// recursively, any member or element of all contained aggregates or unions)
292   /// with a const-qualified type.
293   ///
294   /// \param Loc [in,out] - A source location which *may* be filled
295   /// in with the location of the expression making this a
296   /// non-modifiable lvalue, if specified.
297   isModifiableLvalueResult
298   isModifiableLvalue(ASTContext &Ctx, SourceLocation *Loc = nullptr) const;
299
300   /// The return type of classify(). Represents the C++11 expression
301   ///        taxonomy.
302   class Classification {
303   public:
304     /// The various classification results. Most of these mean prvalue.
305     enum Kinds {
306       CL_LValue,
307       CL_XValue,
308       CL_Function, // Functions cannot be lvalues in C.
309       CL_Void, // Void cannot be an lvalue in C.
310       CL_AddressableVoid, // Void expression whose address can be taken in C.
311       CL_DuplicateVectorComponents, // A vector shuffle with dupes.
312       CL_MemberFunction, // An expression referring to a member function
313       CL_SubObjCPropertySetting,
314       CL_ClassTemporary, // A temporary of class type, or subobject thereof.
315       CL_ArrayTemporary, // A temporary of array type.
316       CL_ObjCMessageRValue, // ObjC message is an rvalue
317       CL_PRValue // A prvalue for any other reason, of any other type
318     };
319     /// The results of modification testing.
320     enum ModifiableType {
321       CM_Untested, // testModifiable was false.
322       CM_Modifiable,
323       CM_RValue, // Not modifiable because it's an rvalue
324       CM_Function, // Not modifiable because it's a function; C++ only
325       CM_LValueCast, // Same as CM_RValue, but indicates GCC cast-as-lvalue ext
326       CM_NoSetterProperty,// Implicit assignment to ObjC property without setter
327       CM_ConstQualified,
328       CM_ConstQualifiedField,
329       CM_ConstAddrSpace,
330       CM_ArrayType,
331       CM_IncompleteType
332     };
333
334   private:
335     friend class Expr;
336
337     unsigned short Kind;
338     unsigned short Modifiable;
339
340     explicit Classification(Kinds k, ModifiableType m)
341       : Kind(k), Modifiable(m)
342     {}
343
344   public:
345     Classification() {}
346
347     Kinds getKind() const { return static_cast<Kinds>(Kind); }
348     ModifiableType getModifiable() const {
349       assert(Modifiable != CM_Untested && "Did not test for modifiability.");
350       return static_cast<ModifiableType>(Modifiable);
351     }
352     bool isLValue() const { return Kind == CL_LValue; }
353     bool isXValue() const { return Kind == CL_XValue; }
354     bool isGLValue() const { return Kind <= CL_XValue; }
355     bool isPRValue() const { return Kind >= CL_Function; }
356     bool isRValue() const { return Kind >= CL_XValue; }
357     bool isModifiable() const { return getModifiable() == CM_Modifiable; }
358
359     /// Create a simple, modifiably lvalue
360     static Classification makeSimpleLValue() {
361       return Classification(CL_LValue, CM_Modifiable);
362     }
363
364   };
365   /// Classify - Classify this expression according to the C++11
366   ///        expression taxonomy.
367   ///
368   /// C++11 defines ([basic.lval]) a new taxonomy of expressions to replace the
369   /// old lvalue vs rvalue. This function determines the type of expression this
370   /// is. There are three expression types:
371   /// - lvalues are classical lvalues as in C++03.
372   /// - prvalues are equivalent to rvalues in C++03.
373   /// - xvalues are expressions yielding unnamed rvalue references, e.g. a
374   ///   function returning an rvalue reference.
375   /// lvalues and xvalues are collectively referred to as glvalues, while
376   /// prvalues and xvalues together form rvalues.
377   Classification Classify(ASTContext &Ctx) const {
378     return ClassifyImpl(Ctx, nullptr);
379   }
380
381   /// ClassifyModifiable - Classify this expression according to the
382   ///        C++11 expression taxonomy, and see if it is valid on the left side
383   ///        of an assignment.
384   ///
385   /// This function extends classify in that it also tests whether the
386   /// expression is modifiable (C99 6.3.2.1p1).
387   /// \param Loc A source location that might be filled with a relevant location
388   ///            if the expression is not modifiable.
389   Classification ClassifyModifiable(ASTContext &Ctx, SourceLocation &Loc) const{
390     return ClassifyImpl(Ctx, &Loc);
391   }
392
393   /// getValueKindForType - Given a formal return or parameter type,
394   /// give its value kind.
395   static ExprValueKind getValueKindForType(QualType T) {
396     if (const ReferenceType *RT = T->getAs<ReferenceType>())
397       return (isa<LValueReferenceType>(RT)
398                 ? VK_LValue
399                 : (RT->getPointeeType()->isFunctionType()
400                      ? VK_LValue : VK_XValue));
401     return VK_RValue;
402   }
403
404   /// getValueKind - The value kind that this expression produces.
405   ExprValueKind getValueKind() const {
406     return static_cast<ExprValueKind>(ExprBits.ValueKind);
407   }
408
409   /// getObjectKind - The object kind that this expression produces.
410   /// Object kinds are meaningful only for expressions that yield an
411   /// l-value or x-value.
412   ExprObjectKind getObjectKind() const {
413     return static_cast<ExprObjectKind>(ExprBits.ObjectKind);
414   }
415
416   bool isOrdinaryOrBitFieldObject() const {
417     ExprObjectKind OK = getObjectKind();
418     return (OK == OK_Ordinary || OK == OK_BitField);
419   }
420
421   /// setValueKind - Set the value kind produced by this expression.
422   void setValueKind(ExprValueKind Cat) { ExprBits.ValueKind = Cat; }
423
424   /// setObjectKind - Set the object kind produced by this expression.
425   void setObjectKind(ExprObjectKind Cat) { ExprBits.ObjectKind = Cat; }
426
427 private:
428   Classification ClassifyImpl(ASTContext &Ctx, SourceLocation *Loc) const;
429
430 public:
431
432   /// Returns true if this expression is a gl-value that
433   /// potentially refers to a bit-field.
434   ///
435   /// In C++, whether a gl-value refers to a bitfield is essentially
436   /// an aspect of the value-kind type system.
437   bool refersToBitField() const { return getObjectKind() == OK_BitField; }
438
439   /// If this expression refers to a bit-field, retrieve the
440   /// declaration of that bit-field.
441   ///
442   /// Note that this returns a non-null pointer in subtly different
443   /// places than refersToBitField returns true.  In particular, this can
444   /// return a non-null pointer even for r-values loaded from
445   /// bit-fields, but it will return null for a conditional bit-field.
446   FieldDecl *getSourceBitField();
447
448   const FieldDecl *getSourceBitField() const {
449     return const_cast<Expr*>(this)->getSourceBitField();
450   }
451
452   Decl *getReferencedDeclOfCallee();
453   const Decl *getReferencedDeclOfCallee() const {
454     return const_cast<Expr*>(this)->getReferencedDeclOfCallee();
455   }
456
457   /// If this expression is an l-value for an Objective C
458   /// property, find the underlying property reference expression.
459   const ObjCPropertyRefExpr *getObjCProperty() const;
460
461   /// Check if this expression is the ObjC 'self' implicit parameter.
462   bool isObjCSelfExpr() const;
463
464   /// Returns whether this expression refers to a vector element.
465   bool refersToVectorElement() const;
466
467   /// Returns whether this expression refers to a global register
468   /// variable.
469   bool refersToGlobalRegisterVar() const;
470
471   /// Returns whether this expression has a placeholder type.
472   bool hasPlaceholderType() const {
473     return getType()->isPlaceholderType();
474   }
475
476   /// Returns whether this expression has a specific placeholder type.
477   bool hasPlaceholderType(BuiltinType::Kind K) const {
478     assert(BuiltinType::isPlaceholderTypeKind(K));
479     if (const BuiltinType *BT = dyn_cast<BuiltinType>(getType()))
480       return BT->getKind() == K;
481     return false;
482   }
483
484   /// isKnownToHaveBooleanValue - Return true if this is an integer expression
485   /// that is known to return 0 or 1.  This happens for _Bool/bool expressions
486   /// but also int expressions which are produced by things like comparisons in
487   /// C.
488   bool isKnownToHaveBooleanValue() const;
489
490   /// isIntegerConstantExpr - Return true if this expression is a valid integer
491   /// constant expression, and, if so, return its value in Result.  If not a
492   /// valid i-c-e, return false and fill in Loc (if specified) with the location
493   /// of the invalid expression.
494   ///
495   /// Note: This does not perform the implicit conversions required by C++11
496   /// [expr.const]p5.
497   bool isIntegerConstantExpr(llvm::APSInt &Result, const ASTContext &Ctx,
498                              SourceLocation *Loc = nullptr,
499                              bool isEvaluated = true) const;
500   bool isIntegerConstantExpr(const ASTContext &Ctx,
501                              SourceLocation *Loc = nullptr) const;
502
503   /// isCXX98IntegralConstantExpr - Return true if this expression is an
504   /// integral constant expression in C++98. Can only be used in C++.
505   bool isCXX98IntegralConstantExpr(const ASTContext &Ctx) const;
506
507   /// isCXX11ConstantExpr - Return true if this expression is a constant
508   /// expression in C++11. Can only be used in C++.
509   ///
510   /// Note: This does not perform the implicit conversions required by C++11
511   /// [expr.const]p5.
512   bool isCXX11ConstantExpr(const ASTContext &Ctx, APValue *Result = nullptr,
513                            SourceLocation *Loc = nullptr) const;
514
515   /// isPotentialConstantExpr - Return true if this function's definition
516   /// might be usable in a constant expression in C++11, if it were marked
517   /// constexpr. Return false if the function can never produce a constant
518   /// expression, along with diagnostics describing why not.
519   static bool isPotentialConstantExpr(const FunctionDecl *FD,
520                                       SmallVectorImpl<
521                                         PartialDiagnosticAt> &Diags);
522
523   /// isPotentialConstantExprUnevaluted - Return true if this expression might
524   /// be usable in a constant expression in C++11 in an unevaluated context, if
525   /// it were in function FD marked constexpr. Return false if the function can
526   /// never produce a constant expression, along with diagnostics describing
527   /// why not.
528   static bool isPotentialConstantExprUnevaluated(Expr *E,
529                                                  const FunctionDecl *FD,
530                                                  SmallVectorImpl<
531                                                    PartialDiagnosticAt> &Diags);
532
533   /// isConstantInitializer - Returns true if this expression can be emitted to
534   /// IR as a constant, and thus can be used as a constant initializer in C.
535   /// If this expression is not constant and Culprit is non-null,
536   /// it is used to store the address of first non constant expr.
537   bool isConstantInitializer(ASTContext &Ctx, bool ForRef,
538                              const Expr **Culprit = nullptr) const;
539
540   /// EvalStatus is a struct with detailed info about an evaluation in progress.
541   struct EvalStatus {
542     /// Whether the evaluated expression has side effects.
543     /// For example, (f() && 0) can be folded, but it still has side effects.
544     bool HasSideEffects;
545
546     /// Whether the evaluation hit undefined behavior.
547     /// For example, 1.0 / 0.0 can be folded to Inf, but has undefined behavior.
548     /// Likewise, INT_MAX + 1 can be folded to INT_MIN, but has UB.
549     bool HasUndefinedBehavior;
550
551     /// Diag - If this is non-null, it will be filled in with a stack of notes
552     /// indicating why evaluation failed (or why it failed to produce a constant
553     /// expression).
554     /// If the expression is unfoldable, the notes will indicate why it's not
555     /// foldable. If the expression is foldable, but not a constant expression,
556     /// the notes will describes why it isn't a constant expression. If the
557     /// expression *is* a constant expression, no notes will be produced.
558     SmallVectorImpl<PartialDiagnosticAt> *Diag;
559
560     EvalStatus()
561         : HasSideEffects(false), HasUndefinedBehavior(false), Diag(nullptr) {}
562
563     // hasSideEffects - Return true if the evaluated expression has
564     // side effects.
565     bool hasSideEffects() const {
566       return HasSideEffects;
567     }
568   };
569
570   /// EvalResult is a struct with detailed info about an evaluated expression.
571   struct EvalResult : EvalStatus {
572     /// Val - This is the value the expression can be folded to.
573     APValue Val;
574
575     // isGlobalLValue - Return true if the evaluated lvalue expression
576     // is global.
577     bool isGlobalLValue() const;
578   };
579
580   /// EvaluateAsRValue - Return true if this is a constant which we can fold to
581   /// an rvalue using any crazy technique (that has nothing to do with language
582   /// standards) that we want to, even if the expression has side-effects. If
583   /// this function returns true, it returns the folded constant in Result. If
584   /// the expression is a glvalue, an lvalue-to-rvalue conversion will be
585   /// applied.
586   bool EvaluateAsRValue(EvalResult &Result, const ASTContext &Ctx) const;
587
588   /// EvaluateAsBooleanCondition - Return true if this is a constant
589   /// which we can fold and convert to a boolean condition using
590   /// any crazy technique that we want to, even if the expression has
591   /// side-effects.
592   bool EvaluateAsBooleanCondition(bool &Result, const ASTContext &Ctx) const;
593
594   enum SideEffectsKind {
595     SE_NoSideEffects,          ///< Strictly evaluate the expression.
596     SE_AllowUndefinedBehavior, ///< Allow UB that we can give a value, but not
597                                ///< arbitrary unmodeled side effects.
598     SE_AllowSideEffects        ///< Allow any unmodeled side effect.
599   };
600
601   /// EvaluateAsInt - Return true if this is a constant which we can fold and
602   /// convert to an integer, using any crazy technique that we want to.
603   bool EvaluateAsInt(llvm::APSInt &Result, const ASTContext &Ctx,
604                      SideEffectsKind AllowSideEffects = SE_NoSideEffects) const;
605
606   /// EvaluateAsFloat - Return true if this is a constant which we can fold and
607   /// convert to a floating point value, using any crazy technique that we
608   /// want to.
609   bool
610   EvaluateAsFloat(llvm::APFloat &Result, const ASTContext &Ctx,
611                   SideEffectsKind AllowSideEffects = SE_NoSideEffects) const;
612
613   /// isEvaluatable - Call EvaluateAsRValue to see if this expression can be
614   /// constant folded without side-effects, but discard the result.
615   bool isEvaluatable(const ASTContext &Ctx,
616                      SideEffectsKind AllowSideEffects = SE_NoSideEffects) const;
617
618   /// HasSideEffects - This routine returns true for all those expressions
619   /// which have any effect other than producing a value. Example is a function
620   /// call, volatile variable read, or throwing an exception. If
621   /// IncludePossibleEffects is false, this call treats certain expressions with
622   /// potential side effects (such as function call-like expressions,
623   /// instantiation-dependent expressions, or invocations from a macro) as not
624   /// having side effects.
625   bool HasSideEffects(const ASTContext &Ctx,
626                       bool IncludePossibleEffects = true) const;
627
628   /// Determine whether this expression involves a call to any function
629   /// that is not trivial.
630   bool hasNonTrivialCall(const ASTContext &Ctx) const;
631
632   /// EvaluateKnownConstInt - Call EvaluateAsRValue and return the folded
633   /// integer. This must be called on an expression that constant folds to an
634   /// integer.
635   llvm::APSInt EvaluateKnownConstInt(const ASTContext &Ctx,
636                     SmallVectorImpl<PartialDiagnosticAt> *Diag = nullptr) const;
637
638   void EvaluateForOverflow(const ASTContext &Ctx) const;
639
640   /// EvaluateAsLValue - Evaluate an expression to see if we can fold it to an
641   /// lvalue with link time known address, with no side-effects.
642   bool EvaluateAsLValue(EvalResult &Result, const ASTContext &Ctx) const;
643
644   /// EvaluateAsInitializer - Evaluate an expression as if it were the
645   /// initializer of the given declaration. Returns true if the initializer
646   /// can be folded to a constant, and produces any relevant notes. In C++11,
647   /// notes will be produced if the expression is not a constant expression.
648   bool EvaluateAsInitializer(APValue &Result, const ASTContext &Ctx,
649                              const VarDecl *VD,
650                              SmallVectorImpl<PartialDiagnosticAt> &Notes) const;
651
652   /// EvaluateWithSubstitution - Evaluate an expression as if from the context
653   /// of a call to the given function with the given arguments, inside an
654   /// unevaluated context. Returns true if the expression could be folded to a
655   /// constant.
656   bool EvaluateWithSubstitution(APValue &Value, ASTContext &Ctx,
657                                 const FunctionDecl *Callee,
658                                 ArrayRef<const Expr*> Args,
659                                 const Expr *This = nullptr) const;
660
661   /// Indicates how the constant expression will be used.
662   enum ConstExprUsage { EvaluateForCodeGen, EvaluateForMangling };
663
664   /// Evaluate an expression that is required to be a constant expression.
665   bool EvaluateAsConstantExpr(EvalResult &Result, ConstExprUsage Usage,
666                               const ASTContext &Ctx) const;
667
668   /// If the current Expr is a pointer, this will try to statically
669   /// determine the number of bytes available where the pointer is pointing.
670   /// Returns true if all of the above holds and we were able to figure out the
671   /// size, false otherwise.
672   ///
673   /// \param Type - How to evaluate the size of the Expr, as defined by the
674   /// "type" parameter of __builtin_object_size
675   bool tryEvaluateObjectSize(uint64_t &Result, ASTContext &Ctx,
676                              unsigned Type) const;
677
678   /// Enumeration used to describe the kind of Null pointer constant
679   /// returned from \c isNullPointerConstant().
680   enum NullPointerConstantKind {
681     /// Expression is not a Null pointer constant.
682     NPCK_NotNull = 0,
683
684     /// Expression is a Null pointer constant built from a zero integer
685     /// expression that is not a simple, possibly parenthesized, zero literal.
686     /// C++ Core Issue 903 will classify these expressions as "not pointers"
687     /// once it is adopted.
688     /// http://www.open-std.org/jtc1/sc22/wg21/docs/cwg_active.html#903
689     NPCK_ZeroExpression,
690
691     /// Expression is a Null pointer constant built from a literal zero.
692     NPCK_ZeroLiteral,
693
694     /// Expression is a C++11 nullptr.
695     NPCK_CXX11_nullptr,
696
697     /// Expression is a GNU-style __null constant.
698     NPCK_GNUNull
699   };
700
701   /// Enumeration used to describe how \c isNullPointerConstant()
702   /// should cope with value-dependent expressions.
703   enum NullPointerConstantValueDependence {
704     /// Specifies that the expression should never be value-dependent.
705     NPC_NeverValueDependent = 0,
706
707     /// Specifies that a value-dependent expression of integral or
708     /// dependent type should be considered a null pointer constant.
709     NPC_ValueDependentIsNull,
710
711     /// Specifies that a value-dependent expression should be considered
712     /// to never be a null pointer constant.
713     NPC_ValueDependentIsNotNull
714   };
715
716   /// isNullPointerConstant - C99 6.3.2.3p3 - Test if this reduces down to
717   /// a Null pointer constant. The return value can further distinguish the
718   /// kind of NULL pointer constant that was detected.
719   NullPointerConstantKind isNullPointerConstant(
720       ASTContext &Ctx,
721       NullPointerConstantValueDependence NPC) const;
722
723   /// isOBJCGCCandidate - Return true if this expression may be used in a read/
724   /// write barrier.
725   bool isOBJCGCCandidate(ASTContext &Ctx) const;
726
727   /// Returns true if this expression is a bound member function.
728   bool isBoundMemberFunction(ASTContext &Ctx) const;
729
730   /// Given an expression of bound-member type, find the type
731   /// of the member.  Returns null if this is an *overloaded* bound
732   /// member expression.
733   static QualType findBoundMemberType(const Expr *expr);
734
735   /// IgnoreImpCasts - Skip past any implicit casts which might
736   /// surround this expression.  Only skips ImplicitCastExprs.
737   Expr *IgnoreImpCasts() LLVM_READONLY;
738
739   /// IgnoreImplicit - Skip past any implicit AST nodes which might
740   /// surround this expression.
741   Expr *IgnoreImplicit() LLVM_READONLY {
742     return cast<Expr>(Stmt::IgnoreImplicit());
743   }
744
745   const Expr *IgnoreImplicit() const LLVM_READONLY {
746     return const_cast<Expr*>(this)->IgnoreImplicit();
747   }
748
749   /// IgnoreParens - Ignore parentheses.  If this Expr is a ParenExpr, return
750   ///  its subexpression.  If that subexpression is also a ParenExpr,
751   ///  then this method recursively returns its subexpression, and so forth.
752   ///  Otherwise, the method returns the current Expr.
753   Expr *IgnoreParens() LLVM_READONLY;
754
755   /// IgnoreParenCasts - Ignore parentheses and casts.  Strip off any ParenExpr
756   /// or CastExprs, returning their operand.
757   Expr *IgnoreParenCasts() LLVM_READONLY;
758
759   /// Ignore casts.  Strip off any CastExprs, returning their operand.
760   Expr *IgnoreCasts() LLVM_READONLY;
761
762   /// IgnoreParenImpCasts - Ignore parentheses and implicit casts.  Strip off
763   /// any ParenExpr or ImplicitCastExprs, returning their operand.
764   Expr *IgnoreParenImpCasts() LLVM_READONLY;
765
766   /// IgnoreConversionOperator - Ignore conversion operator. If this Expr is a
767   /// call to a conversion operator, return the argument.
768   Expr *IgnoreConversionOperator() LLVM_READONLY;
769
770   const Expr *IgnoreConversionOperator() const LLVM_READONLY {
771     return const_cast<Expr*>(this)->IgnoreConversionOperator();
772   }
773
774   const Expr *IgnoreParenImpCasts() const LLVM_READONLY {
775     return const_cast<Expr*>(this)->IgnoreParenImpCasts();
776   }
777
778   /// Ignore parentheses and lvalue casts.  Strip off any ParenExpr and
779   /// CastExprs that represent lvalue casts, returning their operand.
780   Expr *IgnoreParenLValueCasts() LLVM_READONLY;
781
782   const Expr *IgnoreParenLValueCasts() const LLVM_READONLY {
783     return const_cast<Expr*>(this)->IgnoreParenLValueCasts();
784   }
785
786   /// IgnoreParenNoopCasts - Ignore parentheses and casts that do not change the
787   /// value (including ptr->int casts of the same size).  Strip off any
788   /// ParenExpr or CastExprs, returning their operand.
789   Expr *IgnoreParenNoopCasts(ASTContext &Ctx) LLVM_READONLY;
790
791   /// Ignore parentheses and derived-to-base casts.
792   Expr *ignoreParenBaseCasts() LLVM_READONLY;
793
794   const Expr *ignoreParenBaseCasts() const LLVM_READONLY {
795     return const_cast<Expr*>(this)->ignoreParenBaseCasts();
796   }
797
798   /// Determine whether this expression is a default function argument.
799   ///
800   /// Default arguments are implicitly generated in the abstract syntax tree
801   /// by semantic analysis for function calls, object constructions, etc. in
802   /// C++. Default arguments are represented by \c CXXDefaultArgExpr nodes;
803   /// this routine also looks through any implicit casts to determine whether
804   /// the expression is a default argument.
805   bool isDefaultArgument() const;
806
807   /// Determine whether the result of this expression is a
808   /// temporary object of the given class type.
809   bool isTemporaryObject(ASTContext &Ctx, const CXXRecordDecl *TempTy) const;
810
811   /// Whether this expression is an implicit reference to 'this' in C++.
812   bool isImplicitCXXThis() const;
813
814   const Expr *IgnoreImpCasts() const LLVM_READONLY {
815     return const_cast<Expr*>(this)->IgnoreImpCasts();
816   }
817   const Expr *IgnoreParens() const LLVM_READONLY {
818     return const_cast<Expr*>(this)->IgnoreParens();
819   }
820   const Expr *IgnoreParenCasts() const LLVM_READONLY {
821     return const_cast<Expr*>(this)->IgnoreParenCasts();
822   }
823   /// Strip off casts, but keep parentheses.
824   const Expr *IgnoreCasts() const LLVM_READONLY {
825     return const_cast<Expr*>(this)->IgnoreCasts();
826   }
827
828   const Expr *IgnoreParenNoopCasts(ASTContext &Ctx) const LLVM_READONLY {
829     return const_cast<Expr*>(this)->IgnoreParenNoopCasts(Ctx);
830   }
831
832   static bool hasAnyTypeDependentArguments(ArrayRef<Expr *> Exprs);
833
834   /// For an expression of class type or pointer to class type,
835   /// return the most derived class decl the expression is known to refer to.
836   ///
837   /// If this expression is a cast, this method looks through it to find the
838   /// most derived decl that can be inferred from the expression.
839   /// This is valid because derived-to-base conversions have undefined
840   /// behavior if the object isn't dynamically of the derived type.
841   const CXXRecordDecl *getBestDynamicClassType() const;
842
843   /// Get the inner expression that determines the best dynamic class.
844   /// If this is a prvalue, we guarantee that it is of the most-derived type
845   /// for the object itself.
846   const Expr *getBestDynamicClassTypeExpr() const;
847
848   /// Walk outwards from an expression we want to bind a reference to and
849   /// find the expression whose lifetime needs to be extended. Record
850   /// the LHSs of comma expressions and adjustments needed along the path.
851   const Expr *skipRValueSubobjectAdjustments(
852       SmallVectorImpl<const Expr *> &CommaLHS,
853       SmallVectorImpl<SubobjectAdjustment> &Adjustments) const;
854   const Expr *skipRValueSubobjectAdjustments() const {
855     SmallVector<const Expr *, 8> CommaLHSs;
856     SmallVector<SubobjectAdjustment, 8> Adjustments;
857     return skipRValueSubobjectAdjustments(CommaLHSs, Adjustments);
858   }
859
860   static bool classof(const Stmt *T) {
861     return T->getStmtClass() >= firstExprConstant &&
862            T->getStmtClass() <= lastExprConstant;
863   }
864 };
865
866 //===----------------------------------------------------------------------===//
867 // Primary Expressions.
868 //===----------------------------------------------------------------------===//
869
870 /// OpaqueValueExpr - An expression referring to an opaque object of a
871 /// fixed type and value class.  These don't correspond to concrete
872 /// syntax; instead they're used to express operations (usually copy
873 /// operations) on values whose source is generally obvious from
874 /// context.
875 class OpaqueValueExpr : public Expr {
876   friend class ASTStmtReader;
877   Expr *SourceExpr;
878   SourceLocation Loc;
879
880 public:
881   OpaqueValueExpr(SourceLocation Loc, QualType T, ExprValueKind VK,
882                   ExprObjectKind OK = OK_Ordinary,
883                   Expr *SourceExpr = nullptr)
884     : Expr(OpaqueValueExprClass, T, VK, OK,
885            T->isDependentType() ||
886            (SourceExpr && SourceExpr->isTypeDependent()),
887            T->isDependentType() || 
888            (SourceExpr && SourceExpr->isValueDependent()),
889            T->isInstantiationDependentType() ||
890            (SourceExpr && SourceExpr->isInstantiationDependent()),
891            false),
892       SourceExpr(SourceExpr), Loc(Loc) {
893     setIsUnique(false);
894   }
895
896   /// Given an expression which invokes a copy constructor --- i.e.  a
897   /// CXXConstructExpr, possibly wrapped in an ExprWithCleanups ---
898   /// find the OpaqueValueExpr that's the source of the construction.
899   static const OpaqueValueExpr *findInCopyConstruct(const Expr *expr);
900
901   explicit OpaqueValueExpr(EmptyShell Empty)
902     : Expr(OpaqueValueExprClass, Empty) { }
903
904   /// Retrieve the location of this expression.
905   SourceLocation getLocation() const { return Loc; }
906
907   SourceLocation getLocStart() const LLVM_READONLY {
908     return SourceExpr ? SourceExpr->getLocStart() : Loc;
909   }
910   SourceLocation getLocEnd() const LLVM_READONLY {
911     return SourceExpr ? SourceExpr->getLocEnd() : Loc;
912   }
913   SourceLocation getExprLoc() const LLVM_READONLY {
914     if (SourceExpr) return SourceExpr->getExprLoc();
915     return Loc;
916   }
917
918   child_range children() {
919     return child_range(child_iterator(), child_iterator());
920   }
921
922   const_child_range children() const {
923     return const_child_range(const_child_iterator(), const_child_iterator());
924   }
925
926   /// The source expression of an opaque value expression is the
927   /// expression which originally generated the value.  This is
928   /// provided as a convenience for analyses that don't wish to
929   /// precisely model the execution behavior of the program.
930   ///
931   /// The source expression is typically set when building the
932   /// expression which binds the opaque value expression in the first
933   /// place.
934   Expr *getSourceExpr() const { return SourceExpr; }
935
936   void setIsUnique(bool V) {
937     assert((!V || SourceExpr) &&
938            "unique OVEs are expected to have source expressions");
939     OpaqueValueExprBits.IsUnique = V;
940   }
941
942   bool isUnique() const { return OpaqueValueExprBits.IsUnique; }
943
944   static bool classof(const Stmt *T) {
945     return T->getStmtClass() == OpaqueValueExprClass;
946   }
947 };
948
949 /// A reference to a declared variable, function, enum, etc.
950 /// [C99 6.5.1p2]
951 ///
952 /// This encodes all the information about how a declaration is referenced
953 /// within an expression.
954 ///
955 /// There are several optional constructs attached to DeclRefExprs only when
956 /// they apply in order to conserve memory. These are laid out past the end of
957 /// the object, and flags in the DeclRefExprBitfield track whether they exist:
958 ///
959 ///   DeclRefExprBits.HasQualifier:
960 ///       Specifies when this declaration reference expression has a C++
961 ///       nested-name-specifier.
962 ///   DeclRefExprBits.HasFoundDecl:
963 ///       Specifies when this declaration reference expression has a record of
964 ///       a NamedDecl (different from the referenced ValueDecl) which was found
965 ///       during name lookup and/or overload resolution.
966 ///   DeclRefExprBits.HasTemplateKWAndArgsInfo:
967 ///       Specifies when this declaration reference expression has an explicit
968 ///       C++ template keyword and/or template argument list.
969 ///   DeclRefExprBits.RefersToEnclosingVariableOrCapture
970 ///       Specifies when this declaration reference expression (validly)
971 ///       refers to an enclosed local or a captured variable.
972 class DeclRefExpr final
973     : public Expr,
974       private llvm::TrailingObjects<DeclRefExpr, NestedNameSpecifierLoc,
975                                     NamedDecl *, ASTTemplateKWAndArgsInfo,
976                                     TemplateArgumentLoc> {
977   /// The declaration that we are referencing.
978   ValueDecl *D;
979
980   /// The location of the declaration name itself.
981   SourceLocation Loc;
982
983   /// Provides source/type location info for the declaration name
984   /// embedded in D.
985   DeclarationNameLoc DNLoc;
986
987   size_t numTrailingObjects(OverloadToken<NestedNameSpecifierLoc>) const {
988     return hasQualifier() ? 1 : 0;
989   }
990
991   size_t numTrailingObjects(OverloadToken<NamedDecl *>) const {
992     return hasFoundDecl() ? 1 : 0;
993   }
994
995   size_t numTrailingObjects(OverloadToken<ASTTemplateKWAndArgsInfo>) const {
996     return hasTemplateKWAndArgsInfo() ? 1 : 0;
997   }
998
999   /// Test whether there is a distinct FoundDecl attached to the end of
1000   /// this DRE.
1001   bool hasFoundDecl() const { return DeclRefExprBits.HasFoundDecl; }
1002
1003   DeclRefExpr(const ASTContext &Ctx,
1004               NestedNameSpecifierLoc QualifierLoc,
1005               SourceLocation TemplateKWLoc,
1006               ValueDecl *D, bool RefersToEnlosingVariableOrCapture,
1007               const DeclarationNameInfo &NameInfo,
1008               NamedDecl *FoundD,
1009               const TemplateArgumentListInfo *TemplateArgs,
1010               QualType T, ExprValueKind VK);
1011
1012   /// Construct an empty declaration reference expression.
1013   explicit DeclRefExpr(EmptyShell Empty)
1014     : Expr(DeclRefExprClass, Empty) { }
1015
1016   /// Computes the type- and value-dependence flags for this
1017   /// declaration reference expression.
1018   void computeDependence(const ASTContext &C);
1019
1020 public:
1021   DeclRefExpr(ValueDecl *D, bool RefersToEnclosingVariableOrCapture, QualType T,
1022               ExprValueKind VK, SourceLocation L,
1023               const DeclarationNameLoc &LocInfo = DeclarationNameLoc())
1024     : Expr(DeclRefExprClass, T, VK, OK_Ordinary, false, false, false, false),
1025       D(D), Loc(L), DNLoc(LocInfo) {
1026     DeclRefExprBits.HasQualifier = 0;
1027     DeclRefExprBits.HasTemplateKWAndArgsInfo = 0;
1028     DeclRefExprBits.HasFoundDecl = 0;
1029     DeclRefExprBits.HadMultipleCandidates = 0;
1030     DeclRefExprBits.RefersToEnclosingVariableOrCapture =
1031         RefersToEnclosingVariableOrCapture;
1032     computeDependence(D->getASTContext());
1033   }
1034
1035   static DeclRefExpr *
1036   Create(const ASTContext &Context, NestedNameSpecifierLoc QualifierLoc,
1037          SourceLocation TemplateKWLoc, ValueDecl *D,
1038          bool RefersToEnclosingVariableOrCapture, SourceLocation NameLoc,
1039          QualType T, ExprValueKind VK, NamedDecl *FoundD = nullptr,
1040          const TemplateArgumentListInfo *TemplateArgs = nullptr);
1041
1042   static DeclRefExpr *
1043   Create(const ASTContext &Context, NestedNameSpecifierLoc QualifierLoc,
1044          SourceLocation TemplateKWLoc, ValueDecl *D,
1045          bool RefersToEnclosingVariableOrCapture,
1046          const DeclarationNameInfo &NameInfo, QualType T, ExprValueKind VK,
1047          NamedDecl *FoundD = nullptr,
1048          const TemplateArgumentListInfo *TemplateArgs = nullptr);
1049
1050   /// Construct an empty declaration reference expression.
1051   static DeclRefExpr *CreateEmpty(const ASTContext &Context,
1052                                   bool HasQualifier,
1053                                   bool HasFoundDecl,
1054                                   bool HasTemplateKWAndArgsInfo,
1055                                   unsigned NumTemplateArgs);
1056
1057   ValueDecl *getDecl() { return D; }
1058   const ValueDecl *getDecl() const { return D; }
1059   void setDecl(ValueDecl *NewD) { D = NewD; }
1060
1061   DeclarationNameInfo getNameInfo() const {
1062     return DeclarationNameInfo(getDecl()->getDeclName(), Loc, DNLoc);
1063   }
1064
1065   SourceLocation getLocation() const { return Loc; }
1066   void setLocation(SourceLocation L) { Loc = L; }
1067   SourceLocation getLocStart() const LLVM_READONLY;
1068   SourceLocation getLocEnd() const LLVM_READONLY;
1069
1070   /// Determine whether this declaration reference was preceded by a
1071   /// C++ nested-name-specifier, e.g., \c N::foo.
1072   bool hasQualifier() const { return DeclRefExprBits.HasQualifier; }
1073
1074   /// If the name was qualified, retrieves the nested-name-specifier
1075   /// that precedes the name, with source-location information.
1076   NestedNameSpecifierLoc getQualifierLoc() const {
1077     if (!hasQualifier())
1078       return NestedNameSpecifierLoc();
1079     return *getTrailingObjects<NestedNameSpecifierLoc>();
1080   }
1081
1082   /// If the name was qualified, retrieves the nested-name-specifier
1083   /// that precedes the name. Otherwise, returns NULL.
1084   NestedNameSpecifier *getQualifier() const {
1085     return getQualifierLoc().getNestedNameSpecifier();
1086   }
1087
1088   /// Get the NamedDecl through which this reference occurred.
1089   ///
1090   /// This Decl may be different from the ValueDecl actually referred to in the
1091   /// presence of using declarations, etc. It always returns non-NULL, and may
1092   /// simple return the ValueDecl when appropriate.
1093
1094   NamedDecl *getFoundDecl() {
1095     return hasFoundDecl() ? *getTrailingObjects<NamedDecl *>() : D;
1096   }
1097
1098   /// Get the NamedDecl through which this reference occurred.
1099   /// See non-const variant.
1100   const NamedDecl *getFoundDecl() const {
1101     return hasFoundDecl() ? *getTrailingObjects<NamedDecl *>() : D;
1102   }
1103
1104   bool hasTemplateKWAndArgsInfo() const {
1105     return DeclRefExprBits.HasTemplateKWAndArgsInfo;
1106   }
1107
1108   /// Retrieve the location of the template keyword preceding
1109   /// this name, if any.
1110   SourceLocation getTemplateKeywordLoc() const {
1111     if (!hasTemplateKWAndArgsInfo()) return SourceLocation();
1112     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->TemplateKWLoc;
1113   }
1114
1115   /// Retrieve the location of the left angle bracket starting the
1116   /// explicit template argument list following the name, if any.
1117   SourceLocation getLAngleLoc() const {
1118     if (!hasTemplateKWAndArgsInfo()) return SourceLocation();
1119     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->LAngleLoc;
1120   }
1121
1122   /// Retrieve the location of the right angle bracket ending the
1123   /// explicit template argument list following the name, if any.
1124   SourceLocation getRAngleLoc() const {
1125     if (!hasTemplateKWAndArgsInfo()) return SourceLocation();
1126     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->RAngleLoc;
1127   }
1128
1129   /// Determines whether the name in this declaration reference
1130   /// was preceded by the template keyword.
1131   bool hasTemplateKeyword() const { return getTemplateKeywordLoc().isValid(); }
1132
1133   /// Determines whether this declaration reference was followed by an
1134   /// explicit template argument list.
1135   bool hasExplicitTemplateArgs() const { return getLAngleLoc().isValid(); }
1136
1137   /// Copies the template arguments (if present) into the given
1138   /// structure.
1139   void copyTemplateArgumentsInto(TemplateArgumentListInfo &List) const {
1140     if (hasExplicitTemplateArgs())
1141       getTrailingObjects<ASTTemplateKWAndArgsInfo>()->copyInto(
1142           getTrailingObjects<TemplateArgumentLoc>(), List);
1143   }
1144
1145   /// Retrieve the template arguments provided as part of this
1146   /// template-id.
1147   const TemplateArgumentLoc *getTemplateArgs() const {
1148     if (!hasExplicitTemplateArgs())
1149       return nullptr;
1150
1151     return getTrailingObjects<TemplateArgumentLoc>();
1152   }
1153
1154   /// Retrieve the number of template arguments provided as part of this
1155   /// template-id.
1156   unsigned getNumTemplateArgs() const {
1157     if (!hasExplicitTemplateArgs())
1158       return 0;
1159
1160     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->NumTemplateArgs;
1161   }
1162
1163   ArrayRef<TemplateArgumentLoc> template_arguments() const {
1164     return {getTemplateArgs(), getNumTemplateArgs()};
1165   }
1166
1167   /// Returns true if this expression refers to a function that
1168   /// was resolved from an overloaded set having size greater than 1.
1169   bool hadMultipleCandidates() const {
1170     return DeclRefExprBits.HadMultipleCandidates;
1171   }
1172   /// Sets the flag telling whether this expression refers to
1173   /// a function that was resolved from an overloaded set having size
1174   /// greater than 1.
1175   void setHadMultipleCandidates(bool V = true) {
1176     DeclRefExprBits.HadMultipleCandidates = V;
1177   }
1178
1179   /// Does this DeclRefExpr refer to an enclosing local or a captured
1180   /// variable?
1181   bool refersToEnclosingVariableOrCapture() const {
1182     return DeclRefExprBits.RefersToEnclosingVariableOrCapture;
1183   }
1184
1185   static bool classof(const Stmt *T) {
1186     return T->getStmtClass() == DeclRefExprClass;
1187   }
1188
1189   // Iterators
1190   child_range children() {
1191     return child_range(child_iterator(), child_iterator());
1192   }
1193
1194   const_child_range children() const {
1195     return const_child_range(const_child_iterator(), const_child_iterator());
1196   }
1197
1198   friend TrailingObjects;
1199   friend class ASTStmtReader;
1200   friend class ASTStmtWriter;
1201 };
1202
1203 /// [C99 6.4.2.2] - A predefined identifier such as __func__.
1204 class PredefinedExpr : public Expr {
1205 public:
1206   enum IdentType {
1207     Func,
1208     Function,
1209     LFunction, // Same as Function, but as wide string.
1210     FuncDName,
1211     FuncSig,
1212     LFuncSig, // Same as FuncSig, but as as wide string
1213     PrettyFunction,
1214     /// The same as PrettyFunction, except that the
1215     /// 'virtual' keyword is omitted for virtual member functions.
1216     PrettyFunctionNoVirtual
1217   };
1218
1219 private:
1220   SourceLocation Loc;
1221   IdentType Type;
1222   Stmt *FnName;
1223
1224 public:
1225   PredefinedExpr(SourceLocation L, QualType FNTy, IdentType IT,
1226                  StringLiteral *SL);
1227
1228   /// Construct an empty predefined expression.
1229   explicit PredefinedExpr(EmptyShell Empty)
1230       : Expr(PredefinedExprClass, Empty), Loc(), Type(Func), FnName(nullptr) {}
1231
1232   IdentType getIdentType() const { return Type; }
1233
1234   SourceLocation getLocation() const { return Loc; }
1235   void setLocation(SourceLocation L) { Loc = L; }
1236
1237   StringLiteral *getFunctionName();
1238   const StringLiteral *getFunctionName() const {
1239     return const_cast<PredefinedExpr *>(this)->getFunctionName();
1240   }
1241
1242   static StringRef getIdentTypeName(IdentType IT);
1243   static std::string ComputeName(IdentType IT, const Decl *CurrentDecl);
1244
1245   SourceLocation getLocStart() const LLVM_READONLY { return Loc; }
1246   SourceLocation getLocEnd() const LLVM_READONLY { return Loc; }
1247
1248   static bool classof(const Stmt *T) {
1249     return T->getStmtClass() == PredefinedExprClass;
1250   }
1251
1252   // Iterators
1253   child_range children() { return child_range(&FnName, &FnName + 1); }
1254   const_child_range children() const {
1255     return const_child_range(&FnName, &FnName + 1);
1256   }
1257
1258   friend class ASTStmtReader;
1259 };
1260
1261 /// Used by IntegerLiteral/FloatingLiteral to store the numeric without
1262 /// leaking memory.
1263 ///
1264 /// For large floats/integers, APFloat/APInt will allocate memory from the heap
1265 /// to represent these numbers.  Unfortunately, when we use a BumpPtrAllocator
1266 /// to allocate IntegerLiteral/FloatingLiteral nodes the memory associated with
1267 /// the APFloat/APInt values will never get freed. APNumericStorage uses
1268 /// ASTContext's allocator for memory allocation.
1269 class APNumericStorage {
1270   union {
1271     uint64_t VAL;    ///< Used to store the <= 64 bits integer value.
1272     uint64_t *pVal;  ///< Used to store the >64 bits integer value.
1273   };
1274   unsigned BitWidth;
1275
1276   bool hasAllocation() const { return llvm::APInt::getNumWords(BitWidth) > 1; }
1277
1278   APNumericStorage(const APNumericStorage &) = delete;
1279   void operator=(const APNumericStorage &) = delete;
1280
1281 protected:
1282   APNumericStorage() : VAL(0), BitWidth(0) { }
1283
1284   llvm::APInt getIntValue() const {
1285     unsigned NumWords = llvm::APInt::getNumWords(BitWidth);
1286     if (NumWords > 1)
1287       return llvm::APInt(BitWidth, NumWords, pVal);
1288     else
1289       return llvm::APInt(BitWidth, VAL);
1290   }
1291   void setIntValue(const ASTContext &C, const llvm::APInt &Val);
1292 };
1293
1294 class APIntStorage : private APNumericStorage {
1295 public:
1296   llvm::APInt getValue() const { return getIntValue(); }
1297   void setValue(const ASTContext &C, const llvm::APInt &Val) {
1298     setIntValue(C, Val);
1299   }
1300 };
1301
1302 class APFloatStorage : private APNumericStorage {
1303 public:
1304   llvm::APFloat getValue(const llvm::fltSemantics &Semantics) const {
1305     return llvm::APFloat(Semantics, getIntValue());
1306   }
1307   void setValue(const ASTContext &C, const llvm::APFloat &Val) {
1308     setIntValue(C, Val.bitcastToAPInt());
1309   }
1310 };
1311
1312 class IntegerLiteral : public Expr, public APIntStorage {
1313   SourceLocation Loc;
1314
1315   /// Construct an empty integer literal.
1316   explicit IntegerLiteral(EmptyShell Empty)
1317     : Expr(IntegerLiteralClass, Empty) { }
1318
1319 public:
1320   // type should be IntTy, LongTy, LongLongTy, UnsignedIntTy, UnsignedLongTy,
1321   // or UnsignedLongLongTy
1322   IntegerLiteral(const ASTContext &C, const llvm::APInt &V, QualType type,
1323                  SourceLocation l);
1324
1325   /// Returns a new integer literal with value 'V' and type 'type'.
1326   /// \param type - either IntTy, LongTy, LongLongTy, UnsignedIntTy,
1327   /// UnsignedLongTy, or UnsignedLongLongTy which should match the size of V
1328   /// \param V - the value that the returned integer literal contains.
1329   static IntegerLiteral *Create(const ASTContext &C, const llvm::APInt &V,
1330                                 QualType type, SourceLocation l);
1331   /// Returns a new empty integer literal.
1332   static IntegerLiteral *Create(const ASTContext &C, EmptyShell Empty);
1333
1334   SourceLocation getLocStart() const LLVM_READONLY { return Loc; }
1335   SourceLocation getLocEnd() const LLVM_READONLY { return Loc; }
1336
1337   /// Retrieve the location of the literal.
1338   SourceLocation getLocation() const { return Loc; }
1339
1340   void setLocation(SourceLocation Location) { Loc = Location; }
1341
1342   static bool classof(const Stmt *T) {
1343     return T->getStmtClass() == IntegerLiteralClass;
1344   }
1345
1346   // Iterators
1347   child_range children() {
1348     return child_range(child_iterator(), child_iterator());
1349   }
1350   const_child_range children() const {
1351     return const_child_range(const_child_iterator(), const_child_iterator());
1352   }
1353 };
1354
1355 class FixedPointLiteral : public Expr, public APIntStorage {
1356   SourceLocation Loc;
1357   unsigned Scale;
1358
1359   /// \brief Construct an empty integer literal.
1360   explicit FixedPointLiteral(EmptyShell Empty)
1361       : Expr(FixedPointLiteralClass, Empty) {}
1362
1363  public:
1364   FixedPointLiteral(const ASTContext &C, const llvm::APInt &V, QualType type,
1365                     SourceLocation l, unsigned Scale);
1366
1367   // Store the int as is without any bit shifting.
1368   static FixedPointLiteral *CreateFromRawInt(const ASTContext &C,
1369                                              const llvm::APInt &V,
1370                                              QualType type, SourceLocation l,
1371                                              unsigned Scale);
1372
1373   SourceLocation getLocStart() const LLVM_READONLY { return Loc; }
1374   SourceLocation getLocEnd() const LLVM_READONLY { return Loc; }
1375
1376   /// \brief Retrieve the location of the literal.
1377   SourceLocation getLocation() const { return Loc; }
1378
1379   void setLocation(SourceLocation Location) { Loc = Location; }
1380
1381   static bool classof(const Stmt *T) {
1382     return T->getStmtClass() == FixedPointLiteralClass;
1383   }
1384
1385   std::string getValueAsString(unsigned Radix) const;
1386
1387   // Iterators
1388   child_range children() {
1389     return child_range(child_iterator(), child_iterator());
1390   }
1391   const_child_range children() const {
1392     return const_child_range(const_child_iterator(), const_child_iterator());
1393   }
1394 };
1395
1396 class CharacterLiteral : public Expr {
1397 public:
1398   enum CharacterKind {
1399     Ascii,
1400     Wide,
1401     UTF8,
1402     UTF16,
1403     UTF32
1404   };
1405
1406 private:
1407   unsigned Value;
1408   SourceLocation Loc;
1409 public:
1410   // type should be IntTy
1411   CharacterLiteral(unsigned value, CharacterKind kind, QualType type,
1412                    SourceLocation l)
1413     : Expr(CharacterLiteralClass, type, VK_RValue, OK_Ordinary, false, false,
1414            false, false),
1415       Value(value), Loc(l) {
1416     CharacterLiteralBits.Kind = kind;
1417   }
1418
1419   /// Construct an empty character literal.
1420   CharacterLiteral(EmptyShell Empty) : Expr(CharacterLiteralClass, Empty) { }
1421
1422   SourceLocation getLocation() const { return Loc; }
1423   CharacterKind getKind() const {
1424     return static_cast<CharacterKind>(CharacterLiteralBits.Kind);
1425   }
1426
1427   SourceLocation getLocStart() const LLVM_READONLY { return Loc; }
1428   SourceLocation getLocEnd() const LLVM_READONLY { return Loc; }
1429
1430   unsigned getValue() const { return Value; }
1431
1432   void setLocation(SourceLocation Location) { Loc = Location; }
1433   void setKind(CharacterKind kind) { CharacterLiteralBits.Kind = kind; }
1434   void setValue(unsigned Val) { Value = Val; }
1435
1436   static bool classof(const Stmt *T) {
1437     return T->getStmtClass() == CharacterLiteralClass;
1438   }
1439
1440   // Iterators
1441   child_range children() {
1442     return child_range(child_iterator(), child_iterator());
1443   }
1444   const_child_range children() const {
1445     return const_child_range(const_child_iterator(), const_child_iterator());
1446   }
1447 };
1448
1449 class FloatingLiteral : public Expr, private APFloatStorage {
1450   SourceLocation Loc;
1451
1452   FloatingLiteral(const ASTContext &C, const llvm::APFloat &V, bool isexact,
1453                   QualType Type, SourceLocation L);
1454
1455   /// Construct an empty floating-point literal.
1456   explicit FloatingLiteral(const ASTContext &C, EmptyShell Empty);
1457
1458 public:
1459   static FloatingLiteral *Create(const ASTContext &C, const llvm::APFloat &V,
1460                                  bool isexact, QualType Type, SourceLocation L);
1461   static FloatingLiteral *Create(const ASTContext &C, EmptyShell Empty);
1462
1463   llvm::APFloat getValue() const {
1464     return APFloatStorage::getValue(getSemantics());
1465   }
1466   void setValue(const ASTContext &C, const llvm::APFloat &Val) {
1467     assert(&getSemantics() == &Val.getSemantics() && "Inconsistent semantics");
1468     APFloatStorage::setValue(C, Val);
1469   }
1470
1471   /// Get a raw enumeration value representing the floating-point semantics of
1472   /// this literal (32-bit IEEE, x87, ...), suitable for serialisation.
1473   APFloatSemantics getRawSemantics() const {
1474     return static_cast<APFloatSemantics>(FloatingLiteralBits.Semantics);
1475   }
1476
1477   /// Set the raw enumeration value representing the floating-point semantics of
1478   /// this literal (32-bit IEEE, x87, ...), suitable for serialisation.
1479   void setRawSemantics(APFloatSemantics Sem) {
1480     FloatingLiteralBits.Semantics = Sem;
1481   }
1482
1483   /// Return the APFloat semantics this literal uses.
1484   const llvm::fltSemantics &getSemantics() const;
1485
1486   /// Set the APFloat semantics this literal uses.
1487   void setSemantics(const llvm::fltSemantics &Sem);
1488
1489   bool isExact() const { return FloatingLiteralBits.IsExact; }
1490   void setExact(bool E) { FloatingLiteralBits.IsExact = E; }
1491
1492   /// getValueAsApproximateDouble - This returns the value as an inaccurate
1493   /// double.  Note that this may cause loss of precision, but is useful for
1494   /// debugging dumps, etc.
1495   double getValueAsApproximateDouble() const;
1496
1497   SourceLocation getLocation() const { return Loc; }
1498   void setLocation(SourceLocation L) { Loc = L; }
1499
1500   SourceLocation getLocStart() const LLVM_READONLY { return Loc; }
1501   SourceLocation getLocEnd() const LLVM_READONLY { return Loc; }
1502
1503   static bool classof(const Stmt *T) {
1504     return T->getStmtClass() == FloatingLiteralClass;
1505   }
1506
1507   // Iterators
1508   child_range children() {
1509     return child_range(child_iterator(), child_iterator());
1510   }
1511   const_child_range children() const {
1512     return const_child_range(const_child_iterator(), const_child_iterator());
1513   }
1514 };
1515
1516 /// ImaginaryLiteral - We support imaginary integer and floating point literals,
1517 /// like "1.0i".  We represent these as a wrapper around FloatingLiteral and
1518 /// IntegerLiteral classes.  Instances of this class always have a Complex type
1519 /// whose element type matches the subexpression.
1520 ///
1521 class ImaginaryLiteral : public Expr {
1522   Stmt *Val;
1523 public:
1524   ImaginaryLiteral(Expr *val, QualType Ty)
1525     : Expr(ImaginaryLiteralClass, Ty, VK_RValue, OK_Ordinary, false, false,
1526            false, false),
1527       Val(val) {}
1528
1529   /// Build an empty imaginary literal.
1530   explicit ImaginaryLiteral(EmptyShell Empty)
1531     : Expr(ImaginaryLiteralClass, Empty) { }
1532
1533   const Expr *getSubExpr() const { return cast<Expr>(Val); }
1534   Expr *getSubExpr() { return cast<Expr>(Val); }
1535   void setSubExpr(Expr *E) { Val = E; }
1536
1537   SourceLocation getLocStart() const LLVM_READONLY { return Val->getLocStart(); }
1538   SourceLocation getLocEnd() const LLVM_READONLY { return Val->getLocEnd(); }
1539
1540   static bool classof(const Stmt *T) {
1541     return T->getStmtClass() == ImaginaryLiteralClass;
1542   }
1543
1544   // Iterators
1545   child_range children() { return child_range(&Val, &Val+1); }
1546   const_child_range children() const {
1547     return const_child_range(&Val, &Val + 1);
1548   }
1549 };
1550
1551 /// StringLiteral - This represents a string literal expression, e.g. "foo"
1552 /// or L"bar" (wide strings).  The actual string is returned by getBytes()
1553 /// is NOT null-terminated, and the length of the string is determined by
1554 /// calling getByteLength().  The C type for a string is always a
1555 /// ConstantArrayType.  In C++, the char type is const qualified, in C it is
1556 /// not.
1557 ///
1558 /// Note that strings in C can be formed by concatenation of multiple string
1559 /// literal pptokens in translation phase #6.  This keeps track of the locations
1560 /// of each of these pieces.
1561 ///
1562 /// Strings in C can also be truncated and extended by assigning into arrays,
1563 /// e.g. with constructs like:
1564 ///   char X[2] = "foobar";
1565 /// In this case, getByteLength() will return 6, but the string literal will
1566 /// have type "char[2]".
1567 class StringLiteral : public Expr {
1568 public:
1569   enum StringKind {
1570     Ascii,
1571     Wide,
1572     UTF8,
1573     UTF16,
1574     UTF32
1575   };
1576
1577 private:
1578   friend class ASTStmtReader;
1579
1580   union {
1581     const char *asChar;
1582     const uint16_t *asUInt16;
1583     const uint32_t *asUInt32;
1584   } StrData;
1585   unsigned Length;
1586   unsigned CharByteWidth : 4;
1587   unsigned Kind : 3;
1588   unsigned IsPascal : 1;
1589   unsigned NumConcatenated;
1590   SourceLocation TokLocs[1];
1591
1592   StringLiteral(QualType Ty) :
1593     Expr(StringLiteralClass, Ty, VK_LValue, OK_Ordinary, false, false, false,
1594          false) {}
1595
1596   static int mapCharByteWidth(TargetInfo const &target,StringKind k);
1597
1598 public:
1599   /// This is the "fully general" constructor that allows representation of
1600   /// strings formed from multiple concatenated tokens.
1601   static StringLiteral *Create(const ASTContext &C, StringRef Str,
1602                                StringKind Kind, bool Pascal, QualType Ty,
1603                                const SourceLocation *Loc, unsigned NumStrs);
1604
1605   /// Simple constructor for string literals made from one token.
1606   static StringLiteral *Create(const ASTContext &C, StringRef Str,
1607                                StringKind Kind, bool Pascal, QualType Ty,
1608                                SourceLocation Loc) {
1609     return Create(C, Str, Kind, Pascal, Ty, &Loc, 1);
1610   }
1611
1612   /// Construct an empty string literal.
1613   static StringLiteral *CreateEmpty(const ASTContext &C, unsigned NumStrs);
1614
1615   StringRef getString() const {
1616     assert(CharByteWidth==1
1617            && "This function is used in places that assume strings use char");
1618     return StringRef(StrData.asChar, getByteLength());
1619   }
1620
1621   /// Allow access to clients that need the byte representation, such as
1622   /// ASTWriterStmt::VisitStringLiteral().
1623   StringRef getBytes() const {
1624     // FIXME: StringRef may not be the right type to use as a result for this.
1625     if (CharByteWidth == 1)
1626       return StringRef(StrData.asChar, getByteLength());
1627     if (CharByteWidth == 4)
1628       return StringRef(reinterpret_cast<const char*>(StrData.asUInt32),
1629                        getByteLength());
1630     assert(CharByteWidth == 2 && "unsupported CharByteWidth");
1631     return StringRef(reinterpret_cast<const char*>(StrData.asUInt16),
1632                      getByteLength());
1633   }
1634
1635   void outputString(raw_ostream &OS) const;
1636
1637   uint32_t getCodeUnit(size_t i) const {
1638     assert(i < Length && "out of bounds access");
1639     if (CharByteWidth == 1)
1640       return static_cast<unsigned char>(StrData.asChar[i]);
1641     if (CharByteWidth == 4)
1642       return StrData.asUInt32[i];
1643     assert(CharByteWidth == 2 && "unsupported CharByteWidth");
1644     return StrData.asUInt16[i];
1645   }
1646
1647   unsigned getByteLength() const { return CharByteWidth*Length; }
1648   unsigned getLength() const { return Length; }
1649   unsigned getCharByteWidth() const { return CharByteWidth; }
1650
1651   /// Sets the string data to the given string data.
1652   void setString(const ASTContext &C, StringRef Str,
1653                  StringKind Kind, bool IsPascal);
1654
1655   StringKind getKind() const { return static_cast<StringKind>(Kind); }
1656
1657
1658   bool isAscii() const { return Kind == Ascii; }
1659   bool isWide() const { return Kind == Wide; }
1660   bool isUTF8() const { return Kind == UTF8; }
1661   bool isUTF16() const { return Kind == UTF16; }
1662   bool isUTF32() const { return Kind == UTF32; }
1663   bool isPascal() const { return IsPascal; }
1664
1665   bool containsNonAscii() const {
1666     StringRef Str = getString();
1667     for (unsigned i = 0, e = Str.size(); i != e; ++i)
1668       if (!isASCII(Str[i]))
1669         return true;
1670     return false;
1671   }
1672
1673   bool containsNonAsciiOrNull() const {
1674     StringRef Str = getString();
1675     for (unsigned i = 0, e = Str.size(); i != e; ++i)
1676       if (!isASCII(Str[i]) || !Str[i])
1677         return true;
1678     return false;
1679   }
1680
1681   /// getNumConcatenated - Get the number of string literal tokens that were
1682   /// concatenated in translation phase #6 to form this string literal.
1683   unsigned getNumConcatenated() const { return NumConcatenated; }
1684
1685   SourceLocation getStrTokenLoc(unsigned TokNum) const {
1686     assert(TokNum < NumConcatenated && "Invalid tok number");
1687     return TokLocs[TokNum];
1688   }
1689   void setStrTokenLoc(unsigned TokNum, SourceLocation L) {
1690     assert(TokNum < NumConcatenated && "Invalid tok number");
1691     TokLocs[TokNum] = L;
1692   }
1693
1694   /// getLocationOfByte - Return a source location that points to the specified
1695   /// byte of this string literal.
1696   ///
1697   /// Strings are amazingly complex.  They can be formed from multiple tokens
1698   /// and can have escape sequences in them in addition to the usual trigraph
1699   /// and escaped newline business.  This routine handles this complexity.
1700   ///
1701   SourceLocation
1702   getLocationOfByte(unsigned ByteNo, const SourceManager &SM,
1703                     const LangOptions &Features, const TargetInfo &Target,
1704                     unsigned *StartToken = nullptr,
1705                     unsigned *StartTokenByteOffset = nullptr) const;
1706
1707   typedef const SourceLocation *tokloc_iterator;
1708   tokloc_iterator tokloc_begin() const { return TokLocs; }
1709   tokloc_iterator tokloc_end() const { return TokLocs + NumConcatenated; }
1710
1711   SourceLocation getLocStart() const LLVM_READONLY { return TokLocs[0]; }
1712   SourceLocation getLocEnd() const LLVM_READONLY {
1713     return TokLocs[NumConcatenated - 1];
1714   }
1715
1716   static bool classof(const Stmt *T) {
1717     return T->getStmtClass() == StringLiteralClass;
1718   }
1719
1720   // Iterators
1721   child_range children() {
1722     return child_range(child_iterator(), child_iterator());
1723   }
1724   const_child_range children() const {
1725     return const_child_range(const_child_iterator(), const_child_iterator());
1726   }
1727 };
1728
1729 /// ParenExpr - This represents a parethesized expression, e.g. "(1)".  This
1730 /// AST node is only formed if full location information is requested.
1731 class ParenExpr : public Expr {
1732   SourceLocation L, R;
1733   Stmt *Val;
1734 public:
1735   ParenExpr(SourceLocation l, SourceLocation r, Expr *val)
1736     : Expr(ParenExprClass, val->getType(),
1737            val->getValueKind(), val->getObjectKind(),
1738            val->isTypeDependent(), val->isValueDependent(),
1739            val->isInstantiationDependent(),
1740            val->containsUnexpandedParameterPack()),
1741       L(l), R(r), Val(val) {}
1742
1743   /// Construct an empty parenthesized expression.
1744   explicit ParenExpr(EmptyShell Empty)
1745     : Expr(ParenExprClass, Empty) { }
1746
1747   const Expr *getSubExpr() const { return cast<Expr>(Val); }
1748   Expr *getSubExpr() { return cast<Expr>(Val); }
1749   void setSubExpr(Expr *E) { Val = E; }
1750
1751   SourceLocation getLocStart() const LLVM_READONLY { return L; }
1752   SourceLocation getLocEnd() const LLVM_READONLY { return R; }
1753
1754   /// Get the location of the left parentheses '('.
1755   SourceLocation getLParen() const { return L; }
1756   void setLParen(SourceLocation Loc) { L = Loc; }
1757
1758   /// Get the location of the right parentheses ')'.
1759   SourceLocation getRParen() const { return R; }
1760   void setRParen(SourceLocation Loc) { R = Loc; }
1761
1762   static bool classof(const Stmt *T) {
1763     return T->getStmtClass() == ParenExprClass;
1764   }
1765
1766   // Iterators
1767   child_range children() { return child_range(&Val, &Val+1); }
1768   const_child_range children() const {
1769     return const_child_range(&Val, &Val + 1);
1770   }
1771 };
1772
1773 /// UnaryOperator - This represents the unary-expression's (except sizeof and
1774 /// alignof), the postinc/postdec operators from postfix-expression, and various
1775 /// extensions.
1776 ///
1777 /// Notes on various nodes:
1778 ///
1779 /// Real/Imag - These return the real/imag part of a complex operand.  If
1780 ///   applied to a non-complex value, the former returns its operand and the
1781 ///   later returns zero in the type of the operand.
1782 ///
1783 class UnaryOperator : public Expr {
1784 public:
1785   typedef UnaryOperatorKind Opcode;
1786
1787 private:
1788   unsigned Opc : 5;
1789   unsigned CanOverflow : 1;
1790   SourceLocation Loc;
1791   Stmt *Val;
1792 public:
1793   UnaryOperator(Expr *input, Opcode opc, QualType type, ExprValueKind VK,
1794                 ExprObjectKind OK, SourceLocation l, bool CanOverflow)
1795       : Expr(UnaryOperatorClass, type, VK, OK,
1796              input->isTypeDependent() || type->isDependentType(),
1797              input->isValueDependent(),
1798              (input->isInstantiationDependent() ||
1799               type->isInstantiationDependentType()),
1800              input->containsUnexpandedParameterPack()),
1801         Opc(opc), CanOverflow(CanOverflow), Loc(l), Val(input) {}
1802
1803   /// Build an empty unary operator.
1804   explicit UnaryOperator(EmptyShell Empty)
1805     : Expr(UnaryOperatorClass, Empty), Opc(UO_AddrOf) { }
1806
1807   Opcode getOpcode() const { return static_cast<Opcode>(Opc); }
1808   void setOpcode(Opcode O) { Opc = O; }
1809
1810   Expr *getSubExpr() const { return cast<Expr>(Val); }
1811   void setSubExpr(Expr *E) { Val = E; }
1812
1813   /// getOperatorLoc - Return the location of the operator.
1814   SourceLocation getOperatorLoc() const { return Loc; }
1815   void setOperatorLoc(SourceLocation L) { Loc = L; }
1816
1817   /// Returns true if the unary operator can cause an overflow. For instance,
1818   ///   signed int i = INT_MAX; i++;
1819   ///   signed char c = CHAR_MAX; c++;
1820   /// Due to integer promotions, c++ is promoted to an int before the postfix
1821   /// increment, and the result is an int that cannot overflow. However, i++
1822   /// can overflow.
1823   bool canOverflow() const { return CanOverflow; }
1824   void setCanOverflow(bool C) { CanOverflow = C; }
1825
1826   /// isPostfix - Return true if this is a postfix operation, like x++.
1827   static bool isPostfix(Opcode Op) {
1828     return Op == UO_PostInc || Op == UO_PostDec;
1829   }
1830
1831   /// isPrefix - Return true if this is a prefix operation, like --x.
1832   static bool isPrefix(Opcode Op) {
1833     return Op == UO_PreInc || Op == UO_PreDec;
1834   }
1835
1836   bool isPrefix() const { return isPrefix(getOpcode()); }
1837   bool isPostfix() const { return isPostfix(getOpcode()); }
1838
1839   static bool isIncrementOp(Opcode Op) {
1840     return Op == UO_PreInc || Op == UO_PostInc;
1841   }
1842   bool isIncrementOp() const {
1843     return isIncrementOp(getOpcode());
1844   }
1845
1846   static bool isDecrementOp(Opcode Op) {
1847     return Op == UO_PreDec || Op == UO_PostDec;
1848   }
1849   bool isDecrementOp() const {
1850     return isDecrementOp(getOpcode());
1851   }
1852
1853   static bool isIncrementDecrementOp(Opcode Op) { return Op <= UO_PreDec; }
1854   bool isIncrementDecrementOp() const {
1855     return isIncrementDecrementOp(getOpcode());
1856   }
1857
1858   static bool isArithmeticOp(Opcode Op) {
1859     return Op >= UO_Plus && Op <= UO_LNot;
1860   }
1861   bool isArithmeticOp() const { return isArithmeticOp(getOpcode()); }
1862
1863   /// getOpcodeStr - Turn an Opcode enum value into the punctuation char it
1864   /// corresponds to, e.g. "sizeof" or "[pre]++"
1865   static StringRef getOpcodeStr(Opcode Op);
1866
1867   /// Retrieve the unary opcode that corresponds to the given
1868   /// overloaded operator.
1869   static Opcode getOverloadedOpcode(OverloadedOperatorKind OO, bool Postfix);
1870
1871   /// Retrieve the overloaded operator kind that corresponds to
1872   /// the given unary opcode.
1873   static OverloadedOperatorKind getOverloadedOperator(Opcode Opc);
1874
1875   SourceLocation getLocStart() const LLVM_READONLY {
1876     return isPostfix() ? Val->getLocStart() : Loc;
1877   }
1878   SourceLocation getLocEnd() const LLVM_READONLY {
1879     return isPostfix() ? Loc : Val->getLocEnd();
1880   }
1881   SourceLocation getExprLoc() const LLVM_READONLY { return Loc; }
1882
1883   static bool classof(const Stmt *T) {
1884     return T->getStmtClass() == UnaryOperatorClass;
1885   }
1886
1887   // Iterators
1888   child_range children() { return child_range(&Val, &Val+1); }
1889   const_child_range children() const {
1890     return const_child_range(&Val, &Val + 1);
1891   }
1892 };
1893
1894 /// Helper class for OffsetOfExpr.
1895
1896 // __builtin_offsetof(type, identifier(.identifier|[expr])*)
1897 class OffsetOfNode {
1898 public:
1899   /// The kind of offsetof node we have.
1900   enum Kind {
1901     /// An index into an array.
1902     Array = 0x00,
1903     /// A field.
1904     Field = 0x01,
1905     /// A field in a dependent type, known only by its name.
1906     Identifier = 0x02,
1907     /// An implicit indirection through a C++ base class, when the
1908     /// field found is in a base class.
1909     Base = 0x03
1910   };
1911
1912 private:
1913   enum { MaskBits = 2, Mask = 0x03 };
1914
1915   /// The source range that covers this part of the designator.
1916   SourceRange Range;
1917
1918   /// The data describing the designator, which comes in three
1919   /// different forms, depending on the lower two bits.
1920   ///   - An unsigned index into the array of Expr*'s stored after this node
1921   ///     in memory, for [constant-expression] designators.
1922   ///   - A FieldDecl*, for references to a known field.
1923   ///   - An IdentifierInfo*, for references to a field with a given name
1924   ///     when the class type is dependent.
1925   ///   - A CXXBaseSpecifier*, for references that look at a field in a
1926   ///     base class.
1927   uintptr_t Data;
1928
1929 public:
1930   /// Create an offsetof node that refers to an array element.
1931   OffsetOfNode(SourceLocation LBracketLoc, unsigned Index,
1932                SourceLocation RBracketLoc)
1933       : Range(LBracketLoc, RBracketLoc), Data((Index << 2) | Array) {}
1934
1935   /// Create an offsetof node that refers to a field.
1936   OffsetOfNode(SourceLocation DotLoc, FieldDecl *Field, SourceLocation NameLoc)
1937       : Range(DotLoc.isValid() ? DotLoc : NameLoc, NameLoc),
1938         Data(reinterpret_cast<uintptr_t>(Field) | OffsetOfNode::Field) {}
1939
1940   /// Create an offsetof node that refers to an identifier.
1941   OffsetOfNode(SourceLocation DotLoc, IdentifierInfo *Name,
1942                SourceLocation NameLoc)
1943       : Range(DotLoc.isValid() ? DotLoc : NameLoc, NameLoc),
1944         Data(reinterpret_cast<uintptr_t>(Name) | Identifier) {}
1945
1946   /// Create an offsetof node that refers into a C++ base class.
1947   explicit OffsetOfNode(const CXXBaseSpecifier *Base)
1948       : Range(), Data(reinterpret_cast<uintptr_t>(Base) | OffsetOfNode::Base) {}
1949
1950   /// Determine what kind of offsetof node this is.
1951   Kind getKind() const { return static_cast<Kind>(Data & Mask); }
1952
1953   /// For an array element node, returns the index into the array
1954   /// of expressions.
1955   unsigned getArrayExprIndex() const {
1956     assert(getKind() == Array);
1957     return Data >> 2;
1958   }
1959
1960   /// For a field offsetof node, returns the field.
1961   FieldDecl *getField() const {
1962     assert(getKind() == Field);
1963     return reinterpret_cast<FieldDecl *>(Data & ~(uintptr_t)Mask);
1964   }
1965
1966   /// For a field or identifier offsetof node, returns the name of
1967   /// the field.
1968   IdentifierInfo *getFieldName() const;
1969
1970   /// For a base class node, returns the base specifier.
1971   CXXBaseSpecifier *getBase() const {
1972     assert(getKind() == Base);
1973     return reinterpret_cast<CXXBaseSpecifier *>(Data & ~(uintptr_t)Mask);
1974   }
1975
1976   /// Retrieve the source range that covers this offsetof node.
1977   ///
1978   /// For an array element node, the source range contains the locations of
1979   /// the square brackets. For a field or identifier node, the source range
1980   /// contains the location of the period (if there is one) and the
1981   /// identifier.
1982   SourceRange getSourceRange() const LLVM_READONLY { return Range; }
1983   SourceLocation getLocStart() const LLVM_READONLY { return Range.getBegin(); }
1984   SourceLocation getLocEnd() const LLVM_READONLY { return Range.getEnd(); }
1985 };
1986
1987 /// OffsetOfExpr - [C99 7.17] - This represents an expression of the form
1988 /// offsetof(record-type, member-designator). For example, given:
1989 /// @code
1990 /// struct S {
1991 ///   float f;
1992 ///   double d;
1993 /// };
1994 /// struct T {
1995 ///   int i;
1996 ///   struct S s[10];
1997 /// };
1998 /// @endcode
1999 /// we can represent and evaluate the expression @c offsetof(struct T, s[2].d).
2000
2001 class OffsetOfExpr final
2002     : public Expr,
2003       private llvm::TrailingObjects<OffsetOfExpr, OffsetOfNode, Expr *> {
2004   SourceLocation OperatorLoc, RParenLoc;
2005   // Base type;
2006   TypeSourceInfo *TSInfo;
2007   // Number of sub-components (i.e. instances of OffsetOfNode).
2008   unsigned NumComps;
2009   // Number of sub-expressions (i.e. array subscript expressions).
2010   unsigned NumExprs;
2011
2012   size_t numTrailingObjects(OverloadToken<OffsetOfNode>) const {
2013     return NumComps;
2014   }
2015
2016   OffsetOfExpr(const ASTContext &C, QualType type,
2017                SourceLocation OperatorLoc, TypeSourceInfo *tsi,
2018                ArrayRef<OffsetOfNode> comps, ArrayRef<Expr*> exprs,
2019                SourceLocation RParenLoc);
2020
2021   explicit OffsetOfExpr(unsigned numComps, unsigned numExprs)
2022     : Expr(OffsetOfExprClass, EmptyShell()),
2023       TSInfo(nullptr), NumComps(numComps), NumExprs(numExprs) {}
2024
2025 public:
2026
2027   static OffsetOfExpr *Create(const ASTContext &C, QualType type,
2028                               SourceLocation OperatorLoc, TypeSourceInfo *tsi,
2029                               ArrayRef<OffsetOfNode> comps,
2030                               ArrayRef<Expr*> exprs, SourceLocation RParenLoc);
2031
2032   static OffsetOfExpr *CreateEmpty(const ASTContext &C,
2033                                    unsigned NumComps, unsigned NumExprs);
2034
2035   /// getOperatorLoc - Return the location of the operator.
2036   SourceLocation getOperatorLoc() const { return OperatorLoc; }
2037   void setOperatorLoc(SourceLocation L) { OperatorLoc = L; }
2038
2039   /// Return the location of the right parentheses.
2040   SourceLocation getRParenLoc() const { return RParenLoc; }
2041   void setRParenLoc(SourceLocation R) { RParenLoc = R; }
2042
2043   TypeSourceInfo *getTypeSourceInfo() const {
2044     return TSInfo;
2045   }
2046   void setTypeSourceInfo(TypeSourceInfo *tsi) {
2047     TSInfo = tsi;
2048   }
2049
2050   const OffsetOfNode &getComponent(unsigned Idx) const {
2051     assert(Idx < NumComps && "Subscript out of range");
2052     return getTrailingObjects<OffsetOfNode>()[Idx];
2053   }
2054
2055   void setComponent(unsigned Idx, OffsetOfNode ON) {
2056     assert(Idx < NumComps && "Subscript out of range");
2057     getTrailingObjects<OffsetOfNode>()[Idx] = ON;
2058   }
2059
2060   unsigned getNumComponents() const {
2061     return NumComps;
2062   }
2063
2064   Expr* getIndexExpr(unsigned Idx) {
2065     assert(Idx < NumExprs && "Subscript out of range");
2066     return getTrailingObjects<Expr *>()[Idx];
2067   }
2068
2069   const Expr *getIndexExpr(unsigned Idx) const {
2070     assert(Idx < NumExprs && "Subscript out of range");
2071     return getTrailingObjects<Expr *>()[Idx];
2072   }
2073
2074   void setIndexExpr(unsigned Idx, Expr* E) {
2075     assert(Idx < NumComps && "Subscript out of range");
2076     getTrailingObjects<Expr *>()[Idx] = E;
2077   }
2078
2079   unsigned getNumExpressions() const {
2080     return NumExprs;
2081   }
2082
2083   SourceLocation getLocStart() const LLVM_READONLY { return OperatorLoc; }
2084   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
2085
2086   static bool classof(const Stmt *T) {
2087     return T->getStmtClass() == OffsetOfExprClass;
2088   }
2089
2090   // Iterators
2091   child_range children() {
2092     Stmt **begin = reinterpret_cast<Stmt **>(getTrailingObjects<Expr *>());
2093     return child_range(begin, begin + NumExprs);
2094   }
2095   const_child_range children() const {
2096     Stmt *const *begin =
2097         reinterpret_cast<Stmt *const *>(getTrailingObjects<Expr *>());
2098     return const_child_range(begin, begin + NumExprs);
2099   }
2100   friend TrailingObjects;
2101 };
2102
2103 /// UnaryExprOrTypeTraitExpr - expression with either a type or (unevaluated)
2104 /// expression operand.  Used for sizeof/alignof (C99 6.5.3.4) and
2105 /// vec_step (OpenCL 1.1 6.11.12).
2106 class UnaryExprOrTypeTraitExpr : public Expr {
2107   union {
2108     TypeSourceInfo *Ty;
2109     Stmt *Ex;
2110   } Argument;
2111   SourceLocation OpLoc, RParenLoc;
2112
2113 public:
2114   UnaryExprOrTypeTraitExpr(UnaryExprOrTypeTrait ExprKind, TypeSourceInfo *TInfo,
2115                            QualType resultType, SourceLocation op,
2116                            SourceLocation rp) :
2117       Expr(UnaryExprOrTypeTraitExprClass, resultType, VK_RValue, OK_Ordinary,
2118            false, // Never type-dependent (C++ [temp.dep.expr]p3).
2119            // Value-dependent if the argument is type-dependent.
2120            TInfo->getType()->isDependentType(),
2121            TInfo->getType()->isInstantiationDependentType(),
2122            TInfo->getType()->containsUnexpandedParameterPack()),
2123       OpLoc(op), RParenLoc(rp) {
2124     UnaryExprOrTypeTraitExprBits.Kind = ExprKind;
2125     UnaryExprOrTypeTraitExprBits.IsType = true;
2126     Argument.Ty = TInfo;
2127   }
2128
2129   UnaryExprOrTypeTraitExpr(UnaryExprOrTypeTrait ExprKind, Expr *E,
2130                            QualType resultType, SourceLocation op,
2131                            SourceLocation rp);
2132
2133   /// Construct an empty sizeof/alignof expression.
2134   explicit UnaryExprOrTypeTraitExpr(EmptyShell Empty)
2135     : Expr(UnaryExprOrTypeTraitExprClass, Empty) { }
2136
2137   UnaryExprOrTypeTrait getKind() const {
2138     return static_cast<UnaryExprOrTypeTrait>(UnaryExprOrTypeTraitExprBits.Kind);
2139   }
2140   void setKind(UnaryExprOrTypeTrait K) { UnaryExprOrTypeTraitExprBits.Kind = K;}
2141
2142   bool isArgumentType() const { return UnaryExprOrTypeTraitExprBits.IsType; }
2143   QualType getArgumentType() const {
2144     return getArgumentTypeInfo()->getType();
2145   }
2146   TypeSourceInfo *getArgumentTypeInfo() const {
2147     assert(isArgumentType() && "calling getArgumentType() when arg is expr");
2148     return Argument.Ty;
2149   }
2150   Expr *getArgumentExpr() {
2151     assert(!isArgumentType() && "calling getArgumentExpr() when arg is type");
2152     return static_cast<Expr*>(Argument.Ex);
2153   }
2154   const Expr *getArgumentExpr() const {
2155     return const_cast<UnaryExprOrTypeTraitExpr*>(this)->getArgumentExpr();
2156   }
2157
2158   void setArgument(Expr *E) {
2159     Argument.Ex = E;
2160     UnaryExprOrTypeTraitExprBits.IsType = false;
2161   }
2162   void setArgument(TypeSourceInfo *TInfo) {
2163     Argument.Ty = TInfo;
2164     UnaryExprOrTypeTraitExprBits.IsType = true;
2165   }
2166
2167   /// Gets the argument type, or the type of the argument expression, whichever
2168   /// is appropriate.
2169   QualType getTypeOfArgument() const {
2170     return isArgumentType() ? getArgumentType() : getArgumentExpr()->getType();
2171   }
2172
2173   SourceLocation getOperatorLoc() const { return OpLoc; }
2174   void setOperatorLoc(SourceLocation L) { OpLoc = L; }
2175
2176   SourceLocation getRParenLoc() const { return RParenLoc; }
2177   void setRParenLoc(SourceLocation L) { RParenLoc = L; }
2178
2179   SourceLocation getLocStart() const LLVM_READONLY { return OpLoc; }
2180   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
2181
2182   static bool classof(const Stmt *T) {
2183     return T->getStmtClass() == UnaryExprOrTypeTraitExprClass;
2184   }
2185
2186   // Iterators
2187   child_range children();
2188   const_child_range children() const;
2189 };
2190
2191 //===----------------------------------------------------------------------===//
2192 // Postfix Operators.
2193 //===----------------------------------------------------------------------===//
2194
2195 /// ArraySubscriptExpr - [C99 6.5.2.1] Array Subscripting.
2196 class ArraySubscriptExpr : public Expr {
2197   enum { LHS, RHS, END_EXPR=2 };
2198   Stmt* SubExprs[END_EXPR];
2199   SourceLocation RBracketLoc;
2200 public:
2201   ArraySubscriptExpr(Expr *lhs, Expr *rhs, QualType t,
2202                      ExprValueKind VK, ExprObjectKind OK,
2203                      SourceLocation rbracketloc)
2204   : Expr(ArraySubscriptExprClass, t, VK, OK,
2205          lhs->isTypeDependent() || rhs->isTypeDependent(),
2206          lhs->isValueDependent() || rhs->isValueDependent(),
2207          (lhs->isInstantiationDependent() ||
2208           rhs->isInstantiationDependent()),
2209          (lhs->containsUnexpandedParameterPack() ||
2210           rhs->containsUnexpandedParameterPack())),
2211     RBracketLoc(rbracketloc) {
2212     SubExprs[LHS] = lhs;
2213     SubExprs[RHS] = rhs;
2214   }
2215
2216   /// Create an empty array subscript expression.
2217   explicit ArraySubscriptExpr(EmptyShell Shell)
2218     : Expr(ArraySubscriptExprClass, Shell) { }
2219
2220   /// An array access can be written A[4] or 4[A] (both are equivalent).
2221   /// - getBase() and getIdx() always present the normalized view: A[4].
2222   ///    In this case getBase() returns "A" and getIdx() returns "4".
2223   /// - getLHS() and getRHS() present the syntactic view. e.g. for
2224   ///    4[A] getLHS() returns "4".
2225   /// Note: Because vector element access is also written A[4] we must
2226   /// predicate the format conversion in getBase and getIdx only on the
2227   /// the type of the RHS, as it is possible for the LHS to be a vector of
2228   /// integer type
2229   Expr *getLHS() { return cast<Expr>(SubExprs[LHS]); }
2230   const Expr *getLHS() const { return cast<Expr>(SubExprs[LHS]); }
2231   void setLHS(Expr *E) { SubExprs[LHS] = E; }
2232
2233   Expr *getRHS() { return cast<Expr>(SubExprs[RHS]); }
2234   const Expr *getRHS() const { return cast<Expr>(SubExprs[RHS]); }
2235   void setRHS(Expr *E) { SubExprs[RHS] = E; }
2236
2237   Expr *getBase() {
2238     return getRHS()->getType()->isIntegerType() ? getLHS() : getRHS();
2239   }
2240
2241   const Expr *getBase() const {
2242     return getRHS()->getType()->isIntegerType() ? getLHS() : getRHS();
2243   }
2244
2245   Expr *getIdx() {
2246     return getRHS()->getType()->isIntegerType() ? getRHS() : getLHS();
2247   }
2248
2249   const Expr *getIdx() const {
2250     return getRHS()->getType()->isIntegerType() ? getRHS() : getLHS();
2251   }
2252
2253   SourceLocation getLocStart() const LLVM_READONLY {
2254     return getLHS()->getLocStart();
2255   }
2256   SourceLocation getLocEnd() const LLVM_READONLY { return RBracketLoc; }
2257
2258   SourceLocation getRBracketLoc() const { return RBracketLoc; }
2259   void setRBracketLoc(SourceLocation L) { RBracketLoc = L; }
2260
2261   SourceLocation getExprLoc() const LLVM_READONLY {
2262     return getBase()->getExprLoc();
2263   }
2264
2265   static bool classof(const Stmt *T) {
2266     return T->getStmtClass() == ArraySubscriptExprClass;
2267   }
2268
2269   // Iterators
2270   child_range children() {
2271     return child_range(&SubExprs[0], &SubExprs[0]+END_EXPR);
2272   }
2273   const_child_range children() const {
2274     return const_child_range(&SubExprs[0], &SubExprs[0] + END_EXPR);
2275   }
2276 };
2277
2278 /// CallExpr - Represents a function call (C99 6.5.2.2, C++ [expr.call]).
2279 /// CallExpr itself represents a normal function call, e.g., "f(x, 2)",
2280 /// while its subclasses may represent alternative syntax that (semantically)
2281 /// results in a function call. For example, CXXOperatorCallExpr is
2282 /// a subclass for overloaded operator calls that use operator syntax, e.g.,
2283 /// "str1 + str2" to resolve to a function call.
2284 class CallExpr : public Expr {
2285   enum { FN=0, PREARGS_START=1 };
2286   Stmt **SubExprs;
2287   unsigned NumArgs;
2288   SourceLocation RParenLoc;
2289
2290   void updateDependenciesFromArg(Expr *Arg);
2291
2292 protected:
2293   // These versions of the constructor are for derived classes.
2294   CallExpr(const ASTContext &C, StmtClass SC, Expr *fn,
2295            ArrayRef<Expr *> preargs, ArrayRef<Expr *> args, QualType t,
2296            ExprValueKind VK, SourceLocation rparenloc);
2297   CallExpr(const ASTContext &C, StmtClass SC, Expr *fn, ArrayRef<Expr *> args,
2298            QualType t, ExprValueKind VK, SourceLocation rparenloc);
2299   CallExpr(const ASTContext &C, StmtClass SC, unsigned NumPreArgs,
2300            EmptyShell Empty);
2301
2302   Stmt *getPreArg(unsigned i) {
2303     assert(i < getNumPreArgs() && "Prearg access out of range!");
2304     return SubExprs[PREARGS_START+i];
2305   }
2306   const Stmt *getPreArg(unsigned i) const {
2307     assert(i < getNumPreArgs() && "Prearg access out of range!");
2308     return SubExprs[PREARGS_START+i];
2309   }
2310   void setPreArg(unsigned i, Stmt *PreArg) {
2311     assert(i < getNumPreArgs() && "Prearg access out of range!");
2312     SubExprs[PREARGS_START+i] = PreArg;
2313   }
2314
2315   unsigned getNumPreArgs() const { return CallExprBits.NumPreArgs; }
2316
2317 public:
2318   CallExpr(const ASTContext& C, Expr *fn, ArrayRef<Expr*> args, QualType t,
2319            ExprValueKind VK, SourceLocation rparenloc);
2320
2321   /// Build an empty call expression.
2322   CallExpr(const ASTContext &C, StmtClass SC, EmptyShell Empty);
2323
2324   const Expr *getCallee() const { return cast<Expr>(SubExprs[FN]); }
2325   Expr *getCallee() { return cast<Expr>(SubExprs[FN]); }
2326   void setCallee(Expr *F) { SubExprs[FN] = F; }
2327
2328   Decl *getCalleeDecl();
2329   const Decl *getCalleeDecl() const {
2330     return const_cast<CallExpr*>(this)->getCalleeDecl();
2331   }
2332
2333   /// If the callee is a FunctionDecl, return it. Otherwise return 0.
2334   FunctionDecl *getDirectCallee();
2335   const FunctionDecl *getDirectCallee() const {
2336     return const_cast<CallExpr*>(this)->getDirectCallee();
2337   }
2338
2339   /// getNumArgs - Return the number of actual arguments to this call.
2340   ///
2341   unsigned getNumArgs() const { return NumArgs; }
2342
2343   /// Retrieve the call arguments.
2344   Expr **getArgs() {
2345     return reinterpret_cast<Expr **>(SubExprs+getNumPreArgs()+PREARGS_START);
2346   }
2347   const Expr *const *getArgs() const {
2348     return reinterpret_cast<Expr **>(SubExprs + getNumPreArgs() +
2349                                      PREARGS_START);
2350   }
2351
2352   /// getArg - Return the specified argument.
2353   Expr *getArg(unsigned Arg) {
2354     assert(Arg < NumArgs && "Arg access out of range!");
2355     return cast_or_null<Expr>(SubExprs[Arg + getNumPreArgs() + PREARGS_START]);
2356   }
2357   const Expr *getArg(unsigned Arg) const {
2358     assert(Arg < NumArgs && "Arg access out of range!");
2359     return cast_or_null<Expr>(SubExprs[Arg + getNumPreArgs() + PREARGS_START]);
2360   }
2361
2362   /// setArg - Set the specified argument.
2363   void setArg(unsigned Arg, Expr *ArgExpr) {
2364     assert(Arg < NumArgs && "Arg access out of range!");
2365     SubExprs[Arg+getNumPreArgs()+PREARGS_START] = ArgExpr;
2366   }
2367
2368   /// setNumArgs - This changes the number of arguments present in this call.
2369   /// Any orphaned expressions are deleted by this, and any new operands are set
2370   /// to null.
2371   void setNumArgs(const ASTContext& C, unsigned NumArgs);
2372
2373   typedef ExprIterator arg_iterator;
2374   typedef ConstExprIterator const_arg_iterator;
2375   typedef llvm::iterator_range<arg_iterator> arg_range;
2376   typedef llvm::iterator_range<const_arg_iterator> arg_const_range;
2377
2378   arg_range arguments() { return arg_range(arg_begin(), arg_end()); }
2379   arg_const_range arguments() const {
2380     return arg_const_range(arg_begin(), arg_end());
2381   }
2382
2383   arg_iterator arg_begin() { return SubExprs+PREARGS_START+getNumPreArgs(); }
2384   arg_iterator arg_end() {
2385     return SubExprs+PREARGS_START+getNumPreArgs()+getNumArgs();
2386   }
2387   const_arg_iterator arg_begin() const {
2388     return SubExprs+PREARGS_START+getNumPreArgs();
2389   }
2390   const_arg_iterator arg_end() const {
2391     return SubExprs+PREARGS_START+getNumPreArgs()+getNumArgs();
2392   }
2393
2394   /// This method provides fast access to all the subexpressions of
2395   /// a CallExpr without going through the slower virtual child_iterator
2396   /// interface.  This provides efficient reverse iteration of the
2397   /// subexpressions.  This is currently used for CFG construction.
2398   ArrayRef<Stmt*> getRawSubExprs() {
2399     return llvm::makeArrayRef(SubExprs,
2400                               getNumPreArgs() + PREARGS_START + getNumArgs());
2401   }
2402
2403   /// getNumCommas - Return the number of commas that must have been present in
2404   /// this function call.
2405   unsigned getNumCommas() const { return NumArgs ? NumArgs - 1 : 0; }
2406
2407   /// getBuiltinCallee - If this is a call to a builtin, return the builtin ID
2408   /// of the callee. If not, return 0.
2409   unsigned getBuiltinCallee() const;
2410
2411   /// Returns \c true if this is a call to a builtin which does not
2412   /// evaluate side-effects within its arguments.
2413   bool isUnevaluatedBuiltinCall(const ASTContext &Ctx) const;
2414
2415   /// getCallReturnType - Get the return type of the call expr. This is not
2416   /// always the type of the expr itself, if the return type is a reference
2417   /// type.
2418   QualType getCallReturnType(const ASTContext &Ctx) const;
2419
2420   SourceLocation getRParenLoc() const { return RParenLoc; }
2421   void setRParenLoc(SourceLocation L) { RParenLoc = L; }
2422
2423   SourceLocation getLocStart() const LLVM_READONLY;
2424   SourceLocation getLocEnd() const LLVM_READONLY;
2425
2426   /// Return true if this is a call to __assume() or __builtin_assume() with
2427   /// a non-value-dependent constant parameter evaluating as false.
2428   bool isBuiltinAssumeFalse(const ASTContext &Ctx) const;
2429
2430   bool isCallToStdMove() const {
2431     const FunctionDecl* FD = getDirectCallee();
2432     return getNumArgs() == 1 && FD && FD->isInStdNamespace() &&
2433            FD->getIdentifier() && FD->getIdentifier()->isStr("move");
2434   }
2435
2436   static bool classof(const Stmt *T) {
2437     return T->getStmtClass() >= firstCallExprConstant &&
2438            T->getStmtClass() <= lastCallExprConstant;
2439   }
2440
2441   // Iterators
2442   child_range children() {
2443     return child_range(&SubExprs[0],
2444                        &SubExprs[0]+NumArgs+getNumPreArgs()+PREARGS_START);
2445   }
2446
2447   const_child_range children() const {
2448     return const_child_range(&SubExprs[0], &SubExprs[0] + NumArgs +
2449                                                getNumPreArgs() + PREARGS_START);
2450   }
2451 };
2452
2453 /// Extra data stored in some MemberExpr objects.
2454 struct MemberExprNameQualifier {
2455   /// The nested-name-specifier that qualifies the name, including
2456   /// source-location information.
2457   NestedNameSpecifierLoc QualifierLoc;
2458
2459   /// The DeclAccessPair through which the MemberDecl was found due to
2460   /// name qualifiers.
2461   DeclAccessPair FoundDecl;
2462 };
2463
2464 /// MemberExpr - [C99 6.5.2.3] Structure and Union Members.  X->F and X.F.
2465 ///
2466 class MemberExpr final
2467     : public Expr,
2468       private llvm::TrailingObjects<MemberExpr, MemberExprNameQualifier,
2469                                     ASTTemplateKWAndArgsInfo,
2470                                     TemplateArgumentLoc> {
2471   /// Base - the expression for the base pointer or structure references.  In
2472   /// X.F, this is "X".
2473   Stmt *Base;
2474
2475   /// MemberDecl - This is the decl being referenced by the field/member name.
2476   /// In X.F, this is the decl referenced by F.
2477   ValueDecl *MemberDecl;
2478
2479   /// MemberDNLoc - Provides source/type location info for the
2480   /// declaration name embedded in MemberDecl.
2481   DeclarationNameLoc MemberDNLoc;
2482
2483   /// MemberLoc - This is the location of the member name.
2484   SourceLocation MemberLoc;
2485
2486   /// This is the location of the -> or . in the expression.
2487   SourceLocation OperatorLoc;
2488
2489   /// IsArrow - True if this is "X->F", false if this is "X.F".
2490   bool IsArrow : 1;
2491
2492   /// True if this member expression used a nested-name-specifier to
2493   /// refer to the member, e.g., "x->Base::f", or found its member via a using
2494   /// declaration.  When true, a MemberExprNameQualifier
2495   /// structure is allocated immediately after the MemberExpr.
2496   bool HasQualifierOrFoundDecl : 1;
2497
2498   /// True if this member expression specified a template keyword
2499   /// and/or a template argument list explicitly, e.g., x->f<int>,
2500   /// x->template f, x->template f<int>.
2501   /// When true, an ASTTemplateKWAndArgsInfo structure and its
2502   /// TemplateArguments (if any) are present.
2503   bool HasTemplateKWAndArgsInfo : 1;
2504
2505   /// True if this member expression refers to a method that
2506   /// was resolved from an overloaded set having size greater than 1.
2507   bool HadMultipleCandidates : 1;
2508
2509   size_t numTrailingObjects(OverloadToken<MemberExprNameQualifier>) const {
2510     return HasQualifierOrFoundDecl ? 1 : 0;
2511   }
2512
2513   size_t numTrailingObjects(OverloadToken<ASTTemplateKWAndArgsInfo>) const {
2514     return HasTemplateKWAndArgsInfo ? 1 : 0;
2515   }
2516
2517 public:
2518   MemberExpr(Expr *base, bool isarrow, SourceLocation operatorloc,
2519              ValueDecl *memberdecl, const DeclarationNameInfo &NameInfo,
2520              QualType ty, ExprValueKind VK, ExprObjectKind OK)
2521       : Expr(MemberExprClass, ty, VK, OK, base->isTypeDependent(),
2522              base->isValueDependent(), base->isInstantiationDependent(),
2523              base->containsUnexpandedParameterPack()),
2524         Base(base), MemberDecl(memberdecl), MemberDNLoc(NameInfo.getInfo()),
2525         MemberLoc(NameInfo.getLoc()), OperatorLoc(operatorloc),
2526         IsArrow(isarrow), HasQualifierOrFoundDecl(false),
2527         HasTemplateKWAndArgsInfo(false), HadMultipleCandidates(false) {
2528     assert(memberdecl->getDeclName() == NameInfo.getName());
2529   }
2530
2531   // NOTE: this constructor should be used only when it is known that
2532   // the member name can not provide additional syntactic info
2533   // (i.e., source locations for C++ operator names or type source info
2534   // for constructors, destructors and conversion operators).
2535   MemberExpr(Expr *base, bool isarrow, SourceLocation operatorloc,
2536              ValueDecl *memberdecl, SourceLocation l, QualType ty,
2537              ExprValueKind VK, ExprObjectKind OK)
2538       : Expr(MemberExprClass, ty, VK, OK, base->isTypeDependent(),
2539              base->isValueDependent(), base->isInstantiationDependent(),
2540              base->containsUnexpandedParameterPack()),
2541         Base(base), MemberDecl(memberdecl), MemberDNLoc(), MemberLoc(l),
2542         OperatorLoc(operatorloc), IsArrow(isarrow),
2543         HasQualifierOrFoundDecl(false), HasTemplateKWAndArgsInfo(false),
2544         HadMultipleCandidates(false) {}
2545
2546   static MemberExpr *Create(const ASTContext &C, Expr *base, bool isarrow,
2547                             SourceLocation OperatorLoc,
2548                             NestedNameSpecifierLoc QualifierLoc,
2549                             SourceLocation TemplateKWLoc, ValueDecl *memberdecl,
2550                             DeclAccessPair founddecl,
2551                             DeclarationNameInfo MemberNameInfo,
2552                             const TemplateArgumentListInfo *targs, QualType ty,
2553                             ExprValueKind VK, ExprObjectKind OK);
2554
2555   void setBase(Expr *E) { Base = E; }
2556   Expr *getBase() const { return cast<Expr>(Base); }
2557
2558   /// Retrieve the member declaration to which this expression refers.
2559   ///
2560   /// The returned declaration will be a FieldDecl or (in C++) a VarDecl (for
2561   /// static data members), a CXXMethodDecl, or an EnumConstantDecl.
2562   ValueDecl *getMemberDecl() const { return MemberDecl; }
2563   void setMemberDecl(ValueDecl *D) { MemberDecl = D; }
2564
2565   /// Retrieves the declaration found by lookup.
2566   DeclAccessPair getFoundDecl() const {
2567     if (!HasQualifierOrFoundDecl)
2568       return DeclAccessPair::make(getMemberDecl(),
2569                                   getMemberDecl()->getAccess());
2570     return getTrailingObjects<MemberExprNameQualifier>()->FoundDecl;
2571   }
2572
2573   /// Determines whether this member expression actually had
2574   /// a C++ nested-name-specifier prior to the name of the member, e.g.,
2575   /// x->Base::foo.
2576   bool hasQualifier() const { return getQualifier() != nullptr; }
2577
2578   /// If the member name was qualified, retrieves the
2579   /// nested-name-specifier that precedes the member name, with source-location
2580   /// information.
2581   NestedNameSpecifierLoc getQualifierLoc() const {
2582     if (!HasQualifierOrFoundDecl)
2583       return NestedNameSpecifierLoc();
2584
2585     return getTrailingObjects<MemberExprNameQualifier>()->QualifierLoc;
2586   }
2587
2588   /// If the member name was qualified, retrieves the
2589   /// nested-name-specifier that precedes the member name. Otherwise, returns
2590   /// NULL.
2591   NestedNameSpecifier *getQualifier() const {
2592     return getQualifierLoc().getNestedNameSpecifier();
2593   }
2594
2595   /// Retrieve the location of the template keyword preceding
2596   /// the member name, if any.
2597   SourceLocation getTemplateKeywordLoc() const {
2598     if (!HasTemplateKWAndArgsInfo) return SourceLocation();
2599     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->TemplateKWLoc;
2600   }
2601
2602   /// Retrieve the location of the left angle bracket starting the
2603   /// explicit template argument list following the member name, if any.
2604   SourceLocation getLAngleLoc() const {
2605     if (!HasTemplateKWAndArgsInfo) return SourceLocation();
2606     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->LAngleLoc;
2607   }
2608
2609   /// Retrieve the location of the right angle bracket ending the
2610   /// explicit template argument list following the member name, if any.
2611   SourceLocation getRAngleLoc() const {
2612     if (!HasTemplateKWAndArgsInfo) return SourceLocation();
2613     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->RAngleLoc;
2614   }
2615
2616   /// Determines whether the member name was preceded by the template keyword.
2617   bool hasTemplateKeyword() const { return getTemplateKeywordLoc().isValid(); }
2618
2619   /// Determines whether the member name was followed by an
2620   /// explicit template argument list.
2621   bool hasExplicitTemplateArgs() const { return getLAngleLoc().isValid(); }
2622
2623   /// Copies the template arguments (if present) into the given
2624   /// structure.
2625   void copyTemplateArgumentsInto(TemplateArgumentListInfo &List) const {
2626     if (hasExplicitTemplateArgs())
2627       getTrailingObjects<ASTTemplateKWAndArgsInfo>()->copyInto(
2628           getTrailingObjects<TemplateArgumentLoc>(), List);
2629   }
2630
2631   /// Retrieve the template arguments provided as part of this
2632   /// template-id.
2633   const TemplateArgumentLoc *getTemplateArgs() const {
2634     if (!hasExplicitTemplateArgs())
2635       return nullptr;
2636
2637     return getTrailingObjects<TemplateArgumentLoc>();
2638   }
2639
2640   /// Retrieve the number of template arguments provided as part of this
2641   /// template-id.
2642   unsigned getNumTemplateArgs() const {
2643     if (!hasExplicitTemplateArgs())
2644       return 0;
2645
2646     return getTrailingObjects<ASTTemplateKWAndArgsInfo>()->NumTemplateArgs;
2647   }
2648
2649   ArrayRef<TemplateArgumentLoc> template_arguments() const {
2650     return {getTemplateArgs(), getNumTemplateArgs()};
2651   }
2652
2653   /// Retrieve the member declaration name info.
2654   DeclarationNameInfo getMemberNameInfo() const {
2655     return DeclarationNameInfo(MemberDecl->getDeclName(),
2656                                MemberLoc, MemberDNLoc);
2657   }
2658
2659   SourceLocation getOperatorLoc() const LLVM_READONLY { return OperatorLoc; }
2660
2661   bool isArrow() const { return IsArrow; }
2662   void setArrow(bool A) { IsArrow = A; }
2663
2664   /// getMemberLoc - Return the location of the "member", in X->F, it is the
2665   /// location of 'F'.
2666   SourceLocation getMemberLoc() const { return MemberLoc; }
2667   void setMemberLoc(SourceLocation L) { MemberLoc = L; }
2668
2669   SourceLocation getLocStart() const LLVM_READONLY;
2670   SourceLocation getLocEnd() const LLVM_READONLY;
2671
2672   SourceLocation getExprLoc() const LLVM_READONLY { return MemberLoc; }
2673
2674   /// Determine whether the base of this explicit is implicit.
2675   bool isImplicitAccess() const {
2676     return getBase() && getBase()->isImplicitCXXThis();
2677   }
2678
2679   /// Returns true if this member expression refers to a method that
2680   /// was resolved from an overloaded set having size greater than 1.
2681   bool hadMultipleCandidates() const {
2682     return HadMultipleCandidates;
2683   }
2684   /// Sets the flag telling whether this expression refers to
2685   /// a method that was resolved from an overloaded set having size
2686   /// greater than 1.
2687   void setHadMultipleCandidates(bool V = true) {
2688     HadMultipleCandidates = V;
2689   }
2690
2691   /// Returns true if virtual dispatch is performed.
2692   /// If the member access is fully qualified, (i.e. X::f()), virtual
2693   /// dispatching is not performed. In -fapple-kext mode qualified
2694   /// calls to virtual method will still go through the vtable.
2695   bool performsVirtualDispatch(const LangOptions &LO) const {
2696     return LO.AppleKext || !hasQualifier();
2697   }
2698
2699   static bool classof(const Stmt *T) {
2700     return T->getStmtClass() == MemberExprClass;
2701   }
2702
2703   // Iterators
2704   child_range children() { return child_range(&Base, &Base+1); }
2705   const_child_range children() const {
2706     return const_child_range(&Base, &Base + 1);
2707   }
2708
2709   friend TrailingObjects;
2710   friend class ASTReader;
2711   friend class ASTStmtWriter;
2712 };
2713
2714 /// CompoundLiteralExpr - [C99 6.5.2.5]
2715 ///
2716 class CompoundLiteralExpr : public Expr {
2717   /// LParenLoc - If non-null, this is the location of the left paren in a
2718   /// compound literal like "(int){4}".  This can be null if this is a
2719   /// synthesized compound expression.
2720   SourceLocation LParenLoc;
2721
2722   /// The type as written.  This can be an incomplete array type, in
2723   /// which case the actual expression type will be different.
2724   /// The int part of the pair stores whether this expr is file scope.
2725   llvm::PointerIntPair<TypeSourceInfo *, 1, bool> TInfoAndScope;
2726   Stmt *Init;
2727 public:
2728   CompoundLiteralExpr(SourceLocation lparenloc, TypeSourceInfo *tinfo,
2729                       QualType T, ExprValueKind VK, Expr *init, bool fileScope)
2730     : Expr(CompoundLiteralExprClass, T, VK, OK_Ordinary,
2731            tinfo->getType()->isDependentType(),
2732            init->isValueDependent(),
2733            (init->isInstantiationDependent() ||
2734             tinfo->getType()->isInstantiationDependentType()),
2735            init->containsUnexpandedParameterPack()),
2736       LParenLoc(lparenloc), TInfoAndScope(tinfo, fileScope), Init(init) {}
2737
2738   /// Construct an empty compound literal.
2739   explicit CompoundLiteralExpr(EmptyShell Empty)
2740     : Expr(CompoundLiteralExprClass, Empty) { }
2741
2742   const Expr *getInitializer() const { return cast<Expr>(Init); }
2743   Expr *getInitializer() { return cast<Expr>(Init); }
2744   void setInitializer(Expr *E) { Init = E; }
2745
2746   bool isFileScope() const { return TInfoAndScope.getInt(); }
2747   void setFileScope(bool FS) { TInfoAndScope.setInt(FS); }
2748
2749   SourceLocation getLParenLoc() const { return LParenLoc; }
2750   void setLParenLoc(SourceLocation L) { LParenLoc = L; }
2751
2752   TypeSourceInfo *getTypeSourceInfo() const {
2753     return TInfoAndScope.getPointer();
2754   }
2755   void setTypeSourceInfo(TypeSourceInfo *tinfo) {
2756     TInfoAndScope.setPointer(tinfo);
2757   }
2758
2759   SourceLocation getLocStart() const LLVM_READONLY {
2760     // FIXME: Init should never be null.
2761     if (!Init)
2762       return SourceLocation();
2763     if (LParenLoc.isInvalid())
2764       return Init->getLocStart();
2765     return LParenLoc;
2766   }
2767   SourceLocation getLocEnd() const LLVM_READONLY {
2768     // FIXME: Init should never be null.
2769     if (!Init)
2770       return SourceLocation();
2771     return Init->getLocEnd();
2772   }
2773
2774   static bool classof(const Stmt *T) {
2775     return T->getStmtClass() == CompoundLiteralExprClass;
2776   }
2777
2778   // Iterators
2779   child_range children() { return child_range(&Init, &Init+1); }
2780   const_child_range children() const {
2781     return const_child_range(&Init, &Init + 1);
2782   }
2783 };
2784
2785 /// CastExpr - Base class for type casts, including both implicit
2786 /// casts (ImplicitCastExpr) and explicit casts that have some
2787 /// representation in the source code (ExplicitCastExpr's derived
2788 /// classes).
2789 class CastExpr : public Expr {
2790 private:
2791   Stmt *Op;
2792
2793   bool CastConsistency() const;
2794
2795   const CXXBaseSpecifier * const *path_buffer() const {
2796     return const_cast<CastExpr*>(this)->path_buffer();
2797   }
2798   CXXBaseSpecifier **path_buffer();
2799
2800   void setBasePathSize(unsigned basePathSize) {
2801     CastExprBits.BasePathSize = basePathSize;
2802     assert(CastExprBits.BasePathSize == basePathSize &&
2803            "basePathSize doesn't fit in bits of CastExprBits.BasePathSize!");
2804   }
2805
2806 protected:
2807   CastExpr(StmtClass SC, QualType ty, ExprValueKind VK, const CastKind kind,
2808            Expr *op, unsigned BasePathSize)
2809       : Expr(SC, ty, VK, OK_Ordinary,
2810              // Cast expressions are type-dependent if the type is
2811              // dependent (C++ [temp.dep.expr]p3).
2812              ty->isDependentType(),
2813              // Cast expressions are value-dependent if the type is
2814              // dependent or if the subexpression is value-dependent.
2815              ty->isDependentType() || (op && op->isValueDependent()),
2816              (ty->isInstantiationDependentType() ||
2817               (op && op->isInstantiationDependent())),
2818              // An implicit cast expression doesn't (lexically) contain an
2819              // unexpanded pack, even if its target type does.
2820              ((SC != ImplicitCastExprClass &&
2821                ty->containsUnexpandedParameterPack()) ||
2822               (op && op->containsUnexpandedParameterPack()))),
2823         Op(op) {
2824     CastExprBits.Kind = kind;
2825     CastExprBits.PartOfExplicitCast = false;
2826     setBasePathSize(BasePathSize);
2827     assert(CastConsistency());
2828   }
2829
2830   /// Construct an empty cast.
2831   CastExpr(StmtClass SC, EmptyShell Empty, unsigned BasePathSize)
2832     : Expr(SC, Empty) {
2833     CastExprBits.PartOfExplicitCast = false;
2834     setBasePathSize(BasePathSize);
2835   }
2836
2837 public:
2838   CastKind getCastKind() const { return (CastKind) CastExprBits.Kind; }
2839   void setCastKind(CastKind K) { CastExprBits.Kind = K; }
2840
2841   static const char *getCastKindName(CastKind CK);
2842   const char *getCastKindName() const { return getCastKindName(getCastKind()); }
2843
2844   Expr *getSubExpr() { return cast<Expr>(Op); }
2845   const Expr *getSubExpr() const { return cast<Expr>(Op); }
2846   void setSubExpr(Expr *E) { Op = E; }
2847
2848   /// Retrieve the cast subexpression as it was written in the source
2849   /// code, looking through any implicit casts or other intermediate nodes
2850   /// introduced by semantic analysis.
2851   Expr *getSubExprAsWritten();
2852   const Expr *getSubExprAsWritten() const {
2853     return const_cast<CastExpr *>(this)->getSubExprAsWritten();
2854   }
2855
2856   /// If this cast applies a user-defined conversion, retrieve the conversion
2857   /// function that it invokes.
2858   NamedDecl *getConversionFunction() const;
2859
2860   typedef CXXBaseSpecifier **path_iterator;
2861   typedef const CXXBaseSpecifier * const *path_const_iterator;
2862   bool path_empty() const { return CastExprBits.BasePathSize == 0; }
2863   unsigned path_size() const { return CastExprBits.BasePathSize; }
2864   path_iterator path_begin() { return path_buffer(); }
2865   path_iterator path_end() { return path_buffer() + path_size(); }
2866   path_const_iterator path_begin() const { return path_buffer(); }
2867   path_const_iterator path_end() const { return path_buffer() + path_size(); }
2868
2869   const FieldDecl *getTargetUnionField() const {
2870     assert(getCastKind() == CK_ToUnion);
2871     return getTargetFieldForToUnionCast(getType(), getSubExpr()->getType());
2872   }
2873
2874   static const FieldDecl *getTargetFieldForToUnionCast(QualType unionType,
2875                                                        QualType opType);
2876   static const FieldDecl *getTargetFieldForToUnionCast(const RecordDecl *RD,
2877                                                        QualType opType);
2878
2879   static bool classof(const Stmt *T) {
2880     return T->getStmtClass() >= firstCastExprConstant &&
2881            T->getStmtClass() <= lastCastExprConstant;
2882   }
2883
2884   // Iterators
2885   child_range children() { return child_range(&Op, &Op+1); }
2886   const_child_range children() const { return const_child_range(&Op, &Op + 1); }
2887 };
2888
2889 /// ImplicitCastExpr - Allows us to explicitly represent implicit type
2890 /// conversions, which have no direct representation in the original
2891 /// source code. For example: converting T[]->T*, void f()->void
2892 /// (*f)(), float->double, short->int, etc.
2893 ///
2894 /// In C, implicit casts always produce rvalues. However, in C++, an
2895 /// implicit cast whose result is being bound to a reference will be
2896 /// an lvalue or xvalue. For example:
2897 ///
2898 /// @code
2899 /// class Base { };
2900 /// class Derived : public Base { };
2901 /// Derived &&ref();
2902 /// void f(Derived d) {
2903 ///   Base& b = d; // initializer is an ImplicitCastExpr
2904 ///                // to an lvalue of type Base
2905 ///   Base&& r = ref(); // initializer is an ImplicitCastExpr
2906 ///                     // to an xvalue of type Base
2907 /// }
2908 /// @endcode
2909 class ImplicitCastExpr final
2910     : public CastExpr,
2911       private llvm::TrailingObjects<ImplicitCastExpr, CXXBaseSpecifier *> {
2912 private:
2913   ImplicitCastExpr(QualType ty, CastKind kind, Expr *op,
2914                    unsigned BasePathLength, ExprValueKind VK)
2915     : CastExpr(ImplicitCastExprClass, ty, VK, kind, op, BasePathLength) {
2916   }
2917
2918   /// Construct an empty implicit cast.
2919   explicit ImplicitCastExpr(EmptyShell Shell, unsigned PathSize)
2920     : CastExpr(ImplicitCastExprClass, Shell, PathSize) { }
2921
2922 public:
2923   enum OnStack_t { OnStack };
2924   ImplicitCastExpr(OnStack_t _, QualType ty, CastKind kind, Expr *op,
2925                    ExprValueKind VK)
2926     : CastExpr(ImplicitCastExprClass, ty, VK, kind, op, 0) {
2927   }
2928
2929   bool isPartOfExplicitCast() const { return CastExprBits.PartOfExplicitCast; }
2930   void setIsPartOfExplicitCast(bool PartOfExplicitCast) {
2931     CastExprBits.PartOfExplicitCast = PartOfExplicitCast;
2932   }
2933
2934   static ImplicitCastExpr *Create(const ASTContext &Context, QualType T,
2935                                   CastKind Kind, Expr *Operand,
2936                                   const CXXCastPath *BasePath,
2937                                   ExprValueKind Cat);
2938
2939   static ImplicitCastExpr *CreateEmpty(const ASTContext &Context,
2940                                        unsigned PathSize);
2941
2942   SourceLocation getLocStart() const LLVM_READONLY {
2943     return getSubExpr()->getLocStart();
2944   }
2945   SourceLocation getLocEnd() const LLVM_READONLY {
2946     return getSubExpr()->getLocEnd();
2947   }
2948
2949   static bool classof(const Stmt *T) {
2950     return T->getStmtClass() == ImplicitCastExprClass;
2951   }
2952
2953   friend TrailingObjects;
2954   friend class CastExpr;
2955 };
2956
2957 inline Expr *Expr::IgnoreImpCasts() {
2958   Expr *e = this;
2959   while (ImplicitCastExpr *ice = dyn_cast<ImplicitCastExpr>(e))
2960     e = ice->getSubExpr();
2961   return e;
2962 }
2963
2964 /// ExplicitCastExpr - An explicit cast written in the source
2965 /// code.
2966 ///
2967 /// This class is effectively an abstract class, because it provides
2968 /// the basic representation of an explicitly-written cast without
2969 /// specifying which kind of cast (C cast, functional cast, static
2970 /// cast, etc.) was written; specific derived classes represent the
2971 /// particular style of cast and its location information.
2972 ///
2973 /// Unlike implicit casts, explicit cast nodes have two different
2974 /// types: the type that was written into the source code, and the
2975 /// actual type of the expression as determined by semantic
2976 /// analysis. These types may differ slightly. For example, in C++ one
2977 /// can cast to a reference type, which indicates that the resulting
2978 /// expression will be an lvalue or xvalue. The reference type, however,
2979 /// will not be used as the type of the expression.
2980 class ExplicitCastExpr : public CastExpr {
2981   /// TInfo - Source type info for the (written) type
2982   /// this expression is casting to.
2983   TypeSourceInfo *TInfo;
2984
2985 protected:
2986   ExplicitCastExpr(StmtClass SC, QualType exprTy, ExprValueKind VK,
2987                    CastKind kind, Expr *op, unsigned PathSize,
2988                    TypeSourceInfo *writtenTy)
2989     : CastExpr(SC, exprTy, VK, kind, op, PathSize), TInfo(writtenTy) {}
2990
2991   /// Construct an empty explicit cast.
2992   ExplicitCastExpr(StmtClass SC, EmptyShell Shell, unsigned PathSize)
2993     : CastExpr(SC, Shell, PathSize) { }
2994
2995 public:
2996   /// getTypeInfoAsWritten - Returns the type source info for the type
2997   /// that this expression is casting to.
2998   TypeSourceInfo *getTypeInfoAsWritten() const { return TInfo; }
2999   void setTypeInfoAsWritten(TypeSourceInfo *writtenTy) { TInfo = writtenTy; }
3000
3001   /// getTypeAsWritten - Returns the type that this expression is
3002   /// casting to, as written in the source code.
3003   QualType getTypeAsWritten() const { return TInfo->getType(); }
3004
3005   static bool classof(const Stmt *T) {
3006      return T->getStmtClass() >= firstExplicitCastExprConstant &&
3007             T->getStmtClass() <= lastExplicitCastExprConstant;
3008   }
3009 };
3010
3011 /// CStyleCastExpr - An explicit cast in C (C99 6.5.4) or a C-style
3012 /// cast in C++ (C++ [expr.cast]), which uses the syntax
3013 /// (Type)expr. For example: @c (int)f.
3014 class CStyleCastExpr final
3015     : public ExplicitCastExpr,
3016       private llvm::TrailingObjects<CStyleCastExpr, CXXBaseSpecifier *> {
3017   SourceLocation LPLoc; // the location of the left paren
3018   SourceLocation RPLoc; // the location of the right paren
3019
3020   CStyleCastExpr(QualType exprTy, ExprValueKind vk, CastKind kind, Expr *op,
3021                  unsigned PathSize, TypeSourceInfo *writtenTy,
3022                  SourceLocation l, SourceLocation r)
3023     : ExplicitCastExpr(CStyleCastExprClass, exprTy, vk, kind, op, PathSize,
3024                        writtenTy), LPLoc(l), RPLoc(r) {}
3025
3026   /// Construct an empty C-style explicit cast.
3027   explicit CStyleCastExpr(EmptyShell Shell, unsigned PathSize)
3028     : ExplicitCastExpr(CStyleCastExprClass, Shell, PathSize) { }
3029
3030 public:
3031   static CStyleCastExpr *Create(const ASTContext &Context, QualType T,
3032                                 ExprValueKind VK, CastKind K,
3033                                 Expr *Op, const CXXCastPath *BasePath,
3034                                 TypeSourceInfo *WrittenTy, SourceLocation L,
3035                                 SourceLocation R);
3036
3037   static CStyleCastExpr *CreateEmpty(const ASTContext &Context,
3038                                      unsigned PathSize);
3039
3040   SourceLocation getLParenLoc() const { return LPLoc; }
3041   void setLParenLoc(SourceLocation L) { LPLoc = L; }
3042
3043   SourceLocation getRParenLoc() const { return RPLoc; }
3044   void setRParenLoc(SourceLocation L) { RPLoc = L; }
3045
3046   SourceLocation getLocStart() const LLVM_READONLY { return LPLoc; }
3047   SourceLocation getLocEnd() const LLVM_READONLY {
3048     return getSubExpr()->getLocEnd();
3049   }
3050
3051   static bool classof(const Stmt *T) {
3052     return T->getStmtClass() == CStyleCastExprClass;
3053   }
3054
3055   friend TrailingObjects;
3056   friend class CastExpr;
3057 };
3058
3059 /// A builtin binary operation expression such as "x + y" or "x <= y".
3060 ///
3061 /// This expression node kind describes a builtin binary operation,
3062 /// such as "x + y" for integer values "x" and "y". The operands will
3063 /// already have been converted to appropriate types (e.g., by
3064 /// performing promotions or conversions).
3065 ///
3066 /// In C++, where operators may be overloaded, a different kind of
3067 /// expression node (CXXOperatorCallExpr) is used to express the
3068 /// invocation of an overloaded operator with operator syntax. Within
3069 /// a C++ template, whether BinaryOperator or CXXOperatorCallExpr is
3070 /// used to store an expression "x + y" depends on the subexpressions
3071 /// for x and y. If neither x or y is type-dependent, and the "+"
3072 /// operator resolves to a built-in operation, BinaryOperator will be
3073 /// used to express the computation (x and y may still be
3074 /// value-dependent). If either x or y is type-dependent, or if the
3075 /// "+" resolves to an overloaded operator, CXXOperatorCallExpr will
3076 /// be used to express the computation.
3077 class BinaryOperator : public Expr {
3078 public:
3079   typedef BinaryOperatorKind Opcode;
3080
3081 private:
3082   unsigned Opc : 6;
3083
3084   // This is only meaningful for operations on floating point types and 0
3085   // otherwise.
3086   unsigned FPFeatures : 2;
3087   SourceLocation OpLoc;
3088
3089   enum { LHS, RHS, END_EXPR };
3090   Stmt* SubExprs[END_EXPR];
3091 public:
3092
3093   BinaryOperator(Expr *lhs, Expr *rhs, Opcode opc, QualType ResTy,
3094                  ExprValueKind VK, ExprObjectKind OK,
3095                  SourceLocation opLoc, FPOptions FPFeatures)
3096     : Expr(BinaryOperatorClass, ResTy, VK, OK,
3097            lhs->isTypeDependent() || rhs->isTypeDependent(),
3098            lhs->isValueDependent() || rhs->isValueDependent(),
3099            (lhs->isInstantiationDependent() ||
3100             rhs->isInstantiationDependent()),
3101            (lhs->containsUnexpandedParameterPack() ||
3102             rhs->containsUnexpandedParameterPack())),
3103       Opc(opc), FPFeatures(FPFeatures.getInt()), OpLoc(opLoc) {
3104     SubExprs[LHS] = lhs;
3105     SubExprs[RHS] = rhs;
3106     assert(!isCompoundAssignmentOp() &&
3107            "Use CompoundAssignOperator for compound assignments");
3108   }
3109
3110   /// Construct an empty binary operator.
3111   explicit BinaryOperator(EmptyShell Empty)
3112     : Expr(BinaryOperatorClass, Empty), Opc(BO_Comma) { }
3113
3114   SourceLocation getExprLoc() const LLVM_READONLY { return OpLoc; }
3115   SourceLocation getOperatorLoc() const { return OpLoc; }
3116   void setOperatorLoc(SourceLocation L) { OpLoc = L; }
3117
3118   Opcode getOpcode() const { return static_cast<Opcode>(Opc); }
3119   void setOpcode(Opcode O) { Opc = O; }
3120
3121   Expr *getLHS() const { return cast<Expr>(SubExprs[LHS]); }
3122   void setLHS(Expr *E) { SubExprs[LHS] = E; }
3123   Expr *getRHS() const { return cast<Expr>(SubExprs[RHS]); }
3124   void setRHS(Expr *E) { SubExprs[RHS] = E; }
3125
3126   SourceLocation getLocStart() const LLVM_READONLY {
3127     return getLHS()->getLocStart();
3128   }
3129   SourceLocation getLocEnd() const LLVM_READONLY {
3130     return getRHS()->getLocEnd();
3131   }
3132
3133   /// getOpcodeStr - Turn an Opcode enum value into the punctuation char it
3134   /// corresponds to, e.g. "<<=".
3135   static StringRef getOpcodeStr(Opcode Op);
3136
3137   StringRef getOpcodeStr() const { return getOpcodeStr(getOpcode()); }
3138
3139   /// Retrieve the binary opcode that corresponds to the given
3140   /// overloaded operator.
3141   static Opcode getOverloadedOpcode(OverloadedOperatorKind OO);
3142
3143   /// Retrieve the overloaded operator kind that corresponds to
3144   /// the given binary opcode.
3145   static OverloadedOperatorKind getOverloadedOperator(Opcode Opc);
3146
3147   /// predicates to categorize the respective opcodes.
3148   bool isPtrMemOp() const { return Opc == BO_PtrMemD || Opc == BO_PtrMemI; }
3149   static bool isMultiplicativeOp(Opcode Opc) {
3150     return Opc >= BO_Mul && Opc <= BO_Rem;
3151   }
3152   bool isMultiplicativeOp() const { return isMultiplicativeOp(getOpcode()); }
3153   static bool isAdditiveOp(Opcode Opc) { return Opc == BO_Add || Opc==BO_Sub; }
3154   bool isAdditiveOp() const { return isAdditiveOp(getOpcode()); }
3155   static bool isShiftOp(Opcode Opc) { return Opc == BO_Shl || Opc == BO_Shr; }
3156   bool isShiftOp() const { return isShiftOp(getOpcode()); }
3157
3158   static bool isBitwiseOp(Opcode Opc) { return Opc >= BO_And && Opc <= BO_Or; }
3159   bool isBitwiseOp() const { return isBitwiseOp(getOpcode()); }
3160
3161   static bool isRelationalOp(Opcode Opc) { return Opc >= BO_LT && Opc<=BO_GE; }
3162   bool isRelationalOp() const { return isRelationalOp(getOpcode()); }
3163
3164   static bool isEqualityOp(Opcode Opc) { return Opc == BO_EQ || Opc == BO_NE; }
3165   bool isEqualityOp() const { return isEqualityOp(getOpcode()); }
3166
3167   static bool isComparisonOp(Opcode Opc) { return Opc >= BO_Cmp && Opc<=BO_NE; }
3168   bool isComparisonOp() const { return isComparisonOp(getOpcode()); }
3169
3170   static Opcode negateComparisonOp(Opcode Opc) {
3171     switch (Opc) {
3172     default:
3173       llvm_unreachable("Not a comparison operator.");
3174     case BO_LT: return BO_GE;
3175     case BO_GT: return BO_LE;
3176     case BO_LE: return BO_GT;
3177     case BO_GE: return BO_LT;
3178     case BO_EQ: return BO_NE;
3179     case BO_NE: return BO_EQ;
3180     }
3181   }
3182
3183   static Opcode reverseComparisonOp(Opcode Opc) {
3184     switch (Opc) {
3185     default:
3186       llvm_unreachable("Not a comparison operator.");
3187     case BO_LT: return BO_GT;
3188     case BO_GT: return BO_LT;
3189     case BO_LE: return BO_GE;
3190     case BO_GE: return BO_LE;
3191     case BO_EQ:
3192     case BO_NE:
3193       return Opc;
3194     }
3195   }
3196
3197   static bool isLogicalOp(Opcode Opc) { return Opc == BO_LAnd || Opc==BO_LOr; }
3198   bool isLogicalOp() const { return isLogicalOp(getOpcode()); }
3199
3200   static bool isAssignmentOp(Opcode Opc) {
3201     return Opc >= BO_Assign && Opc <= BO_OrAssign;
3202   }
3203   bool isAssignmentOp() const { return isAssignmentOp(getOpcode()); }
3204
3205   static bool isCompoundAssignmentOp(Opcode Opc) {
3206     return Opc > BO_Assign && Opc <= BO_OrAssign;
3207   }
3208   bool isCompoundAssignmentOp() const {
3209     return isCompoundAssignmentOp(getOpcode());
3210   }
3211   static Opcode getOpForCompoundAssignment(Opcode Opc) {
3212     assert(isCompoundAssignmentOp(Opc));
3213     if (Opc >= BO_AndAssign)
3214       return Opcode(unsigned(Opc) - BO_AndAssign + BO_And);
3215     else
3216       return Opcode(unsigned(Opc) - BO_MulAssign + BO_Mul);
3217   }
3218
3219   static bool isShiftAssignOp(Opcode Opc) {
3220     return Opc == BO_ShlAssign || Opc == BO_ShrAssign;
3221   }
3222   bool isShiftAssignOp() const {
3223     return isShiftAssignOp(getOpcode());
3224   }
3225
3226   // Return true if a binary operator using the specified opcode and operands
3227   // would match the 'p = (i8*)nullptr + n' idiom for casting a pointer-sized
3228   // integer to a pointer.
3229   static bool isNullPointerArithmeticExtension(ASTContext &Ctx, Opcode Opc,
3230                                                Expr *LHS, Expr *RHS);
3231
3232   static bool classof(const Stmt *S) {
3233     return S->getStmtClass() >= firstBinaryOperatorConstant &&
3234            S->getStmtClass() <= lastBinaryOperatorConstant;
3235   }
3236
3237   // Iterators
3238   child_range children() {
3239     return child_range(&SubExprs[0], &SubExprs[0]+END_EXPR);
3240   }
3241   const_child_range children() const {
3242     return const_child_range(&SubExprs[0], &SubExprs[0] + END_EXPR);
3243   }
3244
3245   // Set the FP contractability status of this operator. Only meaningful for
3246   // operations on floating point types.
3247   void setFPFeatures(FPOptions F) { FPFeatures = F.getInt(); }
3248
3249   FPOptions getFPFeatures() const { return FPOptions(FPFeatures); }
3250
3251   // Get the FP contractability status of this operator. Only meaningful for
3252   // operations on floating point types.
3253   bool isFPContractableWithinStatement() const {
3254     return FPOptions(FPFeatures).allowFPContractWithinStatement();
3255   }
3256
3257 protected:
3258   BinaryOperator(Expr *lhs, Expr *rhs, Opcode opc, QualType ResTy,
3259                  ExprValueKind VK, ExprObjectKind OK,
3260                  SourceLocation opLoc, FPOptions FPFeatures, bool dead2)
3261     : Expr(CompoundAssignOperatorClass, ResTy, VK, OK,
3262            lhs->isTypeDependent() || rhs->isTypeDependent(),
3263            lhs->isValueDependent() || rhs->isValueDependent(),
3264            (lhs->isInstantiationDependent() ||
3265             rhs->isInstantiationDependent()),
3266            (lhs->containsUnexpandedParameterPack() ||
3267             rhs->containsUnexpandedParameterPack())),
3268       Opc(opc), FPFeatures(FPFeatures.getInt()), OpLoc(opLoc) {
3269     SubExprs[LHS] = lhs;
3270     SubExprs[RHS] = rhs;
3271   }
3272
3273   BinaryOperator(StmtClass SC, EmptyShell Empty)
3274     : Expr(SC, Empty), Opc(BO_MulAssign) { }
3275 };
3276
3277 /// CompoundAssignOperator - For compound assignments (e.g. +=), we keep
3278 /// track of the type the operation is performed in.  Due to the semantics of
3279 /// these operators, the operands are promoted, the arithmetic performed, an
3280 /// implicit conversion back to the result type done, then the assignment takes
3281 /// place.  This captures the intermediate type which the computation is done
3282 /// in.
3283 class CompoundAssignOperator : public BinaryOperator {
3284   QualType ComputationLHSType;
3285   QualType ComputationResultType;
3286 public:
3287   CompoundAssignOperator(Expr *lhs, Expr *rhs, Opcode opc, QualType ResType,
3288                          ExprValueKind VK, ExprObjectKind OK,
3289                          QualType CompLHSType, QualType CompResultType,
3290                          SourceLocation OpLoc, FPOptions FPFeatures)
3291     : BinaryOperator(lhs, rhs, opc, ResType, VK, OK, OpLoc, FPFeatures,
3292                      true),
3293       ComputationLHSType(CompLHSType),
3294       ComputationResultType(CompResultType) {
3295     assert(isCompoundAssignmentOp() &&
3296            "Only should be used for compound assignments");
3297   }
3298
3299   /// Build an empty compound assignment operator expression.
3300   explicit CompoundAssignOperator(EmptyShell Empty)
3301     : BinaryOperator(CompoundAssignOperatorClass, Empty) { }
3302
3303   // The two computation types are the type the LHS is converted
3304   // to for the computation and the type of the result; the two are
3305   // distinct in a few cases (specifically, int+=ptr and ptr-=ptr).
3306   QualType getComputationLHSType() const { return ComputationLHSType; }
3307   void setComputationLHSType(QualType T) { ComputationLHSType = T; }
3308
3309   QualType getComputationResultType() const { return ComputationResultType; }
3310   void setComputationResultType(QualType T) { ComputationResultType = T; }
3311
3312   static bool classof(const Stmt *S) {
3313     return S->getStmtClass() == CompoundAssignOperatorClass;
3314   }
3315 };
3316
3317 /// AbstractConditionalOperator - An abstract base class for
3318 /// ConditionalOperator and BinaryConditionalOperator.
3319 class AbstractConditionalOperator : public Expr {
3320   SourceLocation QuestionLoc, ColonLoc;
3321   friend class ASTStmtReader;
3322
3323 protected:
3324   AbstractConditionalOperator(StmtClass SC, QualType T,
3325                               ExprValueKind VK, ExprObjectKind OK,
3326                               bool TD, bool VD, bool ID,
3327                               bool ContainsUnexpandedParameterPack,
3328                               SourceLocation qloc,
3329                               SourceLocation cloc)
3330     : Expr(SC, T, VK, OK, TD, VD, ID, ContainsUnexpandedParameterPack),
3331       QuestionLoc(qloc), ColonLoc(cloc) {}
3332
3333   AbstractConditionalOperator(StmtClass SC, EmptyShell Empty)
3334     : Expr(SC, Empty) { }
3335
3336 public:
3337   // getCond - Return the expression representing the condition for
3338   //   the ?: operator.
3339   Expr *getCond() const;
3340
3341   // getTrueExpr - Return the subexpression representing the value of
3342   //   the expression if the condition evaluates to true.
3343   Expr *getTrueExpr() const;
3344
3345   // getFalseExpr - Return the subexpression representing the value of
3346   //   the expression if the condition evaluates to false.  This is
3347   //   the same as getRHS.
3348   Expr *getFalseExpr() const;
3349
3350   SourceLocation getQuestionLoc() const { return QuestionLoc; }
3351   SourceLocation getColonLoc() const { return ColonLoc; }
3352
3353   static bool classof(const Stmt *T) {
3354     return T->getStmtClass() == ConditionalOperatorClass ||
3355            T->getStmtClass() == BinaryConditionalOperatorClass;
3356   }
3357 };
3358
3359 /// ConditionalOperator - The ?: ternary operator.  The GNU "missing
3360 /// middle" extension is a BinaryConditionalOperator.
3361 class ConditionalOperator : public AbstractConditionalOperator {
3362   enum { COND, LHS, RHS, END_EXPR };
3363   Stmt* SubExprs[END_EXPR]; // Left/Middle/Right hand sides.
3364
3365   friend class ASTStmtReader;
3366 public:
3367   ConditionalOperator(Expr *cond, SourceLocation QLoc, Expr *lhs,
3368                       SourceLocation CLoc, Expr *rhs,
3369                       QualType t, ExprValueKind VK, ExprObjectKind OK)
3370     : AbstractConditionalOperator(ConditionalOperatorClass, t, VK, OK,
3371            // FIXME: the type of the conditional operator doesn't
3372            // depend on the type of the conditional, but the standard
3373            // seems to imply that it could. File a bug!
3374            (lhs->isTypeDependent() || rhs->isTypeDependent()),
3375            (cond->isValueDependent() || lhs->isValueDependent() ||
3376             rhs->isValueDependent()),
3377            (cond->isInstantiationDependent() ||
3378             lhs->isInstantiationDependent() ||
3379             rhs->isInstantiationDependent()),
3380            (cond->containsUnexpandedParameterPack() ||
3381             lhs->containsUnexpandedParameterPack() ||
3382             rhs->containsUnexpandedParameterPack()),
3383                                   QLoc, CLoc) {
3384     SubExprs[COND] = cond;
3385     SubExprs[LHS] = lhs;
3386     SubExprs[RHS] = rhs;
3387   }
3388
3389   /// Build an empty conditional operator.
3390   explicit ConditionalOperator(EmptyShell Empty)
3391     : AbstractConditionalOperator(ConditionalOperatorClass, Empty) { }
3392
3393   // getCond - Return the expression representing the condition for
3394   //   the ?: operator.
3395   Expr *getCond() const { return cast<Expr>(SubExprs[COND]); }
3396
3397   // getTrueExpr - Return the subexpression representing the value of
3398   //   the expression if the condition evaluates to true.
3399   Expr *getTrueExpr() const { return cast<Expr>(SubExprs[LHS]); }
3400
3401   // getFalseExpr - Return the subexpression representing the value of
3402   //   the expression if the condition evaluates to false.  This is
3403   //   the same as getRHS.
3404   Expr *getFalseExpr() const { return cast<Expr>(SubExprs[RHS]); }
3405
3406   Expr *getLHS() const { return cast<Expr>(SubExprs[LHS]); }
3407   Expr *getRHS() const { return cast<Expr>(SubExprs[RHS]); }
3408
3409   SourceLocation getLocStart() const LLVM_READONLY {
3410     return getCond()->getLocStart();
3411   }
3412   SourceLocation getLocEnd() const LLVM_READONLY {
3413     return getRHS()->getLocEnd();
3414   }
3415
3416   static bool classof(const Stmt *T) {
3417     return T->getStmtClass() == ConditionalOperatorClass;
3418   }
3419
3420   // Iterators
3421   child_range children() {
3422     return child_range(&SubExprs[0], &SubExprs[0]+END_EXPR);
3423   }
3424   const_child_range children() const {
3425     return const_child_range(&SubExprs[0], &SubExprs[0] + END_EXPR);
3426   }
3427 };
3428
3429 /// BinaryConditionalOperator - The GNU extension to the conditional
3430 /// operator which allows the middle operand to be omitted.
3431 ///
3432 /// This is a different expression kind on the assumption that almost
3433 /// every client ends up needing to know that these are different.
3434 class BinaryConditionalOperator : public AbstractConditionalOperator {
3435   enum { COMMON, COND, LHS, RHS, NUM_SUBEXPRS };
3436
3437   /// - the common condition/left-hand-side expression, which will be
3438   ///   evaluated as the opaque value
3439   /// - the condition, expressed in terms of the opaque value
3440   /// - the left-hand-side, expressed in terms of the opaque value
3441   /// - the right-hand-side
3442   Stmt *SubExprs[NUM_SUBEXPRS];
3443   OpaqueValueExpr *OpaqueValue;
3444
3445   friend class ASTStmtReader;
3446 public:
3447   BinaryConditionalOperator(Expr *common, OpaqueValueExpr *opaqueValue,
3448                             Expr *cond, Expr *lhs, Expr *rhs,
3449                             SourceLocation qloc, SourceLocation cloc,
3450                             QualType t, ExprValueKind VK, ExprObjectKind OK)
3451     : AbstractConditionalOperator(BinaryConditionalOperatorClass, t, VK, OK,
3452            (common->isTypeDependent() || rhs->isTypeDependent()),
3453            (common->isValueDependent() || rhs->isValueDependent()),
3454            (common->isInstantiationDependent() ||
3455             rhs->isInstantiationDependent()),
3456            (common->containsUnexpandedParameterPack() ||
3457             rhs->containsUnexpandedParameterPack()),
3458                                   qloc, cloc),
3459       OpaqueValue(opaqueValue) {
3460     SubExprs[COMMON] = common;
3461     SubExprs[COND] = cond;
3462     SubExprs[LHS] = lhs;
3463     SubExprs[RHS] = rhs;
3464     assert(OpaqueValue->getSourceExpr() == common && "Wrong opaque value");
3465   }
3466
3467   /// Build an empty conditional operator.
3468   explicit BinaryConditionalOperator(EmptyShell Empty)
3469     : AbstractConditionalOperator(BinaryConditionalOperatorClass, Empty) { }
3470
3471   /// getCommon - Return the common expression, written to the
3472   ///   left of the condition.  The opaque value will be bound to the
3473   ///   result of this expression.
3474   Expr *getCommon() const { return cast<Expr>(SubExprs[COMMON]); }
3475
3476   /// getOpaqueValue - Return the opaque value placeholder.
3477   OpaqueValueExpr *getOpaqueValue() const { return OpaqueValue; }
3478
3479   /// getCond - Return the condition expression; this is defined
3480   ///   in terms of the opaque value.
3481   Expr *getCond() const { return cast<Expr>(SubExprs[COND]); }
3482
3483   /// getTrueExpr - Return the subexpression which will be
3484   ///   evaluated if the condition evaluates to true;  this is defined
3485   ///   in terms of the opaque value.
3486   Expr *getTrueExpr() const {
3487     return cast<Expr>(SubExprs[LHS]);
3488   }
3489
3490   /// getFalseExpr - Return the subexpression which will be
3491   ///   evaluated if the condnition evaluates to false; this is
3492   ///   defined in terms of the opaque value.
3493   Expr *getFalseExpr() const {
3494     return cast<Expr>(SubExprs[RHS]);
3495   }
3496
3497   SourceLocation getLocStart() const LLVM_READONLY {
3498     return getCommon()->getLocStart();
3499   }
3500   SourceLocation getLocEnd() const LLVM_READONLY {
3501     return getFalseExpr()->getLocEnd();
3502   }
3503
3504   static bool classof(const Stmt *T) {
3505     return T->getStmtClass() == BinaryConditionalOperatorClass;
3506   }
3507
3508   // Iterators
3509   child_range children() {
3510     return child_range(SubExprs, SubExprs + NUM_SUBEXPRS);
3511   }
3512   const_child_range children() const {
3513     return const_child_range(SubExprs, SubExprs + NUM_SUBEXPRS);
3514   }
3515 };
3516
3517 inline Expr *AbstractConditionalOperator::getCond() const {
3518   if (const ConditionalOperator *co = dyn_cast<ConditionalOperator>(this))
3519     return co->getCond();
3520   return cast<BinaryConditionalOperator>(this)->getCond();
3521 }
3522
3523 inline Expr *AbstractConditionalOperator::getTrueExpr() const {
3524   if (const ConditionalOperator *co = dyn_cast<ConditionalOperator>(this))
3525     return co->getTrueExpr();
3526   return cast<BinaryConditionalOperator>(this)->getTrueExpr();
3527 }
3528
3529 inline Expr *AbstractConditionalOperator::getFalseExpr() const {
3530   if (const ConditionalOperator *co = dyn_cast<ConditionalOperator>(this))
3531     return co->getFalseExpr();
3532   return cast<BinaryConditionalOperator>(this)->getFalseExpr();
3533 }
3534
3535 /// AddrLabelExpr - The GNU address of label extension, representing &&label.
3536 class AddrLabelExpr : public Expr {
3537   SourceLocation AmpAmpLoc, LabelLoc;
3538   LabelDecl *Label;
3539 public:
3540   AddrLabelExpr(SourceLocation AALoc, SourceLocation LLoc, LabelDecl *L,
3541                 QualType t)
3542     : Expr(AddrLabelExprClass, t, VK_RValue, OK_Ordinary, false, false, false,
3543            false),
3544       AmpAmpLoc(AALoc), LabelLoc(LLoc), Label(L) {}
3545
3546   /// Build an empty address of a label expression.
3547   explicit AddrLabelExpr(EmptyShell Empty)
3548     : Expr(AddrLabelExprClass, Empty) { }
3549
3550   SourceLocation getAmpAmpLoc() const { return AmpAmpLoc; }
3551   void setAmpAmpLoc(SourceLocation L) { AmpAmpLoc = L; }
3552   SourceLocation getLabelLoc() const { return LabelLoc; }
3553   void setLabelLoc(SourceLocation L) { LabelLoc = L; }
3554
3555   SourceLocation getLocStart() const LLVM_READONLY { return AmpAmpLoc; }
3556   SourceLocation getLocEnd() const LLVM_READONLY { return LabelLoc; }
3557
3558   LabelDecl *getLabel() const { return Label; }
3559   void setLabel(LabelDecl *L) { Label = L; }
3560
3561   static bool classof(const Stmt *T) {
3562     return T->getStmtClass() == AddrLabelExprClass;
3563   }
3564
3565   // Iterators
3566   child_range children() {
3567     return child_range(child_iterator(), child_iterator());
3568   }
3569   const_child_range children() const {
3570     return const_child_range(const_child_iterator(), const_child_iterator());
3571   }
3572 };
3573
3574 /// StmtExpr - This is the GNU Statement Expression extension: ({int X=4; X;}).
3575 /// The StmtExpr contains a single CompoundStmt node, which it evaluates and
3576 /// takes the value of the last subexpression.
3577 ///
3578 /// A StmtExpr is always an r-value; values "returned" out of a
3579 /// StmtExpr will be copied.
3580 class StmtExpr : public Expr {
3581   Stmt *SubStmt;
3582   SourceLocation LParenLoc, RParenLoc;
3583 public:
3584   // FIXME: Does type-dependence need to be computed differently?
3585   // FIXME: Do we need to compute instantiation instantiation-dependence for
3586   // statements? (ugh!)
3587   StmtExpr(CompoundStmt *substmt, QualType T,
3588            SourceLocation lp, SourceLocation rp) :
3589     Expr(StmtExprClass, T, VK_RValue, OK_Ordinary,
3590          T->isDependentType(), false, false, false),
3591     SubStmt(substmt), LParenLoc(lp), RParenLoc(rp) { }
3592
3593   /// Build an empty statement expression.
3594   explicit StmtExpr(EmptyShell Empty) : Expr(StmtExprClass, Empty) { }
3595
3596   CompoundStmt *getSubStmt() { return cast<CompoundStmt>(SubStmt); }
3597   const CompoundStmt *getSubStmt() const { return cast<CompoundStmt>(SubStmt); }
3598   void setSubStmt(CompoundStmt *S) { SubStmt = S; }
3599
3600   SourceLocation getLocStart() const LLVM_READONLY { return LParenLoc; }
3601   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
3602
3603   SourceLocation getLParenLoc() const { return LParenLoc; }
3604   void setLParenLoc(SourceLocation L) { LParenLoc = L; }
3605   SourceLocation getRParenLoc() const { return RParenLoc; }
3606   void setRParenLoc(SourceLocation L) { RParenLoc = L; }
3607
3608   static bool classof(const Stmt *T) {
3609     return T->getStmtClass() == StmtExprClass;
3610   }
3611
3612   // Iterators
3613   child_range children() { return child_range(&SubStmt, &SubStmt+1); }
3614   const_child_range children() const {
3615     return const_child_range(&SubStmt, &SubStmt + 1);
3616   }
3617 };
3618
3619 /// ShuffleVectorExpr - clang-specific builtin-in function
3620 /// __builtin_shufflevector.
3621 /// This AST node represents a operator that does a constant
3622 /// shuffle, similar to LLVM's shufflevector instruction. It takes
3623 /// two vectors and a variable number of constant indices,
3624 /// and returns the appropriately shuffled vector.
3625 class ShuffleVectorExpr : public Expr {
3626   SourceLocation BuiltinLoc, RParenLoc;
3627
3628   // SubExprs - the list of values passed to the __builtin_shufflevector
3629   // function. The first two are vectors, and the rest are constant
3630   // indices.  The number of values in this list is always
3631   // 2+the number of indices in the vector type.
3632   Stmt **SubExprs;
3633   unsigned NumExprs;
3634
3635 public:
3636   ShuffleVectorExpr(const ASTContext &C, ArrayRef<Expr*> args, QualType Type,
3637                     SourceLocation BLoc, SourceLocation RP);
3638
3639   /// Build an empty vector-shuffle expression.
3640   explicit ShuffleVectorExpr(EmptyShell Empty)
3641     : Expr(ShuffleVectorExprClass, Empty), SubExprs(nullptr) { }
3642
3643   SourceLocation getBuiltinLoc() const { return BuiltinLoc; }
3644   void setBuiltinLoc(SourceLocation L) { BuiltinLoc = L; }
3645
3646   SourceLocation getRParenLoc() const { return RParenLoc; }
3647   void setRParenLoc(SourceLocation L) { RParenLoc = L; }
3648
3649   SourceLocation getLocStart() const LLVM_READONLY { return BuiltinLoc; }
3650   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
3651
3652   static bool classof(const Stmt *T) {
3653     return T->getStmtClass() == ShuffleVectorExprClass;
3654   }
3655
3656   /// getNumSubExprs - Return the size of the SubExprs array.  This includes the
3657   /// constant expression, the actual arguments passed in, and the function
3658   /// pointers.
3659   unsigned getNumSubExprs() const { return NumExprs; }
3660
3661   /// Retrieve the array of expressions.
3662   Expr **getSubExprs() { return reinterpret_cast<Expr **>(SubExprs); }
3663
3664   /// getExpr - Return the Expr at the specified index.
3665   Expr *getExpr(unsigned Index) {
3666     assert((Index < NumExprs) && "Arg access out of range!");
3667     return cast<Expr>(SubExprs[Index]);
3668   }
3669   const Expr *getExpr(unsigned Index) const {
3670     assert((Index < NumExprs) && "Arg access out of range!");
3671     return cast<Expr>(SubExprs[Index]);
3672   }
3673
3674   void setExprs(const ASTContext &C, ArrayRef<Expr *> Exprs);
3675
3676   llvm::APSInt getShuffleMaskIdx(const ASTContext &Ctx, unsigned N) const {
3677     assert((N < NumExprs - 2) && "Shuffle idx out of range!");
3678     return getExpr(N+2)->EvaluateKnownConstInt(Ctx);
3679   }
3680
3681   // Iterators
3682   child_range children() {
3683     return child_range(&SubExprs[0], &SubExprs[0]+NumExprs);
3684   }
3685   const_child_range children() const {
3686     return const_child_range(&SubExprs[0], &SubExprs[0] + NumExprs);
3687   }
3688 };
3689
3690 /// ConvertVectorExpr - Clang builtin function __builtin_convertvector
3691 /// This AST node provides support for converting a vector type to another
3692 /// vector type of the same arity.
3693 class ConvertVectorExpr : public Expr {
3694 private:
3695   Stmt *SrcExpr;
3696   TypeSourceInfo *TInfo;
3697   SourceLocation BuiltinLoc, RParenLoc;
3698
3699   friend class ASTReader;
3700   friend class ASTStmtReader;
3701   explicit ConvertVectorExpr(EmptyShell Empty) : Expr(ConvertVectorExprClass, Empty) {}
3702
3703 public:
3704   ConvertVectorExpr(Expr* SrcExpr, TypeSourceInfo *TI, QualType DstType,
3705              ExprValueKind VK, ExprObjectKind OK,
3706              SourceLocation BuiltinLoc, SourceLocation RParenLoc)
3707     : Expr(ConvertVectorExprClass, DstType, VK, OK,
3708            DstType->isDependentType(),
3709            DstType->isDependentType() || SrcExpr->isValueDependent(),
3710            (DstType->isInstantiationDependentType() ||
3711             SrcExpr->isInstantiationDependent()),
3712            (DstType->containsUnexpandedParameterPack() ||
3713             SrcExpr->containsUnexpandedParameterPack())),
3714   SrcExpr(SrcExpr), TInfo(TI), BuiltinLoc(BuiltinLoc), RParenLoc(RParenLoc) {}
3715
3716   /// getSrcExpr - Return the Expr to be converted.
3717   Expr *getSrcExpr() const { return cast<Expr>(SrcExpr); }
3718
3719   /// getTypeSourceInfo - Return the destination type.
3720   TypeSourceInfo *getTypeSourceInfo() const {
3721     return TInfo;
3722   }
3723   void setTypeSourceInfo(TypeSourceInfo *ti) {
3724     TInfo = ti;
3725   }
3726
3727   /// getBuiltinLoc - Return the location of the __builtin_convertvector token.
3728   SourceLocation getBuiltinLoc() const { return BuiltinLoc; }
3729
3730   /// getRParenLoc - Return the location of final right parenthesis.
3731   SourceLocation getRParenLoc() const { return RParenLoc; }
3732
3733   SourceLocation getLocStart() const LLVM_READONLY { return BuiltinLoc; }
3734   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
3735
3736   static bool classof(const Stmt *T) {
3737     return T->getStmtClass() == ConvertVectorExprClass;
3738   }
3739
3740   // Iterators
3741   child_range children() { return child_range(&SrcExpr, &SrcExpr+1); }
3742   const_child_range children() const {
3743     return const_child_range(&SrcExpr, &SrcExpr + 1);
3744   }
3745 };
3746
3747 /// ChooseExpr - GNU builtin-in function __builtin_choose_expr.
3748 /// This AST node is similar to the conditional operator (?:) in C, with
3749 /// the following exceptions:
3750 /// - the test expression must be a integer constant expression.
3751 /// - the expression returned acts like the chosen subexpression in every
3752 ///   visible way: the type is the same as that of the chosen subexpression,
3753 ///   and all predicates (whether it's an l-value, whether it's an integer
3754 ///   constant expression, etc.) return the same result as for the chosen
3755 ///   sub-expression.
3756 class ChooseExpr : public Expr {
3757   enum { COND, LHS, RHS, END_EXPR };
3758   Stmt* SubExprs[END_EXPR]; // Left/Middle/Right hand sides.
3759   SourceLocation BuiltinLoc, RParenLoc;
3760   bool CondIsTrue;
3761 public:
3762   ChooseExpr(SourceLocation BLoc, Expr *cond, Expr *lhs, Expr *rhs,
3763              QualType t, ExprValueKind VK, ExprObjectKind OK,
3764              SourceLocation RP, bool condIsTrue,
3765              bool TypeDependent, bool ValueDependent)
3766     : Expr(ChooseExprClass, t, VK, OK, TypeDependent, ValueDependent,
3767            (cond->isInstantiationDependent() ||
3768             lhs->isInstantiationDependent() ||
3769             rhs->isInstantiationDependent()),
3770            (cond->containsUnexpandedParameterPack() ||
3771             lhs->containsUnexpandedParameterPack() ||
3772             rhs->containsUnexpandedParameterPack())),
3773       BuiltinLoc(BLoc), RParenLoc(RP), CondIsTrue(condIsTrue) {
3774       SubExprs[COND] = cond;
3775       SubExprs[LHS] = lhs;
3776       SubExprs[RHS] = rhs;
3777     }
3778
3779   /// Build an empty __builtin_choose_expr.
3780   explicit ChooseExpr(EmptyShell Empty) : Expr(ChooseExprClass, Empty) { }
3781
3782   /// isConditionTrue - Return whether the condition is true (i.e. not
3783   /// equal to zero).
3784   bool isConditionTrue() const {
3785     assert(!isConditionDependent() &&
3786            "Dependent condition isn't true or false");
3787     return CondIsTrue;
3788   }
3789   void setIsConditionTrue(bool isTrue) { CondIsTrue = isTrue; }
3790
3791   bool isConditionDependent() const {
3792     return getCond()->isTypeDependent() || getCond()->isValueDependent();
3793   }
3794
3795   /// getChosenSubExpr - Return the subexpression chosen according to the
3796   /// condition.
3797   Expr *getChosenSubExpr() const {
3798     return isConditionTrue() ? getLHS() : getRHS();
3799   }
3800
3801   Expr *getCond() const { return cast<Expr>(SubExprs[COND]); }
3802   void setCond(Expr *E) { SubExprs[COND] = E; }
3803   Expr *getLHS() const { return cast<Expr>(SubExprs[LHS]); }
3804   void setLHS(Expr *E) { SubExprs[LHS] = E; }
3805   Expr *getRHS() const { return cast<Expr>(SubExprs[RHS]); }
3806   void setRHS(Expr *E) { SubExprs[RHS] = E; }
3807
3808   SourceLocation getBuiltinLoc() const { return BuiltinLoc; }
3809   void setBuiltinLoc(SourceLocation L) { BuiltinLoc = L; }
3810
3811   SourceLocation getRParenLoc() const { return RParenLoc; }
3812   void setRParenLoc(SourceLocation L) { RParenLoc = L; }
3813
3814   SourceLocation getLocStart() const LLVM_READONLY { return BuiltinLoc; }
3815   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
3816
3817   static bool classof(const Stmt *T) {
3818     return T->getStmtClass() == ChooseExprClass;
3819   }
3820
3821   // Iterators
3822   child_range children() {
3823     return child_range(&SubExprs[0], &SubExprs[0]+END_EXPR);
3824   }
3825   const_child_range children() const {
3826     return const_child_range(&SubExprs[0], &SubExprs[0] + END_EXPR);
3827   }
3828 };
3829
3830 /// GNUNullExpr - Implements the GNU __null extension, which is a name
3831 /// for a null pointer constant that has integral type (e.g., int or
3832 /// long) and is the same size and alignment as a pointer. The __null
3833 /// extension is typically only used by system headers, which define
3834 /// NULL as __null in C++ rather than using 0 (which is an integer
3835 /// that may not match the size of a pointer).
3836 class GNUNullExpr : public Expr {
3837   /// TokenLoc - The location of the __null keyword.
3838   SourceLocation TokenLoc;
3839
3840 public:
3841   GNUNullExpr(QualType Ty, SourceLocation Loc)
3842     : Expr(GNUNullExprClass, Ty, VK_RValue, OK_Ordinary, false, false, false,
3843            false),
3844       TokenLoc(Loc) { }
3845
3846   /// Build an empty GNU __null expression.
3847   explicit GNUNullExpr(EmptyShell Empty) : Expr(GNUNullExprClass, Empty) { }
3848
3849   /// getTokenLocation - The location of the __null token.
3850   SourceLocation getTokenLocation() const { return TokenLoc; }
3851   void setTokenLocation(SourceLocation L) { TokenLoc = L; }
3852
3853   SourceLocation getLocStart() const LLVM_READONLY { return TokenLoc; }
3854   SourceLocation getLocEnd() const LLVM_READONLY { return TokenLoc; }
3855
3856   static bool classof(const Stmt *T) {
3857     return T->getStmtClass() == GNUNullExprClass;
3858   }
3859
3860   // Iterators
3861   child_range children() {
3862     return child_range(child_iterator(), child_iterator());
3863   }
3864   const_child_range children() const {
3865     return const_child_range(const_child_iterator(), const_child_iterator());
3866   }
3867 };
3868
3869 /// Represents a call to the builtin function \c __builtin_va_arg.
3870 class VAArgExpr : public Expr {
3871   Stmt *Val;
3872   llvm::PointerIntPair<TypeSourceInfo *, 1, bool> TInfo;
3873   SourceLocation BuiltinLoc, RParenLoc;
3874 public:
3875   VAArgExpr(SourceLocation BLoc, Expr *e, TypeSourceInfo *TInfo,
3876             SourceLocation RPLoc, QualType t, bool IsMS)
3877       : Expr(VAArgExprClass, t, VK_RValue, OK_Ordinary, t->isDependentType(),
3878              false, (TInfo->getType()->isInstantiationDependentType() ||
3879                      e->isInstantiationDependent()),
3880              (TInfo->getType()->containsUnexpandedParameterPack() ||
3881               e->containsUnexpandedParameterPack())),
3882         Val(e), TInfo(TInfo, IsMS), BuiltinLoc(BLoc), RParenLoc(RPLoc) {}
3883
3884   /// Create an empty __builtin_va_arg expression.
3885   explicit VAArgExpr(EmptyShell Empty)
3886       : Expr(VAArgExprClass, Empty), Val(nullptr), TInfo(nullptr, false) {}
3887
3888   const Expr *getSubExpr() const { return cast<Expr>(Val); }
3889   Expr *getSubExpr() { return cast<Expr>(Val); }
3890   void setSubExpr(Expr *E) { Val = E; }
3891
3892   /// Returns whether this is really a Win64 ABI va_arg expression.
3893   bool isMicrosoftABI() const { return TInfo.getInt(); }
3894   void setIsMicrosoftABI(bool IsMS) { TInfo.setInt(IsMS); }
3895
3896   TypeSourceInfo *getWrittenTypeInfo() const { return TInfo.getPointer(); }
3897   void setWrittenTypeInfo(TypeSourceInfo *TI) { TInfo.setPointer(TI); }
3898
3899   SourceLocation getBuiltinLoc() const { return BuiltinLoc; }
3900   void setBuiltinLoc(SourceLocation L) { BuiltinLoc = L; }
3901
3902   SourceLocation getRParenLoc() const { return RParenLoc; }
3903   void setRParenLoc(SourceLocation L) { RParenLoc = L; }
3904
3905   SourceLocation getLocStart() const LLVM_READONLY { return BuiltinLoc; }
3906   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
3907
3908   static bool classof(const Stmt *T) {
3909     return T->getStmtClass() == VAArgExprClass;
3910   }
3911
3912   // Iterators
3913   child_range children() { return child_range(&Val, &Val+1); }
3914   const_child_range children() const {
3915     return const_child_range(&Val, &Val + 1);
3916   }
3917 };
3918
3919 /// Describes an C or C++ initializer list.
3920 ///
3921 /// InitListExpr describes an initializer list, which can be used to
3922 /// initialize objects of different types, including
3923 /// struct/class/union types, arrays, and vectors. For example:
3924 ///
3925 /// @code
3926 /// struct foo x = { 1, { 2, 3 } };
3927 /// @endcode
3928 ///
3929 /// Prior to semantic analysis, an initializer list will represent the
3930 /// initializer list as written by the user, but will have the
3931 /// placeholder type "void". This initializer list is called the
3932 /// syntactic form of the initializer, and may contain C99 designated
3933 /// initializers (represented as DesignatedInitExprs), initializations
3934 /// of subobject members without explicit braces, and so on. Clients
3935 /// interested in the original syntax of the initializer list should
3936 /// use the syntactic form of the initializer list.
3937 ///
3938 /// After semantic analysis, the initializer list will represent the
3939 /// semantic form of the initializer, where the initializations of all
3940 /// subobjects are made explicit with nested InitListExpr nodes and
3941 /// C99 designators have been eliminated by placing the designated
3942 /// initializations into the subobject they initialize. Additionally,
3943 /// any "holes" in the initialization, where no initializer has been
3944 /// specified for a particular subobject, will be replaced with
3945 /// implicitly-generated ImplicitValueInitExpr expressions that
3946 /// value-initialize the subobjects. Note, however, that the
3947 /// initializer lists may still have fewer initializers than there are
3948 /// elements to initialize within the object.
3949 ///
3950 /// After semantic analysis has completed, given an initializer list,
3951 /// method isSemanticForm() returns true if and only if this is the
3952 /// semantic form of the initializer list (note: the same AST node
3953 /// may at the same time be the syntactic form).
3954 /// Given the semantic form of the initializer list, one can retrieve
3955 /// the syntactic form of that initializer list (when different)
3956 /// using method getSyntacticForm(); the method returns null if applied
3957 /// to a initializer list which is already in syntactic form.
3958 /// Similarly, given the syntactic form (i.e., an initializer list such
3959 /// that isSemanticForm() returns false), one can retrieve the semantic
3960 /// form using method getSemanticForm().
3961 /// Since many initializer lists have the same syntactic and semantic forms,
3962 /// getSyntacticForm() may return NULL, indicating that the current
3963 /// semantic initializer list also serves as its syntactic form.
3964 class InitListExpr : public Expr {
3965   // FIXME: Eliminate this vector in favor of ASTContext allocation
3966   typedef ASTVector<Stmt *> InitExprsTy;
3967   InitExprsTy InitExprs;
3968   SourceLocation LBraceLoc, RBraceLoc;
3969
3970   /// The alternative form of the initializer list (if it exists).
3971   /// The int part of the pair stores whether this initializer list is
3972   /// in semantic form. If not null, the pointer points to:
3973   ///   - the syntactic form, if this is in semantic form;
3974   ///   - the semantic form, if this is in syntactic form.
3975   llvm::PointerIntPair<InitListExpr *, 1, bool> AltForm;
3976
3977   /// Either:
3978   ///  If this initializer list initializes an array with more elements than
3979   ///  there are initializers in the list, specifies an expression to be used
3980   ///  for value initialization of the rest of the elements.
3981   /// Or
3982   ///  If this initializer list initializes a union, specifies which
3983   ///  field within the union will be initialized.
3984   llvm::PointerUnion<Expr *, FieldDecl *> ArrayFillerOrUnionFieldInit;
3985
3986 public:
3987   InitListExpr(const ASTContext &C, SourceLocation lbraceloc,
3988                ArrayRef<Expr*> initExprs, SourceLocation rbraceloc);
3989
3990   /// Build an empty initializer list.
3991   explicit InitListExpr(EmptyShell Empty)
3992     : Expr(InitListExprClass, Empty), AltForm(nullptr, true) { }
3993
3994   unsigned getNumInits() const { return InitExprs.size(); }
3995
3996   /// Retrieve the set of initializers.
3997   Expr **getInits() { return reinterpret_cast<Expr **>(InitExprs.data()); }
3998
3999   /// Retrieve the set of initializers.
4000   Expr * const *getInits() const {
4001     return reinterpret_cast<Expr * const *>(InitExprs.data());
4002   }
4003
4004   ArrayRef<Expr *> inits() {
4005     return llvm::makeArrayRef(getInits(), getNumInits());
4006   }
4007
4008   ArrayRef<Expr *> inits() const {
4009     return llvm::makeArrayRef(getInits(), getNumInits());
4010   }
4011
4012   const Expr *getInit(unsigned Init) const {
4013     assert(Init < getNumInits() && "Initializer access out of range!");
4014     return cast_or_null<Expr>(InitExprs[Init]);
4015   }
4016
4017   Expr *getInit(unsigned Init) {
4018     assert(Init < getNumInits() && "Initializer access out of range!");
4019     return cast_or_null<Expr>(InitExprs[Init]);
4020   }
4021
4022   void setInit(unsigned Init, Expr *expr) {
4023     assert(Init < getNumInits() && "Initializer access out of range!");
4024     InitExprs[Init] = expr;
4025
4026     if (expr) {
4027       ExprBits.TypeDependent |= expr->isTypeDependent();
4028       ExprBits.ValueDependent |= expr->isValueDependent();
4029       ExprBits.InstantiationDependent |= expr->isInstantiationDependent();
4030       ExprBits.ContainsUnexpandedParameterPack |=
4031           expr->containsUnexpandedParameterPack();
4032     }
4033   }
4034
4035   /// Reserve space for some number of initializers.
4036   void reserveInits(const ASTContext &C, unsigned NumInits);
4037
4038   /// Specify the number of initializers
4039   ///
4040   /// If there are more than @p NumInits initializers, the remaining
4041   /// initializers will be destroyed. If there are fewer than @p
4042   /// NumInits initializers, NULL expressions will be added for the
4043   /// unknown initializers.
4044   void resizeInits(const ASTContext &Context, unsigned NumInits);
4045
4046   /// Updates the initializer at index @p Init with the new
4047   /// expression @p expr, and returns the old expression at that
4048   /// location.
4049   ///
4050   /// When @p Init is out of range for this initializer list, the
4051   /// initializer list will be extended with NULL expressions to
4052   /// accommodate the new entry.
4053   Expr *updateInit(const ASTContext &C, unsigned Init, Expr *expr);
4054
4055   /// If this initializer list initializes an array with more elements
4056   /// than there are initializers in the list, specifies an expression to be
4057   /// used for value initialization of the rest of the elements.
4058   Expr *getArrayFiller() {
4059     return ArrayFillerOrUnionFieldInit.dyn_cast<Expr *>();
4060   }
4061   const Expr *getArrayFiller() const {
4062     return const_cast<InitListExpr *>(this)->getArrayFiller();
4063   }
4064   void setArrayFiller(Expr *filler);
4065
4066   /// Return true if this is an array initializer and its array "filler"
4067   /// has been set.
4068   bool hasArrayFiller() const { return getArrayFiller(); }
4069
4070   /// If this initializes a union, specifies which field in the
4071   /// union to initialize.
4072   ///
4073   /// Typically, this field is the first named field within the
4074   /// union. However, a designated initializer can specify the
4075   /// initialization of a different field within the union.
4076   FieldDecl *getInitializedFieldInUnion() {
4077     return ArrayFillerOrUnionFieldInit.dyn_cast<FieldDecl *>();
4078   }
4079   const FieldDecl *getInitializedFieldInUnion() const {
4080     return const_cast<InitListExpr *>(this)->getInitializedFieldInUnion();
4081   }
4082   void setInitializedFieldInUnion(FieldDecl *FD) {
4083     assert((FD == nullptr
4084             || getInitializedFieldInUnion() == nullptr
4085             || getInitializedFieldInUnion() == FD)
4086            && "Only one field of a union may be initialized at a time!");
4087     ArrayFillerOrUnionFieldInit = FD;
4088   }
4089
4090   // Explicit InitListExpr's originate from source code (and have valid source
4091   // locations). Implicit InitListExpr's are created by the semantic analyzer.
4092   bool isExplicit() const {
4093     return LBraceLoc.isValid() && RBraceLoc.isValid();
4094   }
4095
4096   // Is this an initializer for an array of characters, initialized by a string
4097   // literal or an @encode?
4098   bool isStringLiteralInit() const;
4099
4100   /// Is this a transparent initializer list (that is, an InitListExpr that is
4101   /// purely syntactic, and whose semantics are that of the sole contained
4102   /// initializer)?
4103   bool isTransparent() const;
4104
4105   /// Is this the zero initializer {0} in a language which considers it
4106   /// idiomatic?
4107   bool isIdiomaticZeroInitializer(const LangOptions &LangOpts) const;
4108
4109   SourceLocation getLBraceLoc() const { return LBraceLoc; }
4110   void setLBraceLoc(SourceLocation Loc) { LBraceLoc = Loc; }
4111   SourceLocation getRBraceLoc() const { return RBraceLoc; }
4112   void setRBraceLoc(SourceLocation Loc) { RBraceLoc = Loc; }
4113
4114   bool isSemanticForm() const { return AltForm.getInt(); }
4115   InitListExpr *getSemanticForm() const {
4116     return isSemanticForm() ? nullptr : AltForm.getPointer();
4117   }
4118   bool isSyntacticForm() const {
4119     return !AltForm.getInt() || !AltForm.getPointer();
4120   }
4121   InitListExpr *getSyntacticForm() const {
4122     return isSemanticForm() ? AltForm.getPointer() : nullptr;
4123   }
4124
4125   void setSyntacticForm(InitListExpr *Init) {
4126     AltForm.setPointer(Init);
4127     AltForm.setInt(true);
4128     Init->AltForm.setPointer(this);
4129     Init->AltForm.setInt(false);
4130   }
4131
4132   bool hadArrayRangeDesignator() const {
4133     return InitListExprBits.HadArrayRangeDesignator != 0;
4134   }
4135   void sawArrayRangeDesignator(bool ARD = true) {
4136     InitListExprBits.HadArrayRangeDesignator = ARD;
4137   }
4138
4139   SourceLocation getLocStart() const LLVM_READONLY;
4140   SourceLocation getLocEnd() const LLVM_READONLY;
4141
4142   static bool classof(const Stmt *T) {
4143     return T->getStmtClass() == InitListExprClass;
4144   }
4145
4146   // Iterators
4147   child_range children() {
4148     const_child_range CCR = const_cast<const InitListExpr *>(this)->children();
4149     return child_range(cast_away_const(CCR.begin()),
4150                        cast_away_const(CCR.end()));
4151   }
4152
4153   const_child_range children() const {
4154     // FIXME: This does not include the array filler expression.
4155     if (InitExprs.empty())
4156       return const_child_range(const_child_iterator(), const_child_iterator());
4157     return const_child_range(&InitExprs[0], &InitExprs[0] + InitExprs.size());
4158   }
4159
4160   typedef InitExprsTy::iterator iterator;
4161   typedef InitExprsTy::const_iterator const_iterator;
4162   typedef InitExprsTy::reverse_iterator reverse_iterator;
4163   typedef InitExprsTy::const_reverse_iterator const_reverse_iterator;
4164
4165   iterator begin() { return InitExprs.begin(); }
4166   const_iterator begin() const { return InitExprs.begin(); }
4167   iterator end() { return InitExprs.end(); }
4168   const_iterator end() const { return InitExprs.end(); }
4169   reverse_iterator rbegin() { return InitExprs.rbegin(); }
4170   const_reverse_iterator rbegin() const { return InitExprs.rbegin(); }
4171   reverse_iterator rend() { return InitExprs.rend(); }
4172   const_reverse_iterator rend() const { return InitExprs.rend(); }
4173
4174   friend class ASTStmtReader;
4175   friend class ASTStmtWriter;
4176 };
4177
4178 /// Represents a C99 designated initializer expression.
4179 ///
4180 /// A designated initializer expression (C99 6.7.8) contains one or
4181 /// more designators (which can be field designators, array
4182 /// designators, or GNU array-range designators) followed by an
4183 /// expression that initializes the field or element(s) that the
4184 /// designators refer to. For example, given:
4185 ///
4186 /// @code
4187 /// struct point {
4188 ///   double x;
4189 ///   double y;
4190 /// };
4191 /// struct point ptarray[10] = { [2].y = 1.0, [2].x = 2.0, [0].x = 1.0 };
4192 /// @endcode
4193 ///
4194 /// The InitListExpr contains three DesignatedInitExprs, the first of
4195 /// which covers @c [2].y=1.0. This DesignatedInitExpr will have two
4196 /// designators, one array designator for @c [2] followed by one field
4197 /// designator for @c .y. The initialization expression will be 1.0.
4198 class DesignatedInitExpr final
4199     : public Expr,
4200       private llvm::TrailingObjects<DesignatedInitExpr, Stmt *> {
4201 public:
4202   /// Forward declaration of the Designator class.
4203   class Designator;
4204
4205 private:
4206   /// The location of the '=' or ':' prior to the actual initializer
4207   /// expression.
4208   SourceLocation EqualOrColonLoc;
4209
4210   /// Whether this designated initializer used the GNU deprecated
4211   /// syntax rather than the C99 '=' syntax.
4212   unsigned GNUSyntax : 1;
4213
4214   /// The number of designators in this initializer expression.
4215   unsigned NumDesignators : 15;
4216
4217   /// The number of subexpressions of this initializer expression,
4218   /// which contains both the initializer and any additional
4219   /// expressions used by array and array-range designators.
4220   unsigned NumSubExprs : 16;
4221
4222   /// The designators in this designated initialization
4223   /// expression.
4224   Designator *Designators;
4225
4226   DesignatedInitExpr(const ASTContext &C, QualType Ty,
4227                      llvm::ArrayRef<Designator> Designators,
4228                      SourceLocation EqualOrColonLoc, bool GNUSyntax,
4229                      ArrayRef<Expr *> IndexExprs, Expr *Init);
4230
4231   explicit DesignatedInitExpr(unsigned NumSubExprs)
4232     : Expr(DesignatedInitExprClass, EmptyShell()),
4233       NumDesignators(0), NumSubExprs(NumSubExprs), Designators(nullptr) { }
4234
4235 public:
4236   /// A field designator, e.g., ".x".
4237   struct FieldDesignator {
4238     /// Refers to the field that is being initialized. The low bit
4239     /// of this field determines whether this is actually a pointer
4240     /// to an IdentifierInfo (if 1) or a FieldDecl (if 0). When
4241     /// initially constructed, a field designator will store an
4242     /// IdentifierInfo*. After semantic analysis has resolved that
4243     /// name, the field designator will instead store a FieldDecl*.
4244     uintptr_t NameOrField;
4245
4246     /// The location of the '.' in the designated initializer.
4247     unsigned DotLoc;
4248
4249     /// The location of the field name in the designated initializer.
4250     unsigned FieldLoc;
4251   };
4252
4253   /// An array or GNU array-range designator, e.g., "[9]" or "[10..15]".
4254   struct ArrayOrRangeDesignator {
4255     /// Location of the first index expression within the designated
4256     /// initializer expression's list of subexpressions.
4257     unsigned Index;
4258     /// The location of the '[' starting the array range designator.
4259     unsigned LBracketLoc;
4260     /// The location of the ellipsis separating the start and end
4261     /// indices. Only valid for GNU array-range designators.
4262     unsigned EllipsisLoc;
4263     /// The location of the ']' terminating the array range designator.
4264     unsigned RBracketLoc;
4265   };
4266
4267   /// Represents a single C99 designator.
4268   ///
4269   /// @todo This class is infuriatingly similar to clang::Designator,
4270   /// but minor differences (storing indices vs. storing pointers)
4271   /// keep us from reusing it. Try harder, later, to rectify these
4272   /// differences.
4273   class Designator {
4274     /// The kind of designator this describes.
4275     enum {
4276       FieldDesignator,
4277       ArrayDesignator,
4278       ArrayRangeDesignator
4279     } Kind;
4280
4281     union {
4282       /// A field designator, e.g., ".x".
4283       struct FieldDesignator Field;
4284       /// An array or GNU array-range designator, e.g., "[9]" or "[10..15]".
4285       struct ArrayOrRangeDesignator ArrayOrRange;
4286     };
4287     friend class DesignatedInitExpr;
4288
4289   public:
4290     Designator() {}
4291
4292     /// Initializes a field designator.
4293     Designator(const IdentifierInfo *FieldName, SourceLocation DotLoc,
4294                SourceLocation FieldLoc)
4295       : Kind(FieldDesignator) {
4296       Field.NameOrField = reinterpret_cast<uintptr_t>(FieldName) | 0x01;
4297       Field.DotLoc = DotLoc.getRawEncoding();
4298       Field.FieldLoc = FieldLoc.getRawEncoding();
4299     }
4300
4301     /// Initializes an array designator.
4302     Designator(unsigned Index, SourceLocation LBracketLoc,
4303                SourceLocation RBracketLoc)
4304       : Kind(ArrayDesignator) {
4305       ArrayOrRange.Index = Index;
4306       ArrayOrRange.LBracketLoc = LBracketLoc.getRawEncoding();
4307       ArrayOrRange.EllipsisLoc = SourceLocation().getRawEncoding();
4308       ArrayOrRange.RBracketLoc = RBracketLoc.getRawEncoding();
4309     }
4310
4311     /// Initializes a GNU array-range designator.
4312     Designator(unsigned Index, SourceLocation LBracketLoc,
4313                SourceLocation EllipsisLoc, SourceLocation RBracketLoc)
4314       : Kind(ArrayRangeDesignator) {
4315       ArrayOrRange.Index = Index;
4316       ArrayOrRange.LBracketLoc = LBracketLoc.getRawEncoding();
4317       ArrayOrRange.EllipsisLoc = EllipsisLoc.getRawEncoding();
4318       ArrayOrRange.RBracketLoc = RBracketLoc.getRawEncoding();
4319     }
4320
4321     bool isFieldDesignator() const { return Kind == FieldDesignator; }
4322     bool isArrayDesignator() const { return Kind == ArrayDesignator; }
4323     bool isArrayRangeDesignator() const { return Kind == ArrayRangeDesignator; }
4324
4325     IdentifierInfo *getFieldName() const;
4326
4327     FieldDecl *getField() const {
4328       assert(Kind == FieldDesignator && "Only valid on a field designator");
4329       if (Field.NameOrField & 0x01)
4330         return nullptr;
4331       else
4332         return reinterpret_cast<FieldDecl *>(Field.NameOrField);
4333     }
4334
4335     void setField(FieldDecl *FD) {
4336       assert(Kind == FieldDesignator && "Only valid on a field designator");
4337       Field.NameOrField = reinterpret_cast<uintptr_t>(FD);
4338     }
4339
4340     SourceLocation getDotLoc() const {
4341       assert(Kind == FieldDesignator && "Only valid on a field designator");
4342       return SourceLocation::getFromRawEncoding(Field.DotLoc);
4343     }
4344
4345     SourceLocation getFieldLoc() const {
4346       assert(Kind == FieldDesignator && "Only valid on a field designator");
4347       return SourceLocation::getFromRawEncoding(Field.FieldLoc);
4348     }
4349
4350     SourceLocation getLBracketLoc() const {
4351       assert((Kind == ArrayDesignator || Kind == ArrayRangeDesignator) &&
4352              "Only valid on an array or array-range designator");
4353       return SourceLocation::getFromRawEncoding(ArrayOrRange.LBracketLoc);
4354     }
4355
4356     SourceLocation getRBracketLoc() const {
4357       assert((Kind == ArrayDesignator || Kind == ArrayRangeDesignator) &&
4358              "Only valid on an array or array-range designator");
4359       return SourceLocation::getFromRawEncoding(ArrayOrRange.RBracketLoc);
4360     }
4361
4362     SourceLocation getEllipsisLoc() const {
4363       assert(Kind == ArrayRangeDesignator &&
4364              "Only valid on an array-range designator");
4365       return SourceLocation::getFromRawEncoding(ArrayOrRange.EllipsisLoc);
4366     }
4367
4368     unsigned getFirstExprIndex() const {
4369       assert((Kind == ArrayDesignator || Kind == ArrayRangeDesignator) &&
4370              "Only valid on an array or array-range designator");
4371       return ArrayOrRange.Index;
4372     }
4373
4374     SourceLocation getLocStart() const LLVM_READONLY {
4375       if (Kind == FieldDesignator)
4376         return getDotLoc().isInvalid()? getFieldLoc() : getDotLoc();
4377       else
4378         return getLBracketLoc();
4379     }
4380     SourceLocation getLocEnd() const LLVM_READONLY {
4381       return Kind == FieldDesignator ? getFieldLoc() : getRBracketLoc();
4382     }
4383     SourceRange getSourceRange() const LLVM_READONLY {
4384       return SourceRange(getLocStart(), getLocEnd());
4385     }
4386   };
4387
4388   static DesignatedInitExpr *Create(const ASTContext &C,
4389                                     llvm::ArrayRef<Designator> Designators,
4390                                     ArrayRef<Expr*> IndexExprs,
4391                                     SourceLocation EqualOrColonLoc,
4392                                     bool GNUSyntax, Expr *Init);
4393
4394   static DesignatedInitExpr *CreateEmpty(const ASTContext &C,
4395                                          unsigned NumIndexExprs);
4396
4397   /// Returns the number of designators in this initializer.
4398   unsigned size() const { return NumDesignators; }
4399
4400   // Iterator access to the designators.
4401   llvm::MutableArrayRef<Designator> designators() {
4402     return {Designators, NumDesignators};
4403   }
4404
4405   llvm::ArrayRef<Designator> designators() const {
4406     return {Designators, NumDesignators};
4407   }
4408
4409   Designator *getDesignator(unsigned Idx) { return &designators()[Idx]; }
4410   const Designator *getDesignator(unsigned Idx) const {
4411     return &designators()[Idx];
4412   }
4413
4414   void setDesignators(const ASTContext &C, const Designator *Desigs,
4415                       unsigned NumDesigs);
4416
4417   Expr *getArrayIndex(const Designator &D) const;
4418   Expr *getArrayRangeStart(const Designator &D) const;
4419   Expr *getArrayRangeEnd(const Designator &D) const;
4420
4421   /// Retrieve the location of the '=' that precedes the
4422   /// initializer value itself, if present.
4423   SourceLocation getEqualOrColonLoc() const { return EqualOrColonLoc; }
4424   void setEqualOrColonLoc(SourceLocation L) { EqualOrColonLoc = L; }
4425
4426   /// Determines whether this designated initializer used the
4427   /// deprecated GNU syntax for designated initializers.
4428   bool usesGNUSyntax() const { return GNUSyntax; }
4429   void setGNUSyntax(bool GNU) { GNUSyntax = GNU; }
4430
4431   /// Retrieve the initializer value.
4432   Expr *getInit() const {
4433     return cast<Expr>(*const_cast<DesignatedInitExpr*>(this)->child_begin());
4434   }
4435
4436   void setInit(Expr *init) {
4437     *child_begin() = init;
4438   }
4439
4440   /// Retrieve the total number of subexpressions in this
4441   /// designated initializer expression, including the actual
4442   /// initialized value and any expressions that occur within array
4443   /// and array-range designators.
4444   unsigned getNumSubExprs() const { return NumSubExprs; }
4445
4446   Expr *getSubExpr(unsigned Idx) const {
4447     assert(Idx < NumSubExprs && "Subscript out of range");
4448     return cast<Expr>(getTrailingObjects<Stmt *>()[Idx]);
4449   }
4450
4451   void setSubExpr(unsigned Idx, Expr *E) {
4452     assert(Idx < NumSubExprs && "Subscript out of range");
4453     getTrailingObjects<Stmt *>()[Idx] = E;
4454   }
4455
4456   /// Replaces the designator at index @p Idx with the series
4457   /// of designators in [First, Last).
4458   void ExpandDesignator(const ASTContext &C, unsigned Idx,
4459                         const Designator *First, const Designator *Last);
4460
4461   SourceRange getDesignatorsSourceRange() const;
4462
4463   SourceLocation getLocStart() const LLVM_READONLY;
4464   SourceLocation getLocEnd() const LLVM_READONLY;
4465
4466   static bool classof(const Stmt *T) {
4467     return T->getStmtClass() == DesignatedInitExprClass;
4468   }
4469
4470   // Iterators
4471   child_range children() {
4472     Stmt **begin = getTrailingObjects<Stmt *>();
4473     return child_range(begin, begin + NumSubExprs);
4474   }
4475   const_child_range children() const {
4476     Stmt * const *begin = getTrailingObjects<Stmt *>();
4477     return const_child_range(begin, begin + NumSubExprs);
4478   }
4479
4480   friend TrailingObjects;
4481 };
4482
4483 /// Represents a place-holder for an object not to be initialized by
4484 /// anything.
4485 ///
4486 /// This only makes sense when it appears as part of an updater of a
4487 /// DesignatedInitUpdateExpr (see below). The base expression of a DIUE
4488 /// initializes a big object, and the NoInitExpr's mark the spots within the
4489 /// big object not to be overwritten by the updater.
4490 ///
4491 /// \see DesignatedInitUpdateExpr
4492 class NoInitExpr : public Expr {
4493 public:
4494   explicit NoInitExpr(QualType ty)
4495     : Expr(NoInitExprClass, ty, VK_RValue, OK_Ordinary,
4496            false, false, ty->isInstantiationDependentType(), false) { }
4497
4498   explicit NoInitExpr(EmptyShell Empty)
4499     : Expr(NoInitExprClass, Empty) { }
4500
4501   static bool classof(const Stmt *T) {
4502     return T->getStmtClass() == NoInitExprClass;
4503   }
4504
4505   SourceLocation getLocStart() const LLVM_READONLY { return SourceLocation(); }
4506   SourceLocation getLocEnd() const LLVM_READONLY { return SourceLocation(); }
4507
4508   // Iterators
4509   child_range children() {
4510     return child_range(child_iterator(), child_iterator());
4511   }
4512   const_child_range children() const {
4513     return const_child_range(const_child_iterator(), const_child_iterator());
4514   }
4515 };
4516
4517 // In cases like:
4518 //   struct Q { int a, b, c; };
4519 //   Q *getQ();
4520 //   void foo() {
4521 //     struct A { Q q; } a = { *getQ(), .q.b = 3 };
4522 //   }
4523 //
4524 // We will have an InitListExpr for a, with type A, and then a
4525 // DesignatedInitUpdateExpr for "a.q" with type Q. The "base" for this DIUE
4526 // is the call expression *getQ(); the "updater" for the DIUE is ".q.b = 3"
4527 //
4528 class DesignatedInitUpdateExpr : public Expr {
4529   // BaseAndUpdaterExprs[0] is the base expression;
4530   // BaseAndUpdaterExprs[1] is an InitListExpr overwriting part of the base.
4531   Stmt *BaseAndUpdaterExprs[2];
4532
4533 public:
4534   DesignatedInitUpdateExpr(const ASTContext &C, SourceLocation lBraceLoc,
4535                            Expr *baseExprs, SourceLocation rBraceLoc);
4536
4537   explicit DesignatedInitUpdateExpr(EmptyShell Empty)
4538     : Expr(DesignatedInitUpdateExprClass, Empty) { }
4539
4540   SourceLocation getLocStart() const LLVM_READONLY;
4541   SourceLocation getLocEnd() const LLVM_READONLY;
4542
4543   static bool classof(const Stmt *T) {
4544     return T->getStmtClass() == DesignatedInitUpdateExprClass;
4545   }
4546
4547   Expr *getBase() const { return cast<Expr>(BaseAndUpdaterExprs[0]); }
4548   void setBase(Expr *Base) { BaseAndUpdaterExprs[0] = Base; }
4549
4550   InitListExpr *getUpdater() const {
4551     return cast<InitListExpr>(BaseAndUpdaterExprs[1]);
4552   }
4553   void setUpdater(Expr *Updater) { BaseAndUpdaterExprs[1] = Updater; }
4554
4555   // Iterators
4556   // children = the base and the updater
4557   child_range children() {
4558     return child_range(&BaseAndUpdaterExprs[0], &BaseAndUpdaterExprs[0] + 2);
4559   }
4560   const_child_range children() const {
4561     return const_child_range(&BaseAndUpdaterExprs[0],
4562                              &BaseAndUpdaterExprs[0] + 2);
4563   }
4564 };
4565
4566 /// Represents a loop initializing the elements of an array.
4567 ///
4568 /// The need to initialize the elements of an array occurs in a number of
4569 /// contexts:
4570 ///
4571 ///  * in the implicit copy/move constructor for a class with an array member
4572 ///  * when a lambda-expression captures an array by value
4573 ///  * when a decomposition declaration decomposes an array
4574 ///
4575 /// There are two subexpressions: a common expression (the source array)
4576 /// that is evaluated once up-front, and a per-element initializer that
4577 /// runs once for each array element.
4578 ///
4579 /// Within the per-element initializer, the common expression may be referenced
4580 /// via an OpaqueValueExpr, and the current index may be obtained via an
4581 /// ArrayInitIndexExpr.
4582 class ArrayInitLoopExpr : public Expr {
4583   Stmt *SubExprs[2];
4584
4585   explicit ArrayInitLoopExpr(EmptyShell Empty)
4586       : Expr(ArrayInitLoopExprClass, Empty), SubExprs{} {}
4587
4588 public:
4589   explicit ArrayInitLoopExpr(QualType T, Expr *CommonInit, Expr *ElementInit)
4590       : Expr(ArrayInitLoopExprClass, T, VK_RValue, OK_Ordinary, false,
4591              CommonInit->isValueDependent() || ElementInit->isValueDependent(),
4592              T->isInstantiationDependentType(),
4593              CommonInit->containsUnexpandedParameterPack() ||
4594                  ElementInit->containsUnexpandedParameterPack()),
4595         SubExprs{CommonInit, ElementInit} {}
4596
4597   /// Get the common subexpression shared by all initializations (the source
4598   /// array).
4599   OpaqueValueExpr *getCommonExpr() const {
4600     return cast<OpaqueValueExpr>(SubExprs[0]);
4601   }
4602
4603   /// Get the initializer to use for each array element.
4604   Expr *getSubExpr() const { return cast<Expr>(SubExprs[1]); }
4605
4606   llvm::APInt getArraySize() const {
4607     return cast<ConstantArrayType>(getType()->castAsArrayTypeUnsafe())
4608         ->getSize();
4609   }
4610
4611   static bool classof(const Stmt *S) {
4612     return S->getStmtClass() == ArrayInitLoopExprClass;
4613   }
4614
4615   SourceLocation getLocStart() const LLVM_READONLY {
4616     return getCommonExpr()->getLocStart();
4617   }
4618   SourceLocation getLocEnd() const LLVM_READONLY {
4619     return getCommonExpr()->getLocEnd();
4620   }
4621
4622   child_range children() {
4623     return child_range(SubExprs, SubExprs + 2);
4624   }
4625   const_child_range children() const {
4626     return const_child_range(SubExprs, SubExprs + 2);
4627   }
4628
4629   friend class ASTReader;
4630   friend class ASTStmtReader;
4631   friend class ASTStmtWriter;
4632 };
4633
4634 /// Represents the index of the current element of an array being
4635 /// initialized by an ArrayInitLoopExpr. This can only appear within the
4636 /// subexpression of an ArrayInitLoopExpr.
4637 class ArrayInitIndexExpr : public Expr {
4638   explicit ArrayInitIndexExpr(EmptyShell Empty)
4639       : Expr(ArrayInitIndexExprClass, Empty) {}
4640
4641 public:
4642   explicit ArrayInitIndexExpr(QualType T)
4643       : Expr(ArrayInitIndexExprClass, T, VK_RValue, OK_Ordinary,
4644              false, false, false, false) {}
4645
4646   static bool classof(const Stmt *S) {
4647     return S->getStmtClass() == ArrayInitIndexExprClass;
4648   }
4649
4650   SourceLocation getLocStart() const LLVM_READONLY { return SourceLocation(); }
4651   SourceLocation getLocEnd() const LLVM_READONLY { return SourceLocation(); }
4652
4653   child_range children() {
4654     return child_range(child_iterator(), child_iterator());
4655   }
4656   const_child_range children() const {
4657     return const_child_range(const_child_iterator(), const_child_iterator());
4658   }
4659
4660   friend class ASTReader;
4661   friend class ASTStmtReader;
4662 };
4663
4664 /// Represents an implicitly-generated value initialization of
4665 /// an object of a given type.
4666 ///
4667 /// Implicit value initializations occur within semantic initializer
4668 /// list expressions (InitListExpr) as placeholders for subobject
4669 /// initializations not explicitly specified by the user.
4670 ///
4671 /// \see InitListExpr
4672 class ImplicitValueInitExpr : public Expr {
4673 public:
4674   explicit ImplicitValueInitExpr(QualType ty)
4675     : Expr(ImplicitValueInitExprClass, ty, VK_RValue, OK_Ordinary,
4676            false, false, ty->isInstantiationDependentType(), false) { }
4677
4678   /// Construct an empty implicit value initialization.
4679   explicit ImplicitValueInitExpr(EmptyShell Empty)
4680     : Expr(ImplicitValueInitExprClass, Empty) { }
4681
4682   static bool classof(const Stmt *T) {
4683     return T->getStmtClass() == ImplicitValueInitExprClass;
4684   }
4685
4686   SourceLocation getLocStart() const LLVM_READONLY { return SourceLocation(); }
4687   SourceLocation getLocEnd() const LLVM_READONLY { return SourceLocation(); }
4688
4689   // Iterators
4690   child_range children() {
4691     return child_range(child_iterator(), child_iterator());
4692   }
4693   const_child_range children() const {
4694     return const_child_range(const_child_iterator(), const_child_iterator());
4695   }
4696 };
4697
4698 class ParenListExpr : public Expr {
4699   Stmt **Exprs;
4700   unsigned NumExprs;
4701   SourceLocation LParenLoc, RParenLoc;
4702
4703 public:
4704   ParenListExpr(const ASTContext& C, SourceLocation lparenloc,
4705                 ArrayRef<Expr*> exprs, SourceLocation rparenloc);
4706
4707   /// Build an empty paren list.
4708   explicit ParenListExpr(EmptyShell Empty) : Expr(ParenListExprClass, Empty) { }
4709
4710   unsigned getNumExprs() const { return NumExprs; }
4711
4712   const Expr* getExpr(unsigned Init) const {
4713     assert(Init < getNumExprs() && "Initializer access out of range!");
4714     return cast_or_null<Expr>(Exprs[Init]);
4715   }
4716
4717   Expr* getExpr(unsigned Init) {
4718     assert(Init < getNumExprs() && "Initializer access out of range!");
4719     return cast_or_null<Expr>(Exprs[Init]);
4720   }
4721
4722   Expr **getExprs() { return reinterpret_cast<Expr **>(Exprs); }
4723
4724   ArrayRef<Expr *> exprs() {
4725     return llvm::makeArrayRef(getExprs(), getNumExprs());
4726   }
4727
4728   SourceLocation getLParenLoc() const { return LParenLoc; }
4729   SourceLocation getRParenLoc() const { return RParenLoc; }
4730
4731   SourceLocation getLocStart() const LLVM_READONLY { return LParenLoc; }
4732   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
4733
4734   static bool classof(const Stmt *T) {
4735     return T->getStmtClass() == ParenListExprClass;
4736   }
4737
4738   // Iterators
4739   child_range children() {
4740     return child_range(&Exprs[0], &Exprs[0]+NumExprs);
4741   }
4742   const_child_range children() const {
4743     return const_child_range(&Exprs[0], &Exprs[0] + NumExprs);
4744   }
4745
4746   friend class ASTStmtReader;
4747   friend class ASTStmtWriter;
4748 };
4749
4750 /// Represents a C11 generic selection.
4751 ///
4752 /// A generic selection (C11 6.5.1.1) contains an unevaluated controlling
4753 /// expression, followed by one or more generic associations.  Each generic
4754 /// association specifies a type name and an expression, or "default" and an
4755 /// expression (in which case it is known as a default generic association).
4756 /// The type and value of the generic selection are identical to those of its
4757 /// result expression, which is defined as the expression in the generic
4758 /// association with a type name that is compatible with the type of the
4759 /// controlling expression, or the expression in the default generic association
4760 /// if no types are compatible.  For example:
4761 ///
4762 /// @code
4763 /// _Generic(X, double: 1, float: 2, default: 3)
4764 /// @endcode
4765 ///
4766 /// The above expression evaluates to 1 if 1.0 is substituted for X, 2 if 1.0f
4767 /// or 3 if "hello".
4768 ///
4769 /// As an extension, generic selections are allowed in C++, where the following
4770 /// additional semantics apply:
4771 ///
4772 /// Any generic selection whose controlling expression is type-dependent or
4773 /// which names a dependent type in its association list is result-dependent,
4774 /// which means that the choice of result expression is dependent.
4775 /// Result-dependent generic associations are both type- and value-dependent.
4776 class GenericSelectionExpr : public Expr {
4777   enum { CONTROLLING, END_EXPR };
4778   TypeSourceInfo **AssocTypes;
4779   Stmt **SubExprs;
4780   unsigned NumAssocs, ResultIndex;
4781   SourceLocation GenericLoc, DefaultLoc, RParenLoc;
4782
4783 public:
4784   GenericSelectionExpr(const ASTContext &Context,
4785                        SourceLocation GenericLoc, Expr *ControllingExpr,
4786                        ArrayRef<TypeSourceInfo*> AssocTypes,
4787                        ArrayRef<Expr*> AssocExprs,
4788                        SourceLocation DefaultLoc, SourceLocation RParenLoc,
4789                        bool ContainsUnexpandedParameterPack,
4790                        unsigned ResultIndex);
4791
4792   /// This constructor is used in the result-dependent case.
4793   GenericSelectionExpr(const ASTContext &Context,
4794                        SourceLocation GenericLoc, Expr *ControllingExpr,
4795                        ArrayRef<TypeSourceInfo*> AssocTypes,
4796                        ArrayRef<Expr*> AssocExprs,
4797                        SourceLocation DefaultLoc, SourceLocation RParenLoc,
4798                        bool ContainsUnexpandedParameterPack);
4799
4800   explicit GenericSelectionExpr(EmptyShell Empty)
4801     : Expr(GenericSelectionExprClass, Empty) { }
4802
4803   unsigned getNumAssocs() const { return NumAssocs; }
4804
4805   SourceLocation getGenericLoc() const { return GenericLoc; }
4806   SourceLocation getDefaultLoc() const { return DefaultLoc; }
4807   SourceLocation getRParenLoc() const { return RParenLoc; }
4808
4809   const Expr *getAssocExpr(unsigned i) const {
4810     return cast<Expr>(SubExprs[END_EXPR+i]);
4811   }
4812   Expr *getAssocExpr(unsigned i) { return cast<Expr>(SubExprs[END_EXPR+i]); }
4813   ArrayRef<Expr *> getAssocExprs() const {
4814     return NumAssocs
4815                ? llvm::makeArrayRef(
4816                      &reinterpret_cast<Expr **>(SubExprs)[END_EXPR], NumAssocs)
4817                : None;
4818   }
4819   const TypeSourceInfo *getAssocTypeSourceInfo(unsigned i) const {
4820     return AssocTypes[i];
4821   }
4822   TypeSourceInfo *getAssocTypeSourceInfo(unsigned i) { return AssocTypes[i]; }
4823   ArrayRef<TypeSourceInfo *> getAssocTypeSourceInfos() const {
4824     return NumAssocs ? llvm::makeArrayRef(&AssocTypes[0], NumAssocs) : None;
4825   }
4826
4827   QualType getAssocType(unsigned i) const {
4828     if (const TypeSourceInfo *TS = getAssocTypeSourceInfo(i))
4829       return TS->getType();
4830     else
4831       return QualType();
4832   }
4833
4834   const Expr *getControllingExpr() const {
4835     return cast<Expr>(SubExprs[CONTROLLING]);
4836   }
4837   Expr *getControllingExpr() { return cast<Expr>(SubExprs[CONTROLLING]); }
4838
4839   /// Whether this generic selection is result-dependent.
4840   bool isResultDependent() const { return ResultIndex == -1U; }
4841
4842   /// The zero-based index of the result expression's generic association in
4843   /// the generic selection's association list.  Defined only if the
4844   /// generic selection is not result-dependent.
4845   unsigned getResultIndex() const {
4846     assert(!isResultDependent() && "Generic selection is result-dependent");
4847     return ResultIndex;
4848   }
4849
4850   /// The generic selection's result expression.  Defined only if the
4851   /// generic selection is not result-dependent.
4852   const Expr *getResultExpr() const { return getAssocExpr(getResultIndex()); }
4853   Expr *getResultExpr() { return getAssocExpr(getResultIndex()); }
4854
4855   SourceLocation getLocStart() const LLVM_READONLY { return GenericLoc; }
4856   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
4857
4858   static bool classof(const Stmt *T) {
4859     return T->getStmtClass() == GenericSelectionExprClass;
4860   }
4861
4862   child_range children() {
4863     return child_range(SubExprs, SubExprs+END_EXPR+NumAssocs);
4864   }
4865   const_child_range children() const {
4866     return const_child_range(SubExprs, SubExprs + END_EXPR + NumAssocs);
4867   }
4868   friend class ASTStmtReader;
4869 };
4870
4871 //===----------------------------------------------------------------------===//
4872 // Clang Extensions
4873 //===----------------------------------------------------------------------===//
4874
4875 /// ExtVectorElementExpr - This represents access to specific elements of a
4876 /// vector, and may occur on the left hand side or right hand side.  For example
4877 /// the following is legal:  "V.xy = V.zw" if V is a 4 element extended vector.
4878 ///
4879 /// Note that the base may have either vector or pointer to vector type, just
4880 /// like a struct field reference.
4881 ///
4882 class ExtVectorElementExpr : public Expr {
4883   Stmt *Base;
4884   IdentifierInfo *Accessor;
4885   SourceLocation AccessorLoc;
4886 public:
4887   ExtVectorElementExpr(QualType ty, ExprValueKind VK, Expr *base,
4888                        IdentifierInfo &accessor, SourceLocation loc)
4889     : Expr(ExtVectorElementExprClass, ty, VK,
4890            (VK == VK_RValue ? OK_Ordinary : OK_VectorComponent),
4891            base->isTypeDependent(), base->isValueDependent(),
4892            base->isInstantiationDependent(),
4893            base->containsUnexpandedParameterPack()),
4894       Base(base), Accessor(&accessor), AccessorLoc(loc) {}
4895
4896   /// Build an empty vector element expression.
4897   explicit ExtVectorElementExpr(EmptyShell Empty)
4898     : Expr(ExtVectorElementExprClass, Empty) { }
4899
4900   const Expr *getBase() const { return cast<Expr>(Base); }
4901   Expr *getBase() { return cast<Expr>(Base); }
4902   void setBase(Expr *E) { Base = E; }
4903
4904   IdentifierInfo &getAccessor() const { return *Accessor; }
4905   void setAccessor(IdentifierInfo *II) { Accessor = II; }
4906
4907   SourceLocation getAccessorLoc() const { return AccessorLoc; }
4908   void setAccessorLoc(SourceLocation L) { AccessorLoc = L; }
4909
4910   /// getNumElements - Get the number of components being selected.
4911   unsigned getNumElements() const;
4912
4913   /// containsDuplicateElements - Return true if any element access is
4914   /// repeated.
4915   bool containsDuplicateElements() const;
4916
4917   /// getEncodedElementAccess - Encode the elements accessed into an llvm
4918   /// aggregate Constant of ConstantInt(s).
4919   void getEncodedElementAccess(SmallVectorImpl<uint32_t> &Elts) const;
4920
4921   SourceLocation getLocStart() const LLVM_READONLY {
4922     return getBase()->getLocStart();
4923   }
4924   SourceLocation getLocEnd() const LLVM_READONLY { return AccessorLoc; }
4925
4926   /// isArrow - Return true if the base expression is a pointer to vector,
4927   /// return false if the base expression is a vector.
4928   bool isArrow() const;
4929
4930   static bool classof(const Stmt *T) {
4931     return T->getStmtClass() == ExtVectorElementExprClass;
4932   }
4933
4934   // Iterators
4935   child_range children() { return child_range(&Base, &Base+1); }
4936   const_child_range children() const {
4937     return const_child_range(&Base, &Base + 1);
4938   }
4939 };
4940
4941 /// BlockExpr - Adaptor class for mixing a BlockDecl with expressions.
4942 /// ^{ statement-body }   or   ^(int arg1, float arg2){ statement-body }
4943 class BlockExpr : public Expr {
4944 protected:
4945   BlockDecl *TheBlock;
4946 public:
4947   BlockExpr(BlockDecl *BD, QualType ty)
4948     : Expr(BlockExprClass, ty, VK_RValue, OK_Ordinary,
4949            ty->isDependentType(), ty->isDependentType(),
4950            ty->isInstantiationDependentType() || BD->isDependentContext(),
4951            false),
4952       TheBlock(BD) {}
4953
4954   /// Build an empty block expression.
4955   explicit BlockExpr(EmptyShell Empty) : Expr(BlockExprClass, Empty) { }
4956
4957   const BlockDecl *getBlockDecl() const { return TheBlock; }
4958   BlockDecl *getBlockDecl() { return TheBlock; }
4959   void setBlockDecl(BlockDecl *BD) { TheBlock = BD; }
4960
4961   // Convenience functions for probing the underlying BlockDecl.
4962   SourceLocation getCaretLocation() const;
4963   const Stmt *getBody() const;
4964   Stmt *getBody();
4965
4966   SourceLocation getLocStart() const LLVM_READONLY { return getCaretLocation(); }
4967   SourceLocation getLocEnd() const LLVM_READONLY { return getBody()->getLocEnd(); }
4968
4969   /// getFunctionType - Return the underlying function type for this block.
4970   const FunctionProtoType *getFunctionType() const;
4971
4972   static bool classof(const Stmt *T) {
4973     return T->getStmtClass() == BlockExprClass;
4974   }
4975
4976   // Iterators
4977   child_range children() {
4978     return child_range(child_iterator(), child_iterator());
4979   }
4980   const_child_range children() const {
4981     return const_child_range(const_child_iterator(), const_child_iterator());
4982   }
4983 };
4984
4985 /// AsTypeExpr - Clang builtin function __builtin_astype [OpenCL 6.2.4.2]
4986 /// This AST node provides support for reinterpreting a type to another
4987 /// type of the same size.
4988 class AsTypeExpr : public Expr {
4989 private:
4990   Stmt *SrcExpr;
4991   SourceLocation BuiltinLoc, RParenLoc;
4992
4993   friend class ASTReader;
4994   friend class ASTStmtReader;
4995   explicit AsTypeExpr(EmptyShell Empty) : Expr(AsTypeExprClass, Empty) {}
4996
4997 public:
4998   AsTypeExpr(Expr* SrcExpr, QualType DstType,
4999              ExprValueKind VK, ExprObjectKind OK,
5000              SourceLocation BuiltinLoc, SourceLocation RParenLoc)
5001     : Expr(AsTypeExprClass, DstType, VK, OK,
5002            DstType->isDependentType(),
5003            DstType->isDependentType() || SrcExpr->isValueDependent(),
5004            (DstType->isInstantiationDependentType() ||
5005             SrcExpr->isInstantiationDependent()),
5006            (DstType->containsUnexpandedParameterPack() ||
5007             SrcExpr->containsUnexpandedParameterPack())),
5008   SrcExpr(SrcExpr), BuiltinLoc(BuiltinLoc), RParenLoc(RParenLoc) {}
5009
5010   /// getSrcExpr - Return the Expr to be converted.
5011   Expr *getSrcExpr() const { return cast<Expr>(SrcExpr); }
5012
5013   /// getBuiltinLoc - Return the location of the __builtin_astype token.
5014   SourceLocation getBuiltinLoc() const { return BuiltinLoc; }
5015
5016   /// getRParenLoc - Return the location of final right parenthesis.
5017   SourceLocation getRParenLoc() const { return RParenLoc; }
5018
5019   SourceLocation getLocStart() const LLVM_READONLY { return BuiltinLoc; }
5020   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
5021
5022   static bool classof(const Stmt *T) {
5023     return T->getStmtClass() == AsTypeExprClass;
5024   }
5025
5026   // Iterators
5027   child_range children() { return child_range(&SrcExpr, &SrcExpr+1); }
5028   const_child_range children() const {
5029     return const_child_range(&SrcExpr, &SrcExpr + 1);
5030   }
5031 };
5032
5033 /// PseudoObjectExpr - An expression which accesses a pseudo-object
5034 /// l-value.  A pseudo-object is an abstract object, accesses to which
5035 /// are translated to calls.  The pseudo-object expression has a
5036 /// syntactic form, which shows how the expression was actually
5037 /// written in the source code, and a semantic form, which is a series
5038 /// of expressions to be executed in order which detail how the
5039 /// operation is actually evaluated.  Optionally, one of the semantic
5040 /// forms may also provide a result value for the expression.
5041 ///
5042 /// If any of the semantic-form expressions is an OpaqueValueExpr,
5043 /// that OVE is required to have a source expression, and it is bound
5044 /// to the result of that source expression.  Such OVEs may appear
5045 /// only in subsequent semantic-form expressions and as
5046 /// sub-expressions of the syntactic form.
5047 ///
5048 /// PseudoObjectExpr should be used only when an operation can be
5049 /// usefully described in terms of fairly simple rewrite rules on
5050 /// objects and functions that are meant to be used by end-developers.
5051 /// For example, under the Itanium ABI, dynamic casts are implemented
5052 /// as a call to a runtime function called __dynamic_cast; using this
5053 /// class to describe that would be inappropriate because that call is
5054 /// not really part of the user-visible semantics, and instead the
5055 /// cast is properly reflected in the AST and IR-generation has been
5056 /// taught to generate the call as necessary.  In contrast, an
5057 /// Objective-C property access is semantically defined to be
5058 /// equivalent to a particular message send, and this is very much
5059 /// part of the user model.  The name of this class encourages this
5060 /// modelling design.
5061 class PseudoObjectExpr final
5062     : public Expr,
5063       private llvm::TrailingObjects<PseudoObjectExpr, Expr *> {
5064   // PseudoObjectExprBits.NumSubExprs - The number of sub-expressions.
5065   // Always at least two, because the first sub-expression is the
5066   // syntactic form.
5067
5068   // PseudoObjectExprBits.ResultIndex - The index of the
5069   // sub-expression holding the result.  0 means the result is void,
5070   // which is unambiguous because it's the index of the syntactic
5071   // form.  Note that this is therefore 1 higher than the value passed
5072   // in to Create, which is an index within the semantic forms.
5073   // Note also that ASTStmtWriter assumes this encoding.
5074
5075   Expr **getSubExprsBuffer() { return getTrailingObjects<Expr *>(); }
5076   const Expr * const *getSubExprsBuffer() const {
5077     return getTrailingObjects<Expr *>();
5078   }
5079
5080   PseudoObjectExpr(QualType type, ExprValueKind VK,
5081                    Expr *syntactic, ArrayRef<Expr*> semantic,
5082                    unsigned resultIndex);
5083
5084   PseudoObjectExpr(EmptyShell shell, unsigned numSemanticExprs);
5085
5086   unsigned getNumSubExprs() const {
5087     return PseudoObjectExprBits.NumSubExprs;
5088   }
5089
5090 public:
5091   /// NoResult - A value for the result index indicating that there is
5092   /// no semantic result.
5093   enum : unsigned { NoResult = ~0U };
5094
5095   static PseudoObjectExpr *Create(const ASTContext &Context, Expr *syntactic,
5096                                   ArrayRef<Expr*> semantic,
5097                                   unsigned resultIndex);
5098
5099   static PseudoObjectExpr *Create(const ASTContext &Context, EmptyShell shell,
5100                                   unsigned numSemanticExprs);
5101
5102   /// Return the syntactic form of this expression, i.e. the
5103   /// expression it actually looks like.  Likely to be expressed in
5104   /// terms of OpaqueValueExprs bound in the semantic form.
5105   Expr *getSyntacticForm() { return getSubExprsBuffer()[0]; }
5106   const Expr *getSyntacticForm() const { return getSubExprsBuffer()[0]; }
5107
5108   /// Return the index of the result-bearing expression into the semantics
5109   /// expressions, or PseudoObjectExpr::NoResult if there is none.
5110   unsigned getResultExprIndex() const {
5111     if (PseudoObjectExprBits.ResultIndex == 0) return NoResult;
5112     return PseudoObjectExprBits.ResultIndex - 1;
5113   }
5114
5115   /// Return the result-bearing expression, or null if there is none.
5116   Expr *getResultExpr() {
5117     if (PseudoObjectExprBits.ResultIndex == 0)
5118       return nullptr;
5119     return getSubExprsBuffer()[PseudoObjectExprBits.ResultIndex];
5120   }
5121   const Expr *getResultExpr() const {
5122     return const_cast<PseudoObjectExpr*>(this)->getResultExpr();
5123   }
5124
5125   unsigned getNumSemanticExprs() const { return getNumSubExprs() - 1; }
5126
5127   typedef Expr * const *semantics_iterator;
5128   typedef const Expr * const *const_semantics_iterator;
5129   semantics_iterator semantics_begin() {
5130     return getSubExprsBuffer() + 1;
5131   }
5132   const_semantics_iterator semantics_begin() const {
5133     return getSubExprsBuffer() + 1;
5134   }
5135   semantics_iterator semantics_end() {
5136     return getSubExprsBuffer() + getNumSubExprs();
5137   }
5138   const_semantics_iterator semantics_end() const {
5139     return getSubExprsBuffer() + getNumSubExprs();
5140   }
5141
5142   llvm::iterator_range<semantics_iterator> semantics() {
5143     return llvm::make_range(semantics_begin(), semantics_end());
5144   }
5145   llvm::iterator_range<const_semantics_iterator> semantics() const {
5146     return llvm::make_range(semantics_begin(), semantics_end());
5147   }
5148
5149   Expr *getSemanticExpr(unsigned index) {
5150     assert(index + 1 < getNumSubExprs());
5151     return getSubExprsBuffer()[index + 1];
5152   }
5153   const Expr *getSemanticExpr(unsigned index) const {
5154     return const_cast<PseudoObjectExpr*>(this)->getSemanticExpr(index);
5155   }
5156
5157   SourceLocation getExprLoc() const LLVM_READONLY {
5158     return getSyntacticForm()->getExprLoc();
5159   }
5160
5161   SourceLocation getLocStart() const LLVM_READONLY {
5162     return getSyntacticForm()->getLocStart();
5163   }
5164   SourceLocation getLocEnd() const LLVM_READONLY {
5165     return getSyntacticForm()->getLocEnd();
5166   }
5167
5168   child_range children() {
5169     const_child_range CCR =
5170         const_cast<const PseudoObjectExpr *>(this)->children();
5171     return child_range(cast_away_const(CCR.begin()),
5172                        cast_away_const(CCR.end()));
5173   }
5174   const_child_range children() const {
5175     Stmt *const *cs = const_cast<Stmt *const *>(
5176         reinterpret_cast<const Stmt *const *>(getSubExprsBuffer()));
5177     return const_child_range(cs, cs + getNumSubExprs());
5178   }
5179
5180   static bool classof(const Stmt *T) {
5181     return T->getStmtClass() == PseudoObjectExprClass;
5182   }
5183
5184   friend TrailingObjects;
5185   friend class ASTStmtReader;
5186 };
5187
5188 /// AtomicExpr - Variadic atomic builtins: __atomic_exchange, __atomic_fetch_*,
5189 /// __atomic_load, __atomic_store, and __atomic_compare_exchange_*, for the
5190 /// similarly-named C++11 instructions, and __c11 variants for <stdatomic.h>,
5191 /// and corresponding __opencl_atomic_* for OpenCL 2.0.
5192 /// All of these instructions take one primary pointer, at least one memory
5193 /// order. The instructions for which getScopeModel returns non-null value
5194 /// take one synch scope.
5195 class AtomicExpr : public Expr {
5196 public:
5197   enum AtomicOp {
5198 #define BUILTIN(ID, TYPE, ATTRS)
5199 #define ATOMIC_BUILTIN(ID, TYPE, ATTRS) AO ## ID,
5200 #include "clang/Basic/Builtins.def"
5201     // Avoid trailing comma
5202     BI_First = 0
5203   };
5204
5205 private:
5206   /// Location of sub-expressions.
5207   /// The location of Scope sub-expression is NumSubExprs - 1, which is
5208   /// not fixed, therefore is not defined in enum.
5209   enum { PTR, ORDER, VAL1, ORDER_FAIL, VAL2, WEAK, END_EXPR };
5210   Stmt *SubExprs[END_EXPR + 1];
5211   unsigned NumSubExprs;
5212   SourceLocation BuiltinLoc, RParenLoc;
5213   AtomicOp Op;
5214
5215   friend class ASTStmtReader;
5216 public:
5217   AtomicExpr(SourceLocation BLoc, ArrayRef<Expr*> args, QualType t,
5218              AtomicOp op, SourceLocation RP);
5219
5220   /// Determine the number of arguments the specified atomic builtin
5221   /// should have.
5222   static unsigned getNumSubExprs(AtomicOp Op);
5223
5224   /// Build an empty AtomicExpr.
5225   explicit AtomicExpr(EmptyShell Empty) : Expr(AtomicExprClass, Empty) { }
5226
5227   Expr *getPtr() const {
5228     return cast<Expr>(SubExprs[PTR]);
5229   }
5230   Expr *getOrder() const {
5231     return cast<Expr>(SubExprs[ORDER]);
5232   }
5233   Expr *getScope() const {
5234     assert(getScopeModel() && "No scope");
5235     return cast<Expr>(SubExprs[NumSubExprs - 1]);
5236   }
5237   Expr *getVal1() const {
5238     if (Op == AO__c11_atomic_init || Op == AO__opencl_atomic_init)
5239       return cast<Expr>(SubExprs[ORDER]);
5240     assert(NumSubExprs > VAL1);
5241     return cast<Expr>(SubExprs[VAL1]);
5242   }
5243   Expr *getOrderFail() const {
5244     assert(NumSubExprs > ORDER_FAIL);
5245     return cast<Expr>(SubExprs[ORDER_FAIL]);
5246   }
5247   Expr *getVal2() const {
5248     if (Op == AO__atomic_exchange)
5249       return cast<Expr>(SubExprs[ORDER_FAIL]);
5250     assert(NumSubExprs > VAL2);
5251     return cast<Expr>(SubExprs[VAL2]);
5252   }
5253   Expr *getWeak() const {
5254     assert(NumSubExprs > WEAK);
5255     return cast<Expr>(SubExprs[WEAK]);
5256   }
5257   QualType getValueType() const;
5258
5259   AtomicOp getOp() const { return Op; }
5260   unsigned getNumSubExprs() const { return NumSubExprs; }
5261
5262   Expr **getSubExprs() { return reinterpret_cast<Expr **>(SubExprs); }
5263   const Expr * const *getSubExprs() const {
5264     return reinterpret_cast<Expr * const *>(SubExprs);
5265   }
5266
5267   bool isVolatile() const {
5268     return getPtr()->getType()->getPointeeType().isVolatileQualified();
5269   }
5270
5271   bool isCmpXChg() const {
5272     return getOp() == AO__c11_atomic_compare_exchange_strong ||
5273            getOp() == AO__c11_atomic_compare_exchange_weak ||
5274            getOp() == AO__opencl_atomic_compare_exchange_strong ||
5275            getOp() == AO__opencl_atomic_compare_exchange_weak ||
5276            getOp() == AO__atomic_compare_exchange ||
5277            getOp() == AO__atomic_compare_exchange_n;
5278   }
5279
5280   bool isOpenCL() const {
5281     return getOp() >= AO__opencl_atomic_init &&
5282            getOp() <= AO__opencl_atomic_fetch_max;
5283   }
5284
5285   SourceLocation getBuiltinLoc() const { return BuiltinLoc; }
5286   SourceLocation getRParenLoc() const { return RParenLoc; }
5287
5288   SourceLocation getLocStart() const LLVM_READONLY { return BuiltinLoc; }
5289   SourceLocation getLocEnd() const LLVM_READONLY { return RParenLoc; }
5290
5291   static bool classof(const Stmt *T) {
5292     return T->getStmtClass() == AtomicExprClass;
5293   }
5294
5295   // Iterators
5296   child_range children() {
5297     return child_range(SubExprs, SubExprs+NumSubExprs);
5298   }
5299   const_child_range children() const {
5300     return const_child_range(SubExprs, SubExprs + NumSubExprs);
5301   }
5302
5303   /// Get atomic scope model for the atomic op code.
5304   /// \return empty atomic scope model if the atomic op code does not have
5305   ///   scope operand.
5306   static std::unique_ptr<AtomicScopeModel> getScopeModel(AtomicOp Op) {
5307     auto Kind =
5308         (Op >= AO__opencl_atomic_load && Op <= AO__opencl_atomic_fetch_max)
5309             ? AtomicScopeModelKind::OpenCL
5310             : AtomicScopeModelKind::None;
5311     return AtomicScopeModel::create(Kind);
5312   }
5313
5314   /// Get atomic scope model.
5315   /// \return empty atomic scope model if this atomic expression does not have
5316   ///   scope operand.
5317   std::unique_ptr<AtomicScopeModel> getScopeModel() const {
5318     return getScopeModel(getOp());
5319   }
5320 };
5321
5322 /// TypoExpr - Internal placeholder for expressions where typo correction
5323 /// still needs to be performed and/or an error diagnostic emitted.
5324 class TypoExpr : public Expr {
5325 public:
5326   TypoExpr(QualType T)
5327       : Expr(TypoExprClass, T, VK_LValue, OK_Ordinary,
5328              /*isTypeDependent*/ true,
5329              /*isValueDependent*/ true,
5330              /*isInstantiationDependent*/ true,
5331              /*containsUnexpandedParameterPack*/ false) {
5332     assert(T->isDependentType() && "TypoExpr given a non-dependent type");
5333   }
5334
5335   child_range children() {
5336     return child_range(child_iterator(), child_iterator());
5337   }
5338   const_child_range children() const {
5339     return const_child_range(const_child_iterator(), const_child_iterator());
5340   }
5341
5342   SourceLocation getLocStart() const LLVM_READONLY { return SourceLocation(); }
5343   SourceLocation getLocEnd() const LLVM_READONLY { return SourceLocation(); }
5344   
5345   static bool classof(const Stmt *T) {
5346     return T->getStmtClass() == TypoExprClass;
5347   }
5348
5349 };
5350 } // end namespace clang
5351
5352 #endif // LLVM_CLANG_AST_EXPR_H