Home | History | Annotate | Download | only in Parse
      1 //===--- Parser.cpp - C Language Family Parser ----------------------------===//
      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 Parser interfaces.
     11 //
     12 //===----------------------------------------------------------------------===//
     13 
     14 #include "clang/Parse/Parser.h"
     15 #include "clang/Parse/ParseDiagnostic.h"
     16 #include "clang/Sema/DeclSpec.h"
     17 #include "clang/Sema/Scope.h"
     18 #include "clang/Sema/ParsedTemplate.h"
     19 #include "llvm/Support/raw_ostream.h"
     20 #include "RAIIObjectsForParser.h"
     21 #include "ParsePragma.h"
     22 #include "clang/AST/DeclTemplate.h"
     23 #include "clang/AST/ASTConsumer.h"
     24 using namespace clang;
     25 
     26 namespace {
     27 /// \brief A comment handler that passes comments found by the preprocessor
     28 /// to the parser action.
     29 class ActionCommentHandler : public CommentHandler {
     30   Sema &S;
     31 
     32 public:
     33   explicit ActionCommentHandler(Sema &S) : S(S) { }
     34 
     35   virtual bool HandleComment(Preprocessor &PP, SourceRange Comment) {
     36     S.ActOnComment(Comment);
     37     return false;
     38   }
     39 };
     40 } // end anonymous namespace
     41 
     42 IdentifierInfo *Parser::getSEHExceptKeyword() {
     43   // __except is accepted as a (contextual) keyword
     44   if (!Ident__except && (getLangOpts().MicrosoftExt || getLangOpts().Borland))
     45     Ident__except = PP.getIdentifierInfo("__except");
     46 
     47   return Ident__except;
     48 }
     49 
     50 Parser::Parser(Preprocessor &pp, Sema &actions, bool SkipFunctionBodies)
     51   : PP(pp), Actions(actions), Diags(PP.getDiagnostics()),
     52     GreaterThanIsOperator(true), ColonIsSacred(false),
     53     InMessageExpression(false), TemplateParameterDepth(0),
     54     ParsingInObjCContainer(false), SkipFunctionBodies(SkipFunctionBodies) {
     55   Tok.setKind(tok::eof);
     56   Actions.CurScope = 0;
     57   NumCachedScopes = 0;
     58   ParenCount = BracketCount = BraceCount = 0;
     59   CurParsedObjCImpl = 0;
     60 
     61   // Add #pragma handlers. These are removed and destroyed in the
     62   // destructor.
     63   AlignHandler.reset(new PragmaAlignHandler(actions));
     64   PP.AddPragmaHandler(AlignHandler.get());
     65 
     66   GCCVisibilityHandler.reset(new PragmaGCCVisibilityHandler(actions));
     67   PP.AddPragmaHandler("GCC", GCCVisibilityHandler.get());
     68 
     69   OptionsHandler.reset(new PragmaOptionsHandler(actions));
     70   PP.AddPragmaHandler(OptionsHandler.get());
     71 
     72   PackHandler.reset(new PragmaPackHandler(actions));
     73   PP.AddPragmaHandler(PackHandler.get());
     74 
     75   MSStructHandler.reset(new PragmaMSStructHandler(actions));
     76   PP.AddPragmaHandler(MSStructHandler.get());
     77 
     78   UnusedHandler.reset(new PragmaUnusedHandler(actions));
     79   PP.AddPragmaHandler(UnusedHandler.get());
     80 
     81   WeakHandler.reset(new PragmaWeakHandler(actions));
     82   PP.AddPragmaHandler(WeakHandler.get());
     83 
     84   RedefineExtnameHandler.reset(new PragmaRedefineExtnameHandler(actions));
     85   PP.AddPragmaHandler(RedefineExtnameHandler.get());
     86 
     87   FPContractHandler.reset(new PragmaFPContractHandler(actions));
     88   PP.AddPragmaHandler("STDC", FPContractHandler.get());
     89 
     90   if (getLangOpts().OpenCL) {
     91     OpenCLExtensionHandler.reset(new PragmaOpenCLExtensionHandler(actions));
     92     PP.AddPragmaHandler("OPENCL", OpenCLExtensionHandler.get());
     93 
     94     PP.AddPragmaHandler("OPENCL", FPContractHandler.get());
     95   }
     96 
     97   CommentSemaHandler.reset(new ActionCommentHandler(actions));
     98   PP.addCommentHandler(CommentSemaHandler.get());
     99 
    100   PP.setCodeCompletionHandler(*this);
    101 }
    102 
    103 /// If a crash happens while the parser is active, print out a line indicating
    104 /// what the current token is.
    105 void PrettyStackTraceParserEntry::print(raw_ostream &OS) const {
    106   const Token &Tok = P.getCurToken();
    107   if (Tok.is(tok::eof)) {
    108     OS << "<eof> parser at end of file\n";
    109     return;
    110   }
    111 
    112   if (Tok.getLocation().isInvalid()) {
    113     OS << "<unknown> parser at unknown location\n";
    114     return;
    115   }
    116 
    117   const Preprocessor &PP = P.getPreprocessor();
    118   Tok.getLocation().print(OS, PP.getSourceManager());
    119   if (Tok.isAnnotation())
    120     OS << ": at annotation token \n";
    121   else
    122     OS << ": current parser token '" << PP.getSpelling(Tok) << "'\n";
    123 }
    124 
    125 
    126 DiagnosticBuilder Parser::Diag(SourceLocation Loc, unsigned DiagID) {
    127   return Diags.Report(Loc, DiagID);
    128 }
    129 
    130 DiagnosticBuilder Parser::Diag(const Token &Tok, unsigned DiagID) {
    131   return Diag(Tok.getLocation(), DiagID);
    132 }
    133 
    134 /// \brief Emits a diagnostic suggesting parentheses surrounding a
    135 /// given range.
    136 ///
    137 /// \param Loc The location where we'll emit the diagnostic.
    138 /// \param DK The kind of diagnostic to emit.
    139 /// \param ParenRange Source range enclosing code that should be parenthesized.
    140 void Parser::SuggestParentheses(SourceLocation Loc, unsigned DK,
    141                                 SourceRange ParenRange) {
    142   SourceLocation EndLoc = PP.getLocForEndOfToken(ParenRange.getEnd());
    143   if (!ParenRange.getEnd().isFileID() || EndLoc.isInvalid()) {
    144     // We can't display the parentheses, so just dig the
    145     // warning/error and return.
    146     Diag(Loc, DK);
    147     return;
    148   }
    149 
    150   Diag(Loc, DK)
    151     << FixItHint::CreateInsertion(ParenRange.getBegin(), "(")
    152     << FixItHint::CreateInsertion(EndLoc, ")");
    153 }
    154 
    155 static bool IsCommonTypo(tok::TokenKind ExpectedTok, const Token &Tok) {
    156   switch (ExpectedTok) {
    157   case tok::semi: return Tok.is(tok::colon); // : for ;
    158   default: return false;
    159   }
    160 }
    161 
    162 /// ExpectAndConsume - The parser expects that 'ExpectedTok' is next in the
    163 /// input.  If so, it is consumed and false is returned.
    164 ///
    165 /// If the input is malformed, this emits the specified diagnostic.  Next, if
    166 /// SkipToTok is specified, it calls SkipUntil(SkipToTok).  Finally, true is
    167 /// returned.
    168 bool Parser::ExpectAndConsume(tok::TokenKind ExpectedTok, unsigned DiagID,
    169                               const char *Msg, tok::TokenKind SkipToTok) {
    170   if (Tok.is(ExpectedTok) || Tok.is(tok::code_completion)) {
    171     ConsumeAnyToken();
    172     return false;
    173   }
    174 
    175   // Detect common single-character typos and resume.
    176   if (IsCommonTypo(ExpectedTok, Tok)) {
    177     SourceLocation Loc = Tok.getLocation();
    178     Diag(Loc, DiagID)
    179       << Msg
    180       << FixItHint::CreateReplacement(SourceRange(Loc),
    181                                       getTokenSimpleSpelling(ExpectedTok));
    182     ConsumeAnyToken();
    183 
    184     // Pretend there wasn't a problem.
    185     return false;
    186   }
    187 
    188   const char *Spelling = 0;
    189   SourceLocation EndLoc = PP.getLocForEndOfToken(PrevTokLocation);
    190   if (EndLoc.isValid() &&
    191       (Spelling = tok::getTokenSimpleSpelling(ExpectedTok))) {
    192     // Show what code to insert to fix this problem.
    193     Diag(EndLoc, DiagID)
    194       << Msg
    195       << FixItHint::CreateInsertion(EndLoc, Spelling);
    196   } else
    197     Diag(Tok, DiagID) << Msg;
    198 
    199   if (SkipToTok != tok::unknown)
    200     SkipUntil(SkipToTok);
    201   return true;
    202 }
    203 
    204 bool Parser::ExpectAndConsumeSemi(unsigned DiagID) {
    205   if (Tok.is(tok::semi) || Tok.is(tok::code_completion)) {
    206     ConsumeToken();
    207     return false;
    208   }
    209 
    210   if ((Tok.is(tok::r_paren) || Tok.is(tok::r_square)) &&
    211       NextToken().is(tok::semi)) {
    212     Diag(Tok, diag::err_extraneous_token_before_semi)
    213       << PP.getSpelling(Tok)
    214       << FixItHint::CreateRemoval(Tok.getLocation());
    215     ConsumeAnyToken(); // The ')' or ']'.
    216     ConsumeToken(); // The ';'.
    217     return false;
    218   }
    219 
    220   return ExpectAndConsume(tok::semi, DiagID);
    221 }
    222 
    223 void Parser::ConsumeExtraSemi(ExtraSemiKind Kind, unsigned TST) {
    224   if (!Tok.is(tok::semi)) return;
    225 
    226   bool HadMultipleSemis = false;
    227   SourceLocation StartLoc = Tok.getLocation();
    228   SourceLocation EndLoc = Tok.getLocation();
    229   ConsumeToken();
    230 
    231   while ((Tok.is(tok::semi) && !Tok.isAtStartOfLine())) {
    232     HadMultipleSemis = true;
    233     EndLoc = Tok.getLocation();
    234     ConsumeToken();
    235   }
    236 
    237   // C++11 allows extra semicolons at namespace scope, but not in any of the
    238   // other contexts.
    239   if (Kind == OutsideFunction && getLangOpts().CPlusPlus) {
    240     if (getLangOpts().CPlusPlus0x)
    241       Diag(StartLoc, diag::warn_cxx98_compat_top_level_semi)
    242           << FixItHint::CreateRemoval(SourceRange(StartLoc, EndLoc));
    243     else
    244       Diag(StartLoc, diag::ext_extra_semi_cxx11)
    245           << FixItHint::CreateRemoval(SourceRange(StartLoc, EndLoc));
    246     return;
    247   }
    248 
    249   if (Kind != AfterMemberFunctionDefinition || HadMultipleSemis)
    250     Diag(StartLoc, diag::ext_extra_semi)
    251         << Kind << DeclSpec::getSpecifierName((DeclSpec::TST)TST)
    252         << FixItHint::CreateRemoval(SourceRange(StartLoc, EndLoc));
    253   else
    254     // A single semicolon is valid after a member function definition.
    255     Diag(StartLoc, diag::warn_extra_semi_after_mem_fn_def)
    256       << FixItHint::CreateRemoval(SourceRange(StartLoc, EndLoc));
    257 }
    258 
    259 //===----------------------------------------------------------------------===//
    260 // Error recovery.
    261 //===----------------------------------------------------------------------===//
    262 
    263 /// SkipUntil - Read tokens until we get to the specified token, then consume
    264 /// it (unless DontConsume is true).  Because we cannot guarantee that the
    265 /// token will ever occur, this skips to the next token, or to some likely
    266 /// good stopping point.  If StopAtSemi is true, skipping will stop at a ';'
    267 /// character.
    268 ///
    269 /// If SkipUntil finds the specified token, it returns true, otherwise it
    270 /// returns false.
    271 bool Parser::SkipUntil(ArrayRef<tok::TokenKind> Toks, bool StopAtSemi,
    272                        bool DontConsume, bool StopAtCodeCompletion) {
    273   // We always want this function to skip at least one token if the first token
    274   // isn't T and if not at EOF.
    275   bool isFirstTokenSkipped = true;
    276   while (1) {
    277     // If we found one of the tokens, stop and return true.
    278     for (unsigned i = 0, NumToks = Toks.size(); i != NumToks; ++i) {
    279       if (Tok.is(Toks[i])) {
    280         if (DontConsume) {
    281           // Noop, don't consume the token.
    282         } else {
    283           ConsumeAnyToken();
    284         }
    285         return true;
    286       }
    287     }
    288 
    289     switch (Tok.getKind()) {
    290     case tok::eof:
    291       // Ran out of tokens.
    292       return false;
    293 
    294     case tok::code_completion:
    295       if (!StopAtCodeCompletion)
    296         ConsumeToken();
    297       return false;
    298 
    299     case tok::l_paren:
    300       // Recursively skip properly-nested parens.
    301       ConsumeParen();
    302       SkipUntil(tok::r_paren, false, false, StopAtCodeCompletion);
    303       break;
    304     case tok::l_square:
    305       // Recursively skip properly-nested square brackets.
    306       ConsumeBracket();
    307       SkipUntil(tok::r_square, false, false, StopAtCodeCompletion);
    308       break;
    309     case tok::l_brace:
    310       // Recursively skip properly-nested braces.
    311       ConsumeBrace();
    312       SkipUntil(tok::r_brace, false, false, StopAtCodeCompletion);
    313       break;
    314 
    315     // Okay, we found a ']' or '}' or ')', which we think should be balanced.
    316     // Since the user wasn't looking for this token (if they were, it would
    317     // already be handled), this isn't balanced.  If there is a LHS token at a
    318     // higher level, we will assume that this matches the unbalanced token
    319     // and return it.  Otherwise, this is a spurious RHS token, which we skip.
    320     case tok::r_paren:
    321       if (ParenCount && !isFirstTokenSkipped)
    322         return false;  // Matches something.
    323       ConsumeParen();
    324       break;
    325     case tok::r_square:
    326       if (BracketCount && !isFirstTokenSkipped)
    327         return false;  // Matches something.
    328       ConsumeBracket();
    329       break;
    330     case tok::r_brace:
    331       if (BraceCount && !isFirstTokenSkipped)
    332         return false;  // Matches something.
    333       ConsumeBrace();
    334       break;
    335 
    336     case tok::string_literal:
    337     case tok::wide_string_literal:
    338     case tok::utf8_string_literal:
    339     case tok::utf16_string_literal:
    340     case tok::utf32_string_literal:
    341       ConsumeStringToken();
    342       break;
    343 
    344     case tok::semi:
    345       if (StopAtSemi)
    346         return false;
    347       // FALL THROUGH.
    348     default:
    349       // Skip this token.
    350       ConsumeToken();
    351       break;
    352     }
    353     isFirstTokenSkipped = false;
    354   }
    355 }
    356 
    357 //===----------------------------------------------------------------------===//
    358 // Scope manipulation
    359 //===----------------------------------------------------------------------===//
    360 
    361 /// EnterScope - Start a new scope.
    362 void Parser::EnterScope(unsigned ScopeFlags) {
    363   if (NumCachedScopes) {
    364     Scope *N = ScopeCache[--NumCachedScopes];
    365     N->Init(getCurScope(), ScopeFlags);
    366     Actions.CurScope = N;
    367   } else {
    368     Actions.CurScope = new Scope(getCurScope(), ScopeFlags, Diags);
    369   }
    370 }
    371 
    372 /// ExitScope - Pop a scope off the scope stack.
    373 void Parser::ExitScope() {
    374   assert(getCurScope() && "Scope imbalance!");
    375 
    376   // Inform the actions module that this scope is going away if there are any
    377   // decls in it.
    378   if (!getCurScope()->decl_empty())
    379     Actions.ActOnPopScope(Tok.getLocation(), getCurScope());
    380 
    381   Scope *OldScope = getCurScope();
    382   Actions.CurScope = OldScope->getParent();
    383 
    384   if (NumCachedScopes == ScopeCacheSize)
    385     delete OldScope;
    386   else
    387     ScopeCache[NumCachedScopes++] = OldScope;
    388 }
    389 
    390 /// Set the flags for the current scope to ScopeFlags. If ManageFlags is false,
    391 /// this object does nothing.
    392 Parser::ParseScopeFlags::ParseScopeFlags(Parser *Self, unsigned ScopeFlags,
    393                                  bool ManageFlags)
    394   : CurScope(ManageFlags ? Self->getCurScope() : 0) {
    395   if (CurScope) {
    396     OldFlags = CurScope->getFlags();
    397     CurScope->setFlags(ScopeFlags);
    398   }
    399 }
    400 
    401 /// Restore the flags for the current scope to what they were before this
    402 /// object overrode them.
    403 Parser::ParseScopeFlags::~ParseScopeFlags() {
    404   if (CurScope)
    405     CurScope->setFlags(OldFlags);
    406 }
    407 
    408 
    409 //===----------------------------------------------------------------------===//
    410 // C99 6.9: External Definitions.
    411 //===----------------------------------------------------------------------===//
    412 
    413 Parser::~Parser() {
    414   // If we still have scopes active, delete the scope tree.
    415   delete getCurScope();
    416   Actions.CurScope = 0;
    417 
    418   // Free the scope cache.
    419   for (unsigned i = 0, e = NumCachedScopes; i != e; ++i)
    420     delete ScopeCache[i];
    421 
    422   // Free LateParsedTemplatedFunction nodes.
    423   for (LateParsedTemplateMapT::iterator it = LateParsedTemplateMap.begin();
    424       it != LateParsedTemplateMap.end(); ++it)
    425     delete it->second;
    426 
    427   // Remove the pragma handlers we installed.
    428   PP.RemovePragmaHandler(AlignHandler.get());
    429   AlignHandler.reset();
    430   PP.RemovePragmaHandler("GCC", GCCVisibilityHandler.get());
    431   GCCVisibilityHandler.reset();
    432   PP.RemovePragmaHandler(OptionsHandler.get());
    433   OptionsHandler.reset();
    434   PP.RemovePragmaHandler(PackHandler.get());
    435   PackHandler.reset();
    436   PP.RemovePragmaHandler(MSStructHandler.get());
    437   MSStructHandler.reset();
    438   PP.RemovePragmaHandler(UnusedHandler.get());
    439   UnusedHandler.reset();
    440   PP.RemovePragmaHandler(WeakHandler.get());
    441   WeakHandler.reset();
    442   PP.RemovePragmaHandler(RedefineExtnameHandler.get());
    443   RedefineExtnameHandler.reset();
    444 
    445   if (getLangOpts().OpenCL) {
    446     PP.RemovePragmaHandler("OPENCL", OpenCLExtensionHandler.get());
    447     OpenCLExtensionHandler.reset();
    448     PP.RemovePragmaHandler("OPENCL", FPContractHandler.get());
    449   }
    450 
    451   PP.RemovePragmaHandler("STDC", FPContractHandler.get());
    452   FPContractHandler.reset();
    453 
    454   PP.removeCommentHandler(CommentSemaHandler.get());
    455 
    456   PP.clearCodeCompletionHandler();
    457 
    458   assert(TemplateIds.empty() && "Still alive TemplateIdAnnotations around?");
    459 }
    460 
    461 /// Initialize - Warm up the parser.
    462 ///
    463 void Parser::Initialize() {
    464   // Create the translation unit scope.  Install it as the current scope.
    465   assert(getCurScope() == 0 && "A scope is already active?");
    466   EnterScope(Scope::DeclScope);
    467   Actions.ActOnTranslationUnitScope(getCurScope());
    468 
    469   // Prime the lexer look-ahead.
    470   ConsumeToken();
    471 
    472   // Initialization for Objective-C context sensitive keywords recognition.
    473   // Referenced in Parser::ParseObjCTypeQualifierList.
    474   if (getLangOpts().ObjC1) {
    475     ObjCTypeQuals[objc_in] = &PP.getIdentifierTable().get("in");
    476     ObjCTypeQuals[objc_out] = &PP.getIdentifierTable().get("out");
    477     ObjCTypeQuals[objc_inout] = &PP.getIdentifierTable().get("inout");
    478     ObjCTypeQuals[objc_oneway] = &PP.getIdentifierTable().get("oneway");
    479     ObjCTypeQuals[objc_bycopy] = &PP.getIdentifierTable().get("bycopy");
    480     ObjCTypeQuals[objc_byref] = &PP.getIdentifierTable().get("byref");
    481   }
    482 
    483   Ident_instancetype = 0;
    484   Ident_final = 0;
    485   Ident_override = 0;
    486 
    487   Ident_super = &PP.getIdentifierTable().get("super");
    488 
    489   if (getLangOpts().AltiVec) {
    490     Ident_vector = &PP.getIdentifierTable().get("vector");
    491     Ident_pixel = &PP.getIdentifierTable().get("pixel");
    492   }
    493 
    494   Ident_introduced = 0;
    495   Ident_deprecated = 0;
    496   Ident_obsoleted = 0;
    497   Ident_unavailable = 0;
    498 
    499   Ident__except = 0;
    500 
    501   Ident__exception_code = Ident__exception_info = Ident__abnormal_termination = 0;
    502   Ident___exception_code = Ident___exception_info = Ident___abnormal_termination = 0;
    503   Ident_GetExceptionCode = Ident_GetExceptionInfo = Ident_AbnormalTermination = 0;
    504 
    505   if(getLangOpts().Borland) {
    506     Ident__exception_info        = PP.getIdentifierInfo("_exception_info");
    507     Ident___exception_info       = PP.getIdentifierInfo("__exception_info");
    508     Ident_GetExceptionInfo       = PP.getIdentifierInfo("GetExceptionInformation");
    509     Ident__exception_code        = PP.getIdentifierInfo("_exception_code");
    510     Ident___exception_code       = PP.getIdentifierInfo("__exception_code");
    511     Ident_GetExceptionCode       = PP.getIdentifierInfo("GetExceptionCode");
    512     Ident__abnormal_termination  = PP.getIdentifierInfo("_abnormal_termination");
    513     Ident___abnormal_termination = PP.getIdentifierInfo("__abnormal_termination");
    514     Ident_AbnormalTermination    = PP.getIdentifierInfo("AbnormalTermination");
    515 
    516     PP.SetPoisonReason(Ident__exception_code,diag::err_seh___except_block);
    517     PP.SetPoisonReason(Ident___exception_code,diag::err_seh___except_block);
    518     PP.SetPoisonReason(Ident_GetExceptionCode,diag::err_seh___except_block);
    519     PP.SetPoisonReason(Ident__exception_info,diag::err_seh___except_filter);
    520     PP.SetPoisonReason(Ident___exception_info,diag::err_seh___except_filter);
    521     PP.SetPoisonReason(Ident_GetExceptionInfo,diag::err_seh___except_filter);
    522     PP.SetPoisonReason(Ident__abnormal_termination,diag::err_seh___finally_block);
    523     PP.SetPoisonReason(Ident___abnormal_termination,diag::err_seh___finally_block);
    524     PP.SetPoisonReason(Ident_AbnormalTermination,diag::err_seh___finally_block);
    525   }
    526 }
    527 
    528 namespace {
    529   /// \brief RAIIObject to destroy the contents of a SmallVector of
    530   /// TemplateIdAnnotation pointers and clear the vector.
    531   class DestroyTemplateIdAnnotationsRAIIObj {
    532     SmallVectorImpl<TemplateIdAnnotation *> &Container;
    533   public:
    534     DestroyTemplateIdAnnotationsRAIIObj(SmallVectorImpl<TemplateIdAnnotation *>
    535                                        &Container)
    536       : Container(Container) {}
    537 
    538     ~DestroyTemplateIdAnnotationsRAIIObj() {
    539       for (SmallVectorImpl<TemplateIdAnnotation *>::iterator I =
    540            Container.begin(), E = Container.end();
    541            I != E; ++I)
    542         (*I)->Destroy();
    543       Container.clear();
    544     }
    545   };
    546 }
    547 
    548 /// ParseTopLevelDecl - Parse one top-level declaration, return whatever the
    549 /// action tells us to.  This returns true if the EOF was encountered.
    550 bool Parser::ParseTopLevelDecl(DeclGroupPtrTy &Result) {
    551   DestroyTemplateIdAnnotationsRAIIObj CleanupRAII(TemplateIds);
    552 
    553   // Skip over the EOF token, flagging end of previous input for incremental
    554   // processing
    555   if (PP.isIncrementalProcessingEnabled() && Tok.is(tok::eof))
    556     ConsumeToken();
    557 
    558   while (Tok.is(tok::annot_pragma_unused))
    559     HandlePragmaUnused();
    560 
    561   Result = DeclGroupPtrTy();
    562   if (Tok.is(tok::eof)) {
    563     // Late template parsing can begin.
    564     if (getLangOpts().DelayedTemplateParsing)
    565       Actions.SetLateTemplateParser(LateTemplateParserCallback, this);
    566     if (!PP.isIncrementalProcessingEnabled())
    567       Actions.ActOnEndOfTranslationUnit();
    568     //else don't tell Sema that we ended parsing: more input might come.
    569 
    570     return true;
    571   }
    572 
    573   ParsedAttributesWithRange attrs(AttrFactory);
    574   MaybeParseCXX0XAttributes(attrs);
    575   MaybeParseMicrosoftAttributes(attrs);
    576 
    577   Result = ParseExternalDeclaration(attrs);
    578   return false;
    579 }
    580 
    581 /// ParseTranslationUnit:
    582 ///       translation-unit: [C99 6.9]
    583 ///         external-declaration
    584 ///         translation-unit external-declaration
    585 void Parser::ParseTranslationUnit() {
    586   Initialize();
    587 
    588   DeclGroupPtrTy Res;
    589   while (!ParseTopLevelDecl(Res))
    590     /*parse them all*/;
    591 
    592   ExitScope();
    593   assert(getCurScope() == 0 && "Scope imbalance!");
    594 }
    595 
    596 /// ParseExternalDeclaration:
    597 ///
    598 ///       external-declaration: [C99 6.9], declaration: [C++ dcl.dcl]
    599 ///         function-definition
    600 ///         declaration
    601 /// [C++0x] empty-declaration
    602 /// [GNU]   asm-definition
    603 /// [GNU]   __extension__ external-declaration
    604 /// [OBJC]  objc-class-definition
    605 /// [OBJC]  objc-class-declaration
    606 /// [OBJC]  objc-alias-declaration
    607 /// [OBJC]  objc-protocol-definition
    608 /// [OBJC]  objc-method-definition
    609 /// [OBJC]  @end
    610 /// [C++]   linkage-specification
    611 /// [GNU] asm-definition:
    612 ///         simple-asm-expr ';'
    613 ///
    614 /// [C++0x] empty-declaration:
    615 ///           ';'
    616 ///
    617 /// [C++0x/GNU] 'extern' 'template' declaration
    618 Parser::DeclGroupPtrTy
    619 Parser::ParseExternalDeclaration(ParsedAttributesWithRange &attrs,
    620                                  ParsingDeclSpec *DS) {
    621   DestroyTemplateIdAnnotationsRAIIObj CleanupRAII(TemplateIds);
    622   ParenBraceBracketBalancer BalancerRAIIObj(*this);
    623 
    624   if (PP.isCodeCompletionReached()) {
    625     cutOffParsing();
    626     return DeclGroupPtrTy();
    627   }
    628 
    629   Decl *SingleDecl = 0;
    630   switch (Tok.getKind()) {
    631   case tok::annot_pragma_vis:
    632     HandlePragmaVisibility();
    633     return DeclGroupPtrTy();
    634   case tok::annot_pragma_pack:
    635     HandlePragmaPack();
    636     return DeclGroupPtrTy();
    637   case tok::semi:
    638     ConsumeExtraSemi(OutsideFunction);
    639     // TODO: Invoke action for top-level semicolon.
    640     return DeclGroupPtrTy();
    641   case tok::r_brace:
    642     Diag(Tok, diag::err_extraneous_closing_brace);
    643     ConsumeBrace();
    644     return DeclGroupPtrTy();
    645   case tok::eof:
    646     Diag(Tok, diag::err_expected_external_declaration);
    647     return DeclGroupPtrTy();
    648   case tok::kw___extension__: {
    649     // __extension__ silences extension warnings in the subexpression.
    650     ExtensionRAIIObject O(Diags);  // Use RAII to do this.
    651     ConsumeToken();
    652     return ParseExternalDeclaration(attrs);
    653   }
    654   case tok::kw_asm: {
    655     ProhibitAttributes(attrs);
    656 
    657     SourceLocation StartLoc = Tok.getLocation();
    658     SourceLocation EndLoc;
    659     ExprResult Result(ParseSimpleAsm(&EndLoc));
    660 
    661     ExpectAndConsume(tok::semi, diag::err_expected_semi_after,
    662                      "top-level asm block");
    663 
    664     if (Result.isInvalid())
    665       return DeclGroupPtrTy();
    666     SingleDecl = Actions.ActOnFileScopeAsmDecl(Result.get(), StartLoc, EndLoc);
    667     break;
    668   }
    669   case tok::at:
    670     return ParseObjCAtDirectives();
    671   case tok::minus:
    672   case tok::plus:
    673     if (!getLangOpts().ObjC1) {
    674       Diag(Tok, diag::err_expected_external_declaration);
    675       ConsumeToken();
    676       return DeclGroupPtrTy();
    677     }
    678     SingleDecl = ParseObjCMethodDefinition();
    679     break;
    680   case tok::code_completion:
    681       Actions.CodeCompleteOrdinaryName(getCurScope(),
    682                              CurParsedObjCImpl? Sema::PCC_ObjCImplementation
    683                                               : Sema::PCC_Namespace);
    684     cutOffParsing();
    685     return DeclGroupPtrTy();
    686   case tok::kw_using:
    687   case tok::kw_namespace:
    688   case tok::kw_typedef:
    689   case tok::kw_template:
    690   case tok::kw_export:    // As in 'export template'
    691   case tok::kw_static_assert:
    692   case tok::kw__Static_assert:
    693     // A function definition cannot start with any of these keywords.
    694     {
    695       SourceLocation DeclEnd;
    696       StmtVector Stmts;
    697       return ParseDeclaration(Stmts, Declarator::FileContext, DeclEnd, attrs);
    698     }
    699 
    700   case tok::kw_static:
    701     // Parse (then ignore) 'static' prior to a template instantiation. This is
    702     // a GCC extension that we intentionally do not support.
    703     if (getLangOpts().CPlusPlus && NextToken().is(tok::kw_template)) {
    704       Diag(ConsumeToken(), diag::warn_static_inline_explicit_inst_ignored)
    705         << 0;
    706       SourceLocation DeclEnd;
    707       StmtVector Stmts;
    708       return ParseDeclaration(Stmts, Declarator::FileContext, DeclEnd, attrs);
    709     }
    710     goto dont_know;
    711 
    712   case tok::kw_inline:
    713     if (getLangOpts().CPlusPlus) {
    714       tok::TokenKind NextKind = NextToken().getKind();
    715 
    716       // Inline namespaces. Allowed as an extension even in C++03.
    717       if (NextKind == tok::kw_namespace) {
    718         SourceLocation DeclEnd;
    719         StmtVector Stmts;
    720         return ParseDeclaration(Stmts, Declarator::FileContext, DeclEnd, attrs);
    721       }
    722 
    723       // Parse (then ignore) 'inline' prior to a template instantiation. This is
    724       // a GCC extension that we intentionally do not support.
    725       if (NextKind == tok::kw_template) {
    726         Diag(ConsumeToken(), diag::warn_static_inline_explicit_inst_ignored)
    727           << 1;
    728         SourceLocation DeclEnd;
    729         StmtVector Stmts;
    730         return ParseDeclaration(Stmts, Declarator::FileContext, DeclEnd, attrs);
    731       }
    732     }
    733     goto dont_know;
    734 
    735   case tok::kw_extern:
    736     if (getLangOpts().CPlusPlus && NextToken().is(tok::kw_template)) {
    737       // Extern templates
    738       SourceLocation ExternLoc = ConsumeToken();
    739       SourceLocation TemplateLoc = ConsumeToken();
    740       Diag(ExternLoc, getLangOpts().CPlusPlus0x ?
    741              diag::warn_cxx98_compat_extern_template :
    742              diag::ext_extern_template) << SourceRange(ExternLoc, TemplateLoc);
    743       SourceLocation DeclEnd;
    744       return Actions.ConvertDeclToDeclGroup(
    745                   ParseExplicitInstantiation(Declarator::FileContext,
    746                                              ExternLoc, TemplateLoc, DeclEnd));
    747     }
    748     // FIXME: Detect C++ linkage specifications here?
    749     goto dont_know;
    750 
    751   case tok::kw___if_exists:
    752   case tok::kw___if_not_exists:
    753     ParseMicrosoftIfExistsExternalDeclaration();
    754     return DeclGroupPtrTy();
    755 
    756   default:
    757   dont_know:
    758     // We can't tell whether this is a function-definition or declaration yet.
    759     if (DS) {
    760       return ParseDeclarationOrFunctionDefinition(attrs, DS);
    761     } else {
    762       return ParseDeclarationOrFunctionDefinition(attrs);
    763     }
    764   }
    765 
    766   // This routine returns a DeclGroup, if the thing we parsed only contains a
    767   // single decl, convert it now.
    768   return Actions.ConvertDeclToDeclGroup(SingleDecl);
    769 }
    770 
    771 /// \brief Determine whether the current token, if it occurs after a
    772 /// declarator, continues a declaration or declaration list.
    773 bool Parser::isDeclarationAfterDeclarator() {
    774   // Check for '= delete' or '= default'
    775   if (getLangOpts().CPlusPlus && Tok.is(tok::equal)) {
    776     const Token &KW = NextToken();
    777     if (KW.is(tok::kw_default) || KW.is(tok::kw_delete))
    778       return false;
    779   }
    780 
    781   return Tok.is(tok::equal) ||      // int X()=  -> not a function def
    782     Tok.is(tok::comma) ||           // int X(),  -> not a function def
    783     Tok.is(tok::semi)  ||           // int X();  -> not a function def
    784     Tok.is(tok::kw_asm) ||          // int X() __asm__ -> not a function def
    785     Tok.is(tok::kw___attribute) ||  // int X() __attr__ -> not a function def
    786     (getLangOpts().CPlusPlus &&
    787      Tok.is(tok::l_paren));         // int X(0) -> not a function def [C++]
    788 }
    789 
    790 /// \brief Determine whether the current token, if it occurs after a
    791 /// declarator, indicates the start of a function definition.
    792 bool Parser::isStartOfFunctionDefinition(const ParsingDeclarator &Declarator) {
    793   assert(Declarator.isFunctionDeclarator() && "Isn't a function declarator");
    794   if (Tok.is(tok::l_brace))   // int X() {}
    795     return true;
    796 
    797   // Handle K&R C argument lists: int X(f) int f; {}
    798   if (!getLangOpts().CPlusPlus &&
    799       Declarator.getFunctionTypeInfo().isKNRPrototype())
    800     return isDeclarationSpecifier();
    801 
    802   if (getLangOpts().CPlusPlus && Tok.is(tok::equal)) {
    803     const Token &KW = NextToken();
    804     return KW.is(tok::kw_default) || KW.is(tok::kw_delete);
    805   }
    806 
    807   return Tok.is(tok::colon) ||         // X() : Base() {} (used for ctors)
    808          Tok.is(tok::kw_try);          // X() try { ... }
    809 }
    810 
    811 /// ParseDeclarationOrFunctionDefinition - Parse either a function-definition or
    812 /// a declaration.  We can't tell which we have until we read up to the
    813 /// compound-statement in function-definition. TemplateParams, if
    814 /// non-NULL, provides the template parameters when we're parsing a
    815 /// C++ template-declaration.
    816 ///
    817 ///       function-definition: [C99 6.9.1]
    818 ///         decl-specs      declarator declaration-list[opt] compound-statement
    819 /// [C90] function-definition: [C99 6.7.1] - implicit int result
    820 /// [C90]   decl-specs[opt] declarator declaration-list[opt] compound-statement
    821 ///
    822 ///       declaration: [C99 6.7]
    823 ///         declaration-specifiers init-declarator-list[opt] ';'
    824 /// [!C99]  init-declarator-list ';'                   [TODO: warn in c99 mode]
    825 /// [OMP]   threadprivate-directive                              [TODO]
    826 ///
    827 Parser::DeclGroupPtrTy
    828 Parser::ParseDeclOrFunctionDefInternal(ParsedAttributesWithRange &attrs,
    829                                        ParsingDeclSpec &DS,
    830                                        AccessSpecifier AS) {
    831   // Parse the common declaration-specifiers piece.
    832   ParseDeclarationSpecifiers(DS, ParsedTemplateInfo(), AS, DSC_top_level);
    833 
    834   // C99 6.7.2.3p6: Handle "struct-or-union identifier;", "enum { X };"
    835   // declaration-specifiers init-declarator-list[opt] ';'
    836   if (Tok.is(tok::semi)) {
    837     ProhibitAttributes(attrs);
    838     ConsumeToken();
    839     Decl *TheDecl = Actions.ParsedFreeStandingDeclSpec(getCurScope(), AS, DS);
    840     DS.complete(TheDecl);
    841     return Actions.ConvertDeclToDeclGroup(TheDecl);
    842   }
    843 
    844   DS.takeAttributesFrom(attrs);
    845 
    846   // ObjC2 allows prefix attributes on class interfaces and protocols.
    847   // FIXME: This still needs better diagnostics. We should only accept
    848   // attributes here, no types, etc.
    849   if (getLangOpts().ObjC2 && Tok.is(tok::at)) {
    850     SourceLocation AtLoc = ConsumeToken(); // the "@"
    851     if (!Tok.isObjCAtKeyword(tok::objc_interface) &&
    852         !Tok.isObjCAtKeyword(tok::objc_protocol)) {
    853       Diag(Tok, diag::err_objc_unexpected_attr);
    854       SkipUntil(tok::semi); // FIXME: better skip?
    855       return DeclGroupPtrTy();
    856     }
    857 
    858     DS.abort();
    859 
    860     const char *PrevSpec = 0;
    861     unsigned DiagID;
    862     if (DS.SetTypeSpecType(DeclSpec::TST_unspecified, AtLoc, PrevSpec, DiagID))
    863       Diag(AtLoc, DiagID) << PrevSpec;
    864 
    865     if (Tok.isObjCAtKeyword(tok::objc_protocol))
    866       return ParseObjCAtProtocolDeclaration(AtLoc, DS.getAttributes());
    867 
    868     return Actions.ConvertDeclToDeclGroup(
    869             ParseObjCAtInterfaceDeclaration(AtLoc, DS.getAttributes()));
    870   }
    871 
    872   // If the declspec consisted only of 'extern' and we have a string
    873   // literal following it, this must be a C++ linkage specifier like
    874   // 'extern "C"'.
    875   if (Tok.is(tok::string_literal) && getLangOpts().CPlusPlus &&
    876       DS.getStorageClassSpec() == DeclSpec::SCS_extern &&
    877       DS.getParsedSpecifiers() == DeclSpec::PQ_StorageClassSpecifier) {
    878     Decl *TheDecl = ParseLinkage(DS, Declarator::FileContext);
    879     return Actions.ConvertDeclToDeclGroup(TheDecl);
    880   }
    881 
    882   return ParseDeclGroup(DS, Declarator::FileContext, true);
    883 }
    884 
    885 Parser::DeclGroupPtrTy
    886 Parser::ParseDeclarationOrFunctionDefinition(ParsedAttributesWithRange &attrs,
    887                                              ParsingDeclSpec *DS,
    888                                              AccessSpecifier AS) {
    889   if (DS) {
    890     return ParseDeclOrFunctionDefInternal(attrs, *DS, AS);
    891   } else {
    892     ParsingDeclSpec PDS(*this);
    893     // Must temporarily exit the objective-c container scope for
    894     // parsing c constructs and re-enter objc container scope
    895     // afterwards.
    896     ObjCDeclContextSwitch ObjCDC(*this);
    897 
    898     return ParseDeclOrFunctionDefInternal(attrs, PDS, AS);
    899   }
    900 }
    901 
    902 /// ParseFunctionDefinition - We parsed and verified that the specified
    903 /// Declarator is well formed.  If this is a K&R-style function, read the
    904 /// parameters declaration-list, then start the compound-statement.
    905 ///
    906 ///       function-definition: [C99 6.9.1]
    907 ///         decl-specs      declarator declaration-list[opt] compound-statement
    908 /// [C90] function-definition: [C99 6.7.1] - implicit int result
    909 /// [C90]   decl-specs[opt] declarator declaration-list[opt] compound-statement
    910 /// [C++] function-definition: [C++ 8.4]
    911 ///         decl-specifier-seq[opt] declarator ctor-initializer[opt]
    912 ///         function-body
    913 /// [C++] function-definition: [C++ 8.4]
    914 ///         decl-specifier-seq[opt] declarator function-try-block
    915 ///
    916 Decl *Parser::ParseFunctionDefinition(ParsingDeclarator &D,
    917                                       const ParsedTemplateInfo &TemplateInfo,
    918                                       LateParsedAttrList *LateParsedAttrs) {
    919   // Poison the SEH identifiers so they are flagged as illegal in function bodies
    920   PoisonSEHIdentifiersRAIIObject PoisonSEHIdentifiers(*this, true);
    921   const DeclaratorChunk::FunctionTypeInfo &FTI = D.getFunctionTypeInfo();
    922 
    923   // If this is C90 and the declspecs were completely missing, fudge in an
    924   // implicit int.  We do this here because this is the only place where
    925   // declaration-specifiers are completely optional in the grammar.
    926   if (getLangOpts().ImplicitInt && D.getDeclSpec().isEmpty()) {
    927     const char *PrevSpec;
    928     unsigned DiagID;
    929     D.getMutableDeclSpec().SetTypeSpecType(DeclSpec::TST_int,
    930                                            D.getIdentifierLoc(),
    931                                            PrevSpec, DiagID);
    932     D.SetRangeBegin(D.getDeclSpec().getSourceRange().getBegin());
    933   }
    934 
    935   // If this declaration was formed with a K&R-style identifier list for the
    936   // arguments, parse declarations for all of the args next.
    937   // int foo(a,b) int a; float b; {}
    938   if (FTI.isKNRPrototype())
    939     ParseKNRParamDeclarations(D);
    940 
    941   // We should have either an opening brace or, in a C++ constructor,
    942   // we may have a colon.
    943   if (Tok.isNot(tok::l_brace) &&
    944       (!getLangOpts().CPlusPlus ||
    945        (Tok.isNot(tok::colon) && Tok.isNot(tok::kw_try) &&
    946         Tok.isNot(tok::equal)))) {
    947     Diag(Tok, diag::err_expected_fn_body);
    948 
    949     // Skip over garbage, until we get to '{'.  Don't eat the '{'.
    950     SkipUntil(tok::l_brace, true, true);
    951 
    952     // If we didn't find the '{', bail out.
    953     if (Tok.isNot(tok::l_brace))
    954       return 0;
    955   }
    956 
    957   // Check to make sure that any normal attributes are allowed to be on
    958   // a definition.  Late parsed attributes are checked at the end.
    959   if (Tok.isNot(tok::equal)) {
    960     AttributeList *DtorAttrs = D.getAttributes();
    961     while (DtorAttrs) {
    962       if (!IsThreadSafetyAttribute(DtorAttrs->getName()->getName())) {
    963         Diag(DtorAttrs->getLoc(), diag::warn_attribute_on_function_definition)
    964           << DtorAttrs->getName()->getName();
    965       }
    966       DtorAttrs = DtorAttrs->getNext();
    967     }
    968   }
    969 
    970   // In delayed template parsing mode, for function template we consume the
    971   // tokens and store them for late parsing at the end of the translation unit.
    972   if (getLangOpts().DelayedTemplateParsing &&
    973       Tok.isNot(tok::equal) &&
    974       TemplateInfo.Kind == ParsedTemplateInfo::Template) {
    975     MultiTemplateParamsArg TemplateParameterLists(*TemplateInfo.TemplateParams);
    976 
    977     ParseScope BodyScope(this, Scope::FnScope|Scope::DeclScope);
    978     Scope *ParentScope = getCurScope()->getParent();
    979 
    980     D.setFunctionDefinitionKind(FDK_Definition);
    981     Decl *DP = Actions.HandleDeclarator(ParentScope, D,
    982                                         TemplateParameterLists);
    983     D.complete(DP);
    984     D.getMutableDeclSpec().abort();
    985 
    986     if (DP) {
    987       LateParsedTemplatedFunction *LPT = new LateParsedTemplatedFunction(DP);
    988 
    989       FunctionDecl *FnD = 0;
    990       if (FunctionTemplateDecl *FunTmpl = dyn_cast<FunctionTemplateDecl>(DP))
    991         FnD = FunTmpl->getTemplatedDecl();
    992       else
    993         FnD = cast<FunctionDecl>(DP);
    994       Actions.CheckForFunctionRedefinition(FnD);
    995 
    996       LateParsedTemplateMap[FnD] = LPT;
    997       Actions.MarkAsLateParsedTemplate(FnD);
    998       LexTemplateFunctionForLateParsing(LPT->Toks);
    999     } else {
   1000       CachedTokens Toks;
   1001       LexTemplateFunctionForLateParsing(Toks);
   1002     }
   1003     return DP;
   1004   }
   1005   else if (CurParsedObjCImpl &&
   1006            !TemplateInfo.TemplateParams &&
   1007            (Tok.is(tok::l_brace) || Tok.is(tok::kw_try) ||
   1008             Tok.is(tok::colon)) &&
   1009       Actions.CurContext->isTranslationUnit()) {
   1010     ParseScope BodyScope(this, Scope::FnScope|Scope::DeclScope);
   1011     Scope *ParentScope = getCurScope()->getParent();
   1012 
   1013     D.setFunctionDefinitionKind(FDK_Definition);
   1014     Decl *FuncDecl = Actions.HandleDeclarator(ParentScope, D,
   1015                                               MultiTemplateParamsArg());
   1016     D.complete(FuncDecl);
   1017     D.getMutableDeclSpec().abort();
   1018     if (FuncDecl) {
   1019       // Consume the tokens and store them for later parsing.
   1020       StashAwayMethodOrFunctionBodyTokens(FuncDecl);
   1021       CurParsedObjCImpl->HasCFunction = true;
   1022       return FuncDecl;
   1023     }
   1024   }
   1025 
   1026   // Enter a scope for the function body.
   1027   ParseScope BodyScope(this, Scope::FnScope|Scope::DeclScope);
   1028 
   1029   // Tell the actions module that we have entered a function definition with the
   1030   // specified Declarator for the function.
   1031   Decl *Res = TemplateInfo.TemplateParams?
   1032       Actions.ActOnStartOfFunctionTemplateDef(getCurScope(),
   1033                                               *TemplateInfo.TemplateParams, D)
   1034     : Actions.ActOnStartOfFunctionDef(getCurScope(), D);
   1035 
   1036   // Break out of the ParsingDeclarator context before we parse the body.
   1037   D.complete(Res);
   1038 
   1039   // Break out of the ParsingDeclSpec context, too.  This const_cast is
   1040   // safe because we're always the sole owner.
   1041   D.getMutableDeclSpec().abort();
   1042 
   1043   if (Tok.is(tok::equal)) {
   1044     assert(getLangOpts().CPlusPlus && "Only C++ function definitions have '='");
   1045     ConsumeToken();
   1046 
   1047     Actions.ActOnFinishFunctionBody(Res, 0, false);
   1048 
   1049     bool Delete = false;
   1050     SourceLocation KWLoc;
   1051     if (Tok.is(tok::kw_delete)) {
   1052       Diag(Tok, getLangOpts().CPlusPlus0x ?
   1053            diag::warn_cxx98_compat_deleted_function :
   1054            diag::ext_deleted_function);
   1055 
   1056       KWLoc = ConsumeToken();
   1057       Actions.SetDeclDeleted(Res, KWLoc);
   1058       Delete = true;
   1059     } else if (Tok.is(tok::kw_default)) {
   1060       Diag(Tok, getLangOpts().CPlusPlus0x ?
   1061            diag::warn_cxx98_compat_defaulted_function :
   1062            diag::ext_defaulted_function);
   1063 
   1064       KWLoc = ConsumeToken();
   1065       Actions.SetDeclDefaulted(Res, KWLoc);
   1066     } else {
   1067       llvm_unreachable("function definition after = not 'delete' or 'default'");
   1068     }
   1069 
   1070     if (Tok.is(tok::comma)) {
   1071       Diag(KWLoc, diag::err_default_delete_in_multiple_declaration)
   1072         << Delete;
   1073       SkipUntil(tok::semi);
   1074     } else {
   1075       ExpectAndConsume(tok::semi, diag::err_expected_semi_after,
   1076                        Delete ? "delete" : "default", tok::semi);
   1077     }
   1078 
   1079     return Res;
   1080   }
   1081 
   1082   if (Tok.is(tok::kw_try))
   1083     return ParseFunctionTryBlock(Res, BodyScope);
   1084 
   1085   // If we have a colon, then we're probably parsing a C++
   1086   // ctor-initializer.
   1087   if (Tok.is(tok::colon)) {
   1088     ParseConstructorInitializer(Res);
   1089 
   1090     // Recover from error.
   1091     if (!Tok.is(tok::l_brace)) {
   1092       BodyScope.Exit();
   1093       Actions.ActOnFinishFunctionBody(Res, 0);
   1094       return Res;
   1095     }
   1096   } else
   1097     Actions.ActOnDefaultCtorInitializers(Res);
   1098 
   1099   // Late attributes are parsed in the same scope as the function body.
   1100   if (LateParsedAttrs)
   1101     ParseLexedAttributeList(*LateParsedAttrs, Res, false, true);
   1102 
   1103   return ParseFunctionStatementBody(Res, BodyScope);
   1104 }
   1105 
   1106 /// ParseKNRParamDeclarations - Parse 'declaration-list[opt]' which provides
   1107 /// types for a function with a K&R-style identifier list for arguments.
   1108 void Parser::ParseKNRParamDeclarations(Declarator &D) {
   1109   // We know that the top-level of this declarator is a function.
   1110   DeclaratorChunk::FunctionTypeInfo &FTI = D.getFunctionTypeInfo();
   1111 
   1112   // Enter function-declaration scope, limiting any declarators to the
   1113   // function prototype scope, including parameter declarators.
   1114   ParseScope PrototypeScope(this, Scope::FunctionPrototypeScope|Scope::DeclScope);
   1115 
   1116   // Read all the argument declarations.
   1117   while (isDeclarationSpecifier()) {
   1118     SourceLocation DSStart = Tok.getLocation();
   1119 
   1120     // Parse the common declaration-specifiers piece.
   1121     DeclSpec DS(AttrFactory);
   1122     ParseDeclarationSpecifiers(DS);
   1123 
   1124     // C99 6.9.1p6: 'each declaration in the declaration list shall have at
   1125     // least one declarator'.
   1126     // NOTE: GCC just makes this an ext-warn.  It's not clear what it does with
   1127     // the declarations though.  It's trivial to ignore them, really hard to do
   1128     // anything else with them.
   1129     if (Tok.is(tok::semi)) {
   1130       Diag(DSStart, diag::err_declaration_does_not_declare_param);
   1131       ConsumeToken();
   1132       continue;
   1133     }
   1134 
   1135     // C99 6.9.1p6: Declarations shall contain no storage-class specifiers other
   1136     // than register.
   1137     if (DS.getStorageClassSpec() != DeclSpec::SCS_unspecified &&
   1138         DS.getStorageClassSpec() != DeclSpec::SCS_register) {
   1139       Diag(DS.getStorageClassSpecLoc(),
   1140            diag::err_invalid_storage_class_in_func_decl);
   1141       DS.ClearStorageClassSpecs();
   1142     }
   1143     if (DS.isThreadSpecified()) {
   1144       Diag(DS.getThreadSpecLoc(),
   1145            diag::err_invalid_storage_class_in_func_decl);
   1146       DS.ClearStorageClassSpecs();
   1147     }
   1148 
   1149     // Parse the first declarator attached to this declspec.
   1150     Declarator ParmDeclarator(DS, Declarator::KNRTypeListContext);
   1151     ParseDeclarator(ParmDeclarator);
   1152 
   1153     // Handle the full declarator list.
   1154     while (1) {
   1155       // If attributes are present, parse them.
   1156       MaybeParseGNUAttributes(ParmDeclarator);
   1157 
   1158       // Ask the actions module to compute the type for this declarator.
   1159       Decl *Param =
   1160         Actions.ActOnParamDeclarator(getCurScope(), ParmDeclarator);
   1161 
   1162       if (Param &&
   1163           // A missing identifier has already been diagnosed.
   1164           ParmDeclarator.getIdentifier()) {
   1165 
   1166         // Scan the argument list looking for the correct param to apply this
   1167         // type.
   1168         for (unsigned i = 0; ; ++i) {
   1169           // C99 6.9.1p6: those declarators shall declare only identifiers from
   1170           // the identifier list.
   1171           if (i == FTI.NumArgs) {
   1172             Diag(ParmDeclarator.getIdentifierLoc(), diag::err_no_matching_param)
   1173               << ParmDeclarator.getIdentifier();
   1174             break;
   1175           }
   1176 
   1177           if (FTI.ArgInfo[i].Ident == ParmDeclarator.getIdentifier()) {
   1178             // Reject redefinitions of parameters.
   1179             if (FTI.ArgInfo[i].Param) {
   1180               Diag(ParmDeclarator.getIdentifierLoc(),
   1181                    diag::err_param_redefinition)
   1182                  << ParmDeclarator.getIdentifier();
   1183             } else {
   1184               FTI.ArgInfo[i].Param = Param;
   1185             }
   1186             break;
   1187           }
   1188         }
   1189       }
   1190 
   1191       // If we don't have a comma, it is either the end of the list (a ';') or
   1192       // an error, bail out.
   1193       if (Tok.isNot(tok::comma))
   1194         break;
   1195 
   1196       ParmDeclarator.clear();
   1197 
   1198       // Consume the comma.
   1199       ParmDeclarator.setCommaLoc(ConsumeToken());
   1200 
   1201       // Parse the next declarator.
   1202       ParseDeclarator(ParmDeclarator);
   1203     }
   1204 
   1205     if (ExpectAndConsumeSemi(diag::err_expected_semi_declaration)) {
   1206       // Skip to end of block or statement
   1207       SkipUntil(tok::semi, true);
   1208       if (Tok.is(tok::semi))
   1209         ConsumeToken();
   1210     }
   1211   }
   1212 
   1213   // The actions module must verify that all arguments were declared.
   1214   Actions.ActOnFinishKNRParamDeclarations(getCurScope(), D, Tok.getLocation());
   1215 }
   1216 
   1217 
   1218 /// ParseAsmStringLiteral - This is just a normal string-literal, but is not
   1219 /// allowed to be a wide string, and is not subject to character translation.
   1220 ///
   1221 /// [GNU] asm-string-literal:
   1222 ///         string-literal
   1223 ///
   1224 Parser::ExprResult Parser::ParseAsmStringLiteral() {
   1225   switch (Tok.getKind()) {
   1226     case tok::string_literal:
   1227       break;
   1228     case tok::utf8_string_literal:
   1229     case tok::utf16_string_literal:
   1230     case tok::utf32_string_literal:
   1231     case tok::wide_string_literal: {
   1232       SourceLocation L = Tok.getLocation();
   1233       Diag(Tok, diag::err_asm_operand_wide_string_literal)
   1234         << (Tok.getKind() == tok::wide_string_literal)
   1235         << SourceRange(L, L);
   1236       return ExprError();
   1237     }
   1238     default:
   1239       Diag(Tok, diag::err_expected_string_literal);
   1240       return ExprError();
   1241   }
   1242 
   1243   return ParseStringLiteralExpression();
   1244 }
   1245 
   1246 /// ParseSimpleAsm
   1247 ///
   1248 /// [GNU] simple-asm-expr:
   1249 ///         'asm' '(' asm-string-literal ')'
   1250 ///
   1251 Parser::ExprResult Parser::ParseSimpleAsm(SourceLocation *EndLoc) {
   1252   assert(Tok.is(tok::kw_asm) && "Not an asm!");
   1253   SourceLocation Loc = ConsumeToken();
   1254 
   1255   if (Tok.is(tok::kw_volatile)) {
   1256     // Remove from the end of 'asm' to the end of 'volatile'.
   1257     SourceRange RemovalRange(PP.getLocForEndOfToken(Loc),
   1258                              PP.getLocForEndOfToken(Tok.getLocation()));
   1259 
   1260     Diag(Tok, diag::warn_file_asm_volatile)
   1261       << FixItHint::CreateRemoval(RemovalRange);
   1262     ConsumeToken();
   1263   }
   1264 
   1265   BalancedDelimiterTracker T(*this, tok::l_paren);
   1266   if (T.consumeOpen()) {
   1267     Diag(Tok, diag::err_expected_lparen_after) << "asm";
   1268     return ExprError();
   1269   }
   1270 
   1271   ExprResult Result(ParseAsmStringLiteral());
   1272 
   1273   if (Result.isInvalid()) {
   1274     SkipUntil(tok::r_paren, true, true);
   1275     if (EndLoc)
   1276       *EndLoc = Tok.getLocation();
   1277     ConsumeAnyToken();
   1278   } else {
   1279     // Close the paren and get the location of the end bracket
   1280     T.consumeClose();
   1281     if (EndLoc)
   1282       *EndLoc = T.getCloseLocation();
   1283   }
   1284 
   1285   return Result;
   1286 }
   1287 
   1288 /// \brief Get the TemplateIdAnnotation from the token and put it in the
   1289 /// cleanup pool so that it gets destroyed when parsing the current top level
   1290 /// declaration is finished.
   1291 TemplateIdAnnotation *Parser::takeTemplateIdAnnotation(const Token &tok) {
   1292   assert(tok.is(tok::annot_template_id) && "Expected template-id token");
   1293   TemplateIdAnnotation *
   1294       Id = static_cast<TemplateIdAnnotation *>(tok.getAnnotationValue());
   1295   return Id;
   1296 }
   1297 
   1298 void Parser::AnnotateScopeToken(CXXScopeSpec &SS, bool IsNewAnnotation) {
   1299   // Push the current token back into the token stream (or revert it if it is
   1300   // cached) and use an annotation scope token for current token.
   1301   if (PP.isBacktrackEnabled())
   1302     PP.RevertCachedTokens(1);
   1303   else
   1304     PP.EnterToken(Tok);
   1305   Tok.setKind(tok::annot_cxxscope);
   1306   Tok.setAnnotationValue(Actions.SaveNestedNameSpecifierAnnotation(SS));
   1307   Tok.setAnnotationRange(SS.getRange());
   1308 
   1309   // In case the tokens were cached, have Preprocessor replace them
   1310   // with the annotation token.  We don't need to do this if we've
   1311   // just reverted back to a prior state.
   1312   if (IsNewAnnotation)
   1313     PP.AnnotateCachedTokens(Tok);
   1314 }
   1315 
   1316 /// \brief Attempt to classify the name at the current token position. This may
   1317 /// form a type, scope or primary expression annotation, or replace the token
   1318 /// with a typo-corrected keyword. This is only appropriate when the current
   1319 /// name must refer to an entity which has already been declared.
   1320 ///
   1321 /// \param IsAddressOfOperand Must be \c true if the name is preceded by an '&'
   1322 ///        and might possibly have a dependent nested name specifier.
   1323 /// \param CCC Indicates how to perform typo-correction for this name. If NULL,
   1324 ///        no typo correction will be performed.
   1325 Parser::AnnotatedNameKind
   1326 Parser::TryAnnotateName(bool IsAddressOfOperand,
   1327                         CorrectionCandidateCallback *CCC) {
   1328   assert(Tok.is(tok::identifier) || Tok.is(tok::annot_cxxscope));
   1329 
   1330   const bool EnteringContext = false;
   1331   const bool WasScopeAnnotation = Tok.is(tok::annot_cxxscope);
   1332 
   1333   CXXScopeSpec SS;
   1334   if (getLangOpts().CPlusPlus &&
   1335       ParseOptionalCXXScopeSpecifier(SS, ParsedType(), EnteringContext))
   1336     return ANK_Error;
   1337 
   1338   if (Tok.isNot(tok::identifier) || SS.isInvalid()) {
   1339     if (TryAnnotateTypeOrScopeTokenAfterScopeSpec(EnteringContext, false, SS,
   1340                                                   !WasScopeAnnotation))
   1341       return ANK_Error;
   1342     return ANK_Unresolved;
   1343   }
   1344 
   1345   IdentifierInfo *Name = Tok.getIdentifierInfo();
   1346   SourceLocation NameLoc = Tok.getLocation();
   1347 
   1348   // FIXME: Move the tentative declaration logic into ClassifyName so we can
   1349   // typo-correct to tentatively-declared identifiers.
   1350   if (isTentativelyDeclared(Name)) {
   1351     // Identifier has been tentatively declared, and thus cannot be resolved as
   1352     // an expression. Fall back to annotating it as a type.
   1353     if (TryAnnotateTypeOrScopeTokenAfterScopeSpec(EnteringContext, false, SS,
   1354                                                   !WasScopeAnnotation))
   1355       return ANK_Error;
   1356     return Tok.is(tok::annot_typename) ? ANK_Success : ANK_TentativeDecl;
   1357   }
   1358 
   1359   Token Next = NextToken();
   1360 
   1361   // Look up and classify the identifier. We don't perform any typo-correction
   1362   // after a scope specifier, because in general we can't recover from typos
   1363   // there (eg, after correcting 'A::tempalte B<X>::C', we would need to jump
   1364   // back into scope specifier parsing).
   1365   Sema::NameClassification Classification
   1366     = Actions.ClassifyName(getCurScope(), SS, Name, NameLoc, Next,
   1367                            IsAddressOfOperand, SS.isEmpty() ? CCC : 0);
   1368 
   1369   switch (Classification.getKind()) {
   1370   case Sema::NC_Error:
   1371     return ANK_Error;
   1372 
   1373   case Sema::NC_Keyword:
   1374     // The identifier was typo-corrected to a keyword.
   1375     Tok.setIdentifierInfo(Name);
   1376     Tok.setKind(Name->getTokenID());
   1377     PP.TypoCorrectToken(Tok);
   1378     if (SS.isNotEmpty())
   1379       AnnotateScopeToken(SS, !WasScopeAnnotation);
   1380     // We've "annotated" this as a keyword.
   1381     return ANK_Success;
   1382 
   1383   case Sema::NC_Unknown:
   1384     // It's not something we know about. Leave it unannotated.
   1385     break;
   1386 
   1387   case Sema::NC_Type:
   1388     Tok.setKind(tok::annot_typename);
   1389     setTypeAnnotation(Tok, Classification.getType());
   1390     Tok.setAnnotationEndLoc(NameLoc);
   1391     if (SS.isNotEmpty())
   1392       Tok.setLocation(SS.getBeginLoc());
   1393     PP.AnnotateCachedTokens(Tok);
   1394     return ANK_Success;
   1395 
   1396   case Sema::NC_Expression:
   1397     Tok.setKind(tok::annot_primary_expr);
   1398     setExprAnnotation(Tok, Classification.getExpression());
   1399     Tok.setAnnotationEndLoc(NameLoc);
   1400     if (SS.isNotEmpty())
   1401       Tok.setLocation(SS.getBeginLoc());
   1402     PP.AnnotateCachedTokens(Tok);
   1403     return ANK_Success;
   1404 
   1405   case Sema::NC_TypeTemplate:
   1406     if (Next.isNot(tok::less)) {
   1407       // This may be a type template being used as a template template argument.
   1408       if (SS.isNotEmpty())
   1409         AnnotateScopeToken(SS, !WasScopeAnnotation);
   1410       return ANK_TemplateName;
   1411     }
   1412     // Fall through.
   1413   case Sema::NC_FunctionTemplate: {
   1414     // We have a type or function template followed by '<'.
   1415     ConsumeToken();
   1416     UnqualifiedId Id;
   1417     Id.setIdentifier(Name, NameLoc);
   1418     if (AnnotateTemplateIdToken(
   1419             TemplateTy::make(Classification.getTemplateName()),
   1420             Classification.getTemplateNameKind(), SS, SourceLocation(), Id))
   1421       return ANK_Error;
   1422     return ANK_Success;
   1423   }
   1424 
   1425   case Sema::NC_NestedNameSpecifier:
   1426     llvm_unreachable("already parsed nested name specifier");
   1427   }
   1428 
   1429   // Unable to classify the name, but maybe we can annotate a scope specifier.
   1430   if (SS.isNotEmpty())
   1431     AnnotateScopeToken(SS, !WasScopeAnnotation);
   1432   return ANK_Unresolved;
   1433 }
   1434 
   1435 /// TryAnnotateTypeOrScopeToken - If the current token position is on a
   1436 /// typename (possibly qualified in C++) or a C++ scope specifier not followed
   1437 /// by a typename, TryAnnotateTypeOrScopeToken will replace one or more tokens
   1438 /// with a single annotation token representing the typename or C++ scope
   1439 /// respectively.
   1440 /// This simplifies handling of C++ scope specifiers and allows efficient
   1441 /// backtracking without the need to re-parse and resolve nested-names and
   1442 /// typenames.
   1443 /// It will mainly be called when we expect to treat identifiers as typenames
   1444 /// (if they are typenames). For example, in C we do not expect identifiers
   1445 /// inside expressions to be treated as typenames so it will not be called
   1446 /// for expressions in C.
   1447 /// The benefit for C/ObjC is that a typename will be annotated and
   1448 /// Actions.getTypeName will not be needed to be called again (e.g. getTypeName
   1449 /// will not be called twice, once to check whether we have a declaration
   1450 /// specifier, and another one to get the actual type inside
   1451 /// ParseDeclarationSpecifiers).
   1452 ///
   1453 /// This returns true if an error occurred.
   1454 ///
   1455 /// Note that this routine emits an error if you call it with ::new or ::delete
   1456 /// as the current tokens, so only call it in contexts where these are invalid.
   1457 bool Parser::TryAnnotateTypeOrScopeToken(bool EnteringContext, bool NeedType) {
   1458   assert((Tok.is(tok::identifier) || Tok.is(tok::coloncolon)
   1459           || Tok.is(tok::kw_typename) || Tok.is(tok::annot_cxxscope)
   1460           || Tok.is(tok::kw_decltype) || Tok.is(tok::annot_template_id))
   1461           && "Cannot be a type or scope token!");
   1462 
   1463   if (Tok.is(tok::kw_typename)) {
   1464     // Parse a C++ typename-specifier, e.g., "typename T::type".
   1465     //
   1466     //   typename-specifier:
   1467     //     'typename' '::' [opt] nested-name-specifier identifier
   1468     //     'typename' '::' [opt] nested-name-specifier template [opt]
   1469     //            simple-template-id
   1470     SourceLocation TypenameLoc = ConsumeToken();
   1471     CXXScopeSpec SS;
   1472     if (ParseOptionalCXXScopeSpecifier(SS, /*ObjectType=*/ParsedType(),
   1473                                        /*EnteringContext=*/false,
   1474                                        0, /*IsTypename*/true))
   1475       return true;
   1476     if (!SS.isSet()) {
   1477       if (Tok.is(tok::identifier) || Tok.is(tok::annot_template_id) ||
   1478           Tok.is(tok::annot_decltype)) {
   1479         // Attempt to recover by skipping the invalid 'typename'
   1480         if (Tok.is(tok::annot_decltype) ||
   1481             (!TryAnnotateTypeOrScopeToken(EnteringContext, NeedType) &&
   1482             Tok.isAnnotation())) {
   1483           unsigned DiagID = diag::err_expected_qualified_after_typename;
   1484           // MS compatibility: MSVC permits using known types with typename.
   1485           // e.g. "typedef typename T* pointer_type"
   1486           if (getLangOpts().MicrosoftExt)
   1487             DiagID = diag::warn_expected_qualified_after_typename;
   1488           Diag(Tok.getLocation(), DiagID);
   1489           return false;
   1490         }
   1491       }
   1492 
   1493       Diag(Tok.getLocation(), diag::err_expected_qualified_after_typename);
   1494       return true;
   1495     }
   1496 
   1497     TypeResult Ty;
   1498     if (Tok.is(tok::identifier)) {
   1499       // FIXME: check whether the next token is '<', first!
   1500       Ty = Actions.ActOnTypenameType(getCurScope(), TypenameLoc, SS,
   1501                                      *Tok.getIdentifierInfo(),
   1502                                      Tok.getLocation());
   1503     } else if (Tok.is(tok::annot_template_id)) {
   1504       TemplateIdAnnotation *TemplateId = takeTemplateIdAnnotation(Tok);
   1505       if (TemplateId->Kind == TNK_Function_template) {
   1506         Diag(Tok, diag::err_typename_refers_to_non_type_template)
   1507           << Tok.getAnnotationRange();
   1508         return true;
   1509       }
   1510 
   1511       ASTTemplateArgsPtr TemplateArgsPtr(TemplateId->getTemplateArgs(),
   1512                                          TemplateId->NumArgs);
   1513 
   1514       Ty = Actions.ActOnTypenameType(getCurScope(), TypenameLoc, SS,
   1515                                      TemplateId->TemplateKWLoc,
   1516                                      TemplateId->Template,
   1517                                      TemplateId->TemplateNameLoc,
   1518                                      TemplateId->LAngleLoc,
   1519                                      TemplateArgsPtr,
   1520                                      TemplateId->RAngleLoc);
   1521     } else {
   1522       Diag(Tok, diag::err_expected_type_name_after_typename)
   1523         << SS.getRange();
   1524       return true;
   1525     }
   1526 
   1527     SourceLocation EndLoc = Tok.getLastLoc();
   1528     Tok.setKind(tok::annot_typename);
   1529     setTypeAnnotation(Tok, Ty.isInvalid() ? ParsedType() : Ty.get());
   1530     Tok.setAnnotationEndLoc(EndLoc);
   1531     Tok.setLocation(TypenameLoc);
   1532     PP.AnnotateCachedTokens(Tok);
   1533     return false;
   1534   }
   1535 
   1536   // Remembers whether the token was originally a scope annotation.
   1537   bool WasScopeAnnotation = Tok.is(tok::annot_cxxscope);
   1538 
   1539   CXXScopeSpec SS;
   1540   if (getLangOpts().CPlusPlus)
   1541     if (ParseOptionalCXXScopeSpecifier(SS, ParsedType(), EnteringContext))
   1542       return true;
   1543 
   1544   return TryAnnotateTypeOrScopeTokenAfterScopeSpec(EnteringContext, NeedType,
   1545                                                    SS, !WasScopeAnnotation);
   1546 }
   1547 
   1548 /// \brief Try to annotate a type or scope token, having already parsed an
   1549 /// optional scope specifier. \p IsNewScope should be \c true unless the scope
   1550 /// specifier was extracted from an existing tok::annot_cxxscope annotation.
   1551 bool Parser::TryAnnotateTypeOrScopeTokenAfterScopeSpec(bool EnteringContext,
   1552                                                        bool NeedType,
   1553                                                        CXXScopeSpec &SS,
   1554                                                        bool IsNewScope) {
   1555   if (Tok.is(tok::identifier)) {
   1556     IdentifierInfo *CorrectedII = 0;
   1557     // Determine whether the identifier is a type name.
   1558     if (ParsedType Ty = Actions.getTypeName(*Tok.getIdentifierInfo(),
   1559                                             Tok.getLocation(), getCurScope(),
   1560                                             &SS, false,
   1561                                             NextToken().is(tok::period),
   1562                                             ParsedType(),
   1563                                             /*IsCtorOrDtorName=*/false,
   1564                                             /*NonTrivialTypeSourceInfo*/true,
   1565                                             NeedType ? &CorrectedII : NULL)) {
   1566       // A FixIt was applied as a result of typo correction
   1567       if (CorrectedII)
   1568         Tok.setIdentifierInfo(CorrectedII);
   1569       // This is a typename. Replace the current token in-place with an
   1570       // annotation type token.
   1571       Tok.setKind(tok::annot_typename);
   1572       setTypeAnnotation(Tok, Ty);
   1573       Tok.setAnnotationEndLoc(Tok.getLocation());
   1574       if (SS.isNotEmpty()) // it was a C++ qualified type name.
   1575         Tok.setLocation(SS.getBeginLoc());
   1576 
   1577       // In case the tokens were cached, have Preprocessor replace
   1578       // them with the annotation token.
   1579       PP.AnnotateCachedTokens(Tok);
   1580       return false;
   1581     }
   1582 
   1583     if (!getLangOpts().CPlusPlus) {
   1584       // If we're in C, we can't have :: tokens at all (the lexer won't return
   1585       // them).  If the identifier is not a type, then it can't be scope either,
   1586       // just early exit.
   1587       return false;
   1588     }
   1589 
   1590     // If this is a template-id, annotate with a template-id or type token.
   1591     if (NextToken().is(tok::less)) {
   1592       TemplateTy Template;
   1593       UnqualifiedId TemplateName;
   1594       TemplateName.setIdentifier(Tok.getIdentifierInfo(), Tok.getLocation());
   1595       bool MemberOfUnknownSpecialization;
   1596       if (TemplateNameKind TNK
   1597           = Actions.isTemplateName(getCurScope(), SS,
   1598                                    /*hasTemplateKeyword=*/false, TemplateName,
   1599                                    /*ObjectType=*/ ParsedType(),
   1600                                    EnteringContext,
   1601                                    Template, MemberOfUnknownSpecialization)) {
   1602         // Consume the identifier.
   1603         ConsumeToken();
   1604         if (AnnotateTemplateIdToken(Template, TNK, SS, SourceLocation(),
   1605                                     TemplateName)) {
   1606           // If an unrecoverable error occurred, we need to return true here,
   1607           // because the token stream is in a damaged state.  We may not return
   1608           // a valid identifier.
   1609           return true;
   1610         }
   1611       }
   1612     }
   1613 
   1614     // The current token, which is either an identifier or a
   1615     // template-id, is not part of the annotation. Fall through to
   1616     // push that token back into the stream and complete the C++ scope
   1617     // specifier annotation.
   1618   }
   1619 
   1620   if (Tok.is(tok::annot_template_id)) {
   1621     TemplateIdAnnotation *TemplateId = takeTemplateIdAnnotation(Tok);
   1622     if (TemplateId->Kind == TNK_Type_template) {
   1623       // A template-id that refers to a type was parsed into a
   1624       // template-id annotation in a context where we weren't allowed
   1625       // to produce a type annotation token. Update the template-id
   1626       // annotation token to a type annotation token now.
   1627       AnnotateTemplateIdTokenAsType();
   1628       return false;
   1629     }
   1630   }
   1631 
   1632   if (SS.isEmpty())
   1633     return false;
   1634 
   1635   // A C++ scope specifier that isn't followed by a typename.
   1636   AnnotateScopeToken(SS, IsNewScope);
   1637   return false;
   1638 }
   1639 
   1640 /// TryAnnotateScopeToken - Like TryAnnotateTypeOrScopeToken but only
   1641 /// annotates C++ scope specifiers and template-ids.  This returns
   1642 /// true if there was an error that could not be recovered from.
   1643 ///
   1644 /// Note that this routine emits an error if you call it with ::new or ::delete
   1645 /// as the current tokens, so only call it in contexts where these are invalid.
   1646 bool Parser::TryAnnotateCXXScopeToken(bool EnteringContext) {
   1647   assert(getLangOpts().CPlusPlus &&
   1648          "Call sites of this function should be guarded by checking for C++");
   1649   assert((Tok.is(tok::identifier) || Tok.is(tok::coloncolon) ||
   1650           (Tok.is(tok::annot_template_id) && NextToken().is(tok::coloncolon)) ||
   1651          Tok.is(tok::kw_decltype)) && "Cannot be a type or scope token!");
   1652 
   1653   CXXScopeSpec SS;
   1654   if (ParseOptionalCXXScopeSpecifier(SS, ParsedType(), EnteringContext))
   1655     return true;
   1656   if (SS.isEmpty())
   1657     return false;
   1658 
   1659   AnnotateScopeToken(SS, true);
   1660   return false;
   1661 }
   1662 
   1663 bool Parser::isTokenEqualOrEqualTypo() {
   1664   tok::TokenKind Kind = Tok.getKind();
   1665   switch (Kind) {
   1666   default:
   1667     return false;
   1668   case tok::ampequal:            // &=
   1669   case tok::starequal:           // *=
   1670   case tok::plusequal:           // +=
   1671   case tok::minusequal:          // -=
   1672   case tok::exclaimequal:        // !=
   1673   case tok::slashequal:          // /=
   1674   case tok::percentequal:        // %=
   1675   case tok::lessequal:           // <=
   1676   case tok::lesslessequal:       // <<=
   1677   case tok::greaterequal:        // >=
   1678   case tok::greatergreaterequal: // >>=
   1679   case tok::caretequal:          // ^=
   1680   case tok::pipeequal:           // |=
   1681   case tok::equalequal:          // ==
   1682     Diag(Tok, diag::err_invalid_token_after_declarator_suggest_equal)
   1683       << getTokenSimpleSpelling(Kind)
   1684       << FixItHint::CreateReplacement(SourceRange(Tok.getLocation()), "=");
   1685   case tok::equal:
   1686     return true;
   1687   }
   1688 }
   1689 
   1690 SourceLocation Parser::handleUnexpectedCodeCompletionToken() {
   1691   assert(Tok.is(tok::code_completion));
   1692   PrevTokLocation = Tok.getLocation();
   1693 
   1694   for (Scope *S = getCurScope(); S; S = S->getParent()) {
   1695     if (S->getFlags() & Scope::FnScope) {
   1696       Actions.CodeCompleteOrdinaryName(getCurScope(), Sema::PCC_RecoveryInFunction);
   1697       cutOffParsing();
   1698       return PrevTokLocation;
   1699     }
   1700 
   1701     if (S->getFlags() & Scope::ClassScope) {
   1702       Actions.CodeCompleteOrdinaryName(getCurScope(), Sema::PCC_Class);
   1703       cutOffParsing();
   1704       return PrevTokLocation;
   1705     }
   1706   }
   1707 
   1708   Actions.CodeCompleteOrdinaryName(getCurScope(), Sema::PCC_Namespace);
   1709   cutOffParsing();
   1710   return PrevTokLocation;
   1711 }
   1712 
   1713 // Anchor the Parser::FieldCallback vtable to this translation unit.
   1714 // We use a spurious method instead of the destructor because
   1715 // destroying FieldCallbacks can actually be slightly
   1716 // performance-sensitive.
   1717 void Parser::FieldCallback::_anchor() {
   1718 }
   1719 
   1720 // Code-completion pass-through functions
   1721 
   1722 void Parser::CodeCompleteDirective(bool InConditional) {
   1723   Actions.CodeCompletePreprocessorDirective(InConditional);
   1724 }
   1725 
   1726 void Parser::CodeCompleteInConditionalExclusion() {
   1727   Actions.CodeCompleteInPreprocessorConditionalExclusion(getCurScope());
   1728 }
   1729 
   1730 void Parser::CodeCompleteMacroName(bool IsDefinition) {
   1731   Actions.CodeCompletePreprocessorMacroName(IsDefinition);
   1732 }
   1733 
   1734 void Parser::CodeCompletePreprocessorExpression() {
   1735   Actions.CodeCompletePreprocessorExpression();
   1736 }
   1737 
   1738 void Parser::CodeCompleteMacroArgument(IdentifierInfo *Macro,
   1739                                        MacroInfo *MacroInfo,
   1740                                        unsigned ArgumentIndex) {
   1741   Actions.CodeCompletePreprocessorMacroArgument(getCurScope(), Macro, MacroInfo,
   1742                                                 ArgumentIndex);
   1743 }
   1744 
   1745 void Parser::CodeCompleteNaturalLanguage() {
   1746   Actions.CodeCompleteNaturalLanguage();
   1747 }
   1748 
   1749 bool Parser::ParseMicrosoftIfExistsCondition(IfExistsCondition& Result) {
   1750   assert((Tok.is(tok::kw___if_exists) || Tok.is(tok::kw___if_not_exists)) &&
   1751          "Expected '__if_exists' or '__if_not_exists'");
   1752   Result.IsIfExists = Tok.is(tok::kw___if_exists);
   1753   Result.KeywordLoc = ConsumeToken();
   1754 
   1755   BalancedDelimiterTracker T(*this, tok::l_paren);
   1756   if (T.consumeOpen()) {
   1757     Diag(Tok, diag::err_expected_lparen_after)
   1758       << (Result.IsIfExists? "__if_exists" : "__if_not_exists");
   1759     return true;
   1760   }
   1761 
   1762   // Parse nested-name-specifier.
   1763   ParseOptionalCXXScopeSpecifier(Result.SS, ParsedType(),
   1764                                  /*EnteringContext=*/false);
   1765 
   1766   // Check nested-name specifier.
   1767   if (Result.SS.isInvalid()) {
   1768     T.skipToEnd();
   1769     return true;
   1770   }
   1771 
   1772   // Parse the unqualified-id.
   1773   SourceLocation TemplateKWLoc; // FIXME: parsed, but unused.
   1774   if (ParseUnqualifiedId(Result.SS, false, true, true, ParsedType(),
   1775                          TemplateKWLoc, Result.Name)) {
   1776     T.skipToEnd();
   1777     return true;
   1778   }
   1779 
   1780   if (T.consumeClose())
   1781     return true;
   1782 
   1783   // Check if the symbol exists.
   1784   switch (Actions.CheckMicrosoftIfExistsSymbol(getCurScope(), Result.KeywordLoc,
   1785                                                Result.IsIfExists, Result.SS,
   1786                                                Result.Name)) {
   1787   case Sema::IER_Exists:
   1788     Result.Behavior = Result.IsIfExists ? IEB_Parse : IEB_Skip;
   1789     break;
   1790 
   1791   case Sema::IER_DoesNotExist:
   1792     Result.Behavior = !Result.IsIfExists ? IEB_Parse : IEB_Skip;
   1793     break;
   1794 
   1795   case Sema::IER_Dependent:
   1796     Result.Behavior = IEB_Dependent;
   1797     break;
   1798 
   1799   case Sema::IER_Error:
   1800     return true;
   1801   }
   1802 
   1803   return false;
   1804 }
   1805 
   1806 void Parser::ParseMicrosoftIfExistsExternalDeclaration() {
   1807   IfExistsCondition Result;
   1808   if (ParseMicrosoftIfExistsCondition(Result))
   1809     return;
   1810 
   1811   BalancedDelimiterTracker Braces(*this, tok::l_brace);
   1812   if (Braces.consumeOpen()) {
   1813     Diag(Tok, diag::err_expected_lbrace);
   1814     return;
   1815   }
   1816 
   1817   switch (Result.Behavior) {
   1818   case IEB_Parse:
   1819     // Parse declarations below.
   1820     break;
   1821 
   1822   case IEB_Dependent:
   1823     llvm_unreachable("Cannot have a dependent external declaration");
   1824 
   1825   case IEB_Skip:
   1826     Braces.skipToEnd();
   1827     return;
   1828   }
   1829 
   1830   // Parse the declarations.
   1831   while (Tok.isNot(tok::r_brace) && Tok.isNot(tok::eof)) {
   1832     ParsedAttributesWithRange attrs(AttrFactory);
   1833     MaybeParseCXX0XAttributes(attrs);
   1834     MaybeParseMicrosoftAttributes(attrs);
   1835     DeclGroupPtrTy Result = ParseExternalDeclaration(attrs);
   1836     if (Result && !getCurScope()->getParent())
   1837       Actions.getASTConsumer().HandleTopLevelDecl(Result.get());
   1838   }
   1839   Braces.consumeClose();
   1840 }
   1841 
   1842 Parser::DeclGroupPtrTy Parser::ParseModuleImport(SourceLocation AtLoc) {
   1843   assert(Tok.isObjCAtKeyword(tok::objc___experimental_modules_import) &&
   1844          "Improper start to module import");
   1845   SourceLocation ImportLoc = ConsumeToken();
   1846 
   1847   llvm::SmallVector<std::pair<IdentifierInfo *, SourceLocation>, 2> Path;
   1848 
   1849   // Parse the module path.
   1850   do {
   1851     if (!Tok.is(tok::identifier)) {
   1852       if (Tok.is(tok::code_completion)) {
   1853         Actions.CodeCompleteModuleImport(ImportLoc, Path);
   1854         ConsumeCodeCompletionToken();
   1855         SkipUntil(tok::semi);
   1856         return DeclGroupPtrTy();
   1857       }
   1858 
   1859       Diag(Tok, diag::err_module_expected_ident);
   1860       SkipUntil(tok::semi);
   1861       return DeclGroupPtrTy();
   1862     }
   1863 
   1864     // Record this part of the module path.
   1865     Path.push_back(std::make_pair(Tok.getIdentifierInfo(), Tok.getLocation()));
   1866     ConsumeToken();
   1867 
   1868     if (Tok.is(tok::period)) {
   1869       ConsumeToken();
   1870       continue;
   1871     }
   1872 
   1873     break;
   1874   } while (true);
   1875 
   1876   DeclResult Import = Actions.ActOnModuleImport(AtLoc, ImportLoc, Path);
   1877   ExpectAndConsumeSemi(diag::err_module_expected_semi);
   1878   if (Import.isInvalid())
   1879     return DeclGroupPtrTy();
   1880 
   1881   return Actions.ConvertDeclToDeclGroup(Import.get());
   1882 }
   1883 
   1884 bool BalancedDelimiterTracker::diagnoseOverflow() {
   1885   P.Diag(P.Tok, diag::err_parser_impl_limit_overflow);
   1886   P.SkipUntil(tok::eof);
   1887   return true;
   1888 }
   1889 
   1890 bool BalancedDelimiterTracker::expectAndConsume(unsigned DiagID,
   1891                                             const char *Msg,
   1892                                             tok::TokenKind SkipToToc ) {
   1893   LOpen = P.Tok.getLocation();
   1894   if (P.ExpectAndConsume(Kind, DiagID, Msg, SkipToToc))
   1895     return true;
   1896 
   1897   if (getDepth() < MaxDepth)
   1898     return false;
   1899 
   1900   return diagnoseOverflow();
   1901 }
   1902 
   1903 bool BalancedDelimiterTracker::diagnoseMissingClose() {
   1904   assert(!P.Tok.is(Close) && "Should have consumed closing delimiter");
   1905 
   1906   const char *LHSName = "unknown";
   1907   diag::kind DID;
   1908   switch (Close) {
   1909   default: llvm_unreachable("Unexpected balanced token");
   1910   case tok::r_paren : LHSName = "("; DID = diag::err_expected_rparen; break;
   1911   case tok::r_brace : LHSName = "{"; DID = diag::err_expected_rbrace; break;
   1912   case tok::r_square: LHSName = "["; DID = diag::err_expected_rsquare; break;
   1913   }
   1914   P.Diag(P.Tok, DID);
   1915   P.Diag(LOpen, diag::note_matching) << LHSName;
   1916   if (P.SkipUntil(Close))
   1917     LClose = P.Tok.getLocation();
   1918   return true;
   1919 }
   1920 
   1921 void BalancedDelimiterTracker::skipToEnd() {
   1922   P.SkipUntil(Close, false);
   1923 }
   1924