clang  7.0.0
ParseExprCXX.cpp
Go to the documentation of this file.
1 //===--- ParseExprCXX.cpp - C++ Expression Parsing ------------------------===//
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 the Expression parsing implementation for C++.
11 //
12 //===----------------------------------------------------------------------===//
13 #include "clang/Parse/Parser.h"
14 #include "clang/AST/ASTContext.h"
15 #include "clang/AST/DeclTemplate.h"
20 #include "clang/Sema/DeclSpec.h"
22 #include "clang/Sema/Scope.h"
23 #include "llvm/Support/ErrorHandling.h"
24 
25 
26 using namespace clang;
27 
29  switch (Kind) {
30  // template name
31  case tok::unknown: return 0;
32  // casts
33  case tok::kw_const_cast: return 1;
34  case tok::kw_dynamic_cast: return 2;
35  case tok::kw_reinterpret_cast: return 3;
36  case tok::kw_static_cast: return 4;
37  default:
38  llvm_unreachable("Unknown type for digraph error message.");
39  }
40 }
41 
42 // Are the two tokens adjacent in the same source file?
43 bool Parser::areTokensAdjacent(const Token &First, const Token &Second) {
45  SourceLocation FirstLoc = SM.getSpellingLoc(First.getLocation());
46  SourceLocation FirstEnd = FirstLoc.getLocWithOffset(First.getLength());
47  return FirstEnd == SM.getSpellingLoc(Second.getLocation());
48 }
49 
50 // Suggest fixit for "<::" after a cast.
51 static void FixDigraph(Parser &P, Preprocessor &PP, Token &DigraphToken,
52  Token &ColonToken, tok::TokenKind Kind, bool AtDigraph) {
53  // Pull '<:' and ':' off token stream.
54  if (!AtDigraph)
55  PP.Lex(DigraphToken);
56  PP.Lex(ColonToken);
57 
58  SourceRange Range;
59  Range.setBegin(DigraphToken.getLocation());
60  Range.setEnd(ColonToken.getLocation());
61  P.Diag(DigraphToken.getLocation(), diag::err_missing_whitespace_digraph)
63  << FixItHint::CreateReplacement(Range, "< ::");
64 
65  // Update token information to reflect their change in token type.
66  ColonToken.setKind(tok::coloncolon);
67  ColonToken.setLocation(ColonToken.getLocation().getLocWithOffset(-1));
68  ColonToken.setLength(2);
69  DigraphToken.setKind(tok::less);
70  DigraphToken.setLength(1);
71 
72  // Push new tokens back to token stream.
73  PP.EnterToken(ColonToken);
74  if (!AtDigraph)
75  PP.EnterToken(DigraphToken);
76 }
77 
78 // Check for '<::' which should be '< ::' instead of '[:' when following
79 // a template name.
80 void Parser::CheckForTemplateAndDigraph(Token &Next, ParsedType ObjectType,
81  bool EnteringContext,
82  IdentifierInfo &II, CXXScopeSpec &SS) {
83  if (!Next.is(tok::l_square) || Next.getLength() != 2)
84  return;
85 
86  Token SecondToken = GetLookAheadToken(2);
87  if (!SecondToken.is(tok::colon) || !areTokensAdjacent(Next, SecondToken))
88  return;
89 
90  TemplateTy Template;
92  TemplateName.setIdentifier(&II, Tok.getLocation());
93  bool MemberOfUnknownSpecialization;
94  if (!Actions.isTemplateName(getCurScope(), SS, /*hasTemplateKeyword=*/false,
95  TemplateName, ObjectType, EnteringContext,
96  Template, MemberOfUnknownSpecialization))
97  return;
98 
99  FixDigraph(*this, PP, Next, SecondToken, tok::unknown,
100  /*AtDigraph*/false);
101 }
102 
103 /// Parse global scope or nested-name-specifier if present.
104 ///
105 /// Parses a C++ global scope specifier ('::') or nested-name-specifier (which
106 /// may be preceded by '::'). Note that this routine will not parse ::new or
107 /// ::delete; it will just leave them in the token stream.
108 ///
109 /// '::'[opt] nested-name-specifier
110 /// '::'
111 ///
112 /// nested-name-specifier:
113 /// type-name '::'
114 /// namespace-name '::'
115 /// nested-name-specifier identifier '::'
116 /// nested-name-specifier 'template'[opt] simple-template-id '::'
117 ///
118 ///
119 /// \param SS the scope specifier that will be set to the parsed
120 /// nested-name-specifier (or empty)
121 ///
122 /// \param ObjectType if this nested-name-specifier is being parsed following
123 /// the "." or "->" of a member access expression, this parameter provides the
124 /// type of the object whose members are being accessed.
125 ///
126 /// \param EnteringContext whether we will be entering into the context of
127 /// the nested-name-specifier after parsing it.
128 ///
129 /// \param MayBePseudoDestructor When non-NULL, points to a flag that
130 /// indicates whether this nested-name-specifier may be part of a
131 /// pseudo-destructor name. In this case, the flag will be set false
132 /// if we don't actually end up parsing a destructor name. Moreorover,
133 /// if we do end up determining that we are parsing a destructor name,
134 /// the last component of the nested-name-specifier is not parsed as
135 /// part of the scope specifier.
136 ///
137 /// \param IsTypename If \c true, this nested-name-specifier is known to be
138 /// part of a type name. This is used to improve error recovery.
139 ///
140 /// \param LastII When non-NULL, points to an IdentifierInfo* that will be
141 /// filled in with the leading identifier in the last component of the
142 /// nested-name-specifier, if any.
143 ///
144 /// \param OnlyNamespace If true, only considers namespaces in lookup.
145 ///
146 /// \returns true if there was an error parsing a scope specifier
147 bool Parser::ParseOptionalCXXScopeSpecifier(CXXScopeSpec &SS,
148  ParsedType ObjectType,
149  bool EnteringContext,
150  bool *MayBePseudoDestructor,
151  bool IsTypename,
152  IdentifierInfo **LastII,
153  bool OnlyNamespace) {
154  assert(getLangOpts().CPlusPlus &&
155  "Call sites of this function should be guarded by checking for C++");
156 
157  if (Tok.is(tok::annot_cxxscope)) {
158  assert(!LastII && "want last identifier but have already annotated scope");
159  assert(!MayBePseudoDestructor && "unexpected annot_cxxscope");
161  Tok.getAnnotationRange(),
162  SS);
163  ConsumeAnnotationToken();
164  return false;
165  }
166 
167  if (Tok.is(tok::annot_template_id)) {
168  // If the current token is an annotated template id, it may already have
169  // a scope specifier. Restore it.
170  TemplateIdAnnotation *TemplateId = takeTemplateIdAnnotation(Tok);
171  SS = TemplateId->SS;
172  }
173 
174  // Has to happen before any "return false"s in this function.
175  bool CheckForDestructor = false;
176  if (MayBePseudoDestructor && *MayBePseudoDestructor) {
177  CheckForDestructor = true;
178  *MayBePseudoDestructor = false;
179  }
180 
181  if (LastII)
182  *LastII = nullptr;
183 
184  bool HasScopeSpecifier = false;
185 
186  if (Tok.is(tok::coloncolon)) {
187  // ::new and ::delete aren't nested-name-specifiers.
188  tok::TokenKind NextKind = NextToken().getKind();
189  if (NextKind == tok::kw_new || NextKind == tok::kw_delete)
190  return false;
191 
192  if (NextKind == tok::l_brace) {
193  // It is invalid to have :: {, consume the scope qualifier and pretend
194  // like we never saw it.
195  Diag(ConsumeToken(), diag::err_expected) << tok::identifier;
196  } else {
197  // '::' - Global scope qualifier.
198  if (Actions.ActOnCXXGlobalScopeSpecifier(ConsumeToken(), SS))
199  return true;
200 
201  HasScopeSpecifier = true;
202  }
203  }
204 
205  if (Tok.is(tok::kw___super)) {
206  SourceLocation SuperLoc = ConsumeToken();
207  if (!Tok.is(tok::coloncolon)) {
208  Diag(Tok.getLocation(), diag::err_expected_coloncolon_after_super);
209  return true;
210  }
211 
212  return Actions.ActOnSuperScopeSpecifier(SuperLoc, ConsumeToken(), SS);
213  }
214 
215  if (!HasScopeSpecifier &&
216  Tok.isOneOf(tok::kw_decltype, tok::annot_decltype)) {
217  DeclSpec DS(AttrFactory);
218  SourceLocation DeclLoc = Tok.getLocation();
219  SourceLocation EndLoc = ParseDecltypeSpecifier(DS);
220 
221  SourceLocation CCLoc;
222  // Work around a standard defect: 'decltype(auto)::' is not a
223  // nested-name-specifier.
225  !TryConsumeToken(tok::coloncolon, CCLoc)) {
226  AnnotateExistingDecltypeSpecifier(DS, DeclLoc, EndLoc);
227  return false;
228  }
229 
230  if (Actions.ActOnCXXNestedNameSpecifierDecltype(SS, DS, CCLoc))
231  SS.SetInvalid(SourceRange(DeclLoc, CCLoc));
232 
233  HasScopeSpecifier = true;
234  }
235 
236  while (true) {
237  if (HasScopeSpecifier) {
238  // C++ [basic.lookup.classref]p5:
239  // If the qualified-id has the form
240  //
241  // ::class-name-or-namespace-name::...
242  //
243  // the class-name-or-namespace-name is looked up in global scope as a
244  // class-name or namespace-name.
245  //
246  // To implement this, we clear out the object type as soon as we've
247  // seen a leading '::' or part of a nested-name-specifier.
248  ObjectType = nullptr;
249 
250  if (Tok.is(tok::code_completion)) {
251  // Code completion for a nested-name-specifier, where the code
252  // completion token follows the '::'.
253  Actions.CodeCompleteQualifiedId(getCurScope(), SS, EnteringContext);
254  // Include code completion token into the range of the scope otherwise
255  // when we try to annotate the scope tokens the dangling code completion
256  // token will cause assertion in
257  // Preprocessor::AnnotatePreviousCachedTokens.
258  SS.setEndLoc(Tok.getLocation());
259  cutOffParsing();
260  return true;
261  }
262  }
263 
264  // nested-name-specifier:
265  // nested-name-specifier 'template'[opt] simple-template-id '::'
266 
267  // Parse the optional 'template' keyword, then make sure we have
268  // 'identifier <' after it.
269  if (Tok.is(tok::kw_template)) {
270  // If we don't have a scope specifier or an object type, this isn't a
271  // nested-name-specifier, since they aren't allowed to start with
272  // 'template'.
273  if (!HasScopeSpecifier && !ObjectType)
274  break;
275 
276  TentativeParsingAction TPA(*this);
277  SourceLocation TemplateKWLoc = ConsumeToken();
278 
280  if (Tok.is(tok::identifier)) {
281  // Consume the identifier.
282  TemplateName.setIdentifier(Tok.getIdentifierInfo(), Tok.getLocation());
283  ConsumeToken();
284  } else if (Tok.is(tok::kw_operator)) {
285  // We don't need to actually parse the unqualified-id in this case,
286  // because a simple-template-id cannot start with 'operator', but
287  // go ahead and parse it anyway for consistency with the case where
288  // we already annotated the template-id.
289  if (ParseUnqualifiedIdOperator(SS, EnteringContext, ObjectType,
290  TemplateName)) {
291  TPA.Commit();
292  break;
293  }
294 
295  if (TemplateName.getKind() != UnqualifiedIdKind::IK_OperatorFunctionId &&
297  Diag(TemplateName.getSourceRange().getBegin(),
298  diag::err_id_after_template_in_nested_name_spec)
299  << TemplateName.getSourceRange();
300  TPA.Commit();
301  break;
302  }
303  } else {
304  TPA.Revert();
305  break;
306  }
307 
308  // If the next token is not '<', we have a qualified-id that refers
309  // to a template name, such as T::template apply, but is not a
310  // template-id.
311  if (Tok.isNot(tok::less)) {
312  TPA.Revert();
313  break;
314  }
315 
316  // Commit to parsing the template-id.
317  TPA.Commit();
318  TemplateTy Template;
320  getCurScope(), SS, TemplateKWLoc, TemplateName, ObjectType,
321  EnteringContext, Template, /*AllowInjectedClassName*/ true)) {
322  if (AnnotateTemplateIdToken(Template, TNK, SS, TemplateKWLoc,
323  TemplateName, false))
324  return true;
325  } else
326  return true;
327 
328  continue;
329  }
330 
331  if (Tok.is(tok::annot_template_id) && NextToken().is(tok::coloncolon)) {
332  // We have
333  //
334  // template-id '::'
335  //
336  // So we need to check whether the template-id is a simple-template-id of
337  // the right kind (it should name a type or be dependent), and then
338  // convert it into a type within the nested-name-specifier.
339  TemplateIdAnnotation *TemplateId = takeTemplateIdAnnotation(Tok);
340  if (CheckForDestructor && GetLookAheadToken(2).is(tok::tilde)) {
341  *MayBePseudoDestructor = true;
342  return false;
343  }
344 
345  if (LastII)
346  *LastII = TemplateId->Name;
347 
348  // Consume the template-id token.
349  ConsumeAnnotationToken();
350 
351  assert(Tok.is(tok::coloncolon) && "NextToken() not working properly!");
352  SourceLocation CCLoc = ConsumeToken();
353 
354  HasScopeSpecifier = true;
355 
356  ASTTemplateArgsPtr TemplateArgsPtr(TemplateId->getTemplateArgs(),
357  TemplateId->NumArgs);
358 
360  SS,
361  TemplateId->TemplateKWLoc,
362  TemplateId->Template,
363  TemplateId->TemplateNameLoc,
364  TemplateId->LAngleLoc,
365  TemplateArgsPtr,
366  TemplateId->RAngleLoc,
367  CCLoc,
368  EnteringContext)) {
369  SourceLocation StartLoc
370  = SS.getBeginLoc().isValid()? SS.getBeginLoc()
371  : TemplateId->TemplateNameLoc;
372  SS.SetInvalid(SourceRange(StartLoc, CCLoc));
373  }
374 
375  continue;
376  }
377 
378  // The rest of the nested-name-specifier possibilities start with
379  // tok::identifier.
380  if (Tok.isNot(tok::identifier))
381  break;
382 
383  IdentifierInfo &II = *Tok.getIdentifierInfo();
384 
385  // nested-name-specifier:
386  // type-name '::'
387  // namespace-name '::'
388  // nested-name-specifier identifier '::'
389  Token Next = NextToken();
390  Sema::NestedNameSpecInfo IdInfo(&II, Tok.getLocation(), Next.getLocation(),
391  ObjectType);
392 
393  // If we get foo:bar, this is almost certainly a typo for foo::bar. Recover
394  // and emit a fixit hint for it.
395  if (Next.is(tok::colon) && !ColonIsSacred) {
396  if (Actions.IsInvalidUnlessNestedName(getCurScope(), SS, IdInfo,
397  EnteringContext) &&
398  // If the token after the colon isn't an identifier, it's still an
399  // error, but they probably meant something else strange so don't
400  // recover like this.
401  PP.LookAhead(1).is(tok::identifier)) {
402  Diag(Next, diag::err_unexpected_colon_in_nested_name_spec)
403  << FixItHint::CreateReplacement(Next.getLocation(), "::");
404  // Recover as if the user wrote '::'.
405  Next.setKind(tok::coloncolon);
406  }
407  }
408 
409  if (Next.is(tok::coloncolon) && GetLookAheadToken(2).is(tok::l_brace)) {
410  // It is invalid to have :: {, consume the scope qualifier and pretend
411  // like we never saw it.
412  Token Identifier = Tok; // Stash away the identifier.
413  ConsumeToken(); // Eat the identifier, current token is now '::'.
414  Diag(PP.getLocForEndOfToken(ConsumeToken()), diag::err_expected)
415  << tok::identifier;
416  UnconsumeToken(Identifier); // Stick the identifier back.
417  Next = NextToken(); // Point Next at the '{' token.
418  }
419 
420  if (Next.is(tok::coloncolon)) {
421  if (CheckForDestructor && GetLookAheadToken(2).is(tok::tilde) &&
422  !Actions.isNonTypeNestedNameSpecifier(getCurScope(), SS, IdInfo)) {
423  *MayBePseudoDestructor = true;
424  return false;
425  }
426 
427  if (ColonIsSacred) {
428  const Token &Next2 = GetLookAheadToken(2);
429  if (Next2.is(tok::kw_private) || Next2.is(tok::kw_protected) ||
430  Next2.is(tok::kw_public) || Next2.is(tok::kw_virtual)) {
431  Diag(Next2, diag::err_unexpected_token_in_nested_name_spec)
432  << Next2.getName()
434  Token ColonColon;
435  PP.Lex(ColonColon);
436  ColonColon.setKind(tok::colon);
437  PP.EnterToken(ColonColon);
438  break;
439  }
440  }
441 
442  if (LastII)
443  *LastII = &II;
444 
445  // We have an identifier followed by a '::'. Lookup this name
446  // as the name in a nested-name-specifier.
447  Token Identifier = Tok;
448  SourceLocation IdLoc = ConsumeToken();
449  assert(Tok.isOneOf(tok::coloncolon, tok::colon) &&
450  "NextToken() not working properly!");
451  Token ColonColon = Tok;
452  SourceLocation CCLoc = ConsumeToken();
453 
454  bool IsCorrectedToColon = false;
455  bool *CorrectionFlagPtr = ColonIsSacred ? &IsCorrectedToColon : nullptr;
456  if (Actions.ActOnCXXNestedNameSpecifier(
457  getCurScope(), IdInfo, EnteringContext, SS, false,
458  CorrectionFlagPtr, OnlyNamespace)) {
459  // Identifier is not recognized as a nested name, but we can have
460  // mistyped '::' instead of ':'.
461  if (CorrectionFlagPtr && IsCorrectedToColon) {
462  ColonColon.setKind(tok::colon);
463  PP.EnterToken(Tok);
464  PP.EnterToken(ColonColon);
465  Tok = Identifier;
466  break;
467  }
468  SS.SetInvalid(SourceRange(IdLoc, CCLoc));
469  }
470  HasScopeSpecifier = true;
471  continue;
472  }
473 
474  CheckForTemplateAndDigraph(Next, ObjectType, EnteringContext, II, SS);
475 
476  // nested-name-specifier:
477  // type-name '<'
478  if (Next.is(tok::less)) {
479  TemplateTy Template;
481  TemplateName.setIdentifier(&II, Tok.getLocation());
482  bool MemberOfUnknownSpecialization;
483  if (TemplateNameKind TNK = Actions.isTemplateName(getCurScope(), SS,
484  /*hasTemplateKeyword=*/false,
485  TemplateName,
486  ObjectType,
487  EnteringContext,
488  Template,
489  MemberOfUnknownSpecialization)) {
490  // We have found a template name, so annotate this token
491  // with a template-id annotation. We do not permit the
492  // template-id to be translated into a type annotation,
493  // because some clients (e.g., the parsing of class template
494  // specializations) still want to see the original template-id
495  // token.
496  ConsumeToken();
497  if (AnnotateTemplateIdToken(Template, TNK, SS, SourceLocation(),
498  TemplateName, false))
499  return true;
500  continue;
501  }
502 
503  if (MemberOfUnknownSpecialization && (ObjectType || SS.isSet()) &&
504  (IsTypename || IsTemplateArgumentList(1))) {
505  // We have something like t::getAs<T>, where getAs is a
506  // member of an unknown specialization. However, this will only
507  // parse correctly as a template, so suggest the keyword 'template'
508  // before 'getAs' and treat this as a dependent template name.
509  unsigned DiagID = diag::err_missing_dependent_template_keyword;
510  if (getLangOpts().MicrosoftExt)
511  DiagID = diag::warn_missing_dependent_template_keyword;
512 
513  Diag(Tok.getLocation(), DiagID)
514  << II.getName()
515  << FixItHint::CreateInsertion(Tok.getLocation(), "template ");
516 
518  getCurScope(), SS, Tok.getLocation(), TemplateName, ObjectType,
519  EnteringContext, Template, /*AllowInjectedClassName*/ true)) {
520  // Consume the identifier.
521  ConsumeToken();
522  if (AnnotateTemplateIdToken(Template, TNK, SS, SourceLocation(),
523  TemplateName, false))
524  return true;
525  }
526  else
527  return true;
528 
529  continue;
530  }
531  }
532 
533  // We don't have any tokens that form the beginning of a
534  // nested-name-specifier, so we're done.
535  break;
536  }
537 
538  // Even if we didn't see any pieces of a nested-name-specifier, we
539  // still check whether there is a tilde in this position, which
540  // indicates a potential pseudo-destructor.
541  if (CheckForDestructor && Tok.is(tok::tilde))
542  *MayBePseudoDestructor = true;
543 
544  return false;
545 }
546 
547 ExprResult Parser::tryParseCXXIdExpression(CXXScopeSpec &SS, bool isAddressOfOperand,
548  Token &Replacement) {
549  SourceLocation TemplateKWLoc;
550  UnqualifiedId Name;
551  if (ParseUnqualifiedId(SS,
552  /*EnteringContext=*/false,
553  /*AllowDestructorName=*/false,
554  /*AllowConstructorName=*/false,
555  /*AllowDeductionGuide=*/false,
556  /*ObjectType=*/nullptr, &TemplateKWLoc, Name))
557  return ExprError();
558 
559  // This is only the direct operand of an & operator if it is not
560  // followed by a postfix-expression suffix.
561  if (isAddressOfOperand && isPostfixExpressionSuffixStart())
562  isAddressOfOperand = false;
563 
564  ExprResult E = Actions.ActOnIdExpression(
565  getCurScope(), SS, TemplateKWLoc, Name, Tok.is(tok::l_paren),
566  isAddressOfOperand, nullptr, /*IsInlineAsmIdentifier=*/false,
567  &Replacement);
568  if (!E.isInvalid() && !E.isUnset() && Tok.is(tok::less))
569  checkPotentialAngleBracket(E);
570  return E;
571 }
572 
573 /// ParseCXXIdExpression - Handle id-expression.
574 ///
575 /// id-expression:
576 /// unqualified-id
577 /// qualified-id
578 ///
579 /// qualified-id:
580 /// '::'[opt] nested-name-specifier 'template'[opt] unqualified-id
581 /// '::' identifier
582 /// '::' operator-function-id
583 /// '::' template-id
584 ///
585 /// NOTE: The standard specifies that, for qualified-id, the parser does not
586 /// expect:
587 ///
588 /// '::' conversion-function-id
589 /// '::' '~' class-name
590 ///
591 /// This may cause a slight inconsistency on diagnostics:
592 ///
593 /// class C {};
594 /// namespace A {}
595 /// void f() {
596 /// :: A :: ~ C(); // Some Sema error about using destructor with a
597 /// // namespace.
598 /// :: ~ C(); // Some Parser error like 'unexpected ~'.
599 /// }
600 ///
601 /// We simplify the parser a bit and make it work like:
602 ///
603 /// qualified-id:
604 /// '::'[opt] nested-name-specifier 'template'[opt] unqualified-id
605 /// '::' unqualified-id
606 ///
607 /// That way Sema can handle and report similar errors for namespaces and the
608 /// global scope.
609 ///
610 /// The isAddressOfOperand parameter indicates that this id-expression is a
611 /// direct operand of the address-of operator. This is, besides member contexts,
612 /// the only place where a qualified-id naming a non-static class member may
613 /// appear.
614 ///
615 ExprResult Parser::ParseCXXIdExpression(bool isAddressOfOperand) {
616  // qualified-id:
617  // '::'[opt] nested-name-specifier 'template'[opt] unqualified-id
618  // '::' unqualified-id
619  //
620  CXXScopeSpec SS;
621  ParseOptionalCXXScopeSpecifier(SS, nullptr, /*EnteringContext=*/false);
622 
625  tryParseCXXIdExpression(SS, isAddressOfOperand, Replacement);
626  if (Result.isUnset()) {
627  // If the ExprResult is valid but null, then typo correction suggested a
628  // keyword replacement that needs to be reparsed.
629  UnconsumeToken(Replacement);
630  Result = tryParseCXXIdExpression(SS, isAddressOfOperand, Replacement);
631  }
632  assert(!Result.isUnset() && "Typo correction suggested a keyword replacement "
633  "for a previous keyword suggestion");
634  return Result;
635 }
636 
637 /// ParseLambdaExpression - Parse a C++11 lambda expression.
638 ///
639 /// lambda-expression:
640 /// lambda-introducer lambda-declarator[opt] compound-statement
641 ///
642 /// lambda-introducer:
643 /// '[' lambda-capture[opt] ']'
644 ///
645 /// lambda-capture:
646 /// capture-default
647 /// capture-list
648 /// capture-default ',' capture-list
649 ///
650 /// capture-default:
651 /// '&'
652 /// '='
653 ///
654 /// capture-list:
655 /// capture
656 /// capture-list ',' capture
657 ///
658 /// capture:
659 /// simple-capture
660 /// init-capture [C++1y]
661 ///
662 /// simple-capture:
663 /// identifier
664 /// '&' identifier
665 /// 'this'
666 ///
667 /// init-capture: [C++1y]
668 /// identifier initializer
669 /// '&' identifier initializer
670 ///
671 /// lambda-declarator:
672 /// '(' parameter-declaration-clause ')' attribute-specifier[opt]
673 /// 'mutable'[opt] exception-specification[opt]
674 /// trailing-return-type[opt]
675 ///
676 ExprResult Parser::ParseLambdaExpression() {
677  // Parse lambda-introducer.
678  LambdaIntroducer Intro;
679  Optional<unsigned> DiagID = ParseLambdaIntroducer(Intro);
680  if (DiagID) {
681  Diag(Tok, DiagID.getValue());
682  SkipUntil(tok::r_square, StopAtSemi);
683  SkipUntil(tok::l_brace, StopAtSemi);
684  SkipUntil(tok::r_brace, StopAtSemi);
685  return ExprError();
686  }
687 
688  return ParseLambdaExpressionAfterIntroducer(Intro);
689 }
690 
691 /// TryParseLambdaExpression - Use lookahead and potentially tentative
692 /// parsing to determine if we are looking at a C++0x lambda expression, and parse
693 /// it if we are.
694 ///
695 /// If we are not looking at a lambda expression, returns ExprError().
696 ExprResult Parser::TryParseLambdaExpression() {
697  assert(getLangOpts().CPlusPlus11
698  && Tok.is(tok::l_square)
699  && "Not at the start of a possible lambda expression.");
700 
701  const Token Next = NextToken();
702  if (Next.is(tok::eof)) // Nothing else to lookup here...
703  return ExprEmpty();
704 
705  const Token After = GetLookAheadToken(2);
706  // If lookahead indicates this is a lambda...
707  if (Next.is(tok::r_square) || // []
708  Next.is(tok::equal) || // [=
709  (Next.is(tok::amp) && // [&] or [&,
710  (After.is(tok::r_square) ||
711  After.is(tok::comma))) ||
712  (Next.is(tok::identifier) && // [identifier]
713  After.is(tok::r_square))) {
714  return ParseLambdaExpression();
715  }
716 
717  // If lookahead indicates an ObjC message send...
718  // [identifier identifier
719  if (Next.is(tok::identifier) && After.is(tok::identifier)) {
720  return ExprEmpty();
721  }
722 
723  // Here, we're stuck: lambda introducers and Objective-C message sends are
724  // unambiguous, but it requires arbitrary lookhead. [a,b,c,d,e,f,g] is a
725  // lambda, and [a,b,c,d,e,f,g h] is a Objective-C message send. Instead of
726  // writing two routines to parse a lambda introducer, just try to parse
727  // a lambda introducer first, and fall back if that fails.
728  // (TryParseLambdaIntroducer never produces any diagnostic output.)
729  LambdaIntroducer Intro;
730  if (TryParseLambdaIntroducer(Intro))
731  return ExprEmpty();
732 
733  return ParseLambdaExpressionAfterIntroducer(Intro);
734 }
735 
736 /// Parse a lambda introducer.
737 /// \param Intro A LambdaIntroducer filled in with information about the
738 /// contents of the lambda-introducer.
739 /// \param SkippedInits If non-null, we are disambiguating between an Obj-C
740 /// message send and a lambda expression. In this mode, we will
741 /// sometimes skip the initializers for init-captures and not fully
742 /// populate \p Intro. This flag will be set to \c true if we do so.
743 /// \return A DiagnosticID if it hit something unexpected. The location for
744 /// the diagnostic is that of the current token.
745 Optional<unsigned> Parser::ParseLambdaIntroducer(LambdaIntroducer &Intro,
746  bool *SkippedInits) {
747  typedef Optional<unsigned> DiagResult;
748 
749  assert(Tok.is(tok::l_square) && "Lambda expressions begin with '['.");
750  BalancedDelimiterTracker T(*this, tok::l_square);
751  T.consumeOpen();
752 
753  Intro.Range.setBegin(T.getOpenLocation());
754 
755  bool first = true;
756 
757  // Parse capture-default.
758  if (Tok.is(tok::amp) &&
759  (NextToken().is(tok::comma) || NextToken().is(tok::r_square))) {
760  Intro.Default = LCD_ByRef;
761  Intro.DefaultLoc = ConsumeToken();
762  first = false;
763  } else if (Tok.is(tok::equal)) {
764  Intro.Default = LCD_ByCopy;
765  Intro.DefaultLoc = ConsumeToken();
766  first = false;
767  }
768 
769  while (Tok.isNot(tok::r_square)) {
770  if (!first) {
771  if (Tok.isNot(tok::comma)) {
772  // Provide a completion for a lambda introducer here. Except
773  // in Objective-C, where this is Almost Surely meant to be a message
774  // send. In that case, fail here and let the ObjC message
775  // expression parser perform the completion.
776  if (Tok.is(tok::code_completion) &&
777  !(getLangOpts().ObjC1 && Intro.Default == LCD_None &&
778  !Intro.Captures.empty())) {
779  Actions.CodeCompleteLambdaIntroducer(getCurScope(), Intro,
780  /*AfterAmpersand=*/false);
781  cutOffParsing();
782  break;
783  }
784 
785  return DiagResult(diag::err_expected_comma_or_rsquare);
786  }
787  ConsumeToken();
788  }
789 
790  if (Tok.is(tok::code_completion)) {
791  // If we're in Objective-C++ and we have a bare '[', then this is more
792  // likely to be a message receiver.
793  if (getLangOpts().ObjC1 && first)
795  else
796  Actions.CodeCompleteLambdaIntroducer(getCurScope(), Intro,
797  /*AfterAmpersand=*/false);
798  cutOffParsing();
799  break;
800  }
801 
802  first = false;
803 
804  // Parse capture.
807  SourceLocation Loc;
808  IdentifierInfo *Id = nullptr;
809  SourceLocation EllipsisLoc;
810  ExprResult Init;
811  SourceLocation LocStart = Tok.getLocation();
812 
813  if (Tok.is(tok::star)) {
814  Loc = ConsumeToken();
815  if (Tok.is(tok::kw_this)) {
816  ConsumeToken();
817  Kind = LCK_StarThis;
818  } else {
819  return DiagResult(diag::err_expected_star_this_capture);
820  }
821  } else if (Tok.is(tok::kw_this)) {
822  Kind = LCK_This;
823  Loc = ConsumeToken();
824  } else {
825  if (Tok.is(tok::amp)) {
826  Kind = LCK_ByRef;
827  ConsumeToken();
828 
829  if (Tok.is(tok::code_completion)) {
830  Actions.CodeCompleteLambdaIntroducer(getCurScope(), Intro,
831  /*AfterAmpersand=*/true);
832  cutOffParsing();
833  break;
834  }
835  }
836 
837  if (Tok.is(tok::identifier)) {
838  Id = Tok.getIdentifierInfo();
839  Loc = ConsumeToken();
840  } else if (Tok.is(tok::kw_this)) {
841  // FIXME: If we want to suggest a fixit here, will need to return more
842  // than just DiagnosticID. Perhaps full DiagnosticBuilder that can be
843  // Clear()ed to prevent emission in case of tentative parsing?
844  return DiagResult(diag::err_this_captured_by_reference);
845  } else {
846  return DiagResult(diag::err_expected_capture);
847  }
848 
849  if (Tok.is(tok::l_paren)) {
850  BalancedDelimiterTracker Parens(*this, tok::l_paren);
851  Parens.consumeOpen();
852 
854 
855  ExprVector Exprs;
856  CommaLocsTy Commas;
857  if (SkippedInits) {
858  Parens.skipToEnd();
859  *SkippedInits = true;
860  } else if (ParseExpressionList(Exprs, Commas)) {
861  Parens.skipToEnd();
862  Init = ExprError();
863  } else {
864  Parens.consumeClose();
865  Init = Actions.ActOnParenListExpr(Parens.getOpenLocation(),
866  Parens.getCloseLocation(),
867  Exprs);
868  }
869  } else if (Tok.isOneOf(tok::l_brace, tok::equal)) {
870  // Each lambda init-capture forms its own full expression, which clears
871  // Actions.MaybeODRUseExprs. So create an expression evaluation context
872  // to save the necessary state, and restore it later.
875 
876  if (TryConsumeToken(tok::equal))
878  else
880 
881  if (!SkippedInits) {
882  Init = ParseInitializer();
883  } else if (Tok.is(tok::l_brace)) {
884  BalancedDelimiterTracker Braces(*this, tok::l_brace);
885  Braces.consumeOpen();
886  Braces.skipToEnd();
887  *SkippedInits = true;
888  } else {
889  // We're disambiguating this:
890  //
891  // [..., x = expr
892  //
893  // We need to find the end of the following expression in order to
894  // determine whether this is an Obj-C message send's receiver, a
895  // C99 designator, or a lambda init-capture.
896  //
897  // Parse the expression to find where it ends, and annotate it back
898  // onto the tokens. We would have parsed this expression the same way
899  // in either case: both the RHS of an init-capture and the RHS of an
900  // assignment expression are parsed as an initializer-clause, and in
901  // neither case can anything be added to the scope between the '[' and
902  // here.
903  //
904  // FIXME: This is horrible. Adding a mechanism to skip an expression
905  // would be much cleaner.
906  // FIXME: If there is a ',' before the next ']' or ':', we can skip to
907  // that instead. (And if we see a ':' with no matching '?', we can
908  // classify this as an Obj-C message send.)
909  SourceLocation StartLoc = Tok.getLocation();
910  InMessageExpressionRAIIObject MaybeInMessageExpression(*this, true);
911  Init = ParseInitializer();
912  if (!Init.isInvalid())
913  Init = Actions.CorrectDelayedTyposInExpr(Init.get());
914 
915  if (Tok.getLocation() != StartLoc) {
916  // Back out the lexing of the token after the initializer.
917  PP.RevertCachedTokens(1);
918 
919  // Replace the consumed tokens with an appropriate annotation.
920  Tok.setLocation(StartLoc);
921  Tok.setKind(tok::annot_primary_expr);
922  setExprAnnotation(Tok, Init);
924  PP.AnnotateCachedTokens(Tok);
925 
926  // Consume the annotated initializer.
927  ConsumeAnnotationToken();
928  }
929  }
930  } else
931  TryConsumeToken(tok::ellipsis, EllipsisLoc);
932  }
933  // If this is an init capture, process the initialization expression
934  // right away. For lambda init-captures such as the following:
935  // const int x = 10;
936  // auto L = [i = x+1](int a) {
937  // return [j = x+2,
938  // &k = x](char b) { };
939  // };
940  // keep in mind that each lambda init-capture has to have:
941  // - its initialization expression executed in the context
942  // of the enclosing/parent decl-context.
943  // - but the variable itself has to be 'injected' into the
944  // decl-context of its lambda's call-operator (which has
945  // not yet been created).
946  // Each init-expression is a full-expression that has to get
947  // Sema-analyzed (for capturing etc.) before its lambda's
948  // call-operator's decl-context, scope & scopeinfo are pushed on their
949  // respective stacks. Thus if any variable is odr-used in the init-capture
950  // it will correctly get captured in the enclosing lambda, if one exists.
951  // The init-variables above are created later once the lambdascope and
952  // call-operators decl-context is pushed onto its respective stack.
953 
954  // Since the lambda init-capture's initializer expression occurs in the
955  // context of the enclosing function or lambda, therefore we can not wait
956  // till a lambda scope has been pushed on before deciding whether the
957  // variable needs to be captured. We also need to process all
958  // lvalue-to-rvalue conversions and discarded-value conversions,
959  // so that we can avoid capturing certain constant variables.
960  // For e.g.,
961  // void test() {
962  // const int x = 10;
963  // auto L = [&z = x](char a) { <-- don't capture by the current lambda
964  // return [y = x](int i) { <-- don't capture by enclosing lambda
965  // return y;
966  // }
967  // };
968  // }
969  // If x was not const, the second use would require 'L' to capture, and
970  // that would be an error.
971 
972  ParsedType InitCaptureType;
973  if (!Init.isInvalid())
974  Init = Actions.CorrectDelayedTyposInExpr(Init.get());
975  if (Init.isUsable()) {
976  // Get the pointer and store it in an lvalue, so we can use it as an
977  // out argument.
978  Expr *InitExpr = Init.get();
979  // This performs any lvalue-to-rvalue conversions if necessary, which
980  // can affect what gets captured in the containing decl-context.
981  InitCaptureType = Actions.actOnLambdaInitCaptureInitialization(
982  Loc, Kind == LCK_ByRef, Id, InitKind, InitExpr);
983  Init = InitExpr;
984  }
985 
986  SourceLocation LocEnd = PrevTokLocation;
987 
988  Intro.addCapture(Kind, Loc, Id, EllipsisLoc, InitKind, Init,
989  InitCaptureType, SourceRange(LocStart, LocEnd));
990  }
991 
992  T.consumeClose();
993  Intro.Range.setEnd(T.getCloseLocation());
994  return DiagResult();
995 }
996 
997 /// TryParseLambdaIntroducer - Tentatively parse a lambda introducer.
998 ///
999 /// Returns true if it hit something unexpected.
1000 bool Parser::TryParseLambdaIntroducer(LambdaIntroducer &Intro) {
1001  {
1002  bool SkippedInits = false;
1003  TentativeParsingAction PA1(*this);
1004 
1005  if (ParseLambdaIntroducer(Intro, &SkippedInits)) {
1006  PA1.Revert();
1007  return true;
1008  }
1009 
1010  if (!SkippedInits) {
1011  PA1.Commit();
1012  return false;
1013  }
1014 
1015  PA1.Revert();
1016  }
1017 
1018  // Try to parse it again, but this time parse the init-captures too.
1019  Intro = LambdaIntroducer();
1020  TentativeParsingAction PA2(*this);
1021 
1022  if (!ParseLambdaIntroducer(Intro)) {
1023  PA2.Commit();
1024  return false;
1025  }
1026 
1027  PA2.Revert();
1028  return true;
1029 }
1030 
1031 static void
1033  SourceLocation &ConstexprLoc,
1034  SourceLocation &DeclEndLoc) {
1035  assert(MutableLoc.isInvalid());
1036  assert(ConstexprLoc.isInvalid());
1037  // Consume constexpr-opt mutable-opt in any sequence, and set the DeclEndLoc
1038  // to the final of those locations. Emit an error if we have multiple
1039  // copies of those keywords and recover.
1040 
1041  while (true) {
1042  switch (P.getCurToken().getKind()) {
1043  case tok::kw_mutable: {
1044  if (MutableLoc.isValid()) {
1045  P.Diag(P.getCurToken().getLocation(),
1046  diag::err_lambda_decl_specifier_repeated)
1048  }
1049  MutableLoc = P.ConsumeToken();
1050  DeclEndLoc = MutableLoc;
1051  break /*switch*/;
1052  }
1053  case tok::kw_constexpr:
1054  if (ConstexprLoc.isValid()) {
1055  P.Diag(P.getCurToken().getLocation(),
1056  diag::err_lambda_decl_specifier_repeated)
1058  }
1059  ConstexprLoc = P.ConsumeToken();
1060  DeclEndLoc = ConstexprLoc;
1061  break /*switch*/;
1062  default:
1063  return;
1064  }
1065  }
1066 }
1067 
1068 static void
1070  DeclSpec &DS) {
1071  if (ConstexprLoc.isValid()) {
1072  P.Diag(ConstexprLoc, !P.getLangOpts().CPlusPlus17
1073  ? diag::ext_constexpr_on_lambda_cxx17
1074  : diag::warn_cxx14_compat_constexpr_on_lambda);
1075  const char *PrevSpec = nullptr;
1076  unsigned DiagID = 0;
1077  DS.SetConstexprSpec(ConstexprLoc, PrevSpec, DiagID);
1078  assert(PrevSpec == nullptr && DiagID == 0 &&
1079  "Constexpr cannot have been set previously!");
1080  }
1081 }
1082 
1083 /// ParseLambdaExpressionAfterIntroducer - Parse the rest of a lambda
1084 /// expression.
1085 ExprResult Parser::ParseLambdaExpressionAfterIntroducer(
1086  LambdaIntroducer &Intro) {
1087  SourceLocation LambdaBeginLoc = Intro.Range.getBegin();
1088  Diag(LambdaBeginLoc, diag::warn_cxx98_compat_lambda);
1089 
1090  PrettyStackTraceLoc CrashInfo(PP.getSourceManager(), LambdaBeginLoc,
1091  "lambda expression parsing");
1092 
1093 
1094 
1095  // FIXME: Call into Actions to add any init-capture declarations to the
1096  // scope while parsing the lambda-declarator and compound-statement.
1097 
1098  // Parse lambda-declarator[opt].
1099  DeclSpec DS(AttrFactory);
1101  TemplateParameterDepthRAII CurTemplateDepthTracker(TemplateParameterDepth);
1102  Actions.PushLambdaScope();
1103 
1104  ParsedAttributes Attr(AttrFactory);
1105  SourceLocation DeclLoc = Tok.getLocation();
1106  if (getLangOpts().CUDA) {
1107  // In CUDA code, GNU attributes are allowed to appear immediately after the
1108  // "[...]", even if there is no "(...)" before the lambda body.
1109  MaybeParseGNUAttributes(D);
1110  }
1111 
1112  // Helper to emit a warning if we see a CUDA host/device/global attribute
1113  // after '(...)'. nvcc doesn't accept this.
1114  auto WarnIfHasCUDATargetAttr = [&] {
1115  if (getLangOpts().CUDA)
1116  for (const ParsedAttr &A : Attr)
1117  if (A.getKind() == ParsedAttr::AT_CUDADevice ||
1118  A.getKind() == ParsedAttr::AT_CUDAHost ||
1119  A.getKind() == ParsedAttr::AT_CUDAGlobal)
1120  Diag(A.getLoc(), diag::warn_cuda_attr_lambda_position)
1121  << A.getName()->getName();
1122  };
1123 
1124  TypeResult TrailingReturnType;
1125  if (Tok.is(tok::l_paren)) {
1126  ParseScope PrototypeScope(this,
1130 
1131  BalancedDelimiterTracker T(*this, tok::l_paren);
1132  T.consumeOpen();
1133  SourceLocation LParenLoc = T.getOpenLocation();
1134 
1135  // Parse parameter-declaration-clause.
1137  SourceLocation EllipsisLoc;
1138 
1139  if (Tok.isNot(tok::r_paren)) {
1140  Actions.RecordParsingTemplateParameterDepth(TemplateParameterDepth);
1141  ParseParameterDeclarationClause(D, Attr, ParamInfo, EllipsisLoc);
1142  // For a generic lambda, each 'auto' within the parameter declaration
1143  // clause creates a template type parameter, so increment the depth.
1144  if (Actions.getCurGenericLambda())
1145  ++CurTemplateDepthTracker;
1146  }
1147  T.consumeClose();
1148  SourceLocation RParenLoc = T.getCloseLocation();
1149  SourceLocation DeclEndLoc = RParenLoc;
1150 
1151  // GNU-style attributes must be parsed before the mutable specifier to be
1152  // compatible with GCC.
1153  MaybeParseGNUAttributes(Attr, &DeclEndLoc);
1154 
1155  // MSVC-style attributes must be parsed before the mutable specifier to be
1156  // compatible with MSVC.
1157  MaybeParseMicrosoftDeclSpecs(Attr, &DeclEndLoc);
1158 
1159  // Parse mutable-opt and/or constexpr-opt, and update the DeclEndLoc.
1160  SourceLocation MutableLoc;
1161  SourceLocation ConstexprLoc;
1162  tryConsumeMutableOrConstexprToken(*this, MutableLoc, ConstexprLoc,
1163  DeclEndLoc);
1164 
1165  addConstexprToLambdaDeclSpecifier(*this, ConstexprLoc, DS);
1166 
1167  // Parse exception-specification[opt].
1169  SourceRange ESpecRange;
1170  SmallVector<ParsedType, 2> DynamicExceptions;
1171  SmallVector<SourceRange, 2> DynamicExceptionRanges;
1172  ExprResult NoexceptExpr;
1173  CachedTokens *ExceptionSpecTokens;
1174  ESpecType = tryParseExceptionSpecification(/*Delayed=*/false,
1175  ESpecRange,
1176  DynamicExceptions,
1177  DynamicExceptionRanges,
1178  NoexceptExpr,
1179  ExceptionSpecTokens);
1180 
1181  if (ESpecType != EST_None)
1182  DeclEndLoc = ESpecRange.getEnd();
1183 
1184  // Parse attribute-specifier[opt].
1185  MaybeParseCXX11Attributes(Attr, &DeclEndLoc);
1186 
1187  SourceLocation FunLocalRangeEnd = DeclEndLoc;
1188 
1189  // Parse trailing-return-type[opt].
1190  if (Tok.is(tok::arrow)) {
1191  FunLocalRangeEnd = Tok.getLocation();
1192  SourceRange Range;
1193  TrailingReturnType =
1194  ParseTrailingReturnType(Range, /*MayBeFollowedByDirectInit*/ false);
1195  if (Range.getEnd().isValid())
1196  DeclEndLoc = Range.getEnd();
1197  }
1198 
1199  PrototypeScope.Exit();
1200 
1201  WarnIfHasCUDATargetAttr();
1202 
1203  SourceLocation NoLoc;
1205  /*hasProto=*/true,
1206  /*isAmbiguous=*/false, LParenLoc, ParamInfo.data(),
1207  ParamInfo.size(), EllipsisLoc, RParenLoc,
1208  DS.getTypeQualifiers(),
1209  /*RefQualifierIsLValueRef=*/true,
1210  /*RefQualifierLoc=*/NoLoc,
1211  /*ConstQualifierLoc=*/NoLoc,
1212  /*VolatileQualifierLoc=*/NoLoc,
1213  /*RestrictQualifierLoc=*/NoLoc, MutableLoc, ESpecType,
1214  ESpecRange, DynamicExceptions.data(),
1215  DynamicExceptionRanges.data(), DynamicExceptions.size(),
1216  NoexceptExpr.isUsable() ? NoexceptExpr.get() : nullptr,
1217  /*ExceptionSpecTokens*/ nullptr,
1218  /*DeclsInPrototype=*/None, LParenLoc, FunLocalRangeEnd, D,
1219  TrailingReturnType),
1220  std::move(Attr), DeclEndLoc);
1221  } else if (Tok.isOneOf(tok::kw_mutable, tok::arrow, tok::kw___attribute,
1222  tok::kw_constexpr) ||
1223  (Tok.is(tok::l_square) && NextToken().is(tok::l_square))) {
1224  // It's common to forget that one needs '()' before 'mutable', an attribute
1225  // specifier, or the result type. Deal with this.
1226  unsigned TokKind = 0;
1227  switch (Tok.getKind()) {
1228  case tok::kw_mutable: TokKind = 0; break;
1229  case tok::arrow: TokKind = 1; break;
1230  case tok::kw___attribute:
1231  case tok::l_square: TokKind = 2; break;
1232  case tok::kw_constexpr: TokKind = 3; break;
1233  default: llvm_unreachable("Unknown token kind");
1234  }
1235 
1236  Diag(Tok, diag::err_lambda_missing_parens)
1237  << TokKind
1238  << FixItHint::CreateInsertion(Tok.getLocation(), "() ");
1239  SourceLocation DeclEndLoc = DeclLoc;
1240 
1241  // GNU-style attributes must be parsed before the mutable specifier to be
1242  // compatible with GCC.
1243  MaybeParseGNUAttributes(Attr, &DeclEndLoc);
1244 
1245  // Parse 'mutable', if it's there.
1246  SourceLocation MutableLoc;
1247  if (Tok.is(tok::kw_mutable)) {
1248  MutableLoc = ConsumeToken();
1249  DeclEndLoc = MutableLoc;
1250  }
1251 
1252  // Parse attribute-specifier[opt].
1253  MaybeParseCXX11Attributes(Attr, &DeclEndLoc);
1254 
1255  // Parse the return type, if there is one.
1256  if (Tok.is(tok::arrow)) {
1257  SourceRange Range;
1258  TrailingReturnType =
1259  ParseTrailingReturnType(Range, /*MayBeFollowedByDirectInit*/ false);
1260  if (Range.getEnd().isValid())
1261  DeclEndLoc = Range.getEnd();
1262  }
1263 
1264  WarnIfHasCUDATargetAttr();
1265 
1266  SourceLocation NoLoc;
1268  /*hasProto=*/true,
1269  /*isAmbiguous=*/false,
1270  /*LParenLoc=*/NoLoc,
1271  /*Params=*/nullptr,
1272  /*NumParams=*/0,
1273  /*EllipsisLoc=*/NoLoc,
1274  /*RParenLoc=*/NoLoc,
1275  /*TypeQuals=*/0,
1276  /*RefQualifierIsLValueRef=*/true,
1277  /*RefQualifierLoc=*/NoLoc,
1278  /*ConstQualifierLoc=*/NoLoc,
1279  /*VolatileQualifierLoc=*/NoLoc,
1280  /*RestrictQualifierLoc=*/NoLoc, MutableLoc, EST_None,
1281  /*ESpecRange=*/SourceRange(),
1282  /*Exceptions=*/nullptr,
1283  /*ExceptionRanges=*/nullptr,
1284  /*NumExceptions=*/0,
1285  /*NoexceptExpr=*/nullptr,
1286  /*ExceptionSpecTokens=*/nullptr,
1287  /*DeclsInPrototype=*/None, DeclLoc, DeclEndLoc, D,
1288  TrailingReturnType),
1289  std::move(Attr), DeclEndLoc);
1290  }
1291 
1292  // FIXME: Rename BlockScope -> ClosureScope if we decide to continue using
1293  // it.
1294  unsigned ScopeFlags = Scope::BlockScope | Scope::FnScope | Scope::DeclScope |
1296  ParseScope BodyScope(this, ScopeFlags);
1297 
1298  Actions.ActOnStartOfLambdaDefinition(Intro, D, getCurScope());
1299 
1300  // Parse compound-statement.
1301  if (!Tok.is(tok::l_brace)) {
1302  Diag(Tok, diag::err_expected_lambda_body);
1303  Actions.ActOnLambdaError(LambdaBeginLoc, getCurScope());
1304  return ExprError();
1305  }
1306 
1307  StmtResult Stmt(ParseCompoundStatementBody());
1308  BodyScope.Exit();
1309 
1310  if (!Stmt.isInvalid() && !TrailingReturnType.isInvalid())
1311  return Actions.ActOnLambdaExpr(LambdaBeginLoc, Stmt.get(), getCurScope());
1312 
1313  Actions.ActOnLambdaError(LambdaBeginLoc, getCurScope());
1314  return ExprError();
1315 }
1316 
1317 /// ParseCXXCasts - This handles the various ways to cast expressions to another
1318 /// type.
1319 ///
1320 /// postfix-expression: [C++ 5.2p1]
1321 /// 'dynamic_cast' '<' type-name '>' '(' expression ')'
1322 /// 'static_cast' '<' type-name '>' '(' expression ')'
1323 /// 'reinterpret_cast' '<' type-name '>' '(' expression ')'
1324 /// 'const_cast' '<' type-name '>' '(' expression ')'
1325 ///
1326 ExprResult Parser::ParseCXXCasts() {
1327  tok::TokenKind Kind = Tok.getKind();
1328  const char *CastName = nullptr; // For error messages
1329 
1330  switch (Kind) {
1331  default: llvm_unreachable("Unknown C++ cast!");
1332  case tok::kw_const_cast: CastName = "const_cast"; break;
1333  case tok::kw_dynamic_cast: CastName = "dynamic_cast"; break;
1334  case tok::kw_reinterpret_cast: CastName = "reinterpret_cast"; break;
1335  case tok::kw_static_cast: CastName = "static_cast"; break;
1336  }
1337 
1338  SourceLocation OpLoc = ConsumeToken();
1339  SourceLocation LAngleBracketLoc = Tok.getLocation();
1340 
1341  // Check for "<::" which is parsed as "[:". If found, fix token stream,
1342  // diagnose error, suggest fix, and recover parsing.
1343  if (Tok.is(tok::l_square) && Tok.getLength() == 2) {
1344  Token Next = NextToken();
1345  if (Next.is(tok::colon) && areTokensAdjacent(Tok, Next))
1346  FixDigraph(*this, PP, Tok, Next, Kind, /*AtDigraph*/true);
1347  }
1348 
1349  if (ExpectAndConsume(tok::less, diag::err_expected_less_after, CastName))
1350  return ExprError();
1351 
1352  // Parse the common declaration-specifiers piece.
1353  DeclSpec DS(AttrFactory);
1354  ParseSpecifierQualifierList(DS);
1355 
1356  // Parse the abstract-declarator, if present.
1357  Declarator DeclaratorInfo(DS, DeclaratorContext::TypeNameContext);
1358  ParseDeclarator(DeclaratorInfo);
1359 
1360  SourceLocation RAngleBracketLoc = Tok.getLocation();
1361 
1362  if (ExpectAndConsume(tok::greater))
1363  return ExprError(Diag(LAngleBracketLoc, diag::note_matching) << tok::less);
1364 
1365  BalancedDelimiterTracker T(*this, tok::l_paren);
1366 
1367  if (T.expectAndConsume(diag::err_expected_lparen_after, CastName))
1368  return ExprError();
1369 
1371 
1372  // Match the ')'.
1373  T.consumeClose();
1374 
1375  if (!Result.isInvalid() && !DeclaratorInfo.isInvalidType())
1376  Result = Actions.ActOnCXXNamedCast(OpLoc, Kind,
1377  LAngleBracketLoc, DeclaratorInfo,
1378  RAngleBracketLoc,
1379  T.getOpenLocation(), Result.get(),
1380  T.getCloseLocation());
1381 
1382  return Result;
1383 }
1384 
1385 /// ParseCXXTypeid - This handles the C++ typeid expression.
1386 ///
1387 /// postfix-expression: [C++ 5.2p1]
1388 /// 'typeid' '(' expression ')'
1389 /// 'typeid' '(' type-id ')'
1390 ///
1391 ExprResult Parser::ParseCXXTypeid() {
1392  assert(Tok.is(tok::kw_typeid) && "Not 'typeid'!");
1393 
1394  SourceLocation OpLoc = ConsumeToken();
1395  SourceLocation LParenLoc, RParenLoc;
1396  BalancedDelimiterTracker T(*this, tok::l_paren);
1397 
1398  // typeid expressions are always parenthesized.
1399  if (T.expectAndConsume(diag::err_expected_lparen_after, "typeid"))
1400  return ExprError();
1401  LParenLoc = T.getOpenLocation();
1402 
1404 
1405  // C++0x [expr.typeid]p3:
1406  // When typeid is applied to an expression other than an lvalue of a
1407  // polymorphic class type [...] The expression is an unevaluated
1408  // operand (Clause 5).
1409  //
1410  // Note that we can't tell whether the expression is an lvalue of a
1411  // polymorphic class type until after we've parsed the expression; we
1412  // speculatively assume the subexpression is unevaluated, and fix it up
1413  // later.
1414  //
1415  // We enter the unevaluated context before trying to determine whether we
1416  // have a type-id, because the tentative parse logic will try to resolve
1417  // names, and must treat them as unevaluated.
1421 
1422  if (isTypeIdInParens()) {
1423  TypeResult Ty = ParseTypeName();
1424 
1425  // Match the ')'.
1426  T.consumeClose();
1427  RParenLoc = T.getCloseLocation();
1428  if (Ty.isInvalid() || RParenLoc.isInvalid())
1429  return ExprError();
1430 
1431  Result = Actions.ActOnCXXTypeid(OpLoc, LParenLoc, /*isType=*/true,
1432  Ty.get().getAsOpaquePtr(), RParenLoc);
1433  } else {
1434  Result = ParseExpression();
1435 
1436  // Match the ')'.
1437  if (Result.isInvalid())
1438  SkipUntil(tok::r_paren, StopAtSemi);
1439  else {
1440  T.consumeClose();
1441  RParenLoc = T.getCloseLocation();
1442  if (RParenLoc.isInvalid())
1443  return ExprError();
1444 
1445  Result = Actions.ActOnCXXTypeid(OpLoc, LParenLoc, /*isType=*/false,
1446  Result.get(), RParenLoc);
1447  }
1448  }
1449 
1450  return Result;
1451 }
1452 
1453 /// ParseCXXUuidof - This handles the Microsoft C++ __uuidof expression.
1454 ///
1455 /// '__uuidof' '(' expression ')'
1456 /// '__uuidof' '(' type-id ')'
1457 ///
1458 ExprResult Parser::ParseCXXUuidof() {
1459  assert(Tok.is(tok::kw___uuidof) && "Not '__uuidof'!");
1460 
1461  SourceLocation OpLoc = ConsumeToken();
1462  BalancedDelimiterTracker T(*this, tok::l_paren);
1463 
1464  // __uuidof expressions are always parenthesized.
1465  if (T.expectAndConsume(diag::err_expected_lparen_after, "__uuidof"))
1466  return ExprError();
1467 
1469 
1470  if (isTypeIdInParens()) {
1471  TypeResult Ty = ParseTypeName();
1472 
1473  // Match the ')'.
1474  T.consumeClose();
1475 
1476  if (Ty.isInvalid())
1477  return ExprError();
1478 
1479  Result = Actions.ActOnCXXUuidof(OpLoc, T.getOpenLocation(), /*isType=*/true,
1480  Ty.get().getAsOpaquePtr(),
1481  T.getCloseLocation());
1482  } else {
1485  Result = ParseExpression();
1486 
1487  // Match the ')'.
1488  if (Result.isInvalid())
1489  SkipUntil(tok::r_paren, StopAtSemi);
1490  else {
1491  T.consumeClose();
1492 
1493  Result = Actions.ActOnCXXUuidof(OpLoc, T.getOpenLocation(),
1494  /*isType=*/false,
1495  Result.get(), T.getCloseLocation());
1496  }
1497  }
1498 
1499  return Result;
1500 }
1501 
1502 /// Parse a C++ pseudo-destructor expression after the base,
1503 /// . or -> operator, and nested-name-specifier have already been
1504 /// parsed.
1505 ///
1506 /// postfix-expression: [C++ 5.2]
1507 /// postfix-expression . pseudo-destructor-name
1508 /// postfix-expression -> pseudo-destructor-name
1509 ///
1510 /// pseudo-destructor-name:
1511 /// ::[opt] nested-name-specifier[opt] type-name :: ~type-name
1512 /// ::[opt] nested-name-specifier template simple-template-id ::
1513 /// ~type-name
1514 /// ::[opt] nested-name-specifier[opt] ~type-name
1515 ///
1516 ExprResult
1517 Parser::ParseCXXPseudoDestructor(Expr *Base, SourceLocation OpLoc,
1518  tok::TokenKind OpKind,
1519  CXXScopeSpec &SS,
1520  ParsedType ObjectType) {
1521  // We're parsing either a pseudo-destructor-name or a dependent
1522  // member access that has the same form as a
1523  // pseudo-destructor-name. We parse both in the same way and let
1524  // the action model sort them out.
1525  //
1526  // Note that the ::[opt] nested-name-specifier[opt] has already
1527  // been parsed, and if there was a simple-template-id, it has
1528  // been coalesced into a template-id annotation token.
1529  UnqualifiedId FirstTypeName;
1530  SourceLocation CCLoc;
1531  if (Tok.is(tok::identifier)) {
1532  FirstTypeName.setIdentifier(Tok.getIdentifierInfo(), Tok.getLocation());
1533  ConsumeToken();
1534  assert(Tok.is(tok::coloncolon) &&"ParseOptionalCXXScopeSpecifier fail");
1535  CCLoc = ConsumeToken();
1536  } else if (Tok.is(tok::annot_template_id)) {
1537  // FIXME: retrieve TemplateKWLoc from template-id annotation and
1538  // store it in the pseudo-dtor node (to be used when instantiating it).
1539  FirstTypeName.setTemplateId(
1541  ConsumeAnnotationToken();
1542  assert(Tok.is(tok::coloncolon) &&"ParseOptionalCXXScopeSpecifier fail");
1543  CCLoc = ConsumeToken();
1544  } else {
1545  FirstTypeName.setIdentifier(nullptr, SourceLocation());
1546  }
1547 
1548  // Parse the tilde.
1549  assert(Tok.is(tok::tilde) && "ParseOptionalCXXScopeSpecifier fail");
1550  SourceLocation TildeLoc = ConsumeToken();
1551 
1552  if (Tok.is(tok::kw_decltype) && !FirstTypeName.isValid() && SS.isEmpty()) {
1553  DeclSpec DS(AttrFactory);
1554  ParseDecltypeSpecifier(DS);
1555  if (DS.getTypeSpecType() == TST_error)
1556  return ExprError();
1557  return Actions.ActOnPseudoDestructorExpr(getCurScope(), Base, OpLoc, OpKind,
1558  TildeLoc, DS);
1559  }
1560 
1561  if (!Tok.is(tok::identifier)) {
1562  Diag(Tok, diag::err_destructor_tilde_identifier);
1563  return ExprError();
1564  }
1565 
1566  // Parse the second type.
1567  UnqualifiedId SecondTypeName;
1568  IdentifierInfo *Name = Tok.getIdentifierInfo();
1569  SourceLocation NameLoc = ConsumeToken();
1570  SecondTypeName.setIdentifier(Name, NameLoc);
1571 
1572  // If there is a '<', the second type name is a template-id. Parse
1573  // it as such.
1574  if (Tok.is(tok::less) &&
1575  ParseUnqualifiedIdTemplateId(SS, SourceLocation(),
1576  Name, NameLoc,
1577  false, ObjectType, SecondTypeName,
1578  /*AssumeTemplateName=*/true))
1579  return ExprError();
1580 
1581  return Actions.ActOnPseudoDestructorExpr(getCurScope(), Base, OpLoc, OpKind,
1582  SS, FirstTypeName, CCLoc, TildeLoc,
1583  SecondTypeName);
1584 }
1585 
1586 /// ParseCXXBoolLiteral - This handles the C++ Boolean literals.
1587 ///
1588 /// boolean-literal: [C++ 2.13.5]
1589 /// 'true'
1590 /// 'false'
1591 ExprResult Parser::ParseCXXBoolLiteral() {
1592  tok::TokenKind Kind = Tok.getKind();
1593  return Actions.ActOnCXXBoolLiteral(ConsumeToken(), Kind);
1594 }
1595 
1596 /// ParseThrowExpression - This handles the C++ throw expression.
1597 ///
1598 /// throw-expression: [C++ 15]
1599 /// 'throw' assignment-expression[opt]
1600 ExprResult Parser::ParseThrowExpression() {
1601  assert(Tok.is(tok::kw_throw) && "Not throw!");
1602  SourceLocation ThrowLoc = ConsumeToken(); // Eat the throw token.
1603 
1604  // If the current token isn't the start of an assignment-expression,
1605  // then the expression is not present. This handles things like:
1606  // "C ? throw : (void)42", which is crazy but legal.
1607  switch (Tok.getKind()) { // FIXME: move this predicate somewhere common.
1608  case tok::semi:
1609  case tok::r_paren:
1610  case tok::r_square:
1611  case tok::r_brace:
1612  case tok::colon:
1613  case tok::comma:
1614  return Actions.ActOnCXXThrow(getCurScope(), ThrowLoc, nullptr);
1615 
1616  default:
1618  if (Expr.isInvalid()) return Expr;
1619  return Actions.ActOnCXXThrow(getCurScope(), ThrowLoc, Expr.get());
1620  }
1621 }
1622 
1623 /// Parse the C++ Coroutines co_yield expression.
1624 ///
1625 /// co_yield-expression:
1626 /// 'co_yield' assignment-expression[opt]
1627 ExprResult Parser::ParseCoyieldExpression() {
1628  assert(Tok.is(tok::kw_co_yield) && "Not co_yield!");
1629 
1630  SourceLocation Loc = ConsumeToken();
1631  ExprResult Expr = Tok.is(tok::l_brace) ? ParseBraceInitializer()
1633  if (!Expr.isInvalid())
1634  Expr = Actions.ActOnCoyieldExpr(getCurScope(), Loc, Expr.get());
1635  return Expr;
1636 }
1637 
1638 /// ParseCXXThis - This handles the C++ 'this' pointer.
1639 ///
1640 /// C++ 9.3.2: In the body of a non-static member function, the keyword this is
1641 /// a non-lvalue expression whose value is the address of the object for which
1642 /// the function is called.
1643 ExprResult Parser::ParseCXXThis() {
1644  assert(Tok.is(tok::kw_this) && "Not 'this'!");
1645  SourceLocation ThisLoc = ConsumeToken();
1646  return Actions.ActOnCXXThis(ThisLoc);
1647 }
1648 
1649 /// ParseCXXTypeConstructExpression - Parse construction of a specified type.
1650 /// Can be interpreted either as function-style casting ("int(x)")
1651 /// or class type construction ("ClassType(x,y,z)")
1652 /// or creation of a value-initialized type ("int()").
1653 /// See [C++ 5.2.3].
1654 ///
1655 /// postfix-expression: [C++ 5.2p1]
1656 /// simple-type-specifier '(' expression-list[opt] ')'
1657 /// [C++0x] simple-type-specifier braced-init-list
1658 /// typename-specifier '(' expression-list[opt] ')'
1659 /// [C++0x] typename-specifier braced-init-list
1660 ///
1661 /// In C++1z onwards, the type specifier can also be a template-name.
1662 ExprResult
1663 Parser::ParseCXXTypeConstructExpression(const DeclSpec &DS) {
1665  ParsedType TypeRep = Actions.ActOnTypeName(getCurScope(), DeclaratorInfo).get();
1666 
1667  assert((Tok.is(tok::l_paren) ||
1668  (getLangOpts().CPlusPlus11 && Tok.is(tok::l_brace)))
1669  && "Expected '(' or '{'!");
1670 
1671  if (Tok.is(tok::l_brace)) {
1672  ExprResult Init = ParseBraceInitializer();
1673  if (Init.isInvalid())
1674  return Init;
1675  Expr *InitList = Init.get();
1676  return Actions.ActOnCXXTypeConstructExpr(
1677  TypeRep, InitList->getLocStart(), MultiExprArg(&InitList, 1),
1678  InitList->getLocEnd(), /*ListInitialization=*/true);
1679  } else {
1680  BalancedDelimiterTracker T(*this, tok::l_paren);
1681  T.consumeOpen();
1682 
1683  ExprVector Exprs;
1684  CommaLocsTy CommaLocs;
1685 
1686  if (Tok.isNot(tok::r_paren)) {
1687  if (ParseExpressionList(Exprs, CommaLocs, [&] {
1689  TypeRep.get()->getCanonicalTypeInternal(),
1690  DS.getLocEnd(), Exprs);
1691  })) {
1692  SkipUntil(tok::r_paren, StopAtSemi);
1693  return ExprError();
1694  }
1695  }
1696 
1697  // Match the ')'.
1698  T.consumeClose();
1699 
1700  // TypeRep could be null, if it references an invalid typedef.
1701  if (!TypeRep)
1702  return ExprError();
1703 
1704  assert((Exprs.size() == 0 || Exprs.size()-1 == CommaLocs.size())&&
1705  "Unexpected number of commas!");
1706  return Actions.ActOnCXXTypeConstructExpr(TypeRep, T.getOpenLocation(),
1707  Exprs, T.getCloseLocation(),
1708  /*ListInitialization=*/false);
1709  }
1710 }
1711 
1712 /// ParseCXXCondition - if/switch/while condition expression.
1713 ///
1714 /// condition:
1715 /// expression
1716 /// type-specifier-seq declarator '=' assignment-expression
1717 /// [C++11] type-specifier-seq declarator '=' initializer-clause
1718 /// [C++11] type-specifier-seq declarator braced-init-list
1719 /// [Clang] type-specifier-seq ref-qualifier[opt] '[' identifier-list ']'
1720 /// brace-or-equal-initializer
1721 /// [GNU] type-specifier-seq declarator simple-asm-expr[opt] attributes[opt]
1722 /// '=' assignment-expression
1723 ///
1724 /// In C++1z, a condition may in some contexts be preceded by an
1725 /// optional init-statement. This function will parse that too.
1726 ///
1727 /// \param InitStmt If non-null, an init-statement is permitted, and if present
1728 /// will be parsed and stored here.
1729 ///
1730 /// \param Loc The location of the start of the statement that requires this
1731 /// condition, e.g., the "for" in a for loop.
1732 ///
1733 /// \returns The parsed condition.
1734 Sema::ConditionResult Parser::ParseCXXCondition(StmtResult *InitStmt,
1735  SourceLocation Loc,
1736  Sema::ConditionKind CK) {
1737  ParenBraceBracketBalancer BalancerRAIIObj(*this);
1738 
1739  if (Tok.is(tok::code_completion)) {
1741  cutOffParsing();
1742  return Sema::ConditionError();
1743  }
1744 
1745  ParsedAttributesWithRange attrs(AttrFactory);
1746  MaybeParseCXX11Attributes(attrs);
1747 
1748  const auto WarnOnInit = [this, &CK] {
1749  Diag(Tok.getLocation(), getLangOpts().CPlusPlus17
1750  ? diag::warn_cxx14_compat_init_statement
1751  : diag::ext_init_statement)
1752  << (CK == Sema::ConditionKind::Switch);
1753  };
1754 
1755  // Determine what kind of thing we have.
1756  switch (isCXXConditionDeclarationOrInitStatement(InitStmt)) {
1757  case ConditionOrInitStatement::Expression: {
1758  ProhibitAttributes(attrs);
1759 
1760  // We can have an empty expression here.
1761  // if (; true);
1762  if (InitStmt && Tok.is(tok::semi)) {
1763  WarnOnInit();
1764  SourceLocation SemiLoc = ConsumeToken();
1765  *InitStmt = Actions.ActOnNullStmt(SemiLoc);
1766  return ParseCXXCondition(nullptr, Loc, CK);
1767  }
1768 
1769  // Parse the expression.
1770  ExprResult Expr = ParseExpression(); // expression
1771  if (Expr.isInvalid())
1772  return Sema::ConditionError();
1773 
1774  if (InitStmt && Tok.is(tok::semi)) {
1775  WarnOnInit();
1776  *InitStmt = Actions.ActOnExprStmt(Expr.get());
1777  ConsumeToken();
1778  return ParseCXXCondition(nullptr, Loc, CK);
1779  }
1780 
1781  return Actions.ActOnCondition(getCurScope(), Loc, Expr.get(), CK);
1782  }
1783 
1784  case ConditionOrInitStatement::InitStmtDecl: {
1785  WarnOnInit();
1786  SourceLocation DeclStart = Tok.getLocation(), DeclEnd;
1787  DeclGroupPtrTy DG =
1788  ParseSimpleDeclaration(DeclaratorContext::InitStmtContext, DeclEnd,
1789  attrs, /*RequireSemi=*/true);
1790  *InitStmt = Actions.ActOnDeclStmt(DG, DeclStart, DeclEnd);
1791  return ParseCXXCondition(nullptr, Loc, CK);
1792  }
1793 
1794  case ConditionOrInitStatement::ConditionDecl:
1795  case ConditionOrInitStatement::Error:
1796  break;
1797  }
1798 
1799  // type-specifier-seq
1800  DeclSpec DS(AttrFactory);
1801  DS.takeAttributesFrom(attrs);
1802  ParseSpecifierQualifierList(DS, AS_none, DeclSpecContext::DSC_condition);
1803 
1804  // declarator
1805  Declarator DeclaratorInfo(DS, DeclaratorContext::ConditionContext);
1806  ParseDeclarator(DeclaratorInfo);
1807 
1808  // simple-asm-expr[opt]
1809  if (Tok.is(tok::kw_asm)) {
1810  SourceLocation Loc;
1811  ExprResult AsmLabel(ParseSimpleAsm(&Loc));
1812  if (AsmLabel.isInvalid()) {
1813  SkipUntil(tok::semi, StopAtSemi);
1814  return Sema::ConditionError();
1815  }
1816  DeclaratorInfo.setAsmLabel(AsmLabel.get());
1817  DeclaratorInfo.SetRangeEnd(Loc);
1818  }
1819 
1820  // If attributes are present, parse them.
1821  MaybeParseGNUAttributes(DeclaratorInfo);
1822 
1823  // Type-check the declaration itself.
1825  DeclaratorInfo);
1826  if (Dcl.isInvalid())
1827  return Sema::ConditionError();
1828  Decl *DeclOut = Dcl.get();
1829 
1830  // '=' assignment-expression
1831  // If a '==' or '+=' is found, suggest a fixit to '='.
1832  bool CopyInitialization = isTokenEqualOrEqualTypo();
1833  if (CopyInitialization)
1834  ConsumeToken();
1835 
1836  ExprResult InitExpr = ExprError();
1837  if (getLangOpts().CPlusPlus11 && Tok.is(tok::l_brace)) {
1838  Diag(Tok.getLocation(),
1839  diag::warn_cxx98_compat_generalized_initializer_lists);
1840  InitExpr = ParseBraceInitializer();
1841  } else if (CopyInitialization) {
1842  InitExpr = ParseAssignmentExpression();
1843  } else if (Tok.is(tok::l_paren)) {
1844  // This was probably an attempt to initialize the variable.
1845  SourceLocation LParen = ConsumeParen(), RParen = LParen;
1846  if (SkipUntil(tok::r_paren, StopAtSemi | StopBeforeMatch))
1847  RParen = ConsumeParen();
1848  Diag(DeclOut->getLocation(),
1849  diag::err_expected_init_in_condition_lparen)
1850  << SourceRange(LParen, RParen);
1851  } else {
1852  Diag(DeclOut->getLocation(), diag::err_expected_init_in_condition);
1853  }
1854 
1855  if (!InitExpr.isInvalid())
1856  Actions.AddInitializerToDecl(DeclOut, InitExpr.get(), !CopyInitialization);
1857  else
1858  Actions.ActOnInitializerError(DeclOut);
1859 
1860  Actions.FinalizeDeclaration(DeclOut);
1861  return Actions.ActOnConditionVariable(DeclOut, Loc, CK);
1862 }
1863 
1864 /// ParseCXXSimpleTypeSpecifier - [C++ 7.1.5.2] Simple type specifiers.
1865 /// This should only be called when the current token is known to be part of
1866 /// simple-type-specifier.
1867 ///
1868 /// simple-type-specifier:
1869 /// '::'[opt] nested-name-specifier[opt] type-name
1870 /// '::'[opt] nested-name-specifier 'template' simple-template-id [TODO]
1871 /// char
1872 /// wchar_t
1873 /// bool
1874 /// short
1875 /// int
1876 /// long
1877 /// signed
1878 /// unsigned
1879 /// float
1880 /// double
1881 /// void
1882 /// [GNU] typeof-specifier
1883 /// [C++0x] auto [TODO]
1884 ///
1885 /// type-name:
1886 /// class-name
1887 /// enum-name
1888 /// typedef-name
1889 ///
1890 void Parser::ParseCXXSimpleTypeSpecifier(DeclSpec &DS) {
1891  DS.SetRangeStart(Tok.getLocation());
1892  const char *PrevSpec;
1893  unsigned DiagID;
1894  SourceLocation Loc = Tok.getLocation();
1895  const clang::PrintingPolicy &Policy =
1896  Actions.getASTContext().getPrintingPolicy();
1897 
1898  switch (Tok.getKind()) {
1899  case tok::identifier: // foo::bar
1900  case tok::coloncolon: // ::foo::bar
1901  llvm_unreachable("Annotation token should already be formed!");
1902  default:
1903  llvm_unreachable("Not a simple-type-specifier token!");
1904 
1905  // type-name
1906  case tok::annot_typename: {
1907  if (getTypeAnnotation(Tok))
1908  DS.SetTypeSpecType(DeclSpec::TST_typename, Loc, PrevSpec, DiagID,
1909  getTypeAnnotation(Tok), Policy);
1910  else
1911  DS.SetTypeSpecError();
1912 
1913  DS.SetRangeEnd(Tok.getAnnotationEndLoc());
1914  ConsumeAnnotationToken();
1915 
1916  DS.Finish(Actions, Policy);
1917  return;
1918  }
1919 
1920  // builtin types
1921  case tok::kw_short:
1922  DS.SetTypeSpecWidth(DeclSpec::TSW_short, Loc, PrevSpec, DiagID, Policy);
1923  break;
1924  case tok::kw_long:
1925  DS.SetTypeSpecWidth(DeclSpec::TSW_long, Loc, PrevSpec, DiagID, Policy);
1926  break;
1927  case tok::kw___int64:
1928  DS.SetTypeSpecWidth(DeclSpec::TSW_longlong, Loc, PrevSpec, DiagID, Policy);
1929  break;
1930  case tok::kw_signed:
1931  DS.SetTypeSpecSign(DeclSpec::TSS_signed, Loc, PrevSpec, DiagID);
1932  break;
1933  case tok::kw_unsigned:
1934  DS.SetTypeSpecSign(DeclSpec::TSS_unsigned, Loc, PrevSpec, DiagID);
1935  break;
1936  case tok::kw_void:
1937  DS.SetTypeSpecType(DeclSpec::TST_void, Loc, PrevSpec, DiagID, Policy);
1938  break;
1939  case tok::kw_char:
1940  DS.SetTypeSpecType(DeclSpec::TST_char, Loc, PrevSpec, DiagID, Policy);
1941  break;
1942  case tok::kw_int:
1943  DS.SetTypeSpecType(DeclSpec::TST_int, Loc, PrevSpec, DiagID, Policy);
1944  break;
1945  case tok::kw___int128:
1946  DS.SetTypeSpecType(DeclSpec::TST_int128, Loc, PrevSpec, DiagID, Policy);
1947  break;
1948  case tok::kw_half:
1949  DS.SetTypeSpecType(DeclSpec::TST_half, Loc, PrevSpec, DiagID, Policy);
1950  break;
1951  case tok::kw_float:
1952  DS.SetTypeSpecType(DeclSpec::TST_float, Loc, PrevSpec, DiagID, Policy);
1953  break;
1954  case tok::kw_double:
1955  DS.SetTypeSpecType(DeclSpec::TST_double, Loc, PrevSpec, DiagID, Policy);
1956  break;
1957  case tok::kw__Float16:
1958  DS.SetTypeSpecType(DeclSpec::TST_float16, Loc, PrevSpec, DiagID, Policy);
1959  break;
1960  case tok::kw___float128:
1961  DS.SetTypeSpecType(DeclSpec::TST_float128, Loc, PrevSpec, DiagID, Policy);
1962  break;
1963  case tok::kw_wchar_t:
1964  DS.SetTypeSpecType(DeclSpec::TST_wchar, Loc, PrevSpec, DiagID, Policy);
1965  break;
1966  case tok::kw_char8_t:
1967  DS.SetTypeSpecType(DeclSpec::TST_char8, Loc, PrevSpec, DiagID, Policy);
1968  break;
1969  case tok::kw_char16_t:
1970  DS.SetTypeSpecType(DeclSpec::TST_char16, Loc, PrevSpec, DiagID, Policy);
1971  break;
1972  case tok::kw_char32_t:
1973  DS.SetTypeSpecType(DeclSpec::TST_char32, Loc, PrevSpec, DiagID, Policy);
1974  break;
1975  case tok::kw_bool:
1976  DS.SetTypeSpecType(DeclSpec::TST_bool, Loc, PrevSpec, DiagID, Policy);
1977  break;
1978  case tok::annot_decltype:
1979  case tok::kw_decltype:
1980  DS.SetRangeEnd(ParseDecltypeSpecifier(DS));
1981  return DS.Finish(Actions, Policy);
1982 
1983  // GNU typeof support.
1984  case tok::kw_typeof:
1985  ParseTypeofSpecifier(DS);
1986  DS.Finish(Actions, Policy);
1987  return;
1988  }
1989  ConsumeAnyToken();
1990  DS.SetRangeEnd(PrevTokLocation);
1991  DS.Finish(Actions, Policy);
1992 }
1993 
1994 /// ParseCXXTypeSpecifierSeq - Parse a C++ type-specifier-seq (C++
1995 /// [dcl.name]), which is a non-empty sequence of type-specifiers,
1996 /// e.g., "const short int". Note that the DeclSpec is *not* finished
1997 /// by parsing the type-specifier-seq, because these sequences are
1998 /// typically followed by some form of declarator. Returns true and
1999 /// emits diagnostics if this is not a type-specifier-seq, false
2000 /// otherwise.
2001 ///
2002 /// type-specifier-seq: [C++ 8.1]
2003 /// type-specifier type-specifier-seq[opt]
2004 ///
2005 bool Parser::ParseCXXTypeSpecifierSeq(DeclSpec &DS) {
2006  ParseSpecifierQualifierList(DS, AS_none, DeclSpecContext::DSC_type_specifier);
2007  DS.Finish(Actions, Actions.getASTContext().getPrintingPolicy());
2008  return false;
2009 }
2010 
2011 /// Finish parsing a C++ unqualified-id that is a template-id of
2012 /// some form.
2013 ///
2014 /// This routine is invoked when a '<' is encountered after an identifier or
2015 /// operator-function-id is parsed by \c ParseUnqualifiedId() to determine
2016 /// whether the unqualified-id is actually a template-id. This routine will
2017 /// then parse the template arguments and form the appropriate template-id to
2018 /// return to the caller.
2019 ///
2020 /// \param SS the nested-name-specifier that precedes this template-id, if
2021 /// we're actually parsing a qualified-id.
2022 ///
2023 /// \param Name for constructor and destructor names, this is the actual
2024 /// identifier that may be a template-name.
2025 ///
2026 /// \param NameLoc the location of the class-name in a constructor or
2027 /// destructor.
2028 ///
2029 /// \param EnteringContext whether we're entering the scope of the
2030 /// nested-name-specifier.
2031 ///
2032 /// \param ObjectType if this unqualified-id occurs within a member access
2033 /// expression, the type of the base object whose member is being accessed.
2034 ///
2035 /// \param Id as input, describes the template-name or operator-function-id
2036 /// that precedes the '<'. If template arguments were parsed successfully,
2037 /// will be updated with the template-id.
2038 ///
2039 /// \param AssumeTemplateId When true, this routine will assume that the name
2040 /// refers to a template without performing name lookup to verify.
2041 ///
2042 /// \returns true if a parse error occurred, false otherwise.
2043 bool Parser::ParseUnqualifiedIdTemplateId(CXXScopeSpec &SS,
2044  SourceLocation TemplateKWLoc,
2045  IdentifierInfo *Name,
2046  SourceLocation NameLoc,
2047  bool EnteringContext,
2048  ParsedType ObjectType,
2049  UnqualifiedId &Id,
2050  bool AssumeTemplateId) {
2051  assert(Tok.is(tok::less) && "Expected '<' to finish parsing a template-id");
2052 
2053  TemplateTy Template;
2055  switch (Id.getKind()) {
2059  if (AssumeTemplateId) {
2060  // We defer the injected-class-name checks until we've found whether
2061  // this template-id is used to form a nested-name-specifier or not.
2062  TNK = Actions.ActOnDependentTemplateName(
2063  getCurScope(), SS, TemplateKWLoc, Id, ObjectType, EnteringContext,
2064  Template, /*AllowInjectedClassName*/ true);
2065  if (TNK == TNK_Non_template)
2066  return true;
2067  } else {
2068  bool MemberOfUnknownSpecialization;
2069  TNK = Actions.isTemplateName(getCurScope(), SS,
2070  TemplateKWLoc.isValid(), Id,
2071  ObjectType, EnteringContext, Template,
2072  MemberOfUnknownSpecialization);
2073 
2074  if (TNK == TNK_Non_template && MemberOfUnknownSpecialization &&
2075  ObjectType && IsTemplateArgumentList()) {
2076  // We have something like t->getAs<T>(), where getAs is a
2077  // member of an unknown specialization. However, this will only
2078  // parse correctly as a template, so suggest the keyword 'template'
2079  // before 'getAs' and treat this as a dependent template name.
2080  std::string Name;
2082  Name = Id.Identifier->getName();
2083  else {
2084  Name = "operator ";
2087  else
2088  Name += Id.Identifier->getName();
2089  }
2090  Diag(Id.StartLocation, diag::err_missing_dependent_template_keyword)
2091  << Name
2092  << FixItHint::CreateInsertion(Id.StartLocation, "template ");
2093  TNK = Actions.ActOnDependentTemplateName(
2094  getCurScope(), SS, TemplateKWLoc, Id, ObjectType, EnteringContext,
2095  Template, /*AllowInjectedClassName*/ true);
2096  if (TNK == TNK_Non_template)
2097  return true;
2098  }
2099  }
2100  break;
2101 
2104  bool MemberOfUnknownSpecialization;
2105  TemplateName.setIdentifier(Name, NameLoc);
2106  TNK = Actions.isTemplateName(getCurScope(), SS, TemplateKWLoc.isValid(),
2107  TemplateName, ObjectType,
2108  EnteringContext, Template,
2109  MemberOfUnknownSpecialization);
2110  break;
2111  }
2112 
2115  bool MemberOfUnknownSpecialization;
2116  TemplateName.setIdentifier(Name, NameLoc);
2117  if (ObjectType) {
2118  TNK = Actions.ActOnDependentTemplateName(
2119  getCurScope(), SS, TemplateKWLoc, TemplateName, ObjectType,
2120  EnteringContext, Template, /*AllowInjectedClassName*/ true);
2121  if (TNK == TNK_Non_template)
2122  return true;
2123  } else {
2124  TNK = Actions.isTemplateName(getCurScope(), SS, TemplateKWLoc.isValid(),
2125  TemplateName, ObjectType,
2126  EnteringContext, Template,
2127  MemberOfUnknownSpecialization);
2128 
2129  if (TNK == TNK_Non_template && !Id.DestructorName.get()) {
2130  Diag(NameLoc, diag::err_destructor_template_id)
2131  << Name << SS.getRange();
2132  return true;
2133  }
2134  }
2135  break;
2136  }
2137 
2138  default:
2139  return false;
2140  }
2141 
2142  if (TNK == TNK_Non_template)
2143  return false;
2144 
2145  // Parse the enclosed template argument list.
2146  SourceLocation LAngleLoc, RAngleLoc;
2147  TemplateArgList TemplateArgs;
2148  if (ParseTemplateIdAfterTemplateName(true, LAngleLoc, TemplateArgs,
2149  RAngleLoc))
2150  return true;
2151 
2155  // Form a parsed representation of the template-id to be stored in the
2156  // UnqualifiedId.
2157 
2158  // FIXME: Store name for literal operator too.
2159  IdentifierInfo *TemplateII =
2161  : nullptr;
2162  OverloadedOperatorKind OpKind =
2164  ? OO_None
2166 
2168  SS, TemplateKWLoc, Id.StartLocation, TemplateII, OpKind, Template, TNK,
2169  LAngleLoc, RAngleLoc, TemplateArgs, TemplateIds);
2170 
2171  Id.setTemplateId(TemplateId);
2172  return false;
2173  }
2174 
2175  // Bundle the template arguments together.
2176  ASTTemplateArgsPtr TemplateArgsPtr(TemplateArgs);
2177 
2178  // Constructor and destructor names.
2180  = Actions.ActOnTemplateIdType(SS, TemplateKWLoc,
2181  Template, Name, NameLoc,
2182  LAngleLoc, TemplateArgsPtr, RAngleLoc,
2183  /*IsCtorOrDtorName=*/true);
2184  if (Type.isInvalid())
2185  return true;
2186 
2188  Id.setConstructorName(Type.get(), NameLoc, RAngleLoc);
2189  else
2190  Id.setDestructorName(Id.StartLocation, Type.get(), RAngleLoc);
2191 
2192  return false;
2193 }
2194 
2195 /// Parse an operator-function-id or conversion-function-id as part
2196 /// of a C++ unqualified-id.
2197 ///
2198 /// This routine is responsible only for parsing the operator-function-id or
2199 /// conversion-function-id; it does not handle template arguments in any way.
2200 ///
2201 /// \code
2202 /// operator-function-id: [C++ 13.5]
2203 /// 'operator' operator
2204 ///
2205 /// operator: one of
2206 /// new delete new[] delete[]
2207 /// + - * / % ^ & | ~
2208 /// ! = < > += -= *= /= %=
2209 /// ^= &= |= << >> >>= <<= == !=
2210 /// <= >= && || ++ -- , ->* ->
2211 /// () [] <=>
2212 ///
2213 /// conversion-function-id: [C++ 12.3.2]
2214 /// operator conversion-type-id
2215 ///
2216 /// conversion-type-id:
2217 /// type-specifier-seq conversion-declarator[opt]
2218 ///
2219 /// conversion-declarator:
2220 /// ptr-operator conversion-declarator[opt]
2221 /// \endcode
2222 ///
2223 /// \param SS The nested-name-specifier that preceded this unqualified-id. If
2224 /// non-empty, then we are parsing the unqualified-id of a qualified-id.
2225 ///
2226 /// \param EnteringContext whether we are entering the scope of the
2227 /// nested-name-specifier.
2228 ///
2229 /// \param ObjectType if this unqualified-id occurs within a member access
2230 /// expression, the type of the base object whose member is being accessed.
2231 ///
2232 /// \param Result on a successful parse, contains the parsed unqualified-id.
2233 ///
2234 /// \returns true if parsing fails, false otherwise.
2235 bool Parser::ParseUnqualifiedIdOperator(CXXScopeSpec &SS, bool EnteringContext,
2236  ParsedType ObjectType,
2237  UnqualifiedId &Result) {
2238  assert(Tok.is(tok::kw_operator) && "Expected 'operator' keyword");
2239 
2240  // Consume the 'operator' keyword.
2241  SourceLocation KeywordLoc = ConsumeToken();
2242 
2243  // Determine what kind of operator name we have.
2244  unsigned SymbolIdx = 0;
2245  SourceLocation SymbolLocations[3];
2247  switch (Tok.getKind()) {
2248  case tok::kw_new:
2249  case tok::kw_delete: {
2250  bool isNew = Tok.getKind() == tok::kw_new;
2251  // Consume the 'new' or 'delete'.
2252  SymbolLocations[SymbolIdx++] = ConsumeToken();
2253  // Check for array new/delete.
2254  if (Tok.is(tok::l_square) &&
2255  (!getLangOpts().CPlusPlus11 || NextToken().isNot(tok::l_square))) {
2256  // Consume the '[' and ']'.
2257  BalancedDelimiterTracker T(*this, tok::l_square);
2258  T.consumeOpen();
2259  T.consumeClose();
2260  if (T.getCloseLocation().isInvalid())
2261  return true;
2262 
2263  SymbolLocations[SymbolIdx++] = T.getOpenLocation();
2264  SymbolLocations[SymbolIdx++] = T.getCloseLocation();
2265  Op = isNew? OO_Array_New : OO_Array_Delete;
2266  } else {
2267  Op = isNew? OO_New : OO_Delete;
2268  }
2269  break;
2270  }
2271 
2272 #define OVERLOADED_OPERATOR(Name,Spelling,Token,Unary,Binary,MemberOnly) \
2273  case tok::Token: \
2274  SymbolLocations[SymbolIdx++] = ConsumeToken(); \
2275  Op = OO_##Name; \
2276  break;
2277 #define OVERLOADED_OPERATOR_MULTI(Name,Spelling,Unary,Binary,MemberOnly)
2278 #include "clang/Basic/OperatorKinds.def"
2279 
2280  case tok::l_paren: {
2281  // Consume the '(' and ')'.
2282  BalancedDelimiterTracker T(*this, tok::l_paren);
2283  T.consumeOpen();
2284  T.consumeClose();
2285  if (T.getCloseLocation().isInvalid())
2286  return true;
2287 
2288  SymbolLocations[SymbolIdx++] = T.getOpenLocation();
2289  SymbolLocations[SymbolIdx++] = T.getCloseLocation();
2290  Op = OO_Call;
2291  break;
2292  }
2293 
2294  case tok::l_square: {
2295  // Consume the '[' and ']'.
2296  BalancedDelimiterTracker T(*this, tok::l_square);
2297  T.consumeOpen();
2298  T.consumeClose();
2299  if (T.getCloseLocation().isInvalid())
2300  return true;
2301 
2302  SymbolLocations[SymbolIdx++] = T.getOpenLocation();
2303  SymbolLocations[SymbolIdx++] = T.getCloseLocation();
2304  Op = OO_Subscript;
2305  break;
2306  }
2307 
2308  case tok::code_completion: {
2309  // Code completion for the operator name.
2311  cutOffParsing();
2312  // Don't try to parse any further.
2313  return true;
2314  }
2315 
2316  default:
2317  break;
2318  }
2319 
2320  if (Op != OO_None) {
2321  // We have parsed an operator-function-id.
2322  Result.setOperatorFunctionId(KeywordLoc, Op, SymbolLocations);
2323  return false;
2324  }
2325 
2326  // Parse a literal-operator-id.
2327  //
2328  // literal-operator-id: C++11 [over.literal]
2329  // operator string-literal identifier
2330  // operator user-defined-string-literal
2331 
2332  if (getLangOpts().CPlusPlus11 && isTokenStringLiteral()) {
2333  Diag(Tok.getLocation(), diag::warn_cxx98_compat_literal_operator);
2334 
2335  SourceLocation DiagLoc;
2336  unsigned DiagId = 0;
2337 
2338  // We're past translation phase 6, so perform string literal concatenation
2339  // before checking for "".
2340  SmallVector<Token, 4> Toks;
2342  while (isTokenStringLiteral()) {
2343  if (!Tok.is(tok::string_literal) && !DiagId) {
2344  // C++11 [over.literal]p1:
2345  // The string-literal or user-defined-string-literal in a
2346  // literal-operator-id shall have no encoding-prefix [...].
2347  DiagLoc = Tok.getLocation();
2348  DiagId = diag::err_literal_operator_string_prefix;
2349  }
2350  Toks.push_back(Tok);
2351  TokLocs.push_back(ConsumeStringToken());
2352  }
2353 
2354  StringLiteralParser Literal(Toks, PP);
2355  if (Literal.hadError)
2356  return true;
2357 
2358  // Grab the literal operator's suffix, which will be either the next token
2359  // or a ud-suffix from the string literal.
2360  IdentifierInfo *II = nullptr;
2361  SourceLocation SuffixLoc;
2362  if (!Literal.getUDSuffix().empty()) {
2363  II = &PP.getIdentifierTable().get(Literal.getUDSuffix());
2364  SuffixLoc =
2366  Literal.getUDSuffixOffset(),
2367  PP.getSourceManager(), getLangOpts());
2368  } else if (Tok.is(tok::identifier)) {
2369  II = Tok.getIdentifierInfo();
2370  SuffixLoc = ConsumeToken();
2371  TokLocs.push_back(SuffixLoc);
2372  } else {
2373  Diag(Tok.getLocation(), diag::err_expected) << tok::identifier;
2374  return true;
2375  }
2376 
2377  // The string literal must be empty.
2378  if (!Literal.GetString().empty() || Literal.Pascal) {
2379  // C++11 [over.literal]p1:
2380  // The string-literal or user-defined-string-literal in a
2381  // literal-operator-id shall [...] contain no characters
2382  // other than the implicit terminating '\0'.
2383  DiagLoc = TokLocs.front();
2384  DiagId = diag::err_literal_operator_string_not_empty;
2385  }
2386 
2387  if (DiagId) {
2388  // This isn't a valid literal-operator-id, but we think we know
2389  // what the user meant. Tell them what they should have written.
2390  SmallString<32> Str;
2391  Str += "\"\"";
2392  Str += II->getName();
2393  Diag(DiagLoc, DiagId) << FixItHint::CreateReplacement(
2394  SourceRange(TokLocs.front(), TokLocs.back()), Str);
2395  }
2396 
2397  Result.setLiteralOperatorId(II, KeywordLoc, SuffixLoc);
2398 
2399  return Actions.checkLiteralOperatorId(SS, Result);
2400  }
2401 
2402  // Parse a conversion-function-id.
2403  //
2404  // conversion-function-id: [C++ 12.3.2]
2405  // operator conversion-type-id
2406  //
2407  // conversion-type-id:
2408  // type-specifier-seq conversion-declarator[opt]
2409  //
2410  // conversion-declarator:
2411  // ptr-operator conversion-declarator[opt]
2412 
2413  // Parse the type-specifier-seq.
2414  DeclSpec DS(AttrFactory);
2415  if (ParseCXXTypeSpecifierSeq(DS)) // FIXME: ObjectType?
2416  return true;
2417 
2418  // Parse the conversion-declarator, which is merely a sequence of
2419  // ptr-operators.
2421  ParseDeclaratorInternal(D, /*DirectDeclParser=*/nullptr);
2422 
2423  // Finish up the type.
2424  TypeResult Ty = Actions.ActOnTypeName(getCurScope(), D);
2425  if (Ty.isInvalid())
2426  return true;
2427 
2428  // Note that this is a conversion-function-id.
2429  Result.setConversionFunctionId(KeywordLoc, Ty.get(),
2430  D.getSourceRange().getEnd());
2431  return false;
2432 }
2433 
2434 /// Parse a C++ unqualified-id (or a C identifier), which describes the
2435 /// name of an entity.
2436 ///
2437 /// \code
2438 /// unqualified-id: [C++ expr.prim.general]
2439 /// identifier
2440 /// operator-function-id
2441 /// conversion-function-id
2442 /// [C++0x] literal-operator-id [TODO]
2443 /// ~ class-name
2444 /// template-id
2445 ///
2446 /// \endcode
2447 ///
2448 /// \param SS The nested-name-specifier that preceded this unqualified-id. If
2449 /// non-empty, then we are parsing the unqualified-id of a qualified-id.
2450 ///
2451 /// \param EnteringContext whether we are entering the scope of the
2452 /// nested-name-specifier.
2453 ///
2454 /// \param AllowDestructorName whether we allow parsing of a destructor name.
2455 ///
2456 /// \param AllowConstructorName whether we allow parsing a constructor name.
2457 ///
2458 /// \param AllowDeductionGuide whether we allow parsing a deduction guide name.
2459 ///
2460 /// \param ObjectType if this unqualified-id occurs within a member access
2461 /// expression, the type of the base object whose member is being accessed.
2462 ///
2463 /// \param Result on a successful parse, contains the parsed unqualified-id.
2464 ///
2465 /// \returns true if parsing fails, false otherwise.
2466 bool Parser::ParseUnqualifiedId(CXXScopeSpec &SS, bool EnteringContext,
2467  bool AllowDestructorName,
2468  bool AllowConstructorName,
2469  bool AllowDeductionGuide,
2470  ParsedType ObjectType,
2471  SourceLocation *TemplateKWLoc,
2472  UnqualifiedId &Result) {
2473  if (TemplateKWLoc)
2474  *TemplateKWLoc = SourceLocation();
2475 
2476  // Handle 'A::template B'. This is for template-ids which have not
2477  // already been annotated by ParseOptionalCXXScopeSpecifier().
2478  bool TemplateSpecified = false;
2479  if (Tok.is(tok::kw_template)) {
2480  if (TemplateKWLoc && (ObjectType || SS.isSet())) {
2481  TemplateSpecified = true;
2482  *TemplateKWLoc = ConsumeToken();
2483  } else {
2484  SourceLocation TemplateLoc = ConsumeToken();
2485  Diag(TemplateLoc, diag::err_unexpected_template_in_unqualified_id)
2486  << FixItHint::CreateRemoval(TemplateLoc);
2487  }
2488  }
2489 
2490  // unqualified-id:
2491  // identifier
2492  // template-id (when it hasn't already been annotated)
2493  if (Tok.is(tok::identifier)) {
2494  // Consume the identifier.
2495  IdentifierInfo *Id = Tok.getIdentifierInfo();
2496  SourceLocation IdLoc = ConsumeToken();
2497 
2498  if (!getLangOpts().CPlusPlus) {
2499  // If we're not in C++, only identifiers matter. Record the
2500  // identifier and return.
2501  Result.setIdentifier(Id, IdLoc);
2502  return false;
2503  }
2504 
2506  if (AllowConstructorName &&
2507  Actions.isCurrentClassName(*Id, getCurScope(), &SS)) {
2508  // We have parsed a constructor name.
2509  ParsedType Ty = Actions.getConstructorName(*Id, IdLoc, getCurScope(), SS,
2510  EnteringContext);
2511  if (!Ty)
2512  return true;
2513  Result.setConstructorName(Ty, IdLoc, IdLoc);
2514  } else if (getLangOpts().CPlusPlus17 &&
2515  AllowDeductionGuide && SS.isEmpty() &&
2516  Actions.isDeductionGuideName(getCurScope(), *Id, IdLoc,
2517  &TemplateName)) {
2518  // We have parsed a template-name naming a deduction guide.
2519  Result.setDeductionGuideName(TemplateName, IdLoc);
2520  } else {
2521  // We have parsed an identifier.
2522  Result.setIdentifier(Id, IdLoc);
2523  }
2524 
2525  // If the next token is a '<', we may have a template.
2526  TemplateTy Template;
2527  if (Tok.is(tok::less))
2528  return ParseUnqualifiedIdTemplateId(
2529  SS, TemplateKWLoc ? *TemplateKWLoc : SourceLocation(), Id, IdLoc,
2530  EnteringContext, ObjectType, Result, TemplateSpecified);
2531  else if (TemplateSpecified &&
2533  getCurScope(), SS, *TemplateKWLoc, Result, ObjectType,
2534  EnteringContext, Template,
2535  /*AllowInjectedClassName*/ true) == TNK_Non_template)
2536  return true;
2537 
2538  return false;
2539  }
2540 
2541  // unqualified-id:
2542  // template-id (already parsed and annotated)
2543  if (Tok.is(tok::annot_template_id)) {
2544  TemplateIdAnnotation *TemplateId = takeTemplateIdAnnotation(Tok);
2545 
2546  // If the template-name names the current class, then this is a constructor
2547  if (AllowConstructorName && TemplateId->Name &&
2548  Actions.isCurrentClassName(*TemplateId->Name, getCurScope(), &SS)) {
2549  if (SS.isSet()) {
2550  // C++ [class.qual]p2 specifies that a qualified template-name
2551  // is taken as the constructor name where a constructor can be
2552  // declared. Thus, the template arguments are extraneous, so
2553  // complain about them and remove them entirely.
2554  Diag(TemplateId->TemplateNameLoc,
2555  diag::err_out_of_line_constructor_template_id)
2556  << TemplateId->Name
2558  SourceRange(TemplateId->LAngleLoc, TemplateId->RAngleLoc));
2559  ParsedType Ty = Actions.getConstructorName(
2560  *TemplateId->Name, TemplateId->TemplateNameLoc, getCurScope(), SS,
2561  EnteringContext);
2562  if (!Ty)
2563  return true;
2564  Result.setConstructorName(Ty, TemplateId->TemplateNameLoc,
2565  TemplateId->RAngleLoc);
2566  ConsumeAnnotationToken();
2567  return false;
2568  }
2569 
2570  Result.setConstructorTemplateId(TemplateId);
2571  ConsumeAnnotationToken();
2572  return false;
2573  }
2574 
2575  // We have already parsed a template-id; consume the annotation token as
2576  // our unqualified-id.
2577  Result.setTemplateId(TemplateId);
2578  SourceLocation TemplateLoc = TemplateId->TemplateKWLoc;
2579  if (TemplateLoc.isValid()) {
2580  if (TemplateKWLoc && (ObjectType || SS.isSet()))
2581  *TemplateKWLoc = TemplateLoc;
2582  else
2583  Diag(TemplateLoc, diag::err_unexpected_template_in_unqualified_id)
2584  << FixItHint::CreateRemoval(TemplateLoc);
2585  }
2586  ConsumeAnnotationToken();
2587  return false;
2588  }
2589 
2590  // unqualified-id:
2591  // operator-function-id
2592  // conversion-function-id
2593  if (Tok.is(tok::kw_operator)) {
2594  if (ParseUnqualifiedIdOperator(SS, EnteringContext, ObjectType, Result))
2595  return true;
2596 
2597  // If we have an operator-function-id or a literal-operator-id and the next
2598  // token is a '<', we may have a
2599  //
2600  // template-id:
2601  // operator-function-id < template-argument-list[opt] >
2602  TemplateTy Template;
2605  Tok.is(tok::less))
2606  return ParseUnqualifiedIdTemplateId(
2607  SS, TemplateKWLoc ? *TemplateKWLoc : SourceLocation(), nullptr,
2608  SourceLocation(), EnteringContext, ObjectType, Result,
2609  TemplateSpecified);
2610  else if (TemplateSpecified &&
2612  getCurScope(), SS, *TemplateKWLoc, Result, ObjectType,
2613  EnteringContext, Template,
2614  /*AllowInjectedClassName*/ true) == TNK_Non_template)
2615  return true;
2616 
2617  return false;
2618  }
2619 
2620  if (getLangOpts().CPlusPlus &&
2621  (AllowDestructorName || SS.isSet()) && Tok.is(tok::tilde)) {
2622  // C++ [expr.unary.op]p10:
2623  // There is an ambiguity in the unary-expression ~X(), where X is a
2624  // class-name. The ambiguity is resolved in favor of treating ~ as a
2625  // unary complement rather than treating ~X as referring to a destructor.
2626 
2627  // Parse the '~'.
2628  SourceLocation TildeLoc = ConsumeToken();
2629 
2630  if (SS.isEmpty() && Tok.is(tok::kw_decltype)) {
2631  DeclSpec DS(AttrFactory);
2632  SourceLocation EndLoc = ParseDecltypeSpecifier(DS);
2633  if (ParsedType Type =
2634  Actions.getDestructorTypeForDecltype(DS, ObjectType)) {
2635  Result.setDestructorName(TildeLoc, Type, EndLoc);
2636  return false;
2637  }
2638  return true;
2639  }
2640 
2641  // Parse the class-name.
2642  if (Tok.isNot(tok::identifier)) {
2643  Diag(Tok, diag::err_destructor_tilde_identifier);
2644  return true;
2645  }
2646 
2647  // If the user wrote ~T::T, correct it to T::~T.
2648  DeclaratorScopeObj DeclScopeObj(*this, SS);
2649  if (!TemplateSpecified && NextToken().is(tok::coloncolon)) {
2650  // Don't let ParseOptionalCXXScopeSpecifier() "correct"
2651  // `int A; struct { ~A::A(); };` to `int A; struct { ~A:A(); };`,
2652  // it will confuse this recovery logic.
2653  ColonProtectionRAIIObject ColonRAII(*this, false);
2654 
2655  if (SS.isSet()) {
2656  AnnotateScopeToken(SS, /*NewAnnotation*/true);
2657  SS.clear();
2658  }
2659  if (ParseOptionalCXXScopeSpecifier(SS, ObjectType, EnteringContext))
2660  return true;
2661  if (SS.isNotEmpty())
2662  ObjectType = nullptr;
2663  if (Tok.isNot(tok::identifier) || NextToken().is(tok::coloncolon) ||
2664  !SS.isSet()) {
2665  Diag(TildeLoc, diag::err_destructor_tilde_scope);
2666  return true;
2667  }
2668 
2669  // Recover as if the tilde had been written before the identifier.
2670  Diag(TildeLoc, diag::err_destructor_tilde_scope)
2671  << FixItHint::CreateRemoval(TildeLoc)
2672  << FixItHint::CreateInsertion(Tok.getLocation(), "~");
2673 
2674  // Temporarily enter the scope for the rest of this function.
2675  if (Actions.ShouldEnterDeclaratorScope(getCurScope(), SS))
2676  DeclScopeObj.EnterDeclaratorScope();
2677  }
2678 
2679  // Parse the class-name (or template-name in a simple-template-id).
2680  IdentifierInfo *ClassName = Tok.getIdentifierInfo();
2681  SourceLocation ClassNameLoc = ConsumeToken();
2682 
2683  if (Tok.is(tok::less)) {
2684  Result.setDestructorName(TildeLoc, nullptr, ClassNameLoc);
2685  return ParseUnqualifiedIdTemplateId(
2686  SS, TemplateKWLoc ? *TemplateKWLoc : SourceLocation(), ClassName,
2687  ClassNameLoc, EnteringContext, ObjectType, Result, TemplateSpecified);
2688  }
2689 
2690  // Note that this is a destructor name.
2691  ParsedType Ty = Actions.getDestructorName(TildeLoc, *ClassName,
2692  ClassNameLoc, getCurScope(),
2693  SS, ObjectType,
2694  EnteringContext);
2695  if (!Ty)
2696  return true;
2697 
2698  Result.setDestructorName(TildeLoc, Ty, ClassNameLoc);
2699  return false;
2700  }
2701 
2702  Diag(Tok, diag::err_expected_unqualified_id)
2703  << getLangOpts().CPlusPlus;
2704  return true;
2705 }
2706 
2707 /// ParseCXXNewExpression - Parse a C++ new-expression. New is used to allocate
2708 /// memory in a typesafe manner and call constructors.
2709 ///
2710 /// This method is called to parse the new expression after the optional :: has
2711 /// been already parsed. If the :: was present, "UseGlobal" is true and "Start"
2712 /// is its location. Otherwise, "Start" is the location of the 'new' token.
2713 ///
2714 /// new-expression:
2715 /// '::'[opt] 'new' new-placement[opt] new-type-id
2716 /// new-initializer[opt]
2717 /// '::'[opt] 'new' new-placement[opt] '(' type-id ')'
2718 /// new-initializer[opt]
2719 ///
2720 /// new-placement:
2721 /// '(' expression-list ')'
2722 ///
2723 /// new-type-id:
2724 /// type-specifier-seq new-declarator[opt]
2725 /// [GNU] attributes type-specifier-seq new-declarator[opt]
2726 ///
2727 /// new-declarator:
2728 /// ptr-operator new-declarator[opt]
2729 /// direct-new-declarator
2730 ///
2731 /// new-initializer:
2732 /// '(' expression-list[opt] ')'
2733 /// [C++0x] braced-init-list
2734 ///
2735 ExprResult
2736 Parser::ParseCXXNewExpression(bool UseGlobal, SourceLocation Start) {
2737  assert(Tok.is(tok::kw_new) && "expected 'new' token");
2738  ConsumeToken(); // Consume 'new'
2739 
2740  // A '(' now can be a new-placement or the '(' wrapping the type-id in the
2741  // second form of new-expression. It can't be a new-type-id.
2742 
2743  ExprVector PlacementArgs;
2744  SourceLocation PlacementLParen, PlacementRParen;
2745 
2746  SourceRange TypeIdParens;
2747  DeclSpec DS(AttrFactory);
2748  Declarator DeclaratorInfo(DS, DeclaratorContext::CXXNewContext);
2749  if (Tok.is(tok::l_paren)) {
2750  // If it turns out to be a placement, we change the type location.
2751  BalancedDelimiterTracker T(*this, tok::l_paren);
2752  T.consumeOpen();
2753  PlacementLParen = T.getOpenLocation();
2754  if (ParseExpressionListOrTypeId(PlacementArgs, DeclaratorInfo)) {
2755  SkipUntil(tok::semi, StopAtSemi | StopBeforeMatch);
2756  return ExprError();
2757  }
2758 
2759  T.consumeClose();
2760  PlacementRParen = T.getCloseLocation();
2761  if (PlacementRParen.isInvalid()) {
2762  SkipUntil(tok::semi, StopAtSemi | StopBeforeMatch);
2763  return ExprError();
2764  }
2765 
2766  if (PlacementArgs.empty()) {
2767  // Reset the placement locations. There was no placement.
2768  TypeIdParens = T.getRange();
2769  PlacementLParen = PlacementRParen = SourceLocation();
2770  } else {
2771  // We still need the type.
2772  if (Tok.is(tok::l_paren)) {
2773  BalancedDelimiterTracker T(*this, tok::l_paren);
2774  T.consumeOpen();
2775  MaybeParseGNUAttributes(DeclaratorInfo);
2776  ParseSpecifierQualifierList(DS);
2777  DeclaratorInfo.SetSourceRange(DS.getSourceRange());
2778  ParseDeclarator(DeclaratorInfo);
2779  T.consumeClose();
2780  TypeIdParens = T.getRange();
2781  } else {
2782  MaybeParseGNUAttributes(DeclaratorInfo);
2783  if (ParseCXXTypeSpecifierSeq(DS))
2784  DeclaratorInfo.setInvalidType(true);
2785  else {
2786  DeclaratorInfo.SetSourceRange(DS.getSourceRange());
2787  ParseDeclaratorInternal(DeclaratorInfo,
2788  &Parser::ParseDirectNewDeclarator);
2789  }
2790  }
2791  }
2792  } else {
2793  // A new-type-id is a simplified type-id, where essentially the
2794  // direct-declarator is replaced by a direct-new-declarator.
2795  MaybeParseGNUAttributes(DeclaratorInfo);
2796  if (ParseCXXTypeSpecifierSeq(DS))
2797  DeclaratorInfo.setInvalidType(true);
2798  else {
2799  DeclaratorInfo.SetSourceRange(DS.getSourceRange());
2800  ParseDeclaratorInternal(DeclaratorInfo,
2801  &Parser::ParseDirectNewDeclarator);
2802  }
2803  }
2804  if (DeclaratorInfo.isInvalidType()) {
2805  SkipUntil(tok::semi, StopAtSemi | StopBeforeMatch);
2806  return ExprError();
2807  }
2808 
2809  ExprResult Initializer;
2810 
2811  if (Tok.is(tok::l_paren)) {
2812  SourceLocation ConstructorLParen, ConstructorRParen;
2813  ExprVector ConstructorArgs;
2814  BalancedDelimiterTracker T(*this, tok::l_paren);
2815  T.consumeOpen();
2816  ConstructorLParen = T.getOpenLocation();
2817  if (Tok.isNot(tok::r_paren)) {
2818  CommaLocsTy CommaLocs;
2819  if (ParseExpressionList(ConstructorArgs, CommaLocs, [&] {
2820  ParsedType TypeRep = Actions.ActOnTypeName(getCurScope(),
2821  DeclaratorInfo).get();
2823  TypeRep.get()->getCanonicalTypeInternal(),
2824  DeclaratorInfo.getLocEnd(),
2825  ConstructorArgs);
2826  })) {
2827  SkipUntil(tok::semi, StopAtSemi | StopBeforeMatch);
2828  return ExprError();
2829  }
2830  }
2831  T.consumeClose();
2832  ConstructorRParen = T.getCloseLocation();
2833  if (ConstructorRParen.isInvalid()) {
2834  SkipUntil(tok::semi, StopAtSemi | StopBeforeMatch);
2835  return ExprError();
2836  }
2837  Initializer = Actions.ActOnParenListExpr(ConstructorLParen,
2838  ConstructorRParen,
2839  ConstructorArgs);
2840  } else if (Tok.is(tok::l_brace) && getLangOpts().CPlusPlus11) {
2841  Diag(Tok.getLocation(),
2842  diag::warn_cxx98_compat_generalized_initializer_lists);
2843  Initializer = ParseBraceInitializer();
2844  }
2845  if (Initializer.isInvalid())
2846  return Initializer;
2847 
2848  return Actions.ActOnCXXNew(Start, UseGlobal, PlacementLParen,
2849  PlacementArgs, PlacementRParen,
2850  TypeIdParens, DeclaratorInfo, Initializer.get());
2851 }
2852 
2853 /// ParseDirectNewDeclarator - Parses a direct-new-declarator. Intended to be
2854 /// passed to ParseDeclaratorInternal.
2855 ///
2856 /// direct-new-declarator:
2857 /// '[' expression ']'
2858 /// direct-new-declarator '[' constant-expression ']'
2859 ///
2860 void Parser::ParseDirectNewDeclarator(Declarator &D) {
2861  // Parse the array dimensions.
2862  bool first = true;
2863  while (Tok.is(tok::l_square)) {
2864  // An array-size expression can't start with a lambda.
2865  if (CheckProhibitedCXX11Attribute())
2866  continue;
2867 
2868  BalancedDelimiterTracker T(*this, tok::l_square);
2869  T.consumeOpen();
2870 
2871  ExprResult Size(first ? ParseExpression()
2873  if (Size.isInvalid()) {
2874  // Recover
2875  SkipUntil(tok::r_square, StopAtSemi);
2876  return;
2877  }
2878  first = false;
2879 
2880  T.consumeClose();
2881 
2882  // Attributes here appertain to the array type. C++11 [expr.new]p5.
2883  ParsedAttributes Attrs(AttrFactory);
2884  MaybeParseCXX11Attributes(Attrs);
2885 
2887  /*static=*/false, /*star=*/false,
2888  Size.get(), T.getOpenLocation(),
2889  T.getCloseLocation()),
2890  std::move(Attrs), T.getCloseLocation());
2891 
2892  if (T.getCloseLocation().isInvalid())
2893  return;
2894  }
2895 }
2896 
2897 /// ParseExpressionListOrTypeId - Parse either an expression-list or a type-id.
2898 /// This ambiguity appears in the syntax of the C++ new operator.
2899 ///
2900 /// new-expression:
2901 /// '::'[opt] 'new' new-placement[opt] '(' type-id ')'
2902 /// new-initializer[opt]
2903 ///
2904 /// new-placement:
2905 /// '(' expression-list ')'
2906 ///
2907 bool Parser::ParseExpressionListOrTypeId(
2908  SmallVectorImpl<Expr*> &PlacementArgs,
2909  Declarator &D) {
2910  // The '(' was already consumed.
2911  if (isTypeIdInParens()) {
2912  ParseSpecifierQualifierList(D.getMutableDeclSpec());
2914  ParseDeclarator(D);
2915  return D.isInvalidType();
2916  }
2917 
2918  // It's not a type, it has to be an expression list.
2919  // Discard the comma locations - ActOnCXXNew has enough parameters.
2920  CommaLocsTy CommaLocs;
2921  return ParseExpressionList(PlacementArgs, CommaLocs);
2922 }
2923 
2924 /// ParseCXXDeleteExpression - Parse a C++ delete-expression. Delete is used
2925 /// to free memory allocated by new.
2926 ///
2927 /// This method is called to parse the 'delete' expression after the optional
2928 /// '::' has been already parsed. If the '::' was present, "UseGlobal" is true
2929 /// and "Start" is its location. Otherwise, "Start" is the location of the
2930 /// 'delete' token.
2931 ///
2932 /// delete-expression:
2933 /// '::'[opt] 'delete' cast-expression
2934 /// '::'[opt] 'delete' '[' ']' cast-expression
2935 ExprResult
2936 Parser::ParseCXXDeleteExpression(bool UseGlobal, SourceLocation Start) {
2937  assert(Tok.is(tok::kw_delete) && "Expected 'delete' keyword");
2938  ConsumeToken(); // Consume 'delete'
2939 
2940  // Array delete?
2941  bool ArrayDelete = false;
2942  if (Tok.is(tok::l_square) && NextToken().is(tok::r_square)) {
2943  // C++11 [expr.delete]p1:
2944  // Whenever the delete keyword is followed by empty square brackets, it
2945  // shall be interpreted as [array delete].
2946  // [Footnote: A lambda expression with a lambda-introducer that consists
2947  // of empty square brackets can follow the delete keyword if
2948  // the lambda expression is enclosed in parentheses.]
2949  // FIXME: Produce a better diagnostic if the '[]' is unambiguously a
2950  // lambda-introducer.
2951  ArrayDelete = true;
2952  BalancedDelimiterTracker T(*this, tok::l_square);
2953 
2954  T.consumeOpen();
2955  T.consumeClose();
2956  if (T.getCloseLocation().isInvalid())
2957  return ExprError();
2958  }
2959 
2960  ExprResult Operand(ParseCastExpression(false));
2961  if (Operand.isInvalid())
2962  return Operand;
2963 
2964  return Actions.ActOnCXXDelete(Start, UseGlobal, ArrayDelete, Operand.get());
2965 }
2966 
2968  switch (kind) {
2969  default: llvm_unreachable("Not a known type trait");
2970 #define TYPE_TRAIT_1(Spelling, Name, Key) \
2971 case tok::kw_ ## Spelling: return UTT_ ## Name;
2972 #define TYPE_TRAIT_2(Spelling, Name, Key) \
2973 case tok::kw_ ## Spelling: return BTT_ ## Name;
2974 #include "clang/Basic/TokenKinds.def"
2975 #define TYPE_TRAIT_N(Spelling, Name, Key) \
2976  case tok::kw_ ## Spelling: return TT_ ## Name;
2977 #include "clang/Basic/TokenKinds.def"
2978  }
2979 }
2980 
2982  switch(kind) {
2983  default: llvm_unreachable("Not a known binary type trait");
2984  case tok::kw___array_rank: return ATT_ArrayRank;
2985  case tok::kw___array_extent: return ATT_ArrayExtent;
2986  }
2987 }
2988 
2990  switch(kind) {
2991  default: llvm_unreachable("Not a known unary expression trait.");
2992  case tok::kw___is_lvalue_expr: return ET_IsLValueExpr;
2993  case tok::kw___is_rvalue_expr: return ET_IsRValueExpr;
2994  }
2995 }
2996 
2998  switch (kind) {
2999  default: llvm_unreachable("Not a known type trait");
3000 #define TYPE_TRAIT(N,Spelling,K) case tok::kw_##Spelling: return N;
3001 #include "clang/Basic/TokenKinds.def"
3002  }
3003 }
3004 
3005 /// Parse the built-in type-trait pseudo-functions that allow
3006 /// implementation of the TR1/C++11 type traits templates.
3007 ///
3008 /// primary-expression:
3009 /// unary-type-trait '(' type-id ')'
3010 /// binary-type-trait '(' type-id ',' type-id ')'
3011 /// type-trait '(' type-id-seq ')'
3012 ///
3013 /// type-id-seq:
3014 /// type-id ...[opt] type-id-seq[opt]
3015 ///
3016 ExprResult Parser::ParseTypeTrait() {
3017  tok::TokenKind Kind = Tok.getKind();
3018  unsigned Arity = TypeTraitArity(Kind);
3019 
3020  SourceLocation Loc = ConsumeToken();
3021 
3022  BalancedDelimiterTracker Parens(*this, tok::l_paren);
3023  if (Parens.expectAndConsume())
3024  return ExprError();
3025 
3027  do {
3028  // Parse the next type.
3029  TypeResult Ty = ParseTypeName();
3030  if (Ty.isInvalid()) {
3031  Parens.skipToEnd();
3032  return ExprError();
3033  }
3034 
3035  // Parse the ellipsis, if present.
3036  if (Tok.is(tok::ellipsis)) {
3037  Ty = Actions.ActOnPackExpansion(Ty.get(), ConsumeToken());
3038  if (Ty.isInvalid()) {
3039  Parens.skipToEnd();
3040  return ExprError();
3041  }
3042  }
3043 
3044  // Add this type to the list of arguments.
3045  Args.push_back(Ty.get());
3046  } while (TryConsumeToken(tok::comma));
3047 
3048  if (Parens.consumeClose())
3049  return ExprError();
3050 
3051  SourceLocation EndLoc = Parens.getCloseLocation();
3052 
3053  if (Arity && Args.size() != Arity) {
3054  Diag(EndLoc, diag::err_type_trait_arity)
3055  << Arity << 0 << (Arity > 1) << (int)Args.size() << SourceRange(Loc);
3056  return ExprError();
3057  }
3058 
3059  if (!Arity && Args.empty()) {
3060  Diag(EndLoc, diag::err_type_trait_arity)
3061  << 1 << 1 << 1 << (int)Args.size() << SourceRange(Loc);
3062  return ExprError();
3063  }
3064 
3065  return Actions.ActOnTypeTrait(TypeTraitFromTokKind(Kind), Loc, Args, EndLoc);
3066 }
3067 
3068 /// ParseArrayTypeTrait - Parse the built-in array type-trait
3069 /// pseudo-functions.
3070 ///
3071 /// primary-expression:
3072 /// [Embarcadero] '__array_rank' '(' type-id ')'
3073 /// [Embarcadero] '__array_extent' '(' type-id ',' expression ')'
3074 ///
3075 ExprResult Parser::ParseArrayTypeTrait() {
3077  SourceLocation Loc = ConsumeToken();
3078 
3079  BalancedDelimiterTracker T(*this, tok::l_paren);
3080  if (T.expectAndConsume())
3081  return ExprError();
3082 
3083  TypeResult Ty = ParseTypeName();
3084  if (Ty.isInvalid()) {
3085  SkipUntil(tok::comma, StopAtSemi);
3086  SkipUntil(tok::r_paren, StopAtSemi);
3087  return ExprError();
3088  }
3089 
3090  switch (ATT) {
3091  case ATT_ArrayRank: {
3092  T.consumeClose();
3093  return Actions.ActOnArrayTypeTrait(ATT, Loc, Ty.get(), nullptr,
3094  T.getCloseLocation());
3095  }
3096  case ATT_ArrayExtent: {
3097  if (ExpectAndConsume(tok::comma)) {
3098  SkipUntil(tok::r_paren, StopAtSemi);
3099  return ExprError();
3100  }
3101 
3102  ExprResult DimExpr = ParseExpression();
3103  T.consumeClose();
3104 
3105  return Actions.ActOnArrayTypeTrait(ATT, Loc, Ty.get(), DimExpr.get(),
3106  T.getCloseLocation());
3107  }
3108  }
3109  llvm_unreachable("Invalid ArrayTypeTrait!");
3110 }
3111 
3112 /// ParseExpressionTrait - Parse built-in expression-trait
3113 /// pseudo-functions like __is_lvalue_expr( xxx ).
3114 ///
3115 /// primary-expression:
3116 /// [Embarcadero] expression-trait '(' expression ')'
3117 ///
3118 ExprResult Parser::ParseExpressionTrait() {
3120  SourceLocation Loc = ConsumeToken();
3121 
3122  BalancedDelimiterTracker T(*this, tok::l_paren);
3123  if (T.expectAndConsume())
3124  return ExprError();
3125 
3127 
3128  T.consumeClose();
3129 
3130  return Actions.ActOnExpressionTrait(ET, Loc, Expr.get(),
3131  T.getCloseLocation());
3132 }
3133 
3134 
3135 /// ParseCXXAmbiguousParenExpression - We have parsed the left paren of a
3136 /// parenthesized ambiguous type-id. This uses tentative parsing to disambiguate
3137 /// based on the context past the parens.
3138 ExprResult
3139 Parser::ParseCXXAmbiguousParenExpression(ParenParseOption &ExprType,
3140  ParsedType &CastTy,
3141  BalancedDelimiterTracker &Tracker,
3142  ColonProtectionRAIIObject &ColonProt) {
3143  assert(getLangOpts().CPlusPlus && "Should only be called for C++!");
3144  assert(ExprType == CastExpr && "Compound literals are not ambiguous!");
3145  assert(isTypeIdInParens() && "Not a type-id!");
3146 
3147  ExprResult Result(true);
3148  CastTy = nullptr;
3149 
3150  // We need to disambiguate a very ugly part of the C++ syntax:
3151  //
3152  // (T())x; - type-id
3153  // (T())*x; - type-id
3154  // (T())/x; - expression
3155  // (T()); - expression
3156  //
3157  // The bad news is that we cannot use the specialized tentative parser, since
3158  // it can only verify that the thing inside the parens can be parsed as
3159  // type-id, it is not useful for determining the context past the parens.
3160  //
3161  // The good news is that the parser can disambiguate this part without
3162  // making any unnecessary Action calls.
3163  //
3164  // It uses a scheme similar to parsing inline methods. The parenthesized
3165  // tokens are cached, the context that follows is determined (possibly by
3166  // parsing a cast-expression), and then we re-introduce the cached tokens
3167  // into the token stream and parse them appropriately.
3168 
3169  ParenParseOption ParseAs;
3170  CachedTokens Toks;
3171 
3172  // Store the tokens of the parentheses. We will parse them after we determine
3173  // the context that follows them.
3174  if (!ConsumeAndStoreUntil(tok::r_paren, Toks)) {
3175  // We didn't find the ')' we expected.
3176  Tracker.consumeClose();
3177  return ExprError();
3178  }
3179 
3180  if (Tok.is(tok::l_brace)) {
3181  ParseAs = CompoundLiteral;
3182  } else {
3183  bool NotCastExpr;
3184  if (Tok.is(tok::l_paren) && NextToken().is(tok::r_paren)) {
3185  NotCastExpr = true;
3186  } else {
3187  // Try parsing the cast-expression that may follow.
3188  // If it is not a cast-expression, NotCastExpr will be true and no token
3189  // will be consumed.
3190  ColonProt.restore();
3191  Result = ParseCastExpression(false/*isUnaryExpression*/,
3192  false/*isAddressofOperand*/,
3193  NotCastExpr,
3194  // type-id has priority.
3195  IsTypeCast);
3196  }
3197 
3198  // If we parsed a cast-expression, it's really a type-id, otherwise it's
3199  // an expression.
3200  ParseAs = NotCastExpr ? SimpleExpr : CastExpr;
3201  }
3202 
3203  // Create a fake EOF to mark end of Toks buffer.
3204  Token AttrEnd;
3205  AttrEnd.startToken();
3206  AttrEnd.setKind(tok::eof);
3207  AttrEnd.setLocation(Tok.getLocation());
3208  AttrEnd.setEofData(Toks.data());
3209  Toks.push_back(AttrEnd);
3210 
3211  // The current token should go after the cached tokens.
3212  Toks.push_back(Tok);
3213  // Re-enter the stored parenthesized tokens into the token stream, so we may
3214  // parse them now.
3215  PP.EnterTokenStream(Toks, true /*DisableMacroExpansion*/);
3216  // Drop the current token and bring the first cached one. It's the same token
3217  // as when we entered this function.
3218  ConsumeAnyToken();
3219 
3220  if (ParseAs >= CompoundLiteral) {
3221  // Parse the type declarator.
3222  DeclSpec DS(AttrFactory);
3223  Declarator DeclaratorInfo(DS, DeclaratorContext::TypeNameContext);
3224  {
3225  ColonProtectionRAIIObject InnerColonProtection(*this);
3226  ParseSpecifierQualifierList(DS);
3227  ParseDeclarator(DeclaratorInfo);
3228  }
3229 
3230  // Match the ')'.
3231  Tracker.consumeClose();
3232  ColonProt.restore();
3233 
3234  // Consume EOF marker for Toks buffer.
3235  assert(Tok.is(tok::eof) && Tok.getEofData() == AttrEnd.getEofData());
3236  ConsumeAnyToken();
3237 
3238  if (ParseAs == CompoundLiteral) {
3239  ExprType = CompoundLiteral;
3240  if (DeclaratorInfo.isInvalidType())
3241  return ExprError();
3242 
3243  TypeResult Ty = Actions.ActOnTypeName(getCurScope(), DeclaratorInfo);
3244  return ParseCompoundLiteralExpression(Ty.get(),
3245  Tracker.getOpenLocation(),
3246  Tracker.getCloseLocation());
3247  }
3248 
3249  // We parsed '(' type-id ')' and the thing after it wasn't a '{'.
3250  assert(ParseAs == CastExpr);
3251 
3252  if (DeclaratorInfo.isInvalidType())
3253  return ExprError();
3254 
3255  // Result is what ParseCastExpression returned earlier.
3256  if (!Result.isInvalid())
3257  Result = Actions.ActOnCastExpr(getCurScope(), Tracker.getOpenLocation(),
3258  DeclaratorInfo, CastTy,
3259  Tracker.getCloseLocation(), Result.get());
3260  return Result;
3261  }
3262 
3263  // Not a compound literal, and not followed by a cast-expression.
3264  assert(ParseAs == SimpleExpr);
3265 
3266  ExprType = SimpleExpr;
3267  Result = ParseExpression();
3268  if (!Result.isInvalid() && Tok.is(tok::r_paren))
3269  Result = Actions.ActOnParenExpr(Tracker.getOpenLocation(),
3270  Tok.getLocation(), Result.get());
3271 
3272  // Match the ')'.
3273  if (Result.isInvalid()) {
3274  while (Tok.isNot(tok::eof))
3275  ConsumeAnyToken();
3276  assert(Tok.getEofData() == AttrEnd.getEofData());
3277  ConsumeAnyToken();
3278  return ExprError();
3279  }
3280 
3281  Tracker.consumeClose();
3282  // Consume EOF marker for Toks buffer.
3283  assert(Tok.is(tok::eof) && Tok.getEofData() == AttrEnd.getEofData());
3284  ConsumeAnyToken();
3285  return Result;
3286 }
static TypeTrait TypeTraitFromTokKind(tok::TokenKind kind)
Defines the clang::ASTContext interface.
void setConstructorName(ParsedType ClassType, SourceLocation ClassNameLoc, SourceLocation EndLoc)
Specify that this unqualified-id was parsed as a constructor name.
Definition: DeclSpec.h:1070
ConditionResult ActOnCondition(Scope *S, SourceLocation Loc, Expr *SubExpr, ConditionKind CK)
Definition: SemaExpr.cpp:15807
ExprResult ActOnArrayTypeTrait(ArrayTypeTrait ATT, SourceLocation KWLoc, ParsedType LhsTy, Expr *DimExpr, SourceLocation RParen)
ActOnArrayTypeTrait - Parsed one of the binary type trait support pseudo-functions.
StringRef getUDSuffix() const
ExprResult ActOnCastExpr(Scope *S, SourceLocation LParenLoc, Declarator &D, ParsedType &Ty, SourceLocation RParenLoc, Expr *CastExpr)
Definition: SemaExpr.cpp:6150
SourceLocation getLocWithOffset(int Offset) const
Return a source location with the specified offset from this SourceLocation.
no exception specification
PtrTy get() const
Definition: Ownership.h:81
ExprResult ParseExpression(TypeCastState isTypeCast=NotTypeCast)
Simple precedence-based parser for binary/ternary operators.
Definition: ParseExpr.cpp:123
void restore()
restore - This can be used to restore the state early, before the dtor is run.
Keeps information about an identifier in a nested-name-spec.
Definition: Sema.h:5365
This is a scope that corresponds to the parameters within a function prototype.
Definition: Scope.h:81
ConditionResult ActOnConditionVariable(Decl *ConditionVar, SourceLocation StmtLoc, ConditionKind CK)
bool checkLiteralOperatorId(const CXXScopeSpec &SS, const UnqualifiedId &Id)
SourceRange getSourceRange() const LLVM_READONLY
Return the source range that covers this unqualified-id.
Definition: DeclSpec.h:1122
static const TSS TSS_unsigned
Definition: DeclSpec.h:268
bool ActOnCXXNestedNameSpecifier(Scope *S, NestedNameSpecInfo &IdInfo, bool EnteringContext, CXXScopeSpec &SS, bool ErrorRecoveryLookup=false, bool *IsCorrectedToColon=nullptr, bool OnlyNamespace=false)
The parser has parsed a nested-name-specifier &#39;identifier::&#39;.
SourceLocation StartLocation
The location of the first token that describes this unqualified-id, which will be the location of the...
Definition: DeclSpec.h:980
IdentifierInfo * Name
FIXME: Temporarily stores the name of a specialization.
static const TST TST_wchar
Definition: DeclSpec.h:275
ExprResult ActOnParenListExpr(SourceLocation L, SourceLocation R, MultiExprArg Val)
Definition: SemaExpr.cpp:6323
SourceLocation TemplateNameLoc
TemplateNameLoc - The location of the template name within the source.
static ConditionResult ConditionError()
Definition: Sema.h:9822
const Token & LookAhead(unsigned N)
Peeks ahead N tokens and returns that token without consuming any tokens.
Stmt - This represents one statement.
Definition: Stmt.h:66
IdentifierInfo * Identifier
When Kind == IK_Identifier, the parsed identifier, or when Kind == IK_UserLiteralId, the identifier suffix.
Definition: DeclSpec.h:950
TemplateNameKind isTemplateName(Scope *S, CXXScopeSpec &SS, bool hasTemplateKeyword, const UnqualifiedId &Name, ParsedType ObjectType, bool EnteringContext, TemplateTy &Template, bool &MemberOfUnknownSpecialization)
StmtResult ActOnExprStmt(ExprResult Arg)
Definition: SemaStmt.cpp:45
bool is(tok::TokenKind K) const
is/isNot - Predicates to check if this token is a specific kind, as in "if (Tok.is(tok::l_brace)) {...
Definition: Token.h:95
bool isEmpty() const
No scope specifier.
Definition: DeclSpec.h:189
DeclResult ActOnCXXConditionDeclaration(Scope *S, Declarator &D)
ActOnCXXConditionDeclarationExpr - Parsed a condition declaration of a C++ if/switch/while/for statem...
void setEndLoc(SourceLocation Loc)
Definition: DeclSpec.h:71
static const TST TST_char16
Definition: DeclSpec.h:277
Decl - This represents one declaration (or definition), e.g.
Definition: DeclBase.h:86
Defines the PrettyStackTraceEntry class, which is used to make crashes give more contextual informati...
bool SetConstexprSpec(SourceLocation Loc, const char *&PrevSpec, unsigned &DiagID)
Definition: DeclSpec.cpp:978
Defines the C++ template declaration subclasses.
StringRef P
The base class of the type hierarchy.
Definition: Type.h:1428
SourceLocation getCloseLocation() const
This indicates that the scope corresponds to a function, which means that labels are set here...
Definition: Scope.h:47
void CodeCompleteQualifiedId(Scope *S, CXXScopeSpec &SS, bool EnteringContext)
Parser - This implements a parser for the C family of languages.
Definition: Parser.h:57
An overloaded operator name, e.g., operator+.
bool IsInvalidUnlessNestedName(Scope *S, CXXScopeSpec &SS, NestedNameSpecInfo &IdInfo, bool EnteringContext)
IsInvalidUnlessNestedName - This method is used for error recovery purposes to determine whether the ...
ExprResult ActOnExpressionTrait(ExpressionTrait OET, SourceLocation KWLoc, Expr *Queried, SourceLocation RParen)
ActOnExpressionTrait - Parsed one of the unary type trait support pseudo-functions.
static TemplateIdAnnotation * Create(CXXScopeSpec SS, SourceLocation TemplateKWLoc, SourceLocation TemplateNameLoc, IdentifierInfo *Name, OverloadedOperatorKind OperatorKind, ParsedTemplateTy OpaqueTemplateName, TemplateNameKind TemplateKind, SourceLocation LAngleLoc, SourceLocation RAngleLoc, ArrayRef< ParsedTemplateArgument > TemplateArgs, SmallVectorImpl< TemplateIdAnnotation *> &CleanupList)
Creates a new TemplateIdAnnotation with NumArgs arguments and appends it to List. ...
void CodeCompleteObjCMessageReceiver(Scope *S)
RAII object that enters a new expression evaluation context.
Definition: Sema.h:10734
void EnterToken(const Token &Tok)
Enters a token in the token stream to be lexed next.
ActionResult< Stmt * > StmtResult
Definition: Ownership.h:268
Information about one declarator, including the parsed type information and the identifier.
Definition: DeclSpec.h:1752
static const TST TST_char
Definition: DeclSpec.h:274
Like System, but searched after the system directories.
void setBegin(SourceLocation b)
Describes how types, statements, expressions, and declarations should be printed. ...
Definition: PrettyPrinter.h:38
RAII object that makes sure paren/bracket/brace count is correct after declaration/statement parsing...
ColonProtectionRAIIObject - This sets the Parser::ColonIsSacred bool and restores it when destroyed...
bool isUnset() const
Definition: Ownership.h:172
tok::TokenKind getKind() const
Definition: Token.h:90
bool SkipUntil(tok::TokenKind T, SkipUntilFlags Flags=static_cast< SkipUntilFlags >(0))
SkipUntil - Read tokens until we get to the specified token, then consume it (unless StopBeforeMatch ...
Definition: Parser.h:1039
Information about a template-id annotation token.
void CodeCompleteOrdinaryName(Scope *S, ParserCompletionContext CompletionContext)
const Token & NextToken()
NextToken - This peeks ahead one token and returns it without consuming it.
Definition: Parser.h:707
SourceLocation getLocForEndOfToken(SourceLocation Loc, unsigned Offset=0)
Computes the source location just past the end of the token at this source location.
bool TryConsumeToken(tok::TokenKind Expected)
Definition: Parser.h:412
bool ActOnCXXNestedNameSpecifierDecltype(CXXScopeSpec &SS, const DeclSpec &DS, SourceLocation ColonColonLoc)
One of these records is kept for each identifier that is lexed.
void setConstructorTemplateId(TemplateIdAnnotation *TemplateId)
Specify that this unqualified-id was parsed as a template-id that names a constructor.
Definition: DeclSpec.cpp:39
SourceLocation getAnnotationEndLoc() const
Definition: Token.h:138
sema::LambdaScopeInfo * getCurGenericLambda()
Retrieve the current generic lambda info, if any.
Definition: Sema.cpp:1505
static const TST TST_char8
Definition: DeclSpec.h:276
ExprResult ExprEmpty()
Definition: Ownership.h:289
void setConversionFunctionId(SourceLocation OperatorLoc, ParsedType Ty, SourceLocation EndLoc)
Specify that this unqualified-id was parsed as a conversion-function-id.
Definition: DeclSpec.h:1038
void CodeCompleteConstructor(Scope *S, QualType Type, SourceLocation Loc, ArrayRef< Expr *> Args)
LambdaCaptureKind
The different capture forms in a lambda introducer.
Definition: Lambda.h:34
The current expression is potentially evaluated at run time, which means that code may be generated t...
bool ShouldEnterDeclaratorScope(Scope *S, const CXXScopeSpec &SS)
OverloadedOperatorKind Operator
The kind of overloaded operator.
Definition: DeclSpec.h:933
static const TST TST_double
Definition: DeclSpec.h:283
struct OFI OperatorFunctionId
When Kind == IK_OperatorFunctionId, the overloaded operator that we parsed.
Definition: DeclSpec.h:954
ExprResult ActOnCXXUuidof(SourceLocation OpLoc, SourceLocation LParenLoc, bool isType, void *TyOrExpr, SourceLocation RParenLoc)
ActOnCXXUuidof - Parse __uuidof( something ).
Token - This structure provides full information about a lexed token.
Definition: Token.h:35
void setKind(tok::TokenKind K)
Definition: Token.h:91
RAII class that helps handle the parsing of an open/close delimiter pair, such as braces { ...
ParsedType getDestructorName(SourceLocation TildeLoc, IdentifierInfo &II, SourceLocation NameLoc, Scope *S, CXXScopeSpec &SS, ParsedType ObjectType, bool EnteringContext)
A user-defined literal name, e.g., operator "" _i.
void SetSourceRange(SourceRange R)
Definition: DeclSpec.h:1882
bool isInvalidType() const
Definition: DeclSpec.h:2432
void CodeCompleteLambdaIntroducer(Scope *S, LambdaIntroducer &Intro, bool AfterAmpersand)
UnionParsedType DestructorName
When Kind == IK_DestructorName, the type referred to by the class-name.
Definition: DeclSpec.h:966
This is a scope that corresponds to a block/closure object.
Definition: Scope.h:71
ExprResult ActOnCXXThrow(Scope *S, SourceLocation OpLoc, Expr *expr)
ActOnCXXThrow - Parse throw expressions.
Represents a C++ unqualified-id that has been parsed.
Definition: DeclSpec.h:922
static ParsedType getTypeAnnotation(const Token &Tok)
getTypeAnnotation - Read a parsed type out of an annotation token.
Definition: Parser.h:712
PtrTy get() const
Definition: Ownership.h:174
< Capturing the *this object by copy
Definition: Lambda.h:37
void ActOnInitializerError(Decl *Dcl)
ActOnInitializerError - Given that there was an error parsing an initializer for the given declaratio...
Definition: SemaDecl.cpp:11353
ExprResult CorrectDelayedTyposInExpr(Expr *E, VarDecl *InitDecl=nullptr, llvm::function_ref< ExprResult(Expr *)> Filter=[](Expr *E) -> ExprResult { return E;})
Process any TypoExprs in the given Expr and its children, generating diagnostics as appropriate and r...
const clang::PrintingPolicy & getPrintingPolicy() const
Definition: ASTContext.h:643
SourceRange getAnnotationRange() const
SourceRange of the group of tokens that this annotation token represents.
Definition: Token.h:158
ParsedTemplateArgument * getTemplateArgs()
Retrieves a pointer to the template arguments.
If a crash happens while one of these objects are live, the message is printed out along with the spe...
void SetInvalid(SourceRange R)
Indicate that this nested-name-specifier is invalid.
Definition: DeclSpec.h:199
ExprResult ActOnCXXThis(SourceLocation loc)
static SourceLocation AdvanceToTokenCharacter(SourceLocation TokStart, unsigned Characters, const SourceManager &SM, const LangOptions &LangOpts)
AdvanceToTokenCharacter - If the current SourceLocation specifies a location at the start of a token...
Definition: Lexer.h:349
Represents a C++ nested-name-specifier or a global scope specifier.
Definition: DeclSpec.h:63
CastExpr - Base class for type casts, including both implicit casts (ImplicitCastExpr) and explicit c...
Definition: Expr.h:2827
SourceLocation getSpellingLoc(SourceLocation Loc) const
Given a SourceLocation object, return the spelling location referenced by the ID. ...
ArrayTypeTrait
Names for the array type traits.
Definition: TypeTraits.h:91
SourceLocation ConsumeAnyToken(bool ConsumeCodeCompletionTok=false)
ConsumeAnyToken - Dispatch to the right Consume* method based on the current token type...
Definition: Parser.h:432
void setTemplateId(TemplateIdAnnotation *TemplateId)
Specify that this unqualified-id was parsed as a template-id.
Definition: DeclSpec.cpp:31
LambdaCaptureInitKind
Definition: DeclSpec.h:2530
SourceRange getSourceRange() const LLVM_READONLY
Definition: DeclSpec.h:507
const char * getName() const
Definition: Token.h:166
bool isNonTypeNestedNameSpecifier(Scope *S, CXXScopeSpec &SS, NestedNameSpecInfo &IdInfo)
SourceLocation TemplateKWLoc
TemplateKWLoc - The location of the template keyword.
static const TST TST_float
Definition: DeclSpec.h:282
TypeTrait
Names for traits that operate specifically on types.
Definition: TypeTraits.h:21
SourceLocation LAngleLoc
The location of the &#39;<&#39; before the template argument list.
DeclSpec & getMutableDeclSpec()
getMutableDeclSpec - Return a non-const version of the DeclSpec.
Definition: DeclSpec.h:1848
static const TSW TSW_long
Definition: DeclSpec.h:255
StmtResult ActOnDeclStmt(DeclGroupPtrTy Decl, SourceLocation StartLoc, SourceLocation EndLoc)
Definition: SemaStmt.cpp:73
void SetRangeStart(SourceLocation Loc)
Definition: DeclSpec.h:616
void addCapture(LambdaCaptureKind Kind, SourceLocation Loc, IdentifierInfo *Id, SourceLocation EllipsisLoc, LambdaCaptureInitKind InitKind, ExprResult Init, ParsedType InitCaptureType, SourceRange ExplicitRange)
Append a capture in a lambda introducer.
Definition: DeclSpec.h:2569
SourceRange getRange() const
Definition: DeclSpec.h:68
SmallVector< LambdaCapture, 4 > Captures
Definition: DeclSpec.h:2563
TST getTypeSpecType() const
Definition: DeclSpec.h:483
ExprResult ActOnLambdaExpr(SourceLocation StartLoc, Stmt *Body, Scope *CurScope)
ActOnLambdaExpr - This is called when the body of a lambda expression was successfully completed...
Expr - This represents one expression.
Definition: Expr.h:106
bool ActOnCXXGlobalScopeSpecifier(SourceLocation CCLoc, CXXScopeSpec &SS)
The parser has parsed a global nested-name-specifier &#39;::&#39;.
void setDeductionGuideName(ParsedTemplateTy Template, SourceLocation TemplateLoc)
Specify that this unqualified-id was parsed as a template-name for a deduction-guide.
Definition: DeclSpec.h:1114
static DeclaratorChunk getFunction(bool HasProto, bool IsAmbiguous, SourceLocation LParenLoc, ParamInfo *Params, unsigned NumParams, SourceLocation EllipsisLoc, SourceLocation RParenLoc, unsigned TypeQuals, bool RefQualifierIsLvalueRef, SourceLocation RefQualifierLoc, SourceLocation ConstQualifierLoc, SourceLocation VolatileQualifierLoc, SourceLocation RestrictQualifierLoc, SourceLocation MutableLoc, ExceptionSpecificationType ESpecType, SourceRange ESpecRange, ParsedType *Exceptions, SourceRange *ExceptionRanges, unsigned NumExceptions, Expr *NoexceptExpr, CachedTokens *ExceptionSpecTokens, ArrayRef< NamedDecl *> DeclsInPrototype, SourceLocation LocalRangeBegin, SourceLocation LocalRangeEnd, Declarator &TheDeclarator, TypeResult TrailingReturnType=TypeResult())
DeclaratorChunk::getFunction - Return a DeclaratorChunk for a function.
Definition: DeclSpec.cpp:152
int Id
Definition: ASTDiff.cpp:191
void AnnotateCachedTokens(const Token &Tok)
We notify the Preprocessor that if it is caching tokens (because backtrack is enabled) it should repl...
ParsedType getDestructorTypeForDecltype(const DeclSpec &DS, ParsedType ObjectType)
This file defines the classes used to store parsed information about declaration-specifiers and decla...
bool ParseUnqualifiedId(CXXScopeSpec &SS, bool EnteringContext, bool AllowDestructorName, bool AllowConstructorName, bool AllowDeductionGuide, ParsedType ObjectType, SourceLocation *TemplateKWLoc, UnqualifiedId &Result)
Parse a C++ unqualified-id (or a C identifier), which describes the name of an entity.
TypeResult ActOnTypeName(Scope *S, Declarator &D)
Definition: SemaType.cpp:5693
OpaquePtr< T > get() const
Definition: Ownership.h:105
void setEofData(const void *D)
Definition: Token.h:194
void RevertCachedTokens(unsigned N)
When backtracking is enabled and tokens are cached, this allows to revert a specific number of tokens...
ExprResult ActOnPseudoDestructorExpr(Scope *S, Expr *Base, SourceLocation OpLoc, tok::TokenKind OpKind, CXXScopeSpec &SS, UnqualifiedId &FirstTypeName, SourceLocation CCLoc, SourceLocation TildeLoc, UnqualifiedId &SecondTypeName)
const Token & getCurToken() const
Definition: Parser.h:365
OpaquePtr< TemplateName > TemplateTy
Definition: Parser.h:376
SourceLocation getLocation() const
Return a source location identifier for the specified offset in the current file. ...
Definition: Token.h:124
void setAsmLabel(Expr *E)
Definition: DeclSpec.h:2419
SourceLocation getBeginLoc() const
Definition: DeclSpec.h:72
Represents a C++ template name within the type system.
Definition: TemplateName.h:178
This is a compound statement scope.
Definition: Scope.h:130
UnqualifiedIdKind getKind() const
Determine what kind of name we have.
Definition: DeclSpec.h:1004
The current expression and its subexpressions occur within an unevaluated operand (C++11 [expr]p7)...
TemplateNameKind
Specifies the kind of template name that an identifier refers to.
Definition: TemplateKinds.h:21
ExprResult ActOnTypeTrait(TypeTrait Kind, SourceLocation KWLoc, ArrayRef< ParsedType > Args, SourceLocation RParenLoc)
Parsed one of the type trait support pseudo-functions.
void setLiteralOperatorId(const IdentifierInfo *Id, SourceLocation OpLoc, SourceLocation IdLoc)
Specific that this unqualified-id was parsed as a literal-operator-id.
Definition: DeclSpec.h:1055
static const TST TST_int
Definition: DeclSpec.h:279
StmtResult ActOnNullStmt(SourceLocation SemiLoc, bool HasLeadingEmptyMacro=false)
Definition: SemaStmt.cpp:68
ConditionKind
Definition: Sema.h:9824
bool isInvalid() const
Definition: Ownership.h:170
SourceLocation getEnd() const
bool SetTypeSpecSign(TSS S, SourceLocation Loc, const char *&PrevSpec, unsigned &DiagID)
Definition: DeclSpec.cpp:660
SourceLocation getOpenLocation() const
static const TST TST_half
Definition: DeclSpec.h:281
ExprResult ActOnCXXDelete(SourceLocation StartLoc, bool UseGlobal, bool ArrayForm, Expr *Operand)
ActOnCXXDelete - Parsed a C++ &#39;delete&#39; expression.
bool isUsable() const
Definition: Ownership.h:171
sema::LambdaScopeInfo * PushLambdaScope()
Definition: Sema.cpp:1387
The result type of a method or function.
static const TSW TSW_short
Definition: DeclSpec.h:254
StringRef GetString() const
ParsedTemplateArgument ActOnPackExpansion(const ParsedTemplateArgument &Arg, SourceLocation EllipsisLoc)
Invoked when parsing a template argument followed by an ellipsis, which creates a pack expansion...
const SourceManager & SM
Definition: Format.cpp:1475
bool isValid() const
Determine whether this unqualified-id refers to a valid name.
Definition: DeclSpec.h:998
OpaquePtr< DeclGroupRef > DeclGroupPtrTy
Definition: Parser.h:375
const LangOptions & getLangOpts() const
Definition: Parser.h:359
bool SetTypeSpecWidth(TSW W, SourceLocation Loc, const char *&PrevSpec, unsigned &DiagID, const PrintingPolicy &Policy)
These methods set the specified attribute of the DeclSpec, but return true and ignore the request if ...
Definition: DeclSpec.cpp:633
This is a scope that corresponds to the parameters within a function prototype for a function declara...
Definition: Scope.h:87
ExprResult ActOnParenExpr(SourceLocation L, SourceLocation R, Expr *E)
Definition: SemaExpr.cpp:3558
SourceManager & getSourceManager() const
Definition: Preprocessor.h:825
static const TST TST_char32
Definition: DeclSpec.h:278
unsigned getUDSuffixOffset() const
Get the spelling offset of the first byte of the ud-suffix.
SourceLocation DefaultLoc
Definition: DeclSpec.h:2561
Kind
Stop skipping at semicolon.
Definition: Parser.h:1019
ActionResult - This structure is used while parsing/acting on expressions, stmts, etc...
Definition: Ownership.h:157
unsigned getUDSuffixToken() const
Get the index of a token containing a ud-suffix.
ASTContext & getASTContext() const
Definition: Sema.h:1211
static const TST TST_float16
Definition: DeclSpec.h:284
Encodes a location in the source.
IdentifierInfo & get(StringRef Name)
Return the identifier token info for the specified named identifier.
void setLength(unsigned Len)
Definition: Token.h:133
static void addConstexprToLambdaDeclSpecifier(Parser &P, SourceLocation ConstexprLoc, DeclSpec &DS)
void FinalizeDeclaration(Decl *D)
FinalizeDeclaration - called by ParseDeclarationAfterDeclarator to perform any semantic actions neces...
Definition: SemaDecl.cpp:11945
MutableArrayRef< Expr * > MultiExprArg
Definition: Ownership.h:277
bool isDeductionGuideName(Scope *S, const IdentifierInfo &Name, SourceLocation NameLoc, ParsedTemplateTy *Template=nullptr)
Determine whether a particular identifier might be the name in a C++1z deduction-guide declaration...
SourceLocation getLocStart() const LLVM_READONLY
Definition: Stmt.h:401
IdentifierInfo * getIdentifierInfo() const
Definition: Token.h:177
void setAnnotationEndLoc(SourceLocation L)
Definition: Token.h:142
IdentifierTable & getIdentifierTable()
Definition: Preprocessor.h:829
ParsedAttr - Represents a syntactic attribute.
Definition: ParsedAttr.h:105
static const TSS TSS_signed
Definition: DeclSpec.h:267
ExprResult ActOnCXXNamedCast(SourceLocation OpLoc, tok::TokenKind Kind, SourceLocation LAngleBracketLoc, Declarator &D, SourceLocation RAngleBracketLoc, SourceLocation LParenLoc, Expr *E, SourceLocation RParenLoc)
ActOnCXXNamedCast - Parse {dynamic,static,reinterpret,const}_cast&#39;s.
Definition: SemaCast.cpp:232
void CodeCompleteOperatorName(Scope *S)
void Lex(Token &Result)
Lex the next token for this preprocessor.
ExprResult ActOnCXXTypeConstructExpr(ParsedType TypeRep, SourceLocation LParenOrBraceLoc, MultiExprArg Exprs, SourceLocation RParenOrBraceLoc, bool ListInitialization)
ActOnCXXTypeConstructExpr - Parse construction of a specified type.
const void * getEofData() const
Definition: Token.h:190
TemplateNameKind ActOnDependentTemplateName(Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, const UnqualifiedId &Name, ParsedType ObjectType, bool EnteringContext, TemplateTy &Template, bool AllowInjectedClassName=false)
Form a dependent template name.
TokenKind
Provides a simple uniform namespace for tokens from all C languages.
Definition: TokenKinds.h:25
SourceLocation getLocEnd() const LLVM_READONLY
Definition: Stmt.h:403
Scope * getCurScope() const
Definition: Parser.h:366
static DeclaratorChunk getArray(unsigned TypeQuals, bool isStatic, bool isStar, Expr *NumElts, SourceLocation LBLoc, SourceLocation RBLoc)
Return a DeclaratorChunk for an array.
Definition: DeclSpec.h:1559
ExprResult ActOnCXXNew(SourceLocation StartLoc, bool UseGlobal, SourceLocation PlacementLParen, MultiExprArg PlacementArgs, SourceLocation PlacementRParen, SourceRange TypeIdParens, Declarator &D, Expr *Initializer)
ActOnCXXNew - Parsed a C++ &#39;new&#39; expression.
static void FixDigraph(Parser &P, Preprocessor &PP, Token &DigraphToken, Token &ColonToken, tok::TokenKind Kind, bool AtDigraph)
StringRef getName() const
Return the actual identifier string.
SourceRange getSourceRange() const LLVM_READONLY
Get the source range that spans this declarator.
Definition: DeclSpec.h:1876
bool isNot(tok::TokenKind K) const
Definition: Token.h:96
static const TST TST_decltype_auto
Definition: DeclSpec.h:301
The name does not refer to a template.
Definition: TemplateKinds.h:23
Dataflow Directional Tag Classes.
void ActOnLambdaError(SourceLocation StartLoc, Scope *CurScope, bool IsInstantiation=false)
ActOnLambdaError - If there is an error parsing a lambda, this callback is invoked to pop the informa...
bool isValid() const
Return true if this is a valid SourceLocation object.
LambdaCaptureDefault Default
Definition: DeclSpec.h:2562
bool expectAndConsume(unsigned DiagID=diag::err_expected, const char *Msg="", tok::TokenKind SkipToTok=tok::unknown)
Definition: Parser.cpp:2249
OverloadedOperatorKind
Enumeration specifying the different kinds of C++ overloaded operators.
Definition: OperatorKinds.h:22
static const TST TST_void
Definition: DeclSpec.h:273
CXXScopeSpec SS
The nested-name-specifier that precedes the template name.
SourceLocation RAngleLoc
The location of the &#39;>&#39; after the template argument list.
static const TST TST_int128
Definition: DeclSpec.h:280
void RecordParsingTemplateParameterDepth(unsigned Depth)
This is used to inform Sema what the current TemplateParameterDepth is during Parsing.
Definition: Sema.cpp:1393
static FixItHint CreateRemoval(CharSourceRange RemoveRange)
Create a code modification hint that removes the given source range.
Definition: Diagnostic.h:118
bool isOneOf(tok::TokenKind K1, tok::TokenKind K2) const
Definition: Token.h:97
SourceLocation getLocEnd() const LLVM_READONLY
Definition: DeclSpec.h:510
SourceLocation getLastCachedTokenLocation() const
Get the location of the last cached token, suitable for setting the end location of an annotation tok...
bool ActOnSuperScopeSpecifier(SourceLocation SuperLoc, SourceLocation ColonColonLoc, CXXScopeSpec &SS)
The parser has parsed a &#39;__super&#39; nested-name-specifier.
unsigned getLength() const
Definition: Token.h:127
void AddInitializerToDecl(Decl *dcl, Expr *init, bool DirectInit)
AddInitializerToDecl - Adds the initializer Init to the declaration dcl.
Definition: SemaDecl.cpp:10936
const Expr * Replacement
Definition: ParsedAttr.h:67
bool isCurrentClassName(const IdentifierInfo &II, Scope *S, const CXXScopeSpec *SS=nullptr)
isCurrentClassName - Determine whether the identifier II is the name of the class type currently bein...
ParsedType getConstructorName(IdentifierInfo &II, SourceLocation NameLoc, Scope *S, CXXScopeSpec &SS, bool EnteringContext)
Definition: SemaExprCXX.cpp:83
Not an overloaded operator.
Definition: OperatorKinds.h:23
void ActOnStartOfLambdaDefinition(LambdaIntroducer &Intro, Declarator &ParamInfo, Scope *CurScope)
ActOnStartOfLambdaDefinition - This is called just before we start parsing the body of a lambda; it a...
Definition: SemaLambda.cpp:830
QualType getCanonicalTypeInternal() const
Definition: Type.h:2214
void takeAttributesFrom(ParsedAttributes &attrs)
Definition: DeclSpec.h:753
DiagnosticBuilder Diag(SourceLocation Loc, unsigned DiagID)
Definition: Parser.cpp:73
static void tryConsumeMutableOrConstexprToken(Parser &P, SourceLocation &MutableLoc, SourceLocation &ConstexprLoc, SourceLocation &DeclEndLoc)
void RestoreNestedNameSpecifierAnnotation(void *Annotation, SourceRange AnnotationRange, CXXScopeSpec &SS)
Given an annotation pointer for a nested-name-specifier, restore the nested-name-specifier structure...
const char * getOperatorSpelling(OverloadedOperatorKind Operator)
Retrieve the spelling of the given overloaded operator, without the preceding "operator" keyword...
ExprResult ActOnCXXBoolLiteral(SourceLocation OpLoc, tok::TokenKind Kind)
ActOnCXXBoolLiteral - Parse {true,false} literals.
void setOperatorFunctionId(SourceLocation OperatorLoc, OverloadedOperatorKind Op, SourceLocation SymbolLocations[3])
Specify that this unqualified-id was parsed as an operator-function-id.
Definition: DeclSpec.cpp:1303
static const TST TST_typename
Definition: DeclSpec.h:297
void SetRangeEnd(SourceLocation Loc)
SetRangeEnd - Set the end of the source range to Loc, unless it&#39;s invalid.
Definition: DeclSpec.h:1890
ExprResult ParseAssignmentExpression(TypeCastState isTypeCast=NotTypeCast)
Parse an expr that doesn&#39;t include (top-level) commas.
Definition: ParseExpr.cpp:160
ExprResult ActOnCXXTypeid(SourceLocation OpLoc, SourceLocation LParenLoc, bool isType, void *TyOrExpr, SourceLocation RParenLoc)
ActOnCXXTypeid - Parse typeid( something ).
ExceptionSpecificationType
The various types of exception specifications that exist in C++11.
static FixItHint CreateInsertion(SourceLocation InsertionLoc, StringRef Code, bool BeforePreviousInsertions=false)
Create a code modification hint that inserts the given code string at a specific location.
Definition: Diagnostic.h:92
void AddTypeInfo(const DeclaratorChunk &TI, ParsedAttributes &&attrs, SourceLocation EndLoc)
AddTypeInfo - Add a chunk to this declarator.
Definition: DeclSpec.h:2139
ExprResult ActOnCoyieldExpr(Scope *S, SourceLocation KwLoc, Expr *E)
Capturing the *this object by reference.
Definition: Lambda.h:35
This is a scope that can contain a declaration.
Definition: Scope.h:59
bool SetTypeSpecType(TST T, SourceLocation Loc, const char *&PrevSpec, unsigned &DiagID, const PrintingPolicy &Policy)
Definition: DeclSpec.cpp:749
ExprResult ActOnIdExpression(Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, UnqualifiedId &Id, bool HasTrailingLParen, bool IsAddressOfOperand, std::unique_ptr< CorrectionCandidateCallback > CCC=nullptr, bool IsInlineAsmIdentifier=false, Token *KeywordReplacement=nullptr)
Definition: SemaExpr.cpp:2023
bool isSet() const
Deprecated.
Definition: DeclSpec.h:209
ExprResult ParseConstantExpression(TypeCastState isTypeCast=NotTypeCast)
Definition: ParseExpr.cpp:210
void setInvalidType(bool Val=true)
Definition: DeclSpec.h:2431
An integral condition for a &#39;switch&#39; statement.
TypeResult ActOnTemplateIdType(CXXScopeSpec &SS, SourceLocation TemplateKWLoc, TemplateTy Template, IdentifierInfo *TemplateII, SourceLocation TemplateIILoc, SourceLocation LAngleLoc, ASTTemplateArgsPtr TemplateArgs, SourceLocation RAngleLoc, bool IsCtorOrDtorName=false, bool IsClassName=false)
Captures information about "declaration specifiers".
Definition: DeclSpec.h:228
void setEnd(SourceLocation e)
SourceLocation ConsumeToken()
ConsumeToken - Consume the current &#39;peek token&#39; and lex the next one.
Definition: Parser.h:404
static ExpressionTrait ExpressionTraitFromTokKind(tok::TokenKind kind)
static int SelectDigraphErrorMessage(tok::TokenKind Kind)
bool isNotEmpty() const
A scope specifier is present, but may be valid or invalid.
Definition: DeclSpec.h:191
Capturing by reference.
Definition: Lambda.h:38
static const TST TST_float128
Definition: DeclSpec.h:287
const DeclSpec & getDeclSpec() const
getDeclSpec - Return the declaration-specifier that this declarator was declared with.
Definition: DeclSpec.h:1841
static const TST TST_bool
Definition: DeclSpec.h:288
StringLiteralParser - This decodes string escape characters and performs wide string analysis and Tra...
unsigned kind
All of the diagnostics that can be emitted by the frontend.
Definition: DiagnosticIDs.h:61
static FixItHint CreateReplacement(CharSourceRange RemoveRange, StringRef Code)
Create a code modification hint that replaces the given source range with the given code string...
Definition: Diagnostic.h:129
void Finish(Sema &S, const PrintingPolicy &Policy)
Finish - This does final analysis of the declspec, issuing diagnostics for things like "_Imaginary" (...
Definition: DeclSpec.cpp:1004
Represents a complete lambda introducer.
Definition: DeclSpec.h:2538
ExprResult ExprError()
Definition: Ownership.h:283
static const TSW TSW_longlong
Definition: DeclSpec.h:256
Code completion occurs within the condition of an if, while, switch, or for statement.
Definition: Sema.h:10223
static unsigned TypeTraitArity(tok::TokenKind kind)
void setLocation(SourceLocation L)
Definition: Token.h:132
A trivial tuple used to represent a source range.
void setIdentifier(const IdentifierInfo *Id, SourceLocation IdLoc)
Specify that this unqualified-id was parsed as an identifier.
Definition: DeclSpec.h:1011
bool SetTypeSpecError()
Definition: DeclSpec.cpp:843
unsigned NumArgs
NumArgs - The number of template arguments.
void * getAnnotationValue() const
Definition: Token.h:224
void setDestructorName(SourceLocation TildeLoc, ParsedType ClassType, SourceLocation EndLoc)
Specify that this unqualified-id was parsed as a destructor name.
Definition: DeclSpec.h:1093
SourceLocation getLocEnd() const LLVM_READONLY
Definition: DeclSpec.h:1879
void SetRangeEnd(SourceLocation Loc)
Definition: DeclSpec.h:617
SourceLocation getBegin() const
ParsedAttributes - A collection of parsed attributes.
Definition: ParsedAttr.h:803
This class handles loading and caching of source files into memory.
TypeResult ParseTypeName(SourceRange *Range=nullptr, DeclaratorContext Context=DeclaratorContext::TypeNameContext, AccessSpecifier AS=AS_none, Decl **OwnedType=nullptr, ParsedAttributes *Attrs=nullptr)
ParseTypeName type-name: [C99 6.7.6] specifier-qualifier-list abstract-declarator[opt].
Definition: ParseDecl.cpp:44
static ArrayTypeTrait ArrayTypeTraitFromTokKind(tok::TokenKind kind)
Attr - This represents one attribute.
Definition: Attr.h:43
SourceLocation getLocation() const
Definition: DeclBase.h:419
void startToken()
Reset all flags to cleared.
Definition: Token.h:169
ParsedType actOnLambdaInitCaptureInitialization(SourceLocation Loc, bool ByRef, IdentifierInfo *Id, LambdaCaptureInitKind InitKind, Expr *&Init)
Perform initialization analysis of the init-capture and perform any implicit conversions such as an l...
Definition: Sema.h:5561
ParsedTemplateTy Template
The declaration of the template corresponding to the template-name.
Engages in a tight little dance with the lexer to efficiently preprocess tokens.
Definition: Preprocessor.h:127
Stop skipping at specified token, but don&#39;t skip the token itself.
Definition: Parser.h:1021