Add support for .skip.
[oota-llvm.git] / lib / MC / MCParser / AsmParser.cpp
1 //===- AsmParser.cpp - Parser for Assembly Files --------------------------===//
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 class implements the parser for assembly files.
11 //
12 //===----------------------------------------------------------------------===//
13
14 #include "llvm/ADT/APFloat.h"
15 #include "llvm/ADT/SmallString.h"
16 #include "llvm/ADT/StringMap.h"
17 #include "llvm/ADT/StringSwitch.h"
18 #include "llvm/ADT/Twine.h"
19 #include "llvm/MC/MCAsmInfo.h"
20 #include "llvm/MC/MCContext.h"
21 #include "llvm/MC/MCExpr.h"
22 #include "llvm/MC/MCParser/AsmCond.h"
23 #include "llvm/MC/MCParser/AsmLexer.h"
24 #include "llvm/MC/MCParser/MCAsmParser.h"
25 #include "llvm/MC/MCParser/MCParsedAsmOperand.h"
26 #include "llvm/MC/MCSectionMachO.h"
27 #include "llvm/MC/MCStreamer.h"
28 #include "llvm/MC/MCSymbol.h"
29 #include "llvm/MC/MCDwarf.h"
30 #include "llvm/Support/MemoryBuffer.h"
31 #include "llvm/Support/SourceMgr.h"
32 #include "llvm/Support/raw_ostream.h"
33 #include "llvm/Target/TargetAsmInfo.h"
34 #include "llvm/Target/TargetAsmParser.h"
35 #include <cctype>
36 #include <vector>
37 using namespace llvm;
38
39 namespace {
40
41 /// \brief Helper class for tracking macro definitions.
42 struct Macro {
43   StringRef Name;
44   StringRef Body;
45
46 public:
47   Macro(StringRef N, StringRef B) : Name(N), Body(B) {}
48 };
49
50 /// \brief Helper class for storing information about an active macro
51 /// instantiation.
52 struct MacroInstantiation {
53   /// The macro being instantiated.
54   const Macro *TheMacro;
55
56   /// The macro instantiation with substitutions.
57   MemoryBuffer *Instantiation;
58
59   /// The location of the instantiation.
60   SMLoc InstantiationLoc;
61
62   /// The location where parsing should resume upon instantiation completion.
63   SMLoc ExitLoc;
64
65 public:
66   MacroInstantiation(const Macro *M, SMLoc IL, SMLoc EL,
67                      const std::vector<std::vector<AsmToken> > &A);
68 };
69
70 /// \brief The concrete assembly parser instance.
71 class AsmParser : public MCAsmParser {
72   friend class GenericAsmParser;
73
74   AsmParser(const AsmParser &);   // DO NOT IMPLEMENT
75   void operator=(const AsmParser &);  // DO NOT IMPLEMENT
76 private:
77   AsmLexer Lexer;
78   MCContext &Ctx;
79   MCStreamer &Out;
80   SourceMgr &SrcMgr;
81   MCAsmParserExtension *GenericParser;
82   MCAsmParserExtension *PlatformParser;
83
84   /// This is the current buffer index we're lexing from as managed by the
85   /// SourceMgr object.
86   int CurBuffer;
87
88   AsmCond TheCondState;
89   std::vector<AsmCond> TheCondStack;
90
91   /// DirectiveMap - This is a table handlers for directives.  Each handler is
92   /// invoked after the directive identifier is read and is responsible for
93   /// parsing and validating the rest of the directive.  The handler is passed
94   /// in the directive name and the location of the directive keyword.
95   StringMap<std::pair<MCAsmParserExtension*, DirectiveHandler> > DirectiveMap;
96
97   /// MacroMap - Map of currently defined macros.
98   StringMap<Macro*> MacroMap;
99
100   /// ActiveMacros - Stack of active macro instantiations.
101   std::vector<MacroInstantiation*> ActiveMacros;
102
103   /// Boolean tracking whether macro substitution is enabled.
104   unsigned MacrosEnabled : 1;
105
106   /// Flag tracking whether any errors have been encountered.
107   unsigned HadError : 1;
108
109 public:
110   AsmParser(const Target &T, SourceMgr &SM, MCContext &Ctx, MCStreamer &Out,
111             const MCAsmInfo &MAI);
112   ~AsmParser();
113
114   virtual bool Run(bool NoInitialTextSection, bool NoFinalize = false);
115
116   void AddDirectiveHandler(MCAsmParserExtension *Object,
117                            StringRef Directive,
118                            DirectiveHandler Handler) {
119     DirectiveMap[Directive] = std::make_pair(Object, Handler);
120   }
121
122 public:
123   /// @name MCAsmParser Interface
124   /// {
125
126   virtual SourceMgr &getSourceManager() { return SrcMgr; }
127   virtual MCAsmLexer &getLexer() { return Lexer; }
128   virtual MCContext &getContext() { return Ctx; }
129   virtual MCStreamer &getStreamer() { return Out; }
130
131   virtual void Warning(SMLoc L, const Twine &Meg);
132   virtual bool Error(SMLoc L, const Twine &Msg);
133
134   const AsmToken &Lex();
135
136   bool ParseExpression(const MCExpr *&Res);
137   virtual bool ParseExpression(const MCExpr *&Res, SMLoc &EndLoc);
138   virtual bool ParseParenExpression(const MCExpr *&Res, SMLoc &EndLoc);
139   virtual bool ParseAbsoluteExpression(int64_t &Res);
140
141   /// }
142
143 private:
144   void CheckForValidSection();
145
146   bool ParseStatement();
147
148   bool HandleMacroEntry(StringRef Name, SMLoc NameLoc, const Macro *M);
149   void HandleMacroExit();
150
151   void PrintMacroInstantiations();
152   void PrintMessage(SMLoc Loc, const Twine &Msg, const char *Type) const {
153     SrcMgr.PrintMessage(Loc, Msg, Type);
154   }
155
156   /// EnterIncludeFile - Enter the specified file. This returns true on failure.
157   bool EnterIncludeFile(const std::string &Filename);
158
159   /// \brief Reset the current lexer position to that given by \arg Loc. The
160   /// current token is not set; clients should ensure Lex() is called
161   /// subsequently.
162   void JumpToLoc(SMLoc Loc);
163
164   void EatToEndOfStatement();
165
166   /// \brief Parse up to the end of statement and a return the contents from the
167   /// current token until the end of the statement; the current token on exit
168   /// will be either the EndOfStatement or EOF.
169   StringRef ParseStringToEndOfStatement();
170
171   bool ParseAssignment(StringRef Name, bool allow_redef);
172
173   bool ParsePrimaryExpr(const MCExpr *&Res, SMLoc &EndLoc);
174   bool ParseBinOpRHS(unsigned Precedence, const MCExpr *&Res, SMLoc &EndLoc);
175   bool ParseParenExpr(const MCExpr *&Res, SMLoc &EndLoc);
176   bool ParseBracketExpr(const MCExpr *&Res, SMLoc &EndLoc);
177
178   /// ParseIdentifier - Parse an identifier or string (as a quoted identifier)
179   /// and set \arg Res to the identifier contents.
180   bool ParseIdentifier(StringRef &Res);
181
182   // Directive Parsing.
183
184  // ".ascii", ".asciiz", ".string"
185   bool ParseDirectiveAscii(StringRef IDVal, bool ZeroTerminated);
186   bool ParseDirectiveValue(unsigned Size); // ".byte", ".long", ...
187   bool ParseDirectiveRealValue(const fltSemantics &); // ".single", ...
188   bool ParseDirectiveFill(); // ".fill"
189   bool ParseDirectiveSpace(); // ".space"
190   bool ParseDirectiveZero(); // ".zero"
191   bool ParseDirectiveSet(StringRef IDVal, bool allow_redef); // ".set", ".equ", ".equiv"
192   bool ParseDirectiveOrg(); // ".org"
193   // ".align{,32}", ".p2align{,w,l}"
194   bool ParseDirectiveAlign(bool IsPow2, unsigned ValueSize);
195
196   /// ParseDirectiveSymbolAttribute - Parse a directive like ".globl" which
197   /// accepts a single symbol (which should be a label or an external).
198   bool ParseDirectiveSymbolAttribute(MCSymbolAttr Attr);
199
200   bool ParseDirectiveComm(bool IsLocal); // ".comm" and ".lcomm"
201
202   bool ParseDirectiveAbort(); // ".abort"
203   bool ParseDirectiveInclude(); // ".include"
204
205   bool ParseDirectiveIf(SMLoc DirectiveLoc); // ".if"
206   // ".ifdef" or ".ifndef", depending on expect_defined
207   bool ParseDirectiveIfdef(SMLoc DirectiveLoc, bool expect_defined);
208   bool ParseDirectiveElseIf(SMLoc DirectiveLoc); // ".elseif"
209   bool ParseDirectiveElse(SMLoc DirectiveLoc); // ".else"
210   bool ParseDirectiveEndIf(SMLoc DirectiveLoc); // .endif
211
212   /// ParseEscapedString - Parse the current token as a string which may include
213   /// escaped characters and return the string contents.
214   bool ParseEscapedString(std::string &Data);
215
216   const MCExpr *ApplyModifierToExpr(const MCExpr *E,
217                                     MCSymbolRefExpr::VariantKind Variant);
218 };
219
220 /// \brief Generic implementations of directive handling, etc. which is shared
221 /// (or the default, at least) for all assembler parser.
222 class GenericAsmParser : public MCAsmParserExtension {
223   template<bool (GenericAsmParser::*Handler)(StringRef, SMLoc)>
224   void AddDirectiveHandler(StringRef Directive) {
225     getParser().AddDirectiveHandler(this, Directive,
226                                     HandleDirective<GenericAsmParser, Handler>);
227   }
228 public:
229   GenericAsmParser() {}
230
231   AsmParser &getParser() {
232     return (AsmParser&) this->MCAsmParserExtension::getParser();
233   }
234
235   virtual void Initialize(MCAsmParser &Parser) {
236     // Call the base implementation.
237     this->MCAsmParserExtension::Initialize(Parser);
238
239     // Debugging directives.
240     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveFile>(".file");
241     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveLine>(".line");
242     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveLoc>(".loc");
243     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveStabs>(".stabs");
244
245     // CFI directives.
246     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveCFIStartProc>(
247                                                               ".cfi_startproc");
248     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveCFIEndProc>(
249                                                                 ".cfi_endproc");
250     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveCFIDefCfa>(
251                                                          ".cfi_def_cfa");
252     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveCFIDefCfaOffset>(
253                                                          ".cfi_def_cfa_offset");
254     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveCFIDefCfaRegister>(
255                                                        ".cfi_def_cfa_register");
256     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveCFIOffset>(
257                                                                  ".cfi_offset");
258     AddDirectiveHandler<
259      &GenericAsmParser::ParseDirectiveCFIPersonalityOrLsda>(".cfi_personality");
260     AddDirectiveHandler<
261             &GenericAsmParser::ParseDirectiveCFIPersonalityOrLsda>(".cfi_lsda");
262     AddDirectiveHandler<
263       &GenericAsmParser::ParseDirectiveCFIRememberState>(".cfi_remember_state");
264     AddDirectiveHandler<
265       &GenericAsmParser::ParseDirectiveCFIRestoreState>(".cfi_restore_state");
266
267     // Macro directives.
268     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveMacrosOnOff>(
269       ".macros_on");
270     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveMacrosOnOff>(
271       ".macros_off");
272     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveMacro>(".macro");
273     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveEndMacro>(".endm");
274     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveEndMacro>(".endmacro");
275
276     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveLEB128>(".sleb128");
277     AddDirectiveHandler<&GenericAsmParser::ParseDirectiveLEB128>(".uleb128");
278   }
279
280   bool ParseRegisterOrRegisterNumber(int64_t &Register, SMLoc DirectiveLoc);
281
282   bool ParseDirectiveFile(StringRef, SMLoc DirectiveLoc);
283   bool ParseDirectiveLine(StringRef, SMLoc DirectiveLoc);
284   bool ParseDirectiveLoc(StringRef, SMLoc DirectiveLoc);
285   bool ParseDirectiveStabs(StringRef, SMLoc DirectiveLoc);
286   bool ParseDirectiveCFIStartProc(StringRef, SMLoc DirectiveLoc);
287   bool ParseDirectiveCFIEndProc(StringRef, SMLoc DirectiveLoc);
288   bool ParseDirectiveCFIDefCfa(StringRef, SMLoc DirectiveLoc);
289   bool ParseDirectiveCFIDefCfaOffset(StringRef, SMLoc DirectiveLoc);
290   bool ParseDirectiveCFIDefCfaRegister(StringRef, SMLoc DirectiveLoc);
291   bool ParseDirectiveCFIOffset(StringRef, SMLoc DirectiveLoc);
292   bool ParseDirectiveCFIPersonalityOrLsda(StringRef, SMLoc DirectiveLoc);
293   bool ParseDirectiveCFIRememberState(StringRef, SMLoc DirectiveLoc);
294   bool ParseDirectiveCFIRestoreState(StringRef, SMLoc DirectiveLoc);
295
296   bool ParseDirectiveMacrosOnOff(StringRef, SMLoc DirectiveLoc);
297   bool ParseDirectiveMacro(StringRef, SMLoc DirectiveLoc);
298   bool ParseDirectiveEndMacro(StringRef, SMLoc DirectiveLoc);
299
300   bool ParseDirectiveLEB128(StringRef, SMLoc);
301 };
302
303 }
304
305 namespace llvm {
306
307 extern MCAsmParserExtension *createDarwinAsmParser();
308 extern MCAsmParserExtension *createELFAsmParser();
309 extern MCAsmParserExtension *createCOFFAsmParser();
310
311 }
312
313 enum { DEFAULT_ADDRSPACE = 0 };
314
315 AsmParser::AsmParser(const Target &T, SourceMgr &_SM, MCContext &_Ctx,
316                      MCStreamer &_Out, const MCAsmInfo &_MAI)
317   : Lexer(_MAI), Ctx(_Ctx), Out(_Out), SrcMgr(_SM),
318     GenericParser(new GenericAsmParser), PlatformParser(0),
319     CurBuffer(0), MacrosEnabled(true) {
320   Lexer.setBuffer(SrcMgr.getMemoryBuffer(CurBuffer));
321
322   // Initialize the generic parser.
323   GenericParser->Initialize(*this);
324
325   // Initialize the platform / file format parser.
326   //
327   // FIXME: This is a hack, we need to (majorly) cleanup how these objects are
328   // created.
329   if (_MAI.hasMicrosoftFastStdCallMangling()) {
330     PlatformParser = createCOFFAsmParser();
331     PlatformParser->Initialize(*this);
332   } else if (_MAI.hasSubsectionsViaSymbols()) {
333     PlatformParser = createDarwinAsmParser();
334     PlatformParser->Initialize(*this);
335   } else {
336     PlatformParser = createELFAsmParser();
337     PlatformParser->Initialize(*this);
338   }
339 }
340
341 AsmParser::~AsmParser() {
342   assert(ActiveMacros.empty() && "Unexpected active macro instantiation!");
343
344   // Destroy any macros.
345   for (StringMap<Macro*>::iterator it = MacroMap.begin(),
346          ie = MacroMap.end(); it != ie; ++it)
347     delete it->getValue();
348
349   delete PlatformParser;
350   delete GenericParser;
351 }
352
353 void AsmParser::PrintMacroInstantiations() {
354   // Print the active macro instantiation stack.
355   for (std::vector<MacroInstantiation*>::const_reverse_iterator
356          it = ActiveMacros.rbegin(), ie = ActiveMacros.rend(); it != ie; ++it)
357     PrintMessage((*it)->InstantiationLoc, "while in macro instantiation",
358                  "note");
359 }
360
361 void AsmParser::Warning(SMLoc L, const Twine &Msg) {
362   PrintMessage(L, Msg, "warning");
363   PrintMacroInstantiations();
364 }
365
366 bool AsmParser::Error(SMLoc L, const Twine &Msg) {
367   HadError = true;
368   PrintMessage(L, Msg, "error");
369   PrintMacroInstantiations();
370   return true;
371 }
372
373 bool AsmParser::EnterIncludeFile(const std::string &Filename) {
374   int NewBuf = SrcMgr.AddIncludeFile(Filename, Lexer.getLoc());
375   if (NewBuf == -1)
376     return true;
377
378   CurBuffer = NewBuf;
379
380   Lexer.setBuffer(SrcMgr.getMemoryBuffer(CurBuffer));
381
382   return false;
383 }
384
385 void AsmParser::JumpToLoc(SMLoc Loc) {
386   CurBuffer = SrcMgr.FindBufferContainingLoc(Loc);
387   Lexer.setBuffer(SrcMgr.getMemoryBuffer(CurBuffer), Loc.getPointer());
388 }
389
390 const AsmToken &AsmParser::Lex() {
391   const AsmToken *tok = &Lexer.Lex();
392
393   if (tok->is(AsmToken::Eof)) {
394     // If this is the end of an included file, pop the parent file off the
395     // include stack.
396     SMLoc ParentIncludeLoc = SrcMgr.getParentIncludeLoc(CurBuffer);
397     if (ParentIncludeLoc != SMLoc()) {
398       JumpToLoc(ParentIncludeLoc);
399       tok = &Lexer.Lex();
400     }
401   }
402
403   if (tok->is(AsmToken::Error))
404     Error(Lexer.getErrLoc(), Lexer.getErr());
405
406   return *tok;
407 }
408
409 bool AsmParser::Run(bool NoInitialTextSection, bool NoFinalize) {
410   // Create the initial section, if requested.
411   if (!NoInitialTextSection)
412     Out.InitSections();
413
414   // Prime the lexer.
415   Lex();
416
417   HadError = false;
418   AsmCond StartingCondState = TheCondState;
419
420   // While we have input, parse each statement.
421   while (Lexer.isNot(AsmToken::Eof)) {
422     if (!ParseStatement()) continue;
423
424     // We had an error, validate that one was emitted and recover by skipping to
425     // the next line.
426     assert(HadError && "Parse statement returned an error, but none emitted!");
427     EatToEndOfStatement();
428   }
429
430   if (TheCondState.TheCond != StartingCondState.TheCond ||
431       TheCondState.Ignore != StartingCondState.Ignore)
432     return TokError("unmatched .ifs or .elses");
433
434   // Check to see there are no empty DwarfFile slots.
435   const std::vector<MCDwarfFile *> &MCDwarfFiles =
436     getContext().getMCDwarfFiles();
437   for (unsigned i = 1; i < MCDwarfFiles.size(); i++) {
438     if (!MCDwarfFiles[i])
439       TokError("unassigned file number: " + Twine(i) + " for .file directives");
440   }
441
442   // Finalize the output stream if there are no errors and if the client wants
443   // us to.
444   if (!HadError && !NoFinalize)
445     Out.Finish();
446
447   return HadError;
448 }
449
450 void AsmParser::CheckForValidSection() {
451   if (!getStreamer().getCurrentSection()) {
452     TokError("expected section directive before assembly directive");
453     Out.SwitchSection(Ctx.getMachOSection(
454                         "__TEXT", "__text",
455                         MCSectionMachO::S_ATTR_PURE_INSTRUCTIONS,
456                         0, SectionKind::getText()));
457   }
458 }
459
460 /// EatToEndOfStatement - Throw away the rest of the line for testing purposes.
461 void AsmParser::EatToEndOfStatement() {
462   while (Lexer.isNot(AsmToken::EndOfStatement) &&
463          Lexer.isNot(AsmToken::Eof))
464     Lex();
465
466   // Eat EOL.
467   if (Lexer.is(AsmToken::EndOfStatement))
468     Lex();
469 }
470
471 StringRef AsmParser::ParseStringToEndOfStatement() {
472   const char *Start = getTok().getLoc().getPointer();
473
474   while (Lexer.isNot(AsmToken::EndOfStatement) &&
475          Lexer.isNot(AsmToken::Eof))
476     Lex();
477
478   const char *End = getTok().getLoc().getPointer();
479   return StringRef(Start, End - Start);
480 }
481
482 /// ParseParenExpr - Parse a paren expression and return it.
483 /// NOTE: This assumes the leading '(' has already been consumed.
484 ///
485 /// parenexpr ::= expr)
486 ///
487 bool AsmParser::ParseParenExpr(const MCExpr *&Res, SMLoc &EndLoc) {
488   if (ParseExpression(Res)) return true;
489   if (Lexer.isNot(AsmToken::RParen))
490     return TokError("expected ')' in parentheses expression");
491   EndLoc = Lexer.getLoc();
492   Lex();
493   return false;
494 }
495
496 /// ParseBracketExpr - Parse a bracket expression and return it.
497 /// NOTE: This assumes the leading '[' has already been consumed.
498 ///
499 /// bracketexpr ::= expr]
500 ///
501 bool AsmParser::ParseBracketExpr(const MCExpr *&Res, SMLoc &EndLoc) {
502   if (ParseExpression(Res)) return true;
503   if (Lexer.isNot(AsmToken::RBrac))
504     return TokError("expected ']' in brackets expression");
505   EndLoc = Lexer.getLoc();
506   Lex();
507   return false;
508 }
509
510 /// ParsePrimaryExpr - Parse a primary expression and return it.
511 ///  primaryexpr ::= (parenexpr
512 ///  primaryexpr ::= symbol
513 ///  primaryexpr ::= number
514 ///  primaryexpr ::= '.'
515 ///  primaryexpr ::= ~,+,- primaryexpr
516 bool AsmParser::ParsePrimaryExpr(const MCExpr *&Res, SMLoc &EndLoc) {
517   switch (Lexer.getKind()) {
518   default:
519     return TokError("unknown token in expression");
520   case AsmToken::Exclaim:
521     Lex(); // Eat the operator.
522     if (ParsePrimaryExpr(Res, EndLoc))
523       return true;
524     Res = MCUnaryExpr::CreateLNot(Res, getContext());
525     return false;
526   case AsmToken::Dollar:
527   case AsmToken::String:
528   case AsmToken::Identifier: {
529     EndLoc = Lexer.getLoc();
530
531     StringRef Identifier;
532     if (ParseIdentifier(Identifier))
533       return false;
534
535     // This is a symbol reference.
536     std::pair<StringRef, StringRef> Split = Identifier.split('@');
537     MCSymbol *Sym = getContext().GetOrCreateSymbol(Split.first);
538
539     // Lookup the symbol variant if used.
540     MCSymbolRefExpr::VariantKind Variant = MCSymbolRefExpr::VK_None;
541     if (Split.first.size() != Identifier.size()) {
542       Variant = MCSymbolRefExpr::getVariantKindForName(Split.second);
543       if (Variant == MCSymbolRefExpr::VK_Invalid) {
544         Variant = MCSymbolRefExpr::VK_None;
545         return TokError("invalid variant '" + Split.second + "'");
546       }
547     }
548
549     // If this is an absolute variable reference, substitute it now to preserve
550     // semantics in the face of reassignment.
551     if (Sym->isVariable() && isa<MCConstantExpr>(Sym->getVariableValue())) {
552       if (Variant)
553         return Error(EndLoc, "unexpected modifier on variable reference");
554
555       Res = Sym->getVariableValue();
556       return false;
557     }
558
559     // Otherwise create a symbol ref.
560     Res = MCSymbolRefExpr::Create(Sym, Variant, getContext());
561     return false;
562   }
563   case AsmToken::Integer: {
564     SMLoc Loc = getTok().getLoc();
565     int64_t IntVal = getTok().getIntVal();
566     Res = MCConstantExpr::Create(IntVal, getContext());
567     EndLoc = Lexer.getLoc();
568     Lex(); // Eat token.
569     // Look for 'b' or 'f' following an Integer as a directional label
570     if (Lexer.getKind() == AsmToken::Identifier) {
571       StringRef IDVal = getTok().getString();
572       if (IDVal == "f" || IDVal == "b"){
573         MCSymbol *Sym = Ctx.GetDirectionalLocalSymbol(IntVal,
574                                                       IDVal == "f" ? 1 : 0);
575         Res = MCSymbolRefExpr::Create(Sym, MCSymbolRefExpr::VK_None,
576                                       getContext());
577         if(IDVal == "b" && Sym->isUndefined())
578           return Error(Loc, "invalid reference to undefined symbol");
579         EndLoc = Lexer.getLoc();
580         Lex(); // Eat identifier.
581       }
582     }
583     return false;
584   }
585   case AsmToken::Real: {
586     APFloat RealVal(APFloat::IEEEdouble, getTok().getString());
587     uint64_t IntVal = RealVal.bitcastToAPInt().getZExtValue();
588     Res = MCConstantExpr::Create(IntVal, getContext());
589     Lex(); // Eat token.
590     return false;
591   }
592   case AsmToken::Dot: {
593     // This is a '.' reference, which references the current PC.  Emit a
594     // temporary label to the streamer and refer to it.
595     MCSymbol *Sym = Ctx.CreateTempSymbol();
596     Out.EmitLabel(Sym);
597     Res = MCSymbolRefExpr::Create(Sym, MCSymbolRefExpr::VK_None, getContext());
598     EndLoc = Lexer.getLoc();
599     Lex(); // Eat identifier.
600     return false;
601   }
602   case AsmToken::LParen:
603     Lex(); // Eat the '('.
604     return ParseParenExpr(Res, EndLoc);
605   case AsmToken::LBrac:
606     if (!PlatformParser->HasBracketExpressions())
607       return TokError("brackets expression not supported on this target");
608     Lex(); // Eat the '['.
609     return ParseBracketExpr(Res, EndLoc);
610   case AsmToken::Minus:
611     Lex(); // Eat the operator.
612     if (ParsePrimaryExpr(Res, EndLoc))
613       return true;
614     Res = MCUnaryExpr::CreateMinus(Res, getContext());
615     return false;
616   case AsmToken::Plus:
617     Lex(); // Eat the operator.
618     if (ParsePrimaryExpr(Res, EndLoc))
619       return true;
620     Res = MCUnaryExpr::CreatePlus(Res, getContext());
621     return false;
622   case AsmToken::Tilde:
623     Lex(); // Eat the operator.
624     if (ParsePrimaryExpr(Res, EndLoc))
625       return true;
626     Res = MCUnaryExpr::CreateNot(Res, getContext());
627     return false;
628   }
629 }
630
631 bool AsmParser::ParseExpression(const MCExpr *&Res) {
632   SMLoc EndLoc;
633   return ParseExpression(Res, EndLoc);
634 }
635
636 const MCExpr *
637 AsmParser::ApplyModifierToExpr(const MCExpr *E,
638                                MCSymbolRefExpr::VariantKind Variant) {
639   // Recurse over the given expression, rebuilding it to apply the given variant
640   // if there is exactly one symbol.
641   switch (E->getKind()) {
642   case MCExpr::Target:
643   case MCExpr::Constant:
644     return 0;
645
646   case MCExpr::SymbolRef: {
647     const MCSymbolRefExpr *SRE = cast<MCSymbolRefExpr>(E);
648
649     if (SRE->getKind() != MCSymbolRefExpr::VK_None) {
650       TokError("invalid variant on expression '" +
651                getTok().getIdentifier() + "' (already modified)");
652       return E;
653     }
654
655     return MCSymbolRefExpr::Create(&SRE->getSymbol(), Variant, getContext());
656   }
657
658   case MCExpr::Unary: {
659     const MCUnaryExpr *UE = cast<MCUnaryExpr>(E);
660     const MCExpr *Sub = ApplyModifierToExpr(UE->getSubExpr(), Variant);
661     if (!Sub)
662       return 0;
663     return MCUnaryExpr::Create(UE->getOpcode(), Sub, getContext());
664   }
665
666   case MCExpr::Binary: {
667     const MCBinaryExpr *BE = cast<MCBinaryExpr>(E);
668     const MCExpr *LHS = ApplyModifierToExpr(BE->getLHS(), Variant);
669     const MCExpr *RHS = ApplyModifierToExpr(BE->getRHS(), Variant);
670
671     if (!LHS && !RHS)
672       return 0;
673
674     if (!LHS) LHS = BE->getLHS();
675     if (!RHS) RHS = BE->getRHS();
676
677     return MCBinaryExpr::Create(BE->getOpcode(), LHS, RHS, getContext());
678   }
679   }
680
681   assert(0 && "Invalid expression kind!");
682   return 0;
683 }
684
685 /// ParseExpression - Parse an expression and return it.
686 ///
687 ///  expr ::= expr +,- expr          -> lowest.
688 ///  expr ::= expr |,^,&,! expr      -> middle.
689 ///  expr ::= expr *,/,%,<<,>> expr  -> highest.
690 ///  expr ::= primaryexpr
691 ///
692 bool AsmParser::ParseExpression(const MCExpr *&Res, SMLoc &EndLoc) {
693   // Parse the expression.
694   Res = 0;
695   if (ParsePrimaryExpr(Res, EndLoc) || ParseBinOpRHS(1, Res, EndLoc))
696     return true;
697
698   // As a special case, we support 'a op b @ modifier' by rewriting the
699   // expression to include the modifier. This is inefficient, but in general we
700   // expect users to use 'a@modifier op b'.
701   if (Lexer.getKind() == AsmToken::At) {
702     Lex();
703
704     if (Lexer.isNot(AsmToken::Identifier))
705       return TokError("unexpected symbol modifier following '@'");
706
707     MCSymbolRefExpr::VariantKind Variant =
708       MCSymbolRefExpr::getVariantKindForName(getTok().getIdentifier());
709     if (Variant == MCSymbolRefExpr::VK_Invalid)
710       return TokError("invalid variant '" + getTok().getIdentifier() + "'");
711
712     const MCExpr *ModifiedRes = ApplyModifierToExpr(Res, Variant);
713     if (!ModifiedRes) {
714       return TokError("invalid modifier '" + getTok().getIdentifier() +
715                       "' (no symbols present)");
716       return true;
717     }
718
719     Res = ModifiedRes;
720     Lex();
721   }
722
723   // Try to constant fold it up front, if possible.
724   int64_t Value;
725   if (Res->EvaluateAsAbsolute(Value))
726     Res = MCConstantExpr::Create(Value, getContext());
727
728   return false;
729 }
730
731 bool AsmParser::ParseParenExpression(const MCExpr *&Res, SMLoc &EndLoc) {
732   Res = 0;
733   return ParseParenExpr(Res, EndLoc) ||
734          ParseBinOpRHS(1, Res, EndLoc);
735 }
736
737 bool AsmParser::ParseAbsoluteExpression(int64_t &Res) {
738   const MCExpr *Expr;
739
740   SMLoc StartLoc = Lexer.getLoc();
741   if (ParseExpression(Expr))
742     return true;
743
744   if (!Expr->EvaluateAsAbsolute(Res))
745     return Error(StartLoc, "expected absolute expression");
746
747   return false;
748 }
749
750 static unsigned getBinOpPrecedence(AsmToken::TokenKind K,
751                                    MCBinaryExpr::Opcode &Kind) {
752   switch (K) {
753   default:
754     return 0;    // not a binop.
755
756     // Lowest Precedence: &&, ||, @
757   case AsmToken::AmpAmp:
758     Kind = MCBinaryExpr::LAnd;
759     return 1;
760   case AsmToken::PipePipe:
761     Kind = MCBinaryExpr::LOr;
762     return 1;
763
764
765     // Low Precedence: |, &, ^
766     //
767     // FIXME: gas seems to support '!' as an infix operator?
768   case AsmToken::Pipe:
769     Kind = MCBinaryExpr::Or;
770     return 2;
771   case AsmToken::Caret:
772     Kind = MCBinaryExpr::Xor;
773     return 2;
774   case AsmToken::Amp:
775     Kind = MCBinaryExpr::And;
776     return 2;
777
778     // Low Intermediate Precedence: ==, !=, <>, <, <=, >, >=
779   case AsmToken::EqualEqual:
780     Kind = MCBinaryExpr::EQ;
781     return 3;
782   case AsmToken::ExclaimEqual:
783   case AsmToken::LessGreater:
784     Kind = MCBinaryExpr::NE;
785     return 3;
786   case AsmToken::Less:
787     Kind = MCBinaryExpr::LT;
788     return 3;
789   case AsmToken::LessEqual:
790     Kind = MCBinaryExpr::LTE;
791     return 3;
792   case AsmToken::Greater:
793     Kind = MCBinaryExpr::GT;
794     return 3;
795   case AsmToken::GreaterEqual:
796     Kind = MCBinaryExpr::GTE;
797     return 3;
798
799     // High Intermediate Precedence: +, -
800   case AsmToken::Plus:
801     Kind = MCBinaryExpr::Add;
802     return 4;
803   case AsmToken::Minus:
804     Kind = MCBinaryExpr::Sub;
805     return 4;
806
807     // Highest Precedence: *, /, %, <<, >>
808   case AsmToken::Star:
809     Kind = MCBinaryExpr::Mul;
810     return 5;
811   case AsmToken::Slash:
812     Kind = MCBinaryExpr::Div;
813     return 5;
814   case AsmToken::Percent:
815     Kind = MCBinaryExpr::Mod;
816     return 5;
817   case AsmToken::LessLess:
818     Kind = MCBinaryExpr::Shl;
819     return 5;
820   case AsmToken::GreaterGreater:
821     Kind = MCBinaryExpr::Shr;
822     return 5;
823   }
824 }
825
826
827 /// ParseBinOpRHS - Parse all binary operators with precedence >= 'Precedence'.
828 /// Res contains the LHS of the expression on input.
829 bool AsmParser::ParseBinOpRHS(unsigned Precedence, const MCExpr *&Res,
830                               SMLoc &EndLoc) {
831   while (1) {
832     MCBinaryExpr::Opcode Kind = MCBinaryExpr::Add;
833     unsigned TokPrec = getBinOpPrecedence(Lexer.getKind(), Kind);
834
835     // If the next token is lower precedence than we are allowed to eat, return
836     // successfully with what we ate already.
837     if (TokPrec < Precedence)
838       return false;
839
840     Lex();
841
842     // Eat the next primary expression.
843     const MCExpr *RHS;
844     if (ParsePrimaryExpr(RHS, EndLoc)) return true;
845
846     // If BinOp binds less tightly with RHS than the operator after RHS, let
847     // the pending operator take RHS as its LHS.
848     MCBinaryExpr::Opcode Dummy;
849     unsigned NextTokPrec = getBinOpPrecedence(Lexer.getKind(), Dummy);
850     if (TokPrec < NextTokPrec) {
851       if (ParseBinOpRHS(Precedence+1, RHS, EndLoc)) return true;
852     }
853
854     // Merge LHS and RHS according to operator.
855     Res = MCBinaryExpr::Create(Kind, Res, RHS, getContext());
856   }
857 }
858
859
860
861
862 /// ParseStatement:
863 ///   ::= EndOfStatement
864 ///   ::= Label* Directive ...Operands... EndOfStatement
865 ///   ::= Label* Identifier OperandList* EndOfStatement
866 bool AsmParser::ParseStatement() {
867   if (Lexer.is(AsmToken::EndOfStatement)) {
868     Out.AddBlankLine();
869     Lex();
870     return false;
871   }
872
873   // Statements always start with an identifier or are a full line comment.
874   AsmToken ID = getTok();
875   SMLoc IDLoc = ID.getLoc();
876   StringRef IDVal;
877   int64_t LocalLabelVal = -1;
878   // A full line comment is a '#' as the first token.
879   if (Lexer.is(AsmToken::Hash)) {
880     EatToEndOfStatement();
881     return false;
882   }
883
884   // Allow an integer followed by a ':' as a directional local label.
885   if (Lexer.is(AsmToken::Integer)) {
886     LocalLabelVal = getTok().getIntVal();
887     if (LocalLabelVal < 0) {
888       if (!TheCondState.Ignore)
889         return TokError("unexpected token at start of statement");
890       IDVal = "";
891     }
892     else {
893       IDVal = getTok().getString();
894       Lex(); // Consume the integer token to be used as an identifier token.
895       if (Lexer.getKind() != AsmToken::Colon) {
896         if (!TheCondState.Ignore)
897           return TokError("unexpected token at start of statement");
898       }
899     }
900
901   } else if (Lexer.is(AsmToken::Dot)) {
902     // Treat '.' as a valid identifier in this context.
903     Lex();
904     IDVal = ".";
905
906   } else if (ParseIdentifier(IDVal)) {
907     if (!TheCondState.Ignore)
908       return TokError("unexpected token at start of statement");
909     IDVal = "";
910   }
911
912
913   // Handle conditional assembly here before checking for skipping.  We
914   // have to do this so that .endif isn't skipped in a ".if 0" block for
915   // example.
916   if (IDVal == ".if")
917     return ParseDirectiveIf(IDLoc);
918   if (IDVal == ".ifdef")
919     return ParseDirectiveIfdef(IDLoc, true);
920   if (IDVal == ".ifndef" || IDVal == ".ifnotdef")
921     return ParseDirectiveIfdef(IDLoc, false);
922   if (IDVal == ".elseif")
923     return ParseDirectiveElseIf(IDLoc);
924   if (IDVal == ".else")
925     return ParseDirectiveElse(IDLoc);
926   if (IDVal == ".endif")
927     return ParseDirectiveEndIf(IDLoc);
928
929   // If we are in a ".if 0" block, ignore this statement.
930   if (TheCondState.Ignore) {
931     EatToEndOfStatement();
932     return false;
933   }
934
935   // FIXME: Recurse on local labels?
936
937   // See what kind of statement we have.
938   switch (Lexer.getKind()) {
939   case AsmToken::Colon: {
940     CheckForValidSection();
941
942     // identifier ':'   -> Label.
943     Lex();
944
945     // Diagnose attempt to use '.' as a label.
946     if (IDVal == ".")
947       return Error(IDLoc, "invalid use of pseudo-symbol '.' as a label");
948
949     // Diagnose attempt to use a variable as a label.
950     //
951     // FIXME: Diagnostics. Note the location of the definition as a label.
952     // FIXME: This doesn't diagnose assignment to a symbol which has been
953     // implicitly marked as external.
954     MCSymbol *Sym;
955     if (LocalLabelVal == -1)
956       Sym = getContext().GetOrCreateSymbol(IDVal);
957     else
958       Sym = Ctx.CreateDirectionalLocalSymbol(LocalLabelVal);
959     if (!Sym->isUndefined() || Sym->isVariable())
960       return Error(IDLoc, "invalid symbol redefinition");
961
962     // Emit the label.
963     Out.EmitLabel(Sym);
964
965     // Consume any end of statement token, if present, to avoid spurious
966     // AddBlankLine calls().
967     if (Lexer.is(AsmToken::EndOfStatement)) {
968       Lex();
969       if (Lexer.is(AsmToken::Eof))
970         return false;
971     }
972
973     return ParseStatement();
974   }
975
976   case AsmToken::Equal:
977     // identifier '=' ... -> assignment statement
978     Lex();
979
980     return ParseAssignment(IDVal, true);
981
982   default: // Normal instruction or directive.
983     break;
984   }
985
986   // If macros are enabled, check to see if this is a macro instantiation.
987   if (MacrosEnabled)
988     if (const Macro *M = MacroMap.lookup(IDVal))
989       return HandleMacroEntry(IDVal, IDLoc, M);
990
991   // Otherwise, we have a normal instruction or directive.
992   if (IDVal[0] == '.' && IDVal != ".") {
993     // Assembler features
994     if (IDVal == ".set" || IDVal == ".equ")
995       return ParseDirectiveSet(IDVal, true);
996     if (IDVal == ".equiv")
997       return ParseDirectiveSet(IDVal, false);
998
999     // Data directives
1000
1001     if (IDVal == ".ascii")
1002       return ParseDirectiveAscii(IDVal, false);
1003     if (IDVal == ".asciz" || IDVal == ".string")
1004       return ParseDirectiveAscii(IDVal, true);
1005
1006     if (IDVal == ".byte")
1007       return ParseDirectiveValue(1);
1008     if (IDVal == ".short")
1009       return ParseDirectiveValue(2);
1010     if (IDVal == ".value")
1011       return ParseDirectiveValue(2);
1012     if (IDVal == ".2byte")
1013       return ParseDirectiveValue(2);
1014     if (IDVal == ".long")
1015       return ParseDirectiveValue(4);
1016     if (IDVal == ".int")
1017       return ParseDirectiveValue(4);
1018     if (IDVal == ".4byte")
1019       return ParseDirectiveValue(4);
1020     if (IDVal == ".quad")
1021       return ParseDirectiveValue(8);
1022     if (IDVal == ".8byte")
1023       return ParseDirectiveValue(8);
1024     if (IDVal == ".single" || IDVal == ".float")
1025       return ParseDirectiveRealValue(APFloat::IEEEsingle);
1026     if (IDVal == ".double")
1027       return ParseDirectiveRealValue(APFloat::IEEEdouble);
1028
1029     if (IDVal == ".align") {
1030       bool IsPow2 = !getContext().getAsmInfo().getAlignmentIsInBytes();
1031       return ParseDirectiveAlign(IsPow2, /*ExprSize=*/1);
1032     }
1033     if (IDVal == ".align32") {
1034       bool IsPow2 = !getContext().getAsmInfo().getAlignmentIsInBytes();
1035       return ParseDirectiveAlign(IsPow2, /*ExprSize=*/4);
1036     }
1037     if (IDVal == ".balign")
1038       return ParseDirectiveAlign(/*IsPow2=*/false, /*ExprSize=*/1);
1039     if (IDVal == ".balignw")
1040       return ParseDirectiveAlign(/*IsPow2=*/false, /*ExprSize=*/2);
1041     if (IDVal == ".balignl")
1042       return ParseDirectiveAlign(/*IsPow2=*/false, /*ExprSize=*/4);
1043     if (IDVal == ".p2align")
1044       return ParseDirectiveAlign(/*IsPow2=*/true, /*ExprSize=*/1);
1045     if (IDVal == ".p2alignw")
1046       return ParseDirectiveAlign(/*IsPow2=*/true, /*ExprSize=*/2);
1047     if (IDVal == ".p2alignl")
1048       return ParseDirectiveAlign(/*IsPow2=*/true, /*ExprSize=*/4);
1049
1050     if (IDVal == ".org")
1051       return ParseDirectiveOrg();
1052
1053     if (IDVal == ".fill")
1054       return ParseDirectiveFill();
1055     if (IDVal == ".space" || IDVal == ".skip")
1056       return ParseDirectiveSpace();
1057     if (IDVal == ".zero")
1058       return ParseDirectiveZero();
1059
1060     // Symbol attribute directives
1061
1062     if (IDVal == ".globl" || IDVal == ".global")
1063       return ParseDirectiveSymbolAttribute(MCSA_Global);
1064     // ELF only? Should it be here?
1065     if (IDVal == ".local")
1066       return ParseDirectiveSymbolAttribute(MCSA_Local);
1067     if (IDVal == ".hidden")
1068       return ParseDirectiveSymbolAttribute(MCSA_Hidden);
1069     if (IDVal == ".indirect_symbol")
1070       return ParseDirectiveSymbolAttribute(MCSA_IndirectSymbol);
1071     if (IDVal == ".internal")
1072       return ParseDirectiveSymbolAttribute(MCSA_Internal);
1073     if (IDVal == ".lazy_reference")
1074       return ParseDirectiveSymbolAttribute(MCSA_LazyReference);
1075     if (IDVal == ".no_dead_strip")
1076       return ParseDirectiveSymbolAttribute(MCSA_NoDeadStrip);
1077     if (IDVal == ".symbol_resolver")
1078       return ParseDirectiveSymbolAttribute(MCSA_SymbolResolver);
1079     if (IDVal == ".private_extern")
1080       return ParseDirectiveSymbolAttribute(MCSA_PrivateExtern);
1081     if (IDVal == ".protected")
1082       return ParseDirectiveSymbolAttribute(MCSA_Protected);
1083     if (IDVal == ".reference")
1084       return ParseDirectiveSymbolAttribute(MCSA_Reference);
1085     if (IDVal == ".weak")
1086       return ParseDirectiveSymbolAttribute(MCSA_Weak);
1087     if (IDVal == ".weak_definition")
1088       return ParseDirectiveSymbolAttribute(MCSA_WeakDefinition);
1089     if (IDVal == ".weak_reference")
1090       return ParseDirectiveSymbolAttribute(MCSA_WeakReference);
1091     if (IDVal == ".weak_def_can_be_hidden")
1092       return ParseDirectiveSymbolAttribute(MCSA_WeakDefAutoPrivate);
1093
1094     if (IDVal == ".comm")
1095       return ParseDirectiveComm(/*IsLocal=*/false);
1096     if (IDVal == ".lcomm")
1097       return ParseDirectiveComm(/*IsLocal=*/true);
1098
1099     if (IDVal == ".abort")
1100       return ParseDirectiveAbort();
1101     if (IDVal == ".include")
1102       return ParseDirectiveInclude();
1103
1104     if (IDVal == ".code16" || IDVal == ".code32" || IDVal == ".code64")
1105       return TokError(Twine(IDVal) + " not supported yet");
1106
1107     // Look up the handler in the handler table.
1108     std::pair<MCAsmParserExtension*, DirectiveHandler> Handler =
1109       DirectiveMap.lookup(IDVal);
1110     if (Handler.first)
1111       return (*Handler.second)(Handler.first, IDVal, IDLoc);
1112
1113     // Target hook for parsing target specific directives.
1114     if (!getTargetParser().ParseDirective(ID))
1115       return false;
1116
1117     Warning(IDLoc, "ignoring directive for now");
1118     EatToEndOfStatement();
1119     return false;
1120   }
1121
1122   CheckForValidSection();
1123
1124   // Canonicalize the opcode to lower case.
1125   SmallString<128> Opcode;
1126   for (unsigned i = 0, e = IDVal.size(); i != e; ++i)
1127     Opcode.push_back(tolower(IDVal[i]));
1128
1129   SmallVector<MCParsedAsmOperand*, 8> ParsedOperands;
1130   bool HadError = getTargetParser().ParseInstruction(Opcode.str(), IDLoc,
1131                                                      ParsedOperands);
1132
1133   // Dump the parsed representation, if requested.
1134   if (getShowParsedOperands()) {
1135     SmallString<256> Str;
1136     raw_svector_ostream OS(Str);
1137     OS << "parsed instruction: [";
1138     for (unsigned i = 0; i != ParsedOperands.size(); ++i) {
1139       if (i != 0)
1140         OS << ", ";
1141       ParsedOperands[i]->dump(OS);
1142     }
1143     OS << "]";
1144
1145     PrintMessage(IDLoc, OS.str(), "note");
1146   }
1147
1148   // If parsing succeeded, match the instruction.
1149   if (!HadError)
1150     HadError = getTargetParser().MatchAndEmitInstruction(IDLoc, ParsedOperands,
1151                                                          Out);
1152
1153   // Free any parsed operands.
1154   for (unsigned i = 0, e = ParsedOperands.size(); i != e; ++i)
1155     delete ParsedOperands[i];
1156
1157   // Don't skip the rest of the line, the instruction parser is responsible for
1158   // that.
1159   return false;
1160 }
1161
1162 MacroInstantiation::MacroInstantiation(const Macro *M, SMLoc IL, SMLoc EL,
1163                                    const std::vector<std::vector<AsmToken> > &A)
1164   : TheMacro(M), InstantiationLoc(IL), ExitLoc(EL)
1165 {
1166   // Macro instantiation is lexical, unfortunately. We construct a new buffer
1167   // to hold the macro body with substitutions.
1168   SmallString<256> Buf;
1169   raw_svector_ostream OS(Buf);
1170
1171   StringRef Body = M->Body;
1172   while (!Body.empty()) {
1173     // Scan for the next substitution.
1174     std::size_t End = Body.size(), Pos = 0;
1175     for (; Pos != End; ++Pos) {
1176       // Check for a substitution or escape.
1177       if (Body[Pos] != '$' || Pos + 1 == End)
1178         continue;
1179
1180       char Next = Body[Pos + 1];
1181       if (Next == '$' || Next == 'n' || isdigit(Next))
1182         break;
1183     }
1184
1185     // Add the prefix.
1186     OS << Body.slice(0, Pos);
1187
1188     // Check if we reached the end.
1189     if (Pos == End)
1190       break;
1191
1192     switch (Body[Pos+1]) {
1193        // $$ => $
1194     case '$':
1195       OS << '$';
1196       break;
1197
1198       // $n => number of arguments
1199     case 'n':
1200       OS << A.size();
1201       break;
1202
1203        // $[0-9] => argument
1204     default: {
1205       // Missing arguments are ignored.
1206       unsigned Index = Body[Pos+1] - '0';
1207       if (Index >= A.size())
1208         break;
1209
1210       // Otherwise substitute with the token values, with spaces eliminated.
1211       for (std::vector<AsmToken>::const_iterator it = A[Index].begin(),
1212              ie = A[Index].end(); it != ie; ++it)
1213         OS << it->getString();
1214       break;
1215     }
1216     }
1217
1218     // Update the scan point.
1219     Body = Body.substr(Pos + 2);
1220   }
1221
1222   // We include the .endmacro in the buffer as our queue to exit the macro
1223   // instantiation.
1224   OS << ".endmacro\n";
1225
1226   Instantiation = MemoryBuffer::getMemBufferCopy(OS.str(), "<instantiation>");
1227 }
1228
1229 bool AsmParser::HandleMacroEntry(StringRef Name, SMLoc NameLoc,
1230                                  const Macro *M) {
1231   // Arbitrarily limit macro nesting depth, to match 'as'. We can eliminate
1232   // this, although we should protect against infinite loops.
1233   if (ActiveMacros.size() == 20)
1234     return TokError("macros cannot be nested more than 20 levels deep");
1235
1236   // Parse the macro instantiation arguments.
1237   std::vector<std::vector<AsmToken> > MacroArguments;
1238   MacroArguments.push_back(std::vector<AsmToken>());
1239   unsigned ParenLevel = 0;
1240   for (;;) {
1241     if (Lexer.is(AsmToken::Eof))
1242       return TokError("unexpected token in macro instantiation");
1243     if (Lexer.is(AsmToken::EndOfStatement))
1244       break;
1245
1246     // If we aren't inside parentheses and this is a comma, start a new token
1247     // list.
1248     if (ParenLevel == 0 && Lexer.is(AsmToken::Comma)) {
1249       MacroArguments.push_back(std::vector<AsmToken>());
1250     } else {
1251       // Adjust the current parentheses level.
1252       if (Lexer.is(AsmToken::LParen))
1253         ++ParenLevel;
1254       else if (Lexer.is(AsmToken::RParen) && ParenLevel)
1255         --ParenLevel;
1256
1257       // Append the token to the current argument list.
1258       MacroArguments.back().push_back(getTok());
1259     }
1260     Lex();
1261   }
1262
1263   // Create the macro instantiation object and add to the current macro
1264   // instantiation stack.
1265   MacroInstantiation *MI = new MacroInstantiation(M, NameLoc,
1266                                                   getTok().getLoc(),
1267                                                   MacroArguments);
1268   ActiveMacros.push_back(MI);
1269
1270   // Jump to the macro instantiation and prime the lexer.
1271   CurBuffer = SrcMgr.AddNewSourceBuffer(MI->Instantiation, SMLoc());
1272   Lexer.setBuffer(SrcMgr.getMemoryBuffer(CurBuffer));
1273   Lex();
1274
1275   return false;
1276 }
1277
1278 void AsmParser::HandleMacroExit() {
1279   // Jump to the EndOfStatement we should return to, and consume it.
1280   JumpToLoc(ActiveMacros.back()->ExitLoc);
1281   Lex();
1282
1283   // Pop the instantiation entry.
1284   delete ActiveMacros.back();
1285   ActiveMacros.pop_back();
1286 }
1287
1288 static void MarkUsed(const MCExpr *Value) {
1289   switch (Value->getKind()) {
1290   case MCExpr::Binary:
1291     MarkUsed(static_cast<const MCBinaryExpr*>(Value)->getLHS());
1292     MarkUsed(static_cast<const MCBinaryExpr*>(Value)->getRHS());
1293     break;
1294   case MCExpr::Target:
1295   case MCExpr::Constant:
1296     break;
1297   case MCExpr::SymbolRef: {
1298     static_cast<const MCSymbolRefExpr*>(Value)->getSymbol().setUsed(true);
1299     break;
1300   }
1301   case MCExpr::Unary:
1302     MarkUsed(static_cast<const MCUnaryExpr*>(Value)->getSubExpr());
1303     break;
1304   }
1305 }
1306
1307 bool AsmParser::ParseAssignment(StringRef Name, bool allow_redef) {
1308   // FIXME: Use better location, we should use proper tokens.
1309   SMLoc EqualLoc = Lexer.getLoc();
1310
1311   const MCExpr *Value;
1312   if (ParseExpression(Value))
1313     return true;
1314
1315   MarkUsed(Value);
1316
1317   if (Lexer.isNot(AsmToken::EndOfStatement))
1318     return TokError("unexpected token in assignment");
1319
1320   // Error on assignment to '.'.
1321   if (Name == ".") {
1322     return Error(EqualLoc, ("assignment to pseudo-symbol '.' is unsupported "
1323                             "(use '.space' or '.org').)"));
1324   }
1325
1326   // Eat the end of statement marker.
1327   Lex();
1328
1329   // Validate that the LHS is allowed to be a variable (either it has not been
1330   // used as a symbol, or it is an absolute symbol).
1331   MCSymbol *Sym = getContext().LookupSymbol(Name);
1332   if (Sym) {
1333     // Diagnose assignment to a label.
1334     //
1335     // FIXME: Diagnostics. Note the location of the definition as a label.
1336     // FIXME: Diagnose assignment to protected identifier (e.g., register name).
1337     if (Sym->isUndefined() && !Sym->isUsed() && !Sym->isVariable())
1338       ; // Allow redefinitions of undefined symbols only used in directives.
1339     else if (!Sym->isUndefined() && (!Sym->isAbsolute() || !allow_redef))
1340       return Error(EqualLoc, "redefinition of '" + Name + "'");
1341     else if (!Sym->isVariable())
1342       return Error(EqualLoc, "invalid assignment to '" + Name + "'");
1343     else if (!isa<MCConstantExpr>(Sym->getVariableValue()))
1344       return Error(EqualLoc, "invalid reassignment of non-absolute variable '" +
1345                    Name + "'");
1346
1347     // Don't count these checks as uses.
1348     Sym->setUsed(false);
1349   } else
1350     Sym = getContext().GetOrCreateSymbol(Name);
1351
1352   // FIXME: Handle '.'.
1353
1354   // Do the assignment.
1355   Out.EmitAssignment(Sym, Value);
1356
1357   return false;
1358 }
1359
1360 /// ParseIdentifier:
1361 ///   ::= identifier
1362 ///   ::= string
1363 bool AsmParser::ParseIdentifier(StringRef &Res) {
1364   // The assembler has relaxed rules for accepting identifiers, in particular we
1365   // allow things like '.globl $foo', which would normally be separate
1366   // tokens. At this level, we have already lexed so we cannot (currently)
1367   // handle this as a context dependent token, instead we detect adjacent tokens
1368   // and return the combined identifier.
1369   if (Lexer.is(AsmToken::Dollar)) {
1370     SMLoc DollarLoc = getLexer().getLoc();
1371
1372     // Consume the dollar sign, and check for a following identifier.
1373     Lex();
1374     if (Lexer.isNot(AsmToken::Identifier))
1375       return true;
1376
1377     // We have a '$' followed by an identifier, make sure they are adjacent.
1378     if (DollarLoc.getPointer() + 1 != getTok().getLoc().getPointer())
1379       return true;
1380
1381     // Construct the joined identifier and consume the token.
1382     Res = StringRef(DollarLoc.getPointer(),
1383                     getTok().getIdentifier().size() + 1);
1384     Lex();
1385     return false;
1386   }
1387
1388   if (Lexer.isNot(AsmToken::Identifier) &&
1389       Lexer.isNot(AsmToken::String))
1390     return true;
1391
1392   Res = getTok().getIdentifier();
1393
1394   Lex(); // Consume the identifier token.
1395
1396   return false;
1397 }
1398
1399 /// ParseDirectiveSet:
1400 ///   ::= .equ identifier ',' expression
1401 ///   ::= .equiv identifier ',' expression
1402 ///   ::= .set identifier ',' expression
1403 bool AsmParser::ParseDirectiveSet(StringRef IDVal, bool allow_redef) {
1404   StringRef Name;
1405
1406   if (ParseIdentifier(Name))
1407     return TokError("expected identifier after '" + Twine(IDVal) + "'");
1408
1409   if (getLexer().isNot(AsmToken::Comma))
1410     return TokError("unexpected token in '" + Twine(IDVal) + "'");
1411   Lex();
1412
1413   return ParseAssignment(Name, allow_redef);
1414 }
1415
1416 bool AsmParser::ParseEscapedString(std::string &Data) {
1417   assert(getLexer().is(AsmToken::String) && "Unexpected current token!");
1418
1419   Data = "";
1420   StringRef Str = getTok().getStringContents();
1421   for (unsigned i = 0, e = Str.size(); i != e; ++i) {
1422     if (Str[i] != '\\') {
1423       Data += Str[i];
1424       continue;
1425     }
1426
1427     // Recognize escaped characters. Note that this escape semantics currently
1428     // loosely follows Darwin 'as'. Notably, it doesn't support hex escapes.
1429     ++i;
1430     if (i == e)
1431       return TokError("unexpected backslash at end of string");
1432
1433     // Recognize octal sequences.
1434     if ((unsigned) (Str[i] - '0') <= 7) {
1435       // Consume up to three octal characters.
1436       unsigned Value = Str[i] - '0';
1437
1438       if (i + 1 != e && ((unsigned) (Str[i + 1] - '0')) <= 7) {
1439         ++i;
1440         Value = Value * 8 + (Str[i] - '0');
1441
1442         if (i + 1 != e && ((unsigned) (Str[i + 1] - '0')) <= 7) {
1443           ++i;
1444           Value = Value * 8 + (Str[i] - '0');
1445         }
1446       }
1447
1448       if (Value > 255)
1449         return TokError("invalid octal escape sequence (out of range)");
1450
1451       Data += (unsigned char) Value;
1452       continue;
1453     }
1454
1455     // Otherwise recognize individual escapes.
1456     switch (Str[i]) {
1457     default:
1458       // Just reject invalid escape sequences for now.
1459       return TokError("invalid escape sequence (unrecognized character)");
1460
1461     case 'b': Data += '\b'; break;
1462     case 'f': Data += '\f'; break;
1463     case 'n': Data += '\n'; break;
1464     case 'r': Data += '\r'; break;
1465     case 't': Data += '\t'; break;
1466     case '"': Data += '"'; break;
1467     case '\\': Data += '\\'; break;
1468     }
1469   }
1470
1471   return false;
1472 }
1473
1474 /// ParseDirectiveAscii:
1475 ///   ::= ( .ascii | .asciz | .string ) [ "string" ( , "string" )* ]
1476 bool AsmParser::ParseDirectiveAscii(StringRef IDVal, bool ZeroTerminated) {
1477   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1478     CheckForValidSection();
1479
1480     for (;;) {
1481       if (getLexer().isNot(AsmToken::String))
1482         return TokError("expected string in '" + Twine(IDVal) + "' directive");
1483
1484       std::string Data;
1485       if (ParseEscapedString(Data))
1486         return true;
1487
1488       getStreamer().EmitBytes(Data, DEFAULT_ADDRSPACE);
1489       if (ZeroTerminated)
1490         getStreamer().EmitBytes(StringRef("\0", 1), DEFAULT_ADDRSPACE);
1491
1492       Lex();
1493
1494       if (getLexer().is(AsmToken::EndOfStatement))
1495         break;
1496
1497       if (getLexer().isNot(AsmToken::Comma))
1498         return TokError("unexpected token in '" + Twine(IDVal) + "' directive");
1499       Lex();
1500     }
1501   }
1502
1503   Lex();
1504   return false;
1505 }
1506
1507 /// ParseDirectiveValue
1508 ///  ::= (.byte | .short | ... ) [ expression (, expression)* ]
1509 bool AsmParser::ParseDirectiveValue(unsigned Size) {
1510   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1511     CheckForValidSection();
1512
1513     for (;;) {
1514       const MCExpr *Value;
1515       if (ParseExpression(Value))
1516         return true;
1517
1518       // Special case constant expressions to match code generator.
1519       if (const MCConstantExpr *MCE = dyn_cast<MCConstantExpr>(Value))
1520         getStreamer().EmitIntValue(MCE->getValue(), Size, DEFAULT_ADDRSPACE);
1521       else
1522         getStreamer().EmitValue(Value, Size, DEFAULT_ADDRSPACE);
1523
1524       if (getLexer().is(AsmToken::EndOfStatement))
1525         break;
1526
1527       // FIXME: Improve diagnostic.
1528       if (getLexer().isNot(AsmToken::Comma))
1529         return TokError("unexpected token in directive");
1530       Lex();
1531     }
1532   }
1533
1534   Lex();
1535   return false;
1536 }
1537
1538 /// ParseDirectiveRealValue
1539 ///  ::= (.single | .double) [ expression (, expression)* ]
1540 bool AsmParser::ParseDirectiveRealValue(const fltSemantics &Semantics) {
1541   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1542     CheckForValidSection();
1543
1544     for (;;) {
1545       // We don't truly support arithmetic on floating point expressions, so we
1546       // have to manually parse unary prefixes.
1547       bool IsNeg = false;
1548       if (getLexer().is(AsmToken::Minus)) {
1549         Lex();
1550         IsNeg = true;
1551       } else if (getLexer().is(AsmToken::Plus))
1552         Lex();
1553
1554       if (getLexer().isNot(AsmToken::Integer) &&
1555           getLexer().isNot(AsmToken::Real) &&
1556           getLexer().isNot(AsmToken::Identifier))
1557         return TokError("unexpected token in directive");
1558
1559       // Convert to an APFloat.
1560       APFloat Value(Semantics);
1561       StringRef IDVal = getTok().getString();
1562       if (getLexer().is(AsmToken::Identifier)) {
1563         if (!IDVal.compare_lower("infinity") || !IDVal.compare_lower("inf"))
1564           Value = APFloat::getInf(Semantics);
1565         else if (!IDVal.compare_lower("nan"))
1566           Value = APFloat::getNaN(Semantics, false, ~0);
1567         else
1568           return TokError("invalid floating point literal");
1569       } else if (Value.convertFromString(IDVal, APFloat::rmNearestTiesToEven) ==
1570           APFloat::opInvalidOp)
1571         return TokError("invalid floating point literal");
1572       if (IsNeg)
1573         Value.changeSign();
1574
1575       // Consume the numeric token.
1576       Lex();
1577
1578       // Emit the value as an integer.
1579       APInt AsInt = Value.bitcastToAPInt();
1580       getStreamer().EmitIntValue(AsInt.getLimitedValue(),
1581                                  AsInt.getBitWidth() / 8, DEFAULT_ADDRSPACE);
1582
1583       if (getLexer().is(AsmToken::EndOfStatement))
1584         break;
1585
1586       if (getLexer().isNot(AsmToken::Comma))
1587         return TokError("unexpected token in directive");
1588       Lex();
1589     }
1590   }
1591
1592   Lex();
1593   return false;
1594 }
1595
1596 /// ParseDirectiveSpace
1597 ///  ::= .space expression [ , expression ]
1598 bool AsmParser::ParseDirectiveSpace() {
1599   CheckForValidSection();
1600
1601   int64_t NumBytes;
1602   if (ParseAbsoluteExpression(NumBytes))
1603     return true;
1604
1605   int64_t FillExpr = 0;
1606   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1607     if (getLexer().isNot(AsmToken::Comma))
1608       return TokError("unexpected token in '.space' directive");
1609     Lex();
1610
1611     if (ParseAbsoluteExpression(FillExpr))
1612       return true;
1613
1614     if (getLexer().isNot(AsmToken::EndOfStatement))
1615       return TokError("unexpected token in '.space' directive");
1616   }
1617
1618   Lex();
1619
1620   if (NumBytes <= 0)
1621     return TokError("invalid number of bytes in '.space' directive");
1622
1623   // FIXME: Sometimes the fill expr is 'nop' if it isn't supplied, instead of 0.
1624   getStreamer().EmitFill(NumBytes, FillExpr, DEFAULT_ADDRSPACE);
1625
1626   return false;
1627 }
1628
1629 /// ParseDirectiveZero
1630 ///  ::= .zero expression
1631 bool AsmParser::ParseDirectiveZero() {
1632   CheckForValidSection();
1633
1634   int64_t NumBytes;
1635   if (ParseAbsoluteExpression(NumBytes))
1636     return true;
1637
1638   int64_t Val = 0;
1639   if (getLexer().is(AsmToken::Comma)) {
1640     Lex();
1641     if (ParseAbsoluteExpression(Val))
1642       return true;
1643   }
1644
1645   if (getLexer().isNot(AsmToken::EndOfStatement))
1646     return TokError("unexpected token in '.zero' directive");
1647
1648   Lex();
1649
1650   getStreamer().EmitFill(NumBytes, Val, DEFAULT_ADDRSPACE);
1651
1652   return false;
1653 }
1654
1655 /// ParseDirectiveFill
1656 ///  ::= .fill expression , expression , expression
1657 bool AsmParser::ParseDirectiveFill() {
1658   CheckForValidSection();
1659
1660   int64_t NumValues;
1661   if (ParseAbsoluteExpression(NumValues))
1662     return true;
1663
1664   if (getLexer().isNot(AsmToken::Comma))
1665     return TokError("unexpected token in '.fill' directive");
1666   Lex();
1667
1668   int64_t FillSize;
1669   if (ParseAbsoluteExpression(FillSize))
1670     return true;
1671
1672   if (getLexer().isNot(AsmToken::Comma))
1673     return TokError("unexpected token in '.fill' directive");
1674   Lex();
1675
1676   int64_t FillExpr;
1677   if (ParseAbsoluteExpression(FillExpr))
1678     return true;
1679
1680   if (getLexer().isNot(AsmToken::EndOfStatement))
1681     return TokError("unexpected token in '.fill' directive");
1682
1683   Lex();
1684
1685   if (FillSize != 1 && FillSize != 2 && FillSize != 4 && FillSize != 8)
1686     return TokError("invalid '.fill' size, expected 1, 2, 4, or 8");
1687
1688   for (uint64_t i = 0, e = NumValues; i != e; ++i)
1689     getStreamer().EmitIntValue(FillExpr, FillSize, DEFAULT_ADDRSPACE);
1690
1691   return false;
1692 }
1693
1694 /// ParseDirectiveOrg
1695 ///  ::= .org expression [ , expression ]
1696 bool AsmParser::ParseDirectiveOrg() {
1697   CheckForValidSection();
1698
1699   const MCExpr *Offset;
1700   if (ParseExpression(Offset))
1701     return true;
1702
1703   // Parse optional fill expression.
1704   int64_t FillExpr = 0;
1705   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1706     if (getLexer().isNot(AsmToken::Comma))
1707       return TokError("unexpected token in '.org' directive");
1708     Lex();
1709
1710     if (ParseAbsoluteExpression(FillExpr))
1711       return true;
1712
1713     if (getLexer().isNot(AsmToken::EndOfStatement))
1714       return TokError("unexpected token in '.org' directive");
1715   }
1716
1717   Lex();
1718
1719   // FIXME: Only limited forms of relocatable expressions are accepted here, it
1720   // has to be relative to the current section.
1721   getStreamer().EmitValueToOffset(Offset, FillExpr);
1722
1723   return false;
1724 }
1725
1726 /// ParseDirectiveAlign
1727 ///  ::= {.align, ...} expression [ , expression [ , expression ]]
1728 bool AsmParser::ParseDirectiveAlign(bool IsPow2, unsigned ValueSize) {
1729   CheckForValidSection();
1730
1731   SMLoc AlignmentLoc = getLexer().getLoc();
1732   int64_t Alignment;
1733   if (ParseAbsoluteExpression(Alignment))
1734     return true;
1735
1736   SMLoc MaxBytesLoc;
1737   bool HasFillExpr = false;
1738   int64_t FillExpr = 0;
1739   int64_t MaxBytesToFill = 0;
1740   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1741     if (getLexer().isNot(AsmToken::Comma))
1742       return TokError("unexpected token in directive");
1743     Lex();
1744
1745     // The fill expression can be omitted while specifying a maximum number of
1746     // alignment bytes, e.g:
1747     //  .align 3,,4
1748     if (getLexer().isNot(AsmToken::Comma)) {
1749       HasFillExpr = true;
1750       if (ParseAbsoluteExpression(FillExpr))
1751         return true;
1752     }
1753
1754     if (getLexer().isNot(AsmToken::EndOfStatement)) {
1755       if (getLexer().isNot(AsmToken::Comma))
1756         return TokError("unexpected token in directive");
1757       Lex();
1758
1759       MaxBytesLoc = getLexer().getLoc();
1760       if (ParseAbsoluteExpression(MaxBytesToFill))
1761         return true;
1762
1763       if (getLexer().isNot(AsmToken::EndOfStatement))
1764         return TokError("unexpected token in directive");
1765     }
1766   }
1767
1768   Lex();
1769
1770   if (!HasFillExpr)
1771     FillExpr = 0;
1772
1773   // Compute alignment in bytes.
1774   if (IsPow2) {
1775     // FIXME: Diagnose overflow.
1776     if (Alignment >= 32) {
1777       Error(AlignmentLoc, "invalid alignment value");
1778       Alignment = 31;
1779     }
1780
1781     Alignment = 1ULL << Alignment;
1782   }
1783
1784   // Diagnose non-sensical max bytes to align.
1785   if (MaxBytesLoc.isValid()) {
1786     if (MaxBytesToFill < 1) {
1787       Error(MaxBytesLoc, "alignment directive can never be satisfied in this "
1788             "many bytes, ignoring maximum bytes expression");
1789       MaxBytesToFill = 0;
1790     }
1791
1792     if (MaxBytesToFill >= Alignment) {
1793       Warning(MaxBytesLoc, "maximum bytes expression exceeds alignment and "
1794               "has no effect");
1795       MaxBytesToFill = 0;
1796     }
1797   }
1798
1799   // Check whether we should use optimal code alignment for this .align
1800   // directive.
1801   bool UseCodeAlign = getStreamer().getCurrentSection()->UseCodeAlign();
1802   if ((!HasFillExpr || Lexer.getMAI().getTextAlignFillValue() == FillExpr) &&
1803       ValueSize == 1 && UseCodeAlign) {
1804     getStreamer().EmitCodeAlignment(Alignment, MaxBytesToFill);
1805   } else {
1806     // FIXME: Target specific behavior about how the "extra" bytes are filled.
1807     getStreamer().EmitValueToAlignment(Alignment, FillExpr, ValueSize,
1808                                        MaxBytesToFill);
1809   }
1810
1811   return false;
1812 }
1813
1814 /// ParseDirectiveSymbolAttribute
1815 ///  ::= { ".globl", ".weak", ... } [ identifier ( , identifier )* ]
1816 bool AsmParser::ParseDirectiveSymbolAttribute(MCSymbolAttr Attr) {
1817   if (getLexer().isNot(AsmToken::EndOfStatement)) {
1818     for (;;) {
1819       StringRef Name;
1820
1821       if (ParseIdentifier(Name))
1822         return TokError("expected identifier in directive");
1823
1824       MCSymbol *Sym = getContext().GetOrCreateSymbol(Name);
1825
1826       getStreamer().EmitSymbolAttribute(Sym, Attr);
1827
1828       if (getLexer().is(AsmToken::EndOfStatement))
1829         break;
1830
1831       if (getLexer().isNot(AsmToken::Comma))
1832         return TokError("unexpected token in directive");
1833       Lex();
1834     }
1835   }
1836
1837   Lex();
1838   return false;
1839 }
1840
1841 /// ParseDirectiveComm
1842 ///  ::= ( .comm | .lcomm ) identifier , size_expression [ , align_expression ]
1843 bool AsmParser::ParseDirectiveComm(bool IsLocal) {
1844   CheckForValidSection();
1845
1846   SMLoc IDLoc = getLexer().getLoc();
1847   StringRef Name;
1848   if (ParseIdentifier(Name))
1849     return TokError("expected identifier in directive");
1850
1851   // Handle the identifier as the key symbol.
1852   MCSymbol *Sym = getContext().GetOrCreateSymbol(Name);
1853
1854   if (getLexer().isNot(AsmToken::Comma))
1855     return TokError("unexpected token in directive");
1856   Lex();
1857
1858   int64_t Size;
1859   SMLoc SizeLoc = getLexer().getLoc();
1860   if (ParseAbsoluteExpression(Size))
1861     return true;
1862
1863   int64_t Pow2Alignment = 0;
1864   SMLoc Pow2AlignmentLoc;
1865   if (getLexer().is(AsmToken::Comma)) {
1866     Lex();
1867     Pow2AlignmentLoc = getLexer().getLoc();
1868     if (ParseAbsoluteExpression(Pow2Alignment))
1869       return true;
1870
1871     // If this target takes alignments in bytes (not log) validate and convert.
1872     if (Lexer.getMAI().getAlignmentIsInBytes()) {
1873       if (!isPowerOf2_64(Pow2Alignment))
1874         return Error(Pow2AlignmentLoc, "alignment must be a power of 2");
1875       Pow2Alignment = Log2_64(Pow2Alignment);
1876     }
1877   }
1878
1879   if (getLexer().isNot(AsmToken::EndOfStatement))
1880     return TokError("unexpected token in '.comm' or '.lcomm' directive");
1881
1882   Lex();
1883
1884   // NOTE: a size of zero for a .comm should create a undefined symbol
1885   // but a size of .lcomm creates a bss symbol of size zero.
1886   if (Size < 0)
1887     return Error(SizeLoc, "invalid '.comm' or '.lcomm' directive size, can't "
1888                  "be less than zero");
1889
1890   // NOTE: The alignment in the directive is a power of 2 value, the assembler
1891   // may internally end up wanting an alignment in bytes.
1892   // FIXME: Diagnose overflow.
1893   if (Pow2Alignment < 0)
1894     return Error(Pow2AlignmentLoc, "invalid '.comm' or '.lcomm' directive "
1895                  "alignment, can't be less than zero");
1896
1897   if (!Sym->isUndefined())
1898     return Error(IDLoc, "invalid symbol redefinition");
1899
1900   // '.lcomm' is equivalent to '.zerofill'.
1901   // Create the Symbol as a common or local common with Size and Pow2Alignment
1902   if (IsLocal) {
1903     getStreamer().EmitZerofill(Ctx.getMachOSection(
1904                                  "__DATA", "__bss", MCSectionMachO::S_ZEROFILL,
1905                                  0, SectionKind::getBSS()),
1906                                Sym, Size, 1 << Pow2Alignment);
1907     return false;
1908   }
1909
1910   getStreamer().EmitCommonSymbol(Sym, Size, 1 << Pow2Alignment);
1911   return false;
1912 }
1913
1914 /// ParseDirectiveAbort
1915 ///  ::= .abort [... message ...]
1916 bool AsmParser::ParseDirectiveAbort() {
1917   // FIXME: Use loc from directive.
1918   SMLoc Loc = getLexer().getLoc();
1919
1920   StringRef Str = ParseStringToEndOfStatement();
1921   if (getLexer().isNot(AsmToken::EndOfStatement))
1922     return TokError("unexpected token in '.abort' directive");
1923
1924   Lex();
1925
1926   if (Str.empty())
1927     Error(Loc, ".abort detected. Assembly stopping.");
1928   else
1929     Error(Loc, ".abort '" + Str + "' detected. Assembly stopping.");
1930   // FIXME: Actually abort assembly here.
1931
1932   return false;
1933 }
1934
1935 /// ParseDirectiveInclude
1936 ///  ::= .include "filename"
1937 bool AsmParser::ParseDirectiveInclude() {
1938   if (getLexer().isNot(AsmToken::String))
1939     return TokError("expected string in '.include' directive");
1940
1941   std::string Filename = getTok().getString();
1942   SMLoc IncludeLoc = getLexer().getLoc();
1943   Lex();
1944
1945   if (getLexer().isNot(AsmToken::EndOfStatement))
1946     return TokError("unexpected token in '.include' directive");
1947
1948   // Strip the quotes.
1949   Filename = Filename.substr(1, Filename.size()-2);
1950
1951   // Attempt to switch the lexer to the included file before consuming the end
1952   // of statement to avoid losing it when we switch.
1953   if (EnterIncludeFile(Filename)) {
1954     Error(IncludeLoc, "Could not find include file '" + Filename + "'");
1955     return true;
1956   }
1957
1958   return false;
1959 }
1960
1961 /// ParseDirectiveIf
1962 /// ::= .if expression
1963 bool AsmParser::ParseDirectiveIf(SMLoc DirectiveLoc) {
1964   TheCondStack.push_back(TheCondState);
1965   TheCondState.TheCond = AsmCond::IfCond;
1966   if(TheCondState.Ignore) {
1967     EatToEndOfStatement();
1968   }
1969   else {
1970     int64_t ExprValue;
1971     if (ParseAbsoluteExpression(ExprValue))
1972       return true;
1973
1974     if (getLexer().isNot(AsmToken::EndOfStatement))
1975       return TokError("unexpected token in '.if' directive");
1976
1977     Lex();
1978
1979     TheCondState.CondMet = ExprValue;
1980     TheCondState.Ignore = !TheCondState.CondMet;
1981   }
1982
1983   return false;
1984 }
1985
1986 bool AsmParser::ParseDirectiveIfdef(SMLoc DirectiveLoc, bool expect_defined) {
1987   StringRef Name;
1988   TheCondStack.push_back(TheCondState);
1989   TheCondState.TheCond = AsmCond::IfCond;
1990
1991   if (TheCondState.Ignore) {
1992     EatToEndOfStatement();
1993   } else {
1994     if (ParseIdentifier(Name))
1995       return TokError("expected identifier after '.ifdef'");
1996
1997     Lex();
1998
1999     MCSymbol *Sym = getContext().LookupSymbol(Name);
2000
2001     if (expect_defined)
2002       TheCondState.CondMet = (Sym != NULL && !Sym->isUndefined());
2003     else
2004       TheCondState.CondMet = (Sym == NULL || Sym->isUndefined());
2005     TheCondState.Ignore = !TheCondState.CondMet;
2006   }
2007
2008   return false;
2009 }
2010
2011 /// ParseDirectiveElseIf
2012 /// ::= .elseif expression
2013 bool AsmParser::ParseDirectiveElseIf(SMLoc DirectiveLoc) {
2014   if (TheCondState.TheCond != AsmCond::IfCond &&
2015       TheCondState.TheCond != AsmCond::ElseIfCond)
2016       Error(DirectiveLoc, "Encountered a .elseif that doesn't follow a .if or "
2017                           " an .elseif");
2018   TheCondState.TheCond = AsmCond::ElseIfCond;
2019
2020   bool LastIgnoreState = false;
2021   if (!TheCondStack.empty())
2022       LastIgnoreState = TheCondStack.back().Ignore;
2023   if (LastIgnoreState || TheCondState.CondMet) {
2024     TheCondState.Ignore = true;
2025     EatToEndOfStatement();
2026   }
2027   else {
2028     int64_t ExprValue;
2029     if (ParseAbsoluteExpression(ExprValue))
2030       return true;
2031
2032     if (getLexer().isNot(AsmToken::EndOfStatement))
2033       return TokError("unexpected token in '.elseif' directive");
2034
2035     Lex();
2036     TheCondState.CondMet = ExprValue;
2037     TheCondState.Ignore = !TheCondState.CondMet;
2038   }
2039
2040   return false;
2041 }
2042
2043 /// ParseDirectiveElse
2044 /// ::= .else
2045 bool AsmParser::ParseDirectiveElse(SMLoc DirectiveLoc) {
2046   if (getLexer().isNot(AsmToken::EndOfStatement))
2047     return TokError("unexpected token in '.else' directive");
2048
2049   Lex();
2050
2051   if (TheCondState.TheCond != AsmCond::IfCond &&
2052       TheCondState.TheCond != AsmCond::ElseIfCond)
2053       Error(DirectiveLoc, "Encountered a .else that doesn't follow a .if or an "
2054                           ".elseif");
2055   TheCondState.TheCond = AsmCond::ElseCond;
2056   bool LastIgnoreState = false;
2057   if (!TheCondStack.empty())
2058     LastIgnoreState = TheCondStack.back().Ignore;
2059   if (LastIgnoreState || TheCondState.CondMet)
2060     TheCondState.Ignore = true;
2061   else
2062     TheCondState.Ignore = false;
2063
2064   return false;
2065 }
2066
2067 /// ParseDirectiveEndIf
2068 /// ::= .endif
2069 bool AsmParser::ParseDirectiveEndIf(SMLoc DirectiveLoc) {
2070   if (getLexer().isNot(AsmToken::EndOfStatement))
2071     return TokError("unexpected token in '.endif' directive");
2072
2073   Lex();
2074
2075   if ((TheCondState.TheCond == AsmCond::NoCond) ||
2076       TheCondStack.empty())
2077     Error(DirectiveLoc, "Encountered a .endif that doesn't follow a .if or "
2078                         ".else");
2079   if (!TheCondStack.empty()) {
2080     TheCondState = TheCondStack.back();
2081     TheCondStack.pop_back();
2082   }
2083
2084   return false;
2085 }
2086
2087 /// ParseDirectiveFile
2088 /// ::= .file [number] string
2089 bool GenericAsmParser::ParseDirectiveFile(StringRef, SMLoc DirectiveLoc) {
2090   // FIXME: I'm not sure what this is.
2091   int64_t FileNumber = -1;
2092   SMLoc FileNumberLoc = getLexer().getLoc();
2093   if (getLexer().is(AsmToken::Integer)) {
2094     FileNumber = getTok().getIntVal();
2095     Lex();
2096
2097     if (FileNumber < 1)
2098       return TokError("file number less than one");
2099   }
2100
2101   if (getLexer().isNot(AsmToken::String))
2102     return TokError("unexpected token in '.file' directive");
2103
2104   StringRef Filename = getTok().getString();
2105   Filename = Filename.substr(1, Filename.size()-2);
2106   Lex();
2107
2108   if (getLexer().isNot(AsmToken::EndOfStatement))
2109     return TokError("unexpected token in '.file' directive");
2110
2111   if (FileNumber == -1)
2112     getStreamer().EmitFileDirective(Filename);
2113   else {
2114     if (getStreamer().EmitDwarfFileDirective(FileNumber, Filename))
2115       Error(FileNumberLoc, "file number already allocated");
2116   }
2117
2118   return false;
2119 }
2120
2121 /// ParseDirectiveLine
2122 /// ::= .line [number]
2123 bool GenericAsmParser::ParseDirectiveLine(StringRef, SMLoc DirectiveLoc) {
2124   if (getLexer().isNot(AsmToken::EndOfStatement)) {
2125     if (getLexer().isNot(AsmToken::Integer))
2126       return TokError("unexpected token in '.line' directive");
2127
2128     int64_t LineNumber = getTok().getIntVal();
2129     (void) LineNumber;
2130     Lex();
2131
2132     // FIXME: Do something with the .line.
2133   }
2134
2135   if (getLexer().isNot(AsmToken::EndOfStatement))
2136     return TokError("unexpected token in '.line' directive");
2137
2138   return false;
2139 }
2140
2141
2142 /// ParseDirectiveLoc
2143 /// ::= .loc FileNumber [LineNumber] [ColumnPos] [basic_block] [prologue_end]
2144 ///                                [epilogue_begin] [is_stmt VALUE] [isa VALUE]
2145 /// The first number is a file number, must have been previously assigned with
2146 /// a .file directive, the second number is the line number and optionally the
2147 /// third number is a column position (zero if not specified).  The remaining
2148 /// optional items are .loc sub-directives.
2149 bool GenericAsmParser::ParseDirectiveLoc(StringRef, SMLoc DirectiveLoc) {
2150
2151   if (getLexer().isNot(AsmToken::Integer))
2152     return TokError("unexpected token in '.loc' directive");
2153   int64_t FileNumber = getTok().getIntVal();
2154   if (FileNumber < 1)
2155     return TokError("file number less than one in '.loc' directive");
2156   if (!getContext().isValidDwarfFileNumber(FileNumber))
2157     return TokError("unassigned file number in '.loc' directive");
2158   Lex();
2159
2160   int64_t LineNumber = 0;
2161   if (getLexer().is(AsmToken::Integer)) {
2162     LineNumber = getTok().getIntVal();
2163     if (LineNumber < 1)
2164       return TokError("line number less than one in '.loc' directive");
2165     Lex();
2166   }
2167
2168   int64_t ColumnPos = 0;
2169   if (getLexer().is(AsmToken::Integer)) {
2170     ColumnPos = getTok().getIntVal();
2171     if (ColumnPos < 0)
2172       return TokError("column position less than zero in '.loc' directive");
2173     Lex();
2174   }
2175
2176   unsigned Flags = DWARF2_LINE_DEFAULT_IS_STMT ? DWARF2_FLAG_IS_STMT : 0;
2177   unsigned Isa = 0;
2178   int64_t Discriminator = 0;
2179   if (getLexer().isNot(AsmToken::EndOfStatement)) {
2180     for (;;) {
2181       if (getLexer().is(AsmToken::EndOfStatement))
2182         break;
2183
2184       StringRef Name;
2185       SMLoc Loc = getTok().getLoc();
2186       if (getParser().ParseIdentifier(Name))
2187         return TokError("unexpected token in '.loc' directive");
2188
2189       if (Name == "basic_block")
2190         Flags |= DWARF2_FLAG_BASIC_BLOCK;
2191       else if (Name == "prologue_end")
2192         Flags |= DWARF2_FLAG_PROLOGUE_END;
2193       else if (Name == "epilogue_begin")
2194         Flags |= DWARF2_FLAG_EPILOGUE_BEGIN;
2195       else if (Name == "is_stmt") {
2196         SMLoc Loc = getTok().getLoc();
2197         const MCExpr *Value;
2198         if (getParser().ParseExpression(Value))
2199           return true;
2200         // The expression must be the constant 0 or 1.
2201         if (const MCConstantExpr *MCE = dyn_cast<MCConstantExpr>(Value)) {
2202           int Value = MCE->getValue();
2203           if (Value == 0)
2204             Flags &= ~DWARF2_FLAG_IS_STMT;
2205           else if (Value == 1)
2206             Flags |= DWARF2_FLAG_IS_STMT;
2207           else
2208             return Error(Loc, "is_stmt value not 0 or 1");
2209         }
2210         else {
2211           return Error(Loc, "is_stmt value not the constant value of 0 or 1");
2212         }
2213       }
2214       else if (Name == "isa") {
2215         SMLoc Loc = getTok().getLoc();
2216         const MCExpr *Value;
2217         if (getParser().ParseExpression(Value))
2218           return true;
2219         // The expression must be a constant greater or equal to 0.
2220         if (const MCConstantExpr *MCE = dyn_cast<MCConstantExpr>(Value)) {
2221           int Value = MCE->getValue();
2222           if (Value < 0)
2223             return Error(Loc, "isa number less than zero");
2224           Isa = Value;
2225         }
2226         else {
2227           return Error(Loc, "isa number not a constant value");
2228         }
2229       }
2230       else if (Name == "discriminator") {
2231         if (getParser().ParseAbsoluteExpression(Discriminator))
2232           return true;
2233       }
2234       else {
2235         return Error(Loc, "unknown sub-directive in '.loc' directive");
2236       }
2237
2238       if (getLexer().is(AsmToken::EndOfStatement))
2239         break;
2240     }
2241   }
2242
2243   getStreamer().EmitDwarfLocDirective(FileNumber, LineNumber, ColumnPos, Flags,
2244                                       Isa, Discriminator);
2245
2246   return false;
2247 }
2248
2249 /// ParseDirectiveStabs
2250 /// ::= .stabs string, number, number, number
2251 bool GenericAsmParser::ParseDirectiveStabs(StringRef Directive,
2252                                            SMLoc DirectiveLoc) {
2253   return TokError("unsupported directive '" + Directive + "'");
2254 }
2255
2256 /// ParseDirectiveCFIStartProc
2257 /// ::= .cfi_startproc
2258 bool GenericAsmParser::ParseDirectiveCFIStartProc(StringRef,
2259                                                   SMLoc DirectiveLoc) {
2260   return getStreamer().EmitCFIStartProc();
2261 }
2262
2263 /// ParseDirectiveCFIEndProc
2264 /// ::= .cfi_endproc
2265 bool GenericAsmParser::ParseDirectiveCFIEndProc(StringRef, SMLoc DirectiveLoc) {
2266   return getStreamer().EmitCFIEndProc();
2267 }
2268
2269 /// ParseRegisterOrRegisterNumber - parse register name or number.
2270 bool GenericAsmParser::ParseRegisterOrRegisterNumber(int64_t &Register,
2271                                                      SMLoc DirectiveLoc) {
2272   unsigned RegNo;
2273
2274   if (getLexer().is(AsmToken::Percent)) {
2275     if (getParser().getTargetParser().ParseRegister(RegNo, DirectiveLoc,
2276       DirectiveLoc))
2277       return true;
2278     Register = getContext().getTargetAsmInfo().getDwarfRegNum(RegNo, true);
2279   } else
2280     return getParser().ParseAbsoluteExpression(Register);
2281
2282   return false;
2283 }
2284
2285 /// ParseDirectiveCFIDefCfa
2286 /// ::= .cfi_def_cfa register,  offset
2287 bool GenericAsmParser::ParseDirectiveCFIDefCfa(StringRef,
2288                                                SMLoc DirectiveLoc) {
2289   int64_t Register = 0;
2290   if (ParseRegisterOrRegisterNumber(Register, DirectiveLoc))
2291     return true;
2292
2293   if (getLexer().isNot(AsmToken::Comma))
2294     return TokError("unexpected token in directive");
2295   Lex();
2296
2297   int64_t Offset = 0;
2298   if (getParser().ParseAbsoluteExpression(Offset))
2299     return true;
2300
2301   return getStreamer().EmitCFIDefCfa(Register, Offset);
2302 }
2303
2304 /// ParseDirectiveCFIDefCfaOffset
2305 /// ::= .cfi_def_cfa_offset offset
2306 bool GenericAsmParser::ParseDirectiveCFIDefCfaOffset(StringRef,
2307                                                      SMLoc DirectiveLoc) {
2308   int64_t Offset = 0;
2309   if (getParser().ParseAbsoluteExpression(Offset))
2310     return true;
2311
2312   return getStreamer().EmitCFIDefCfaOffset(Offset);
2313 }
2314
2315 /// ParseDirectiveCFIDefCfaRegister
2316 /// ::= .cfi_def_cfa_register register
2317 bool GenericAsmParser::ParseDirectiveCFIDefCfaRegister(StringRef,
2318                                                        SMLoc DirectiveLoc) {
2319   int64_t Register = 0;
2320   if (ParseRegisterOrRegisterNumber(Register, DirectiveLoc))
2321     return true;
2322
2323   return getStreamer().EmitCFIDefCfaRegister(Register);
2324 }
2325
2326 /// ParseDirectiveCFIOffset
2327 /// ::= .cfi_off register, offset
2328 bool GenericAsmParser::ParseDirectiveCFIOffset(StringRef, SMLoc DirectiveLoc) {
2329   int64_t Register = 0;
2330   int64_t Offset = 0;
2331
2332   if (ParseRegisterOrRegisterNumber(Register, DirectiveLoc))
2333     return true;
2334
2335   if (getLexer().isNot(AsmToken::Comma))
2336     return TokError("unexpected token in directive");
2337   Lex();
2338
2339   if (getParser().ParseAbsoluteExpression(Offset))
2340     return true;
2341
2342   return getStreamer().EmitCFIOffset(Register, Offset);
2343 }
2344
2345 static bool isValidEncoding(int64_t Encoding) {
2346   if (Encoding & ~0xff)
2347     return false;
2348
2349   if (Encoding == dwarf::DW_EH_PE_omit)
2350     return true;
2351
2352   const unsigned Format = Encoding & 0xf;
2353   if (Format != dwarf::DW_EH_PE_absptr && Format != dwarf::DW_EH_PE_udata2 &&
2354       Format != dwarf::DW_EH_PE_udata4 && Format != dwarf::DW_EH_PE_udata8 &&
2355       Format != dwarf::DW_EH_PE_sdata2 && Format != dwarf::DW_EH_PE_sdata4 &&
2356       Format != dwarf::DW_EH_PE_sdata8 && Format != dwarf::DW_EH_PE_signed)
2357     return false;
2358
2359   const unsigned Application = Encoding & 0x70;
2360   if (Application != dwarf::DW_EH_PE_absptr &&
2361       Application != dwarf::DW_EH_PE_pcrel)
2362     return false;
2363
2364   return true;
2365 }
2366
2367 /// ParseDirectiveCFIPersonalityOrLsda
2368 /// ::= .cfi_personality encoding, [symbol_name]
2369 /// ::= .cfi_lsda encoding, [symbol_name]
2370 bool GenericAsmParser::ParseDirectiveCFIPersonalityOrLsda(StringRef IDVal,
2371                                                     SMLoc DirectiveLoc) {
2372   int64_t Encoding = 0;
2373   if (getParser().ParseAbsoluteExpression(Encoding))
2374     return true;
2375   if (Encoding == dwarf::DW_EH_PE_omit)
2376     return false;
2377
2378   if (!isValidEncoding(Encoding))
2379     return TokError("unsupported encoding.");
2380
2381   if (getLexer().isNot(AsmToken::Comma))
2382     return TokError("unexpected token in directive");
2383   Lex();
2384
2385   StringRef Name;
2386   if (getParser().ParseIdentifier(Name))
2387     return TokError("expected identifier in directive");
2388
2389   MCSymbol *Sym = getContext().GetOrCreateSymbol(Name);
2390
2391   if (IDVal == ".cfi_personality")
2392     return getStreamer().EmitCFIPersonality(Sym, Encoding);
2393   else {
2394     assert(IDVal == ".cfi_lsda");
2395     return getStreamer().EmitCFILsda(Sym, Encoding);
2396   }
2397 }
2398
2399 /// ParseDirectiveCFIRememberState
2400 /// ::= .cfi_remember_state
2401 bool GenericAsmParser::ParseDirectiveCFIRememberState(StringRef IDVal,
2402                                                       SMLoc DirectiveLoc) {
2403   return getStreamer().EmitCFIRememberState();
2404 }
2405
2406 /// ParseDirectiveCFIRestoreState
2407 /// ::= .cfi_remember_state
2408 bool GenericAsmParser::ParseDirectiveCFIRestoreState(StringRef IDVal,
2409                                                      SMLoc DirectiveLoc) {
2410   return getStreamer().EmitCFIRestoreState();
2411 }
2412
2413 /// ParseDirectiveMacrosOnOff
2414 /// ::= .macros_on
2415 /// ::= .macros_off
2416 bool GenericAsmParser::ParseDirectiveMacrosOnOff(StringRef Directive,
2417                                                  SMLoc DirectiveLoc) {
2418   if (getLexer().isNot(AsmToken::EndOfStatement))
2419     return Error(getLexer().getLoc(),
2420                  "unexpected token in '" + Directive + "' directive");
2421
2422   getParser().MacrosEnabled = Directive == ".macros_on";
2423
2424   return false;
2425 }
2426
2427 /// ParseDirectiveMacro
2428 /// ::= .macro name
2429 bool GenericAsmParser::ParseDirectiveMacro(StringRef Directive,
2430                                            SMLoc DirectiveLoc) {
2431   StringRef Name;
2432   if (getParser().ParseIdentifier(Name))
2433     return TokError("expected identifier in directive");
2434
2435   if (getLexer().isNot(AsmToken::EndOfStatement))
2436     return TokError("unexpected token in '.macro' directive");
2437
2438   // Eat the end of statement.
2439   Lex();
2440
2441   AsmToken EndToken, StartToken = getTok();
2442
2443   // Lex the macro definition.
2444   for (;;) {
2445     // Check whether we have reached the end of the file.
2446     if (getLexer().is(AsmToken::Eof))
2447       return Error(DirectiveLoc, "no matching '.endmacro' in definition");
2448
2449     // Otherwise, check whether we have reach the .endmacro.
2450     if (getLexer().is(AsmToken::Identifier) &&
2451         (getTok().getIdentifier() == ".endm" ||
2452          getTok().getIdentifier() == ".endmacro")) {
2453       EndToken = getTok();
2454       Lex();
2455       if (getLexer().isNot(AsmToken::EndOfStatement))
2456         return TokError("unexpected token in '" + EndToken.getIdentifier() +
2457                         "' directive");
2458       break;
2459     }
2460
2461     // Otherwise, scan til the end of the statement.
2462     getParser().EatToEndOfStatement();
2463   }
2464
2465   if (getParser().MacroMap.lookup(Name)) {
2466     return Error(DirectiveLoc, "macro '" + Name + "' is already defined");
2467   }
2468
2469   const char *BodyStart = StartToken.getLoc().getPointer();
2470   const char *BodyEnd = EndToken.getLoc().getPointer();
2471   StringRef Body = StringRef(BodyStart, BodyEnd - BodyStart);
2472   getParser().MacroMap[Name] = new Macro(Name, Body);
2473   return false;
2474 }
2475
2476 /// ParseDirectiveEndMacro
2477 /// ::= .endm
2478 /// ::= .endmacro
2479 bool GenericAsmParser::ParseDirectiveEndMacro(StringRef Directive,
2480                                            SMLoc DirectiveLoc) {
2481   if (getLexer().isNot(AsmToken::EndOfStatement))
2482     return TokError("unexpected token in '" + Directive + "' directive");
2483
2484   // If we are inside a macro instantiation, terminate the current
2485   // instantiation.
2486   if (!getParser().ActiveMacros.empty()) {
2487     getParser().HandleMacroExit();
2488     return false;
2489   }
2490
2491   // Otherwise, this .endmacro is a stray entry in the file; well formed
2492   // .endmacro directives are handled during the macro definition parsing.
2493   return TokError("unexpected '" + Directive + "' in file, "
2494                   "no current macro definition");
2495 }
2496
2497 bool GenericAsmParser::ParseDirectiveLEB128(StringRef DirName, SMLoc) {
2498   getParser().CheckForValidSection();
2499
2500   const MCExpr *Value;
2501
2502   if (getParser().ParseExpression(Value))
2503     return true;
2504
2505   if (getLexer().isNot(AsmToken::EndOfStatement))
2506     return TokError("unexpected token in directive");
2507
2508   if (DirName[1] == 's')
2509     getStreamer().EmitSLEB128Value(Value);
2510   else
2511     getStreamer().EmitULEB128Value(Value);
2512
2513   return false;
2514 }
2515
2516
2517 /// \brief Create an MCAsmParser instance.
2518 MCAsmParser *llvm::createMCAsmParser(const Target &T, SourceMgr &SM,
2519                                      MCContext &C, MCStreamer &Out,
2520                                      const MCAsmInfo &MAI) {
2521   return new AsmParser(T, SM, C, Out, MAI);
2522 }