1 //===--- SemaInit.cpp - Semantic Analysis for Initializers ----------------===//
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 implements semantic analysis for initializers.
11 //
12 //===----------------------------------------------------------------------===//
13 
14 #include "clang/AST/ASTContext.h"
15 #include "clang/AST/DeclObjC.h"
16 #include "clang/AST/ExprCXX.h"
17 #include "clang/AST/ExprObjC.h"
18 #include "clang/AST/TypeLoc.h"
19 #include "clang/Basic/TargetInfo.h"
20 #include "clang/Sema/Designator.h"
21 #include "clang/Sema/Initialization.h"
22 #include "clang/Sema/Lookup.h"
23 #include "clang/Sema/SemaInternal.h"
24 #include "llvm/ADT/APInt.h"
25 #include "llvm/ADT/SmallString.h"
26 #include "llvm/Support/ErrorHandling.h"
27 #include "llvm/Support/raw_ostream.h"
28 
29 using namespace clang;
30 
31 //===----------------------------------------------------------------------===//
32 // Sema Initialization Checking
33 //===----------------------------------------------------------------------===//
34 
35 /// \brief Check whether T is compatible with a wide character type (wchar_t,
36 /// char16_t or char32_t).
37 static bool IsWideCharCompatible(QualType T, ASTContext &Context) {
38   if (Context.typesAreCompatible(Context.getWideCharType(), T))
39     return true;
40   if (Context.getLangOpts().CPlusPlus || Context.getLangOpts().C11) {
41     return Context.typesAreCompatible(Context.Char16Ty, T) ||
42            Context.typesAreCompatible(Context.Char32Ty, T);
43   }
44   return false;
45 }
46 
47 enum StringInitFailureKind {
48   SIF_None,
49   SIF_NarrowStringIntoWideChar,
50   SIF_WideStringIntoChar,
51   SIF_IncompatWideStringIntoWideChar,
52   SIF_Other
53 };
54 
55 /// \brief Check whether the array of type AT can be initialized by the Init
56 /// expression by means of string initialization. Returns SIF_None if so,
57 /// otherwise returns a StringInitFailureKind that describes why the
58 /// initialization would not work.
59 static StringInitFailureKind IsStringInit(Expr *Init, const ArrayType *AT,
60                                           ASTContext &Context) {
61   if (!isa<ConstantArrayType>(AT) && !isa<IncompleteArrayType>(AT))
62     return SIF_Other;
63 
64   // See if this is a string literal or @encode.
65   Init = Init->IgnoreParens();
66 
67   // Handle @encode, which is a narrow string.
68   if (isa<ObjCEncodeExpr>(Init) && AT->getElementType()->isCharType())
69     return SIF_None;
70 
71   // Otherwise we can only handle string literals.
72   StringLiteral *SL = dyn_cast<StringLiteral>(Init);
73   if (!SL)
74     return SIF_Other;
75 
76   const QualType ElemTy =
77       Context.getCanonicalType(AT->getElementType()).getUnqualifiedType();
78 
79   switch (SL->getKind()) {
80   case StringLiteral::Ascii:
81   case StringLiteral::UTF8:
82     // char array can be initialized with a narrow string.
83     // Only allow char x[] = "foo";  not char x[] = L"foo";
84     if (ElemTy->isCharType())
85       return SIF_None;
86     if (IsWideCharCompatible(ElemTy, Context))
87       return SIF_NarrowStringIntoWideChar;
88     return SIF_Other;
89   // C99 6.7.8p15 (with correction from DR343), or C11 6.7.9p15:
90   // "An array with element type compatible with a qualified or unqualified
91   // version of wchar_t, char16_t, or char32_t may be initialized by a wide
92   // string literal with the corresponding encoding prefix (L, u, or U,
93   // respectively), optionally enclosed in braces.
94   case StringLiteral::UTF16:
95     if (Context.typesAreCompatible(Context.Char16Ty, ElemTy))
96       return SIF_None;
97     if (ElemTy->isCharType())
98       return SIF_WideStringIntoChar;
99     if (IsWideCharCompatible(ElemTy, Context))
100       return SIF_IncompatWideStringIntoWideChar;
101     return SIF_Other;
102   case StringLiteral::UTF32:
103     if (Context.typesAreCompatible(Context.Char32Ty, ElemTy))
104       return SIF_None;
105     if (ElemTy->isCharType())
106       return SIF_WideStringIntoChar;
107     if (IsWideCharCompatible(ElemTy, Context))
108       return SIF_IncompatWideStringIntoWideChar;
109     return SIF_Other;
110   case StringLiteral::Wide:
111     if (Context.typesAreCompatible(Context.getWideCharType(), ElemTy))
112       return SIF_None;
113     if (ElemTy->isCharType())
114       return SIF_WideStringIntoChar;
115     if (IsWideCharCompatible(ElemTy, Context))
116       return SIF_IncompatWideStringIntoWideChar;
117     return SIF_Other;
118   }
119 
120   llvm_unreachable("missed a StringLiteral kind?");
121 }
122 
123 static StringInitFailureKind IsStringInit(Expr *init, QualType declType,
124                                           ASTContext &Context) {
125   const ArrayType *arrayType = Context.getAsArrayType(declType);
126   if (!arrayType)
127     return SIF_Other;
128   return IsStringInit(init, arrayType, Context);
129 }
130 
131 /// Update the type of a string literal, including any surrounding parentheses,
132 /// to match the type of the object which it is initializing.
133 static void updateStringLiteralType(Expr *E, QualType Ty) {
134   while (true) {
135     E->setType(Ty);
136     if (isa<StringLiteral>(E) || isa<ObjCEncodeExpr>(E))
137       break;
138     else if (ParenExpr *PE = dyn_cast<ParenExpr>(E))
139       E = PE->getSubExpr();
140     else if (UnaryOperator *UO = dyn_cast<UnaryOperator>(E))
141       E = UO->getSubExpr();
142     else if (GenericSelectionExpr *GSE = dyn_cast<GenericSelectionExpr>(E))
143       E = GSE->getResultExpr();
144     else
145       llvm_unreachable("unexpected expr in string literal init");
146   }
147 }
148 
149 static void CheckStringInit(Expr *Str, QualType &DeclT, const ArrayType *AT,
150                             Sema &S) {
151   // Get the length of the string as parsed.
152   auto *ConstantArrayTy =
153       cast<ConstantArrayType>(Str->getType()->getAsArrayTypeUnsafe());
154   uint64_t StrLength = ConstantArrayTy->getSize().getZExtValue();
155 
156   if (const IncompleteArrayType *IAT = dyn_cast<IncompleteArrayType>(AT)) {
157     // C99 6.7.8p14. We have an array of character type with unknown size
158     // being initialized to a string literal.
159     llvm::APInt ConstVal(32, StrLength);
160     // Return a new array type (C99 6.7.8p22).
161     DeclT = S.Context.getConstantArrayType(IAT->getElementType(),
162                                            ConstVal,
163                                            ArrayType::Normal, 0);
164     updateStringLiteralType(Str, DeclT);
165     return;
166   }
167 
168   const ConstantArrayType *CAT = cast<ConstantArrayType>(AT);
169 
170   // We have an array of character type with known size.  However,
171   // the size may be smaller or larger than the string we are initializing.
172   // FIXME: Avoid truncation for 64-bit length strings.
173   if (S.getLangOpts().CPlusPlus) {
174     if (StringLiteral *SL = dyn_cast<StringLiteral>(Str->IgnoreParens())) {
175       // For Pascal strings it's OK to strip off the terminating null character,
176       // so the example below is valid:
177       //
178       // unsigned char a[2] = "\pa";
179       if (SL->isPascal())
180         StrLength--;
181     }
182 
183     // [dcl.init.string]p2
184     if (StrLength > CAT->getSize().getZExtValue())
185       S.Diag(Str->getLocStart(),
186              diag::err_initializer_string_for_char_array_too_long)
187         << Str->getSourceRange();
188   } else {
189     // C99 6.7.8p14.
190     if (StrLength-1 > CAT->getSize().getZExtValue())
191       S.Diag(Str->getLocStart(),
192              diag::ext_initializer_string_for_char_array_too_long)
193         << Str->getSourceRange();
194   }
195 
196   // Set the type to the actual size that we are initializing.  If we have
197   // something like:
198   //   char x[1] = "foo";
199   // then this will set the string literal's type to char[1].
200   updateStringLiteralType(Str, DeclT);
201 }
202 
203 //===----------------------------------------------------------------------===//
204 // Semantic checking for initializer lists.
205 //===----------------------------------------------------------------------===//
206 
207 namespace {
208 
209 /// @brief Semantic checking for initializer lists.
210 ///
211 /// The InitListChecker class contains a set of routines that each
212 /// handle the initialization of a certain kind of entity, e.g.,
213 /// arrays, vectors, struct/union types, scalars, etc. The
214 /// InitListChecker itself performs a recursive walk of the subobject
215 /// structure of the type to be initialized, while stepping through
216 /// the initializer list one element at a time. The IList and Index
217 /// parameters to each of the Check* routines contain the active
218 /// (syntactic) initializer list and the index into that initializer
219 /// list that represents the current initializer. Each routine is
220 /// responsible for moving that Index forward as it consumes elements.
221 ///
222 /// Each Check* routine also has a StructuredList/StructuredIndex
223 /// arguments, which contains the current "structured" (semantic)
224 /// initializer list and the index into that initializer list where we
225 /// are copying initializers as we map them over to the semantic
226 /// list. Once we have completed our recursive walk of the subobject
227 /// structure, we will have constructed a full semantic initializer
228 /// list.
229 ///
230 /// C99 designators cause changes in the initializer list traversal,
231 /// because they make the initialization "jump" into a specific
232 /// subobject and then continue the initialization from that
233 /// point. CheckDesignatedInitializer() recursively steps into the
234 /// designated subobject and manages backing out the recursion to
235 /// initialize the subobjects after the one designated.
236 class InitListChecker {
237   Sema &SemaRef;
238   bool hadError;
239   bool VerifyOnly; // no diagnostics, no structure building
240   bool TreatUnavailableAsInvalid; // Used only in VerifyOnly mode.
241   llvm::DenseMap<InitListExpr *, InitListExpr *> SyntacticToSemantic;
242   InitListExpr *FullyStructuredList;
243 
244   void CheckImplicitInitList(const InitializedEntity &Entity,
245                              InitListExpr *ParentIList, QualType T,
246                              unsigned &Index, InitListExpr *StructuredList,
247                              unsigned &StructuredIndex);
248   void CheckExplicitInitList(const InitializedEntity &Entity,
249                              InitListExpr *IList, QualType &T,
250                              InitListExpr *StructuredList,
251                              bool TopLevelObject = false);
252   void CheckListElementTypes(const InitializedEntity &Entity,
253                              InitListExpr *IList, QualType &DeclType,
254                              bool SubobjectIsDesignatorContext,
255                              unsigned &Index,
256                              InitListExpr *StructuredList,
257                              unsigned &StructuredIndex,
258                              bool TopLevelObject = false);
259   void CheckSubElementType(const InitializedEntity &Entity,
260                            InitListExpr *IList, QualType ElemType,
261                            unsigned &Index,
262                            InitListExpr *StructuredList,
263                            unsigned &StructuredIndex);
264   void CheckComplexType(const InitializedEntity &Entity,
265                         InitListExpr *IList, QualType DeclType,
266                         unsigned &Index,
267                         InitListExpr *StructuredList,
268                         unsigned &StructuredIndex);
269   void CheckScalarType(const InitializedEntity &Entity,
270                        InitListExpr *IList, QualType DeclType,
271                        unsigned &Index,
272                        InitListExpr *StructuredList,
273                        unsigned &StructuredIndex);
274   void CheckReferenceType(const InitializedEntity &Entity,
275                           InitListExpr *IList, QualType DeclType,
276                           unsigned &Index,
277                           InitListExpr *StructuredList,
278                           unsigned &StructuredIndex);
279   void CheckVectorType(const InitializedEntity &Entity,
280                        InitListExpr *IList, QualType DeclType, unsigned &Index,
281                        InitListExpr *StructuredList,
282                        unsigned &StructuredIndex);
283   void CheckStructUnionTypes(const InitializedEntity &Entity,
284                              InitListExpr *IList, QualType DeclType,
285                              CXXRecordDecl::base_class_range Bases,
286                              RecordDecl::field_iterator Field,
287                              bool SubobjectIsDesignatorContext, unsigned &Index,
288                              InitListExpr *StructuredList,
289                              unsigned &StructuredIndex,
290                              bool TopLevelObject = false);
291   void CheckArrayType(const InitializedEntity &Entity,
292                       InitListExpr *IList, QualType &DeclType,
293                       llvm::APSInt elementIndex,
294                       bool SubobjectIsDesignatorContext, unsigned &Index,
295                       InitListExpr *StructuredList,
296                       unsigned &StructuredIndex);
297   bool CheckDesignatedInitializer(const InitializedEntity &Entity,
298                                   InitListExpr *IList, DesignatedInitExpr *DIE,
299                                   unsigned DesigIdx,
300                                   QualType &CurrentObjectType,
301                                   RecordDecl::field_iterator *NextField,
302                                   llvm::APSInt *NextElementIndex,
303                                   unsigned &Index,
304                                   InitListExpr *StructuredList,
305                                   unsigned &StructuredIndex,
306                                   bool FinishSubobjectInit,
307                                   bool TopLevelObject);
308   InitListExpr *getStructuredSubobjectInit(InitListExpr *IList, unsigned Index,
309                                            QualType CurrentObjectType,
310                                            InitListExpr *StructuredList,
311                                            unsigned StructuredIndex,
312                                            SourceRange InitRange,
313                                            bool IsFullyOverwritten = false);
314   void UpdateStructuredListElement(InitListExpr *StructuredList,
315                                    unsigned &StructuredIndex,
316                                    Expr *expr);
317   int numArrayElements(QualType DeclType);
318   int numStructUnionElements(QualType DeclType);
319 
320   static ExprResult PerformEmptyInit(Sema &SemaRef,
321                                      SourceLocation Loc,
322                                      const InitializedEntity &Entity,
323                                      bool VerifyOnly,
324                                      bool TreatUnavailableAsInvalid);
325 
326   // Explanation on the "FillWithNoInit" mode:
327   //
328   // Assume we have the following definitions (Case#1):
329   // struct P { char x[6][6]; } xp = { .x[1] = "bar" };
330   // struct PP { struct P lp; } l = { .lp = xp, .lp.x[1][2] = 'f' };
331   //
332   // l.lp.x[1][0..1] should not be filled with implicit initializers because the
333   // "base" initializer "xp" will provide values for them; l.lp.x[1] will be "baf".
334   //
335   // But if we have (Case#2):
336   // struct PP l = { .lp = xp, .lp.x[1] = { [2] = 'f' } };
337   //
338   // l.lp.x[1][0..1] are implicitly initialized and do not use values from the
339   // "base" initializer; l.lp.x[1] will be "\0\0f\0\0\0".
340   //
341   // To distinguish Case#1 from Case#2, and also to avoid leaving many "holes"
342   // in the InitListExpr, the "holes" in Case#1 are filled not with empty
343   // initializers but with special "NoInitExpr" place holders, which tells the
344   // CodeGen not to generate any initializers for these parts.
345   void FillInEmptyInitForBase(unsigned Init, const CXXBaseSpecifier &Base,
346                               const InitializedEntity &ParentEntity,
347                               InitListExpr *ILE, bool &RequiresSecondPass,
348                               bool FillWithNoInit);
349   void FillInEmptyInitForField(unsigned Init, FieldDecl *Field,
350                                const InitializedEntity &ParentEntity,
351                                InitListExpr *ILE, bool &RequiresSecondPass,
352                                bool FillWithNoInit = false);
353   void FillInEmptyInitializations(const InitializedEntity &Entity,
354                                   InitListExpr *ILE, bool &RequiresSecondPass,
355                                   bool FillWithNoInit = false);
356   bool CheckFlexibleArrayInit(const InitializedEntity &Entity,
357                               Expr *InitExpr, FieldDecl *Field,
358                               bool TopLevelObject);
359   void CheckEmptyInitializable(const InitializedEntity &Entity,
360                                SourceLocation Loc);
361 
362 public:
363   InitListChecker(Sema &S, const InitializedEntity &Entity,
364                   InitListExpr *IL, QualType &T, bool VerifyOnly,
365                   bool TreatUnavailableAsInvalid);
366   bool HadError() { return hadError; }
367 
368   // @brief Retrieves the fully-structured initializer list used for
369   // semantic analysis and code generation.
370   InitListExpr *getFullyStructuredList() const { return FullyStructuredList; }
371 };
372 
373 } // end anonymous namespace
374 
375 ExprResult InitListChecker::PerformEmptyInit(Sema &SemaRef,
376                                              SourceLocation Loc,
377                                              const InitializedEntity &Entity,
378                                              bool VerifyOnly,
379                                              bool TreatUnavailableAsInvalid) {
380   InitializationKind Kind = InitializationKind::CreateValue(Loc, Loc, Loc,
381                                                             true);
382   MultiExprArg SubInit;
383   Expr *InitExpr;
384   InitListExpr DummyInitList(SemaRef.Context, Loc, None, Loc);
385 
386   // C++ [dcl.init.aggr]p7:
387   //   If there are fewer initializer-clauses in the list than there are
388   //   members in the aggregate, then each member not explicitly initialized
389   //   ...
390   bool EmptyInitList = SemaRef.getLangOpts().CPlusPlus11 &&
391       Entity.getType()->getBaseElementTypeUnsafe()->isRecordType();
392   if (EmptyInitList) {
393     // C++1y / DR1070:
394     //   shall be initialized [...] from an empty initializer list.
395     //
396     // We apply the resolution of this DR to C++11 but not C++98, since C++98
397     // does not have useful semantics for initialization from an init list.
398     // We treat this as copy-initialization, because aggregate initialization
399     // always performs copy-initialization on its elements.
400     //
401     // Only do this if we're initializing a class type, to avoid filling in
402     // the initializer list where possible.
403     InitExpr = VerifyOnly ? &DummyInitList : new (SemaRef.Context)
404                    InitListExpr(SemaRef.Context, Loc, None, Loc);
405     InitExpr->setType(SemaRef.Context.VoidTy);
406     SubInit = InitExpr;
407     Kind = InitializationKind::CreateCopy(Loc, Loc);
408   } else {
409     // C++03:
410     //   shall be value-initialized.
411   }
412 
413   InitializationSequence InitSeq(SemaRef, Entity, Kind, SubInit);
414   // libstdc++4.6 marks the vector default constructor as explicit in
415   // _GLIBCXX_DEBUG mode, so recover using the C++03 logic in that case.
416   // stlport does so too. Look for std::__debug for libstdc++, and for
417   // std:: for stlport.  This is effectively a compiler-side implementation of
418   // LWG2193.
419   if (!InitSeq && EmptyInitList && InitSeq.getFailureKind() ==
420           InitializationSequence::FK_ExplicitConstructor) {
421     OverloadCandidateSet::iterator Best;
422     OverloadingResult O =
423         InitSeq.getFailedCandidateSet()
424             .BestViableFunction(SemaRef, Kind.getLocation(), Best);
425     (void)O;
426     assert(O == OR_Success && "Inconsistent overload resolution");
427     CXXConstructorDecl *CtorDecl = cast<CXXConstructorDecl>(Best->Function);
428     CXXRecordDecl *R = CtorDecl->getParent();
429 
430     if (CtorDecl->getMinRequiredArguments() == 0 &&
431         CtorDecl->isExplicit() && R->getDeclName() &&
432         SemaRef.SourceMgr.isInSystemHeader(CtorDecl->getLocation())) {
433       bool IsInStd = false;
434       for (NamespaceDecl *ND = dyn_cast<NamespaceDecl>(R->getDeclContext());
435            ND && !IsInStd; ND = dyn_cast<NamespaceDecl>(ND->getParent())) {
436         if (SemaRef.getStdNamespace()->InEnclosingNamespaceSetOf(ND))
437           IsInStd = true;
438       }
439 
440       if (IsInStd && llvm::StringSwitch<bool>(R->getName())
441               .Cases("basic_string", "deque", "forward_list", true)
442               .Cases("list", "map", "multimap", "multiset", true)
443               .Cases("priority_queue", "queue", "set", "stack", true)
444               .Cases("unordered_map", "unordered_set", "vector", true)
445               .Default(false)) {
446         InitSeq.InitializeFrom(
447             SemaRef, Entity,
448             InitializationKind::CreateValue(Loc, Loc, Loc, true),
449             MultiExprArg(), /*TopLevelOfInitList=*/false,
450             TreatUnavailableAsInvalid);
451         // Emit a warning for this.  System header warnings aren't shown
452         // by default, but people working on system headers should see it.
453         if (!VerifyOnly) {
454           SemaRef.Diag(CtorDecl->getLocation(),
455                        diag::warn_invalid_initializer_from_system_header);
456           if (Entity.getKind() == InitializedEntity::EK_Member)
457             SemaRef.Diag(Entity.getDecl()->getLocation(),
458                          diag::note_used_in_initialization_here);
459           else if (Entity.getKind() == InitializedEntity::EK_ArrayElement)
460             SemaRef.Diag(Loc, diag::note_used_in_initialization_here);
461         }
462       }
463     }
464   }
465   if (!InitSeq) {
466     if (!VerifyOnly) {
467       InitSeq.Diagnose(SemaRef, Entity, Kind, SubInit);
468       if (Entity.getKind() == InitializedEntity::EK_Member)
469         SemaRef.Diag(Entity.getDecl()->getLocation(),
470                      diag::note_in_omitted_aggregate_initializer)
471           << /*field*/1 << Entity.getDecl();
472       else if (Entity.getKind() == InitializedEntity::EK_ArrayElement) {
473         bool IsTrailingArrayNewMember =
474             Entity.getParent() &&
475             Entity.getParent()->isVariableLengthArrayNew();
476         SemaRef.Diag(Loc, diag::note_in_omitted_aggregate_initializer)
477           << (IsTrailingArrayNewMember ? 2 : /*array element*/0)
478           << Entity.getElementIndex();
479       }
480     }
481     return ExprError();
482   }
483 
484   return VerifyOnly ? ExprResult(static_cast<Expr *>(nullptr))
485                     : InitSeq.Perform(SemaRef, Entity, Kind, SubInit);
486 }
487 
488 void InitListChecker::CheckEmptyInitializable(const InitializedEntity &Entity,
489                                               SourceLocation Loc) {
490   assert(VerifyOnly &&
491          "CheckEmptyInitializable is only inteded for verification mode.");
492   if (PerformEmptyInit(SemaRef, Loc, Entity, /*VerifyOnly*/true,
493                        TreatUnavailableAsInvalid).isInvalid())
494     hadError = true;
495 }
496 
497 void InitListChecker::FillInEmptyInitForBase(
498     unsigned Init, const CXXBaseSpecifier &Base,
499     const InitializedEntity &ParentEntity, InitListExpr *ILE,
500     bool &RequiresSecondPass, bool FillWithNoInit) {
501   assert(Init < ILE->getNumInits() && "should have been expanded");
502 
503   InitializedEntity BaseEntity = InitializedEntity::InitializeBase(
504       SemaRef.Context, &Base, false, &ParentEntity);
505 
506   if (!ILE->getInit(Init)) {
507     ExprResult BaseInit =
508         FillWithNoInit ? new (SemaRef.Context) NoInitExpr(Base.getType())
509                        : PerformEmptyInit(SemaRef, ILE->getLocEnd(), BaseEntity,
510                                           /*VerifyOnly*/ false,
511                                           TreatUnavailableAsInvalid);
512     if (BaseInit.isInvalid()) {
513       hadError = true;
514       return;
515     }
516 
517     ILE->setInit(Init, BaseInit.getAs<Expr>());
518   } else if (InitListExpr *InnerILE =
519                  dyn_cast<InitListExpr>(ILE->getInit(Init))) {
520     FillInEmptyInitializations(BaseEntity, InnerILE,
521                                RequiresSecondPass, FillWithNoInit);
522   } else if (DesignatedInitUpdateExpr *InnerDIUE =
523                dyn_cast<DesignatedInitUpdateExpr>(ILE->getInit(Init))) {
524     FillInEmptyInitializations(BaseEntity, InnerDIUE->getUpdater(),
525                                RequiresSecondPass, /*FillWithNoInit =*/true);
526   }
527 }
528 
529 void InitListChecker::FillInEmptyInitForField(unsigned Init, FieldDecl *Field,
530                                         const InitializedEntity &ParentEntity,
531                                               InitListExpr *ILE,
532                                               bool &RequiresSecondPass,
533                                               bool FillWithNoInit) {
534   SourceLocation Loc = ILE->getLocEnd();
535   unsigned NumInits = ILE->getNumInits();
536   InitializedEntity MemberEntity
537     = InitializedEntity::InitializeMember(Field, &ParentEntity);
538 
539   if (const RecordType *RType = ILE->getType()->getAs<RecordType>())
540     if (!RType->getDecl()->isUnion())
541       assert(Init < NumInits && "This ILE should have been expanded");
542 
543   if (Init >= NumInits || !ILE->getInit(Init)) {
544     if (FillWithNoInit) {
545       Expr *Filler = new (SemaRef.Context) NoInitExpr(Field->getType());
546       if (Init < NumInits)
547         ILE->setInit(Init, Filler);
548       else
549         ILE->updateInit(SemaRef.Context, Init, Filler);
550       return;
551     }
552     // C++1y [dcl.init.aggr]p7:
553     //   If there are fewer initializer-clauses in the list than there are
554     //   members in the aggregate, then each member not explicitly initialized
555     //   shall be initialized from its brace-or-equal-initializer [...]
556     if (Field->hasInClassInitializer()) {
557       ExprResult DIE = SemaRef.BuildCXXDefaultInitExpr(Loc, Field);
558       if (DIE.isInvalid()) {
559         hadError = true;
560         return;
561       }
562       if (Init < NumInits)
563         ILE->setInit(Init, DIE.get());
564       else {
565         ILE->updateInit(SemaRef.Context, Init, DIE.get());
566         RequiresSecondPass = true;
567       }
568       return;
569     }
570 
571     if (Field->getType()->isReferenceType()) {
572       // C++ [dcl.init.aggr]p9:
573       //   If an incomplete or empty initializer-list leaves a
574       //   member of reference type uninitialized, the program is
575       //   ill-formed.
576       SemaRef.Diag(Loc, diag::err_init_reference_member_uninitialized)
577         << Field->getType()
578         << ILE->getSyntacticForm()->getSourceRange();
579       SemaRef.Diag(Field->getLocation(),
580                    diag::note_uninit_reference_member);
581       hadError = true;
582       return;
583     }
584 
585     ExprResult MemberInit = PerformEmptyInit(SemaRef, Loc, MemberEntity,
586                                              /*VerifyOnly*/false,
587                                              TreatUnavailableAsInvalid);
588     if (MemberInit.isInvalid()) {
589       hadError = true;
590       return;
591     }
592 
593     if (hadError) {
594       // Do nothing
595     } else if (Init < NumInits) {
596       ILE->setInit(Init, MemberInit.getAs<Expr>());
597     } else if (!isa<ImplicitValueInitExpr>(MemberInit.get())) {
598       // Empty initialization requires a constructor call, so
599       // extend the initializer list to include the constructor
600       // call and make a note that we'll need to take another pass
601       // through the initializer list.
602       ILE->updateInit(SemaRef.Context, Init, MemberInit.getAs<Expr>());
603       RequiresSecondPass = true;
604     }
605   } else if (InitListExpr *InnerILE
606                = dyn_cast<InitListExpr>(ILE->getInit(Init)))
607     FillInEmptyInitializations(MemberEntity, InnerILE,
608                                RequiresSecondPass, FillWithNoInit);
609   else if (DesignatedInitUpdateExpr *InnerDIUE
610                = dyn_cast<DesignatedInitUpdateExpr>(ILE->getInit(Init)))
611     FillInEmptyInitializations(MemberEntity, InnerDIUE->getUpdater(),
612                                RequiresSecondPass, /*FillWithNoInit =*/ true);
613 }
614 
615 /// Recursively replaces NULL values within the given initializer list
616 /// with expressions that perform value-initialization of the
617 /// appropriate type.
618 void
619 InitListChecker::FillInEmptyInitializations(const InitializedEntity &Entity,
620                                             InitListExpr *ILE,
621                                             bool &RequiresSecondPass,
622                                             bool FillWithNoInit) {
623   assert((ILE->getType() != SemaRef.Context.VoidTy) &&
624          "Should not have void type");
625 
626   if (const RecordType *RType = ILE->getType()->getAs<RecordType>()) {
627     const RecordDecl *RDecl = RType->getDecl();
628     if (RDecl->isUnion() && ILE->getInitializedFieldInUnion())
629       FillInEmptyInitForField(0, ILE->getInitializedFieldInUnion(),
630                               Entity, ILE, RequiresSecondPass, FillWithNoInit);
631     else if (RDecl->isUnion() && isa<CXXRecordDecl>(RDecl) &&
632              cast<CXXRecordDecl>(RDecl)->hasInClassInitializer()) {
633       for (auto *Field : RDecl->fields()) {
634         if (Field->hasInClassInitializer()) {
635           FillInEmptyInitForField(0, Field, Entity, ILE, RequiresSecondPass,
636                                   FillWithNoInit);
637           break;
638         }
639       }
640     } else {
641       // The fields beyond ILE->getNumInits() are default initialized, so in
642       // order to leave them uninitialized, the ILE is expanded and the extra
643       // fields are then filled with NoInitExpr.
644       unsigned NumElems = numStructUnionElements(ILE->getType());
645       if (RDecl->hasFlexibleArrayMember())
646         ++NumElems;
647       if (ILE->getNumInits() < NumElems)
648         ILE->resizeInits(SemaRef.Context, NumElems);
649 
650       unsigned Init = 0;
651 
652       if (auto *CXXRD = dyn_cast<CXXRecordDecl>(RDecl)) {
653         for (auto &Base : CXXRD->bases()) {
654           if (hadError)
655             return;
656 
657           FillInEmptyInitForBase(Init, Base, Entity, ILE, RequiresSecondPass,
658                                  FillWithNoInit);
659           ++Init;
660         }
661       }
662 
663       for (auto *Field : RDecl->fields()) {
664         if (Field->isUnnamedBitfield())
665           continue;
666 
667         if (hadError)
668           return;
669 
670         FillInEmptyInitForField(Init, Field, Entity, ILE, RequiresSecondPass,
671                                 FillWithNoInit);
672         if (hadError)
673           return;
674 
675         ++Init;
676 
677         // Only look at the first initialization of a union.
678         if (RDecl->isUnion())
679           break;
680       }
681     }
682 
683     return;
684   }
685 
686   QualType ElementType;
687 
688   InitializedEntity ElementEntity = Entity;
689   unsigned NumInits = ILE->getNumInits();
690   unsigned NumElements = NumInits;
691   if (const ArrayType *AType = SemaRef.Context.getAsArrayType(ILE->getType())) {
692     ElementType = AType->getElementType();
693     if (const auto *CAType = dyn_cast<ConstantArrayType>(AType))
694       NumElements = CAType->getSize().getZExtValue();
695     // For an array new with an unknown bound, ask for one additional element
696     // in order to populate the array filler.
697     if (Entity.isVariableLengthArrayNew())
698       ++NumElements;
699     ElementEntity = InitializedEntity::InitializeElement(SemaRef.Context,
700                                                          0, Entity);
701   } else if (const VectorType *VType = ILE->getType()->getAs<VectorType>()) {
702     ElementType = VType->getElementType();
703     NumElements = VType->getNumElements();
704     ElementEntity = InitializedEntity::InitializeElement(SemaRef.Context,
705                                                          0, Entity);
706   } else
707     ElementType = ILE->getType();
708 
709   for (unsigned Init = 0; Init != NumElements; ++Init) {
710     if (hadError)
711       return;
712 
713     if (ElementEntity.getKind() == InitializedEntity::EK_ArrayElement ||
714         ElementEntity.getKind() == InitializedEntity::EK_VectorElement)
715       ElementEntity.setElementIndex(Init);
716 
717     Expr *InitExpr = (Init < NumInits ? ILE->getInit(Init) : nullptr);
718     if (!InitExpr && Init < NumInits && ILE->hasArrayFiller())
719       ILE->setInit(Init, ILE->getArrayFiller());
720     else if (!InitExpr && !ILE->hasArrayFiller()) {
721       Expr *Filler = nullptr;
722 
723       if (FillWithNoInit)
724         Filler = new (SemaRef.Context) NoInitExpr(ElementType);
725       else {
726         ExprResult ElementInit = PerformEmptyInit(SemaRef, ILE->getLocEnd(),
727                                                   ElementEntity,
728                                                   /*VerifyOnly*/false,
729                                                   TreatUnavailableAsInvalid);
730         if (ElementInit.isInvalid()) {
731           hadError = true;
732           return;
733         }
734 
735         Filler = ElementInit.getAs<Expr>();
736       }
737 
738       if (hadError) {
739         // Do nothing
740       } else if (Init < NumInits) {
741         // For arrays, just set the expression used for value-initialization
742         // of the "holes" in the array.
743         if (ElementEntity.getKind() == InitializedEntity::EK_ArrayElement)
744           ILE->setArrayFiller(Filler);
745         else
746           ILE->setInit(Init, Filler);
747       } else {
748         // For arrays, just set the expression used for value-initialization
749         // of the rest of elements and exit.
750         if (ElementEntity.getKind() == InitializedEntity::EK_ArrayElement) {
751           ILE->setArrayFiller(Filler);
752           return;
753         }
754 
755         if (!isa<ImplicitValueInitExpr>(Filler) && !isa<NoInitExpr>(Filler)) {
756           // Empty initialization requires a constructor call, so
757           // extend the initializer list to include the constructor
758           // call and make a note that we'll need to take another pass
759           // through the initializer list.
760           ILE->updateInit(SemaRef.Context, Init, Filler);
761           RequiresSecondPass = true;
762         }
763       }
764     } else if (InitListExpr *InnerILE
765                  = dyn_cast_or_null<InitListExpr>(InitExpr))
766       FillInEmptyInitializations(ElementEntity, InnerILE, RequiresSecondPass,
767                                  FillWithNoInit);
768     else if (DesignatedInitUpdateExpr *InnerDIUE
769                  = dyn_cast_or_null<DesignatedInitUpdateExpr>(InitExpr))
770       FillInEmptyInitializations(ElementEntity, InnerDIUE->getUpdater(),
771                                  RequiresSecondPass, /*FillWithNoInit =*/ true);
772   }
773 }
774 
775 InitListChecker::InitListChecker(Sema &S, const InitializedEntity &Entity,
776                                  InitListExpr *IL, QualType &T,
777                                  bool VerifyOnly,
778                                  bool TreatUnavailableAsInvalid)
779   : SemaRef(S), VerifyOnly(VerifyOnly),
780     TreatUnavailableAsInvalid(TreatUnavailableAsInvalid) {
781   // FIXME: Check that IL isn't already the semantic form of some other
782   // InitListExpr. If it is, we'd create a broken AST.
783 
784   hadError = false;
785 
786   FullyStructuredList =
787       getStructuredSubobjectInit(IL, 0, T, nullptr, 0, IL->getSourceRange());
788   CheckExplicitInitList(Entity, IL, T, FullyStructuredList,
789                         /*TopLevelObject=*/true);
790 
791   if (!hadError && !VerifyOnly) {
792     bool RequiresSecondPass = false;
793     FillInEmptyInitializations(Entity, FullyStructuredList, RequiresSecondPass);
794     if (RequiresSecondPass && !hadError)
795       FillInEmptyInitializations(Entity, FullyStructuredList,
796                                  RequiresSecondPass);
797   }
798 }
799 
800 int InitListChecker::numArrayElements(QualType DeclType) {
801   // FIXME: use a proper constant
802   int maxElements = 0x7FFFFFFF;
803   if (const ConstantArrayType *CAT =
804         SemaRef.Context.getAsConstantArrayType(DeclType)) {
805     maxElements = static_cast<int>(CAT->getSize().getZExtValue());
806   }
807   return maxElements;
808 }
809 
810 int InitListChecker::numStructUnionElements(QualType DeclType) {
811   RecordDecl *structDecl = DeclType->getAs<RecordType>()->getDecl();
812   int InitializableMembers = 0;
813   if (auto *CXXRD = dyn_cast<CXXRecordDecl>(structDecl))
814     InitializableMembers += CXXRD->getNumBases();
815   for (const auto *Field : structDecl->fields())
816     if (!Field->isUnnamedBitfield())
817       ++InitializableMembers;
818 
819   if (structDecl->isUnion())
820     return std::min(InitializableMembers, 1);
821   return InitializableMembers - structDecl->hasFlexibleArrayMember();
822 }
823 
824 /// Check whether the range of the initializer \p ParentIList from element
825 /// \p Index onwards can be used to initialize an object of type \p T. Update
826 /// \p Index to indicate how many elements of the list were consumed.
827 ///
828 /// This also fills in \p StructuredList, from element \p StructuredIndex
829 /// onwards, with the fully-braced, desugared form of the initialization.
830 void InitListChecker::CheckImplicitInitList(const InitializedEntity &Entity,
831                                             InitListExpr *ParentIList,
832                                             QualType T, unsigned &Index,
833                                             InitListExpr *StructuredList,
834                                             unsigned &StructuredIndex) {
835   int maxElements = 0;
836 
837   if (T->isArrayType())
838     maxElements = numArrayElements(T);
839   else if (T->isRecordType())
840     maxElements = numStructUnionElements(T);
841   else if (T->isVectorType())
842     maxElements = T->getAs<VectorType>()->getNumElements();
843   else
844     llvm_unreachable("CheckImplicitInitList(): Illegal type");
845 
846   if (maxElements == 0) {
847     if (!VerifyOnly)
848       SemaRef.Diag(ParentIList->getInit(Index)->getLocStart(),
849                    diag::err_implicit_empty_initializer);
850     ++Index;
851     hadError = true;
852     return;
853   }
854 
855   // Build a structured initializer list corresponding to this subobject.
856   InitListExpr *StructuredSubobjectInitList
857     = getStructuredSubobjectInit(ParentIList, Index, T, StructuredList,
858                                  StructuredIndex,
859           SourceRange(ParentIList->getInit(Index)->getLocStart(),
860                       ParentIList->getSourceRange().getEnd()));
861   unsigned StructuredSubobjectInitIndex = 0;
862 
863   // Check the element types and build the structural subobject.
864   unsigned StartIndex = Index;
865   CheckListElementTypes(Entity, ParentIList, T,
866                         /*SubobjectIsDesignatorContext=*/false, Index,
867                         StructuredSubobjectInitList,
868                         StructuredSubobjectInitIndex);
869 
870   if (!VerifyOnly) {
871     StructuredSubobjectInitList->setType(T);
872 
873     unsigned EndIndex = (Index == StartIndex? StartIndex : Index - 1);
874     // Update the structured sub-object initializer so that it's ending
875     // range corresponds with the end of the last initializer it used.
876     if (EndIndex < ParentIList->getNumInits() &&
877         ParentIList->getInit(EndIndex)) {
878       SourceLocation EndLoc
879         = ParentIList->getInit(EndIndex)->getSourceRange().getEnd();
880       StructuredSubobjectInitList->setRBraceLoc(EndLoc);
881     }
882 
883     // Complain about missing braces.
884     if (T->isArrayType() || T->isRecordType()) {
885       SemaRef.Diag(StructuredSubobjectInitList->getLocStart(),
886                    diag::warn_missing_braces)
887           << StructuredSubobjectInitList->getSourceRange()
888           << FixItHint::CreateInsertion(
889                  StructuredSubobjectInitList->getLocStart(), "{")
890           << FixItHint::CreateInsertion(
891                  SemaRef.getLocForEndOfToken(
892                      StructuredSubobjectInitList->getLocEnd()),
893                  "}");
894     }
895   }
896 }
897 
898 /// Warn that \p Entity was of scalar type and was initialized by a
899 /// single-element braced initializer list.
900 static void warnBracedScalarInit(Sema &S, const InitializedEntity &Entity,
901                                  SourceRange Braces) {
902   // Don't warn during template instantiation. If the initialization was
903   // non-dependent, we warned during the initial parse; otherwise, the
904   // type might not be scalar in some uses of the template.
905   if (!S.ActiveTemplateInstantiations.empty())
906     return;
907 
908   unsigned DiagID = 0;
909 
910   switch (Entity.getKind()) {
911   case InitializedEntity::EK_VectorElement:
912   case InitializedEntity::EK_ComplexElement:
913   case InitializedEntity::EK_ArrayElement:
914   case InitializedEntity::EK_Parameter:
915   case InitializedEntity::EK_Parameter_CF_Audited:
916   case InitializedEntity::EK_Result:
917     // Extra braces here are suspicious.
918     DiagID = diag::warn_braces_around_scalar_init;
919     break;
920 
921   case InitializedEntity::EK_Member:
922     // Warn on aggregate initialization but not on ctor init list or
923     // default member initializer.
924     if (Entity.getParent())
925       DiagID = diag::warn_braces_around_scalar_init;
926     break;
927 
928   case InitializedEntity::EK_Variable:
929   case InitializedEntity::EK_LambdaCapture:
930     // No warning, might be direct-list-initialization.
931     // FIXME: Should we warn for copy-list-initialization in these cases?
932     break;
933 
934   case InitializedEntity::EK_New:
935   case InitializedEntity::EK_Temporary:
936   case InitializedEntity::EK_CompoundLiteralInit:
937     // No warning, braces are part of the syntax of the underlying construct.
938     break;
939 
940   case InitializedEntity::EK_RelatedResult:
941     // No warning, we already warned when initializing the result.
942     break;
943 
944   case InitializedEntity::EK_Exception:
945   case InitializedEntity::EK_Base:
946   case InitializedEntity::EK_Delegating:
947   case InitializedEntity::EK_BlockElement:
948   case InitializedEntity::EK_Binding:
949     llvm_unreachable("unexpected braced scalar init");
950   }
951 
952   if (DiagID) {
953     S.Diag(Braces.getBegin(), DiagID)
954       << Braces
955       << FixItHint::CreateRemoval(Braces.getBegin())
956       << FixItHint::CreateRemoval(Braces.getEnd());
957   }
958 }
959 
960 /// Check whether the initializer \p IList (that was written with explicit
961 /// braces) can be used to initialize an object of type \p T.
962 ///
963 /// This also fills in \p StructuredList with the fully-braced, desugared
964 /// form of the initialization.
965 void InitListChecker::CheckExplicitInitList(const InitializedEntity &Entity,
966                                             InitListExpr *IList, QualType &T,
967                                             InitListExpr *StructuredList,
968                                             bool TopLevelObject) {
969   if (!VerifyOnly) {
970     SyntacticToSemantic[IList] = StructuredList;
971     StructuredList->setSyntacticForm(IList);
972   }
973 
974   unsigned Index = 0, StructuredIndex = 0;
975   CheckListElementTypes(Entity, IList, T, /*SubobjectIsDesignatorContext=*/true,
976                         Index, StructuredList, StructuredIndex, TopLevelObject);
977   if (!VerifyOnly) {
978     QualType ExprTy = T;
979     if (!ExprTy->isArrayType())
980       ExprTy = ExprTy.getNonLValueExprType(SemaRef.Context);
981     IList->setType(ExprTy);
982     StructuredList->setType(ExprTy);
983   }
984   if (hadError)
985     return;
986 
987   if (Index < IList->getNumInits()) {
988     // We have leftover initializers
989     if (VerifyOnly) {
990       if (SemaRef.getLangOpts().CPlusPlus ||
991           (SemaRef.getLangOpts().OpenCL &&
992            IList->getType()->isVectorType())) {
993         hadError = true;
994       }
995       return;
996     }
997 
998     if (StructuredIndex == 1 &&
999         IsStringInit(StructuredList->getInit(0), T, SemaRef.Context) ==
1000             SIF_None) {
1001       unsigned DK = diag::ext_excess_initializers_in_char_array_initializer;
1002       if (SemaRef.getLangOpts().CPlusPlus) {
1003         DK = diag::err_excess_initializers_in_char_array_initializer;
1004         hadError = true;
1005       }
1006       // Special-case
1007       SemaRef.Diag(IList->getInit(Index)->getLocStart(), DK)
1008         << IList->getInit(Index)->getSourceRange();
1009     } else if (!T->isIncompleteType()) {
1010       // Don't complain for incomplete types, since we'll get an error
1011       // elsewhere
1012       QualType CurrentObjectType = StructuredList->getType();
1013       int initKind =
1014         CurrentObjectType->isArrayType()? 0 :
1015         CurrentObjectType->isVectorType()? 1 :
1016         CurrentObjectType->isScalarType()? 2 :
1017         CurrentObjectType->isUnionType()? 3 :
1018         4;
1019 
1020       unsigned DK = diag::ext_excess_initializers;
1021       if (SemaRef.getLangOpts().CPlusPlus) {
1022         DK = diag::err_excess_initializers;
1023         hadError = true;
1024       }
1025       if (SemaRef.getLangOpts().OpenCL && initKind == 1) {
1026         DK = diag::err_excess_initializers;
1027         hadError = true;
1028       }
1029 
1030       SemaRef.Diag(IList->getInit(Index)->getLocStart(), DK)
1031         << initKind << IList->getInit(Index)->getSourceRange();
1032     }
1033   }
1034 
1035   if (!VerifyOnly && T->isScalarType() &&
1036       IList->getNumInits() == 1 && !isa<InitListExpr>(IList->getInit(0)))
1037     warnBracedScalarInit(SemaRef, Entity, IList->getSourceRange());
1038 }
1039 
1040 void InitListChecker::CheckListElementTypes(const InitializedEntity &Entity,
1041                                             InitListExpr *IList,
1042                                             QualType &DeclType,
1043                                             bool SubobjectIsDesignatorContext,
1044                                             unsigned &Index,
1045                                             InitListExpr *StructuredList,
1046                                             unsigned &StructuredIndex,
1047                                             bool TopLevelObject) {
1048   if (DeclType->isAnyComplexType() && SubobjectIsDesignatorContext) {
1049     // Explicitly braced initializer for complex type can be real+imaginary
1050     // parts.
1051     CheckComplexType(Entity, IList, DeclType, Index,
1052                      StructuredList, StructuredIndex);
1053   } else if (DeclType->isScalarType()) {
1054     CheckScalarType(Entity, IList, DeclType, Index,
1055                     StructuredList, StructuredIndex);
1056   } else if (DeclType->isVectorType()) {
1057     CheckVectorType(Entity, IList, DeclType, Index,
1058                     StructuredList, StructuredIndex);
1059   } else if (DeclType->isRecordType()) {
1060     assert(DeclType->isAggregateType() &&
1061            "non-aggregate records should be handed in CheckSubElementType");
1062     RecordDecl *RD = DeclType->getAs<RecordType>()->getDecl();
1063     auto Bases =
1064         CXXRecordDecl::base_class_range(CXXRecordDecl::base_class_iterator(),
1065                                         CXXRecordDecl::base_class_iterator());
1066     if (auto *CXXRD = dyn_cast<CXXRecordDecl>(RD))
1067       Bases = CXXRD->bases();
1068     CheckStructUnionTypes(Entity, IList, DeclType, Bases, RD->field_begin(),
1069                           SubobjectIsDesignatorContext, Index, StructuredList,
1070                           StructuredIndex, TopLevelObject);
1071   } else if (DeclType->isArrayType()) {
1072     llvm::APSInt Zero(
1073                     SemaRef.Context.getTypeSize(SemaRef.Context.getSizeType()),
1074                     false);
1075     CheckArrayType(Entity, IList, DeclType, Zero,
1076                    SubobjectIsDesignatorContext, Index,
1077                    StructuredList, StructuredIndex);
1078   } else if (DeclType->isVoidType() || DeclType->isFunctionType()) {
1079     // This type is invalid, issue a diagnostic.
1080     ++Index;
1081     if (!VerifyOnly)
1082       SemaRef.Diag(IList->getLocStart(), diag::err_illegal_initializer_type)
1083         << DeclType;
1084     hadError = true;
1085   } else if (DeclType->isReferenceType()) {
1086     CheckReferenceType(Entity, IList, DeclType, Index,
1087                        StructuredList, StructuredIndex);
1088   } else if (DeclType->isObjCObjectType()) {
1089     if (!VerifyOnly)
1090       SemaRef.Diag(IList->getLocStart(), diag::err_init_objc_class)
1091         << DeclType;
1092     hadError = true;
1093   } else {
1094     if (!VerifyOnly)
1095       SemaRef.Diag(IList->getLocStart(), diag::err_illegal_initializer_type)
1096         << DeclType;
1097     hadError = true;
1098   }
1099 }
1100 
1101 void InitListChecker::CheckSubElementType(const InitializedEntity &Entity,
1102                                           InitListExpr *IList,
1103                                           QualType ElemType,
1104                                           unsigned &Index,
1105                                           InitListExpr *StructuredList,
1106                                           unsigned &StructuredIndex) {
1107   Expr *expr = IList->getInit(Index);
1108 
1109   if (ElemType->isReferenceType())
1110     return CheckReferenceType(Entity, IList, ElemType, Index,
1111                               StructuredList, StructuredIndex);
1112 
1113   if (InitListExpr *SubInitList = dyn_cast<InitListExpr>(expr)) {
1114     if (SubInitList->getNumInits() == 1 &&
1115         IsStringInit(SubInitList->getInit(0), ElemType, SemaRef.Context) ==
1116         SIF_None) {
1117       expr = SubInitList->getInit(0);
1118     } else if (!SemaRef.getLangOpts().CPlusPlus) {
1119       InitListExpr *InnerStructuredList
1120         = getStructuredSubobjectInit(IList, Index, ElemType,
1121                                      StructuredList, StructuredIndex,
1122                                      SubInitList->getSourceRange(), true);
1123       CheckExplicitInitList(Entity, SubInitList, ElemType,
1124                             InnerStructuredList);
1125 
1126       if (!hadError && !VerifyOnly) {
1127         bool RequiresSecondPass = false;
1128         FillInEmptyInitializations(Entity, InnerStructuredList,
1129                                    RequiresSecondPass);
1130         if (RequiresSecondPass && !hadError)
1131           FillInEmptyInitializations(Entity, InnerStructuredList,
1132                                      RequiresSecondPass);
1133       }
1134       ++StructuredIndex;
1135       ++Index;
1136       return;
1137     }
1138     // C++ initialization is handled later.
1139   } else if (isa<ImplicitValueInitExpr>(expr)) {
1140     // This happens during template instantiation when we see an InitListExpr
1141     // that we've already checked once.
1142     assert(SemaRef.Context.hasSameType(expr->getType(), ElemType) &&
1143            "found implicit initialization for the wrong type");
1144     if (!VerifyOnly)
1145       UpdateStructuredListElement(StructuredList, StructuredIndex, expr);
1146     ++Index;
1147     return;
1148   }
1149 
1150   if (SemaRef.getLangOpts().CPlusPlus) {
1151     // C++ [dcl.init.aggr]p2:
1152     //   Each member is copy-initialized from the corresponding
1153     //   initializer-clause.
1154 
1155     // FIXME: Better EqualLoc?
1156     InitializationKind Kind =
1157       InitializationKind::CreateCopy(expr->getLocStart(), SourceLocation());
1158     InitializationSequence Seq(SemaRef, Entity, Kind, expr,
1159                                /*TopLevelOfInitList*/ true);
1160 
1161     // C++14 [dcl.init.aggr]p13:
1162     //   If the assignment-expression can initialize a member, the member is
1163     //   initialized. Otherwise [...] brace elision is assumed
1164     //
1165     // Brace elision is never performed if the element is not an
1166     // assignment-expression.
1167     if (Seq || isa<InitListExpr>(expr)) {
1168       if (!VerifyOnly) {
1169         ExprResult Result =
1170           Seq.Perform(SemaRef, Entity, Kind, expr);
1171         if (Result.isInvalid())
1172           hadError = true;
1173 
1174         UpdateStructuredListElement(StructuredList, StructuredIndex,
1175                                     Result.getAs<Expr>());
1176       } else if (!Seq)
1177         hadError = true;
1178       ++Index;
1179       return;
1180     }
1181 
1182     // Fall through for subaggregate initialization
1183   } else if (ElemType->isScalarType() || ElemType->isAtomicType()) {
1184     // FIXME: Need to handle atomic aggregate types with implicit init lists.
1185     return CheckScalarType(Entity, IList, ElemType, Index,
1186                            StructuredList, StructuredIndex);
1187   } else if (const ArrayType *arrayType =
1188                  SemaRef.Context.getAsArrayType(ElemType)) {
1189     // arrayType can be incomplete if we're initializing a flexible
1190     // array member.  There's nothing we can do with the completed
1191     // type here, though.
1192 
1193     if (IsStringInit(expr, arrayType, SemaRef.Context) == SIF_None) {
1194       if (!VerifyOnly) {
1195         CheckStringInit(expr, ElemType, arrayType, SemaRef);
1196         UpdateStructuredListElement(StructuredList, StructuredIndex, expr);
1197       }
1198       ++Index;
1199       return;
1200     }
1201 
1202     // Fall through for subaggregate initialization.
1203 
1204   } else {
1205     assert((ElemType->isRecordType() || ElemType->isVectorType() ||
1206             ElemType->isClkEventT()) && "Unexpected type");
1207 
1208     // C99 6.7.8p13:
1209     //
1210     //   The initializer for a structure or union object that has
1211     //   automatic storage duration shall be either an initializer
1212     //   list as described below, or a single expression that has
1213     //   compatible structure or union type. In the latter case, the
1214     //   initial value of the object, including unnamed members, is
1215     //   that of the expression.
1216     ExprResult ExprRes = expr;
1217     if (SemaRef.CheckSingleAssignmentConstraints(
1218             ElemType, ExprRes, !VerifyOnly) != Sema::Incompatible) {
1219       if (ExprRes.isInvalid())
1220         hadError = true;
1221       else {
1222         ExprRes = SemaRef.DefaultFunctionArrayLvalueConversion(ExprRes.get());
1223           if (ExprRes.isInvalid())
1224             hadError = true;
1225       }
1226       UpdateStructuredListElement(StructuredList, StructuredIndex,
1227                                   ExprRes.getAs<Expr>());
1228       ++Index;
1229       return;
1230     }
1231     ExprRes.get();
1232     // Fall through for subaggregate initialization
1233   }
1234 
1235   // C++ [dcl.init.aggr]p12:
1236   //
1237   //   [...] Otherwise, if the member is itself a non-empty
1238   //   subaggregate, brace elision is assumed and the initializer is
1239   //   considered for the initialization of the first member of
1240   //   the subaggregate.
1241   // OpenCL vector initializer is handled elsewhere.
1242   if ((!SemaRef.getLangOpts().OpenCL && ElemType->isVectorType()) ||
1243       ElemType->isAggregateType()) {
1244     CheckImplicitInitList(Entity, IList, ElemType, Index, StructuredList,
1245                           StructuredIndex);
1246     ++StructuredIndex;
1247   } else {
1248     if (!VerifyOnly) {
1249       // We cannot initialize this element, so let
1250       // PerformCopyInitialization produce the appropriate diagnostic.
1251       SemaRef.PerformCopyInitialization(Entity, SourceLocation(), expr,
1252                                         /*TopLevelOfInitList=*/true);
1253     }
1254     hadError = true;
1255     ++Index;
1256     ++StructuredIndex;
1257   }
1258 }
1259 
1260 void InitListChecker::CheckComplexType(const InitializedEntity &Entity,
1261                                        InitListExpr *IList, QualType DeclType,
1262                                        unsigned &Index,
1263                                        InitListExpr *StructuredList,
1264                                        unsigned &StructuredIndex) {
1265   assert(Index == 0 && "Index in explicit init list must be zero");
1266 
1267   // As an extension, clang supports complex initializers, which initialize
1268   // a complex number component-wise.  When an explicit initializer list for
1269   // a complex number contains two two initializers, this extension kicks in:
1270   // it exepcts the initializer list to contain two elements convertible to
1271   // the element type of the complex type. The first element initializes
1272   // the real part, and the second element intitializes the imaginary part.
1273 
1274   if (IList->getNumInits() != 2)
1275     return CheckScalarType(Entity, IList, DeclType, Index, StructuredList,
1276                            StructuredIndex);
1277 
1278   // This is an extension in C.  (The builtin _Complex type does not exist
1279   // in the C++ standard.)
1280   if (!SemaRef.getLangOpts().CPlusPlus && !VerifyOnly)
1281     SemaRef.Diag(IList->getLocStart(), diag::ext_complex_component_init)
1282       << IList->getSourceRange();
1283 
1284   // Initialize the complex number.
1285   QualType elementType = DeclType->getAs<ComplexType>()->getElementType();
1286   InitializedEntity ElementEntity =
1287     InitializedEntity::InitializeElement(SemaRef.Context, 0, Entity);
1288 
1289   for (unsigned i = 0; i < 2; ++i) {
1290     ElementEntity.setElementIndex(Index);
1291     CheckSubElementType(ElementEntity, IList, elementType, Index,
1292                         StructuredList, StructuredIndex);
1293   }
1294 }
1295 
1296 void InitListChecker::CheckScalarType(const InitializedEntity &Entity,
1297                                       InitListExpr *IList, QualType DeclType,
1298                                       unsigned &Index,
1299                                       InitListExpr *StructuredList,
1300                                       unsigned &StructuredIndex) {
1301   if (Index >= IList->getNumInits()) {
1302     if (!VerifyOnly)
1303       SemaRef.Diag(IList->getLocStart(),
1304                    SemaRef.getLangOpts().CPlusPlus11 ?
1305                      diag::warn_cxx98_compat_empty_scalar_initializer :
1306                      diag::err_empty_scalar_initializer)
1307         << IList->getSourceRange();
1308     hadError = !SemaRef.getLangOpts().CPlusPlus11;
1309     ++Index;
1310     ++StructuredIndex;
1311     return;
1312   }
1313 
1314   Expr *expr = IList->getInit(Index);
1315   if (InitListExpr *SubIList = dyn_cast<InitListExpr>(expr)) {
1316     // FIXME: This is invalid, and accepting it causes overload resolution
1317     // to pick the wrong overload in some corner cases.
1318     if (!VerifyOnly)
1319       SemaRef.Diag(SubIList->getLocStart(),
1320                    diag::ext_many_braces_around_scalar_init)
1321         << SubIList->getSourceRange();
1322 
1323     CheckScalarType(Entity, SubIList, DeclType, Index, StructuredList,
1324                     StructuredIndex);
1325     return;
1326   } else if (isa<DesignatedInitExpr>(expr)) {
1327     if (!VerifyOnly)
1328       SemaRef.Diag(expr->getLocStart(),
1329                    diag::err_designator_for_scalar_init)
1330         << DeclType << expr->getSourceRange();
1331     hadError = true;
1332     ++Index;
1333     ++StructuredIndex;
1334     return;
1335   }
1336 
1337   if (VerifyOnly) {
1338     if (!SemaRef.CanPerformCopyInitialization(Entity,expr))
1339       hadError = true;
1340     ++Index;
1341     return;
1342   }
1343 
1344   ExprResult Result =
1345     SemaRef.PerformCopyInitialization(Entity, expr->getLocStart(), expr,
1346                                       /*TopLevelOfInitList=*/true);
1347 
1348   Expr *ResultExpr = nullptr;
1349 
1350   if (Result.isInvalid())
1351     hadError = true; // types weren't compatible.
1352   else {
1353     ResultExpr = Result.getAs<Expr>();
1354 
1355     if (ResultExpr != expr) {
1356       // The type was promoted, update initializer list.
1357       IList->setInit(Index, ResultExpr);
1358     }
1359   }
1360   if (hadError)
1361     ++StructuredIndex;
1362   else
1363     UpdateStructuredListElement(StructuredList, StructuredIndex, ResultExpr);
1364   ++Index;
1365 }
1366 
1367 void InitListChecker::CheckReferenceType(const InitializedEntity &Entity,
1368                                          InitListExpr *IList, QualType DeclType,
1369                                          unsigned &Index,
1370                                          InitListExpr *StructuredList,
1371                                          unsigned &StructuredIndex) {
1372   if (Index >= IList->getNumInits()) {
1373     // FIXME: It would be wonderful if we could point at the actual member. In
1374     // general, it would be useful to pass location information down the stack,
1375     // so that we know the location (or decl) of the "current object" being
1376     // initialized.
1377     if (!VerifyOnly)
1378       SemaRef.Diag(IList->getLocStart(),
1379                     diag::err_init_reference_member_uninitialized)
1380         << DeclType
1381         << IList->getSourceRange();
1382     hadError = true;
1383     ++Index;
1384     ++StructuredIndex;
1385     return;
1386   }
1387 
1388   Expr *expr = IList->getInit(Index);
1389   if (isa<InitListExpr>(expr) && !SemaRef.getLangOpts().CPlusPlus11) {
1390     if (!VerifyOnly)
1391       SemaRef.Diag(IList->getLocStart(), diag::err_init_non_aggr_init_list)
1392         << DeclType << IList->getSourceRange();
1393     hadError = true;
1394     ++Index;
1395     ++StructuredIndex;
1396     return;
1397   }
1398 
1399   if (VerifyOnly) {
1400     if (!SemaRef.CanPerformCopyInitialization(Entity,expr))
1401       hadError = true;
1402     ++Index;
1403     return;
1404   }
1405 
1406   ExprResult Result =
1407       SemaRef.PerformCopyInitialization(Entity, expr->getLocStart(), expr,
1408                                         /*TopLevelOfInitList=*/true);
1409 
1410   if (Result.isInvalid())
1411     hadError = true;
1412 
1413   expr = Result.getAs<Expr>();
1414   IList->setInit(Index, expr);
1415 
1416   if (hadError)
1417     ++StructuredIndex;
1418   else
1419     UpdateStructuredListElement(StructuredList, StructuredIndex, expr);
1420   ++Index;
1421 }
1422 
1423 void InitListChecker::CheckVectorType(const InitializedEntity &Entity,
1424                                       InitListExpr *IList, QualType DeclType,
1425                                       unsigned &Index,
1426                                       InitListExpr *StructuredList,
1427                                       unsigned &StructuredIndex) {
1428   const VectorType *VT = DeclType->getAs<VectorType>();
1429   unsigned maxElements = VT->getNumElements();
1430   unsigned numEltsInit = 0;
1431   QualType elementType = VT->getElementType();
1432 
1433   if (Index >= IList->getNumInits()) {
1434     // Make sure the element type can be value-initialized.
1435     if (VerifyOnly)
1436       CheckEmptyInitializable(
1437           InitializedEntity::InitializeElement(SemaRef.Context, 0, Entity),
1438           IList->getLocEnd());
1439     return;
1440   }
1441 
1442   if (!SemaRef.getLangOpts().OpenCL) {
1443     // If the initializing element is a vector, try to copy-initialize
1444     // instead of breaking it apart (which is doomed to failure anyway).
1445     Expr *Init = IList->getInit(Index);
1446     if (!isa<InitListExpr>(Init) && Init->getType()->isVectorType()) {
1447       if (VerifyOnly) {
1448         if (!SemaRef.CanPerformCopyInitialization(Entity, Init))
1449           hadError = true;
1450         ++Index;
1451         return;
1452       }
1453 
1454   ExprResult Result =
1455       SemaRef.PerformCopyInitialization(Entity, Init->getLocStart(), Init,
1456                                         /*TopLevelOfInitList=*/true);
1457 
1458       Expr *ResultExpr = nullptr;
1459       if (Result.isInvalid())
1460         hadError = true; // types weren't compatible.
1461       else {
1462         ResultExpr = Result.getAs<Expr>();
1463 
1464         if (ResultExpr != Init) {
1465           // The type was promoted, update initializer list.
1466           IList->setInit(Index, ResultExpr);
1467         }
1468       }
1469       if (hadError)
1470         ++StructuredIndex;
1471       else
1472         UpdateStructuredListElement(StructuredList, StructuredIndex,
1473                                     ResultExpr);
1474       ++Index;
1475       return;
1476     }
1477 
1478     InitializedEntity ElementEntity =
1479       InitializedEntity::InitializeElement(SemaRef.Context, 0, Entity);
1480 
1481     for (unsigned i = 0; i < maxElements; ++i, ++numEltsInit) {
1482       // Don't attempt to go past the end of the init list
1483       if (Index >= IList->getNumInits()) {
1484         if (VerifyOnly)
1485           CheckEmptyInitializable(ElementEntity, IList->getLocEnd());
1486         break;
1487       }
1488 
1489       ElementEntity.setElementIndex(Index);
1490       CheckSubElementType(ElementEntity, IList, elementType, Index,
1491                           StructuredList, StructuredIndex);
1492     }
1493 
1494     if (VerifyOnly)
1495       return;
1496 
1497     bool isBigEndian = SemaRef.Context.getTargetInfo().isBigEndian();
1498     const VectorType *T = Entity.getType()->getAs<VectorType>();
1499     if (isBigEndian && (T->getVectorKind() == VectorType::NeonVector ||
1500                         T->getVectorKind() == VectorType::NeonPolyVector)) {
1501       // The ability to use vector initializer lists is a GNU vector extension
1502       // and is unrelated to the NEON intrinsics in arm_neon.h. On little
1503       // endian machines it works fine, however on big endian machines it
1504       // exhibits surprising behaviour:
1505       //
1506       //   uint32x2_t x = {42, 64};
1507       //   return vget_lane_u32(x, 0); // Will return 64.
1508       //
1509       // Because of this, explicitly call out that it is non-portable.
1510       //
1511       SemaRef.Diag(IList->getLocStart(),
1512                    diag::warn_neon_vector_initializer_non_portable);
1513 
1514       const char *typeCode;
1515       unsigned typeSize = SemaRef.Context.getTypeSize(elementType);
1516 
1517       if (elementType->isFloatingType())
1518         typeCode = "f";
1519       else if (elementType->isSignedIntegerType())
1520         typeCode = "s";
1521       else if (elementType->isUnsignedIntegerType())
1522         typeCode = "u";
1523       else
1524         llvm_unreachable("Invalid element type!");
1525 
1526       SemaRef.Diag(IList->getLocStart(),
1527                    SemaRef.Context.getTypeSize(VT) > 64 ?
1528                    diag::note_neon_vector_initializer_non_portable_q :
1529                    diag::note_neon_vector_initializer_non_portable)
1530         << typeCode << typeSize;
1531     }
1532 
1533     return;
1534   }
1535 
1536   InitializedEntity ElementEntity =
1537     InitializedEntity::InitializeElement(SemaRef.Context, 0, Entity);
1538 
1539   // OpenCL initializers allows vectors to be constructed from vectors.
1540   for (unsigned i = 0; i < maxElements; ++i) {
1541     // Don't attempt to go past the end of the init list
1542     if (Index >= IList->getNumInits())
1543       break;
1544 
1545     ElementEntity.setElementIndex(Index);
1546 
1547     QualType IType = IList->getInit(Index)->getType();
1548     if (!IType->isVectorType()) {
1549       CheckSubElementType(ElementEntity, IList, elementType, Index,
1550                           StructuredList, StructuredIndex);
1551       ++numEltsInit;
1552     } else {
1553       QualType VecType;
1554       const VectorType *IVT = IType->getAs<VectorType>();
1555       unsigned numIElts = IVT->getNumElements();
1556 
1557       if (IType->isExtVectorType())
1558         VecType = SemaRef.Context.getExtVectorType(elementType, numIElts);
1559       else
1560         VecType = SemaRef.Context.getVectorType(elementType, numIElts,
1561                                                 IVT->getVectorKind());
1562       CheckSubElementType(ElementEntity, IList, VecType, Index,
1563                           StructuredList, StructuredIndex);
1564       numEltsInit += numIElts;
1565     }
1566   }
1567 
1568   // OpenCL requires all elements to be initialized.
1569   if (numEltsInit != maxElements) {
1570     if (!VerifyOnly)
1571       SemaRef.Diag(IList->getLocStart(),
1572                    diag::err_vector_incorrect_num_initializers)
1573         << (numEltsInit < maxElements) << maxElements << numEltsInit;
1574     hadError = true;
1575   }
1576 }
1577 
1578 void InitListChecker::CheckArrayType(const InitializedEntity &Entity,
1579                                      InitListExpr *IList, QualType &DeclType,
1580                                      llvm::APSInt elementIndex,
1581                                      bool SubobjectIsDesignatorContext,
1582                                      unsigned &Index,
1583                                      InitListExpr *StructuredList,
1584                                      unsigned &StructuredIndex) {
1585   const ArrayType *arrayType = SemaRef.Context.getAsArrayType(DeclType);
1586 
1587   // Check for the special-case of initializing an array with a string.
1588   if (Index < IList->getNumInits()) {
1589     if (IsStringInit(IList->getInit(Index), arrayType, SemaRef.Context) ==
1590         SIF_None) {
1591       // We place the string literal directly into the resulting
1592       // initializer list. This is the only place where the structure
1593       // of the structured initializer list doesn't match exactly,
1594       // because doing so would involve allocating one character
1595       // constant for each string.
1596       if (!VerifyOnly) {
1597         CheckStringInit(IList->getInit(Index), DeclType, arrayType, SemaRef);
1598         UpdateStructuredListElement(StructuredList, StructuredIndex,
1599                                     IList->getInit(Index));
1600         StructuredList->resizeInits(SemaRef.Context, StructuredIndex);
1601       }
1602       ++Index;
1603       return;
1604     }
1605   }
1606   if (const VariableArrayType *VAT = dyn_cast<VariableArrayType>(arrayType)) {
1607     // Check for VLAs; in standard C it would be possible to check this
1608     // earlier, but I don't know where clang accepts VLAs (gcc accepts
1609     // them in all sorts of strange places).
1610     if (!VerifyOnly)
1611       SemaRef.Diag(VAT->getSizeExpr()->getLocStart(),
1612                     diag::err_variable_object_no_init)
1613         << VAT->getSizeExpr()->getSourceRange();
1614     hadError = true;
1615     ++Index;
1616     ++StructuredIndex;
1617     return;
1618   }
1619 
1620   // We might know the maximum number of elements in advance.
1621   llvm::APSInt maxElements(elementIndex.getBitWidth(),
1622                            elementIndex.isUnsigned());
1623   bool maxElementsKnown = false;
1624   if (const ConstantArrayType *CAT = dyn_cast<ConstantArrayType>(arrayType)) {
1625     maxElements = CAT->getSize();
1626     elementIndex = elementIndex.extOrTrunc(maxElements.getBitWidth());
1627     elementIndex.setIsUnsigned(maxElements.isUnsigned());
1628     maxElementsKnown = true;
1629   }
1630 
1631   QualType elementType = arrayType->getElementType();
1632   while (Index < IList->getNumInits()) {
1633     Expr *Init = IList->getInit(Index);
1634     if (DesignatedInitExpr *DIE = dyn_cast<DesignatedInitExpr>(Init)) {
1635       // If we're not the subobject that matches up with the '{' for
1636       // the designator, we shouldn't be handling the
1637       // designator. Return immediately.
1638       if (!SubobjectIsDesignatorContext)
1639         return;
1640 
1641       // Handle this designated initializer. elementIndex will be
1642       // updated to be the next array element we'll initialize.
1643       if (CheckDesignatedInitializer(Entity, IList, DIE, 0,
1644                                      DeclType, nullptr, &elementIndex, Index,
1645                                      StructuredList, StructuredIndex, true,
1646                                      false)) {
1647         hadError = true;
1648         continue;
1649       }
1650 
1651       if (elementIndex.getBitWidth() > maxElements.getBitWidth())
1652         maxElements = maxElements.extend(elementIndex.getBitWidth());
1653       else if (elementIndex.getBitWidth() < maxElements.getBitWidth())
1654         elementIndex = elementIndex.extend(maxElements.getBitWidth());
1655       elementIndex.setIsUnsigned(maxElements.isUnsigned());
1656 
1657       // If the array is of incomplete type, keep track of the number of
1658       // elements in the initializer.
1659       if (!maxElementsKnown && elementIndex > maxElements)
1660         maxElements = elementIndex;
1661 
1662       continue;
1663     }
1664 
1665     // If we know the maximum number of elements, and we've already
1666     // hit it, stop consuming elements in the initializer list.
1667     if (maxElementsKnown && elementIndex == maxElements)
1668       break;
1669 
1670     InitializedEntity ElementEntity =
1671       InitializedEntity::InitializeElement(SemaRef.Context, StructuredIndex,
1672                                            Entity);
1673     // Check this element.
1674     CheckSubElementType(ElementEntity, IList, elementType, Index,
1675                         StructuredList, StructuredIndex);
1676     ++elementIndex;
1677 
1678     // If the array is of incomplete type, keep track of the number of
1679     // elements in the initializer.
1680     if (!maxElementsKnown && elementIndex > maxElements)
1681       maxElements = elementIndex;
1682   }
1683   if (!hadError && DeclType->isIncompleteArrayType() && !VerifyOnly) {
1684     // If this is an incomplete array type, the actual type needs to
1685     // be calculated here.
1686     llvm::APSInt Zero(maxElements.getBitWidth(), maxElements.isUnsigned());
1687     if (maxElements == Zero) {
1688       // Sizing an array implicitly to zero is not allowed by ISO C,
1689       // but is supported by GNU.
1690       SemaRef.Diag(IList->getLocStart(),
1691                     diag::ext_typecheck_zero_array_size);
1692     }
1693 
1694     DeclType = SemaRef.Context.getConstantArrayType(elementType, maxElements,
1695                                                      ArrayType::Normal, 0);
1696   }
1697   if (!hadError && VerifyOnly) {
1698     // If there are any members of the array that get value-initialized, check
1699     // that is possible. That happens if we know the bound and don't have
1700     // enough elements, or if we're performing an array new with an unknown
1701     // bound.
1702     // FIXME: This needs to detect holes left by designated initializers too.
1703     if ((maxElementsKnown && elementIndex < maxElements) ||
1704         Entity.isVariableLengthArrayNew())
1705       CheckEmptyInitializable(InitializedEntity::InitializeElement(
1706                                                   SemaRef.Context, 0, Entity),
1707                               IList->getLocEnd());
1708   }
1709 }
1710 
1711 bool InitListChecker::CheckFlexibleArrayInit(const InitializedEntity &Entity,
1712                                              Expr *InitExpr,
1713                                              FieldDecl *Field,
1714                                              bool TopLevelObject) {
1715   // Handle GNU flexible array initializers.
1716   unsigned FlexArrayDiag;
1717   if (isa<InitListExpr>(InitExpr) &&
1718       cast<InitListExpr>(InitExpr)->getNumInits() == 0) {
1719     // Empty flexible array init always allowed as an extension
1720     FlexArrayDiag = diag::ext_flexible_array_init;
1721   } else if (SemaRef.getLangOpts().CPlusPlus) {
1722     // Disallow flexible array init in C++; it is not required for gcc
1723     // compatibility, and it needs work to IRGen correctly in general.
1724     FlexArrayDiag = diag::err_flexible_array_init;
1725   } else if (!TopLevelObject) {
1726     // Disallow flexible array init on non-top-level object
1727     FlexArrayDiag = diag::err_flexible_array_init;
1728   } else if (Entity.getKind() != InitializedEntity::EK_Variable) {
1729     // Disallow flexible array init on anything which is not a variable.
1730     FlexArrayDiag = diag::err_flexible_array_init;
1731   } else if (cast<VarDecl>(Entity.getDecl())->hasLocalStorage()) {
1732     // Disallow flexible array init on local variables.
1733     FlexArrayDiag = diag::err_flexible_array_init;
1734   } else {
1735     // Allow other cases.
1736     FlexArrayDiag = diag::ext_flexible_array_init;
1737   }
1738 
1739   if (!VerifyOnly) {
1740     SemaRef.Diag(InitExpr->getLocStart(),
1741                  FlexArrayDiag)
1742       << InitExpr->getLocStart();
1743     SemaRef.Diag(Field->getLocation(), diag::note_flexible_array_member)
1744       << Field;
1745   }
1746 
1747   return FlexArrayDiag != diag::ext_flexible_array_init;
1748 }
1749 
1750 void InitListChecker::CheckStructUnionTypes(
1751     const InitializedEntity &Entity, InitListExpr *IList, QualType DeclType,
1752     CXXRecordDecl::base_class_range Bases, RecordDecl::field_iterator Field,
1753     bool SubobjectIsDesignatorContext, unsigned &Index,
1754     InitListExpr *StructuredList, unsigned &StructuredIndex,
1755     bool TopLevelObject) {
1756   RecordDecl *structDecl = DeclType->getAs<RecordType>()->getDecl();
1757 
1758   // If the record is invalid, some of it's members are invalid. To avoid
1759   // confusion, we forgo checking the intializer for the entire record.
1760   if (structDecl->isInvalidDecl()) {
1761     // Assume it was supposed to consume a single initializer.
1762     ++Index;
1763     hadError = true;
1764     return;
1765   }
1766 
1767   if (DeclType->isUnionType() && IList->getNumInits() == 0) {
1768     RecordDecl *RD = DeclType->getAs<RecordType>()->getDecl();
1769 
1770     // If there's a default initializer, use it.
1771     if (isa<CXXRecordDecl>(RD) && cast<CXXRecordDecl>(RD)->hasInClassInitializer()) {
1772       if (VerifyOnly)
1773         return;
1774       for (RecordDecl::field_iterator FieldEnd = RD->field_end();
1775            Field != FieldEnd; ++Field) {
1776         if (Field->hasInClassInitializer()) {
1777           StructuredList->setInitializedFieldInUnion(*Field);
1778           // FIXME: Actually build a CXXDefaultInitExpr?
1779           return;
1780         }
1781       }
1782     }
1783 
1784     // Value-initialize the first member of the union that isn't an unnamed
1785     // bitfield.
1786     for (RecordDecl::field_iterator FieldEnd = RD->field_end();
1787          Field != FieldEnd; ++Field) {
1788       if (!Field->isUnnamedBitfield()) {
1789         if (VerifyOnly)
1790           CheckEmptyInitializable(
1791               InitializedEntity::InitializeMember(*Field, &Entity),
1792               IList->getLocEnd());
1793         else
1794           StructuredList->setInitializedFieldInUnion(*Field);
1795         break;
1796       }
1797     }
1798     return;
1799   }
1800 
1801   bool InitializedSomething = false;
1802 
1803   // If we have any base classes, they are initialized prior to the fields.
1804   for (auto &Base : Bases) {
1805     Expr *Init = Index < IList->getNumInits() ? IList->getInit(Index) : nullptr;
1806     SourceLocation InitLoc = Init ? Init->getLocStart() : IList->getLocEnd();
1807 
1808     // Designated inits always initialize fields, so if we see one, all
1809     // remaining base classes have no explicit initializer.
1810     if (Init && isa<DesignatedInitExpr>(Init))
1811       Init = nullptr;
1812 
1813     InitializedEntity BaseEntity = InitializedEntity::InitializeBase(
1814         SemaRef.Context, &Base, false, &Entity);
1815     if (Init) {
1816       CheckSubElementType(BaseEntity, IList, Base.getType(), Index,
1817                           StructuredList, StructuredIndex);
1818       InitializedSomething = true;
1819     } else if (VerifyOnly) {
1820       CheckEmptyInitializable(BaseEntity, InitLoc);
1821     }
1822   }
1823 
1824   // If structDecl is a forward declaration, this loop won't do
1825   // anything except look at designated initializers; That's okay,
1826   // because an error should get printed out elsewhere. It might be
1827   // worthwhile to skip over the rest of the initializer, though.
1828   RecordDecl *RD = DeclType->getAs<RecordType>()->getDecl();
1829   RecordDecl::field_iterator FieldEnd = RD->field_end();
1830   bool CheckForMissingFields = true;
1831   while (Index < IList->getNumInits()) {
1832     Expr *Init = IList->getInit(Index);
1833 
1834     if (DesignatedInitExpr *DIE = dyn_cast<DesignatedInitExpr>(Init)) {
1835       // If we're not the subobject that matches up with the '{' for
1836       // the designator, we shouldn't be handling the
1837       // designator. Return immediately.
1838       if (!SubobjectIsDesignatorContext)
1839         return;
1840 
1841       // Handle this designated initializer. Field will be updated to
1842       // the next field that we'll be initializing.
1843       if (CheckDesignatedInitializer(Entity, IList, DIE, 0,
1844                                      DeclType, &Field, nullptr, Index,
1845                                      StructuredList, StructuredIndex,
1846                                      true, TopLevelObject))
1847         hadError = true;
1848 
1849       InitializedSomething = true;
1850 
1851       // Disable check for missing fields when designators are used.
1852       // This matches gcc behaviour.
1853       CheckForMissingFields = false;
1854       continue;
1855     }
1856 
1857     if (Field == FieldEnd) {
1858       // We've run out of fields. We're done.
1859       break;
1860     }
1861 
1862     // We've already initialized a member of a union. We're done.
1863     if (InitializedSomething && DeclType->isUnionType())
1864       break;
1865 
1866     // If we've hit the flexible array member at the end, we're done.
1867     if (Field->getType()->isIncompleteArrayType())
1868       break;
1869 
1870     if (Field->isUnnamedBitfield()) {
1871       // Don't initialize unnamed bitfields, e.g. "int : 20;"
1872       ++Field;
1873       continue;
1874     }
1875 
1876     // Make sure we can use this declaration.
1877     bool InvalidUse;
1878     if (VerifyOnly)
1879       InvalidUse = !SemaRef.CanUseDecl(*Field, TreatUnavailableAsInvalid);
1880     else
1881       InvalidUse = SemaRef.DiagnoseUseOfDecl(*Field,
1882                                           IList->getInit(Index)->getLocStart());
1883     if (InvalidUse) {
1884       ++Index;
1885       ++Field;
1886       hadError = true;
1887       continue;
1888     }
1889 
1890     InitializedEntity MemberEntity =
1891       InitializedEntity::InitializeMember(*Field, &Entity);
1892     CheckSubElementType(MemberEntity, IList, Field->getType(), Index,
1893                         StructuredList, StructuredIndex);
1894     InitializedSomething = true;
1895 
1896     if (DeclType->isUnionType() && !VerifyOnly) {
1897       // Initialize the first field within the union.
1898       StructuredList->setInitializedFieldInUnion(*Field);
1899     }
1900 
1901     ++Field;
1902   }
1903 
1904   // Emit warnings for missing struct field initializers.
1905   if (!VerifyOnly && InitializedSomething && CheckForMissingFields &&
1906       Field != FieldEnd && !Field->getType()->isIncompleteArrayType() &&
1907       !DeclType->isUnionType()) {
1908     // It is possible we have one or more unnamed bitfields remaining.
1909     // Find first (if any) named field and emit warning.
1910     for (RecordDecl::field_iterator it = Field, end = RD->field_end();
1911          it != end; ++it) {
1912       if (!it->isUnnamedBitfield() && !it->hasInClassInitializer()) {
1913         SemaRef.Diag(IList->getSourceRange().getEnd(),
1914                      diag::warn_missing_field_initializers) << *it;
1915         break;
1916       }
1917     }
1918   }
1919 
1920   // Check that any remaining fields can be value-initialized.
1921   if (VerifyOnly && Field != FieldEnd && !DeclType->isUnionType() &&
1922       !Field->getType()->isIncompleteArrayType()) {
1923     // FIXME: Should check for holes left by designated initializers too.
1924     for (; Field != FieldEnd && !hadError; ++Field) {
1925       if (!Field->isUnnamedBitfield() && !Field->hasInClassInitializer())
1926         CheckEmptyInitializable(
1927             InitializedEntity::InitializeMember(*Field, &Entity),
1928             IList->getLocEnd());
1929     }
1930   }
1931 
1932   if (Field == FieldEnd || !Field->getType()->isIncompleteArrayType() ||
1933       Index >= IList->getNumInits())
1934     return;
1935 
1936   if (CheckFlexibleArrayInit(Entity, IList->getInit(Index), *Field,
1937                              TopLevelObject)) {
1938     hadError = true;
1939     ++Index;
1940     return;
1941   }
1942 
1943   InitializedEntity MemberEntity =
1944     InitializedEntity::InitializeMember(*Field, &Entity);
1945 
1946   if (isa<InitListExpr>(IList->getInit(Index)))
1947     CheckSubElementType(MemberEntity, IList, Field->getType(), Index,
1948                         StructuredList, StructuredIndex);
1949   else
1950     CheckImplicitInitList(MemberEntity, IList, Field->getType(), Index,
1951                           StructuredList, StructuredIndex);
1952 }
1953 
1954 /// \brief Expand a field designator that refers to a member of an
1955 /// anonymous struct or union into a series of field designators that
1956 /// refers to the field within the appropriate subobject.
1957 ///
1958 static void ExpandAnonymousFieldDesignator(Sema &SemaRef,
1959                                            DesignatedInitExpr *DIE,
1960                                            unsigned DesigIdx,
1961                                            IndirectFieldDecl *IndirectField) {
1962   typedef DesignatedInitExpr::Designator Designator;
1963 
1964   // Build the replacement designators.
1965   SmallVector<Designator, 4> Replacements;
1966   for (IndirectFieldDecl::chain_iterator PI = IndirectField->chain_begin(),
1967        PE = IndirectField->chain_end(); PI != PE; ++PI) {
1968     if (PI + 1 == PE)
1969       Replacements.push_back(Designator((IdentifierInfo *)nullptr,
1970                                     DIE->getDesignator(DesigIdx)->getDotLoc(),
1971                                 DIE->getDesignator(DesigIdx)->getFieldLoc()));
1972     else
1973       Replacements.push_back(Designator((IdentifierInfo *)nullptr,
1974                                         SourceLocation(), SourceLocation()));
1975     assert(isa<FieldDecl>(*PI));
1976     Replacements.back().setField(cast<FieldDecl>(*PI));
1977   }
1978 
1979   // Expand the current designator into the set of replacement
1980   // designators, so we have a full subobject path down to where the
1981   // member of the anonymous struct/union is actually stored.
1982   DIE->ExpandDesignator(SemaRef.Context, DesigIdx, &Replacements[0],
1983                         &Replacements[0] + Replacements.size());
1984 }
1985 
1986 static DesignatedInitExpr *CloneDesignatedInitExpr(Sema &SemaRef,
1987                                                    DesignatedInitExpr *DIE) {
1988   unsigned NumIndexExprs = DIE->getNumSubExprs() - 1;
1989   SmallVector<Expr*, 4> IndexExprs(NumIndexExprs);
1990   for (unsigned I = 0; I < NumIndexExprs; ++I)
1991     IndexExprs[I] = DIE->getSubExpr(I + 1);
1992   return DesignatedInitExpr::Create(SemaRef.Context, DIE->designators(),
1993                                     IndexExprs,
1994                                     DIE->getEqualOrColonLoc(),
1995                                     DIE->usesGNUSyntax(), DIE->getInit());
1996 }
1997 
1998 namespace {
1999 
2000 // Callback to only accept typo corrections that are for field members of
2001 // the given struct or union.
2002 class FieldInitializerValidatorCCC : public CorrectionCandidateCallback {
2003  public:
2004   explicit FieldInitializerValidatorCCC(RecordDecl *RD)
2005       : Record(RD) {}
2006 
2007   bool ValidateCandidate(const TypoCorrection &candidate) override {
2008     FieldDecl *FD = candidate.getCorrectionDeclAs<FieldDecl>();
2009     return FD && FD->getDeclContext()->getRedeclContext()->Equals(Record);
2010   }
2011 
2012  private:
2013   RecordDecl *Record;
2014 };
2015 
2016 } // end anonymous namespace
2017 
2018 /// @brief Check the well-formedness of a C99 designated initializer.
2019 ///
2020 /// Determines whether the designated initializer @p DIE, which
2021 /// resides at the given @p Index within the initializer list @p
2022 /// IList, is well-formed for a current object of type @p DeclType
2023 /// (C99 6.7.8). The actual subobject that this designator refers to
2024 /// within the current subobject is returned in either
2025 /// @p NextField or @p NextElementIndex (whichever is appropriate).
2026 ///
2027 /// @param IList  The initializer list in which this designated
2028 /// initializer occurs.
2029 ///
2030 /// @param DIE The designated initializer expression.
2031 ///
2032 /// @param DesigIdx  The index of the current designator.
2033 ///
2034 /// @param CurrentObjectType The type of the "current object" (C99 6.7.8p17),
2035 /// into which the designation in @p DIE should refer.
2036 ///
2037 /// @param NextField  If non-NULL and the first designator in @p DIE is
2038 /// a field, this will be set to the field declaration corresponding
2039 /// to the field named by the designator.
2040 ///
2041 /// @param NextElementIndex  If non-NULL and the first designator in @p
2042 /// DIE is an array designator or GNU array-range designator, this
2043 /// will be set to the last index initialized by this designator.
2044 ///
2045 /// @param Index  Index into @p IList where the designated initializer
2046 /// @p DIE occurs.
2047 ///
2048 /// @param StructuredList  The initializer list expression that
2049 /// describes all of the subobject initializers in the order they'll
2050 /// actually be initialized.
2051 ///
2052 /// @returns true if there was an error, false otherwise.
2053 bool
2054 InitListChecker::CheckDesignatedInitializer(const InitializedEntity &Entity,
2055                                             InitListExpr *IList,
2056                                             DesignatedInitExpr *DIE,
2057                                             unsigned DesigIdx,
2058                                             QualType &CurrentObjectType,
2059                                           RecordDecl::field_iterator *NextField,
2060                                             llvm::APSInt *NextElementIndex,
2061                                             unsigned &Index,
2062                                             InitListExpr *StructuredList,
2063                                             unsigned &StructuredIndex,
2064                                             bool FinishSubobjectInit,
2065                                             bool TopLevelObject) {
2066   if (DesigIdx == DIE->size()) {
2067     // Check the actual initialization for the designated object type.
2068     bool prevHadError = hadError;
2069 
2070     // Temporarily remove the designator expression from the
2071     // initializer list that the child calls see, so that we don't try
2072     // to re-process the designator.
2073     unsigned OldIndex = Index;
2074     IList->setInit(OldIndex, DIE->getInit());
2075 
2076     CheckSubElementType(Entity, IList, CurrentObjectType, Index,
2077                         StructuredList, StructuredIndex);
2078 
2079     // Restore the designated initializer expression in the syntactic
2080     // form of the initializer list.
2081     if (IList->getInit(OldIndex) != DIE->getInit())
2082       DIE->setInit(IList->getInit(OldIndex));
2083     IList->setInit(OldIndex, DIE);
2084 
2085     return hadError && !prevHadError;
2086   }
2087 
2088   DesignatedInitExpr::Designator *D = DIE->getDesignator(DesigIdx);
2089   bool IsFirstDesignator = (DesigIdx == 0);
2090   if (!VerifyOnly) {
2091     assert((IsFirstDesignator || StructuredList) &&
2092            "Need a non-designated initializer list to start from");
2093 
2094     // Determine the structural initializer list that corresponds to the
2095     // current subobject.
2096     if (IsFirstDesignator)
2097       StructuredList = SyntacticToSemantic.lookup(IList);
2098     else {
2099       Expr *ExistingInit = StructuredIndex < StructuredList->getNumInits() ?
2100           StructuredList->getInit(StructuredIndex) : nullptr;
2101       if (!ExistingInit && StructuredList->hasArrayFiller())
2102         ExistingInit = StructuredList->getArrayFiller();
2103 
2104       if (!ExistingInit)
2105         StructuredList =
2106           getStructuredSubobjectInit(IList, Index, CurrentObjectType,
2107                                      StructuredList, StructuredIndex,
2108                                      SourceRange(D->getLocStart(),
2109                                                  DIE->getLocEnd()));
2110       else if (InitListExpr *Result = dyn_cast<InitListExpr>(ExistingInit))
2111         StructuredList = Result;
2112       else {
2113         if (DesignatedInitUpdateExpr *E =
2114                 dyn_cast<DesignatedInitUpdateExpr>(ExistingInit))
2115           StructuredList = E->getUpdater();
2116         else {
2117           DesignatedInitUpdateExpr *DIUE =
2118               new (SemaRef.Context) DesignatedInitUpdateExpr(SemaRef.Context,
2119                                         D->getLocStart(), ExistingInit,
2120                                         DIE->getLocEnd());
2121           StructuredList->updateInit(SemaRef.Context, StructuredIndex, DIUE);
2122           StructuredList = DIUE->getUpdater();
2123         }
2124 
2125         // We need to check on source range validity because the previous
2126         // initializer does not have to be an explicit initializer. e.g.,
2127         //
2128         // struct P { int a, b; };
2129         // struct PP { struct P p } l = { { .a = 2 }, .p.b = 3 };
2130         //
2131         // There is an overwrite taking place because the first braced initializer
2132         // list "{ .a = 2 }" already provides value for .p.b (which is zero).
2133         if (ExistingInit->getSourceRange().isValid()) {
2134           // We are creating an initializer list that initializes the
2135           // subobjects of the current object, but there was already an
2136           // initialization that completely initialized the current
2137           // subobject, e.g., by a compound literal:
2138           //
2139           // struct X { int a, b; };
2140           // struct X xs[] = { [0] = (struct X) { 1, 2 }, [0].b = 3 };
2141           //
2142           // Here, xs[0].a == 0 and xs[0].b == 3, since the second,
2143           // designated initializer re-initializes the whole
2144           // subobject [0], overwriting previous initializers.
2145           SemaRef.Diag(D->getLocStart(),
2146                        diag::warn_subobject_initializer_overrides)
2147             << SourceRange(D->getLocStart(), DIE->getLocEnd());
2148 
2149           SemaRef.Diag(ExistingInit->getLocStart(),
2150                        diag::note_previous_initializer)
2151             << /*FIXME:has side effects=*/0
2152             << ExistingInit->getSourceRange();
2153         }
2154       }
2155     }
2156     assert(StructuredList && "Expected a structured initializer list");
2157   }
2158 
2159   if (D->isFieldDesignator()) {
2160     // C99 6.7.8p7:
2161     //
2162     //   If a designator has the form
2163     //
2164     //      . identifier
2165     //
2166     //   then the current object (defined below) shall have
2167     //   structure or union type and the identifier shall be the
2168     //   name of a member of that type.
2169     const RecordType *RT = CurrentObjectType->getAs<RecordType>();
2170     if (!RT) {
2171       SourceLocation Loc = D->getDotLoc();
2172       if (Loc.isInvalid())
2173         Loc = D->getFieldLoc();
2174       if (!VerifyOnly)
2175         SemaRef.Diag(Loc, diag::err_field_designator_non_aggr)
2176           << SemaRef.getLangOpts().CPlusPlus << CurrentObjectType;
2177       ++Index;
2178       return true;
2179     }
2180 
2181     FieldDecl *KnownField = D->getField();
2182     if (!KnownField) {
2183       IdentifierInfo *FieldName = D->getFieldName();
2184       DeclContext::lookup_result Lookup = RT->getDecl()->lookup(FieldName);
2185       for (NamedDecl *ND : Lookup) {
2186         if (auto *FD = dyn_cast<FieldDecl>(ND)) {
2187           KnownField = FD;
2188           break;
2189         }
2190         if (auto *IFD = dyn_cast<IndirectFieldDecl>(ND)) {
2191           // In verify mode, don't modify the original.
2192           if (VerifyOnly)
2193             DIE = CloneDesignatedInitExpr(SemaRef, DIE);
2194           ExpandAnonymousFieldDesignator(SemaRef, DIE, DesigIdx, IFD);
2195           D = DIE->getDesignator(DesigIdx);
2196           KnownField = cast<FieldDecl>(*IFD->chain_begin());
2197           break;
2198         }
2199       }
2200       if (!KnownField) {
2201         if (VerifyOnly) {
2202           ++Index;
2203           return true;  // No typo correction when just trying this out.
2204         }
2205 
2206         // Name lookup found something, but it wasn't a field.
2207         if (!Lookup.empty()) {
2208           SemaRef.Diag(D->getFieldLoc(), diag::err_field_designator_nonfield)
2209             << FieldName;
2210           SemaRef.Diag(Lookup.front()->getLocation(),
2211                        diag::note_field_designator_found);
2212           ++Index;
2213           return true;
2214         }
2215 
2216         // Name lookup didn't find anything.
2217         // Determine whether this was a typo for another field name.
2218         if (TypoCorrection Corrected = SemaRef.CorrectTypo(
2219                 DeclarationNameInfo(FieldName, D->getFieldLoc()),
2220                 Sema::LookupMemberName, /*Scope=*/nullptr, /*SS=*/nullptr,
2221                 llvm::make_unique<FieldInitializerValidatorCCC>(RT->getDecl()),
2222                 Sema::CTK_ErrorRecovery, RT->getDecl())) {
2223           SemaRef.diagnoseTypo(
2224               Corrected,
2225               SemaRef.PDiag(diag::err_field_designator_unknown_suggest)
2226                 << FieldName << CurrentObjectType);
2227           KnownField = Corrected.getCorrectionDeclAs<FieldDecl>();
2228           hadError = true;
2229         } else {
2230           // Typo correction didn't find anything.
2231           SemaRef.Diag(D->getFieldLoc(), diag::err_field_designator_unknown)
2232             << FieldName << CurrentObjectType;
2233           ++Index;
2234           return true;
2235         }
2236       }
2237     }
2238 
2239     unsigned FieldIndex = 0;
2240     for (auto *FI : RT->getDecl()->fields()) {
2241       if (FI->isUnnamedBitfield())
2242         continue;
2243       if (declaresSameEntity(KnownField, FI)) {
2244         KnownField = FI;
2245         break;
2246       }
2247       ++FieldIndex;
2248     }
2249 
2250     RecordDecl::field_iterator Field =
2251         RecordDecl::field_iterator(DeclContext::decl_iterator(KnownField));
2252 
2253     // All of the fields of a union are located at the same place in
2254     // the initializer list.
2255     if (RT->getDecl()->isUnion()) {
2256       FieldIndex = 0;
2257       if (!VerifyOnly) {
2258         FieldDecl *CurrentField = StructuredList->getInitializedFieldInUnion();
2259         if (CurrentField && !declaresSameEntity(CurrentField, *Field)) {
2260           assert(StructuredList->getNumInits() == 1
2261                  && "A union should never have more than one initializer!");
2262 
2263           // We're about to throw away an initializer, emit warning.
2264           SemaRef.Diag(D->getFieldLoc(),
2265                        diag::warn_initializer_overrides)
2266             << D->getSourceRange();
2267           Expr *ExistingInit = StructuredList->getInit(0);
2268           SemaRef.Diag(ExistingInit->getLocStart(),
2269                        diag::note_previous_initializer)
2270             << /*FIXME:has side effects=*/0
2271             << ExistingInit->getSourceRange();
2272 
2273           // remove existing initializer
2274           StructuredList->resizeInits(SemaRef.Context, 0);
2275           StructuredList->setInitializedFieldInUnion(nullptr);
2276         }
2277 
2278         StructuredList->setInitializedFieldInUnion(*Field);
2279       }
2280     }
2281 
2282     // Make sure we can use this declaration.
2283     bool InvalidUse;
2284     if (VerifyOnly)
2285       InvalidUse = !SemaRef.CanUseDecl(*Field, TreatUnavailableAsInvalid);
2286     else
2287       InvalidUse = SemaRef.DiagnoseUseOfDecl(*Field, D->getFieldLoc());
2288     if (InvalidUse) {
2289       ++Index;
2290       return true;
2291     }
2292 
2293     if (!VerifyOnly) {
2294       // Update the designator with the field declaration.
2295       D->setField(*Field);
2296 
2297       // Make sure that our non-designated initializer list has space
2298       // for a subobject corresponding to this field.
2299       if (FieldIndex >= StructuredList->getNumInits())
2300         StructuredList->resizeInits(SemaRef.Context, FieldIndex + 1);
2301     }
2302 
2303     // This designator names a flexible array member.
2304     if (Field->getType()->isIncompleteArrayType()) {
2305       bool Invalid = false;
2306       if ((DesigIdx + 1) != DIE->size()) {
2307         // We can't designate an object within the flexible array
2308         // member (because GCC doesn't allow it).
2309         if (!VerifyOnly) {
2310           DesignatedInitExpr::Designator *NextD
2311             = DIE->getDesignator(DesigIdx + 1);
2312           SemaRef.Diag(NextD->getLocStart(),
2313                         diag::err_designator_into_flexible_array_member)
2314             << SourceRange(NextD->getLocStart(),
2315                            DIE->getLocEnd());
2316           SemaRef.Diag(Field->getLocation(), diag::note_flexible_array_member)
2317             << *Field;
2318         }
2319         Invalid = true;
2320       }
2321 
2322       if (!hadError && !isa<InitListExpr>(DIE->getInit()) &&
2323           !isa<StringLiteral>(DIE->getInit())) {
2324         // The initializer is not an initializer list.
2325         if (!VerifyOnly) {
2326           SemaRef.Diag(DIE->getInit()->getLocStart(),
2327                         diag::err_flexible_array_init_needs_braces)
2328             << DIE->getInit()->getSourceRange();
2329           SemaRef.Diag(Field->getLocation(), diag::note_flexible_array_member)
2330             << *Field;
2331         }
2332         Invalid = true;
2333       }
2334 
2335       // Check GNU flexible array initializer.
2336       if (!Invalid && CheckFlexibleArrayInit(Entity, DIE->getInit(), *Field,
2337                                              TopLevelObject))
2338         Invalid = true;
2339 
2340       if (Invalid) {
2341         ++Index;
2342         return true;
2343       }
2344 
2345       // Initialize the array.
2346       bool prevHadError = hadError;
2347       unsigned newStructuredIndex = FieldIndex;
2348       unsigned OldIndex = Index;
2349       IList->setInit(Index, DIE->getInit());
2350 
2351       InitializedEntity MemberEntity =
2352         InitializedEntity::InitializeMember(*Field, &Entity);
2353       CheckSubElementType(MemberEntity, IList, Field->getType(), Index,
2354                           StructuredList, newStructuredIndex);
2355 
2356       IList->setInit(OldIndex, DIE);
2357       if (hadError && !prevHadError) {
2358         ++Field;
2359         ++FieldIndex;
2360         if (NextField)
2361           *NextField = Field;
2362         StructuredIndex = FieldIndex;
2363         return true;
2364       }
2365     } else {
2366       // Recurse to check later designated subobjects.
2367       QualType FieldType = Field->getType();
2368       unsigned newStructuredIndex = FieldIndex;
2369 
2370       InitializedEntity MemberEntity =
2371         InitializedEntity::InitializeMember(*Field, &Entity);
2372       if (CheckDesignatedInitializer(MemberEntity, IList, DIE, DesigIdx + 1,
2373                                      FieldType, nullptr, nullptr, Index,
2374                                      StructuredList, newStructuredIndex,
2375                                      FinishSubobjectInit, false))
2376         return true;
2377     }
2378 
2379     // Find the position of the next field to be initialized in this
2380     // subobject.
2381     ++Field;
2382     ++FieldIndex;
2383 
2384     // If this the first designator, our caller will continue checking
2385     // the rest of this struct/class/union subobject.
2386     if (IsFirstDesignator) {
2387       if (NextField)
2388         *NextField = Field;
2389       StructuredIndex = FieldIndex;
2390       return false;
2391     }
2392 
2393     if (!FinishSubobjectInit)
2394       return false;
2395 
2396     // We've already initialized something in the union; we're done.
2397     if (RT->getDecl()->isUnion())
2398       return hadError;
2399 
2400     // Check the remaining fields within this class/struct/union subobject.
2401     bool prevHadError = hadError;
2402 
2403     auto NoBases =
2404         CXXRecordDecl::base_class_range(CXXRecordDecl::base_class_iterator(),
2405                                         CXXRecordDecl::base_class_iterator());
2406     CheckStructUnionTypes(Entity, IList, CurrentObjectType, NoBases, Field,
2407                           false, Index, StructuredList, FieldIndex);
2408     return hadError && !prevHadError;
2409   }
2410 
2411   // C99 6.7.8p6:
2412   //
2413   //   If a designator has the form
2414   //
2415   //      [ constant-expression ]
2416   //
2417   //   then the current object (defined below) shall have array
2418   //   type and the expression shall be an integer constant
2419   //   expression. If the array is of unknown size, any
2420   //   nonnegative value is valid.
2421   //
2422   // Additionally, cope with the GNU extension that permits
2423   // designators of the form
2424   //
2425   //      [ constant-expression ... constant-expression ]
2426   const ArrayType *AT = SemaRef.Context.getAsArrayType(CurrentObjectType);
2427   if (!AT) {
2428     if (!VerifyOnly)
2429       SemaRef.Diag(D->getLBracketLoc(), diag::err_array_designator_non_array)
2430         << CurrentObjectType;
2431     ++Index;
2432     return true;
2433   }
2434 
2435   Expr *IndexExpr = nullptr;
2436   llvm::APSInt DesignatedStartIndex, DesignatedEndIndex;
2437   if (D->isArrayDesignator()) {
2438     IndexExpr = DIE->getArrayIndex(*D);
2439     DesignatedStartIndex = IndexExpr->EvaluateKnownConstInt(SemaRef.Context);
2440     DesignatedEndIndex = DesignatedStartIndex;
2441   } else {
2442     assert(D->isArrayRangeDesignator() && "Need array-range designator");
2443 
2444     DesignatedStartIndex =
2445       DIE->getArrayRangeStart(*D)->EvaluateKnownConstInt(SemaRef.Context);
2446     DesignatedEndIndex =
2447       DIE->getArrayRangeEnd(*D)->EvaluateKnownConstInt(SemaRef.Context);
2448     IndexExpr = DIE->getArrayRangeEnd(*D);
2449 
2450     // Codegen can't handle evaluating array range designators that have side
2451     // effects, because we replicate the AST value for each initialized element.
2452     // As such, set the sawArrayRangeDesignator() bit if we initialize multiple
2453     // elements with something that has a side effect, so codegen can emit an
2454     // "error unsupported" error instead of miscompiling the app.
2455     if (DesignatedStartIndex.getZExtValue()!=DesignatedEndIndex.getZExtValue()&&
2456         DIE->getInit()->HasSideEffects(SemaRef.Context) && !VerifyOnly)
2457       FullyStructuredList->sawArrayRangeDesignator();
2458   }
2459 
2460   if (isa<ConstantArrayType>(AT)) {
2461     llvm::APSInt MaxElements(cast<ConstantArrayType>(AT)->getSize(), false);
2462     DesignatedStartIndex
2463       = DesignatedStartIndex.extOrTrunc(MaxElements.getBitWidth());
2464     DesignatedStartIndex.setIsUnsigned(MaxElements.isUnsigned());
2465     DesignatedEndIndex
2466       = DesignatedEndIndex.extOrTrunc(MaxElements.getBitWidth());
2467     DesignatedEndIndex.setIsUnsigned(MaxElements.isUnsigned());
2468     if (DesignatedEndIndex >= MaxElements) {
2469       if (!VerifyOnly)
2470         SemaRef.Diag(IndexExpr->getLocStart(),
2471                       diag::err_array_designator_too_large)
2472           << DesignatedEndIndex.toString(10) << MaxElements.toString(10)
2473           << IndexExpr->getSourceRange();
2474       ++Index;
2475       return true;
2476     }
2477   } else {
2478     unsigned DesignatedIndexBitWidth =
2479       ConstantArrayType::getMaxSizeBits(SemaRef.Context);
2480     DesignatedStartIndex =
2481       DesignatedStartIndex.extOrTrunc(DesignatedIndexBitWidth);
2482     DesignatedEndIndex =
2483       DesignatedEndIndex.extOrTrunc(DesignatedIndexBitWidth);
2484     DesignatedStartIndex.setIsUnsigned(true);
2485     DesignatedEndIndex.setIsUnsigned(true);
2486   }
2487 
2488   if (!VerifyOnly && StructuredList->isStringLiteralInit()) {
2489     // We're modifying a string literal init; we have to decompose the string
2490     // so we can modify the individual characters.
2491     ASTContext &Context = SemaRef.Context;
2492     Expr *SubExpr = StructuredList->getInit(0)->IgnoreParens();
2493 
2494     // Compute the character type
2495     QualType CharTy = AT->getElementType();
2496 
2497     // Compute the type of the integer literals.
2498     QualType PromotedCharTy = CharTy;
2499     if (CharTy->isPromotableIntegerType())
2500       PromotedCharTy = Context.getPromotedIntegerType(CharTy);
2501     unsigned PromotedCharTyWidth = Context.getTypeSize(PromotedCharTy);
2502 
2503     if (StringLiteral *SL = dyn_cast<StringLiteral>(SubExpr)) {
2504       // Get the length of the string.
2505       uint64_t StrLen = SL->getLength();
2506       if (cast<ConstantArrayType>(AT)->getSize().ult(StrLen))
2507         StrLen = cast<ConstantArrayType>(AT)->getSize().getZExtValue();
2508       StructuredList->resizeInits(Context, StrLen);
2509 
2510       // Build a literal for each character in the string, and put them into
2511       // the init list.
2512       for (unsigned i = 0, e = StrLen; i != e; ++i) {
2513         llvm::APInt CodeUnit(PromotedCharTyWidth, SL->getCodeUnit(i));
2514         Expr *Init = new (Context) IntegerLiteral(
2515             Context, CodeUnit, PromotedCharTy, SubExpr->getExprLoc());
2516         if (CharTy != PromotedCharTy)
2517           Init = ImplicitCastExpr::Create(Context, CharTy, CK_IntegralCast,
2518                                           Init, nullptr, VK_RValue);
2519         StructuredList->updateInit(Context, i, Init);
2520       }
2521     } else {
2522       ObjCEncodeExpr *E = cast<ObjCEncodeExpr>(SubExpr);
2523       std::string Str;
2524       Context.getObjCEncodingForType(E->getEncodedType(), Str);
2525 
2526       // Get the length of the string.
2527       uint64_t StrLen = Str.size();
2528       if (cast<ConstantArrayType>(AT)->getSize().ult(StrLen))
2529         StrLen = cast<ConstantArrayType>(AT)->getSize().getZExtValue();
2530       StructuredList->resizeInits(Context, StrLen);
2531 
2532       // Build a literal for each character in the string, and put them into
2533       // the init list.
2534       for (unsigned i = 0, e = StrLen; i != e; ++i) {
2535         llvm::APInt CodeUnit(PromotedCharTyWidth, Str[i]);
2536         Expr *Init = new (Context) IntegerLiteral(
2537             Context, CodeUnit, PromotedCharTy, SubExpr->getExprLoc());
2538         if (CharTy != PromotedCharTy)
2539           Init = ImplicitCastExpr::Create(Context, CharTy, CK_IntegralCast,
2540                                           Init, nullptr, VK_RValue);
2541         StructuredList->updateInit(Context, i, Init);
2542       }
2543     }
2544   }
2545 
2546   // Make sure that our non-designated initializer list has space
2547   // for a subobject corresponding to this array element.
2548   if (!VerifyOnly &&
2549       DesignatedEndIndex.getZExtValue() >= StructuredList->getNumInits())
2550     StructuredList->resizeInits(SemaRef.Context,
2551                                 DesignatedEndIndex.getZExtValue() + 1);
2552 
2553   // Repeatedly perform subobject initializations in the range
2554   // [DesignatedStartIndex, DesignatedEndIndex].
2555 
2556   // Move to the next designator
2557   unsigned ElementIndex = DesignatedStartIndex.getZExtValue();
2558   unsigned OldIndex = Index;
2559 
2560   InitializedEntity ElementEntity =
2561     InitializedEntity::InitializeElement(SemaRef.Context, 0, Entity);
2562 
2563   while (DesignatedStartIndex <= DesignatedEndIndex) {
2564     // Recurse to check later designated subobjects.
2565     QualType ElementType = AT->getElementType();
2566     Index = OldIndex;
2567 
2568     ElementEntity.setElementIndex(ElementIndex);
2569     if (CheckDesignatedInitializer(
2570             ElementEntity, IList, DIE, DesigIdx + 1, ElementType, nullptr,
2571             nullptr, Index, StructuredList, ElementIndex,
2572             FinishSubobjectInit && (DesignatedStartIndex == DesignatedEndIndex),
2573             false))
2574       return true;
2575 
2576     // Move to the next index in the array that we'll be initializing.
2577     ++DesignatedStartIndex;
2578     ElementIndex = DesignatedStartIndex.getZExtValue();
2579   }
2580 
2581   // If this the first designator, our caller will continue checking
2582   // the rest of this array subobject.
2583   if (IsFirstDesignator) {
2584     if (NextElementIndex)
2585       *NextElementIndex = DesignatedStartIndex;
2586     StructuredIndex = ElementIndex;
2587     return false;
2588   }
2589 
2590   if (!FinishSubobjectInit)
2591     return false;
2592 
2593   // Check the remaining elements within this array subobject.
2594   bool prevHadError = hadError;
2595   CheckArrayType(Entity, IList, CurrentObjectType, DesignatedStartIndex,
2596                  /*SubobjectIsDesignatorContext=*/false, Index,
2597                  StructuredList, ElementIndex);
2598   return hadError && !prevHadError;
2599 }
2600 
2601 // Get the structured initializer list for a subobject of type
2602 // @p CurrentObjectType.
2603 InitListExpr *
2604 InitListChecker::getStructuredSubobjectInit(InitListExpr *IList, unsigned Index,
2605                                             QualType CurrentObjectType,
2606                                             InitListExpr *StructuredList,
2607                                             unsigned StructuredIndex,
2608                                             SourceRange InitRange,
2609                                             bool IsFullyOverwritten) {
2610   if (VerifyOnly)
2611     return nullptr; // No structured list in verification-only mode.
2612   Expr *ExistingInit = nullptr;
2613   if (!StructuredList)
2614     ExistingInit = SyntacticToSemantic.lookup(IList);
2615   else if (StructuredIndex < StructuredList->getNumInits())
2616     ExistingInit = StructuredList->getInit(StructuredIndex);
2617 
2618   if (InitListExpr *Result = dyn_cast_or_null<InitListExpr>(ExistingInit))
2619     // There might have already been initializers for subobjects of the current
2620     // object, but a subsequent initializer list will overwrite the entirety
2621     // of the current object. (See DR 253 and C99 6.7.8p21). e.g.,
2622     //
2623     // struct P { char x[6]; };
2624     // struct P l = { .x[2] = 'x', .x = { [0] = 'f' } };
2625     //
2626     // The first designated initializer is ignored, and l.x is just "f".
2627     if (!IsFullyOverwritten)
2628       return Result;
2629 
2630   if (ExistingInit) {
2631     // We are creating an initializer list that initializes the
2632     // subobjects of the current object, but there was already an
2633     // initialization that completely initialized the current
2634     // subobject, e.g., by a compound literal:
2635     //
2636     // struct X { int a, b; };
2637     // struct X xs[] = { [0] = (struct X) { 1, 2 }, [0].b = 3 };
2638     //
2639     // Here, xs[0].a == 0 and xs[0].b == 3, since the second,
2640     // designated initializer re-initializes the whole
2641     // subobject [0], overwriting previous initializers.
2642     SemaRef.Diag(InitRange.getBegin(),
2643                  diag::warn_subobject_initializer_overrides)
2644       << InitRange;
2645     SemaRef.Diag(ExistingInit->getLocStart(),
2646                   diag::note_previous_initializer)
2647       << /*FIXME:has side effects=*/0
2648       << ExistingInit->getSourceRange();
2649   }
2650 
2651   InitListExpr *Result
2652     = new (SemaRef.Context) InitListExpr(SemaRef.Context,
2653                                          InitRange.getBegin(), None,
2654                                          InitRange.getEnd());
2655 
2656   QualType ResultType = CurrentObjectType;
2657   if (!ResultType->isArrayType())
2658     ResultType = ResultType.getNonLValueExprType(SemaRef.Context);
2659   Result->setType(ResultType);
2660 
2661   // Pre-allocate storage for the structured initializer list.
2662   unsigned NumElements = 0;
2663   unsigned NumInits = 0;
2664   bool GotNumInits = false;
2665   if (!StructuredList) {
2666     NumInits = IList->getNumInits();
2667     GotNumInits = true;
2668   } else if (Index < IList->getNumInits()) {
2669     if (InitListExpr *SubList = dyn_cast<InitListExpr>(IList->getInit(Index))) {
2670       NumInits = SubList->getNumInits();
2671       GotNumInits = true;
2672     }
2673   }
2674 
2675   if (const ArrayType *AType
2676       = SemaRef.Context.getAsArrayType(CurrentObjectType)) {
2677     if (const ConstantArrayType *CAType = dyn_cast<ConstantArrayType>(AType)) {
2678       NumElements = CAType->getSize().getZExtValue();
2679       // Simple heuristic so that we don't allocate a very large
2680       // initializer with many empty entries at the end.
2681       if (GotNumInits && NumElements > NumInits)
2682         NumElements = 0;
2683     }
2684   } else if (const VectorType *VType = CurrentObjectType->getAs<VectorType>())
2685     NumElements = VType->getNumElements();
2686   else if (const RecordType *RType = CurrentObjectType->getAs<RecordType>()) {
2687     RecordDecl *RDecl = RType->getDecl();
2688     if (RDecl->isUnion())
2689       NumElements = 1;
2690     else
2691       NumElements = std::distance(RDecl->field_begin(), RDecl->field_end());
2692   }
2693 
2694   Result->reserveInits(SemaRef.Context, NumElements);
2695 
2696   // Link this new initializer list into the structured initializer
2697   // lists.
2698   if (StructuredList)
2699     StructuredList->updateInit(SemaRef.Context, StructuredIndex, Result);
2700   else {
2701     Result->setSyntacticForm(IList);
2702     SyntacticToSemantic[IList] = Result;
2703   }
2704 
2705   return Result;
2706 }
2707 
2708 /// Update the initializer at index @p StructuredIndex within the
2709 /// structured initializer list to the value @p expr.
2710 void InitListChecker::UpdateStructuredListElement(InitListExpr *StructuredList,
2711                                                   unsigned &StructuredIndex,
2712                                                   Expr *expr) {
2713   // No structured initializer list to update
2714   if (!StructuredList)
2715     return;
2716 
2717   if (Expr *PrevInit = StructuredList->updateInit(SemaRef.Context,
2718                                                   StructuredIndex, expr)) {
2719     // This initializer overwrites a previous initializer. Warn.
2720     // We need to check on source range validity because the previous
2721     // initializer does not have to be an explicit initializer.
2722     // struct P { int a, b; };
2723     // struct PP { struct P p } l = { { .a = 2 }, .p.b = 3 };
2724     // There is an overwrite taking place because the first braced initializer
2725     // list "{ .a = 2 }' already provides value for .p.b (which is zero).
2726     if (PrevInit->getSourceRange().isValid()) {
2727       SemaRef.Diag(expr->getLocStart(),
2728                    diag::warn_initializer_overrides)
2729         << expr->getSourceRange();
2730 
2731       SemaRef.Diag(PrevInit->getLocStart(),
2732                    diag::note_previous_initializer)
2733         << /*FIXME:has side effects=*/0
2734         << PrevInit->getSourceRange();
2735     }
2736   }
2737 
2738   ++StructuredIndex;
2739 }
2740 
2741 /// Check that the given Index expression is a valid array designator
2742 /// value. This is essentially just a wrapper around
2743 /// VerifyIntegerConstantExpression that also checks for negative values
2744 /// and produces a reasonable diagnostic if there is a
2745 /// failure. Returns the index expression, possibly with an implicit cast
2746 /// added, on success.  If everything went okay, Value will receive the
2747 /// value of the constant expression.
2748 static ExprResult
2749 CheckArrayDesignatorExpr(Sema &S, Expr *Index, llvm::APSInt &Value) {
2750   SourceLocation Loc = Index->getLocStart();
2751 
2752   // Make sure this is an integer constant expression.
2753   ExprResult Result = S.VerifyIntegerConstantExpression(Index, &Value);
2754   if (Result.isInvalid())
2755     return Result;
2756 
2757   if (Value.isSigned() && Value.isNegative())
2758     return S.Diag(Loc, diag::err_array_designator_negative)
2759       << Value.toString(10) << Index->getSourceRange();
2760 
2761   Value.setIsUnsigned(true);
2762   return Result;
2763 }
2764 
2765 ExprResult Sema::ActOnDesignatedInitializer(Designation &Desig,
2766                                             SourceLocation Loc,
2767                                             bool GNUSyntax,
2768                                             ExprResult Init) {
2769   typedef DesignatedInitExpr::Designator ASTDesignator;
2770 
2771   bool Invalid = false;
2772   SmallVector<ASTDesignator, 32> Designators;
2773   SmallVector<Expr *, 32> InitExpressions;
2774 
2775   // Build designators and check array designator expressions.
2776   for (unsigned Idx = 0; Idx < Desig.getNumDesignators(); ++Idx) {
2777     const Designator &D = Desig.getDesignator(Idx);
2778     switch (D.getKind()) {
2779     case Designator::FieldDesignator:
2780       Designators.push_back(ASTDesignator(D.getField(), D.getDotLoc(),
2781                                           D.getFieldLoc()));
2782       break;
2783 
2784     case Designator::ArrayDesignator: {
2785       Expr *Index = static_cast<Expr *>(D.getArrayIndex());
2786       llvm::APSInt IndexValue;
2787       if (!Index->isTypeDependent() && !Index->isValueDependent())
2788         Index = CheckArrayDesignatorExpr(*this, Index, IndexValue).get();
2789       if (!Index)
2790         Invalid = true;
2791       else {
2792         Designators.push_back(ASTDesignator(InitExpressions.size(),
2793                                             D.getLBracketLoc(),
2794                                             D.getRBracketLoc()));
2795         InitExpressions.push_back(Index);
2796       }
2797       break;
2798     }
2799 
2800     case Designator::ArrayRangeDesignator: {
2801       Expr *StartIndex = static_cast<Expr *>(D.getArrayRangeStart());
2802       Expr *EndIndex = static_cast<Expr *>(D.getArrayRangeEnd());
2803       llvm::APSInt StartValue;
2804       llvm::APSInt EndValue;
2805       bool StartDependent = StartIndex->isTypeDependent() ||
2806                             StartIndex->isValueDependent();
2807       bool EndDependent = EndIndex->isTypeDependent() ||
2808                           EndIndex->isValueDependent();
2809       if (!StartDependent)
2810         StartIndex =
2811             CheckArrayDesignatorExpr(*this, StartIndex, StartValue).get();
2812       if (!EndDependent)
2813         EndIndex = CheckArrayDesignatorExpr(*this, EndIndex, EndValue).get();
2814 
2815       if (!StartIndex || !EndIndex)
2816         Invalid = true;
2817       else {
2818         // Make sure we're comparing values with the same bit width.
2819         if (StartDependent || EndDependent) {
2820           // Nothing to compute.
2821         } else if (StartValue.getBitWidth() > EndValue.getBitWidth())
2822           EndValue = EndValue.extend(StartValue.getBitWidth());
2823         else if (StartValue.getBitWidth() < EndValue.getBitWidth())
2824           StartValue = StartValue.extend(EndValue.getBitWidth());
2825 
2826         if (!StartDependent && !EndDependent && EndValue < StartValue) {
2827           Diag(D.getEllipsisLoc(), diag::err_array_designator_empty_range)
2828             << StartValue.toString(10) << EndValue.toString(10)
2829             << StartIndex->getSourceRange() << EndIndex->getSourceRange();
2830           Invalid = true;
2831         } else {
2832           Designators.push_back(ASTDesignator(InitExpressions.size(),
2833                                               D.getLBracketLoc(),
2834                                               D.getEllipsisLoc(),
2835                                               D.getRBracketLoc()));
2836           InitExpressions.push_back(StartIndex);
2837           InitExpressions.push_back(EndIndex);
2838         }
2839       }
2840       break;
2841     }
2842     }
2843   }
2844 
2845   if (Invalid || Init.isInvalid())
2846     return ExprError();
2847 
2848   // Clear out the expressions within the designation.
2849   Desig.ClearExprs(*this);
2850 
2851   DesignatedInitExpr *DIE
2852     = DesignatedInitExpr::Create(Context,
2853                                  Designators,
2854                                  InitExpressions, Loc, GNUSyntax,
2855                                  Init.getAs<Expr>());
2856 
2857   if (!getLangOpts().C99)
2858     Diag(DIE->getLocStart(), diag::ext_designated_init)
2859       << DIE->getSourceRange();
2860 
2861   return DIE;
2862 }
2863 
2864 //===----------------------------------------------------------------------===//
2865 // Initialization entity
2866 //===----------------------------------------------------------------------===//
2867 
2868 InitializedEntity::InitializedEntity(ASTContext &Context, unsigned Index,
2869                                      const InitializedEntity &Parent)
2870   : Parent(&Parent), Index(Index)
2871 {
2872   if (const ArrayType *AT = Context.getAsArrayType(Parent.getType())) {
2873     Kind = EK_ArrayElement;
2874     Type = AT->getElementType();
2875   } else if (const VectorType *VT = Parent.getType()->getAs<VectorType>()) {
2876     Kind = EK_VectorElement;
2877     Type = VT->getElementType();
2878   } else {
2879     const ComplexType *CT = Parent.getType()->getAs<ComplexType>();
2880     assert(CT && "Unexpected type");
2881     Kind = EK_ComplexElement;
2882     Type = CT->getElementType();
2883   }
2884 }
2885 
2886 InitializedEntity
2887 InitializedEntity::InitializeBase(ASTContext &Context,
2888                                   const CXXBaseSpecifier *Base,
2889                                   bool IsInheritedVirtualBase,
2890                                   const InitializedEntity *Parent) {
2891   InitializedEntity Result;
2892   Result.Kind = EK_Base;
2893   Result.Parent = Parent;
2894   Result.Base = reinterpret_cast<uintptr_t>(Base);
2895   if (IsInheritedVirtualBase)
2896     Result.Base |= 0x01;
2897 
2898   Result.Type = Base->getType();
2899   return Result;
2900 }
2901 
2902 DeclarationName InitializedEntity::getName() const {
2903   switch (getKind()) {
2904   case EK_Parameter:
2905   case EK_Parameter_CF_Audited: {
2906     ParmVarDecl *D = reinterpret_cast<ParmVarDecl*>(Parameter & ~0x1);
2907     return (D ? D->getDeclName() : DeclarationName());
2908   }
2909 
2910   case EK_Variable:
2911   case EK_Member:
2912   case EK_Binding:
2913     return VariableOrMember->getDeclName();
2914 
2915   case EK_LambdaCapture:
2916     return DeclarationName(Capture.VarID);
2917 
2918   case EK_Result:
2919   case EK_Exception:
2920   case EK_New:
2921   case EK_Temporary:
2922   case EK_Base:
2923   case EK_Delegating:
2924   case EK_ArrayElement:
2925   case EK_VectorElement:
2926   case EK_ComplexElement:
2927   case EK_BlockElement:
2928   case EK_CompoundLiteralInit:
2929   case EK_RelatedResult:
2930     return DeclarationName();
2931   }
2932 
2933   llvm_unreachable("Invalid EntityKind!");
2934 }
2935 
2936 ValueDecl *InitializedEntity::getDecl() const {
2937   switch (getKind()) {
2938   case EK_Variable:
2939   case EK_Member:
2940   case EK_Binding:
2941     return VariableOrMember;
2942 
2943   case EK_Parameter:
2944   case EK_Parameter_CF_Audited:
2945     return reinterpret_cast<ParmVarDecl*>(Parameter & ~0x1);
2946 
2947   case EK_Result:
2948   case EK_Exception:
2949   case EK_New:
2950   case EK_Temporary:
2951   case EK_Base:
2952   case EK_Delegating:
2953   case EK_ArrayElement:
2954   case EK_VectorElement:
2955   case EK_ComplexElement:
2956   case EK_BlockElement:
2957   case EK_LambdaCapture:
2958   case EK_CompoundLiteralInit:
2959   case EK_RelatedResult:
2960     return nullptr;
2961   }
2962 
2963   llvm_unreachable("Invalid EntityKind!");
2964 }
2965 
2966 bool InitializedEntity::allowsNRVO() const {
2967   switch (getKind()) {
2968   case EK_Result:
2969   case EK_Exception:
2970     return LocAndNRVO.NRVO;
2971 
2972   case EK_Variable:
2973   case EK_Parameter:
2974   case EK_Parameter_CF_Audited:
2975   case EK_Member:
2976   case EK_Binding:
2977   case EK_New:
2978   case EK_Temporary:
2979   case EK_CompoundLiteralInit:
2980   case EK_Base:
2981   case EK_Delegating:
2982   case EK_ArrayElement:
2983   case EK_VectorElement:
2984   case EK_ComplexElement:
2985   case EK_BlockElement:
2986   case EK_LambdaCapture:
2987   case EK_RelatedResult:
2988     break;
2989   }
2990 
2991   return false;
2992 }
2993 
2994 unsigned InitializedEntity::dumpImpl(raw_ostream &OS) const {
2995   assert(getParent() != this);
2996   unsigned Depth = getParent() ? getParent()->dumpImpl(OS) : 0;
2997   for (unsigned I = 0; I != Depth; ++I)
2998     OS << "`-";
2999 
3000   switch (getKind()) {
3001   case EK_Variable: OS << "Variable"; break;
3002   case EK_Parameter: OS << "Parameter"; break;
3003   case EK_Parameter_CF_Audited: OS << "CF audited function Parameter";
3004     break;
3005   case EK_Result: OS << "Result"; break;
3006   case EK_Exception: OS << "Exception"; break;
3007   case EK_Member: OS << "Member"; break;
3008   case EK_Binding: OS << "Binding"; break;
3009   case EK_New: OS << "New"; break;
3010   case EK_Temporary: OS << "Temporary"; break;
3011   case EK_CompoundLiteralInit: OS << "CompoundLiteral";break;
3012   case EK_RelatedResult: OS << "RelatedResult"; break;
3013   case EK_Base: OS << "Base"; break;
3014   case EK_Delegating: OS << "Delegating"; break;
3015   case EK_ArrayElement: OS << "ArrayElement " << Index; break;
3016   case EK_VectorElement: OS << "VectorElement " << Index; break;
3017   case EK_ComplexElement: OS << "ComplexElement " << Index; break;
3018   case EK_BlockElement: OS << "Block"; break;
3019   case EK_LambdaCapture:
3020     OS << "LambdaCapture ";
3021     OS << DeclarationName(Capture.VarID);
3022     break;
3023   }
3024 
3025   if (auto *D = getDecl()) {
3026     OS << " ";
3027     D->printQualifiedName(OS);
3028   }
3029 
3030   OS << " '" << getType().getAsString() << "'\n";
3031 
3032   return Depth + 1;
3033 }
3034 
3035 LLVM_DUMP_METHOD void InitializedEntity::dump() const {
3036   dumpImpl(llvm::errs());
3037 }
3038 
3039 //===----------------------------------------------------------------------===//
3040 // Initialization sequence
3041 //===----------------------------------------------------------------------===//
3042 
3043 void InitializationSequence::Step::Destroy() {
3044   switch (Kind) {
3045   case SK_ResolveAddressOfOverloadedFunction:
3046   case SK_CastDerivedToBaseRValue:
3047   case SK_CastDerivedToBaseXValue:
3048   case SK_CastDerivedToBaseLValue:
3049   case SK_BindReference:
3050   case SK_BindReferenceToTemporary:
3051   case SK_ExtraneousCopyToTemporary:
3052   case SK_UserConversion:
3053   case SK_QualificationConversionRValue:
3054   case SK_QualificationConversionXValue:
3055   case SK_QualificationConversionLValue:
3056   case SK_AtomicConversion:
3057   case SK_LValueToRValue:
3058   case SK_ListInitialization:
3059   case SK_UnwrapInitList:
3060   case SK_RewrapInitList:
3061   case SK_ConstructorInitialization:
3062   case SK_ConstructorInitializationFromList:
3063   case SK_ZeroInitialization:
3064   case SK_CAssignment:
3065   case SK_StringInit:
3066   case SK_ObjCObjectConversion:
3067   case SK_ArrayInit:
3068   case SK_ParenthesizedArrayInit:
3069   case SK_PassByIndirectCopyRestore:
3070   case SK_PassByIndirectRestore:
3071   case SK_ProduceObjCObject:
3072   case SK_StdInitializerList:
3073   case SK_StdInitializerListConstructorCall:
3074   case SK_OCLSamplerInit:
3075   case SK_OCLZeroEvent:
3076     break;
3077 
3078   case SK_ConversionSequence:
3079   case SK_ConversionSequenceNoNarrowing:
3080     delete ICS;
3081   }
3082 }
3083 
3084 bool InitializationSequence::isDirectReferenceBinding() const {
3085   return !Steps.empty() && Steps.back().Kind == SK_BindReference;
3086 }
3087 
3088 bool InitializationSequence::isAmbiguous() const {
3089   if (!Failed())
3090     return false;
3091 
3092   switch (getFailureKind()) {
3093   case FK_TooManyInitsForReference:
3094   case FK_ArrayNeedsInitList:
3095   case FK_ArrayNeedsInitListOrStringLiteral:
3096   case FK_ArrayNeedsInitListOrWideStringLiteral:
3097   case FK_NarrowStringIntoWideCharArray:
3098   case FK_WideStringIntoCharArray:
3099   case FK_IncompatWideStringIntoWideChar:
3100   case FK_AddressOfOverloadFailed: // FIXME: Could do better
3101   case FK_NonConstLValueReferenceBindingToTemporary:
3102   case FK_NonConstLValueReferenceBindingToUnrelated:
3103   case FK_RValueReferenceBindingToLValue:
3104   case FK_ReferenceInitDropsQualifiers:
3105   case FK_ReferenceInitFailed:
3106   case FK_ConversionFailed:
3107   case FK_ConversionFromPropertyFailed:
3108   case FK_TooManyInitsForScalar:
3109   case FK_ReferenceBindingToInitList:
3110   case FK_InitListBadDestinationType:
3111   case FK_DefaultInitOfConst:
3112   case FK_Incomplete:
3113   case FK_ArrayTypeMismatch:
3114   case FK_NonConstantArrayInit:
3115   case FK_ListInitializationFailed:
3116   case FK_VariableLengthArrayHasInitializer:
3117   case FK_PlaceholderType:
3118   case FK_ExplicitConstructor:
3119   case FK_AddressOfUnaddressableFunction:
3120     return false;
3121 
3122   case FK_ReferenceInitOverloadFailed:
3123   case FK_UserConversionOverloadFailed:
3124   case FK_ConstructorOverloadFailed:
3125   case FK_ListConstructorOverloadFailed:
3126     return FailedOverloadResult == OR_Ambiguous;
3127   }
3128 
3129   llvm_unreachable("Invalid EntityKind!");
3130 }
3131 
3132 bool InitializationSequence::isConstructorInitialization() const {
3133   return !Steps.empty() && Steps.back().Kind == SK_ConstructorInitialization;
3134 }
3135 
3136 void
3137 InitializationSequence
3138 ::AddAddressOverloadResolutionStep(FunctionDecl *Function,
3139                                    DeclAccessPair Found,
3140                                    bool HadMultipleCandidates) {
3141   Step S;
3142   S.Kind = SK_ResolveAddressOfOverloadedFunction;
3143   S.Type = Function->getType();
3144   S.Function.HadMultipleCandidates = HadMultipleCandidates;
3145   S.Function.Function = Function;
3146   S.Function.FoundDecl = Found;
3147   Steps.push_back(S);
3148 }
3149 
3150 void InitializationSequence::AddDerivedToBaseCastStep(QualType BaseType,
3151                                                       ExprValueKind VK) {
3152   Step S;
3153   switch (VK) {
3154   case VK_RValue: S.Kind = SK_CastDerivedToBaseRValue; break;
3155   case VK_XValue: S.Kind = SK_CastDerivedToBaseXValue; break;
3156   case VK_LValue: S.Kind = SK_CastDerivedToBaseLValue; break;
3157   }
3158   S.Type = BaseType;
3159   Steps.push_back(S);
3160 }
3161 
3162 void InitializationSequence::AddReferenceBindingStep(QualType T,
3163                                                      bool BindingTemporary) {
3164   Step S;
3165   S.Kind = BindingTemporary? SK_BindReferenceToTemporary : SK_BindReference;
3166   S.Type = T;
3167   Steps.push_back(S);
3168 }
3169 
3170 void InitializationSequence::AddExtraneousCopyToTemporary(QualType T) {
3171   Step S;
3172   S.Kind = SK_ExtraneousCopyToTemporary;
3173   S.Type = T;
3174   Steps.push_back(S);
3175 }
3176 
3177 void
3178 InitializationSequence::AddUserConversionStep(FunctionDecl *Function,
3179                                               DeclAccessPair FoundDecl,
3180                                               QualType T,
3181                                               bool HadMultipleCandidates) {
3182   Step S;
3183   S.Kind = SK_UserConversion;
3184   S.Type = T;
3185   S.Function.HadMultipleCandidates = HadMultipleCandidates;
3186   S.Function.Function = Function;
3187   S.Function.FoundDecl = FoundDecl;
3188   Steps.push_back(S);
3189 }
3190 
3191 void InitializationSequence::AddQualificationConversionStep(QualType Ty,
3192                                                             ExprValueKind VK) {
3193   Step S;
3194   S.Kind = SK_QualificationConversionRValue; // work around a gcc warning
3195   switch (VK) {
3196   case VK_RValue:
3197     S.Kind = SK_QualificationConversionRValue;
3198     break;
3199   case VK_XValue:
3200     S.Kind = SK_QualificationConversionXValue;
3201     break;
3202   case VK_LValue:
3203     S.Kind = SK_QualificationConversionLValue;
3204     break;
3205   }
3206   S.Type = Ty;
3207   Steps.push_back(S);
3208 }
3209 
3210 void InitializationSequence::AddAtomicConversionStep(QualType Ty) {
3211   Step S;
3212   S.Kind = SK_AtomicConversion;
3213   S.Type = Ty;
3214   Steps.push_back(S);
3215 }
3216 
3217 void InitializationSequence::AddLValueToRValueStep(QualType Ty) {
3218   assert(!Ty.hasQualifiers() && "rvalues may not have qualifiers");
3219 
3220   Step S;
3221   S.Kind = SK_LValueToRValue;
3222   S.Type = Ty;
3223   Steps.push_back(S);
3224 }
3225 
3226 void InitializationSequence::AddConversionSequenceStep(
3227     const ImplicitConversionSequence &ICS, QualType T,
3228     bool TopLevelOfInitList) {
3229   Step S;
3230   S.Kind = TopLevelOfInitList ? SK_ConversionSequenceNoNarrowing
3231                               : SK_ConversionSequence;
3232   S.Type = T;
3233   S.ICS = new ImplicitConversionSequence(ICS);
3234   Steps.push_back(S);
3235 }
3236 
3237 void InitializationSequence::AddListInitializationStep(QualType T) {
3238   Step S;
3239   S.Kind = SK_ListInitialization;
3240   S.Type = T;
3241   Steps.push_back(S);
3242 }
3243 
3244 void InitializationSequence::AddConstructorInitializationStep(
3245     DeclAccessPair FoundDecl, CXXConstructorDecl *Constructor, QualType T,
3246     bool HadMultipleCandidates, bool FromInitList, bool AsInitList) {
3247   Step S;
3248   S.Kind = FromInitList ? AsInitList ? SK_StdInitializerListConstructorCall
3249                                      : SK_ConstructorInitializationFromList
3250                         : SK_ConstructorInitialization;
3251   S.Type = T;
3252   S.Function.HadMultipleCandidates = HadMultipleCandidates;
3253   S.Function.Function = Constructor;
3254   S.Function.FoundDecl = FoundDecl;
3255   Steps.push_back(S);
3256 }
3257 
3258 void InitializationSequence::AddZeroInitializationStep(QualType T) {
3259   Step S;
3260   S.Kind = SK_ZeroInitialization;
3261   S.Type = T;
3262   Steps.push_back(S);
3263 }
3264 
3265 void InitializationSequence::AddCAssignmentStep(QualType T) {
3266   Step S;
3267   S.Kind = SK_CAssignment;
3268   S.Type = T;
3269   Steps.push_back(S);
3270 }
3271 
3272 void InitializationSequence::AddStringInitStep(QualType T) {
3273   Step S;
3274   S.Kind = SK_StringInit;
3275   S.Type = T;
3276   Steps.push_back(S);
3277 }
3278 
3279 void InitializationSequence::AddObjCObjectConversionStep(QualType T) {
3280   Step S;
3281   S.Kind = SK_ObjCObjectConversion;
3282   S.Type = T;
3283   Steps.push_back(S);
3284 }
3285 
3286 void InitializationSequence::AddArrayInitStep(QualType T) {
3287   Step S;
3288   S.Kind = SK_ArrayInit;
3289   S.Type = T;
3290   Steps.push_back(S);
3291 }
3292 
3293 void InitializationSequence::AddParenthesizedArrayInitStep(QualType T) {
3294   Step S;
3295   S.Kind = SK_ParenthesizedArrayInit;
3296   S.Type = T;
3297   Steps.push_back(S);
3298 }
3299 
3300 void InitializationSequence::AddPassByIndirectCopyRestoreStep(QualType type,
3301                                                               bool shouldCopy) {
3302   Step s;
3303   s.Kind = (shouldCopy ? SK_PassByIndirectCopyRestore
3304                        : SK_PassByIndirectRestore);
3305   s.Type = type;
3306   Steps.push_back(s);
3307 }
3308 
3309 void InitializationSequence::AddProduceObjCObjectStep(QualType T) {
3310   Step S;
3311   S.Kind = SK_ProduceObjCObject;
3312   S.Type = T;
3313   Steps.push_back(S);
3314 }
3315 
3316 void InitializationSequence::AddStdInitializerListConstructionStep(QualType T) {
3317   Step S;
3318   S.Kind = SK_StdInitializerList;
3319   S.Type = T;
3320   Steps.push_back(S);
3321 }
3322 
3323 void InitializationSequence::AddOCLSamplerInitStep(QualType T) {
3324   Step S;
3325   S.Kind = SK_OCLSamplerInit;
3326   S.Type = T;
3327   Steps.push_back(S);
3328 }
3329 
3330 void InitializationSequence::AddOCLZeroEventStep(QualType T) {
3331   Step S;
3332   S.Kind = SK_OCLZeroEvent;
3333   S.Type = T;
3334   Steps.push_back(S);
3335 }
3336 
3337 void InitializationSequence::RewrapReferenceInitList(QualType T,
3338                                                      InitListExpr *Syntactic) {
3339   assert(Syntactic->getNumInits() == 1 &&
3340          "Can only rewrap trivial init lists.");
3341   Step S;
3342   S.Kind = SK_UnwrapInitList;
3343   S.Type = Syntactic->getInit(0)->getType();
3344   Steps.insert(Steps.begin(), S);
3345 
3346   S.Kind = SK_RewrapInitList;
3347   S.Type = T;
3348   S.WrappingSyntacticList = Syntactic;
3349   Steps.push_back(S);
3350 }
3351 
3352 void InitializationSequence::SetOverloadFailure(FailureKind Failure,
3353                                                 OverloadingResult Result) {
3354   setSequenceKind(FailedSequence);
3355   this->Failure = Failure;
3356   this->FailedOverloadResult = Result;
3357 }
3358 
3359 //===----------------------------------------------------------------------===//
3360 // Attempt initialization
3361 //===----------------------------------------------------------------------===//
3362 
3363 /// Tries to add a zero initializer. Returns true if that worked.
3364 static bool
3365 maybeRecoverWithZeroInitialization(Sema &S, InitializationSequence &Sequence,
3366                                    const InitializedEntity &Entity) {
3367   if (Entity.getKind() != InitializedEntity::EK_Variable)
3368     return false;
3369 
3370   VarDecl *VD = cast<VarDecl>(Entity.getDecl());
3371   if (VD->getInit() || VD->getLocEnd().isMacroID())
3372     return false;
3373 
3374   QualType VariableTy = VD->getType().getCanonicalType();
3375   SourceLocation Loc = S.getLocForEndOfToken(VD->getLocEnd());
3376   std::string Init = S.getFixItZeroInitializerForType(VariableTy, Loc);
3377   if (!Init.empty()) {
3378     Sequence.AddZeroInitializationStep(Entity.getType());
3379     Sequence.SetZeroInitializationFixit(Init, Loc);
3380     return true;
3381   }
3382   return false;
3383 }
3384 
3385 static void MaybeProduceObjCObject(Sema &S,
3386                                    InitializationSequence &Sequence,
3387                                    const InitializedEntity &Entity) {
3388   if (!S.getLangOpts().ObjCAutoRefCount) return;
3389 
3390   /// When initializing a parameter, produce the value if it's marked
3391   /// __attribute__((ns_consumed)).
3392   if (Entity.isParameterKind()) {
3393     if (!Entity.isParameterConsumed())
3394       return;
3395 
3396     assert(Entity.getType()->isObjCRetainableType() &&
3397            "consuming an object of unretainable type?");
3398     Sequence.AddProduceObjCObjectStep(Entity.getType());
3399 
3400   /// When initializing a return value, if the return type is a
3401   /// retainable type, then returns need to immediately retain the
3402   /// object.  If an autorelease is required, it will be done at the
3403   /// last instant.
3404   } else if (Entity.getKind() == InitializedEntity::EK_Result) {
3405     if (!Entity.getType()->isObjCRetainableType())
3406       return;
3407 
3408     Sequence.AddProduceObjCObjectStep(Entity.getType());
3409   }
3410 }
3411 
3412 static void TryListInitialization(Sema &S,
3413                                   const InitializedEntity &Entity,
3414                                   const InitializationKind &Kind,
3415                                   InitListExpr *InitList,
3416                                   InitializationSequence &Sequence,
3417                                   bool TreatUnavailableAsInvalid);
3418 
3419 /// \brief When initializing from init list via constructor, handle
3420 /// initialization of an object of type std::initializer_list<T>.
3421 ///
3422 /// \return true if we have handled initialization of an object of type
3423 /// std::initializer_list<T>, false otherwise.
3424 static bool TryInitializerListConstruction(Sema &S,
3425                                            InitListExpr *List,
3426                                            QualType DestType,
3427                                            InitializationSequence &Sequence,
3428                                            bool TreatUnavailableAsInvalid) {
3429   QualType E;
3430   if (!S.isStdInitializerList(DestType, &E))
3431     return false;
3432 
3433   if (!S.isCompleteType(List->getExprLoc(), E)) {
3434     Sequence.setIncompleteTypeFailure(E);
3435     return true;
3436   }
3437 
3438   // Try initializing a temporary array from the init list.
3439   QualType ArrayType = S.Context.getConstantArrayType(
3440       E.withConst(), llvm::APInt(S.Context.getTypeSize(S.Context.getSizeType()),
3441                                  List->getNumInits()),
3442       clang::ArrayType::Normal, 0);
3443   InitializedEntity HiddenArray =
3444       InitializedEntity::InitializeTemporary(ArrayType);
3445   InitializationKind Kind =
3446       InitializationKind::CreateDirectList(List->getExprLoc());
3447   TryListInitialization(S, HiddenArray, Kind, List, Sequence,
3448                         TreatUnavailableAsInvalid);
3449   if (Sequence)
3450     Sequence.AddStdInitializerListConstructionStep(DestType);
3451   return true;
3452 }
3453 
3454 /// Determine if the constructor has the signature of a copy or move
3455 /// constructor for the type T of the class in which it was found. That is,
3456 /// determine if its first parameter is of type T or reference to (possibly
3457 /// cv-qualified) T.
3458 static bool hasCopyOrMoveCtorParam(ASTContext &Ctx,
3459                                    const ConstructorInfo &Info) {
3460   if (Info.Constructor->getNumParams() == 0)
3461     return false;
3462 
3463   QualType ParmT =
3464       Info.Constructor->getParamDecl(0)->getType().getNonReferenceType();
3465   QualType ClassT =
3466       Ctx.getRecordType(cast<CXXRecordDecl>(Info.FoundDecl->getDeclContext()));
3467 
3468   return Ctx.hasSameUnqualifiedType(ParmT, ClassT);
3469 }
3470 
3471 static OverloadingResult
3472 ResolveConstructorOverload(Sema &S, SourceLocation DeclLoc,
3473                            MultiExprArg Args,
3474                            OverloadCandidateSet &CandidateSet,
3475                            DeclContext::lookup_result Ctors,
3476                            OverloadCandidateSet::iterator &Best,
3477                            bool CopyInitializing, bool AllowExplicit,
3478                            bool OnlyListConstructors, bool IsListInit,
3479                            bool SecondStepOfCopyInit = false) {
3480   CandidateSet.clear();
3481 
3482   for (NamedDecl *D : Ctors) {
3483     auto Info = getConstructorInfo(D);
3484     if (!Info.Constructor || Info.Constructor->isInvalidDecl())
3485       continue;
3486 
3487     if (!AllowExplicit && Info.Constructor->isExplicit())
3488       continue;
3489 
3490     if (OnlyListConstructors && !S.isInitListConstructor(Info.Constructor))
3491       continue;
3492 
3493     // C++11 [over.best.ics]p4:
3494     //   ... and the constructor or user-defined conversion function is a
3495     //   candidate by
3496     //   - 13.3.1.3, when the argument is the temporary in the second step
3497     //     of a class copy-initialization, or
3498     //   - 13.3.1.4, 13.3.1.5, or 13.3.1.6 (in all cases), [not handled here]
3499     //   - the second phase of 13.3.1.7 when the initializer list has exactly
3500     //     one element that is itself an initializer list, and the target is
3501     //     the first parameter of a constructor of class X, and the conversion
3502     //     is to X or reference to (possibly cv-qualified X),
3503     //   user-defined conversion sequences are not considered.
3504     bool SuppressUserConversions =
3505         SecondStepOfCopyInit ||
3506         (IsListInit && Args.size() == 1 && isa<InitListExpr>(Args[0]) &&
3507          hasCopyOrMoveCtorParam(S.Context, Info));
3508 
3509     if (Info.ConstructorTmpl)
3510       S.AddTemplateOverloadCandidate(Info.ConstructorTmpl, Info.FoundDecl,
3511                                      /*ExplicitArgs*/ nullptr, Args,
3512                                      CandidateSet, SuppressUserConversions);
3513     else {
3514       // C++ [over.match.copy]p1:
3515       //   - When initializing a temporary to be bound to the first parameter
3516       //     of a constructor [for type T] that takes a reference to possibly
3517       //     cv-qualified T as its first argument, called with a single
3518       //     argument in the context of direct-initialization, explicit
3519       //     conversion functions are also considered.
3520       // FIXME: What if a constructor template instantiates to such a signature?
3521       bool AllowExplicitConv = AllowExplicit && !CopyInitializing &&
3522                                Args.size() == 1 &&
3523                                hasCopyOrMoveCtorParam(S.Context, Info);
3524       S.AddOverloadCandidate(Info.Constructor, Info.FoundDecl, Args,
3525                              CandidateSet, SuppressUserConversions,
3526                              /*PartialOverloading=*/false,
3527                              /*AllowExplicit=*/AllowExplicitConv);
3528     }
3529   }
3530 
3531   // Perform overload resolution and return the result.
3532   return CandidateSet.BestViableFunction(S, DeclLoc, Best);
3533 }
3534 
3535 /// \brief Attempt initialization by constructor (C++ [dcl.init]), which
3536 /// enumerates the constructors of the initialized entity and performs overload
3537 /// resolution to select the best.
3538 /// \param IsListInit     Is this list-initialization?
3539 /// \param IsInitListCopy Is this non-list-initialization resulting from a
3540 ///                       list-initialization from {x} where x is the same
3541 ///                       type as the entity?
3542 static void TryConstructorInitialization(Sema &S,
3543                                          const InitializedEntity &Entity,
3544                                          const InitializationKind &Kind,
3545                                          MultiExprArg Args, QualType DestType,
3546                                          InitializationSequence &Sequence,
3547                                          bool IsListInit = false,
3548                                          bool IsInitListCopy = false) {
3549   assert((!IsListInit || (Args.size() == 1 && isa<InitListExpr>(Args[0]))) &&
3550          "IsListInit must come with a single initializer list argument.");
3551 
3552   // The type we're constructing needs to be complete.
3553   if (!S.isCompleteType(Kind.getLocation(), DestType)) {
3554     Sequence.setIncompleteTypeFailure(DestType);
3555     return;
3556   }
3557 
3558   const RecordType *DestRecordType = DestType->getAs<RecordType>();
3559   assert(DestRecordType && "Constructor initialization requires record type");
3560   CXXRecordDecl *DestRecordDecl
3561     = cast<CXXRecordDecl>(DestRecordType->getDecl());
3562 
3563   // Build the candidate set directly in the initialization sequence
3564   // structure, so that it will persist if we fail.
3565   OverloadCandidateSet &CandidateSet = Sequence.getFailedCandidateSet();
3566 
3567   // Determine whether we are allowed to call explicit constructors or
3568   // explicit conversion operators.
3569   bool AllowExplicit = Kind.AllowExplicit() || IsListInit;
3570   bool CopyInitialization = Kind.getKind() == InitializationKind::IK_Copy;
3571 
3572   //   - Otherwise, if T is a class type, constructors are considered. The
3573   //     applicable constructors are enumerated, and the best one is chosen
3574   //     through overload resolution.
3575   DeclContext::lookup_result Ctors = S.LookupConstructors(DestRecordDecl);
3576 
3577   OverloadingResult Result = OR_No_Viable_Function;
3578   OverloadCandidateSet::iterator Best;
3579   bool AsInitializerList = false;
3580 
3581   // C++11 [over.match.list]p1, per DR1467:
3582   //   When objects of non-aggregate type T are list-initialized, such that
3583   //   8.5.4 [dcl.init.list] specifies that overload resolution is performed
3584   //   according to the rules in this section, overload resolution selects
3585   //   the constructor in two phases:
3586   //
3587   //   - Initially, the candidate functions are the initializer-list
3588   //     constructors of the class T and the argument list consists of the
3589   //     initializer list as a single argument.
3590   if (IsListInit) {
3591     InitListExpr *ILE = cast<InitListExpr>(Args[0]);
3592     AsInitializerList = true;
3593 
3594     // If the initializer list has no elements and T has a default constructor,
3595     // the first phase is omitted.
3596     if (ILE->getNumInits() != 0 || !DestRecordDecl->hasDefaultConstructor())
3597       Result = ResolveConstructorOverload(S, Kind.getLocation(), Args,
3598                                           CandidateSet, Ctors, Best,
3599                                           CopyInitialization, AllowExplicit,
3600                                           /*OnlyListConstructor=*/true,
3601                                           IsListInit);
3602 
3603     // Time to unwrap the init list.
3604     Args = MultiExprArg(ILE->getInits(), ILE->getNumInits());
3605   }
3606 
3607   // C++11 [over.match.list]p1:
3608   //   - If no viable initializer-list constructor is found, overload resolution
3609   //     is performed again, where the candidate functions are all the
3610   //     constructors of the class T and the argument list consists of the
3611   //     elements of the initializer list.
3612   if (Result == OR_No_Viable_Function) {
3613     AsInitializerList = false;
3614     Result = ResolveConstructorOverload(S, Kind.getLocation(), Args,
3615                                         CandidateSet, Ctors, Best,
3616                                         CopyInitialization, AllowExplicit,
3617                                         /*OnlyListConstructors=*/false,
3618                                         IsListInit);
3619   }
3620   if (Result) {
3621     Sequence.SetOverloadFailure(IsListInit ?
3622                       InitializationSequence::FK_ListConstructorOverloadFailed :
3623                       InitializationSequence::FK_ConstructorOverloadFailed,
3624                                 Result);
3625     return;
3626   }
3627 
3628   // C++11 [dcl.init]p6:
3629   //   If a program calls for the default initialization of an object
3630   //   of a const-qualified type T, T shall be a class type with a
3631   //   user-provided default constructor.
3632   // C++ core issue 253 proposal:
3633   //   If the implicit default constructor initializes all subobjects, no
3634   //   initializer should be required.
3635   // The 253 proposal is for example needed to process libstdc++ headers in 5.x.
3636   CXXConstructorDecl *CtorDecl = cast<CXXConstructorDecl>(Best->Function);
3637   if (Kind.getKind() == InitializationKind::IK_Default &&
3638       Entity.getType().isConstQualified()) {
3639     if (!CtorDecl->getParent()->allowConstDefaultInit()) {
3640       if (!maybeRecoverWithZeroInitialization(S, Sequence, Entity))
3641         Sequence.SetFailed(InitializationSequence::FK_DefaultInitOfConst);
3642       return;
3643     }
3644   }
3645 
3646   // C++11 [over.match.list]p1:
3647   //   In copy-list-initialization, if an explicit constructor is chosen, the
3648   //   initializer is ill-formed.
3649   if (IsListInit && !Kind.AllowExplicit() && CtorDecl->isExplicit()) {
3650     Sequence.SetFailed(InitializationSequence::FK_ExplicitConstructor);
3651     return;
3652   }
3653 
3654   // Add the constructor initialization step. Any cv-qualification conversion is
3655   // subsumed by the initialization.
3656   bool HadMultipleCandidates = (CandidateSet.size() > 1);
3657   Sequence.AddConstructorInitializationStep(
3658       Best->FoundDecl, CtorDecl, DestType, HadMultipleCandidates,
3659       IsListInit | IsInitListCopy, AsInitializerList);
3660 }
3661 
3662 static bool
3663 ResolveOverloadedFunctionForReferenceBinding(Sema &S,
3664                                              Expr *Initializer,
3665                                              QualType &SourceType,
3666                                              QualType &UnqualifiedSourceType,
3667                                              QualType UnqualifiedTargetType,
3668                                              InitializationSequence &Sequence) {
3669   if (S.Context.getCanonicalType(UnqualifiedSourceType) ==
3670         S.Context.OverloadTy) {
3671     DeclAccessPair Found;
3672     bool HadMultipleCandidates = false;
3673     if (FunctionDecl *Fn
3674         = S.ResolveAddressOfOverloadedFunction(Initializer,
3675                                                UnqualifiedTargetType,
3676                                                false, Found,
3677                                                &HadMultipleCandidates)) {
3678       Sequence.AddAddressOverloadResolutionStep(Fn, Found,
3679                                                 HadMultipleCandidates);
3680       SourceType = Fn->getType();
3681       UnqualifiedSourceType = SourceType.getUnqualifiedType();
3682     } else if (!UnqualifiedTargetType->isRecordType()) {
3683       Sequence.SetFailed(InitializationSequence::FK_AddressOfOverloadFailed);
3684       return true;
3685     }
3686   }
3687   return false;
3688 }
3689 
3690 static void TryReferenceInitializationCore(Sema &S,
3691                                            const InitializedEntity &Entity,
3692                                            const InitializationKind &Kind,
3693                                            Expr *Initializer,
3694                                            QualType cv1T1, QualType T1,
3695                                            Qualifiers T1Quals,
3696                                            QualType cv2T2, QualType T2,
3697                                            Qualifiers T2Quals,
3698                                            InitializationSequence &Sequence);
3699 
3700 static void TryValueInitialization(Sema &S,
3701                                    const InitializedEntity &Entity,
3702                                    const InitializationKind &Kind,
3703                                    InitializationSequence &Sequence,
3704                                    InitListExpr *InitList = nullptr);
3705 
3706 /// \brief Attempt list initialization of a reference.
3707 static void TryReferenceListInitialization(Sema &S,
3708                                            const InitializedEntity &Entity,
3709                                            const InitializationKind &Kind,
3710                                            InitListExpr *InitList,
3711                                            InitializationSequence &Sequence,
3712                                            bool TreatUnavailableAsInvalid) {
3713   // First, catch C++03 where this isn't possible.
3714   if (!S.getLangOpts().CPlusPlus11) {
3715     Sequence.SetFailed(InitializationSequence::FK_ReferenceBindingToInitList);
3716     return;
3717   }
3718   // Can't reference initialize a compound literal.
3719   if (Entity.getKind() == InitializedEntity::EK_CompoundLiteralInit) {
3720     Sequence.SetFailed(InitializationSequence::FK_ReferenceBindingToInitList);
3721     return;
3722   }
3723 
3724   QualType DestType = Entity.getType();
3725   QualType cv1T1 = DestType->getAs<ReferenceType>()->getPointeeType();
3726   Qualifiers T1Quals;
3727   QualType T1 = S.Context.getUnqualifiedArrayType(cv1T1, T1Quals);
3728 
3729   // Reference initialization via an initializer list works thus:
3730   // If the initializer list consists of a single element that is
3731   // reference-related to the referenced type, bind directly to that element
3732   // (possibly creating temporaries).
3733   // Otherwise, initialize a temporary with the initializer list and
3734   // bind to that.
3735   if (InitList->getNumInits() == 1) {
3736     Expr *Initializer = InitList->getInit(0);
3737     QualType cv2T2 = Initializer->getType();
3738     Qualifiers T2Quals;
3739     QualType T2 = S.Context.getUnqualifiedArrayType(cv2T2, T2Quals);
3740 
3741     // If this fails, creating a temporary wouldn't work either.
3742     if (ResolveOverloadedFunctionForReferenceBinding(S, Initializer, cv2T2, T2,
3743                                                      T1, Sequence))
3744       return;
3745 
3746     SourceLocation DeclLoc = Initializer->getLocStart();
3747     bool dummy1, dummy2, dummy3;
3748     Sema::ReferenceCompareResult RefRelationship
3749       = S.CompareReferenceRelationship(DeclLoc, cv1T1, cv2T2, dummy1,
3750                                        dummy2, dummy3);
3751     if (RefRelationship >= Sema::Ref_Related) {
3752       // Try to bind the reference here.
3753       TryReferenceInitializationCore(S, Entity, Kind, Initializer, cv1T1, T1,
3754                                      T1Quals, cv2T2, T2, T2Quals, Sequence);
3755       if (Sequence)
3756         Sequence.RewrapReferenceInitList(cv1T1, InitList);
3757       return;
3758     }
3759 
3760     // Update the initializer if we've resolved an overloaded function.
3761     if (Sequence.step_begin() != Sequence.step_end())
3762       Sequence.RewrapReferenceInitList(cv1T1, InitList);
3763   }
3764 
3765   // Not reference-related. Create a temporary and bind to that.
3766   InitializedEntity TempEntity = InitializedEntity::InitializeTemporary(cv1T1);
3767 
3768   TryListInitialization(S, TempEntity, Kind, InitList, Sequence,
3769                         TreatUnavailableAsInvalid);
3770   if (Sequence) {
3771     if (DestType->isRValueReferenceType() ||
3772         (T1Quals.hasConst() && !T1Quals.hasVolatile()))
3773       Sequence.AddReferenceBindingStep(cv1T1, /*bindingTemporary=*/true);
3774     else
3775       Sequence.SetFailed(
3776           InitializationSequence::FK_NonConstLValueReferenceBindingToTemporary);
3777   }
3778 }
3779 
3780 /// \brief Attempt list initialization (C++0x [dcl.init.list])
3781 static void TryListInitialization(Sema &S,
3782                                   const InitializedEntity &Entity,
3783                                   const InitializationKind &Kind,
3784                                   InitListExpr *InitList,
3785                                   InitializationSequence &Sequence,
3786                                   bool TreatUnavailableAsInvalid) {
3787   QualType DestType = Entity.getType();
3788 
3789   // C++ doesn't allow scalar initialization with more than one argument.
3790   // But C99 complex numbers are scalars and it makes sense there.
3791   if (S.getLangOpts().CPlusPlus && DestType->isScalarType() &&
3792       !DestType->isAnyComplexType() && InitList->getNumInits() > 1) {
3793     Sequence.SetFailed(InitializationSequence::FK_TooManyInitsForScalar);
3794     return;
3795   }
3796   if (DestType->isReferenceType()) {
3797     TryReferenceListInitialization(S, Entity, Kind, InitList, Sequence,
3798                                    TreatUnavailableAsInvalid);
3799     return;
3800   }
3801 
3802   if (DestType->isRecordType() &&
3803       !S.isCompleteType(InitList->getLocStart(), DestType)) {
3804     Sequence.setIncompleteTypeFailure(DestType);
3805     return;
3806   }
3807 
3808   // C++11 [dcl.init.list]p3, per DR1467:
3809   // - If T is a class type and the initializer list has a single element of
3810   //   type cv U, where U is T or a class derived from T, the object is
3811   //   initialized from that element (by copy-initialization for
3812   //   copy-list-initialization, or by direct-initialization for
3813   //   direct-list-initialization).
3814   // - Otherwise, if T is a character array and the initializer list has a
3815   //   single element that is an appropriately-typed string literal
3816   //   (8.5.2 [dcl.init.string]), initialization is performed as described
3817   //   in that section.
3818   // - Otherwise, if T is an aggregate, [...] (continue below).
3819   if (S.getLangOpts().CPlusPlus11 && InitList->getNumInits() == 1) {
3820     if (DestType->isRecordType()) {
3821       QualType InitType = InitList->getInit(0)->getType();
3822       if (S.Context.hasSameUnqualifiedType(InitType, DestType) ||
3823           S.IsDerivedFrom(InitList->getLocStart(), InitType, DestType)) {
3824         Expr *InitAsExpr = InitList->getInit(0);
3825         TryConstructorInitialization(S, Entity, Kind, InitAsExpr, DestType,
3826                                      Sequence, /*InitListSyntax*/ false,
3827                                      /*IsInitListCopy*/ true);
3828         return;
3829       }
3830     }
3831     if (const ArrayType *DestAT = S.Context.getAsArrayType(DestType)) {
3832       Expr *SubInit[1] = {InitList->getInit(0)};
3833       if (!isa<VariableArrayType>(DestAT) &&
3834           IsStringInit(SubInit[0], DestAT, S.Context) == SIF_None) {
3835         InitializationKind SubKind =
3836             Kind.getKind() == InitializationKind::IK_DirectList
3837                 ? InitializationKind::CreateDirect(Kind.getLocation(),
3838                                                    InitList->getLBraceLoc(),
3839                                                    InitList->getRBraceLoc())
3840                 : Kind;
3841         Sequence.InitializeFrom(S, Entity, SubKind, SubInit,
3842                                 /*TopLevelOfInitList*/ true,
3843                                 TreatUnavailableAsInvalid);
3844 
3845         // TryStringLiteralInitialization() (in InitializeFrom()) will fail if
3846         // the element is not an appropriately-typed string literal, in which
3847         // case we should proceed as in C++11 (below).
3848         if (Sequence) {
3849           Sequence.RewrapReferenceInitList(Entity.getType(), InitList);
3850           return;
3851         }
3852       }
3853     }
3854   }
3855 
3856   // C++11 [dcl.init.list]p3:
3857   //   - If T is an aggregate, aggregate initialization is performed.
3858   if ((DestType->isRecordType() && !DestType->isAggregateType()) ||
3859       (S.getLangOpts().CPlusPlus11 &&
3860        S.isStdInitializerList(DestType, nullptr))) {
3861     if (S.getLangOpts().CPlusPlus11) {
3862       //   - Otherwise, if the initializer list has no elements and T is a
3863       //     class type with a default constructor, the object is
3864       //     value-initialized.
3865       if (InitList->getNumInits() == 0) {
3866         CXXRecordDecl *RD = DestType->getAsCXXRecordDecl();
3867         if (RD->hasDefaultConstructor()) {
3868           TryValueInitialization(S, Entity, Kind, Sequence, InitList);
3869           return;
3870         }
3871       }
3872 
3873       //   - Otherwise, if T is a specialization of std::initializer_list<E>,
3874       //     an initializer_list object constructed [...]
3875       if (TryInitializerListConstruction(S, InitList, DestType, Sequence,
3876                                          TreatUnavailableAsInvalid))
3877         return;
3878 
3879       //   - Otherwise, if T is a class type, constructors are considered.
3880       Expr *InitListAsExpr = InitList;
3881       TryConstructorInitialization(S, Entity, Kind, InitListAsExpr, DestType,
3882                                    Sequence, /*InitListSyntax*/ true);
3883     } else
3884       Sequence.SetFailed(InitializationSequence::FK_InitListBadDestinationType);
3885     return;
3886   }
3887 
3888   if (S.getLangOpts().CPlusPlus && !DestType->isAggregateType() &&
3889       InitList->getNumInits() == 1) {
3890     Expr *E = InitList->getInit(0);
3891 
3892     //   - Otherwise, if T is an enumeration with a fixed underlying type,
3893     //     the initializer-list has a single element v, and the initialization
3894     //     is direct-list-initialization, the object is initialized with the
3895     //     value T(v); if a narrowing conversion is required to convert v to
3896     //     the underlying type of T, the program is ill-formed.
3897     auto *ET = DestType->getAs<EnumType>();
3898     if (S.getLangOpts().CPlusPlus1z &&
3899         Kind.getKind() == InitializationKind::IK_DirectList &&
3900         ET && ET->getDecl()->isFixed() &&
3901         !S.Context.hasSameUnqualifiedType(E->getType(), DestType) &&
3902         (E->getType()->isIntegralOrEnumerationType() ||
3903          E->getType()->isFloatingType())) {
3904       // There are two ways that T(v) can work when T is an enumeration type.
3905       // If there is either an implicit conversion sequence from v to T or
3906       // a conversion function that can convert from v to T, then we use that.
3907       // Otherwise, if v is of integral, enumeration, or floating-point type,
3908       // it is converted to the enumeration type via its underlying type.
3909       // There is no overlap possible between these two cases (except when the
3910       // source value is already of the destination type), and the first
3911       // case is handled by the general case for single-element lists below.
3912       ImplicitConversionSequence ICS;
3913       ICS.setStandard();
3914       ICS.Standard.setAsIdentityConversion();
3915       // If E is of a floating-point type, then the conversion is ill-formed
3916       // due to narrowing, but go through the motions in order to produce the
3917       // right diagnostic.
3918       ICS.Standard.Second = E->getType()->isFloatingType()
3919                                 ? ICK_Floating_Integral
3920                                 : ICK_Integral_Conversion;
3921       ICS.Standard.setFromType(E->getType());
3922       ICS.Standard.setToType(0, E->getType());
3923       ICS.Standard.setToType(1, DestType);
3924       ICS.Standard.setToType(2, DestType);
3925       Sequence.AddConversionSequenceStep(ICS, ICS.Standard.getToType(2),
3926                                          /*TopLevelOfInitList*/true);
3927       Sequence.RewrapReferenceInitList(Entity.getType(), InitList);
3928       return;
3929     }
3930 
3931     //   - Otherwise, if the initializer list has a single element of type E
3932     //     [...references are handled above...], the object or reference is
3933     //     initialized from that element (by copy-initialization for
3934     //     copy-list-initialization, or by direct-initialization for
3935     //     direct-list-initialization); if a narrowing conversion is required
3936     //     to convert the element to T, the program is ill-formed.
3937     //
3938     // Per core-24034, this is direct-initialization if we were performing
3939     // direct-list-initialization and copy-initialization otherwise.
3940     // We can't use InitListChecker for this, because it always performs
3941     // copy-initialization. This only matters if we might use an 'explicit'
3942     // conversion operator, so we only need to handle the cases where the source
3943     // is of record type.
3944     if (InitList->getInit(0)->getType()->isRecordType()) {
3945       InitializationKind SubKind =
3946           Kind.getKind() == InitializationKind::IK_DirectList
3947               ? InitializationKind::CreateDirect(Kind.getLocation(),
3948                                                  InitList->getLBraceLoc(),
3949                                                  InitList->getRBraceLoc())
3950               : Kind;
3951       Expr *SubInit[1] = { InitList->getInit(0) };
3952       Sequence.InitializeFrom(S, Entity, SubKind, SubInit,
3953                               /*TopLevelOfInitList*/true,
3954                               TreatUnavailableAsInvalid);
3955       if (Sequence)
3956         Sequence.RewrapReferenceInitList(Entity.getType(), InitList);
3957       return;
3958     }
3959   }
3960 
3961   InitListChecker CheckInitList(S, Entity, InitList,
3962           DestType, /*VerifyOnly=*/true, TreatUnavailableAsInvalid);
3963   if (CheckInitList.HadError()) {
3964     Sequence.SetFailed(InitializationSequence::FK_ListInitializationFailed);
3965     return;
3966   }
3967 
3968   // Add the list initialization step with the built init list.
3969   Sequence.AddListInitializationStep(DestType);
3970 }
3971 
3972 /// \brief Try a reference initialization that involves calling a conversion
3973 /// function.
3974 static OverloadingResult TryRefInitWithConversionFunction(Sema &S,
3975                                              const InitializedEntity &Entity,
3976                                              const InitializationKind &Kind,
3977                                              Expr *Initializer,
3978                                              bool AllowRValues,
3979                                              InitializationSequence &Sequence) {
3980   QualType DestType = Entity.getType();
3981   QualType cv1T1 = DestType->getAs<ReferenceType>()->getPointeeType();
3982   QualType T1 = cv1T1.getUnqualifiedType();
3983   QualType cv2T2 = Initializer->getType();
3984   QualType T2 = cv2T2.getUnqualifiedType();
3985 
3986   bool DerivedToBase;
3987   bool ObjCConversion;
3988   bool ObjCLifetimeConversion;
3989   assert(!S.CompareReferenceRelationship(Initializer->getLocStart(),
3990                                          T1, T2, DerivedToBase,
3991                                          ObjCConversion,
3992                                          ObjCLifetimeConversion) &&
3993          "Must have incompatible references when binding via conversion");
3994   (void)DerivedToBase;
3995   (void)ObjCConversion;
3996   (void)ObjCLifetimeConversion;
3997 
3998   // Build the candidate set directly in the initialization sequence
3999   // structure, so that it will persist if we fail.
4000   OverloadCandidateSet &CandidateSet = Sequence.getFailedCandidateSet();
4001   CandidateSet.clear();
4002 
4003   // Determine whether we are allowed to call explicit constructors or
4004   // explicit conversion operators.
4005   bool AllowExplicit = Kind.AllowExplicit();
4006   bool AllowExplicitConvs = Kind.allowExplicitConversionFunctionsInRefBinding();
4007 
4008   const RecordType *T1RecordType = nullptr;
4009   if (AllowRValues && (T1RecordType = T1->getAs<RecordType>()) &&
4010       S.isCompleteType(Kind.getLocation(), T1)) {
4011     // The type we're converting to is a class type. Enumerate its constructors
4012     // to see if there is a suitable conversion.
4013     CXXRecordDecl *T1RecordDecl = cast<CXXRecordDecl>(T1RecordType->getDecl());
4014 
4015     for (NamedDecl *D : S.LookupConstructors(T1RecordDecl)) {
4016       auto Info = getConstructorInfo(D);
4017       if (!Info.Constructor)
4018         continue;
4019 
4020       if (!Info.Constructor->isInvalidDecl() &&
4021           Info.Constructor->isConvertingConstructor(AllowExplicit)) {
4022         if (Info.ConstructorTmpl)
4023           S.AddTemplateOverloadCandidate(Info.ConstructorTmpl, Info.FoundDecl,
4024                                          /*ExplicitArgs*/ nullptr,
4025                                          Initializer, CandidateSet,
4026                                          /*SuppressUserConversions=*/true);
4027         else
4028           S.AddOverloadCandidate(Info.Constructor, Info.FoundDecl,
4029                                  Initializer, CandidateSet,
4030                                  /*SuppressUserConversions=*/true);
4031       }
4032     }
4033   }
4034   if (T1RecordType && T1RecordType->getDecl()->isInvalidDecl())
4035     return OR_No_Viable_Function;
4036 
4037   const RecordType *T2RecordType = nullptr;
4038   if ((T2RecordType = T2->getAs<RecordType>()) &&
4039       S.isCompleteType(Kind.getLocation(), T2)) {
4040     // The type we're converting from is a class type, enumerate its conversion
4041     // functions.
4042     CXXRecordDecl *T2RecordDecl = cast<CXXRecordDecl>(T2RecordType->getDecl());
4043 
4044     const auto &Conversions = T2RecordDecl->getVisibleConversionFunctions();
4045     for (auto I = Conversions.begin(), E = Conversions.end(); I != E; ++I) {
4046       NamedDecl *D = *I;
4047       CXXRecordDecl *ActingDC = cast<CXXRecordDecl>(D->getDeclContext());
4048       if (isa<UsingShadowDecl>(D))
4049         D = cast<UsingShadowDecl>(D)->getTargetDecl();
4050 
4051       FunctionTemplateDecl *ConvTemplate = dyn_cast<FunctionTemplateDecl>(D);
4052       CXXConversionDecl *Conv;
4053       if (ConvTemplate)
4054         Conv = cast<CXXConversionDecl>(ConvTemplate->getTemplatedDecl());
4055       else
4056         Conv = cast<CXXConversionDecl>(D);
4057 
4058       // If the conversion function doesn't return a reference type,
4059       // it can't be considered for this conversion unless we're allowed to
4060       // consider rvalues.
4061       // FIXME: Do we need to make sure that we only consider conversion
4062       // candidates with reference-compatible results? That might be needed to
4063       // break recursion.
4064       if ((AllowExplicitConvs || !Conv->isExplicit()) &&
4065           (AllowRValues || Conv->getConversionType()->isLValueReferenceType())){
4066         if (ConvTemplate)
4067           S.AddTemplateConversionCandidate(ConvTemplate, I.getPair(),
4068                                            ActingDC, Initializer,
4069                                            DestType, CandidateSet,
4070                                            /*AllowObjCConversionOnExplicit=*/
4071                                              false);
4072         else
4073           S.AddConversionCandidate(Conv, I.getPair(), ActingDC,
4074                                    Initializer, DestType, CandidateSet,
4075                                    /*AllowObjCConversionOnExplicit=*/false);
4076       }
4077     }
4078   }
4079   if (T2RecordType && T2RecordType->getDecl()->isInvalidDecl())
4080     return OR_No_Viable_Function;
4081 
4082   SourceLocation DeclLoc = Initializer->getLocStart();
4083 
4084   // Perform overload resolution. If it fails, return the failed result.
4085   OverloadCandidateSet::iterator Best;
4086   if (OverloadingResult Result
4087         = CandidateSet.BestViableFunction(S, DeclLoc, Best, true))
4088     return Result;
4089 
4090   FunctionDecl *Function = Best->Function;
4091   // This is the overload that will be used for this initialization step if we
4092   // use this initialization. Mark it as referenced.
4093   Function->setReferenced();
4094 
4095   // Compute the returned type of the conversion.
4096   if (isa<CXXConversionDecl>(Function))
4097     T2 = Function->getReturnType();
4098   else
4099     T2 = cv1T1;
4100 
4101   // Add the user-defined conversion step.
4102   bool HadMultipleCandidates = (CandidateSet.size() > 1);
4103   Sequence.AddUserConversionStep(Function, Best->FoundDecl,
4104                                  T2.getNonLValueExprType(S.Context),
4105                                  HadMultipleCandidates);
4106 
4107   // Determine whether we need to perform derived-to-base or
4108   // cv-qualification adjustments.
4109   ExprValueKind VK = VK_RValue;
4110   if (T2->isLValueReferenceType())
4111     VK = VK_LValue;
4112   else if (const RValueReferenceType *RRef = T2->getAs<RValueReferenceType>())
4113     VK = RRef->getPointeeType()->isFunctionType() ? VK_LValue : VK_XValue;
4114 
4115   bool NewDerivedToBase = false;
4116   bool NewObjCConversion = false;
4117   bool NewObjCLifetimeConversion = false;
4118   Sema::ReferenceCompareResult NewRefRelationship
4119     = S.CompareReferenceRelationship(DeclLoc, T1,
4120                                      T2.getNonLValueExprType(S.Context),
4121                                      NewDerivedToBase, NewObjCConversion,
4122                                      NewObjCLifetimeConversion);
4123   if (NewRefRelationship == Sema::Ref_Incompatible) {
4124     // If the type we've converted to is not reference-related to the
4125     // type we're looking for, then there is another conversion step
4126     // we need to perform to produce a temporary of the right type
4127     // that we'll be binding to.
4128     ImplicitConversionSequence ICS;
4129     ICS.setStandard();
4130     ICS.Standard = Best->FinalConversion;
4131     T2 = ICS.Standard.getToType(2);
4132     Sequence.AddConversionSequenceStep(ICS, T2);
4133   } else if (NewDerivedToBase)
4134     Sequence.AddDerivedToBaseCastStep(
4135                                 S.Context.getQualifiedType(T1,
4136                                   T2.getNonReferenceType().getQualifiers()),
4137                                       VK);
4138   else if (NewObjCConversion)
4139     Sequence.AddObjCObjectConversionStep(
4140                                 S.Context.getQualifiedType(T1,
4141                                   T2.getNonReferenceType().getQualifiers()));
4142 
4143   if (cv1T1.getQualifiers() != T2.getNonReferenceType().getQualifiers())
4144     Sequence.AddQualificationConversionStep(cv1T1, VK);
4145 
4146   Sequence.AddReferenceBindingStep(cv1T1, !T2->isReferenceType());
4147   return OR_Success;
4148 }
4149 
4150 static void CheckCXX98CompatAccessibleCopy(Sema &S,
4151                                            const InitializedEntity &Entity,
4152                                            Expr *CurInitExpr);
4153 
4154 /// \brief Attempt reference initialization (C++0x [dcl.init.ref])
4155 static void TryReferenceInitialization(Sema &S,
4156                                        const InitializedEntity &Entity,
4157                                        const InitializationKind &Kind,
4158                                        Expr *Initializer,
4159                                        InitializationSequence &Sequence) {
4160   QualType DestType = Entity.getType();
4161   QualType cv1T1 = DestType->getAs<ReferenceType>()->getPointeeType();
4162   Qualifiers T1Quals;
4163   QualType T1 = S.Context.getUnqualifiedArrayType(cv1T1, T1Quals);
4164   QualType cv2T2 = Initializer->getType();
4165   Qualifiers T2Quals;
4166   QualType T2 = S.Context.getUnqualifiedArrayType(cv2T2, T2Quals);
4167 
4168   // If the initializer is the address of an overloaded function, try
4169   // to resolve the overloaded function. If all goes well, T2 is the
4170   // type of the resulting function.
4171   if (ResolveOverloadedFunctionForReferenceBinding(S, Initializer, cv2T2, T2,
4172                                                    T1, Sequence))
4173     return;
4174 
4175   // Delegate everything else to a subfunction.
4176   TryReferenceInitializationCore(S, Entity, Kind, Initializer, cv1T1, T1,
4177                                  T1Quals, cv2T2, T2, T2Quals, Sequence);
4178 }
4179 
4180 /// Converts the target of reference initialization so that it has the
4181 /// appropriate qualifiers and value kind.
4182 ///
4183 /// In this case, 'x' is an 'int' lvalue, but it needs to be 'const int'.
4184 /// \code
4185 ///   int x;
4186 ///   const int &r = x;
4187 /// \endcode
4188 ///
4189 /// In this case the reference is binding to a bitfield lvalue, which isn't
4190 /// valid. Perform a load to create a lifetime-extended temporary instead.
4191 /// \code
4192 ///   const int &r = someStruct.bitfield;
4193 /// \endcode
4194 static ExprValueKind
4195 convertQualifiersAndValueKindIfNecessary(Sema &S,
4196                                          InitializationSequence &Sequence,
4197                                          Expr *Initializer,
4198                                          QualType cv1T1,
4199                                          Qualifiers T1Quals,
4200                                          Qualifiers T2Quals,
4201                                          bool IsLValueRef) {
4202   bool IsNonAddressableType = Initializer->refersToBitField() ||
4203                               Initializer->refersToVectorElement();
4204 
4205   if (IsNonAddressableType) {
4206     // C++11 [dcl.init.ref]p5: [...] Otherwise, the reference shall be an
4207     // lvalue reference to a non-volatile const type, or the reference shall be
4208     // an rvalue reference.
4209     //
4210     // If not, we can't make a temporary and bind to that. Give up and allow the
4211     // error to be diagnosed later.
4212     if (IsLValueRef && (!T1Quals.hasConst() || T1Quals.hasVolatile())) {
4213       assert(Initializer->isGLValue());
4214       return Initializer->getValueKind();
4215     }
4216 
4217     // Force a load so we can materialize a temporary.
4218     Sequence.AddLValueToRValueStep(cv1T1.getUnqualifiedType());
4219     return VK_RValue;
4220   }
4221 
4222   if (T1Quals != T2Quals) {
4223     Sequence.AddQualificationConversionStep(cv1T1,
4224                                             Initializer->getValueKind());
4225   }
4226 
4227   return Initializer->getValueKind();
4228 }
4229 
4230 /// \brief Reference initialization without resolving overloaded functions.
4231 static void TryReferenceInitializationCore(Sema &S,
4232                                            const InitializedEntity &Entity,
4233                                            const InitializationKind &Kind,
4234                                            Expr *Initializer,
4235                                            QualType cv1T1, QualType T1,
4236                                            Qualifiers T1Quals,
4237                                            QualType cv2T2, QualType T2,
4238                                            Qualifiers T2Quals,
4239                                            InitializationSequence &Sequence) {
4240   QualType DestType = Entity.getType();
4241   SourceLocation DeclLoc = Initializer->getLocStart();
4242   // Compute some basic properties of the types and the initializer.
4243   bool isLValueRef = DestType->isLValueReferenceType();
4244   bool isRValueRef = !isLValueRef;
4245   bool DerivedToBase = false;
4246   bool ObjCConversion = false;
4247   bool ObjCLifetimeConversion = false;
4248   Expr::Classification InitCategory = Initializer->Classify(S.Context);
4249   Sema::ReferenceCompareResult RefRelationship
4250     = S.CompareReferenceRelationship(DeclLoc, cv1T1, cv2T2, DerivedToBase,
4251                                      ObjCConversion, ObjCLifetimeConversion);
4252 
4253   // C++0x [dcl.init.ref]p5:
4254   //   A reference to type "cv1 T1" is initialized by an expression of type
4255   //   "cv2 T2" as follows:
4256   //
4257   //     - If the reference is an lvalue reference and the initializer
4258   //       expression
4259   // Note the analogous bullet points for rvalue refs to functions. Because
4260   // there are no function rvalues in C++, rvalue refs to functions are treated
4261   // like lvalue refs.
4262   OverloadingResult ConvOvlResult = OR_Success;
4263   bool T1Function = T1->isFunctionType();
4264   if (isLValueRef || T1Function) {
4265     if (InitCategory.isLValue() &&
4266         (RefRelationship >= Sema::Ref_Compatible_With_Added_Qualification ||
4267          (Kind.isCStyleOrFunctionalCast() &&
4268           RefRelationship == Sema::Ref_Related))) {
4269       //   - is an lvalue (but is not a bit-field), and "cv1 T1" is
4270       //     reference-compatible with "cv2 T2," or
4271       //
4272       // Per C++ [over.best.ics]p2, we don't diagnose whether the lvalue is a
4273       // bit-field when we're determining whether the reference initialization
4274       // can occur. However, we do pay attention to whether it is a bit-field
4275       // to decide whether we're actually binding to a temporary created from
4276       // the bit-field.
4277       if (DerivedToBase)
4278         Sequence.AddDerivedToBaseCastStep(
4279                          S.Context.getQualifiedType(T1, T2Quals),
4280                          VK_LValue);
4281       else if (ObjCConversion)
4282         Sequence.AddObjCObjectConversionStep(
4283                                      S.Context.getQualifiedType(T1, T2Quals));
4284 
4285       ExprValueKind ValueKind =
4286         convertQualifiersAndValueKindIfNecessary(S, Sequence, Initializer,
4287                                                  cv1T1, T1Quals, T2Quals,
4288                                                  isLValueRef);
4289       Sequence.AddReferenceBindingStep(cv1T1, ValueKind == VK_RValue);
4290       return;
4291     }
4292 
4293     //     - has a class type (i.e., T2 is a class type), where T1 is not
4294     //       reference-related to T2, and can be implicitly converted to an
4295     //       lvalue of type "cv3 T3," where "cv1 T1" is reference-compatible
4296     //       with "cv3 T3" (this conversion is selected by enumerating the
4297     //       applicable conversion functions (13.3.1.6) and choosing the best
4298     //       one through overload resolution (13.3)),
4299     // If we have an rvalue ref to function type here, the rhs must be
4300     // an rvalue. DR1287 removed the "implicitly" here.
4301     if (RefRelationship == Sema::Ref_Incompatible && T2->isRecordType() &&
4302         (isLValueRef || InitCategory.isRValue())) {
4303       ConvOvlResult = TryRefInitWithConversionFunction(
4304           S, Entity, Kind, Initializer, /*AllowRValues*/isRValueRef, Sequence);
4305       if (ConvOvlResult == OR_Success)
4306         return;
4307       if (ConvOvlResult != OR_No_Viable_Function)
4308         Sequence.SetOverloadFailure(
4309             InitializationSequence::FK_ReferenceInitOverloadFailed,
4310             ConvOvlResult);
4311     }
4312   }
4313 
4314   //     - Otherwise, the reference shall be an lvalue reference to a
4315   //       non-volatile const type (i.e., cv1 shall be const), or the reference
4316   //       shall be an rvalue reference.
4317   if (isLValueRef && !(T1Quals.hasConst() && !T1Quals.hasVolatile())) {
4318     if (S.Context.getCanonicalType(T2) == S.Context.OverloadTy)
4319       Sequence.SetFailed(InitializationSequence::FK_AddressOfOverloadFailed);
4320     else if (ConvOvlResult && !Sequence.getFailedCandidateSet().empty())
4321       Sequence.SetOverloadFailure(
4322                         InitializationSequence::FK_ReferenceInitOverloadFailed,
4323                                   ConvOvlResult);
4324     else
4325       Sequence.SetFailed(InitCategory.isLValue()
4326         ? (RefRelationship == Sema::Ref_Related
4327              ? InitializationSequence::FK_ReferenceInitDropsQualifiers
4328              : InitializationSequence::FK_NonConstLValueReferenceBindingToUnrelated)
4329         : InitializationSequence::FK_NonConstLValueReferenceBindingToTemporary);
4330 
4331     return;
4332   }
4333 
4334   //    - If the initializer expression
4335   //      - is an xvalue, class prvalue, array prvalue, or function lvalue and
4336   //        "cv1 T1" is reference-compatible with "cv2 T2"
4337   // Note: functions are handled below.
4338   if (!T1Function &&
4339       (RefRelationship >= Sema::Ref_Compatible_With_Added_Qualification ||
4340        (Kind.isCStyleOrFunctionalCast() &&
4341         RefRelationship == Sema::Ref_Related)) &&
4342       (InitCategory.isXValue() ||
4343        (InitCategory.isPRValue() && T2->isRecordType()) ||
4344        (InitCategory.isPRValue() && T2->isArrayType()))) {
4345     ExprValueKind ValueKind = InitCategory.isXValue()? VK_XValue : VK_RValue;
4346     if (InitCategory.isPRValue() && T2->isRecordType()) {
4347       // The corresponding bullet in C++03 [dcl.init.ref]p5 gives the
4348       // compiler the freedom to perform a copy here or bind to the
4349       // object, while C++0x requires that we bind directly to the
4350       // object. Hence, we always bind to the object without making an
4351       // extra copy. However, in C++03 requires that we check for the
4352       // presence of a suitable copy constructor:
4353       //
4354       //   The constructor that would be used to make the copy shall
4355       //   be callable whether or not the copy is actually done.
4356       if (!S.getLangOpts().CPlusPlus11 && !S.getLangOpts().MicrosoftExt)
4357         Sequence.AddExtraneousCopyToTemporary(cv2T2);
4358       else if (S.getLangOpts().CPlusPlus11)
4359         CheckCXX98CompatAccessibleCopy(S, Entity, Initializer);
4360     }
4361 
4362     if (DerivedToBase)
4363       Sequence.AddDerivedToBaseCastStep(S.Context.getQualifiedType(T1, T2Quals),
4364                                         ValueKind);
4365     else if (ObjCConversion)
4366       Sequence.AddObjCObjectConversionStep(
4367                                        S.Context.getQualifiedType(T1, T2Quals));
4368 
4369     ValueKind = convertQualifiersAndValueKindIfNecessary(S, Sequence,
4370                                                          Initializer, cv1T1,
4371                                                          T1Quals, T2Quals,
4372                                                          isLValueRef);
4373 
4374     Sequence.AddReferenceBindingStep(cv1T1, ValueKind == VK_RValue);
4375     return;
4376   }
4377 
4378   //       - has a class type (i.e., T2 is a class type), where T1 is not
4379   //         reference-related to T2, and can be implicitly converted to an
4380   //         xvalue, class prvalue, or function lvalue of type "cv3 T3",
4381   //         where "cv1 T1" is reference-compatible with "cv3 T3",
4382   //
4383   // DR1287 removes the "implicitly" here.
4384   if (T2->isRecordType()) {
4385     if (RefRelationship == Sema::Ref_Incompatible) {
4386       ConvOvlResult = TryRefInitWithConversionFunction(
4387           S, Entity, Kind, Initializer, /*AllowRValues*/true, Sequence);
4388       if (ConvOvlResult)
4389         Sequence.SetOverloadFailure(
4390             InitializationSequence::FK_ReferenceInitOverloadFailed,
4391             ConvOvlResult);
4392 
4393       return;
4394     }
4395 
4396     if ((RefRelationship == Sema::Ref_Compatible ||
4397          RefRelationship == Sema::Ref_Compatible_With_Added_Qualification) &&
4398         isRValueRef && InitCategory.isLValue()) {
4399       Sequence.SetFailed(
4400         InitializationSequence::FK_RValueReferenceBindingToLValue);
4401       return;
4402     }
4403 
4404     Sequence.SetFailed(InitializationSequence::FK_ReferenceInitDropsQualifiers);
4405     return;
4406   }
4407 
4408   //      - Otherwise, a temporary of type "cv1 T1" is created and initialized
4409   //        from the initializer expression using the rules for a non-reference
4410   //        copy-initialization (8.5). The reference is then bound to the
4411   //        temporary. [...]
4412 
4413   InitializedEntity TempEntity = InitializedEntity::InitializeTemporary(cv1T1);
4414 
4415   // FIXME: Why do we use an implicit conversion here rather than trying
4416   // copy-initialization?
4417   ImplicitConversionSequence ICS
4418     = S.TryImplicitConversion(Initializer, TempEntity.getType(),
4419                               /*SuppressUserConversions=*/false,
4420                               /*AllowExplicit=*/false,
4421                               /*FIXME:InOverloadResolution=*/false,
4422                               /*CStyle=*/Kind.isCStyleOrFunctionalCast(),
4423                               /*AllowObjCWritebackConversion=*/false);
4424 
4425   if (ICS.isBad()) {
4426     // FIXME: Use the conversion function set stored in ICS to turn
4427     // this into an overloading ambiguity diagnostic. However, we need
4428     // to keep that set as an OverloadCandidateSet rather than as some
4429     // other kind of set.
4430     if (ConvOvlResult && !Sequence.getFailedCandidateSet().empty())
4431       Sequence.SetOverloadFailure(
4432                         InitializationSequence::FK_ReferenceInitOverloadFailed,
4433                                   ConvOvlResult);
4434     else if (S.Context.getCanonicalType(T2) == S.Context.OverloadTy)
4435       Sequence.SetFailed(InitializationSequence::FK_AddressOfOverloadFailed);
4436     else
4437       Sequence.SetFailed(InitializationSequence::FK_ReferenceInitFailed);
4438     return;
4439   } else {
4440     Sequence.AddConversionSequenceStep(ICS, TempEntity.getType());
4441   }
4442 
4443   //        [...] If T1 is reference-related to T2, cv1 must be the
4444   //        same cv-qualification as, or greater cv-qualification
4445   //        than, cv2; otherwise, the program is ill-formed.
4446   unsigned T1CVRQuals = T1Quals.getCVRQualifiers();
4447   unsigned T2CVRQuals = T2Quals.getCVRQualifiers();
4448   if (RefRelationship == Sema::Ref_Related &&
4449       (T1CVRQuals | T2CVRQuals) != T1CVRQuals) {
4450     Sequence.SetFailed(InitializationSequence::FK_ReferenceInitDropsQualifiers);
4451     return;
4452   }
4453 
4454   //   [...] If T1 is reference-related to T2 and the reference is an rvalue
4455   //   reference, the initializer expression shall not be an lvalue.
4456   if (RefRelationship >= Sema::Ref_Related && !isLValueRef &&
4457       InitCategory.isLValue()) {
4458     Sequence.SetFailed(
4459                     InitializationSequence::FK_RValueReferenceBindingToLValue);
4460     return;
4461   }
4462 
4463   Sequence.AddReferenceBindingStep(cv1T1, /*bindingTemporary=*/true);
4464 }
4465 
4466 /// \brief Attempt character array initialization from a string literal
4467 /// (C++ [dcl.init.string], C99 6.7.8).
4468 static void TryStringLiteralInitialization(Sema &S,
4469                                            const InitializedEntity &Entity,
4470                                            const InitializationKind &Kind,
4471                                            Expr *Initializer,
4472                                        InitializationSequence &Sequence) {
4473   Sequence.AddStringInitStep(Entity.getType());
4474 }
4475 
4476 /// \brief Attempt value initialization (C++ [dcl.init]p7).
4477 static void TryValueInitialization(Sema &S,
4478                                    const InitializedEntity &Entity,
4479                                    const InitializationKind &Kind,
4480                                    InitializationSequence &Sequence,
4481                                    InitListExpr *InitList) {
4482   assert((!InitList || InitList->getNumInits() == 0) &&
4483          "Shouldn't use value-init for non-empty init lists");
4484 
4485   // C++98 [dcl.init]p5, C++11 [dcl.init]p7:
4486   //
4487   //   To value-initialize an object of type T means:
4488   QualType T = Entity.getType();
4489 
4490   //     -- if T is an array type, then each element is value-initialized;
4491   T = S.Context.getBaseElementType(T);
4492 
4493   if (const RecordType *RT = T->getAs<RecordType>()) {
4494     if (CXXRecordDecl *ClassDecl = dyn_cast<CXXRecordDecl>(RT->getDecl())) {
4495       bool NeedZeroInitialization = true;
4496       if (!S.getLangOpts().CPlusPlus11) {
4497         // C++98:
4498         // -- if T is a class type (clause 9) with a user-declared constructor
4499         //    (12.1), then the default constructor for T is called (and the
4500         //    initialization is ill-formed if T has no accessible default
4501         //    constructor);
4502         if (ClassDecl->hasUserDeclaredConstructor())
4503           NeedZeroInitialization = false;
4504       } else {
4505         // C++11:
4506         // -- if T is a class type (clause 9) with either no default constructor
4507         //    (12.1 [class.ctor]) or a default constructor that is user-provided
4508         //    or deleted, then the object is default-initialized;
4509         CXXConstructorDecl *CD = S.LookupDefaultConstructor(ClassDecl);
4510         if (!CD || !CD->getCanonicalDecl()->isDefaulted() || CD->isDeleted())
4511           NeedZeroInitialization = false;
4512       }
4513 
4514       // -- if T is a (possibly cv-qualified) non-union class type without a
4515       //    user-provided or deleted default constructor, then the object is
4516       //    zero-initialized and, if T has a non-trivial default constructor,
4517       //    default-initialized;
4518       // The 'non-union' here was removed by DR1502. The 'non-trivial default
4519       // constructor' part was removed by DR1507.
4520       if (NeedZeroInitialization)
4521         Sequence.AddZeroInitializationStep(Entity.getType());
4522 
4523       // C++03:
4524       // -- if T is a non-union class type without a user-declared constructor,
4525       //    then every non-static data member and base class component of T is
4526       //    value-initialized;
4527       // [...] A program that calls for [...] value-initialization of an
4528       // entity of reference type is ill-formed.
4529       //
4530       // C++11 doesn't need this handling, because value-initialization does not
4531       // occur recursively there, and the implicit default constructor is
4532       // defined as deleted in the problematic cases.
4533       if (!S.getLangOpts().CPlusPlus11 &&
4534           ClassDecl->hasUninitializedReferenceMember()) {
4535         Sequence.SetFailed(InitializationSequence::FK_TooManyInitsForReference);
4536         return;
4537       }
4538 
4539       // If this is list-value-initialization, pass the empty init list on when
4540       // building the constructor call. This affects the semantics of a few
4541       // things (such as whether an explicit default constructor can be called).
4542       Expr *InitListAsExpr = InitList;
4543       MultiExprArg Args(&InitListAsExpr, InitList ? 1 : 0);
4544       bool InitListSyntax = InitList;
4545 
4546       return TryConstructorInitialization(S, Entity, Kind, Args, T, Sequence,
4547                                           InitListSyntax);
4548     }
4549   }
4550 
4551   Sequence.AddZeroInitializationStep(Entity.getType());
4552 }
4553 
4554 /// \brief Attempt default initialization (C++ [dcl.init]p6).
4555 static void TryDefaultInitialization(Sema &S,
4556                                      const InitializedEntity &Entity,
4557                                      const InitializationKind &Kind,
4558                                      InitializationSequence &Sequence) {
4559   assert(Kind.getKind() == InitializationKind::IK_Default);
4560 
4561   // C++ [dcl.init]p6:
4562   //   To default-initialize an object of type T means:
4563   //     - if T is an array type, each element is default-initialized;
4564   QualType DestType = S.Context.getBaseElementType(Entity.getType());
4565 
4566   //     - if T is a (possibly cv-qualified) class type (Clause 9), the default
4567   //       constructor for T is called (and the initialization is ill-formed if
4568   //       T has no accessible default constructor);
4569   if (DestType->isRecordType() && S.getLangOpts().CPlusPlus) {
4570     TryConstructorInitialization(S, Entity, Kind, None, DestType, Sequence);
4571     return;
4572   }
4573 
4574   //     - otherwise, no initialization is performed.
4575 
4576   //   If a program calls for the default initialization of an object of
4577   //   a const-qualified type T, T shall be a class type with a user-provided
4578   //   default constructor.
4579   if (DestType.isConstQualified() && S.getLangOpts().CPlusPlus) {
4580     if (!maybeRecoverWithZeroInitialization(S, Sequence, Entity))
4581       Sequence.SetFailed(InitializationSequence::FK_DefaultInitOfConst);
4582     return;
4583   }
4584 
4585   // If the destination type has a lifetime property, zero-initialize it.
4586   if (DestType.getQualifiers().hasObjCLifetime()) {
4587     Sequence.AddZeroInitializationStep(Entity.getType());
4588     return;
4589   }
4590 }
4591 
4592 /// \brief Attempt a user-defined conversion between two types (C++ [dcl.init]),
4593 /// which enumerates all conversion functions and performs overload resolution
4594 /// to select the best.
4595 static void TryUserDefinedConversion(Sema &S,
4596                                      QualType DestType,
4597                                      const InitializationKind &Kind,
4598                                      Expr *Initializer,
4599                                      InitializationSequence &Sequence,
4600                                      bool TopLevelOfInitList) {
4601   assert(!DestType->isReferenceType() && "References are handled elsewhere");
4602   QualType SourceType = Initializer->getType();
4603   assert((DestType->isRecordType() || SourceType->isRecordType()) &&
4604          "Must have a class type to perform a user-defined conversion");
4605 
4606   // Build the candidate set directly in the initialization sequence
4607   // structure, so that it will persist if we fail.
4608   OverloadCandidateSet &CandidateSet = Sequence.getFailedCandidateSet();
4609   CandidateSet.clear();
4610 
4611   // Determine whether we are allowed to call explicit constructors or
4612   // explicit conversion operators.
4613   bool AllowExplicit = Kind.AllowExplicit();
4614 
4615   if (const RecordType *DestRecordType = DestType->getAs<RecordType>()) {
4616     // The type we're converting to is a class type. Enumerate its constructors
4617     // to see if there is a suitable conversion.
4618     CXXRecordDecl *DestRecordDecl
4619       = cast<CXXRecordDecl>(DestRecordType->getDecl());
4620 
4621     // Try to complete the type we're converting to.
4622     if (S.isCompleteType(Kind.getLocation(), DestType)) {
4623       DeclContext::lookup_result R = S.LookupConstructors(DestRecordDecl);
4624       // The container holding the constructors can under certain conditions
4625       // be changed while iterating. To be safe we copy the lookup results
4626       // to a new container.
4627       SmallVector<NamedDecl*, 8> CopyOfCon(R.begin(), R.end());
4628       for (SmallVectorImpl<NamedDecl *>::iterator
4629              Con = CopyOfCon.begin(), ConEnd = CopyOfCon.end();
4630            Con != ConEnd; ++Con) {
4631         NamedDecl *D = *Con;
4632         auto Info = getConstructorInfo(D);
4633         if (!Info.Constructor)
4634           continue;
4635 
4636         if (!Info.Constructor->isInvalidDecl() &&
4637             Info.Constructor->isConvertingConstructor(AllowExplicit)) {
4638           if (Info.ConstructorTmpl)
4639             S.AddTemplateOverloadCandidate(Info.ConstructorTmpl, Info.FoundDecl,
4640                                            /*ExplicitArgs*/ nullptr,
4641                                            Initializer, CandidateSet,
4642                                            /*SuppressUserConversions=*/true);
4643           else
4644             S.AddOverloadCandidate(Info.Constructor, Info.FoundDecl,
4645                                    Initializer, CandidateSet,
4646                                    /*SuppressUserConversions=*/true);
4647         }
4648       }
4649     }
4650   }
4651 
4652   SourceLocation DeclLoc = Initializer->getLocStart();
4653 
4654   if (const RecordType *SourceRecordType = SourceType->getAs<RecordType>()) {
4655     // The type we're converting from is a class type, enumerate its conversion
4656     // functions.
4657 
4658     // We can only enumerate the conversion functions for a complete type; if
4659     // the type isn't complete, simply skip this step.
4660     if (S.isCompleteType(DeclLoc, SourceType)) {
4661       CXXRecordDecl *SourceRecordDecl
4662         = cast<CXXRecordDecl>(SourceRecordType->getDecl());
4663 
4664       const auto &Conversions =
4665           SourceRecordDecl->getVisibleConversionFunctions();
4666       for (auto I = Conversions.begin(), E = Conversions.end(); I != E; ++I) {
4667         NamedDecl *D = *I;
4668         CXXRecordDecl *ActingDC = cast<CXXRecordDecl>(D->getDeclContext());
4669         if (isa<UsingShadowDecl>(D))
4670           D = cast<UsingShadowDecl>(D)->getTargetDecl();
4671 
4672         FunctionTemplateDecl *ConvTemplate = dyn_cast<FunctionTemplateDecl>(D);
4673         CXXConversionDecl *Conv;
4674         if (ConvTemplate)
4675           Conv = cast<CXXConversionDecl>(ConvTemplate->getTemplatedDecl());
4676         else
4677           Conv = cast<CXXConversionDecl>(D);
4678 
4679         if (AllowExplicit || !Conv->isExplicit()) {
4680           if (ConvTemplate)
4681             S.AddTemplateConversionCandidate(ConvTemplate, I.getPair(),
4682                                              ActingDC, Initializer, DestType,
4683                                              CandidateSet, AllowExplicit);
4684           else
4685             S.AddConversionCandidate(Conv, I.getPair(), ActingDC,
4686                                      Initializer, DestType, CandidateSet,
4687                                      AllowExplicit);
4688         }
4689       }
4690     }
4691   }
4692 
4693   // Perform overload resolution. If it fails, return the failed result.
4694   OverloadCandidateSet::iterator Best;
4695   if (OverloadingResult Result
4696         = CandidateSet.BestViableFunction(S, DeclLoc, Best, true)) {
4697     Sequence.SetOverloadFailure(
4698                         InitializationSequence::FK_UserConversionOverloadFailed,
4699                                 Result);
4700     return;
4701   }
4702 
4703   FunctionDecl *Function = Best->Function;
4704   Function->setReferenced();
4705   bool HadMultipleCandidates = (CandidateSet.size() > 1);
4706 
4707   if (isa<CXXConstructorDecl>(Function)) {
4708     // Add the user-defined conversion step. Any cv-qualification conversion is
4709     // subsumed by the initialization. Per DR5, the created temporary is of the
4710     // cv-unqualified type of the destination.
4711     Sequence.AddUserConversionStep(Function, Best->FoundDecl,
4712                                    DestType.getUnqualifiedType(),
4713                                    HadMultipleCandidates);
4714     return;
4715   }
4716 
4717   // Add the user-defined conversion step that calls the conversion function.
4718   QualType ConvType = Function->getCallResultType();
4719   if (ConvType->getAs<RecordType>()) {
4720     // If we're converting to a class type, there may be an copy of
4721     // the resulting temporary object (possible to create an object of
4722     // a base class type). That copy is not a separate conversion, so
4723     // we just make a note of the actual destination type (possibly a
4724     // base class of the type returned by the conversion function) and
4725     // let the user-defined conversion step handle the conversion.
4726     Sequence.AddUserConversionStep(Function, Best->FoundDecl, DestType,
4727                                    HadMultipleCandidates);
4728     return;
4729   }
4730 
4731   Sequence.AddUserConversionStep(Function, Best->FoundDecl, ConvType,
4732                                  HadMultipleCandidates);
4733 
4734   // If the conversion following the call to the conversion function
4735   // is interesting, add it as a separate step.
4736   if (Best->FinalConversion.First || Best->FinalConversion.Second ||
4737       Best->FinalConversion.Third) {
4738     ImplicitConversionSequence ICS;
4739     ICS.setStandard();
4740     ICS.Standard = Best->FinalConversion;
4741     Sequence.AddConversionSequenceStep(ICS, DestType, TopLevelOfInitList);
4742   }
4743 }
4744 
4745 /// An egregious hack for compatibility with libstdc++-4.2: in <tr1/hashtable>,
4746 /// a function with a pointer return type contains a 'return false;' statement.
4747 /// In C++11, 'false' is not a null pointer, so this breaks the build of any
4748 /// code using that header.
4749 ///
4750 /// Work around this by treating 'return false;' as zero-initializing the result
4751 /// if it's used in a pointer-returning function in a system header.
4752 static bool isLibstdcxxPointerReturnFalseHack(Sema &S,
4753                                               const InitializedEntity &Entity,
4754                                               const Expr *Init) {
4755   return S.getLangOpts().CPlusPlus11 &&
4756          Entity.getKind() == InitializedEntity::EK_Result &&
4757          Entity.getType()->isPointerType() &&
4758          isa<CXXBoolLiteralExpr>(Init) &&
4759          !cast<CXXBoolLiteralExpr>(Init)->getValue() &&
4760          S.getSourceManager().isInSystemHeader(Init->getExprLoc());
4761 }
4762 
4763 /// The non-zero enum values here are indexes into diagnostic alternatives.
4764 enum InvalidICRKind { IIK_okay, IIK_nonlocal, IIK_nonscalar };
4765 
4766 /// Determines whether this expression is an acceptable ICR source.
4767 static InvalidICRKind isInvalidICRSource(ASTContext &C, Expr *e,
4768                                          bool isAddressOf, bool &isWeakAccess) {
4769   // Skip parens.
4770   e = e->IgnoreParens();
4771 
4772   // Skip address-of nodes.
4773   if (UnaryOperator *op = dyn_cast<UnaryOperator>(e)) {
4774     if (op->getOpcode() == UO_AddrOf)
4775       return isInvalidICRSource(C, op->getSubExpr(), /*addressof*/ true,
4776                                 isWeakAccess);
4777 
4778   // Skip certain casts.
4779   } else if (CastExpr *ce = dyn_cast<CastExpr>(e)) {
4780     switch (ce->getCastKind()) {
4781     case CK_Dependent:
4782     case CK_BitCast:
4783     case CK_LValueBitCast:
4784     case CK_NoOp:
4785       return isInvalidICRSource(C, ce->getSubExpr(), isAddressOf, isWeakAccess);
4786 
4787     case CK_ArrayToPointerDecay:
4788       return IIK_nonscalar;
4789 
4790     case CK_NullToPointer:
4791       return IIK_okay;
4792 
4793     default:
4794       break;
4795     }
4796 
4797   // If we have a declaration reference, it had better be a local variable.
4798   } else if (isa<DeclRefExpr>(e)) {
4799     // set isWeakAccess to true, to mean that there will be an implicit
4800     // load which requires a cleanup.
4801     if (e->getType().getObjCLifetime() == Qualifiers::OCL_Weak)
4802       isWeakAccess = true;
4803 
4804     if (!isAddressOf) return IIK_nonlocal;
4805 
4806     VarDecl *var = dyn_cast<VarDecl>(cast<DeclRefExpr>(e)->getDecl());
4807     if (!var) return IIK_nonlocal;
4808 
4809     return (var->hasLocalStorage() ? IIK_okay : IIK_nonlocal);
4810 
4811   // If we have a conditional operator, check both sides.
4812   } else if (ConditionalOperator *cond = dyn_cast<ConditionalOperator>(e)) {
4813     if (InvalidICRKind iik = isInvalidICRSource(C, cond->getLHS(), isAddressOf,
4814                                                 isWeakAccess))
4815       return iik;
4816 
4817     return isInvalidICRSource(C, cond->getRHS(), isAddressOf, isWeakAccess);
4818 
4819   // These are never scalar.
4820   } else if (isa<ArraySubscriptExpr>(e)) {
4821     return IIK_nonscalar;
4822 
4823   // Otherwise, it needs to be a null pointer constant.
4824   } else {
4825     return (e->isNullPointerConstant(C, Expr::NPC_ValueDependentIsNull)
4826             ? IIK_okay : IIK_nonlocal);
4827   }
4828 
4829   return IIK_nonlocal;
4830 }
4831 
4832 /// Check whether the given expression is a valid operand for an
4833 /// indirect copy/restore.
4834 static void checkIndirectCopyRestoreSource(Sema &S, Expr *src) {
4835   assert(src->isRValue());
4836   bool isWeakAccess = false;
4837   InvalidICRKind iik = isInvalidICRSource(S.Context, src, false, isWeakAccess);
4838   // If isWeakAccess to true, there will be an implicit
4839   // load which requires a cleanup.
4840   if (S.getLangOpts().ObjCAutoRefCount && isWeakAccess)
4841     S.Cleanup.setExprNeedsCleanups(true);
4842 
4843   if (iik == IIK_okay) return;
4844 
4845   S.Diag(src->getExprLoc(), diag::err_arc_nonlocal_writeback)
4846     << ((unsigned) iik - 1)  // shift index into diagnostic explanations
4847     << src->getSourceRange();
4848 }
4849 
4850 /// \brief Determine whether we have compatible array types for the
4851 /// purposes of GNU by-copy array initialization.
4852 static bool hasCompatibleArrayTypes(ASTContext &Context, const ArrayType *Dest,
4853                                     const ArrayType *Source) {
4854   // If the source and destination array types are equivalent, we're
4855   // done.
4856   if (Context.hasSameType(QualType(Dest, 0), QualType(Source, 0)))
4857     return true;
4858 
4859   // Make sure that the element types are the same.
4860   if (!Context.hasSameType(Dest->getElementType(), Source->getElementType()))
4861     return false;
4862 
4863   // The only mismatch we allow is when the destination is an
4864   // incomplete array type and the source is a constant array type.
4865   return Source->isConstantArrayType() && Dest->isIncompleteArrayType();
4866 }
4867 
4868 static bool tryObjCWritebackConversion(Sema &S,
4869                                        InitializationSequence &Sequence,
4870                                        const InitializedEntity &Entity,
4871                                        Expr *Initializer) {
4872   bool ArrayDecay = false;
4873   QualType ArgType = Initializer->getType();
4874   QualType ArgPointee;
4875   if (const ArrayType *ArgArrayType = S.Context.getAsArrayType(ArgType)) {
4876     ArrayDecay = true;
4877     ArgPointee = ArgArrayType->getElementType();
4878     ArgType = S.Context.getPointerType(ArgPointee);
4879   }
4880 
4881   // Handle write-back conversion.
4882   QualType ConvertedArgType;
4883   if (!S.isObjCWritebackConversion(ArgType, Entity.getType(),
4884                                    ConvertedArgType))
4885     return false;
4886 
4887   // We should copy unless we're passing to an argument explicitly
4888   // marked 'out'.
4889   bool ShouldCopy = true;
4890   if (ParmVarDecl *param = cast_or_null<ParmVarDecl>(Entity.getDecl()))
4891     ShouldCopy = (param->getObjCDeclQualifier() != ParmVarDecl::OBJC_TQ_Out);
4892 
4893   // Do we need an lvalue conversion?
4894   if (ArrayDecay || Initializer->isGLValue()) {
4895     ImplicitConversionSequence ICS;
4896     ICS.setStandard();
4897     ICS.Standard.setAsIdentityConversion();
4898 
4899     QualType ResultType;
4900     if (ArrayDecay) {
4901       ICS.Standard.First = ICK_Array_To_Pointer;
4902       ResultType = S.Context.getPointerType(ArgPointee);
4903     } else {
4904       ICS.Standard.First = ICK_Lvalue_To_Rvalue;
4905       ResultType = Initializer->getType().getNonLValueExprType(S.Context);
4906     }
4907 
4908     Sequence.AddConversionSequenceStep(ICS, ResultType);
4909   }
4910 
4911   Sequence.AddPassByIndirectCopyRestoreStep(Entity.getType(), ShouldCopy);
4912   return true;
4913 }
4914 
4915 static bool TryOCLSamplerInitialization(Sema &S,
4916                                         InitializationSequence &Sequence,
4917                                         QualType DestType,
4918                                         Expr *Initializer) {
4919   if (!S.getLangOpts().OpenCL || !DestType->isSamplerT() ||
4920       (!Initializer->isIntegerConstantExpr(S.Context) &&
4921       !Initializer->getType()->isSamplerT()))
4922     return false;
4923 
4924   Sequence.AddOCLSamplerInitStep(DestType);
4925   return true;
4926 }
4927 
4928 //
4929 // OpenCL 1.2 spec, s6.12.10
4930 //
4931 // The event argument can also be used to associate the
4932 // async_work_group_copy with a previous async copy allowing
4933 // an event to be shared by multiple async copies; otherwise
4934 // event should be zero.
4935 //
4936 static bool TryOCLZeroEventInitialization(Sema &S,
4937                                           InitializationSequence &Sequence,
4938                                           QualType DestType,
4939                                           Expr *Initializer) {
4940   if (!S.getLangOpts().OpenCL || !DestType->isEventT() ||
4941       !Initializer->isIntegerConstantExpr(S.getASTContext()) ||
4942       (Initializer->EvaluateKnownConstInt(S.getASTContext()) != 0))
4943     return false;
4944 
4945   Sequence.AddOCLZeroEventStep(DestType);
4946   return true;
4947 }
4948 
4949 InitializationSequence::InitializationSequence(Sema &S,
4950                                                const InitializedEntity &Entity,
4951                                                const InitializationKind &Kind,
4952                                                MultiExprArg Args,
4953                                                bool TopLevelOfInitList,
4954                                                bool TreatUnavailableAsInvalid)
4955     : FailedCandidateSet(Kind.getLocation(), OverloadCandidateSet::CSK_Normal) {
4956   InitializeFrom(S, Entity, Kind, Args, TopLevelOfInitList,
4957                  TreatUnavailableAsInvalid);
4958 }
4959 
4960 /// Tries to get a FunctionDecl out of `E`. If it succeeds and we can take the
4961 /// address of that function, this returns true. Otherwise, it returns false.
4962 static bool isExprAnUnaddressableFunction(Sema &S, const Expr *E) {
4963   auto *DRE = dyn_cast<DeclRefExpr>(E);
4964   if (!DRE || !isa<FunctionDecl>(DRE->getDecl()))
4965     return false;
4966 
4967   return !S.checkAddressOfFunctionIsAvailable(
4968       cast<FunctionDecl>(DRE->getDecl()));
4969 }
4970 
4971 void InitializationSequence::InitializeFrom(Sema &S,
4972                                             const InitializedEntity &Entity,
4973                                             const InitializationKind &Kind,
4974                                             MultiExprArg Args,
4975                                             bool TopLevelOfInitList,
4976                                             bool TreatUnavailableAsInvalid) {
4977   ASTContext &Context = S.Context;
4978 
4979   // Eliminate non-overload placeholder types in the arguments.  We
4980   // need to do this before checking whether types are dependent
4981   // because lowering a pseudo-object expression might well give us
4982   // something of dependent type.
4983   for (unsigned I = 0, E = Args.size(); I != E; ++I)
4984     if (Args[I]->getType()->isNonOverloadPlaceholderType()) {
4985       // FIXME: should we be doing this here?
4986       ExprResult result = S.CheckPlaceholderExpr(Args[I]);
4987       if (result.isInvalid()) {
4988         SetFailed(FK_PlaceholderType);
4989         return;
4990       }
4991       Args[I] = result.get();
4992     }
4993 
4994   // C++0x [dcl.init]p16:
4995   //   The semantics of initializers are as follows. The destination type is
4996   //   the type of the object or reference being initialized and the source
4997   //   type is the type of the initializer expression. The source type is not
4998   //   defined when the initializer is a braced-init-list or when it is a
4999   //   parenthesized list of expressions.
5000   QualType DestType = Entity.getType();
5001 
5002   if (DestType->isDependentType() ||
5003       Expr::hasAnyTypeDependentArguments(Args)) {
5004     SequenceKind = DependentSequence;
5005     return;
5006   }
5007 
5008   // Almost everything is a normal sequence.
5009   setSequenceKind(NormalSequence);
5010 
5011   QualType SourceType;
5012   Expr *Initializer = nullptr;
5013   if (Args.size() == 1) {
5014     Initializer = Args[0];
5015     if (S.getLangOpts().ObjC1) {
5016       if (S.CheckObjCBridgeRelatedConversions(Initializer->getLocStart(),
5017                                               DestType, Initializer->getType(),
5018                                               Initializer) ||
5019           S.ConversionToObjCStringLiteralCheck(DestType, Initializer))
5020         Args[0] = Initializer;
5021     }
5022     if (!isa<InitListExpr>(Initializer))
5023       SourceType = Initializer->getType();
5024   }
5025 
5026   //     - If the initializer is a (non-parenthesized) braced-init-list, the
5027   //       object is list-initialized (8.5.4).
5028   if (Kind.getKind() != InitializationKind::IK_Direct) {
5029     if (InitListExpr *InitList = dyn_cast_or_null<InitListExpr>(Initializer)) {
5030       TryListInitialization(S, Entity, Kind, InitList, *this,
5031                             TreatUnavailableAsInvalid);
5032       return;
5033     }
5034   }
5035 
5036   //     - If the destination type is a reference type, see 8.5.3.
5037   if (DestType->isReferenceType()) {
5038     // C++0x [dcl.init.ref]p1:
5039     //   A variable declared to be a T& or T&&, that is, "reference to type T"
5040     //   (8.3.2), shall be initialized by an object, or function, of type T or
5041     //   by an object that can be converted into a T.
5042     // (Therefore, multiple arguments are not permitted.)
5043     if (Args.size() != 1)
5044       SetFailed(FK_TooManyInitsForReference);
5045     else
5046       TryReferenceInitialization(S, Entity, Kind, Args[0], *this);
5047     return;
5048   }
5049 
5050   //     - If the initializer is (), the object is value-initialized.
5051   if (Kind.getKind() == InitializationKind::IK_Value ||
5052       (Kind.getKind() == InitializationKind::IK_Direct && Args.empty())) {
5053     TryValueInitialization(S, Entity, Kind, *this);
5054     return;
5055   }
5056 
5057   // Handle default initialization.
5058   if (Kind.getKind() == InitializationKind::IK_Default) {
5059     TryDefaultInitialization(S, Entity, Kind, *this);
5060     return;
5061   }
5062 
5063   //     - If the destination type is an array of characters, an array of
5064   //       char16_t, an array of char32_t, or an array of wchar_t, and the
5065   //       initializer is a string literal, see 8.5.2.
5066   //     - Otherwise, if the destination type is an array, the program is
5067   //       ill-formed.
5068   if (const ArrayType *DestAT = Context.getAsArrayType(DestType)) {
5069     if (Initializer && isa<VariableArrayType>(DestAT)) {
5070       SetFailed(FK_VariableLengthArrayHasInitializer);
5071       return;
5072     }
5073 
5074     if (Initializer) {
5075       switch (IsStringInit(Initializer, DestAT, Context)) {
5076       case SIF_None:
5077         TryStringLiteralInitialization(S, Entity, Kind, Initializer, *this);
5078         return;
5079       case SIF_NarrowStringIntoWideChar:
5080         SetFailed(FK_NarrowStringIntoWideCharArray);
5081         return;
5082       case SIF_WideStringIntoChar:
5083         SetFailed(FK_WideStringIntoCharArray);
5084         return;
5085       case SIF_IncompatWideStringIntoWideChar:
5086         SetFailed(FK_IncompatWideStringIntoWideChar);
5087         return;
5088       case SIF_Other:
5089         break;
5090       }
5091     }
5092 
5093     // Note: as an GNU C extension, we allow initialization of an
5094     // array from a compound literal that creates an array of the same
5095     // type, so long as the initializer has no side effects.
5096     if (!S.getLangOpts().CPlusPlus && Initializer &&
5097         isa<CompoundLiteralExpr>(Initializer->IgnoreParens()) &&
5098         Initializer->getType()->isArrayType()) {
5099       const ArrayType *SourceAT
5100         = Context.getAsArrayType(Initializer->getType());
5101       if (!hasCompatibleArrayTypes(S.Context, DestAT, SourceAT))
5102         SetFailed(FK_ArrayTypeMismatch);
5103       else if (Initializer->HasSideEffects(S.Context))
5104         SetFailed(FK_NonConstantArrayInit);
5105       else {
5106         AddArrayInitStep(DestType);
5107       }
5108     }
5109     // Note: as a GNU C++ extension, we allow list-initialization of a
5110     // class member of array type from a parenthesized initializer list.
5111     else if (S.getLangOpts().CPlusPlus &&
5112              Entity.getKind() == InitializedEntity::EK_Member &&
5113              Initializer && isa<InitListExpr>(Initializer)) {
5114       TryListInitialization(S, Entity, Kind, cast<InitListExpr>(Initializer),
5115                             *this, TreatUnavailableAsInvalid);
5116       AddParenthesizedArrayInitStep(DestType);
5117     } else if (DestAT->getElementType()->isCharType())
5118       SetFailed(FK_ArrayNeedsInitListOrStringLiteral);
5119     else if (IsWideCharCompatible(DestAT->getElementType(), Context))
5120       SetFailed(FK_ArrayNeedsInitListOrWideStringLiteral);
5121     else
5122       SetFailed(FK_ArrayNeedsInitList);
5123 
5124     return;
5125   }
5126 
5127   // Determine whether we should consider writeback conversions for
5128   // Objective-C ARC.
5129   bool allowObjCWritebackConversion = S.getLangOpts().ObjCAutoRefCount &&
5130          Entity.isParameterKind();
5131 
5132   // We're at the end of the line for C: it's either a write-back conversion
5133   // or it's a C assignment. There's no need to check anything else.
5134   if (!S.getLangOpts().CPlusPlus) {
5135     // If allowed, check whether this is an Objective-C writeback conversion.
5136     if (allowObjCWritebackConversion &&
5137         tryObjCWritebackConversion(S, *this, Entity, Initializer)) {
5138       return;
5139     }
5140 
5141     if (TryOCLSamplerInitialization(S, *this, DestType, Initializer))
5142       return;
5143 
5144     if (TryOCLZeroEventInitialization(S, *this, DestType, Initializer))
5145       return;
5146 
5147     // Handle initialization in C
5148     AddCAssignmentStep(DestType);
5149     MaybeProduceObjCObject(S, *this, Entity);
5150     return;
5151   }
5152 
5153   assert(S.getLangOpts().CPlusPlus);
5154 
5155   //     - If the destination type is a (possibly cv-qualified) class type:
5156   if (DestType->isRecordType()) {
5157     //     - If the initialization is direct-initialization, or if it is
5158     //       copy-initialization where the cv-unqualified version of the
5159     //       source type is the same class as, or a derived class of, the
5160     //       class of the destination, constructors are considered. [...]
5161     if (Kind.getKind() == InitializationKind::IK_Direct ||
5162         (Kind.getKind() == InitializationKind::IK_Copy &&
5163          (Context.hasSameUnqualifiedType(SourceType, DestType) ||
5164           S.IsDerivedFrom(Initializer->getLocStart(), SourceType, DestType))))
5165       TryConstructorInitialization(S, Entity, Kind, Args,
5166                                    DestType, *this);
5167     //     - Otherwise (i.e., for the remaining copy-initialization cases),
5168     //       user-defined conversion sequences that can convert from the source
5169     //       type to the destination type or (when a conversion function is
5170     //       used) to a derived class thereof are enumerated as described in
5171     //       13.3.1.4, and the best one is chosen through overload resolution
5172     //       (13.3).
5173     else
5174       TryUserDefinedConversion(S, DestType, Kind, Initializer, *this,
5175                                TopLevelOfInitList);
5176     return;
5177   }
5178 
5179   if (Args.size() > 1) {
5180     SetFailed(FK_TooManyInitsForScalar);
5181     return;
5182   }
5183   assert(Args.size() == 1 && "Zero-argument case handled above");
5184 
5185   //    - Otherwise, if the source type is a (possibly cv-qualified) class
5186   //      type, conversion functions are considered.
5187   if (!SourceType.isNull() && SourceType->isRecordType()) {
5188     // For a conversion to _Atomic(T) from either T or a class type derived
5189     // from T, initialize the T object then convert to _Atomic type.
5190     bool NeedAtomicConversion = false;
5191     if (const AtomicType *Atomic = DestType->getAs<AtomicType>()) {
5192       if (Context.hasSameUnqualifiedType(SourceType, Atomic->getValueType()) ||
5193           S.IsDerivedFrom(Initializer->getLocStart(), SourceType,
5194                           Atomic->getValueType())) {
5195         DestType = Atomic->getValueType();
5196         NeedAtomicConversion = true;
5197       }
5198     }
5199 
5200     TryUserDefinedConversion(S, DestType, Kind, Initializer, *this,
5201                              TopLevelOfInitList);
5202     MaybeProduceObjCObject(S, *this, Entity);
5203     if (!Failed() && NeedAtomicConversion)
5204       AddAtomicConversionStep(Entity.getType());
5205     return;
5206   }
5207 
5208   //    - Otherwise, the initial value of the object being initialized is the
5209   //      (possibly converted) value of the initializer expression. Standard
5210   //      conversions (Clause 4) will be used, if necessary, to convert the
5211   //      initializer expression to the cv-unqualified version of the
5212   //      destination type; no user-defined conversions are considered.
5213 
5214   ImplicitConversionSequence ICS
5215     = S.TryImplicitConversion(Initializer, DestType,
5216                               /*SuppressUserConversions*/true,
5217                               /*AllowExplicitConversions*/ false,
5218                               /*InOverloadResolution*/ false,
5219                               /*CStyle=*/Kind.isCStyleOrFunctionalCast(),
5220                               allowObjCWritebackConversion);
5221 
5222   if (ICS.isStandard() &&
5223       ICS.Standard.Second == ICK_Writeback_Conversion) {
5224     // Objective-C ARC writeback conversion.
5225 
5226     // We should copy unless we're passing to an argument explicitly
5227     // marked 'out'.
5228     bool ShouldCopy = true;
5229     if (ParmVarDecl *Param = cast_or_null<ParmVarDecl>(Entity.getDecl()))
5230       ShouldCopy = (Param->getObjCDeclQualifier() != ParmVarDecl::OBJC_TQ_Out);
5231 
5232     // If there was an lvalue adjustment, add it as a separate conversion.
5233     if (ICS.Standard.First == ICK_Array_To_Pointer ||
5234         ICS.Standard.First == ICK_Lvalue_To_Rvalue) {
5235       ImplicitConversionSequence LvalueICS;
5236       LvalueICS.setStandard();
5237       LvalueICS.Standard.setAsIdentityConversion();
5238       LvalueICS.Standard.setAllToTypes(ICS.Standard.getToType(0));
5239       LvalueICS.Standard.First = ICS.Standard.First;
5240       AddConversionSequenceStep(LvalueICS, ICS.Standard.getToType(0));
5241     }
5242 
5243     AddPassByIndirectCopyRestoreStep(DestType, ShouldCopy);
5244   } else if (ICS.isBad()) {
5245     DeclAccessPair dap;
5246     if (isLibstdcxxPointerReturnFalseHack(S, Entity, Initializer)) {
5247       AddZeroInitializationStep(Entity.getType());
5248     } else if (Initializer->getType() == Context.OverloadTy &&
5249                !S.ResolveAddressOfOverloadedFunction(Initializer, DestType,
5250                                                      false, dap))
5251       SetFailed(InitializationSequence::FK_AddressOfOverloadFailed);
5252     else if (Initializer->getType()->isFunctionType() &&
5253              isExprAnUnaddressableFunction(S, Initializer))
5254       SetFailed(InitializationSequence::FK_AddressOfUnaddressableFunction);
5255     else
5256       SetFailed(InitializationSequence::FK_ConversionFailed);
5257   } else {
5258     AddConversionSequenceStep(ICS, DestType, TopLevelOfInitList);
5259 
5260     MaybeProduceObjCObject(S, *this, Entity);
5261   }
5262 }
5263 
5264 InitializationSequence::~InitializationSequence() {
5265   for (auto &S : Steps)
5266     S.Destroy();
5267 }
5268 
5269 //===----------------------------------------------------------------------===//
5270 // Perform initialization
5271 //===----------------------------------------------------------------------===//
5272 static Sema::AssignmentAction
5273 getAssignmentAction(const InitializedEntity &Entity, bool Diagnose = false) {
5274   switch(Entity.getKind()) {
5275   case InitializedEntity::EK_Variable:
5276   case InitializedEntity::EK_New:
5277   case InitializedEntity::EK_Exception:
5278   case InitializedEntity::EK_Base:
5279   case InitializedEntity::EK_Delegating:
5280     return Sema::AA_Initializing;
5281 
5282   case InitializedEntity::EK_Parameter:
5283     if (Entity.getDecl() &&
5284         isa<ObjCMethodDecl>(Entity.getDecl()->getDeclContext()))
5285       return Sema::AA_Sending;
5286 
5287     return Sema::AA_Passing;
5288 
5289   case InitializedEntity::EK_Parameter_CF_Audited:
5290     if (Entity.getDecl() &&
5291       isa<ObjCMethodDecl>(Entity.getDecl()->getDeclContext()))
5292       return Sema::AA_Sending;
5293 
5294     return !Diagnose ? Sema::AA_Passing : Sema::AA_Passing_CFAudited;
5295 
5296   case InitializedEntity::EK_Result:
5297     return Sema::AA_Returning;
5298 
5299   case InitializedEntity::EK_Temporary:
5300   case InitializedEntity::EK_RelatedResult:
5301     // FIXME: Can we tell apart casting vs. converting?
5302     return Sema::AA_Casting;
5303 
5304   case InitializedEntity::EK_Member:
5305   case InitializedEntity::EK_Binding:
5306   case InitializedEntity::EK_ArrayElement:
5307   case InitializedEntity::EK_VectorElement:
5308   case InitializedEntity::EK_ComplexElement:
5309   case InitializedEntity::EK_BlockElement:
5310   case InitializedEntity::EK_LambdaCapture:
5311   case InitializedEntity::EK_CompoundLiteralInit:
5312     return Sema::AA_Initializing;
5313   }
5314 
5315   llvm_unreachable("Invalid EntityKind!");
5316 }
5317 
5318 /// \brief Whether we should bind a created object as a temporary when
5319 /// initializing the given entity.
5320 static bool shouldBindAsTemporary(const InitializedEntity &Entity) {
5321   switch (Entity.getKind()) {
5322   case InitializedEntity::EK_ArrayElement:
5323   case InitializedEntity::EK_Member:
5324   case InitializedEntity::EK_Result:
5325   case InitializedEntity::EK_New:
5326   case InitializedEntity::EK_Variable:
5327   case InitializedEntity::EK_Base:
5328   case InitializedEntity::EK_Delegating:
5329   case InitializedEntity::EK_VectorElement:
5330   case InitializedEntity::EK_ComplexElement:
5331   case InitializedEntity::EK_Exception:
5332   case InitializedEntity::EK_BlockElement:
5333   case InitializedEntity::EK_LambdaCapture:
5334   case InitializedEntity::EK_CompoundLiteralInit:
5335     return false;
5336 
5337   case InitializedEntity::EK_Parameter:
5338   case InitializedEntity::EK_Parameter_CF_Audited:
5339   case InitializedEntity::EK_Temporary:
5340   case InitializedEntity::EK_RelatedResult:
5341   case InitializedEntity::EK_Binding:
5342     return true;
5343   }
5344 
5345   llvm_unreachable("missed an InitializedEntity kind?");
5346 }
5347 
5348 /// \brief Whether the given entity, when initialized with an object
5349 /// created for that initialization, requires destruction.
5350 static bool shouldDestroyTemporary(const InitializedEntity &Entity) {
5351   switch (Entity.getKind()) {
5352     case InitializedEntity::EK_Result:
5353     case InitializedEntity::EK_New:
5354     case InitializedEntity::EK_Base:
5355     case InitializedEntity::EK_Delegating:
5356     case InitializedEntity::EK_VectorElement:
5357     case InitializedEntity::EK_ComplexElement:
5358     case InitializedEntity::EK_BlockElement:
5359     case InitializedEntity::EK_LambdaCapture:
5360       return false;
5361 
5362     case InitializedEntity::EK_Member:
5363     case InitializedEntity::EK_Binding:
5364     case InitializedEntity::EK_Variable:
5365     case InitializedEntity::EK_Parameter:
5366     case InitializedEntity::EK_Parameter_CF_Audited:
5367     case InitializedEntity::EK_Temporary:
5368     case InitializedEntity::EK_ArrayElement:
5369     case InitializedEntity::EK_Exception:
5370     case InitializedEntity::EK_CompoundLiteralInit:
5371     case InitializedEntity::EK_RelatedResult:
5372       return true;
5373   }
5374 
5375   llvm_unreachable("missed an InitializedEntity kind?");
5376 }
5377 
5378 /// \brief Get the location at which initialization diagnostics should appear.
5379 static SourceLocation getInitializationLoc(const InitializedEntity &Entity,
5380                                            Expr *Initializer) {
5381   switch (Entity.getKind()) {
5382   case InitializedEntity::EK_Result:
5383     return Entity.getReturnLoc();
5384 
5385   case InitializedEntity::EK_Exception:
5386     return Entity.getThrowLoc();
5387 
5388   case InitializedEntity::EK_Variable:
5389   case InitializedEntity::EK_Binding:
5390     return Entity.getDecl()->getLocation();
5391 
5392   case InitializedEntity::EK_LambdaCapture:
5393     return Entity.getCaptureLoc();
5394 
5395   case InitializedEntity::EK_ArrayElement:
5396   case InitializedEntity::EK_Member:
5397   case InitializedEntity::EK_Parameter:
5398   case InitializedEntity::EK_Parameter_CF_Audited:
5399   case InitializedEntity::EK_Temporary:
5400   case InitializedEntity::EK_New:
5401   case InitializedEntity::EK_Base:
5402   case InitializedEntity::EK_Delegating:
5403   case InitializedEntity::EK_VectorElement:
5404   case InitializedEntity::EK_ComplexElement:
5405   case InitializedEntity::EK_BlockElement:
5406   case InitializedEntity::EK_CompoundLiteralInit:
5407   case InitializedEntity::EK_RelatedResult:
5408     return Initializer->getLocStart();
5409   }
5410   llvm_unreachable("missed an InitializedEntity kind?");
5411 }
5412 
5413 /// \brief Make a (potentially elidable) temporary copy of the object
5414 /// provided by the given initializer by calling the appropriate copy
5415 /// constructor.
5416 ///
5417 /// \param S The Sema object used for type-checking.
5418 ///
5419 /// \param T The type of the temporary object, which must either be
5420 /// the type of the initializer expression or a superclass thereof.
5421 ///
5422 /// \param Entity The entity being initialized.
5423 ///
5424 /// \param CurInit The initializer expression.
5425 ///
5426 /// \param IsExtraneousCopy Whether this is an "extraneous" copy that
5427 /// is permitted in C++03 (but not C++0x) when binding a reference to
5428 /// an rvalue.
5429 ///
5430 /// \returns An expression that copies the initializer expression into
5431 /// a temporary object, or an error expression if a copy could not be
5432 /// created.
5433 static ExprResult CopyObject(Sema &S,
5434                              QualType T,
5435                              const InitializedEntity &Entity,
5436                              ExprResult CurInit,
5437                              bool IsExtraneousCopy) {
5438   if (CurInit.isInvalid())
5439     return CurInit;
5440   // Determine which class type we're copying to.
5441   Expr *CurInitExpr = (Expr *)CurInit.get();
5442   CXXRecordDecl *Class = nullptr;
5443   if (const RecordType *Record = T->getAs<RecordType>())
5444     Class = cast<CXXRecordDecl>(Record->getDecl());
5445   if (!Class)
5446     return CurInit;
5447 
5448   SourceLocation Loc = getInitializationLoc(Entity, CurInit.get());
5449 
5450   // Make sure that the type we are copying is complete.
5451   if (S.RequireCompleteType(Loc, T, diag::err_temp_copy_incomplete))
5452     return CurInit;
5453 
5454   // Perform overload resolution using the class's constructors. Per
5455   // C++11 [dcl.init]p16, second bullet for class types, this initialization
5456   // is direct-initialization.
5457   OverloadCandidateSet CandidateSet(Loc, OverloadCandidateSet::CSK_Normal);
5458   DeclContext::lookup_result Ctors = S.LookupConstructors(Class);
5459 
5460   OverloadCandidateSet::iterator Best;
5461   switch (ResolveConstructorOverload(
5462       S, Loc, CurInitExpr, CandidateSet, Ctors, Best,
5463       /*CopyInitializing=*/false, /*AllowExplicit=*/true,
5464       /*OnlyListConstructors=*/false, /*IsListInit=*/false,
5465       /*SecondStepOfCopyInit=*/true)) {
5466   case OR_Success:
5467     break;
5468 
5469   case OR_No_Viable_Function:
5470     S.Diag(Loc, IsExtraneousCopy && !S.isSFINAEContext()
5471            ? diag::ext_rvalue_to_reference_temp_copy_no_viable
5472            : diag::err_temp_copy_no_viable)
5473       << (int)Entity.getKind() << CurInitExpr->getType()
5474       << CurInitExpr->getSourceRange();
5475     CandidateSet.NoteCandidates(S, OCD_AllCandidates, CurInitExpr);
5476     if (!IsExtraneousCopy || S.isSFINAEContext())
5477       return ExprError();
5478     return CurInit;
5479 
5480   case OR_Ambiguous:
5481     S.Diag(Loc, diag::err_temp_copy_ambiguous)
5482       << (int)Entity.getKind() << CurInitExpr->getType()
5483       << CurInitExpr->getSourceRange();
5484     CandidateSet.NoteCandidates(S, OCD_ViableCandidates, CurInitExpr);
5485     return ExprError();
5486 
5487   case OR_Deleted:
5488     S.Diag(Loc, diag::err_temp_copy_deleted)
5489       << (int)Entity.getKind() << CurInitExpr->getType()
5490       << CurInitExpr->getSourceRange();
5491     S.NoteDeletedFunction(Best->Function);
5492     return ExprError();
5493   }
5494 
5495   bool HadMultipleCandidates = CandidateSet.size() > 1;
5496 
5497   CXXConstructorDecl *Constructor = cast<CXXConstructorDecl>(Best->Function);
5498   SmallVector<Expr*, 8> ConstructorArgs;
5499   CurInit.get(); // Ownership transferred into MultiExprArg, below.
5500 
5501   S.CheckConstructorAccess(Loc, Constructor, Best->FoundDecl, Entity,
5502                            IsExtraneousCopy);
5503 
5504   if (IsExtraneousCopy) {
5505     // If this is a totally extraneous copy for C++03 reference
5506     // binding purposes, just return the original initialization
5507     // expression. We don't generate an (elided) copy operation here
5508     // because doing so would require us to pass down a flag to avoid
5509     // infinite recursion, where each step adds another extraneous,
5510     // elidable copy.
5511 
5512     // Instantiate the default arguments of any extra parameters in
5513     // the selected copy constructor, as if we were going to create a
5514     // proper call to the copy constructor.
5515     for (unsigned I = 1, N = Constructor->getNumParams(); I != N; ++I) {
5516       ParmVarDecl *Parm = Constructor->getParamDecl(I);
5517       if (S.RequireCompleteType(Loc, Parm->getType(),
5518                                 diag::err_call_incomplete_argument))
5519         break;
5520 
5521       // Build the default argument expression; we don't actually care
5522       // if this succeeds or not, because this routine will complain
5523       // if there was a problem.
5524       S.BuildCXXDefaultArgExpr(Loc, Constructor, Parm);
5525     }
5526 
5527     return CurInitExpr;
5528   }
5529 
5530   // Determine the arguments required to actually perform the
5531   // constructor call (we might have derived-to-base conversions, or
5532   // the copy constructor may have default arguments).
5533   if (S.CompleteConstructorCall(Constructor, CurInitExpr, Loc, ConstructorArgs))
5534     return ExprError();
5535 
5536   // C++0x [class.copy]p32:
5537   //   When certain criteria are met, an implementation is allowed to
5538   //   omit the copy/move construction of a class object, even if the
5539   //   copy/move constructor and/or destructor for the object have
5540   //   side effects. [...]
5541   //     - when a temporary class object that has not been bound to a
5542   //       reference (12.2) would be copied/moved to a class object
5543   //       with the same cv-unqualified type, the copy/move operation
5544   //       can be omitted by constructing the temporary object
5545   //       directly into the target of the omitted copy/move
5546   //
5547   // Note that the other three bullets are handled elsewhere. Copy
5548   // elision for return statements and throw expressions are handled as part
5549   // of constructor initialization, while copy elision for exception handlers
5550   // is handled by the run-time.
5551   //
5552   // FIXME: If the function parameter is not the same type as the temporary, we
5553   // should still be able to elide the copy, but we don't have a way to
5554   // represent in the AST how much should be elided in this case.
5555   bool Elidable =
5556       CurInitExpr->isTemporaryObject(S.Context, Class) &&
5557       S.Context.hasSameUnqualifiedType(
5558           Best->Function->getParamDecl(0)->getType().getNonReferenceType(),
5559           CurInitExpr->getType());
5560 
5561   // Actually perform the constructor call.
5562   CurInit = S.BuildCXXConstructExpr(Loc, T, Best->FoundDecl, Constructor,
5563                                     Elidable,
5564                                     ConstructorArgs,
5565                                     HadMultipleCandidates,
5566                                     /*ListInit*/ false,
5567                                     /*StdInitListInit*/ false,
5568                                     /*ZeroInit*/ false,
5569                                     CXXConstructExpr::CK_Complete,
5570                                     SourceRange());
5571 
5572   // If we're supposed to bind temporaries, do so.
5573   if (!CurInit.isInvalid() && shouldBindAsTemporary(Entity))
5574     CurInit = S.MaybeBindToTemporary(CurInit.getAs<Expr>());
5575   return CurInit;
5576 }
5577 
5578 /// \brief Check whether elidable copy construction for binding a reference to
5579 /// a temporary would have succeeded if we were building in C++98 mode, for
5580 /// -Wc++98-compat.
5581 static void CheckCXX98CompatAccessibleCopy(Sema &S,
5582                                            const InitializedEntity &Entity,
5583                                            Expr *CurInitExpr) {
5584   assert(S.getLangOpts().CPlusPlus11);
5585 
5586   const RecordType *Record = CurInitExpr->getType()->getAs<RecordType>();
5587   if (!Record)
5588     return;
5589 
5590   SourceLocation Loc = getInitializationLoc(Entity, CurInitExpr);
5591   if (S.Diags.isIgnored(diag::warn_cxx98_compat_temp_copy, Loc))
5592     return;
5593 
5594   // Find constructors which would have been considered.
5595   OverloadCandidateSet CandidateSet(Loc, OverloadCandidateSet::CSK_Normal);
5596   DeclContext::lookup_result Ctors =
5597       S.LookupConstructors(cast<CXXRecordDecl>(Record->getDecl()));
5598 
5599   // Perform overload resolution.
5600   OverloadCandidateSet::iterator Best;
5601   OverloadingResult OR = ResolveConstructorOverload(
5602       S, Loc, CurInitExpr, CandidateSet, Ctors, Best,
5603       /*CopyInitializing=*/false, /*AllowExplicit=*/true,
5604       /*OnlyListConstructors=*/false, /*IsListInit=*/false,
5605       /*SecondStepOfCopyInit=*/true);
5606 
5607   PartialDiagnostic Diag = S.PDiag(diag::warn_cxx98_compat_temp_copy)
5608     << OR << (int)Entity.getKind() << CurInitExpr->getType()
5609     << CurInitExpr->getSourceRange();
5610 
5611   switch (OR) {
5612   case OR_Success:
5613     S.CheckConstructorAccess(Loc, cast<CXXConstructorDecl>(Best->Function),
5614                              Best->FoundDecl, Entity, Diag);
5615     // FIXME: Check default arguments as far as that's possible.
5616     break;
5617 
5618   case OR_No_Viable_Function:
5619     S.Diag(Loc, Diag);
5620     CandidateSet.NoteCandidates(S, OCD_AllCandidates, CurInitExpr);
5621     break;
5622 
5623   case OR_Ambiguous:
5624     S.Diag(Loc, Diag);
5625     CandidateSet.NoteCandidates(S, OCD_ViableCandidates, CurInitExpr);
5626     break;
5627 
5628   case OR_Deleted:
5629     S.Diag(Loc, Diag);
5630     S.NoteDeletedFunction(Best->Function);
5631     break;
5632   }
5633 }
5634 
5635 void InitializationSequence::PrintInitLocationNote(Sema &S,
5636                                               const InitializedEntity &Entity) {
5637   if (Entity.isParameterKind() && Entity.getDecl()) {
5638     if (Entity.getDecl()->getLocation().isInvalid())
5639       return;
5640 
5641     if (Entity.getDecl()->getDeclName())
5642       S.Diag(Entity.getDecl()->getLocation(), diag::note_parameter_named_here)
5643         << Entity.getDecl()->getDeclName();
5644     else
5645       S.Diag(Entity.getDecl()->getLocation(), diag::note_parameter_here);
5646   }
5647   else if (Entity.getKind() == InitializedEntity::EK_RelatedResult &&
5648            Entity.getMethodDecl())
5649     S.Diag(Entity.getMethodDecl()->getLocation(),
5650            diag::note_method_return_type_change)
5651       << Entity.getMethodDecl()->getDeclName();
5652 }
5653 
5654 static bool isReferenceBinding(const InitializationSequence::Step &s) {
5655   return s.Kind == InitializationSequence::SK_BindReference ||
5656          s.Kind == InitializationSequence::SK_BindReferenceToTemporary;
5657 }
5658 
5659 /// Returns true if the parameters describe a constructor initialization of
5660 /// an explicit temporary object, e.g. "Point(x, y)".
5661 static bool isExplicitTemporary(const InitializedEntity &Entity,
5662                                 const InitializationKind &Kind,
5663                                 unsigned NumArgs) {
5664   switch (Entity.getKind()) {
5665   case InitializedEntity::EK_Temporary:
5666   case InitializedEntity::EK_CompoundLiteralInit:
5667   case InitializedEntity::EK_RelatedResult:
5668     break;
5669   default:
5670     return false;
5671   }
5672 
5673   switch (Kind.getKind()) {
5674   case InitializationKind::IK_DirectList:
5675     return true;
5676   // FIXME: Hack to work around cast weirdness.
5677   case InitializationKind::IK_Direct:
5678   case InitializationKind::IK_Value:
5679     return NumArgs != 1;
5680   default:
5681     return false;
5682   }
5683 }
5684 
5685 static ExprResult
5686 PerformConstructorInitialization(Sema &S,
5687                                  const InitializedEntity &Entity,
5688                                  const InitializationKind &Kind,
5689                                  MultiExprArg Args,
5690                                  const InitializationSequence::Step& Step,
5691                                  bool &ConstructorInitRequiresZeroInit,
5692                                  bool IsListInitialization,
5693                                  bool IsStdInitListInitialization,
5694                                  SourceLocation LBraceLoc,
5695                                  SourceLocation RBraceLoc) {
5696   unsigned NumArgs = Args.size();
5697   CXXConstructorDecl *Constructor
5698     = cast<CXXConstructorDecl>(Step.Function.Function);
5699   bool HadMultipleCandidates = Step.Function.HadMultipleCandidates;
5700 
5701   // Build a call to the selected constructor.
5702   SmallVector<Expr*, 8> ConstructorArgs;
5703   SourceLocation Loc = (Kind.isCopyInit() && Kind.getEqualLoc().isValid())
5704                          ? Kind.getEqualLoc()
5705                          : Kind.getLocation();
5706 
5707   if (Kind.getKind() == InitializationKind::IK_Default) {
5708     // Force even a trivial, implicit default constructor to be
5709     // semantically checked. We do this explicitly because we don't build
5710     // the definition for completely trivial constructors.
5711     assert(Constructor->getParent() && "No parent class for constructor.");
5712     if (Constructor->isDefaulted() && Constructor->isDefaultConstructor() &&
5713         Constructor->isTrivial() && !Constructor->isUsed(false))
5714       S.DefineImplicitDefaultConstructor(Loc, Constructor);
5715   }
5716 
5717   ExprResult CurInit((Expr *)nullptr);
5718 
5719   // C++ [over.match.copy]p1:
5720   //   - When initializing a temporary to be bound to the first parameter
5721   //     of a constructor that takes a reference to possibly cv-qualified
5722   //     T as its first argument, called with a single argument in the
5723   //     context of direct-initialization, explicit conversion functions
5724   //     are also considered.
5725   bool AllowExplicitConv =
5726       Kind.AllowExplicit() && !Kind.isCopyInit() && Args.size() == 1 &&
5727       hasCopyOrMoveCtorParam(S.Context,
5728                              getConstructorInfo(Step.Function.FoundDecl));
5729 
5730   // Determine the arguments required to actually perform the constructor
5731   // call.
5732   if (S.CompleteConstructorCall(Constructor, Args,
5733                                 Loc, ConstructorArgs,
5734                                 AllowExplicitConv,
5735                                 IsListInitialization))
5736     return ExprError();
5737 
5738 
5739   if (isExplicitTemporary(Entity, Kind, NumArgs)) {
5740     // An explicitly-constructed temporary, e.g., X(1, 2).
5741     if (S.DiagnoseUseOfDecl(Constructor, Loc))
5742       return ExprError();
5743 
5744     TypeSourceInfo *TSInfo = Entity.getTypeSourceInfo();
5745     if (!TSInfo)
5746       TSInfo = S.Context.getTrivialTypeSourceInfo(Entity.getType(), Loc);
5747     SourceRange ParenOrBraceRange =
5748       (Kind.getKind() == InitializationKind::IK_DirectList)
5749       ? SourceRange(LBraceLoc, RBraceLoc)
5750       : Kind.getParenRange();
5751 
5752     if (auto *Shadow = dyn_cast<ConstructorUsingShadowDecl>(
5753             Step.Function.FoundDecl.getDecl())) {
5754       Constructor = S.findInheritingConstructor(Loc, Constructor, Shadow);
5755       if (S.DiagnoseUseOfDecl(Constructor, Loc))
5756         return ExprError();
5757     }
5758     S.MarkFunctionReferenced(Loc, Constructor);
5759 
5760     CurInit = new (S.Context) CXXTemporaryObjectExpr(
5761         S.Context, Constructor, TSInfo,
5762         ConstructorArgs, ParenOrBraceRange, HadMultipleCandidates,
5763         IsListInitialization, IsStdInitListInitialization,
5764         ConstructorInitRequiresZeroInit);
5765   } else {
5766     CXXConstructExpr::ConstructionKind ConstructKind =
5767       CXXConstructExpr::CK_Complete;
5768 
5769     if (Entity.getKind() == InitializedEntity::EK_Base) {
5770       ConstructKind = Entity.getBaseSpecifier()->isVirtual() ?
5771         CXXConstructExpr::CK_VirtualBase :
5772         CXXConstructExpr::CK_NonVirtualBase;
5773     } else if (Entity.getKind() == InitializedEntity::EK_Delegating) {
5774       ConstructKind = CXXConstructExpr::CK_Delegating;
5775     }
5776 
5777     // Only get the parenthesis or brace range if it is a list initialization or
5778     // direct construction.
5779     SourceRange ParenOrBraceRange;
5780     if (IsListInitialization)
5781       ParenOrBraceRange = SourceRange(LBraceLoc, RBraceLoc);
5782     else if (Kind.getKind() == InitializationKind::IK_Direct)
5783       ParenOrBraceRange = Kind.getParenRange();
5784 
5785     // If the entity allows NRVO, mark the construction as elidable
5786     // unconditionally.
5787     if (Entity.allowsNRVO())
5788       CurInit = S.BuildCXXConstructExpr(Loc, Entity.getType(),
5789                                         Step.Function.FoundDecl,
5790                                         Constructor, /*Elidable=*/true,
5791                                         ConstructorArgs,
5792                                         HadMultipleCandidates,
5793                                         IsListInitialization,
5794                                         IsStdInitListInitialization,
5795                                         ConstructorInitRequiresZeroInit,
5796                                         ConstructKind,
5797                                         ParenOrBraceRange);
5798     else
5799       CurInit = S.BuildCXXConstructExpr(Loc, Entity.getType(),
5800                                         Step.Function.FoundDecl,
5801                                         Constructor,
5802                                         ConstructorArgs,
5803                                         HadMultipleCandidates,
5804                                         IsListInitialization,
5805                                         IsStdInitListInitialization,
5806                                         ConstructorInitRequiresZeroInit,
5807                                         ConstructKind,
5808                                         ParenOrBraceRange);
5809   }
5810   if (CurInit.isInvalid())
5811     return ExprError();
5812 
5813   // Only check access if all of that succeeded.
5814   S.CheckConstructorAccess(Loc, Constructor, Step.Function.FoundDecl, Entity);
5815   if (S.DiagnoseUseOfDecl(Step.Function.FoundDecl, Loc))
5816     return ExprError();
5817 
5818   if (shouldBindAsTemporary(Entity))
5819     CurInit = S.MaybeBindToTemporary(CurInit.get());
5820 
5821   return CurInit;
5822 }
5823 
5824 /// Determine whether the specified InitializedEntity definitely has a lifetime
5825 /// longer than the current full-expression. Conservatively returns false if
5826 /// it's unclear.
5827 static bool
5828 InitializedEntityOutlivesFullExpression(const InitializedEntity &Entity) {
5829   const InitializedEntity *Top = &Entity;
5830   while (Top->getParent())
5831     Top = Top->getParent();
5832 
5833   switch (Top->getKind()) {
5834   case InitializedEntity::EK_Variable:
5835   case InitializedEntity::EK_Result:
5836   case InitializedEntity::EK_Exception:
5837   case InitializedEntity::EK_Member:
5838   case InitializedEntity::EK_Binding:
5839   case InitializedEntity::EK_New:
5840   case InitializedEntity::EK_Base:
5841   case InitializedEntity::EK_Delegating:
5842     return true;
5843 
5844   case InitializedEntity::EK_ArrayElement:
5845   case InitializedEntity::EK_VectorElement:
5846   case InitializedEntity::EK_BlockElement:
5847   case InitializedEntity::EK_ComplexElement:
5848     // Could not determine what the full initialization is. Assume it might not
5849     // outlive the full-expression.
5850     return false;
5851 
5852   case InitializedEntity::EK_Parameter:
5853   case InitializedEntity::EK_Parameter_CF_Audited:
5854   case InitializedEntity::EK_Temporary:
5855   case InitializedEntity::EK_LambdaCapture:
5856   case InitializedEntity::EK_CompoundLiteralInit:
5857   case InitializedEntity::EK_RelatedResult:
5858     // The entity being initialized might not outlive the full-expression.
5859     return false;
5860   }
5861 
5862   llvm_unreachable("unknown entity kind");
5863 }
5864 
5865 /// Determine the declaration which an initialized entity ultimately refers to,
5866 /// for the purpose of lifetime-extending a temporary bound to a reference in
5867 /// the initialization of \p Entity.
5868 static const InitializedEntity *getEntityForTemporaryLifetimeExtension(
5869     const InitializedEntity *Entity,
5870     const InitializedEntity *FallbackDecl = nullptr) {
5871   // C++11 [class.temporary]p5:
5872   switch (Entity->getKind()) {
5873   case InitializedEntity::EK_Variable:
5874     //   The temporary [...] persists for the lifetime of the reference
5875     return Entity;
5876 
5877   case InitializedEntity::EK_Member:
5878     // For subobjects, we look at the complete object.
5879     if (Entity->getParent())
5880       return getEntityForTemporaryLifetimeExtension(Entity->getParent(),
5881                                                     Entity);
5882 
5883     //   except:
5884     //   -- A temporary bound to a reference member in a constructor's
5885     //      ctor-initializer persists until the constructor exits.
5886     return Entity;
5887 
5888   case InitializedEntity::EK_Binding:
5889     // Per [dcl.decomp]p3, the binding is treated as a variable of reference
5890     // type.
5891     return Entity;
5892 
5893   case InitializedEntity::EK_Parameter:
5894   case InitializedEntity::EK_Parameter_CF_Audited:
5895     //   -- A temporary bound to a reference parameter in a function call
5896     //      persists until the completion of the full-expression containing
5897     //      the call.
5898   case InitializedEntity::EK_Result:
5899     //   -- The lifetime of a temporary bound to the returned value in a
5900     //      function return statement is not extended; the temporary is
5901     //      destroyed at the end of the full-expression in the return statement.
5902   case InitializedEntity::EK_New:
5903     //   -- A temporary bound to a reference in a new-initializer persists
5904     //      until the completion of the full-expression containing the
5905     //      new-initializer.
5906     return nullptr;
5907 
5908   case InitializedEntity::EK_Temporary:
5909   case InitializedEntity::EK_CompoundLiteralInit:
5910   case InitializedEntity::EK_RelatedResult:
5911     // We don't yet know the storage duration of the surrounding temporary.
5912     // Assume it's got full-expression duration for now, it will patch up our
5913     // storage duration if that's not correct.
5914     return nullptr;
5915 
5916   case InitializedEntity::EK_ArrayElement:
5917     // For subobjects, we look at the complete object.
5918     return getEntityForTemporaryLifetimeExtension(Entity->getParent(),
5919                                                   FallbackDecl);
5920 
5921   case InitializedEntity::EK_Base:
5922     // For subobjects, we look at the complete object.
5923     if (Entity->getParent())
5924       return getEntityForTemporaryLifetimeExtension(Entity->getParent(),
5925                                                     Entity);
5926     // Fall through.
5927   case InitializedEntity::EK_Delegating:
5928     // We can reach this case for aggregate initialization in a constructor:
5929     //   struct A { int &&r; };
5930     //   struct B : A { B() : A{0} {} };
5931     // In this case, use the innermost field decl as the context.
5932     return FallbackDecl;
5933 
5934   case InitializedEntity::EK_BlockElement:
5935   case InitializedEntity::EK_LambdaCapture:
5936   case InitializedEntity::EK_Exception:
5937   case InitializedEntity::EK_VectorElement:
5938   case InitializedEntity::EK_ComplexElement:
5939     return nullptr;
5940   }
5941   llvm_unreachable("unknown entity kind");
5942 }
5943 
5944 static void performLifetimeExtension(Expr *Init,
5945                                      const InitializedEntity *ExtendingEntity);
5946 
5947 /// Update a glvalue expression that is used as the initializer of a reference
5948 /// to note that its lifetime is extended.
5949 /// \return \c true if any temporary had its lifetime extended.
5950 static bool
5951 performReferenceExtension(Expr *Init,
5952                           const InitializedEntity *ExtendingEntity) {
5953   // Walk past any constructs which we can lifetime-extend across.
5954   Expr *Old;
5955   do {
5956     Old = Init;
5957 
5958     if (InitListExpr *ILE = dyn_cast<InitListExpr>(Init)) {
5959       if (ILE->getNumInits() == 1 && ILE->isGLValue()) {
5960         // This is just redundant braces around an initializer. Step over it.
5961         Init = ILE->getInit(0);
5962       }
5963     }
5964 
5965     // Step over any subobject adjustments; we may have a materialized
5966     // temporary inside them.
5967     SmallVector<const Expr *, 2> CommaLHSs;
5968     SmallVector<SubobjectAdjustment, 2> Adjustments;
5969     Init = const_cast<Expr *>(
5970         Init->skipRValueSubobjectAdjustments(CommaLHSs, Adjustments));
5971 
5972     // Per current approach for DR1376, look through casts to reference type
5973     // when performing lifetime extension.
5974     if (CastExpr *CE = dyn_cast<CastExpr>(Init))
5975       if (CE->getSubExpr()->isGLValue())
5976         Init = CE->getSubExpr();
5977 
5978     // FIXME: Per DR1213, subscripting on an array temporary produces an xvalue.
5979     // It's unclear if binding a reference to that xvalue extends the array
5980     // temporary.
5981   } while (Init != Old);
5982 
5983   if (MaterializeTemporaryExpr *ME = dyn_cast<MaterializeTemporaryExpr>(Init)) {
5984     // Update the storage duration of the materialized temporary.
5985     // FIXME: Rebuild the expression instead of mutating it.
5986     ME->setExtendingDecl(ExtendingEntity->getDecl(),
5987                          ExtendingEntity->allocateManglingNumber());
5988     performLifetimeExtension(ME->GetTemporaryExpr(), ExtendingEntity);
5989     return true;
5990   }
5991 
5992   return false;
5993 }
5994 
5995 /// Update a prvalue expression that is going to be materialized as a
5996 /// lifetime-extended temporary.
5997 static void performLifetimeExtension(Expr *Init,
5998                                      const InitializedEntity *ExtendingEntity) {
5999   // Dig out the expression which constructs the extended temporary.
6000   SmallVector<const Expr *, 2> CommaLHSs;
6001   SmallVector<SubobjectAdjustment, 2> Adjustments;
6002   Init = const_cast<Expr *>(
6003       Init->skipRValueSubobjectAdjustments(CommaLHSs, Adjustments));
6004 
6005   if (CXXBindTemporaryExpr *BTE = dyn_cast<CXXBindTemporaryExpr>(Init))
6006     Init = BTE->getSubExpr();
6007 
6008   if (CXXStdInitializerListExpr *ILE =
6009           dyn_cast<CXXStdInitializerListExpr>(Init)) {
6010     performReferenceExtension(ILE->getSubExpr(), ExtendingEntity);
6011     return;
6012   }
6013 
6014   if (InitListExpr *ILE = dyn_cast<InitListExpr>(Init)) {
6015     if (ILE->getType()->isArrayType()) {
6016       for (unsigned I = 0, N = ILE->getNumInits(); I != N; ++I)
6017         performLifetimeExtension(ILE->getInit(I), ExtendingEntity);
6018       return;
6019     }
6020 
6021     if (CXXRecordDecl *RD = ILE->getType()->getAsCXXRecordDecl()) {
6022       assert(RD->isAggregate() && "aggregate init on non-aggregate");
6023 
6024       // If we lifetime-extend a braced initializer which is initializing an
6025       // aggregate, and that aggregate contains reference members which are
6026       // bound to temporaries, those temporaries are also lifetime-extended.
6027       if (RD->isUnion() && ILE->getInitializedFieldInUnion() &&
6028           ILE->getInitializedFieldInUnion()->getType()->isReferenceType())
6029         performReferenceExtension(ILE->getInit(0), ExtendingEntity);
6030       else {
6031         unsigned Index = 0;
6032         for (const auto *I : RD->fields()) {
6033           if (Index >= ILE->getNumInits())
6034             break;
6035           if (I->isUnnamedBitfield())
6036             continue;
6037           Expr *SubInit = ILE->getInit(Index);
6038           if (I->getType()->isReferenceType())
6039             performReferenceExtension(SubInit, ExtendingEntity);
6040           else if (isa<InitListExpr>(SubInit) ||
6041                    isa<CXXStdInitializerListExpr>(SubInit))
6042             // This may be either aggregate-initialization of a member or
6043             // initialization of a std::initializer_list object. Either way,
6044             // we should recursively lifetime-extend that initializer.
6045             performLifetimeExtension(SubInit, ExtendingEntity);
6046           ++Index;
6047         }
6048       }
6049     }
6050   }
6051 }
6052 
6053 static void warnOnLifetimeExtension(Sema &S, const InitializedEntity &Entity,
6054                                     const Expr *Init, bool IsInitializerList,
6055                                     const ValueDecl *ExtendingDecl) {
6056   // Warn if a field lifetime-extends a temporary.
6057   if (isa<FieldDecl>(ExtendingDecl)) {
6058     if (IsInitializerList) {
6059       S.Diag(Init->getExprLoc(), diag::warn_dangling_std_initializer_list)
6060         << /*at end of constructor*/true;
6061       return;
6062     }
6063 
6064     bool IsSubobjectMember = false;
6065     for (const InitializedEntity *Ent = Entity.getParent(); Ent;
6066          Ent = Ent->getParent()) {
6067       if (Ent->getKind() != InitializedEntity::EK_Base) {
6068         IsSubobjectMember = true;
6069         break;
6070       }
6071     }
6072     S.Diag(Init->getExprLoc(),
6073            diag::warn_bind_ref_member_to_temporary)
6074       << ExtendingDecl << Init->getSourceRange()
6075       << IsSubobjectMember << IsInitializerList;
6076     if (IsSubobjectMember)
6077       S.Diag(ExtendingDecl->getLocation(),
6078              diag::note_ref_subobject_of_member_declared_here);
6079     else
6080       S.Diag(ExtendingDecl->getLocation(),
6081              diag::note_ref_or_ptr_member_declared_here)
6082         << /*is pointer*/false;
6083   }
6084 }
6085 
6086 static void DiagnoseNarrowingInInitList(Sema &S,
6087                                         const ImplicitConversionSequence &ICS,
6088                                         QualType PreNarrowingType,
6089                                         QualType EntityType,
6090                                         const Expr *PostInit);
6091 
6092 /// Provide warnings when std::move is used on construction.
6093 static void CheckMoveOnConstruction(Sema &S, const Expr *InitExpr,
6094                                     bool IsReturnStmt) {
6095   if (!InitExpr)
6096     return;
6097 
6098   if (!S.ActiveTemplateInstantiations.empty())
6099     return;
6100 
6101   QualType DestType = InitExpr->getType();
6102   if (!DestType->isRecordType())
6103     return;
6104 
6105   unsigned DiagID = 0;
6106   if (IsReturnStmt) {
6107     const CXXConstructExpr *CCE =
6108         dyn_cast<CXXConstructExpr>(InitExpr->IgnoreParens());
6109     if (!CCE || CCE->getNumArgs() != 1)
6110       return;
6111 
6112     if (!CCE->getConstructor()->isCopyOrMoveConstructor())
6113       return;
6114 
6115     InitExpr = CCE->getArg(0)->IgnoreImpCasts();
6116   }
6117 
6118   // Find the std::move call and get the argument.
6119   const CallExpr *CE = dyn_cast<CallExpr>(InitExpr->IgnoreParens());
6120   if (!CE || CE->getNumArgs() != 1)
6121     return;
6122 
6123   const FunctionDecl *MoveFunction = CE->getDirectCallee();
6124   if (!MoveFunction || !MoveFunction->isInStdNamespace() ||
6125       !MoveFunction->getIdentifier() ||
6126       !MoveFunction->getIdentifier()->isStr("move"))
6127     return;
6128 
6129   const Expr *Arg = CE->getArg(0)->IgnoreImplicit();
6130 
6131   if (IsReturnStmt) {
6132     const DeclRefExpr *DRE = dyn_cast<DeclRefExpr>(Arg->IgnoreParenImpCasts());
6133     if (!DRE || DRE->refersToEnclosingVariableOrCapture())
6134       return;
6135 
6136     const VarDecl *VD = dyn_cast<VarDecl>(DRE->getDecl());
6137     if (!VD || !VD->hasLocalStorage())
6138       return;
6139 
6140     QualType SourceType = VD->getType();
6141     if (!SourceType->isRecordType())
6142       return;
6143 
6144     if (!S.Context.hasSameUnqualifiedType(DestType, SourceType)) {
6145       return;
6146     }
6147 
6148     // If we're returning a function parameter, copy elision
6149     // is not possible.
6150     if (isa<ParmVarDecl>(VD))
6151       DiagID = diag::warn_redundant_move_on_return;
6152     else
6153       DiagID = diag::warn_pessimizing_move_on_return;
6154   } else {
6155     DiagID = diag::warn_pessimizing_move_on_initialization;
6156     const Expr *ArgStripped = Arg->IgnoreImplicit()->IgnoreParens();
6157     if (!ArgStripped->isRValue() || !ArgStripped->getType()->isRecordType())
6158       return;
6159   }
6160 
6161   S.Diag(CE->getLocStart(), DiagID);
6162 
6163   // Get all the locations for a fix-it.  Don't emit the fix-it if any location
6164   // is within a macro.
6165   SourceLocation CallBegin = CE->getCallee()->getLocStart();
6166   if (CallBegin.isMacroID())
6167     return;
6168   SourceLocation RParen = CE->getRParenLoc();
6169   if (RParen.isMacroID())
6170     return;
6171   SourceLocation LParen;
6172   SourceLocation ArgLoc = Arg->getLocStart();
6173 
6174   // Special testing for the argument location.  Since the fix-it needs the
6175   // location right before the argument, the argument location can be in a
6176   // macro only if it is at the beginning of the macro.
6177   while (ArgLoc.isMacroID() &&
6178          S.getSourceManager().isAtStartOfImmediateMacroExpansion(ArgLoc)) {
6179     ArgLoc = S.getSourceManager().getImmediateExpansionRange(ArgLoc).first;
6180   }
6181 
6182   if (LParen.isMacroID())
6183     return;
6184 
6185   LParen = ArgLoc.getLocWithOffset(-1);
6186 
6187   S.Diag(CE->getLocStart(), diag::note_remove_move)
6188       << FixItHint::CreateRemoval(SourceRange(CallBegin, LParen))
6189       << FixItHint::CreateRemoval(SourceRange(RParen, RParen));
6190 }
6191 
6192 static void CheckForNullPointerDereference(Sema &S, const Expr *E) {
6193   // Check to see if we are dereferencing a null pointer.  If so, this is
6194   // undefined behavior, so warn about it.  This only handles the pattern
6195   // "*null", which is a very syntactic check.
6196   if (const UnaryOperator *UO = dyn_cast<UnaryOperator>(E->IgnoreParenCasts()))
6197     if (UO->getOpcode() == UO_Deref &&
6198         UO->getSubExpr()->IgnoreParenCasts()->
6199         isNullPointerConstant(S.Context, Expr::NPC_ValueDependentIsNotNull)) {
6200     S.DiagRuntimeBehavior(UO->getOperatorLoc(), UO,
6201                           S.PDiag(diag::warn_binding_null_to_reference)
6202                             << UO->getSubExpr()->getSourceRange());
6203   }
6204 }
6205 
6206 MaterializeTemporaryExpr *
6207 Sema::CreateMaterializeTemporaryExpr(QualType T, Expr *Temporary,
6208                                      bool BoundToLvalueReference) {
6209   auto MTE = new (Context)
6210       MaterializeTemporaryExpr(T, Temporary, BoundToLvalueReference);
6211 
6212   // Order an ExprWithCleanups for lifetime marks.
6213   //
6214   // TODO: It'll be good to have a single place to check the access of the
6215   // destructor and generate ExprWithCleanups for various uses. Currently these
6216   // are done in both CreateMaterializeTemporaryExpr and MaybeBindToTemporary,
6217   // but there may be a chance to merge them.
6218   Cleanup.setExprNeedsCleanups(false);
6219   return MTE;
6220 }
6221 
6222 ExprResult
6223 InitializationSequence::Perform(Sema &S,
6224                                 const InitializedEntity &Entity,
6225                                 const InitializationKind &Kind,
6226                                 MultiExprArg Args,
6227                                 QualType *ResultType) {
6228   if (Failed()) {
6229     Diagnose(S, Entity, Kind, Args);
6230     return ExprError();
6231   }
6232   if (!ZeroInitializationFixit.empty()) {
6233     unsigned DiagID = diag::err_default_init_const;
6234     if (Decl *D = Entity.getDecl())
6235       if (S.getLangOpts().MSVCCompat && D->hasAttr<SelectAnyAttr>())
6236         DiagID = diag::ext_default_init_const;
6237 
6238     // The initialization would have succeeded with this fixit. Since the fixit
6239     // is on the error, we need to build a valid AST in this case, so this isn't
6240     // handled in the Failed() branch above.
6241     QualType DestType = Entity.getType();
6242     S.Diag(Kind.getLocation(), DiagID)
6243         << DestType << (bool)DestType->getAs<RecordType>()
6244         << FixItHint::CreateInsertion(ZeroInitializationFixitLoc,
6245                                       ZeroInitializationFixit);
6246   }
6247 
6248   if (getKind() == DependentSequence) {
6249     // If the declaration is a non-dependent, incomplete array type
6250     // that has an initializer, then its type will be completed once
6251     // the initializer is instantiated.
6252     if (ResultType && !Entity.getType()->isDependentType() &&
6253         Args.size() == 1) {
6254       QualType DeclType = Entity.getType();
6255       if (const IncompleteArrayType *ArrayT
6256                            = S.Context.getAsIncompleteArrayType(DeclType)) {
6257         // FIXME: We don't currently have the ability to accurately
6258         // compute the length of an initializer list without
6259         // performing full type-checking of the initializer list
6260         // (since we have to determine where braces are implicitly
6261         // introduced and such).  So, we fall back to making the array
6262         // type a dependently-sized array type with no specified
6263         // bound.
6264         if (isa<InitListExpr>((Expr *)Args[0])) {
6265           SourceRange Brackets;
6266 
6267           // Scavange the location of the brackets from the entity, if we can.
6268           if (auto *DD = dyn_cast_or_null<DeclaratorDecl>(Entity.getDecl())) {
6269             if (TypeSourceInfo *TInfo = DD->getTypeSourceInfo()) {
6270               TypeLoc TL = TInfo->getTypeLoc();
6271               if (IncompleteArrayTypeLoc ArrayLoc =
6272                       TL.getAs<IncompleteArrayTypeLoc>())
6273                 Brackets = ArrayLoc.getBracketsRange();
6274             }
6275           }
6276 
6277           *ResultType
6278             = S.Context.getDependentSizedArrayType(ArrayT->getElementType(),
6279                                                    /*NumElts=*/nullptr,
6280                                                    ArrayT->getSizeModifier(),
6281                                        ArrayT->getIndexTypeCVRQualifiers(),
6282                                                    Brackets);
6283         }
6284 
6285       }
6286     }
6287     if (Kind.getKind() == InitializationKind::IK_Direct &&
6288         !Kind.isExplicitCast()) {
6289       // Rebuild the ParenListExpr.
6290       SourceRange ParenRange = Kind.getParenRange();
6291       return S.ActOnParenListExpr(ParenRange.getBegin(), ParenRange.getEnd(),
6292                                   Args);
6293     }
6294     assert(Kind.getKind() == InitializationKind::IK_Copy ||
6295            Kind.isExplicitCast() ||
6296            Kind.getKind() == InitializationKind::IK_DirectList);
6297     return ExprResult(Args[0]);
6298   }
6299 
6300   // No steps means no initialization.
6301   if (Steps.empty())
6302     return ExprResult((Expr *)nullptr);
6303 
6304   if (S.getLangOpts().CPlusPlus11 && Entity.getType()->isReferenceType() &&
6305       Args.size() == 1 && isa<InitListExpr>(Args[0]) &&
6306       !Entity.isParameterKind()) {
6307     // Produce a C++98 compatibility warning if we are initializing a reference
6308     // from an initializer list. For parameters, we produce a better warning
6309     // elsewhere.
6310     Expr *Init = Args[0];
6311     S.Diag(Init->getLocStart(), diag::warn_cxx98_compat_reference_list_init)
6312       << Init->getSourceRange();
6313   }
6314 
6315   // Diagnose cases where we initialize a pointer to an array temporary, and the
6316   // pointer obviously outlives the temporary.
6317   if (Args.size() == 1 && Args[0]->getType()->isArrayType() &&
6318       Entity.getType()->isPointerType() &&
6319       InitializedEntityOutlivesFullExpression(Entity)) {
6320     Expr *Init = Args[0];
6321     Expr::LValueClassification Kind = Init->ClassifyLValue(S.Context);
6322     if (Kind == Expr::LV_ClassTemporary || Kind == Expr::LV_ArrayTemporary)
6323       S.Diag(Init->getLocStart(), diag::warn_temporary_array_to_pointer_decay)
6324         << Init->getSourceRange();
6325   }
6326 
6327   QualType DestType = Entity.getType().getNonReferenceType();
6328   // FIXME: Ugly hack around the fact that Entity.getType() is not
6329   // the same as Entity.getDecl()->getType() in cases involving type merging,
6330   //  and we want latter when it makes sense.
6331   if (ResultType)
6332     *ResultType = Entity.getDecl() ? Entity.getDecl()->getType() :
6333                                      Entity.getType();
6334 
6335   ExprResult CurInit((Expr *)nullptr);
6336 
6337   // For initialization steps that start with a single initializer,
6338   // grab the only argument out the Args and place it into the "current"
6339   // initializer.
6340   switch (Steps.front().Kind) {
6341   case SK_ResolveAddressOfOverloadedFunction:
6342   case SK_CastDerivedToBaseRValue:
6343   case SK_CastDerivedToBaseXValue:
6344   case SK_CastDerivedToBaseLValue:
6345   case SK_BindReference:
6346   case SK_BindReferenceToTemporary:
6347   case SK_ExtraneousCopyToTemporary:
6348   case SK_UserConversion:
6349   case SK_QualificationConversionLValue:
6350   case SK_QualificationConversionXValue:
6351   case SK_QualificationConversionRValue:
6352   case SK_AtomicConversion:
6353   case SK_LValueToRValue:
6354   case SK_ConversionSequence:
6355   case SK_ConversionSequenceNoNarrowing:
6356   case SK_ListInitialization:
6357   case SK_UnwrapInitList:
6358   case SK_RewrapInitList:
6359   case SK_CAssignment:
6360   case SK_StringInit:
6361   case SK_ObjCObjectConversion:
6362   case SK_ArrayInit:
6363   case SK_ParenthesizedArrayInit:
6364   case SK_PassByIndirectCopyRestore:
6365   case SK_PassByIndirectRestore:
6366   case SK_ProduceObjCObject:
6367   case SK_StdInitializerList:
6368   case SK_OCLSamplerInit:
6369   case SK_OCLZeroEvent: {
6370     assert(Args.size() == 1);
6371     CurInit = Args[0];
6372     if (!CurInit.get()) return ExprError();
6373     break;
6374   }
6375 
6376   case SK_ConstructorInitialization:
6377   case SK_ConstructorInitializationFromList:
6378   case SK_StdInitializerListConstructorCall:
6379   case SK_ZeroInitialization:
6380     break;
6381   }
6382 
6383   // Walk through the computed steps for the initialization sequence,
6384   // performing the specified conversions along the way.
6385   bool ConstructorInitRequiresZeroInit = false;
6386   for (step_iterator Step = step_begin(), StepEnd = step_end();
6387        Step != StepEnd; ++Step) {
6388     if (CurInit.isInvalid())
6389       return ExprError();
6390 
6391     QualType SourceType = CurInit.get() ? CurInit.get()->getType() : QualType();
6392 
6393     switch (Step->Kind) {
6394     case SK_ResolveAddressOfOverloadedFunction:
6395       // Overload resolution determined which function invoke; update the
6396       // initializer to reflect that choice.
6397       S.CheckAddressOfMemberAccess(CurInit.get(), Step->Function.FoundDecl);
6398       if (S.DiagnoseUseOfDecl(Step->Function.FoundDecl, Kind.getLocation()))
6399         return ExprError();
6400       CurInit = S.FixOverloadedFunctionReference(CurInit,
6401                                                  Step->Function.FoundDecl,
6402                                                  Step->Function.Function);
6403       break;
6404 
6405     case SK_CastDerivedToBaseRValue:
6406     case SK_CastDerivedToBaseXValue:
6407     case SK_CastDerivedToBaseLValue: {
6408       // We have a derived-to-base cast that produces either an rvalue or an
6409       // lvalue. Perform that cast.
6410 
6411       CXXCastPath BasePath;
6412 
6413       // Casts to inaccessible base classes are allowed with C-style casts.
6414       bool IgnoreBaseAccess = Kind.isCStyleOrFunctionalCast();
6415       if (S.CheckDerivedToBaseConversion(SourceType, Step->Type,
6416                                          CurInit.get()->getLocStart(),
6417                                          CurInit.get()->getSourceRange(),
6418                                          &BasePath, IgnoreBaseAccess))
6419         return ExprError();
6420 
6421       ExprValueKind VK =
6422           Step->Kind == SK_CastDerivedToBaseLValue ?
6423               VK_LValue :
6424               (Step->Kind == SK_CastDerivedToBaseXValue ?
6425                    VK_XValue :
6426                    VK_RValue);
6427       CurInit =
6428           ImplicitCastExpr::Create(S.Context, Step->Type, CK_DerivedToBase,
6429                                    CurInit.get(), &BasePath, VK);
6430       break;
6431     }
6432 
6433     case SK_BindReference:
6434       // References cannot bind to bit-fields (C++ [dcl.init.ref]p5).
6435       if (CurInit.get()->refersToBitField()) {
6436         // We don't necessarily have an unambiguous source bit-field.
6437         FieldDecl *BitField = CurInit.get()->getSourceBitField();
6438         S.Diag(Kind.getLocation(), diag::err_reference_bind_to_bitfield)
6439           << Entity.getType().isVolatileQualified()
6440           << (BitField ? BitField->getDeclName() : DeclarationName())
6441           << (BitField != nullptr)
6442           << CurInit.get()->getSourceRange();
6443         if (BitField)
6444           S.Diag(BitField->getLocation(), diag::note_bitfield_decl);
6445 
6446         return ExprError();
6447       }
6448 
6449       if (CurInit.get()->refersToVectorElement()) {
6450         // References cannot bind to vector elements.
6451         S.Diag(Kind.getLocation(), diag::err_reference_bind_to_vector_element)
6452           << Entity.getType().isVolatileQualified()
6453           << CurInit.get()->getSourceRange();
6454         PrintInitLocationNote(S, Entity);
6455         return ExprError();
6456       }
6457 
6458       // Reference binding does not have any corresponding ASTs.
6459 
6460       // Check exception specifications
6461       if (S.CheckExceptionSpecCompatibility(CurInit.get(), DestType))
6462         return ExprError();
6463 
6464       // Even though we didn't materialize a temporary, the binding may still
6465       // extend the lifetime of a temporary. This happens if we bind a reference
6466       // to the result of a cast to reference type.
6467       if (const InitializedEntity *ExtendingEntity =
6468               getEntityForTemporaryLifetimeExtension(&Entity))
6469         if (performReferenceExtension(CurInit.get(), ExtendingEntity))
6470           warnOnLifetimeExtension(S, Entity, CurInit.get(),
6471                                   /*IsInitializerList=*/false,
6472                                   ExtendingEntity->getDecl());
6473 
6474       CheckForNullPointerDereference(S, CurInit.get());
6475       break;
6476 
6477     case SK_BindReferenceToTemporary: {
6478       // Make sure the "temporary" is actually an rvalue.
6479       assert(CurInit.get()->isRValue() && "not a temporary");
6480 
6481       // Check exception specifications
6482       if (S.CheckExceptionSpecCompatibility(CurInit.get(), DestType))
6483         return ExprError();
6484 
6485       // Materialize the temporary into memory.
6486       MaterializeTemporaryExpr *MTE = S.CreateMaterializeTemporaryExpr(
6487           Entity.getType().getNonReferenceType(), CurInit.get(),
6488           Entity.getType()->isLValueReferenceType());
6489 
6490       // Maybe lifetime-extend the temporary's subobjects to match the
6491       // entity's lifetime.
6492       if (const InitializedEntity *ExtendingEntity =
6493               getEntityForTemporaryLifetimeExtension(&Entity))
6494         if (performReferenceExtension(MTE, ExtendingEntity))
6495           warnOnLifetimeExtension(S, Entity, CurInit.get(), /*IsInitializerList=*/false,
6496                                   ExtendingEntity->getDecl());
6497 
6498       // If we're binding to an Objective-C object that has lifetime, we
6499       // need cleanups. Likewise if we're extending this temporary to automatic
6500       // storage duration -- we need to register its cleanup during the
6501       // full-expression's cleanups.
6502       if ((S.getLangOpts().ObjCAutoRefCount &&
6503            MTE->getType()->isObjCLifetimeType()) ||
6504           (MTE->getStorageDuration() == SD_Automatic &&
6505            MTE->getType().isDestructedType()))
6506         S.Cleanup.setExprNeedsCleanups(true);
6507 
6508       CurInit = MTE;
6509       break;
6510     }
6511 
6512     case SK_ExtraneousCopyToTemporary:
6513       CurInit = CopyObject(S, Step->Type, Entity, CurInit,
6514                            /*IsExtraneousCopy=*/true);
6515       break;
6516 
6517     case SK_UserConversion: {
6518       // We have a user-defined conversion that invokes either a constructor
6519       // or a conversion function.
6520       CastKind CastKind;
6521       bool IsCopy = false;
6522       FunctionDecl *Fn = Step->Function.Function;
6523       DeclAccessPair FoundFn = Step->Function.FoundDecl;
6524       bool HadMultipleCandidates = Step->Function.HadMultipleCandidates;
6525       bool CreatedObject = false;
6526       if (CXXConstructorDecl *Constructor = dyn_cast<CXXConstructorDecl>(Fn)) {
6527         // Build a call to the selected constructor.
6528         SmallVector<Expr*, 8> ConstructorArgs;
6529         SourceLocation Loc = CurInit.get()->getLocStart();
6530         CurInit.get(); // Ownership transferred into MultiExprArg, below.
6531 
6532         // Determine the arguments required to actually perform the constructor
6533         // call.
6534         Expr *Arg = CurInit.get();
6535         if (S.CompleteConstructorCall(Constructor,
6536                                       MultiExprArg(&Arg, 1),
6537                                       Loc, ConstructorArgs))
6538           return ExprError();
6539 
6540         // Build an expression that constructs a temporary.
6541         CurInit = S.BuildCXXConstructExpr(Loc, Step->Type,
6542                                           FoundFn, Constructor,
6543                                           ConstructorArgs,
6544                                           HadMultipleCandidates,
6545                                           /*ListInit*/ false,
6546                                           /*StdInitListInit*/ false,
6547                                           /*ZeroInit*/ false,
6548                                           CXXConstructExpr::CK_Complete,
6549                                           SourceRange());
6550         if (CurInit.isInvalid())
6551           return ExprError();
6552 
6553         S.CheckConstructorAccess(Kind.getLocation(), Constructor, FoundFn,
6554                                  Entity);
6555         if (S.DiagnoseUseOfDecl(FoundFn, Kind.getLocation()))
6556           return ExprError();
6557 
6558         CastKind = CK_ConstructorConversion;
6559         QualType Class = S.Context.getTypeDeclType(Constructor->getParent());
6560         if (S.Context.hasSameUnqualifiedType(SourceType, Class) ||
6561             S.IsDerivedFrom(Loc, SourceType, Class))
6562           IsCopy = true;
6563 
6564         CreatedObject = true;
6565       } else {
6566         // Build a call to the conversion function.
6567         CXXConversionDecl *Conversion = cast<CXXConversionDecl>(Fn);
6568         S.CheckMemberOperatorAccess(Kind.getLocation(), CurInit.get(), nullptr,
6569                                     FoundFn);
6570         if (S.DiagnoseUseOfDecl(FoundFn, Kind.getLocation()))
6571           return ExprError();
6572 
6573         // FIXME: Should we move this initialization into a separate
6574         // derived-to-base conversion? I believe the answer is "no", because
6575         // we don't want to turn off access control here for c-style casts.
6576         ExprResult CurInitExprRes =
6577           S.PerformObjectArgumentInitialization(CurInit.get(),
6578                                                 /*Qualifier=*/nullptr,
6579                                                 FoundFn, Conversion);
6580         if(CurInitExprRes.isInvalid())
6581           return ExprError();
6582         CurInit = CurInitExprRes;
6583 
6584         // Build the actual call to the conversion function.
6585         CurInit = S.BuildCXXMemberCallExpr(CurInit.get(), FoundFn, Conversion,
6586                                            HadMultipleCandidates);
6587         if (CurInit.isInvalid() || !CurInit.get())
6588           return ExprError();
6589 
6590         CastKind = CK_UserDefinedConversion;
6591 
6592         CreatedObject = Conversion->getReturnType()->isRecordType();
6593       }
6594 
6595       bool RequiresCopy = !IsCopy && !isReferenceBinding(Steps.back());
6596       bool MaybeBindToTemp = RequiresCopy || shouldBindAsTemporary(Entity);
6597 
6598       if (!MaybeBindToTemp && CreatedObject && shouldDestroyTemporary(Entity)) {
6599         QualType T = CurInit.get()->getType();
6600         if (const RecordType *Record = T->getAs<RecordType>()) {
6601           CXXDestructorDecl *Destructor
6602             = S.LookupDestructor(cast<CXXRecordDecl>(Record->getDecl()));
6603           S.CheckDestructorAccess(CurInit.get()->getLocStart(), Destructor,
6604                                   S.PDiag(diag::err_access_dtor_temp) << T);
6605           S.MarkFunctionReferenced(CurInit.get()->getLocStart(), Destructor);
6606           if (S.DiagnoseUseOfDecl(Destructor, CurInit.get()->getLocStart()))
6607             return ExprError();
6608         }
6609       }
6610 
6611       CurInit = ImplicitCastExpr::Create(S.Context, CurInit.get()->getType(),
6612                                          CastKind, CurInit.get(), nullptr,
6613                                          CurInit.get()->getValueKind());
6614       if (MaybeBindToTemp)
6615         CurInit = S.MaybeBindToTemporary(CurInit.getAs<Expr>());
6616       if (RequiresCopy)
6617         CurInit = CopyObject(S, Entity.getType().getNonReferenceType(), Entity,
6618                              CurInit, /*IsExtraneousCopy=*/false);
6619       break;
6620     }
6621 
6622     case SK_QualificationConversionLValue:
6623     case SK_QualificationConversionXValue:
6624     case SK_QualificationConversionRValue: {
6625       // Perform a qualification conversion; these can never go wrong.
6626       ExprValueKind VK =
6627           Step->Kind == SK_QualificationConversionLValue ?
6628               VK_LValue :
6629               (Step->Kind == SK_QualificationConversionXValue ?
6630                    VK_XValue :
6631                    VK_RValue);
6632       CurInit = S.ImpCastExprToType(CurInit.get(), Step->Type, CK_NoOp, VK);
6633       break;
6634     }
6635 
6636     case SK_AtomicConversion: {
6637       assert(CurInit.get()->isRValue() && "cannot convert glvalue to atomic");
6638       CurInit = S.ImpCastExprToType(CurInit.get(), Step->Type,
6639                                     CK_NonAtomicToAtomic, VK_RValue);
6640       break;
6641     }
6642 
6643     case SK_LValueToRValue: {
6644       assert(CurInit.get()->isGLValue() && "cannot load from a prvalue");
6645       CurInit = ImplicitCastExpr::Create(S.Context, Step->Type,
6646                                          CK_LValueToRValue, CurInit.get(),
6647                                          /*BasePath=*/nullptr, VK_RValue);
6648       break;
6649     }
6650 
6651     case SK_ConversionSequence:
6652     case SK_ConversionSequenceNoNarrowing: {
6653       Sema::CheckedConversionKind CCK
6654         = Kind.isCStyleCast()? Sema::CCK_CStyleCast
6655         : Kind.isFunctionalCast()? Sema::CCK_FunctionalCast
6656         : Kind.isExplicitCast()? Sema::CCK_OtherCast
6657         : Sema::CCK_ImplicitConversion;
6658       ExprResult CurInitExprRes =
6659         S.PerformImplicitConversion(CurInit.get(), Step->Type, *Step->ICS,
6660                                     getAssignmentAction(Entity), CCK);
6661       if (CurInitExprRes.isInvalid())
6662         return ExprError();
6663 
6664       S.DiscardMisalignedMemberAddress(Step->Type.getTypePtr(), CurInit.get());
6665 
6666       CurInit = CurInitExprRes;
6667 
6668       if (Step->Kind == SK_ConversionSequenceNoNarrowing &&
6669           S.getLangOpts().CPlusPlus && !CurInit.get()->isValueDependent())
6670         DiagnoseNarrowingInInitList(S, *Step->ICS, SourceType, Entity.getType(),
6671                                     CurInit.get());
6672 
6673       break;
6674     }
6675 
6676     case SK_ListInitialization: {
6677       InitListExpr *InitList = cast<InitListExpr>(CurInit.get());
6678       // If we're not initializing the top-level entity, we need to create an
6679       // InitializeTemporary entity for our target type.
6680       QualType Ty = Step->Type;
6681       bool IsTemporary = !S.Context.hasSameType(Entity.getType(), Ty);
6682       InitializedEntity TempEntity = InitializedEntity::InitializeTemporary(Ty);
6683       InitializedEntity InitEntity = IsTemporary ? TempEntity : Entity;
6684       InitListChecker PerformInitList(S, InitEntity,
6685           InitList, Ty, /*VerifyOnly=*/false,
6686           /*TreatUnavailableAsInvalid=*/false);
6687       if (PerformInitList.HadError())
6688         return ExprError();
6689 
6690       // Hack: We must update *ResultType if available in order to set the
6691       // bounds of arrays, e.g. in 'int ar[] = {1, 2, 3};'.
6692       // Worst case: 'const int (&arref)[] = {1, 2, 3};'.
6693       if (ResultType &&
6694           ResultType->getNonReferenceType()->isIncompleteArrayType()) {
6695         if ((*ResultType)->isRValueReferenceType())
6696           Ty = S.Context.getRValueReferenceType(Ty);
6697         else if ((*ResultType)->isLValueReferenceType())
6698           Ty = S.Context.getLValueReferenceType(Ty,
6699             (*ResultType)->getAs<LValueReferenceType>()->isSpelledAsLValue());
6700         *ResultType = Ty;
6701       }
6702 
6703       InitListExpr *StructuredInitList =
6704           PerformInitList.getFullyStructuredList();
6705       CurInit.get();
6706       CurInit = shouldBindAsTemporary(InitEntity)
6707           ? S.MaybeBindToTemporary(StructuredInitList)
6708           : StructuredInitList;
6709       break;
6710     }
6711 
6712     case SK_ConstructorInitializationFromList: {
6713       // When an initializer list is passed for a parameter of type "reference
6714       // to object", we don't get an EK_Temporary entity, but instead an
6715       // EK_Parameter entity with reference type.
6716       // FIXME: This is a hack. What we really should do is create a user
6717       // conversion step for this case, but this makes it considerably more
6718       // complicated. For now, this will do.
6719       InitializedEntity TempEntity = InitializedEntity::InitializeTemporary(
6720                                         Entity.getType().getNonReferenceType());
6721       bool UseTemporary = Entity.getType()->isReferenceType();
6722       assert(Args.size() == 1 && "expected a single argument for list init");
6723       InitListExpr *InitList = cast<InitListExpr>(Args[0]);
6724       S.Diag(InitList->getExprLoc(), diag::warn_cxx98_compat_ctor_list_init)
6725         << InitList->getSourceRange();
6726       MultiExprArg Arg(InitList->getInits(), InitList->getNumInits());
6727       CurInit = PerformConstructorInitialization(S, UseTemporary ? TempEntity :
6728                                                                    Entity,
6729                                                  Kind, Arg, *Step,
6730                                                ConstructorInitRequiresZeroInit,
6731                                                /*IsListInitialization*/true,
6732                                                /*IsStdInitListInit*/false,
6733                                                InitList->getLBraceLoc(),
6734                                                InitList->getRBraceLoc());
6735       break;
6736     }
6737 
6738     case SK_UnwrapInitList:
6739       CurInit = cast<InitListExpr>(CurInit.get())->getInit(0);
6740       break;
6741 
6742     case SK_RewrapInitList: {
6743       Expr *E = CurInit.get();
6744       InitListExpr *Syntactic = Step->WrappingSyntacticList;
6745       InitListExpr *ILE = new (S.Context) InitListExpr(S.Context,
6746           Syntactic->getLBraceLoc(), E, Syntactic->getRBraceLoc());
6747       ILE->setSyntacticForm(Syntactic);
6748       ILE->setType(E->getType());
6749       ILE->setValueKind(E->getValueKind());
6750       CurInit = ILE;
6751       break;
6752     }
6753 
6754     case SK_ConstructorInitialization:
6755     case SK_StdInitializerListConstructorCall: {
6756       // When an initializer list is passed for a parameter of type "reference
6757       // to object", we don't get an EK_Temporary entity, but instead an
6758       // EK_Parameter entity with reference type.
6759       // FIXME: This is a hack. What we really should do is create a user
6760       // conversion step for this case, but this makes it considerably more
6761       // complicated. For now, this will do.
6762       InitializedEntity TempEntity = InitializedEntity::InitializeTemporary(
6763                                         Entity.getType().getNonReferenceType());
6764       bool UseTemporary = Entity.getType()->isReferenceType();
6765       bool IsStdInitListInit =
6766           Step->Kind == SK_StdInitializerListConstructorCall;
6767       CurInit = PerformConstructorInitialization(
6768           S, UseTemporary ? TempEntity : Entity, Kind, Args, *Step,
6769           ConstructorInitRequiresZeroInit,
6770           /*IsListInitialization*/IsStdInitListInit,
6771           /*IsStdInitListInitialization*/IsStdInitListInit,
6772           /*LBraceLoc*/SourceLocation(),
6773           /*RBraceLoc*/SourceLocation());
6774       break;
6775     }
6776 
6777     case SK_ZeroInitialization: {
6778       step_iterator NextStep = Step;
6779       ++NextStep;
6780       if (NextStep != StepEnd &&
6781           (NextStep->Kind == SK_ConstructorInitialization ||
6782            NextStep->Kind == SK_ConstructorInitializationFromList)) {
6783         // The need for zero-initialization is recorded directly into
6784         // the call to the object's constructor within the next step.
6785         ConstructorInitRequiresZeroInit = true;
6786       } else if (Kind.getKind() == InitializationKind::IK_Value &&
6787                  S.getLangOpts().CPlusPlus &&
6788                  !Kind.isImplicitValueInit()) {
6789         TypeSourceInfo *TSInfo = Entity.getTypeSourceInfo();
6790         if (!TSInfo)
6791           TSInfo = S.Context.getTrivialTypeSourceInfo(Step->Type,
6792                                                     Kind.getRange().getBegin());
6793 
6794         CurInit = new (S.Context) CXXScalarValueInitExpr(
6795             TSInfo->getType().getNonLValueExprType(S.Context), TSInfo,
6796             Kind.getRange().getEnd());
6797       } else {
6798         CurInit = new (S.Context) ImplicitValueInitExpr(Step->Type);
6799       }
6800       break;
6801     }
6802 
6803     case SK_CAssignment: {
6804       QualType SourceType = CurInit.get()->getType();
6805       // Save off the initial CurInit in case we need to emit a diagnostic
6806       ExprResult InitialCurInit = CurInit;
6807       ExprResult Result = CurInit;
6808       Sema::AssignConvertType ConvTy =
6809         S.CheckSingleAssignmentConstraints(Step->Type, Result, true,
6810             Entity.getKind() == InitializedEntity::EK_Parameter_CF_Audited);
6811       if (Result.isInvalid())
6812         return ExprError();
6813       CurInit = Result;
6814 
6815       // If this is a call, allow conversion to a transparent union.
6816       ExprResult CurInitExprRes = CurInit;
6817       if (ConvTy != Sema::Compatible &&
6818           Entity.isParameterKind() &&
6819           S.CheckTransparentUnionArgumentConstraints(Step->Type, CurInitExprRes)
6820             == Sema::Compatible)
6821         ConvTy = Sema::Compatible;
6822       if (CurInitExprRes.isInvalid())
6823         return ExprError();
6824       CurInit = CurInitExprRes;
6825 
6826       bool Complained;
6827       if (S.DiagnoseAssignmentResult(ConvTy, Kind.getLocation(),
6828                                      Step->Type, SourceType,
6829                                      InitialCurInit.get(),
6830                                      getAssignmentAction(Entity, true),
6831                                      &Complained)) {
6832         PrintInitLocationNote(S, Entity);
6833         return ExprError();
6834       } else if (Complained)
6835         PrintInitLocationNote(S, Entity);
6836       break;
6837     }
6838 
6839     case SK_StringInit: {
6840       QualType Ty = Step->Type;
6841       CheckStringInit(CurInit.get(), ResultType ? *ResultType : Ty,
6842                       S.Context.getAsArrayType(Ty), S);
6843       break;
6844     }
6845 
6846     case SK_ObjCObjectConversion:
6847       CurInit = S.ImpCastExprToType(CurInit.get(), Step->Type,
6848                           CK_ObjCObjectLValueCast,
6849                           CurInit.get()->getValueKind());
6850       break;
6851 
6852     case SK_ArrayInit:
6853       // Okay: we checked everything before creating this step. Note that
6854       // this is a GNU extension.
6855       S.Diag(Kind.getLocation(), diag::ext_array_init_copy)
6856         << Step->Type << CurInit.get()->getType()
6857         << CurInit.get()->getSourceRange();
6858 
6859       // If the destination type is an incomplete array type, update the
6860       // type accordingly.
6861       if (ResultType) {
6862         if (const IncompleteArrayType *IncompleteDest
6863                            = S.Context.getAsIncompleteArrayType(Step->Type)) {
6864           if (const ConstantArrayType *ConstantSource
6865                  = S.Context.getAsConstantArrayType(CurInit.get()->getType())) {
6866             *ResultType = S.Context.getConstantArrayType(
6867                                              IncompleteDest->getElementType(),
6868                                              ConstantSource->getSize(),
6869                                              ArrayType::Normal, 0);
6870           }
6871         }
6872       }
6873       break;
6874 
6875     case SK_ParenthesizedArrayInit:
6876       // Okay: we checked everything before creating this step. Note that
6877       // this is a GNU extension.
6878       S.Diag(Kind.getLocation(), diag::ext_array_init_parens)
6879         << CurInit.get()->getSourceRange();
6880       break;
6881 
6882     case SK_PassByIndirectCopyRestore:
6883     case SK_PassByIndirectRestore:
6884       checkIndirectCopyRestoreSource(S, CurInit.get());
6885       CurInit = new (S.Context) ObjCIndirectCopyRestoreExpr(
6886           CurInit.get(), Step->Type,
6887           Step->Kind == SK_PassByIndirectCopyRestore);
6888       break;
6889 
6890     case SK_ProduceObjCObject:
6891       CurInit =
6892           ImplicitCastExpr::Create(S.Context, Step->Type, CK_ARCProduceObject,
6893                                    CurInit.get(), nullptr, VK_RValue);
6894       break;
6895 
6896     case SK_StdInitializerList: {
6897       S.Diag(CurInit.get()->getExprLoc(),
6898              diag::warn_cxx98_compat_initializer_list_init)
6899         << CurInit.get()->getSourceRange();
6900 
6901       // Materialize the temporary into memory.
6902       MaterializeTemporaryExpr *MTE = S.CreateMaterializeTemporaryExpr(
6903           CurInit.get()->getType(), CurInit.get(),
6904           /*BoundToLvalueReference=*/false);
6905 
6906       // Maybe lifetime-extend the array temporary's subobjects to match the
6907       // entity's lifetime.
6908       if (const InitializedEntity *ExtendingEntity =
6909               getEntityForTemporaryLifetimeExtension(&Entity))
6910         if (performReferenceExtension(MTE, ExtendingEntity))
6911           warnOnLifetimeExtension(S, Entity, CurInit.get(),
6912                                   /*IsInitializerList=*/true,
6913                                   ExtendingEntity->getDecl());
6914 
6915       // Wrap it in a construction of a std::initializer_list<T>.
6916       CurInit = new (S.Context) CXXStdInitializerListExpr(Step->Type, MTE);
6917 
6918       // Bind the result, in case the library has given initializer_list a
6919       // non-trivial destructor.
6920       if (shouldBindAsTemporary(Entity))
6921         CurInit = S.MaybeBindToTemporary(CurInit.get());
6922       break;
6923     }
6924 
6925     case SK_OCLSamplerInit: {
6926       // Sampler initialzation have 5 cases:
6927       //   1. function argument passing
6928       //      1a. argument is a file-scope variable
6929       //      1b. argument is a function-scope variable
6930       //      1c. argument is one of caller function's parameters
6931       //   2. variable initialization
6932       //      2a. initializing a file-scope variable
6933       //      2b. initializing a function-scope variable
6934       //
6935       // For file-scope variables, since they cannot be initialized by function
6936       // call of __translate_sampler_initializer in LLVM IR, their references
6937       // need to be replaced by a cast from their literal initializers to
6938       // sampler type. Since sampler variables can only be used in function
6939       // calls as arguments, we only need to replace them when handling the
6940       // argument passing.
6941       assert(Step->Type->isSamplerT() &&
6942              "Sampler initialization on non-sampler type.");
6943       Expr *Init = CurInit.get();
6944       QualType SourceType = Init->getType();
6945       // Case 1
6946       if (Entity.isParameterKind()) {
6947         if (!SourceType->isSamplerT()) {
6948           S.Diag(Kind.getLocation(), diag::err_sampler_argument_required)
6949             << SourceType;
6950           break;
6951         } else if (const DeclRefExpr *DRE = dyn_cast<DeclRefExpr>(Init)) {
6952           auto Var = cast<VarDecl>(DRE->getDecl());
6953           // Case 1b and 1c
6954           // No cast from integer to sampler is needed.
6955           if (!Var->hasGlobalStorage()) {
6956             CurInit = ImplicitCastExpr::Create(S.Context, Step->Type,
6957                                                CK_LValueToRValue, Init,
6958                                                /*BasePath=*/nullptr, VK_RValue);
6959             break;
6960           }
6961           // Case 1a
6962           // For function call with a file-scope sampler variable as argument,
6963           // get the integer literal.
6964           // Do not diagnose if the file-scope variable does not have initializer
6965           // since this has already been diagnosed when parsing the variable
6966           // declaration.
6967           if (!Var->getInit() || !isa<ImplicitCastExpr>(Var->getInit()))
6968             break;
6969           Init = cast<ImplicitCastExpr>(const_cast<Expr*>(
6970             Var->getInit()))->getSubExpr();
6971           SourceType = Init->getType();
6972         }
6973       } else {
6974         // Case 2
6975         // Check initializer is 32 bit integer constant.
6976         // If the initializer is taken from global variable, do not diagnose since
6977         // this has already been done when parsing the variable declaration.
6978         if (!Init->isConstantInitializer(S.Context, false))
6979           break;
6980 
6981         if (!SourceType->isIntegerType() ||
6982             32 != S.Context.getIntWidth(SourceType)) {
6983           S.Diag(Kind.getLocation(), diag::err_sampler_initializer_not_integer)
6984             << SourceType;
6985           break;
6986         }
6987 
6988         llvm::APSInt Result;
6989         Init->EvaluateAsInt(Result, S.Context);
6990         const uint64_t SamplerValue = Result.getLimitedValue();
6991         // 32-bit value of sampler's initializer is interpreted as
6992         // bit-field with the following structure:
6993         // |unspecified|Filter|Addressing Mode| Normalized Coords|
6994         // |31        6|5    4|3             1|                 0|
6995         // This structure corresponds to enum values of sampler properties
6996         // defined in SPIR spec v1.2 and also opencl-c.h
6997         unsigned AddressingMode  = (0x0E & SamplerValue) >> 1;
6998         unsigned FilterMode      = (0x30 & SamplerValue) >> 4;
6999         if (FilterMode != 1 && FilterMode != 2)
7000           S.Diag(Kind.getLocation(),
7001                  diag::warn_sampler_initializer_invalid_bits)
7002                  << "Filter Mode";
7003         if (AddressingMode > 4)
7004           S.Diag(Kind.getLocation(),
7005                  diag::warn_sampler_initializer_invalid_bits)
7006                  << "Addressing Mode";
7007       }
7008 
7009       // Cases 1a, 2a and 2b
7010       // Insert cast from integer to sampler.
7011       CurInit = S.ImpCastExprToType(Init, S.Context.OCLSamplerTy,
7012                                       CK_IntToOCLSampler);
7013       break;
7014     }
7015     case SK_OCLZeroEvent: {
7016       assert(Step->Type->isEventT() &&
7017              "Event initialization on non-event type.");
7018 
7019       CurInit = S.ImpCastExprToType(CurInit.get(), Step->Type,
7020                                     CK_ZeroToOCLEvent,
7021                                     CurInit.get()->getValueKind());
7022       break;
7023     }
7024     }
7025   }
7026 
7027   // Diagnose non-fatal problems with the completed initialization.
7028   if (Entity.getKind() == InitializedEntity::EK_Member &&
7029       cast<FieldDecl>(Entity.getDecl())->isBitField())
7030     S.CheckBitFieldInitialization(Kind.getLocation(),
7031                                   cast<FieldDecl>(Entity.getDecl()),
7032                                   CurInit.get());
7033 
7034   // Check for std::move on construction.
7035   if (const Expr *E = CurInit.get()) {
7036     CheckMoveOnConstruction(S, E,
7037                             Entity.getKind() == InitializedEntity::EK_Result);
7038   }
7039 
7040   return CurInit;
7041 }
7042 
7043 /// Somewhere within T there is an uninitialized reference subobject.
7044 /// Dig it out and diagnose it.
7045 static bool DiagnoseUninitializedReference(Sema &S, SourceLocation Loc,
7046                                            QualType T) {
7047   if (T->isReferenceType()) {
7048     S.Diag(Loc, diag::err_reference_without_init)
7049       << T.getNonReferenceType();
7050     return true;
7051   }
7052 
7053   CXXRecordDecl *RD = T->getBaseElementTypeUnsafe()->getAsCXXRecordDecl();
7054   if (!RD || !RD->hasUninitializedReferenceMember())
7055     return false;
7056 
7057   for (const auto *FI : RD->fields()) {
7058     if (FI->isUnnamedBitfield())
7059       continue;
7060 
7061     if (DiagnoseUninitializedReference(S, FI->getLocation(), FI->getType())) {
7062       S.Diag(Loc, diag::note_value_initialization_here) << RD;
7063       return true;
7064     }
7065   }
7066 
7067   for (const auto &BI : RD->bases()) {
7068     if (DiagnoseUninitializedReference(S, BI.getLocStart(), BI.getType())) {
7069       S.Diag(Loc, diag::note_value_initialization_here) << RD;
7070       return true;
7071     }
7072   }
7073 
7074   return false;
7075 }
7076 
7077 
7078 //===----------------------------------------------------------------------===//
7079 // Diagnose initialization failures
7080 //===----------------------------------------------------------------------===//
7081 
7082 /// Emit notes associated with an initialization that failed due to a
7083 /// "simple" conversion failure.
7084 static void emitBadConversionNotes(Sema &S, const InitializedEntity &entity,
7085                                    Expr *op) {
7086   QualType destType = entity.getType();
7087   if (destType.getNonReferenceType()->isObjCObjectPointerType() &&
7088       op->getType()->isObjCObjectPointerType()) {
7089 
7090     // Emit a possible note about the conversion failing because the
7091     // operand is a message send with a related result type.
7092     S.EmitRelatedResultTypeNote(op);
7093 
7094     // Emit a possible note about a return failing because we're
7095     // expecting a related result type.
7096     if (entity.getKind() == InitializedEntity::EK_Result)
7097       S.EmitRelatedResultTypeNoteForReturn(destType);
7098   }
7099 }
7100 
7101 static void diagnoseListInit(Sema &S, const InitializedEntity &Entity,
7102                              InitListExpr *InitList) {
7103   QualType DestType = Entity.getType();
7104 
7105   QualType E;
7106   if (S.getLangOpts().CPlusPlus11 && S.isStdInitializerList(DestType, &E)) {
7107     QualType ArrayType = S.Context.getConstantArrayType(
7108         E.withConst(),
7109         llvm::APInt(S.Context.getTypeSize(S.Context.getSizeType()),
7110                     InitList->getNumInits()),
7111         clang::ArrayType::Normal, 0);
7112     InitializedEntity HiddenArray =
7113         InitializedEntity::InitializeTemporary(ArrayType);
7114     return diagnoseListInit(S, HiddenArray, InitList);
7115   }
7116 
7117   if (DestType->isReferenceType()) {
7118     // A list-initialization failure for a reference means that we tried to
7119     // create a temporary of the inner type (per [dcl.init.list]p3.6) and the
7120     // inner initialization failed.
7121     QualType T = DestType->getAs<ReferenceType>()->getPointeeType();
7122     diagnoseListInit(S, InitializedEntity::InitializeTemporary(T), InitList);
7123     SourceLocation Loc = InitList->getLocStart();
7124     if (auto *D = Entity.getDecl())
7125       Loc = D->getLocation();
7126     S.Diag(Loc, diag::note_in_reference_temporary_list_initializer) << T;
7127     return;
7128   }
7129 
7130   InitListChecker DiagnoseInitList(S, Entity, InitList, DestType,
7131                                    /*VerifyOnly=*/false,
7132                                    /*TreatUnavailableAsInvalid=*/false);
7133   assert(DiagnoseInitList.HadError() &&
7134          "Inconsistent init list check result.");
7135 }
7136 
7137 bool InitializationSequence::Diagnose(Sema &S,
7138                                       const InitializedEntity &Entity,
7139                                       const InitializationKind &Kind,
7140                                       ArrayRef<Expr *> Args) {
7141   if (!Failed())
7142     return false;
7143 
7144   QualType DestType = Entity.getType();
7145   switch (Failure) {
7146   case FK_TooManyInitsForReference:
7147     // FIXME: Customize for the initialized entity?
7148     if (Args.empty()) {
7149       // Dig out the reference subobject which is uninitialized and diagnose it.
7150       // If this is value-initialization, this could be nested some way within
7151       // the target type.
7152       assert(Kind.getKind() == InitializationKind::IK_Value ||
7153              DestType->isReferenceType());
7154       bool Diagnosed =
7155         DiagnoseUninitializedReference(S, Kind.getLocation(), DestType);
7156       assert(Diagnosed && "couldn't find uninitialized reference to diagnose");
7157       (void)Diagnosed;
7158     } else  // FIXME: diagnostic below could be better!
7159       S.Diag(Kind.getLocation(), diag::err_reference_has_multiple_inits)
7160         << SourceRange(Args.front()->getLocStart(), Args.back()->getLocEnd());
7161     break;
7162 
7163   case FK_ArrayNeedsInitList:
7164     S.Diag(Kind.getLocation(), diag::err_array_init_not_init_list) << 0;
7165     break;
7166   case FK_ArrayNeedsInitListOrStringLiteral:
7167     S.Diag(Kind.getLocation(), diag::err_array_init_not_init_list) << 1;
7168     break;
7169   case FK_ArrayNeedsInitListOrWideStringLiteral:
7170     S.Diag(Kind.getLocation(), diag::err_array_init_not_init_list) << 2;
7171     break;
7172   case FK_NarrowStringIntoWideCharArray:
7173     S.Diag(Kind.getLocation(), diag::err_array_init_narrow_string_into_wchar);
7174     break;
7175   case FK_WideStringIntoCharArray:
7176     S.Diag(Kind.getLocation(), diag::err_array_init_wide_string_into_char);
7177     break;
7178   case FK_IncompatWideStringIntoWideChar:
7179     S.Diag(Kind.getLocation(),
7180            diag::err_array_init_incompat_wide_string_into_wchar);
7181     break;
7182   case FK_ArrayTypeMismatch:
7183   case FK_NonConstantArrayInit:
7184     S.Diag(Kind.getLocation(),
7185            (Failure == FK_ArrayTypeMismatch
7186               ? diag::err_array_init_different_type
7187               : diag::err_array_init_non_constant_array))
7188       << DestType.getNonReferenceType()
7189       << Args[0]->getType()
7190       << Args[0]->getSourceRange();
7191     break;
7192 
7193   case FK_VariableLengthArrayHasInitializer:
7194     S.Diag(Kind.getLocation(), diag::err_variable_object_no_init)
7195       << Args[0]->getSourceRange();
7196     break;
7197 
7198   case FK_AddressOfOverloadFailed: {
7199     DeclAccessPair Found;
7200     S.ResolveAddressOfOverloadedFunction(Args[0],
7201                                          DestType.getNonReferenceType(),
7202                                          true,
7203                                          Found);
7204     break;
7205   }
7206 
7207   case FK_AddressOfUnaddressableFunction: {
7208     auto *FD = cast<FunctionDecl>(cast<DeclRefExpr>(Args[0])->getDecl());
7209     S.checkAddressOfFunctionIsAvailable(FD, /*Complain=*/true,
7210                                         Args[0]->getLocStart());
7211     break;
7212   }
7213 
7214   case FK_ReferenceInitOverloadFailed:
7215   case FK_UserConversionOverloadFailed:
7216     switch (FailedOverloadResult) {
7217     case OR_Ambiguous:
7218       if (Failure == FK_UserConversionOverloadFailed)
7219         S.Diag(Kind.getLocation(), diag::err_typecheck_ambiguous_condition)
7220           << Args[0]->getType() << DestType
7221           << Args[0]->getSourceRange();
7222       else
7223         S.Diag(Kind.getLocation(), diag::err_ref_init_ambiguous)
7224           << DestType << Args[0]->getType()
7225           << Args[0]->getSourceRange();
7226 
7227       FailedCandidateSet.NoteCandidates(S, OCD_ViableCandidates, Args);
7228       break;
7229 
7230     case OR_No_Viable_Function:
7231       if (!S.RequireCompleteType(Kind.getLocation(),
7232                                  DestType.getNonReferenceType(),
7233                           diag::err_typecheck_nonviable_condition_incomplete,
7234                                Args[0]->getType(), Args[0]->getSourceRange()))
7235         S.Diag(Kind.getLocation(), diag::err_typecheck_nonviable_condition)
7236           << (Entity.getKind() == InitializedEntity::EK_Result)
7237           << Args[0]->getType() << Args[0]->getSourceRange()
7238           << DestType.getNonReferenceType();
7239 
7240       FailedCandidateSet.NoteCandidates(S, OCD_AllCandidates, Args);
7241       break;
7242 
7243     case OR_Deleted: {
7244       S.Diag(Kind.getLocation(), diag::err_typecheck_deleted_function)
7245         << Args[0]->getType() << DestType.getNonReferenceType()
7246         << Args[0]->getSourceRange();
7247       OverloadCandidateSet::iterator Best;
7248       OverloadingResult Ovl
7249         = FailedCandidateSet.BestViableFunction(S, Kind.getLocation(), Best,
7250                                                 true);
7251       if (Ovl == OR_Deleted) {
7252         S.NoteDeletedFunction(Best->Function);
7253       } else {
7254         llvm_unreachable("Inconsistent overload resolution?");
7255       }
7256       break;
7257     }
7258 
7259     case OR_Success:
7260       llvm_unreachable("Conversion did not fail!");
7261     }
7262     break;
7263 
7264   case FK_NonConstLValueReferenceBindingToTemporary:
7265     if (isa<InitListExpr>(Args[0])) {
7266       S.Diag(Kind.getLocation(),
7267              diag::err_lvalue_reference_bind_to_initlist)
7268       << DestType.getNonReferenceType().isVolatileQualified()
7269       << DestType.getNonReferenceType()
7270       << Args[0]->getSourceRange();
7271       break;
7272     }
7273     // Intentional fallthrough
7274 
7275   case FK_NonConstLValueReferenceBindingToUnrelated:
7276     S.Diag(Kind.getLocation(),
7277            Failure == FK_NonConstLValueReferenceBindingToTemporary
7278              ? diag::err_lvalue_reference_bind_to_temporary
7279              : diag::err_lvalue_reference_bind_to_unrelated)
7280       << DestType.getNonReferenceType().isVolatileQualified()
7281       << DestType.getNonReferenceType()
7282       << Args[0]->getType()
7283       << Args[0]->getSourceRange();
7284     break;
7285 
7286   case FK_RValueReferenceBindingToLValue:
7287     S.Diag(Kind.getLocation(), diag::err_lvalue_to_rvalue_ref)
7288       << DestType.getNonReferenceType() << Args[0]->getType()
7289       << Args[0]->getSourceRange();
7290     break;
7291 
7292   case FK_ReferenceInitDropsQualifiers: {
7293     QualType SourceType = Args[0]->getType();
7294     QualType NonRefType = DestType.getNonReferenceType();
7295     Qualifiers DroppedQualifiers =
7296         SourceType.getQualifiers() - NonRefType.getQualifiers();
7297 
7298     S.Diag(Kind.getLocation(), diag::err_reference_bind_drops_quals)
7299       << SourceType
7300       << NonRefType
7301       << DroppedQualifiers.getCVRQualifiers()
7302       << Args[0]->getSourceRange();
7303     break;
7304   }
7305 
7306   case FK_ReferenceInitFailed:
7307     S.Diag(Kind.getLocation(), diag::err_reference_bind_failed)
7308       << DestType.getNonReferenceType()
7309       << Args[0]->isLValue()
7310       << Args[0]->getType()
7311       << Args[0]->getSourceRange();
7312     emitBadConversionNotes(S, Entity, Args[0]);
7313     break;
7314 
7315   case FK_ConversionFailed: {
7316     QualType FromType = Args[0]->getType();
7317     PartialDiagnostic PDiag = S.PDiag(diag::err_init_conversion_failed)
7318       << (int)Entity.getKind()
7319       << DestType
7320       << Args[0]->isLValue()
7321       << FromType
7322       << Args[0]->getSourceRange();
7323     S.HandleFunctionTypeMismatch(PDiag, FromType, DestType);
7324     S.Diag(Kind.getLocation(), PDiag);
7325     emitBadConversionNotes(S, Entity, Args[0]);
7326     break;
7327   }
7328 
7329   case FK_ConversionFromPropertyFailed:
7330     // No-op. This error has already been reported.
7331     break;
7332 
7333   case FK_TooManyInitsForScalar: {
7334     SourceRange R;
7335 
7336     auto *InitList = dyn_cast<InitListExpr>(Args[0]);
7337     if (InitList && InitList->getNumInits() >= 1) {
7338       R = SourceRange(InitList->getInit(0)->getLocEnd(), InitList->getLocEnd());
7339     } else {
7340       assert(Args.size() > 1 && "Expected multiple initializers!");
7341       R = SourceRange(Args.front()->getLocEnd(), Args.back()->getLocEnd());
7342     }
7343 
7344     R.setBegin(S.getLocForEndOfToken(R.getBegin()));
7345     if (Kind.isCStyleOrFunctionalCast())
7346       S.Diag(Kind.getLocation(), diag::err_builtin_func_cast_more_than_one_arg)
7347         << R;
7348     else
7349       S.Diag(Kind.getLocation(), diag::err_excess_initializers)
7350         << /*scalar=*/2 << R;
7351     break;
7352   }
7353 
7354   case FK_ReferenceBindingToInitList:
7355     S.Diag(Kind.getLocation(), diag::err_reference_bind_init_list)
7356       << DestType.getNonReferenceType() << Args[0]->getSourceRange();
7357     break;
7358 
7359   case FK_InitListBadDestinationType:
7360     S.Diag(Kind.getLocation(), diag::err_init_list_bad_dest_type)
7361       << (DestType->isRecordType()) << DestType << Args[0]->getSourceRange();
7362     break;
7363 
7364   case FK_ListConstructorOverloadFailed:
7365   case FK_ConstructorOverloadFailed: {
7366     SourceRange ArgsRange;
7367     if (Args.size())
7368       ArgsRange = SourceRange(Args.front()->getLocStart(),
7369                               Args.back()->getLocEnd());
7370 
7371     if (Failure == FK_ListConstructorOverloadFailed) {
7372       assert(Args.size() == 1 &&
7373              "List construction from other than 1 argument.");
7374       InitListExpr *InitList = cast<InitListExpr>(Args[0]);
7375       Args = MultiExprArg(InitList->getInits(), InitList->getNumInits());
7376     }
7377 
7378     // FIXME: Using "DestType" for the entity we're printing is probably
7379     // bad.
7380     switch (FailedOverloadResult) {
7381       case OR_Ambiguous:
7382         S.Diag(Kind.getLocation(), diag::err_ovl_ambiguous_init)
7383           << DestType << ArgsRange;
7384         FailedCandidateSet.NoteCandidates(S, OCD_ViableCandidates, Args);
7385         break;
7386 
7387       case OR_No_Viable_Function:
7388         if (Kind.getKind() == InitializationKind::IK_Default &&
7389             (Entity.getKind() == InitializedEntity::EK_Base ||
7390              Entity.getKind() == InitializedEntity::EK_Member) &&
7391             isa<CXXConstructorDecl>(S.CurContext)) {
7392           // This is implicit default initialization of a member or
7393           // base within a constructor. If no viable function was
7394           // found, notify the user that they need to explicitly
7395           // initialize this base/member.
7396           CXXConstructorDecl *Constructor
7397             = cast<CXXConstructorDecl>(S.CurContext);
7398           const CXXRecordDecl *InheritedFrom = nullptr;
7399           if (auto Inherited = Constructor->getInheritedConstructor())
7400             InheritedFrom = Inherited.getShadowDecl()->getNominatedBaseClass();
7401           if (Entity.getKind() == InitializedEntity::EK_Base) {
7402             S.Diag(Kind.getLocation(), diag::err_missing_default_ctor)
7403               << (InheritedFrom ? 2 : Constructor->isImplicit() ? 1 : 0)
7404               << S.Context.getTypeDeclType(Constructor->getParent())
7405               << /*base=*/0
7406               << Entity.getType()
7407               << InheritedFrom;
7408 
7409             RecordDecl *BaseDecl
7410               = Entity.getBaseSpecifier()->getType()->getAs<RecordType>()
7411                                                                   ->getDecl();
7412             S.Diag(BaseDecl->getLocation(), diag::note_previous_decl)
7413               << S.Context.getTagDeclType(BaseDecl);
7414           } else {
7415             S.Diag(Kind.getLocation(), diag::err_missing_default_ctor)
7416               << (InheritedFrom ? 2 : Constructor->isImplicit() ? 1 : 0)
7417               << S.Context.getTypeDeclType(Constructor->getParent())
7418               << /*member=*/1
7419               << Entity.getName()
7420               << InheritedFrom;
7421             S.Diag(Entity.getDecl()->getLocation(),
7422                    diag::note_member_declared_at);
7423 
7424             if (const RecordType *Record
7425                                  = Entity.getType()->getAs<RecordType>())
7426               S.Diag(Record->getDecl()->getLocation(),
7427                      diag::note_previous_decl)
7428                 << S.Context.getTagDeclType(Record->getDecl());
7429           }
7430           break;
7431         }
7432 
7433         S.Diag(Kind.getLocation(), diag::err_ovl_no_viable_function_in_init)
7434           << DestType << ArgsRange;
7435         FailedCandidateSet.NoteCandidates(S, OCD_AllCandidates, Args);
7436         break;
7437 
7438       case OR_Deleted: {
7439         OverloadCandidateSet::iterator Best;
7440         OverloadingResult Ovl
7441           = FailedCandidateSet.BestViableFunction(S, Kind.getLocation(), Best);
7442         if (Ovl != OR_Deleted) {
7443           S.Diag(Kind.getLocation(), diag::err_ovl_deleted_init)
7444             << true << DestType << ArgsRange;
7445           llvm_unreachable("Inconsistent overload resolution?");
7446           break;
7447         }
7448 
7449         // If this is a defaulted or implicitly-declared function, then
7450         // it was implicitly deleted. Make it clear that the deletion was
7451         // implicit.
7452         if (S.isImplicitlyDeleted(Best->Function))
7453           S.Diag(Kind.getLocation(), diag::err_ovl_deleted_special_init)
7454             << S.getSpecialMember(cast<CXXMethodDecl>(Best->Function))
7455             << DestType << ArgsRange;
7456         else
7457           S.Diag(Kind.getLocation(), diag::err_ovl_deleted_init)
7458             << true << DestType << ArgsRange;
7459 
7460         S.NoteDeletedFunction(Best->Function);
7461         break;
7462       }
7463 
7464       case OR_Success:
7465         llvm_unreachable("Conversion did not fail!");
7466     }
7467   }
7468   break;
7469 
7470   case FK_DefaultInitOfConst:
7471     if (Entity.getKind() == InitializedEntity::EK_Member &&
7472         isa<CXXConstructorDecl>(S.CurContext)) {
7473       // This is implicit default-initialization of a const member in
7474       // a constructor. Complain that it needs to be explicitly
7475       // initialized.
7476       CXXConstructorDecl *Constructor = cast<CXXConstructorDecl>(S.CurContext);
7477       S.Diag(Kind.getLocation(), diag::err_uninitialized_member_in_ctor)
7478         << (Constructor->getInheritedConstructor() ? 2 :
7479             Constructor->isImplicit() ? 1 : 0)
7480         << S.Context.getTypeDeclType(Constructor->getParent())
7481         << /*const=*/1
7482         << Entity.getName();
7483       S.Diag(Entity.getDecl()->getLocation(), diag::note_previous_decl)
7484         << Entity.getName();
7485     } else {
7486       S.Diag(Kind.getLocation(), diag::err_default_init_const)
7487           << DestType << (bool)DestType->getAs<RecordType>();
7488     }
7489     break;
7490 
7491   case FK_Incomplete:
7492     S.RequireCompleteType(Kind.getLocation(), FailedIncompleteType,
7493                           diag::err_init_incomplete_type);
7494     break;
7495 
7496   case FK_ListInitializationFailed: {
7497     // Run the init list checker again to emit diagnostics.
7498     InitListExpr *InitList = cast<InitListExpr>(Args[0]);
7499     diagnoseListInit(S, Entity, InitList);
7500     break;
7501   }
7502 
7503   case FK_PlaceholderType: {
7504     // FIXME: Already diagnosed!
7505     break;
7506   }
7507 
7508   case FK_ExplicitConstructor: {
7509     S.Diag(Kind.getLocation(), diag::err_selected_explicit_constructor)
7510       << Args[0]->getSourceRange();
7511     OverloadCandidateSet::iterator Best;
7512     OverloadingResult Ovl
7513       = FailedCandidateSet.BestViableFunction(S, Kind.getLocation(), Best);
7514     (void)Ovl;
7515     assert(Ovl == OR_Success && "Inconsistent overload resolution");
7516     CXXConstructorDecl *CtorDecl = cast<CXXConstructorDecl>(Best->Function);
7517     S.Diag(CtorDecl->getLocation(), diag::note_constructor_declared_here);
7518     break;
7519   }
7520   }
7521 
7522   PrintInitLocationNote(S, Entity);
7523   return true;
7524 }
7525 
7526 void InitializationSequence::dump(raw_ostream &OS) const {
7527   switch (SequenceKind) {
7528   case FailedSequence: {
7529     OS << "Failed sequence: ";
7530     switch (Failure) {
7531     case FK_TooManyInitsForReference:
7532       OS << "too many initializers for reference";
7533       break;
7534 
7535     case FK_ArrayNeedsInitList:
7536       OS << "array requires initializer list";
7537       break;
7538 
7539     case FK_AddressOfUnaddressableFunction:
7540       OS << "address of unaddressable function was taken";
7541       break;
7542 
7543     case FK_ArrayNeedsInitListOrStringLiteral:
7544       OS << "array requires initializer list or string literal";
7545       break;
7546 
7547     case FK_ArrayNeedsInitListOrWideStringLiteral:
7548       OS << "array requires initializer list or wide string literal";
7549       break;
7550 
7551     case FK_NarrowStringIntoWideCharArray:
7552       OS << "narrow string into wide char array";
7553       break;
7554 
7555     case FK_WideStringIntoCharArray:
7556       OS << "wide string into char array";
7557       break;
7558 
7559     case FK_IncompatWideStringIntoWideChar:
7560       OS << "incompatible wide string into wide char array";
7561       break;
7562 
7563     case FK_ArrayTypeMismatch:
7564       OS << "array type mismatch";
7565       break;
7566 
7567     case FK_NonConstantArrayInit:
7568       OS << "non-constant array initializer";
7569       break;
7570 
7571     case FK_AddressOfOverloadFailed:
7572       OS << "address of overloaded function failed";
7573       break;
7574 
7575     case FK_ReferenceInitOverloadFailed:
7576       OS << "overload resolution for reference initialization failed";
7577       break;
7578 
7579     case FK_NonConstLValueReferenceBindingToTemporary:
7580       OS << "non-const lvalue reference bound to temporary";
7581       break;
7582 
7583     case FK_NonConstLValueReferenceBindingToUnrelated:
7584       OS << "non-const lvalue reference bound to unrelated type";
7585       break;
7586 
7587     case FK_RValueReferenceBindingToLValue:
7588       OS << "rvalue reference bound to an lvalue";
7589       break;
7590 
7591     case FK_ReferenceInitDropsQualifiers:
7592       OS << "reference initialization drops qualifiers";
7593       break;
7594 
7595     case FK_ReferenceInitFailed:
7596       OS << "reference initialization failed";
7597       break;
7598 
7599     case FK_ConversionFailed:
7600       OS << "conversion failed";
7601       break;
7602 
7603     case FK_ConversionFromPropertyFailed:
7604       OS << "conversion from property failed";
7605       break;
7606 
7607     case FK_TooManyInitsForScalar:
7608       OS << "too many initializers for scalar";
7609       break;
7610 
7611     case FK_ReferenceBindingToInitList:
7612       OS << "referencing binding to initializer list";
7613       break;
7614 
7615     case FK_InitListBadDestinationType:
7616       OS << "initializer list for non-aggregate, non-scalar type";
7617       break;
7618 
7619     case FK_UserConversionOverloadFailed:
7620       OS << "overloading failed for user-defined conversion";
7621       break;
7622 
7623     case FK_ConstructorOverloadFailed:
7624       OS << "constructor overloading failed";
7625       break;
7626 
7627     case FK_DefaultInitOfConst:
7628       OS << "default initialization of a const variable";
7629       break;
7630 
7631     case FK_Incomplete:
7632       OS << "initialization of incomplete type";
7633       break;
7634 
7635     case FK_ListInitializationFailed:
7636       OS << "list initialization checker failure";
7637       break;
7638 
7639     case FK_VariableLengthArrayHasInitializer:
7640       OS << "variable length array has an initializer";
7641       break;
7642 
7643     case FK_PlaceholderType:
7644       OS << "initializer expression isn't contextually valid";
7645       break;
7646 
7647     case FK_ListConstructorOverloadFailed:
7648       OS << "list constructor overloading failed";
7649       break;
7650 
7651     case FK_ExplicitConstructor:
7652       OS << "list copy initialization chose explicit constructor";
7653       break;
7654     }
7655     OS << '\n';
7656     return;
7657   }
7658 
7659   case DependentSequence:
7660     OS << "Dependent sequence\n";
7661     return;
7662 
7663   case NormalSequence:
7664     OS << "Normal sequence: ";
7665     break;
7666   }
7667 
7668   for (step_iterator S = step_begin(), SEnd = step_end(); S != SEnd; ++S) {
7669     if (S != step_begin()) {
7670       OS << " -> ";
7671     }
7672 
7673     switch (S->Kind) {
7674     case SK_ResolveAddressOfOverloadedFunction:
7675       OS << "resolve address of overloaded function";
7676       break;
7677 
7678     case SK_CastDerivedToBaseRValue:
7679       OS << "derived-to-base case (rvalue" << S->Type.getAsString() << ")";
7680       break;
7681 
7682     case SK_CastDerivedToBaseXValue:
7683       OS << "derived-to-base case (xvalue" << S->Type.getAsString() << ")";
7684       break;
7685 
7686     case SK_CastDerivedToBaseLValue:
7687       OS << "derived-to-base case (lvalue" << S->Type.getAsString() << ")";
7688       break;
7689 
7690     case SK_BindReference:
7691       OS << "bind reference to lvalue";
7692       break;
7693 
7694     case SK_BindReferenceToTemporary:
7695       OS << "bind reference to a temporary";
7696       break;
7697 
7698     case SK_ExtraneousCopyToTemporary:
7699       OS << "extraneous C++03 copy to temporary";
7700       break;
7701 
7702     case SK_UserConversion:
7703       OS << "user-defined conversion via " << *S->Function.Function;
7704       break;
7705 
7706     case SK_QualificationConversionRValue:
7707       OS << "qualification conversion (rvalue)";
7708       break;
7709 
7710     case SK_QualificationConversionXValue:
7711       OS << "qualification conversion (xvalue)";
7712       break;
7713 
7714     case SK_QualificationConversionLValue:
7715       OS << "qualification conversion (lvalue)";
7716       break;
7717 
7718     case SK_AtomicConversion:
7719       OS << "non-atomic-to-atomic conversion";
7720       break;
7721 
7722     case SK_LValueToRValue:
7723       OS << "load (lvalue to rvalue)";
7724       break;
7725 
7726     case SK_ConversionSequence:
7727       OS << "implicit conversion sequence (";
7728       S->ICS->dump(); // FIXME: use OS
7729       OS << ")";
7730       break;
7731 
7732     case SK_ConversionSequenceNoNarrowing:
7733       OS << "implicit conversion sequence with narrowing prohibited (";
7734       S->ICS->dump(); // FIXME: use OS
7735       OS << ")";
7736       break;
7737 
7738     case SK_ListInitialization:
7739       OS << "list aggregate initialization";
7740       break;
7741 
7742     case SK_UnwrapInitList:
7743       OS << "unwrap reference initializer list";
7744       break;
7745 
7746     case SK_RewrapInitList:
7747       OS << "rewrap reference initializer list";
7748       break;
7749 
7750     case SK_ConstructorInitialization:
7751       OS << "constructor initialization";
7752       break;
7753 
7754     case SK_ConstructorInitializationFromList:
7755       OS << "list initialization via constructor";
7756       break;
7757 
7758     case SK_ZeroInitialization:
7759       OS << "zero initialization";
7760       break;
7761 
7762     case SK_CAssignment:
7763       OS << "C assignment";
7764       break;
7765 
7766     case SK_StringInit:
7767       OS << "string initialization";
7768       break;
7769 
7770     case SK_ObjCObjectConversion:
7771       OS << "Objective-C object conversion";
7772       break;
7773 
7774     case SK_ArrayInit:
7775       OS << "array initialization";
7776       break;
7777 
7778     case SK_ParenthesizedArrayInit:
7779       OS << "parenthesized array initialization";
7780       break;
7781 
7782     case SK_PassByIndirectCopyRestore:
7783       OS << "pass by indirect copy and restore";
7784       break;
7785 
7786     case SK_PassByIndirectRestore:
7787       OS << "pass by indirect restore";
7788       break;
7789 
7790     case SK_ProduceObjCObject:
7791       OS << "Objective-C object retension";
7792       break;
7793 
7794     case SK_StdInitializerList:
7795       OS << "std::initializer_list from initializer list";
7796       break;
7797 
7798     case SK_StdInitializerListConstructorCall:
7799       OS << "list initialization from std::initializer_list";
7800       break;
7801 
7802     case SK_OCLSamplerInit:
7803       OS << "OpenCL sampler_t from integer constant";
7804       break;
7805 
7806     case SK_OCLZeroEvent:
7807       OS << "OpenCL event_t from zero";
7808       break;
7809     }
7810 
7811     OS << " [" << S->Type.getAsString() << ']';
7812   }
7813 
7814   OS << '\n';
7815 }
7816 
7817 void InitializationSequence::dump() const {
7818   dump(llvm::errs());
7819 }
7820 
7821 static void DiagnoseNarrowingInInitList(Sema &S,
7822                                         const ImplicitConversionSequence &ICS,
7823                                         QualType PreNarrowingType,
7824                                         QualType EntityType,
7825                                         const Expr *PostInit) {
7826   const StandardConversionSequence *SCS = nullptr;
7827   switch (ICS.getKind()) {
7828   case ImplicitConversionSequence::StandardConversion:
7829     SCS = &ICS.Standard;
7830     break;
7831   case ImplicitConversionSequence::UserDefinedConversion:
7832     SCS = &ICS.UserDefined.After;
7833     break;
7834   case ImplicitConversionSequence::AmbiguousConversion:
7835   case ImplicitConversionSequence::EllipsisConversion:
7836   case ImplicitConversionSequence::BadConversion:
7837     return;
7838   }
7839 
7840   // C++11 [dcl.init.list]p7: Check whether this is a narrowing conversion.
7841   APValue ConstantValue;
7842   QualType ConstantType;
7843   switch (SCS->getNarrowingKind(S.Context, PostInit, ConstantValue,
7844                                 ConstantType)) {
7845   case NK_Not_Narrowing:
7846     // No narrowing occurred.
7847     return;
7848 
7849   case NK_Type_Narrowing:
7850     // This was a floating-to-integer conversion, which is always considered a
7851     // narrowing conversion even if the value is a constant and can be
7852     // represented exactly as an integer.
7853     S.Diag(PostInit->getLocStart(),
7854            (S.getLangOpts().MicrosoftExt || !S.getLangOpts().CPlusPlus11)
7855                ? diag::warn_init_list_type_narrowing
7856                : diag::ext_init_list_type_narrowing)
7857       << PostInit->getSourceRange()
7858       << PreNarrowingType.getLocalUnqualifiedType()
7859       << EntityType.getLocalUnqualifiedType();
7860     break;
7861 
7862   case NK_Constant_Narrowing:
7863     // A constant value was narrowed.
7864     S.Diag(PostInit->getLocStart(),
7865            (S.getLangOpts().MicrosoftExt || !S.getLangOpts().CPlusPlus11)
7866                ? diag::warn_init_list_constant_narrowing
7867                : diag::ext_init_list_constant_narrowing)
7868       << PostInit->getSourceRange()
7869       << ConstantValue.getAsString(S.getASTContext(), ConstantType)
7870       << EntityType.getLocalUnqualifiedType();
7871     break;
7872 
7873   case NK_Variable_Narrowing:
7874     // A variable's value may have been narrowed.
7875     S.Diag(PostInit->getLocStart(),
7876            (S.getLangOpts().MicrosoftExt || !S.getLangOpts().CPlusPlus11)
7877                ? diag::warn_init_list_variable_narrowing
7878                : diag::ext_init_list_variable_narrowing)
7879       << PostInit->getSourceRange()
7880       << PreNarrowingType.getLocalUnqualifiedType()
7881       << EntityType.getLocalUnqualifiedType();
7882     break;
7883   }
7884 
7885   SmallString<128> StaticCast;
7886   llvm::raw_svector_ostream OS(StaticCast);
7887   OS << "static_cast<";
7888   if (const TypedefType *TT = EntityType->getAs<TypedefType>()) {
7889     // It's important to use the typedef's name if there is one so that the
7890     // fixit doesn't break code using types like int64_t.
7891     //
7892     // FIXME: This will break if the typedef requires qualification.  But
7893     // getQualifiedNameAsString() includes non-machine-parsable components.
7894     OS << *TT->getDecl();
7895   } else if (const BuiltinType *BT = EntityType->getAs<BuiltinType>())
7896     OS << BT->getName(S.getLangOpts());
7897   else {
7898     // Oops, we didn't find the actual type of the variable.  Don't emit a fixit
7899     // with a broken cast.
7900     return;
7901   }
7902   OS << ">(";
7903   S.Diag(PostInit->getLocStart(), diag::note_init_list_narrowing_silence)
7904       << PostInit->getSourceRange()
7905       << FixItHint::CreateInsertion(PostInit->getLocStart(), OS.str())
7906       << FixItHint::CreateInsertion(
7907              S.getLocForEndOfToken(PostInit->getLocEnd()), ")");
7908 }
7909 
7910 //===----------------------------------------------------------------------===//
7911 // Initialization helper functions
7912 //===----------------------------------------------------------------------===//
7913 bool
7914 Sema::CanPerformCopyInitialization(const InitializedEntity &Entity,
7915                                    ExprResult Init) {
7916   if (Init.isInvalid())
7917     return false;
7918 
7919   Expr *InitE = Init.get();
7920   assert(InitE && "No initialization expression");
7921 
7922   InitializationKind Kind
7923     = InitializationKind::CreateCopy(InitE->getLocStart(), SourceLocation());
7924   InitializationSequence Seq(*this, Entity, Kind, InitE);
7925   return !Seq.Failed();
7926 }
7927 
7928 ExprResult
7929 Sema::PerformCopyInitialization(const InitializedEntity &Entity,
7930                                 SourceLocation EqualLoc,
7931                                 ExprResult Init,
7932                                 bool TopLevelOfInitList,
7933                                 bool AllowExplicit) {
7934   if (Init.isInvalid())
7935     return ExprError();
7936 
7937   Expr *InitE = Init.get();
7938   assert(InitE && "No initialization expression?");
7939 
7940   if (EqualLoc.isInvalid())
7941     EqualLoc = InitE->getLocStart();
7942 
7943   InitializationKind Kind = InitializationKind::CreateCopy(InitE->getLocStart(),
7944                                                            EqualLoc,
7945                                                            AllowExplicit);
7946   InitializationSequence Seq(*this, Entity, Kind, InitE, TopLevelOfInitList);
7947 
7948   ExprResult Result = Seq.Perform(*this, Entity, Kind, InitE);
7949 
7950   return Result;
7951 }
7952