Debug Info: Move the sorting and uniqueing of pieces from emitLocPieces()
[oota-llvm.git] / lib / CodeGen / AsmPrinter / DwarfDebug.cpp
1 //===-- llvm/CodeGen/DwarfDebug.cpp - Dwarf Debug Framework ---------------===//
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 contains support for writing dwarf debug info into asm files.
11 //
12 //===----------------------------------------------------------------------===//
13
14 #include "ByteStreamer.h"
15 #include "DwarfDebug.h"
16 #include "DIE.h"
17 #include "DIEHash.h"
18 #include "DwarfUnit.h"
19 #include "llvm/ADT/STLExtras.h"
20 #include "llvm/ADT/Statistic.h"
21 #include "llvm/ADT/StringExtras.h"
22 #include "llvm/ADT/Triple.h"
23 #include "llvm/CodeGen/MachineFunction.h"
24 #include "llvm/CodeGen/MachineModuleInfo.h"
25 #include "llvm/IR/Constants.h"
26 #include "llvm/IR/DIBuilder.h"
27 #include "llvm/IR/DataLayout.h"
28 #include "llvm/IR/DebugInfo.h"
29 #include "llvm/IR/Instructions.h"
30 #include "llvm/IR/Module.h"
31 #include "llvm/IR/ValueHandle.h"
32 #include "llvm/MC/MCAsmInfo.h"
33 #include "llvm/MC/MCSection.h"
34 #include "llvm/MC/MCStreamer.h"
35 #include "llvm/MC/MCSymbol.h"
36 #include "llvm/Support/CommandLine.h"
37 #include "llvm/Support/Debug.h"
38 #include "llvm/Support/Dwarf.h"
39 #include "llvm/Support/Endian.h"
40 #include "llvm/Support/ErrorHandling.h"
41 #include "llvm/Support/FormattedStream.h"
42 #include "llvm/Support/LEB128.h"
43 #include "llvm/Support/MD5.h"
44 #include "llvm/Support/Path.h"
45 #include "llvm/Support/Timer.h"
46 #include "llvm/Target/TargetFrameLowering.h"
47 #include "llvm/Target/TargetLoweringObjectFile.h"
48 #include "llvm/Target/TargetMachine.h"
49 #include "llvm/Target/TargetOptions.h"
50 #include "llvm/Target/TargetRegisterInfo.h"
51 #include "llvm/Target/TargetSubtargetInfo.h"
52 using namespace llvm;
53
54 #define DEBUG_TYPE "dwarfdebug"
55
56 static cl::opt<bool>
57 DisableDebugInfoPrinting("disable-debug-info-print", cl::Hidden,
58                          cl::desc("Disable debug info printing"));
59
60 static cl::opt<bool> UnknownLocations(
61     "use-unknown-locations", cl::Hidden,
62     cl::desc("Make an absence of debug location information explicit."),
63     cl::init(false));
64
65 static cl::opt<bool>
66 GenerateGnuPubSections("generate-gnu-dwarf-pub-sections", cl::Hidden,
67                        cl::desc("Generate GNU-style pubnames and pubtypes"),
68                        cl::init(false));
69
70 static cl::opt<bool> GenerateARangeSection("generate-arange-section",
71                                            cl::Hidden,
72                                            cl::desc("Generate dwarf aranges"),
73                                            cl::init(false));
74
75 namespace {
76 enum DefaultOnOff { Default, Enable, Disable };
77 }
78
79 static cl::opt<DefaultOnOff>
80 DwarfAccelTables("dwarf-accel-tables", cl::Hidden,
81                  cl::desc("Output prototype dwarf accelerator tables."),
82                  cl::values(clEnumVal(Default, "Default for platform"),
83                             clEnumVal(Enable, "Enabled"),
84                             clEnumVal(Disable, "Disabled"), clEnumValEnd),
85                  cl::init(Default));
86
87 static cl::opt<DefaultOnOff>
88 SplitDwarf("split-dwarf", cl::Hidden,
89            cl::desc("Output DWARF5 split debug info."),
90            cl::values(clEnumVal(Default, "Default for platform"),
91                       clEnumVal(Enable, "Enabled"),
92                       clEnumVal(Disable, "Disabled"), clEnumValEnd),
93            cl::init(Default));
94
95 static cl::opt<DefaultOnOff>
96 DwarfPubSections("generate-dwarf-pub-sections", cl::Hidden,
97                  cl::desc("Generate DWARF pubnames and pubtypes sections"),
98                  cl::values(clEnumVal(Default, "Default for platform"),
99                             clEnumVal(Enable, "Enabled"),
100                             clEnumVal(Disable, "Disabled"), clEnumValEnd),
101                  cl::init(Default));
102
103 static const char *const DWARFGroupName = "DWARF Emission";
104 static const char *const DbgTimerName = "DWARF Debug Writer";
105
106 //===----------------------------------------------------------------------===//
107
108 /// resolve - Look in the DwarfDebug map for the MDNode that
109 /// corresponds to the reference.
110 template <typename T> T DbgVariable::resolve(DIRef<T> Ref) const {
111   return DD->resolve(Ref);
112 }
113
114 bool DbgVariable::isBlockByrefVariable() const {
115   assert(Var.isVariable() && "Invalid complex DbgVariable!");
116   return Var.isBlockByrefVariable(DD->getTypeIdentifierMap());
117 }
118
119 DIType DbgVariable::getType() const {
120   DIType Ty = Var.getType().resolve(DD->getTypeIdentifierMap());
121   // FIXME: isBlockByrefVariable should be reformulated in terms of complex
122   // addresses instead.
123   if (Var.isBlockByrefVariable(DD->getTypeIdentifierMap())) {
124     /* Byref variables, in Blocks, are declared by the programmer as
125        "SomeType VarName;", but the compiler creates a
126        __Block_byref_x_VarName struct, and gives the variable VarName
127        either the struct, or a pointer to the struct, as its type.  This
128        is necessary for various behind-the-scenes things the compiler
129        needs to do with by-reference variables in blocks.
130
131        However, as far as the original *programmer* is concerned, the
132        variable should still have type 'SomeType', as originally declared.
133
134        The following function dives into the __Block_byref_x_VarName
135        struct to find the original type of the variable.  This will be
136        passed back to the code generating the type for the Debug
137        Information Entry for the variable 'VarName'.  'VarName' will then
138        have the original type 'SomeType' in its debug information.
139
140        The original type 'SomeType' will be the type of the field named
141        'VarName' inside the __Block_byref_x_VarName struct.
142
143        NOTE: In order for this to not completely fail on the debugger
144        side, the Debug Information Entry for the variable VarName needs to
145        have a DW_AT_location that tells the debugger how to unwind through
146        the pointers and __Block_byref_x_VarName struct to find the actual
147        value of the variable.  The function addBlockByrefType does this.  */
148     DIType subType = Ty;
149     uint16_t tag = Ty.getTag();
150
151     if (tag == dwarf::DW_TAG_pointer_type)
152       subType = resolve(DIDerivedType(Ty).getTypeDerivedFrom());
153
154     DIArray Elements = DICompositeType(subType).getElements();
155     for (unsigned i = 0, N = Elements.getNumElements(); i < N; ++i) {
156       DIDerivedType DT(Elements.getElement(i));
157       if (getName() == DT.getName())
158         return (resolve(DT.getTypeDerivedFrom()));
159     }
160   }
161   return Ty;
162 }
163
164 static LLVM_CONSTEXPR DwarfAccelTable::Atom TypeAtoms[] = {
165     DwarfAccelTable::Atom(dwarf::DW_ATOM_die_offset, dwarf::DW_FORM_data4),
166     DwarfAccelTable::Atom(dwarf::DW_ATOM_die_tag, dwarf::DW_FORM_data2),
167     DwarfAccelTable::Atom(dwarf::DW_ATOM_type_flags, dwarf::DW_FORM_data1)};
168
169 DwarfDebug::DwarfDebug(AsmPrinter *A, Module *M)
170     : Asm(A), MMI(Asm->MMI), FirstCU(nullptr), PrevLabel(nullptr),
171       GlobalRangeCount(0), InfoHolder(A, "info_string", DIEValueAllocator),
172       UsedNonDefaultText(false),
173       SkeletonHolder(A, "skel_string", DIEValueAllocator),
174       AccelNames(DwarfAccelTable::Atom(dwarf::DW_ATOM_die_offset,
175                                        dwarf::DW_FORM_data4)),
176       AccelObjC(DwarfAccelTable::Atom(dwarf::DW_ATOM_die_offset,
177                                       dwarf::DW_FORM_data4)),
178       AccelNamespace(DwarfAccelTable::Atom(dwarf::DW_ATOM_die_offset,
179                                            dwarf::DW_FORM_data4)),
180       AccelTypes(TypeAtoms) {
181
182   DwarfInfoSectionSym = DwarfAbbrevSectionSym = DwarfStrSectionSym = nullptr;
183   DwarfDebugRangeSectionSym = DwarfDebugLocSectionSym = nullptr;
184   DwarfLineSectionSym = nullptr;
185   DwarfAddrSectionSym = nullptr;
186   DwarfAbbrevDWOSectionSym = DwarfStrDWOSectionSym = nullptr;
187   FunctionBeginSym = FunctionEndSym = nullptr;
188   CurFn = nullptr;
189   CurMI = nullptr;
190
191   // Turn on accelerator tables for Darwin by default, pubnames by
192   // default for non-Darwin, and handle split dwarf.
193   bool IsDarwin = Triple(A->getTargetTriple()).isOSDarwin();
194
195   if (DwarfAccelTables == Default)
196     HasDwarfAccelTables = IsDarwin;
197   else
198     HasDwarfAccelTables = DwarfAccelTables == Enable;
199
200   if (SplitDwarf == Default)
201     HasSplitDwarf = false;
202   else
203     HasSplitDwarf = SplitDwarf == Enable;
204
205   if (DwarfPubSections == Default)
206     HasDwarfPubSections = !IsDarwin;
207   else
208     HasDwarfPubSections = DwarfPubSections == Enable;
209
210   unsigned DwarfVersionNumber = Asm->TM.Options.MCOptions.DwarfVersion;
211   DwarfVersion = DwarfVersionNumber ? DwarfVersionNumber
212                                     : MMI->getModule()->getDwarfVersion();
213
214   Asm->OutStreamer.getContext().setDwarfVersion(DwarfVersion);
215
216   {
217     NamedRegionTimer T(DbgTimerName, DWARFGroupName, TimePassesIsEnabled);
218     beginModule();
219   }
220 }
221
222 // Define out of line so we don't have to include DwarfUnit.h in DwarfDebug.h.
223 DwarfDebug::~DwarfDebug() { }
224
225 // Switch to the specified MCSection and emit an assembler
226 // temporary label to it if SymbolStem is specified.
227 static MCSymbol *emitSectionSym(AsmPrinter *Asm, const MCSection *Section,
228                                 const char *SymbolStem = nullptr) {
229   Asm->OutStreamer.SwitchSection(Section);
230   if (!SymbolStem)
231     return nullptr;
232
233   MCSymbol *TmpSym = Asm->GetTempSymbol(SymbolStem);
234   Asm->OutStreamer.EmitLabel(TmpSym);
235   return TmpSym;
236 }
237
238 static bool isObjCClass(StringRef Name) {
239   return Name.startswith("+") || Name.startswith("-");
240 }
241
242 static bool hasObjCCategory(StringRef Name) {
243   if (!isObjCClass(Name))
244     return false;
245
246   return Name.find(") ") != StringRef::npos;
247 }
248
249 static void getObjCClassCategory(StringRef In, StringRef &Class,
250                                  StringRef &Category) {
251   if (!hasObjCCategory(In)) {
252     Class = In.slice(In.find('[') + 1, In.find(' '));
253     Category = "";
254     return;
255   }
256
257   Class = In.slice(In.find('[') + 1, In.find('('));
258   Category = In.slice(In.find('[') + 1, In.find(' '));
259   return;
260 }
261
262 static StringRef getObjCMethodName(StringRef In) {
263   return In.slice(In.find(' ') + 1, In.find(']'));
264 }
265
266 // Helper for sorting sections into a stable output order.
267 static bool SectionSort(const MCSection *A, const MCSection *B) {
268   std::string LA = (A ? A->getLabelBeginName() : "");
269   std::string LB = (B ? B->getLabelBeginName() : "");
270   return LA < LB;
271 }
272
273 // Add the various names to the Dwarf accelerator table names.
274 // TODO: Determine whether or not we should add names for programs
275 // that do not have a DW_AT_name or DW_AT_linkage_name field - this
276 // is only slightly different than the lookup of non-standard ObjC names.
277 void DwarfDebug::addSubprogramNames(DISubprogram SP, DIE &Die) {
278   if (!SP.isDefinition())
279     return;
280   addAccelName(SP.getName(), Die);
281
282   // If the linkage name is different than the name, go ahead and output
283   // that as well into the name table.
284   if (SP.getLinkageName() != "" && SP.getName() != SP.getLinkageName())
285     addAccelName(SP.getLinkageName(), Die);
286
287   // If this is an Objective-C selector name add it to the ObjC accelerator
288   // too.
289   if (isObjCClass(SP.getName())) {
290     StringRef Class, Category;
291     getObjCClassCategory(SP.getName(), Class, Category);
292     addAccelObjC(Class, Die);
293     if (Category != "")
294       addAccelObjC(Category, Die);
295     // Also add the base method name to the name table.
296     addAccelName(getObjCMethodName(SP.getName()), Die);
297   }
298 }
299
300 /// isSubprogramContext - Return true if Context is either a subprogram
301 /// or another context nested inside a subprogram.
302 bool DwarfDebug::isSubprogramContext(const MDNode *Context) {
303   if (!Context)
304     return false;
305   DIDescriptor D(Context);
306   if (D.isSubprogram())
307     return true;
308   if (D.isType())
309     return isSubprogramContext(resolve(DIType(Context).getContext()));
310   return false;
311 }
312
313 // Find DIE for the given subprogram and attach appropriate DW_AT_low_pc
314 // and DW_AT_high_pc attributes. If there are global variables in this
315 // scope then create and insert DIEs for these variables.
316 DIE &DwarfDebug::updateSubprogramScopeDIE(DwarfCompileUnit &SPCU,
317                                           DISubprogram SP) {
318   DIE *SPDie = SPCU.getOrCreateSubprogramDIE(SP);
319
320   attachLowHighPC(SPCU, *SPDie, FunctionBeginSym, FunctionEndSym);
321
322   const TargetRegisterInfo *RI = Asm->TM.getSubtargetImpl()->getRegisterInfo();
323   MachineLocation Location(RI->getFrameRegister(*Asm->MF));
324   SPCU.addAddress(*SPDie, dwarf::DW_AT_frame_base, Location);
325
326   // Add name to the name table, we do this here because we're guaranteed
327   // to have concrete versions of our DW_TAG_subprogram nodes.
328   addSubprogramNames(SP, *SPDie);
329
330   return *SPDie;
331 }
332
333 /// Check whether we should create a DIE for the given Scope, return true
334 /// if we don't create a DIE (the corresponding DIE is null).
335 bool DwarfDebug::isLexicalScopeDIENull(LexicalScope *Scope) {
336   if (Scope->isAbstractScope())
337     return false;
338
339   // We don't create a DIE if there is no Range.
340   const SmallVectorImpl<InsnRange> &Ranges = Scope->getRanges();
341   if (Ranges.empty())
342     return true;
343
344   if (Ranges.size() > 1)
345     return false;
346
347   // We don't create a DIE if we have a single Range and the end label
348   // is null.
349   SmallVectorImpl<InsnRange>::const_iterator RI = Ranges.begin();
350   MCSymbol *End = getLabelAfterInsn(RI->second);
351   return !End;
352 }
353
354 static void addSectionLabel(AsmPrinter &Asm, DwarfUnit &U, DIE &D,
355                             dwarf::Attribute A, const MCSymbol *L,
356                             const MCSymbol *Sec) {
357   if (Asm.MAI->doesDwarfUseRelocationsAcrossSections())
358     U.addSectionLabel(D, A, L);
359   else
360     U.addSectionDelta(D, A, L, Sec);
361 }
362
363 void DwarfDebug::addScopeRangeList(DwarfCompileUnit &TheCU, DIE &ScopeDIE,
364                                    const SmallVectorImpl<InsnRange> &Range) {
365   // Emit offset in .debug_range as a relocatable label. emitDIE will handle
366   // emitting it appropriately.
367   MCSymbol *RangeSym = Asm->GetTempSymbol("debug_ranges", GlobalRangeCount++);
368
369   // Under fission, ranges are specified by constant offsets relative to the
370   // CU's DW_AT_GNU_ranges_base.
371   if (useSplitDwarf())
372     TheCU.addSectionDelta(ScopeDIE, dwarf::DW_AT_ranges, RangeSym,
373                           DwarfDebugRangeSectionSym);
374   else
375     addSectionLabel(*Asm, TheCU, ScopeDIE, dwarf::DW_AT_ranges, RangeSym,
376                     DwarfDebugRangeSectionSym);
377
378   RangeSpanList List(RangeSym);
379   for (const InsnRange &R : Range) {
380     RangeSpan Span(getLabelBeforeInsn(R.first), getLabelAfterInsn(R.second));
381     List.addRange(std::move(Span));
382   }
383
384   // Add the range list to the set of ranges to be emitted.
385   TheCU.addRangeList(std::move(List));
386 }
387
388 void DwarfDebug::attachRangesOrLowHighPC(DwarfCompileUnit &TheCU, DIE &Die,
389                                     const SmallVectorImpl<InsnRange> &Ranges) {
390   assert(!Ranges.empty());
391   if (Ranges.size() == 1)
392     attachLowHighPC(TheCU, Die, getLabelBeforeInsn(Ranges.front().first),
393                     getLabelAfterInsn(Ranges.front().second));
394   else
395     addScopeRangeList(TheCU, Die, Ranges);
396 }
397
398 // Construct new DW_TAG_lexical_block for this scope and attach
399 // DW_AT_low_pc/DW_AT_high_pc labels.
400 std::unique_ptr<DIE>
401 DwarfDebug::constructLexicalScopeDIE(DwarfCompileUnit &TheCU,
402                                      LexicalScope *Scope) {
403   if (isLexicalScopeDIENull(Scope))
404     return nullptr;
405
406   auto ScopeDIE = make_unique<DIE>(dwarf::DW_TAG_lexical_block);
407   if (Scope->isAbstractScope())
408     return ScopeDIE;
409
410   attachRangesOrLowHighPC(TheCU, *ScopeDIE, Scope->getRanges());
411
412   return ScopeDIE;
413 }
414
415 // This scope represents inlined body of a function. Construct DIE to
416 // represent this concrete inlined copy of the function.
417 std::unique_ptr<DIE>
418 DwarfDebug::constructInlinedScopeDIE(DwarfCompileUnit &TheCU,
419                                      LexicalScope *Scope) {
420   assert(Scope->getScopeNode());
421   DIScope DS(Scope->getScopeNode());
422   DISubprogram InlinedSP = getDISubprogram(DS);
423   // Find the subprogram's DwarfCompileUnit in the SPMap in case the subprogram
424   // was inlined from another compile unit.
425   DIE *OriginDIE = AbstractSPDies[InlinedSP];
426   assert(OriginDIE && "Unable to find original DIE for an inlined subprogram.");
427
428   auto ScopeDIE = make_unique<DIE>(dwarf::DW_TAG_inlined_subroutine);
429   TheCU.addDIEEntry(*ScopeDIE, dwarf::DW_AT_abstract_origin, *OriginDIE);
430
431   attachRangesOrLowHighPC(TheCU, *ScopeDIE, Scope->getRanges());
432
433   InlinedSubprogramDIEs.insert(OriginDIE);
434
435   // Add the call site information to the DIE.
436   DILocation DL(Scope->getInlinedAt());
437   TheCU.addUInt(*ScopeDIE, dwarf::DW_AT_call_file, None,
438                 TheCU.getOrCreateSourceID(DL.getFilename(), DL.getDirectory()));
439   TheCU.addUInt(*ScopeDIE, dwarf::DW_AT_call_line, None, DL.getLineNumber());
440
441   // Add name to the name table, we do this here because we're guaranteed
442   // to have concrete versions of our DW_TAG_inlined_subprogram nodes.
443   addSubprogramNames(InlinedSP, *ScopeDIE);
444
445   return ScopeDIE;
446 }
447
448 static std::unique_ptr<DIE> constructVariableDIE(DwarfCompileUnit &TheCU,
449                                                  DbgVariable &DV,
450                                                  const LexicalScope &Scope,
451                                                  DIE *&ObjectPointer) {
452   auto Var = TheCU.constructVariableDIE(DV, Scope.isAbstractScope());
453   if (DV.isObjectPointer())
454     ObjectPointer = Var.get();
455   return Var;
456 }
457
458 DIE *DwarfDebug::createScopeChildrenDIE(
459     DwarfCompileUnit &TheCU, LexicalScope *Scope,
460     SmallVectorImpl<std::unique_ptr<DIE>> &Children) {
461   DIE *ObjectPointer = nullptr;
462
463   // Collect arguments for current function.
464   if (LScopes.isCurrentFunctionScope(Scope)) {
465     for (DbgVariable *ArgDV : CurrentFnArguments)
466       if (ArgDV)
467         Children.push_back(
468             constructVariableDIE(TheCU, *ArgDV, *Scope, ObjectPointer));
469
470     // If this is a variadic function, add an unspecified parameter.
471     DISubprogram SP(Scope->getScopeNode());
472     DITypeArray FnArgs = SP.getType().getTypeArray();
473     // If we have a single element of null, it is a function that returns void.
474     // If we have more than one elements and the last one is null, it is a
475     // variadic function.
476     if (FnArgs.getNumElements() > 1 &&
477         !FnArgs.getElement(FnArgs.getNumElements() - 1))
478       Children.push_back(
479           make_unique<DIE>(dwarf::DW_TAG_unspecified_parameters));
480   }
481
482   // Collect lexical scope children first.
483   for (DbgVariable *DV : ScopeVariables.lookup(Scope))
484     Children.push_back(constructVariableDIE(TheCU, *DV, *Scope, ObjectPointer));
485
486   for (LexicalScope *LS : Scope->getChildren())
487     if (std::unique_ptr<DIE> Nested = constructScopeDIE(TheCU, LS))
488       Children.push_back(std::move(Nested));
489   return ObjectPointer;
490 }
491
492 void DwarfDebug::createAndAddScopeChildren(DwarfCompileUnit &TheCU,
493                                            LexicalScope *Scope, DIE &ScopeDIE) {
494   // We create children when the scope DIE is not null.
495   SmallVector<std::unique_ptr<DIE>, 8> Children;
496   if (DIE *ObjectPointer = createScopeChildrenDIE(TheCU, Scope, Children))
497     TheCU.addDIEEntry(ScopeDIE, dwarf::DW_AT_object_pointer, *ObjectPointer);
498
499   // Add children
500   for (auto &I : Children)
501     ScopeDIE.addChild(std::move(I));
502 }
503
504 void DwarfDebug::constructAbstractSubprogramScopeDIE(DwarfCompileUnit &TheCU,
505                                                      LexicalScope *Scope) {
506   assert(Scope && Scope->getScopeNode());
507   assert(Scope->isAbstractScope());
508   assert(!Scope->getInlinedAt());
509
510   DISubprogram SP(Scope->getScopeNode());
511
512   ProcessedSPNodes.insert(SP);
513
514   DIE *&AbsDef = AbstractSPDies[SP];
515   if (AbsDef)
516     return;
517
518   // Find the subprogram's DwarfCompileUnit in the SPMap in case the subprogram
519   // was inlined from another compile unit.
520   DwarfCompileUnit &SPCU = *SPMap[SP];
521   DIE *ContextDIE;
522
523   // Some of this is duplicated from DwarfUnit::getOrCreateSubprogramDIE, with
524   // the important distinction that the DIDescriptor is not associated with the
525   // DIE (since the DIDescriptor will be associated with the concrete DIE, if
526   // any). It could be refactored to some common utility function.
527   if (DISubprogram SPDecl = SP.getFunctionDeclaration()) {
528     ContextDIE = &SPCU.getUnitDie();
529     SPCU.getOrCreateSubprogramDIE(SPDecl);
530   } else
531     ContextDIE = SPCU.getOrCreateContextDIE(resolve(SP.getContext()));
532
533   // Passing null as the associated DIDescriptor because the abstract definition
534   // shouldn't be found by lookup.
535   AbsDef = &SPCU.createAndAddDIE(dwarf::DW_TAG_subprogram, *ContextDIE,
536                                  DIDescriptor());
537   SPCU.applySubprogramAttributesToDefinition(SP, *AbsDef);
538
539   SPCU.addUInt(*AbsDef, dwarf::DW_AT_inline, None, dwarf::DW_INL_inlined);
540   createAndAddScopeChildren(SPCU, Scope, *AbsDef);
541 }
542
543 DIE &DwarfDebug::constructSubprogramScopeDIE(DwarfCompileUnit &TheCU,
544                                              LexicalScope *Scope) {
545   assert(Scope && Scope->getScopeNode());
546   assert(!Scope->getInlinedAt());
547   assert(!Scope->isAbstractScope());
548   DISubprogram Sub(Scope->getScopeNode());
549
550   assert(Sub.isSubprogram());
551
552   ProcessedSPNodes.insert(Sub);
553
554   DIE &ScopeDIE = updateSubprogramScopeDIE(TheCU, Sub);
555
556   createAndAddScopeChildren(TheCU, Scope, ScopeDIE);
557
558   return ScopeDIE;
559 }
560
561 // Construct a DIE for this scope.
562 std::unique_ptr<DIE> DwarfDebug::constructScopeDIE(DwarfCompileUnit &TheCU,
563                                                    LexicalScope *Scope) {
564   if (!Scope || !Scope->getScopeNode())
565     return nullptr;
566
567   DIScope DS(Scope->getScopeNode());
568
569   assert((Scope->getInlinedAt() || !DS.isSubprogram()) &&
570          "Only handle inlined subprograms here, use "
571          "constructSubprogramScopeDIE for non-inlined "
572          "subprograms");
573
574   SmallVector<std::unique_ptr<DIE>, 8> Children;
575
576   // We try to create the scope DIE first, then the children DIEs. This will
577   // avoid creating un-used children then removing them later when we find out
578   // the scope DIE is null.
579   std::unique_ptr<DIE> ScopeDIE;
580   if (Scope->getParent() && DS.isSubprogram()) {
581     ScopeDIE = constructInlinedScopeDIE(TheCU, Scope);
582     if (!ScopeDIE)
583       return nullptr;
584     // We create children when the scope DIE is not null.
585     createScopeChildrenDIE(TheCU, Scope, Children);
586   } else {
587     // Early exit when we know the scope DIE is going to be null.
588     if (isLexicalScopeDIENull(Scope))
589       return nullptr;
590
591     // We create children here when we know the scope DIE is not going to be
592     // null and the children will be added to the scope DIE.
593     createScopeChildrenDIE(TheCU, Scope, Children);
594
595     // There is no need to emit empty lexical block DIE.
596     std::pair<ImportedEntityMap::const_iterator,
597               ImportedEntityMap::const_iterator> Range =
598         std::equal_range(ScopesWithImportedEntities.begin(),
599                          ScopesWithImportedEntities.end(),
600                          std::pair<const MDNode *, const MDNode *>(DS, nullptr),
601                          less_first());
602     if (Children.empty() && Range.first == Range.second)
603       return nullptr;
604     ScopeDIE = constructLexicalScopeDIE(TheCU, Scope);
605     assert(ScopeDIE && "Scope DIE should not be null.");
606     for (ImportedEntityMap::const_iterator i = Range.first; i != Range.second;
607          ++i)
608       constructImportedEntityDIE(TheCU, i->second, *ScopeDIE);
609   }
610
611   // Add children
612   for (auto &I : Children)
613     ScopeDIE->addChild(std::move(I));
614
615   return ScopeDIE;
616 }
617
618 void DwarfDebug::addGnuPubAttributes(DwarfUnit &U, DIE &D) const {
619   if (!GenerateGnuPubSections)
620     return;
621
622   U.addFlag(D, dwarf::DW_AT_GNU_pubnames);
623 }
624
625 // Create new DwarfCompileUnit for the given metadata node with tag
626 // DW_TAG_compile_unit.
627 DwarfCompileUnit &DwarfDebug::constructDwarfCompileUnit(DICompileUnit DIUnit) {
628   StringRef FN = DIUnit.getFilename();
629   CompilationDir = DIUnit.getDirectory();
630
631   auto OwnedUnit = make_unique<DwarfCompileUnit>(
632       InfoHolder.getUnits().size(), DIUnit, Asm, this, &InfoHolder);
633   DwarfCompileUnit &NewCU = *OwnedUnit;
634   DIE &Die = NewCU.getUnitDie();
635   InfoHolder.addUnit(std::move(OwnedUnit));
636
637   // LTO with assembly output shares a single line table amongst multiple CUs.
638   // To avoid the compilation directory being ambiguous, let the line table
639   // explicitly describe the directory of all files, never relying on the
640   // compilation directory.
641   if (!Asm->OutStreamer.hasRawTextSupport() || SingleCU)
642     Asm->OutStreamer.getContext().setMCLineTableCompilationDir(
643         NewCU.getUniqueID(), CompilationDir);
644
645   NewCU.addString(Die, dwarf::DW_AT_producer, DIUnit.getProducer());
646   NewCU.addUInt(Die, dwarf::DW_AT_language, dwarf::DW_FORM_data2,
647                 DIUnit.getLanguage());
648   NewCU.addString(Die, dwarf::DW_AT_name, FN);
649
650   if (!useSplitDwarf()) {
651     NewCU.initStmtList(DwarfLineSectionSym);
652
653     // If we're using split dwarf the compilation dir is going to be in the
654     // skeleton CU and so we don't need to duplicate it here.
655     if (!CompilationDir.empty())
656       NewCU.addString(Die, dwarf::DW_AT_comp_dir, CompilationDir);
657
658     addGnuPubAttributes(NewCU, Die);
659   }
660
661   if (DIUnit.isOptimized())
662     NewCU.addFlag(Die, dwarf::DW_AT_APPLE_optimized);
663
664   StringRef Flags = DIUnit.getFlags();
665   if (!Flags.empty())
666     NewCU.addString(Die, dwarf::DW_AT_APPLE_flags, Flags);
667
668   if (unsigned RVer = DIUnit.getRunTimeVersion())
669     NewCU.addUInt(Die, dwarf::DW_AT_APPLE_major_runtime_vers,
670                   dwarf::DW_FORM_data1, RVer);
671
672   if (!FirstCU)
673     FirstCU = &NewCU;
674
675   if (useSplitDwarf()) {
676     NewCU.initSection(Asm->getObjFileLowering().getDwarfInfoDWOSection(),
677                       DwarfInfoDWOSectionSym);
678     NewCU.setSkeleton(constructSkeletonCU(NewCU));
679   } else
680     NewCU.initSection(Asm->getObjFileLowering().getDwarfInfoSection(),
681                       DwarfInfoSectionSym);
682
683   CUMap.insert(std::make_pair(DIUnit, &NewCU));
684   CUDieMap.insert(std::make_pair(&Die, &NewCU));
685   return NewCU;
686 }
687
688 void DwarfDebug::constructImportedEntityDIE(DwarfCompileUnit &TheCU,
689                                             const MDNode *N) {
690   DIImportedEntity Module(N);
691   assert(Module.Verify());
692   if (DIE *D = TheCU.getOrCreateContextDIE(Module.getContext()))
693     constructImportedEntityDIE(TheCU, Module, *D);
694 }
695
696 void DwarfDebug::constructImportedEntityDIE(DwarfCompileUnit &TheCU,
697                                             const MDNode *N, DIE &Context) {
698   DIImportedEntity Module(N);
699   assert(Module.Verify());
700   return constructImportedEntityDIE(TheCU, Module, Context);
701 }
702
703 void DwarfDebug::constructImportedEntityDIE(DwarfCompileUnit &TheCU,
704                                             const DIImportedEntity &Module,
705                                             DIE &Context) {
706   assert(Module.Verify() &&
707          "Use one of the MDNode * overloads to handle invalid metadata");
708   DIE &IMDie = TheCU.createAndAddDIE(Module.getTag(), Context, Module);
709   DIE *EntityDie;
710   DIDescriptor Entity = resolve(Module.getEntity());
711   if (Entity.isNameSpace())
712     EntityDie = TheCU.getOrCreateNameSpace(DINameSpace(Entity));
713   else if (Entity.isSubprogram())
714     EntityDie = TheCU.getOrCreateSubprogramDIE(DISubprogram(Entity));
715   else if (Entity.isType())
716     EntityDie = TheCU.getOrCreateTypeDIE(DIType(Entity));
717   else
718     EntityDie = TheCU.getDIE(Entity);
719   TheCU.addSourceLine(IMDie, Module.getLineNumber(),
720                       Module.getContext().getFilename(),
721                       Module.getContext().getDirectory());
722   TheCU.addDIEEntry(IMDie, dwarf::DW_AT_import, *EntityDie);
723   StringRef Name = Module.getName();
724   if (!Name.empty())
725     TheCU.addString(IMDie, dwarf::DW_AT_name, Name);
726 }
727
728 // Emit all Dwarf sections that should come prior to the content. Create
729 // global DIEs and emit initial debug info sections. This is invoked by
730 // the target AsmPrinter.
731 void DwarfDebug::beginModule() {
732   if (DisableDebugInfoPrinting)
733     return;
734
735   const Module *M = MMI->getModule();
736
737   FunctionDIs = makeSubprogramMap(*M);
738
739   // If module has named metadata anchors then use them, otherwise scan the
740   // module using debug info finder to collect debug info.
741   NamedMDNode *CU_Nodes = M->getNamedMetadata("llvm.dbg.cu");
742   if (!CU_Nodes)
743     return;
744   TypeIdentifierMap = generateDITypeIdentifierMap(CU_Nodes);
745
746   // Emit initial sections so we can reference labels later.
747   emitSectionLabels();
748
749   SingleCU = CU_Nodes->getNumOperands() == 1;
750
751   for (MDNode *N : CU_Nodes->operands()) {
752     DICompileUnit CUNode(N);
753     DwarfCompileUnit &CU = constructDwarfCompileUnit(CUNode);
754     DIArray ImportedEntities = CUNode.getImportedEntities();
755     for (unsigned i = 0, e = ImportedEntities.getNumElements(); i != e; ++i)
756       ScopesWithImportedEntities.push_back(std::make_pair(
757           DIImportedEntity(ImportedEntities.getElement(i)).getContext(),
758           ImportedEntities.getElement(i)));
759     std::sort(ScopesWithImportedEntities.begin(),
760               ScopesWithImportedEntities.end(), less_first());
761     DIArray GVs = CUNode.getGlobalVariables();
762     for (unsigned i = 0, e = GVs.getNumElements(); i != e; ++i)
763       CU.createGlobalVariableDIE(DIGlobalVariable(GVs.getElement(i)));
764     DIArray SPs = CUNode.getSubprograms();
765     for (unsigned i = 0, e = SPs.getNumElements(); i != e; ++i)
766       SPMap.insert(std::make_pair(SPs.getElement(i), &CU));
767     DIArray EnumTypes = CUNode.getEnumTypes();
768     for (unsigned i = 0, e = EnumTypes.getNumElements(); i != e; ++i) {
769       DIType Ty(EnumTypes.getElement(i));
770       // The enum types array by design contains pointers to
771       // MDNodes rather than DIRefs. Unique them here.
772       DIType UniqueTy(resolve(Ty.getRef()));
773       CU.getOrCreateTypeDIE(UniqueTy);
774     }
775     DIArray RetainedTypes = CUNode.getRetainedTypes();
776     for (unsigned i = 0, e = RetainedTypes.getNumElements(); i != e; ++i) {
777       DIType Ty(RetainedTypes.getElement(i));
778       // The retained types array by design contains pointers to
779       // MDNodes rather than DIRefs. Unique them here.
780       DIType UniqueTy(resolve(Ty.getRef()));
781       CU.getOrCreateTypeDIE(UniqueTy);
782     }
783     // Emit imported_modules last so that the relevant context is already
784     // available.
785     for (unsigned i = 0, e = ImportedEntities.getNumElements(); i != e; ++i)
786       constructImportedEntityDIE(CU, ImportedEntities.getElement(i));
787   }
788
789   // Tell MMI that we have debug info.
790   MMI->setDebugInfoAvailability(true);
791
792   // Prime section data.
793   SectionMap[Asm->getObjFileLowering().getTextSection()];
794 }
795
796 void DwarfDebug::finishVariableDefinitions() {
797   for (const auto &Var : ConcreteVariables) {
798     DIE *VariableDie = Var->getDIE();
799     // FIXME: There shouldn't be any variables without DIEs.
800     if (!VariableDie)
801       continue;
802     // FIXME: Consider the time-space tradeoff of just storing the unit pointer
803     // in the ConcreteVariables list, rather than looking it up again here.
804     // DIE::getUnit isn't simple - it walks parent pointers, etc.
805     DwarfCompileUnit *Unit = lookupUnit(VariableDie->getUnit());
806     assert(Unit);
807     DbgVariable *AbsVar = getExistingAbstractVariable(Var->getVariable());
808     if (AbsVar && AbsVar->getDIE()) {
809       Unit->addDIEEntry(*VariableDie, dwarf::DW_AT_abstract_origin,
810                         *AbsVar->getDIE());
811     } else
812       Unit->applyVariableAttributes(*Var, *VariableDie);
813   }
814 }
815
816 void DwarfDebug::finishSubprogramDefinitions() {
817   const Module *M = MMI->getModule();
818
819   NamedMDNode *CU_Nodes = M->getNamedMetadata("llvm.dbg.cu");
820   for (MDNode *N : CU_Nodes->operands()) {
821     DICompileUnit TheCU(N);
822     // Construct subprogram DIE and add variables DIEs.
823     DwarfCompileUnit *SPCU =
824         static_cast<DwarfCompileUnit *>(CUMap.lookup(TheCU));
825     DIArray Subprograms = TheCU.getSubprograms();
826     for (unsigned i = 0, e = Subprograms.getNumElements(); i != e; ++i) {
827       DISubprogram SP(Subprograms.getElement(i));
828       // Perhaps the subprogram is in another CU (such as due to comdat
829       // folding, etc), in which case ignore it here.
830       if (SPMap[SP] != SPCU)
831         continue;
832       DIE *D = SPCU->getDIE(SP);
833       if (DIE *AbsSPDIE = AbstractSPDies.lookup(SP)) {
834         if (D)
835           // If this subprogram has an abstract definition, reference that
836           SPCU->addDIEEntry(*D, dwarf::DW_AT_abstract_origin, *AbsSPDIE);
837       } else {
838         if (!D)
839           // Lazily construct the subprogram if we didn't see either concrete or
840           // inlined versions during codegen.
841           D = SPCU->getOrCreateSubprogramDIE(SP);
842         // And attach the attributes
843         SPCU->applySubprogramAttributesToDefinition(SP, *D);
844       }
845     }
846   }
847 }
848
849
850 // Collect info for variables that were optimized out.
851 void DwarfDebug::collectDeadVariables() {
852   const Module *M = MMI->getModule();
853
854   if (NamedMDNode *CU_Nodes = M->getNamedMetadata("llvm.dbg.cu")) {
855     for (MDNode *N : CU_Nodes->operands()) {
856       DICompileUnit TheCU(N);
857       // Construct subprogram DIE and add variables DIEs.
858       DwarfCompileUnit *SPCU =
859           static_cast<DwarfCompileUnit *>(CUMap.lookup(TheCU));
860       assert(SPCU && "Unable to find Compile Unit!");
861       DIArray Subprograms = TheCU.getSubprograms();
862       for (unsigned i = 0, e = Subprograms.getNumElements(); i != e; ++i) {
863         DISubprogram SP(Subprograms.getElement(i));
864         if (ProcessedSPNodes.count(SP) != 0)
865           continue;
866         assert(SP.isSubprogram() &&
867                "CU's subprogram list contains a non-subprogram");
868         assert(SP.isDefinition() &&
869                "CU's subprogram list contains a subprogram declaration");
870         DIArray Variables = SP.getVariables();
871         if (Variables.getNumElements() == 0)
872           continue;
873
874         DIE *SPDIE = AbstractSPDies.lookup(SP);
875         if (!SPDIE)
876           SPDIE = SPCU->getDIE(SP);
877         assert(SPDIE);
878         for (unsigned vi = 0, ve = Variables.getNumElements(); vi != ve; ++vi) {
879           DIVariable DV(Variables.getElement(vi));
880           assert(DV.isVariable());
881           DbgVariable NewVar(DV, this);
882           auto VariableDie = SPCU->constructVariableDIE(NewVar);
883           SPCU->applyVariableAttributes(NewVar, *VariableDie);
884           SPDIE->addChild(std::move(VariableDie));
885         }
886       }
887     }
888   }
889 }
890
891 void DwarfDebug::finalizeModuleInfo() {
892   finishSubprogramDefinitions();
893
894   finishVariableDefinitions();
895
896   // Collect info for variables that were optimized out.
897   collectDeadVariables();
898
899   // Handle anything that needs to be done on a per-unit basis after
900   // all other generation.
901   for (const auto &TheU : getUnits()) {
902     // Emit DW_AT_containing_type attribute to connect types with their
903     // vtable holding type.
904     TheU->constructContainingTypeDIEs();
905
906     // Add CU specific attributes if we need to add any.
907     if (TheU->getUnitDie().getTag() == dwarf::DW_TAG_compile_unit) {
908       // If we're splitting the dwarf out now that we've got the entire
909       // CU then add the dwo id to it.
910       DwarfCompileUnit *SkCU =
911           static_cast<DwarfCompileUnit *>(TheU->getSkeleton());
912       if (useSplitDwarf()) {
913         // Emit a unique identifier for this CU.
914         uint64_t ID = DIEHash(Asm).computeCUSignature(TheU->getUnitDie());
915         TheU->addUInt(TheU->getUnitDie(), dwarf::DW_AT_GNU_dwo_id,
916                       dwarf::DW_FORM_data8, ID);
917         SkCU->addUInt(SkCU->getUnitDie(), dwarf::DW_AT_GNU_dwo_id,
918                       dwarf::DW_FORM_data8, ID);
919
920         // We don't keep track of which addresses are used in which CU so this
921         // is a bit pessimistic under LTO.
922         if (!AddrPool.isEmpty())
923           addSectionLabel(*Asm, *SkCU, SkCU->getUnitDie(),
924                           dwarf::DW_AT_GNU_addr_base, DwarfAddrSectionSym,
925                           DwarfAddrSectionSym);
926         if (!TheU->getRangeLists().empty())
927           addSectionLabel(*Asm, *SkCU, SkCU->getUnitDie(),
928                           dwarf::DW_AT_GNU_ranges_base,
929                           DwarfDebugRangeSectionSym, DwarfDebugRangeSectionSym);
930       }
931
932       // If we have code split among multiple sections or non-contiguous
933       // ranges of code then emit a DW_AT_ranges attribute on the unit that will
934       // remain in the .o file, otherwise add a DW_AT_low_pc.
935       // FIXME: We should use ranges allow reordering of code ala
936       // .subsections_via_symbols in mach-o. This would mean turning on
937       // ranges for all subprogram DIEs for mach-o.
938       DwarfCompileUnit &U =
939           SkCU ? *SkCU : static_cast<DwarfCompileUnit &>(*TheU);
940       unsigned NumRanges = TheU->getRanges().size();
941       if (NumRanges) {
942         if (NumRanges > 1) {
943           addSectionLabel(*Asm, U, U.getUnitDie(), dwarf::DW_AT_ranges,
944                           Asm->GetTempSymbol("cu_ranges", U.getUniqueID()),
945                           DwarfDebugRangeSectionSym);
946
947           // A DW_AT_low_pc attribute may also be specified in combination with
948           // DW_AT_ranges to specify the default base address for use in
949           // location lists (see Section 2.6.2) and range lists (see Section
950           // 2.17.3).
951           U.addUInt(U.getUnitDie(), dwarf::DW_AT_low_pc, dwarf::DW_FORM_addr,
952                     0);
953         } else {
954           RangeSpan &Range = TheU->getRanges().back();
955           U.addLocalLabelAddress(U.getUnitDie(), dwarf::DW_AT_low_pc,
956                                  Range.getStart());
957           U.addLabelDelta(U.getUnitDie(), dwarf::DW_AT_high_pc, Range.getEnd(),
958                           Range.getStart());
959         }
960       }
961     }
962   }
963
964   // Compute DIE offsets and sizes.
965   InfoHolder.computeSizeAndOffsets();
966   if (useSplitDwarf())
967     SkeletonHolder.computeSizeAndOffsets();
968 }
969
970 void DwarfDebug::endSections() {
971   // Filter labels by section.
972   for (const SymbolCU &SCU : ArangeLabels) {
973     if (SCU.Sym->isInSection()) {
974       // Make a note of this symbol and it's section.
975       const MCSection *Section = &SCU.Sym->getSection();
976       if (!Section->getKind().isMetadata())
977         SectionMap[Section].push_back(SCU);
978     } else {
979       // Some symbols (e.g. common/bss on mach-o) can have no section but still
980       // appear in the output. This sucks as we rely on sections to build
981       // arange spans. We can do it without, but it's icky.
982       SectionMap[nullptr].push_back(SCU);
983     }
984   }
985
986   // Build a list of sections used.
987   std::vector<const MCSection *> Sections;
988   for (const auto &it : SectionMap) {
989     const MCSection *Section = it.first;
990     Sections.push_back(Section);
991   }
992
993   // Sort the sections into order.
994   // This is only done to ensure consistent output order across different runs.
995   std::sort(Sections.begin(), Sections.end(), SectionSort);
996
997   // Add terminating symbols for each section.
998   for (unsigned ID = 0, E = Sections.size(); ID != E; ID++) {
999     const MCSection *Section = Sections[ID];
1000     MCSymbol *Sym = nullptr;
1001
1002     if (Section) {
1003       // We can't call MCSection::getLabelEndName, as it's only safe to do so
1004       // if we know the section name up-front. For user-created sections, the
1005       // resulting label may not be valid to use as a label. (section names can
1006       // use a greater set of characters on some systems)
1007       Sym = Asm->GetTempSymbol("debug_end", ID);
1008       Asm->OutStreamer.SwitchSection(Section);
1009       Asm->OutStreamer.EmitLabel(Sym);
1010     }
1011
1012     // Insert a final terminator.
1013     SectionMap[Section].push_back(SymbolCU(nullptr, Sym));
1014   }
1015 }
1016
1017 // Emit all Dwarf sections that should come after the content.
1018 void DwarfDebug::endModule() {
1019   assert(CurFn == nullptr);
1020   assert(CurMI == nullptr);
1021
1022   if (!FirstCU)
1023     return;
1024
1025   // End any existing sections.
1026   // TODO: Does this need to happen?
1027   endSections();
1028
1029   // Finalize the debug info for the module.
1030   finalizeModuleInfo();
1031
1032   emitDebugStr();
1033
1034   // Emit all the DIEs into a debug info section.
1035   emitDebugInfo();
1036
1037   // Corresponding abbreviations into a abbrev section.
1038   emitAbbreviations();
1039
1040   // Emit info into a debug aranges section.
1041   if (GenerateARangeSection)
1042     emitDebugARanges();
1043
1044   // Emit info into a debug ranges section.
1045   emitDebugRanges();
1046
1047   if (useSplitDwarf()) {
1048     emitDebugStrDWO();
1049     emitDebugInfoDWO();
1050     emitDebugAbbrevDWO();
1051     emitDebugLineDWO();
1052     emitDebugLocDWO();
1053     // Emit DWO addresses.
1054     AddrPool.emit(*Asm, Asm->getObjFileLowering().getDwarfAddrSection());
1055   } else
1056     // Emit info into a debug loc section.
1057     emitDebugLoc();
1058
1059   // Emit info into the dwarf accelerator table sections.
1060   if (useDwarfAccelTables()) {
1061     emitAccelNames();
1062     emitAccelObjC();
1063     emitAccelNamespaces();
1064     emitAccelTypes();
1065   }
1066
1067   // Emit the pubnames and pubtypes sections if requested.
1068   if (HasDwarfPubSections) {
1069     emitDebugPubNames(GenerateGnuPubSections);
1070     emitDebugPubTypes(GenerateGnuPubSections);
1071   }
1072
1073   // clean up.
1074   SPMap.clear();
1075   AbstractVariables.clear();
1076
1077   // Reset these for the next Module if we have one.
1078   FirstCU = nullptr;
1079 }
1080
1081 // Find abstract variable, if any, associated with Var.
1082 DbgVariable *DwarfDebug::getExistingAbstractVariable(const DIVariable &DV,
1083                                                      DIVariable &Cleansed) {
1084   LLVMContext &Ctx = DV->getContext();
1085   // More then one inlined variable corresponds to one abstract variable.
1086   // FIXME: This duplication of variables when inlining should probably be
1087   // removed. It's done to allow each DIVariable to describe its location
1088   // because the DebugLoc on the dbg.value/declare isn't accurate. We should
1089   // make it accurate then remove this duplication/cleansing stuff.
1090   Cleansed = cleanseInlinedVariable(DV, Ctx);
1091   auto I = AbstractVariables.find(Cleansed);
1092   if (I != AbstractVariables.end())
1093     return I->second.get();
1094   return nullptr;
1095 }
1096
1097 DbgVariable *DwarfDebug::getExistingAbstractVariable(const DIVariable &DV) {
1098   DIVariable Cleansed;
1099   return getExistingAbstractVariable(DV, Cleansed);
1100 }
1101
1102 void DwarfDebug::createAbstractVariable(const DIVariable &Var,
1103                                         LexicalScope *Scope) {
1104   auto AbsDbgVariable = make_unique<DbgVariable>(Var, this);
1105   addScopeVariable(Scope, AbsDbgVariable.get());
1106   AbstractVariables[Var] = std::move(AbsDbgVariable);
1107 }
1108
1109 void DwarfDebug::ensureAbstractVariableIsCreated(const DIVariable &DV,
1110                                                  const MDNode *ScopeNode) {
1111   DIVariable Cleansed = DV;
1112   if (getExistingAbstractVariable(DV, Cleansed))
1113     return;
1114
1115   createAbstractVariable(Cleansed, LScopes.getOrCreateAbstractScope(ScopeNode));
1116 }
1117
1118 void
1119 DwarfDebug::ensureAbstractVariableIsCreatedIfScoped(const DIVariable &DV,
1120                                                     const MDNode *ScopeNode) {
1121   DIVariable Cleansed = DV;
1122   if (getExistingAbstractVariable(DV, Cleansed))
1123     return;
1124
1125   if (LexicalScope *Scope = LScopes.findAbstractScope(ScopeNode))
1126     createAbstractVariable(Cleansed, Scope);
1127 }
1128
1129 // If Var is a current function argument then add it to CurrentFnArguments list.
1130 bool DwarfDebug::addCurrentFnArgument(DbgVariable *Var, LexicalScope *Scope) {
1131   if (!LScopes.isCurrentFunctionScope(Scope))
1132     return false;
1133   DIVariable DV = Var->getVariable();
1134   if (DV.getTag() != dwarf::DW_TAG_arg_variable)
1135     return false;
1136   unsigned ArgNo = DV.getArgNumber();
1137   if (ArgNo == 0)
1138     return false;
1139
1140   size_t Size = CurrentFnArguments.size();
1141   if (Size == 0)
1142     CurrentFnArguments.resize(CurFn->getFunction()->arg_size());
1143   // llvm::Function argument size is not good indicator of how many
1144   // arguments does the function have at source level.
1145   if (ArgNo > Size)
1146     CurrentFnArguments.resize(ArgNo * 2);
1147   assert(!CurrentFnArguments[ArgNo - 1]);
1148   CurrentFnArguments[ArgNo - 1] = Var;
1149   return true;
1150 }
1151
1152 // Collect variable information from side table maintained by MMI.
1153 void DwarfDebug::collectVariableInfoFromMMITable(
1154     SmallPtrSet<const MDNode *, 16> &Processed) {
1155   for (const auto &VI : MMI->getVariableDbgInfo()) {
1156     if (!VI.Var)
1157       continue;
1158     Processed.insert(VI.Var);
1159     DIVariable DV(VI.Var);
1160     LexicalScope *Scope = LScopes.findLexicalScope(VI.Loc);
1161
1162     // If variable scope is not found then skip this variable.
1163     if (!Scope)
1164       continue;
1165
1166     ensureAbstractVariableIsCreatedIfScoped(DV, Scope->getScopeNode());
1167     ConcreteVariables.push_back(make_unique<DbgVariable>(DV, this));
1168     DbgVariable *RegVar = ConcreteVariables.back().get();
1169     RegVar->setFrameIndex(VI.Slot);
1170     addScopeVariable(Scope, RegVar);
1171   }
1172 }
1173
1174 // Get .debug_loc entry for the instruction range starting at MI.
1175 static DebugLocEntry::Value getDebugLocValue(const MachineInstr *MI) {
1176   const MDNode *Var = MI->getDebugVariable();
1177
1178   assert(MI->getNumOperands() == 3);
1179   if (MI->getOperand(0).isReg()) {
1180     MachineLocation MLoc;
1181     // If the second operand is an immediate, this is a
1182     // register-indirect address.
1183     if (!MI->getOperand(1).isImm())
1184       MLoc.set(MI->getOperand(0).getReg());
1185     else
1186       MLoc.set(MI->getOperand(0).getReg(), MI->getOperand(1).getImm());
1187     return DebugLocEntry::Value(Var, MLoc);
1188   }
1189   if (MI->getOperand(0).isImm())
1190     return DebugLocEntry::Value(Var, MI->getOperand(0).getImm());
1191   if (MI->getOperand(0).isFPImm())
1192     return DebugLocEntry::Value(Var, MI->getOperand(0).getFPImm());
1193   if (MI->getOperand(0).isCImm())
1194     return DebugLocEntry::Value(Var, MI->getOperand(0).getCImm());
1195
1196   llvm_unreachable("Unexpected 3 operand DBG_VALUE instruction!");
1197 }
1198
1199 /// Determine whether two variable pieces overlap.
1200 static bool piecesOverlap(DIVariable P1, DIVariable P2) {
1201   if (!P1.isVariablePiece() || !P2.isVariablePiece())
1202     return true;
1203   unsigned l1 = P1.getPieceOffset();
1204   unsigned l2 = P2.getPieceOffset();
1205   unsigned r1 = l1 + P1.getPieceSize();
1206   unsigned r2 = l2 + P2.getPieceSize();
1207   // True where [l1,r1[ and [r1,r2[ overlap.
1208   return (l1 < r2) && (l2 < r1);
1209 }
1210
1211 /// Build the location list for all DBG_VALUEs in the function that
1212 /// describe the same variable.  If the ranges of several independent
1213 /// pieces of the same variable overlap partially, split them up and
1214 /// combine the ranges. The resulting DebugLocEntries are will have
1215 /// strict monotonically increasing begin addresses and will never
1216 /// overlap.
1217 //
1218 // Input:
1219 //
1220 //   Ranges History [var, loc, piece ofs size]
1221 // 0 |      [x, (reg0, piece 0, 32)]
1222 // 1 | |    [x, (reg1, piece 32, 32)] <- IsPieceOfPrevEntry
1223 // 2 | |    ...
1224 // 3   |    [clobber reg0]
1225 // 4        [x, (mem, piece 0, 64)] <- overlapping with both previous pieces of x.
1226 //
1227 // Output:
1228 //
1229 // [0-1]    [x, (reg0, piece  0, 32)]
1230 // [1-3]    [x, (reg0, piece  0, 32), (reg1, piece 32, 32)]
1231 // [3-4]    [x, (reg1, piece 32, 32)]
1232 // [4- ]    [x, (mem,  piece  0, 64)]
1233 void
1234 DwarfDebug::buildLocationList(SmallVectorImpl<DebugLocEntry> &DebugLoc,
1235                               const DbgValueHistoryMap::InstrRanges &Ranges) {
1236   typedef std::pair<DIVariable, DebugLocEntry::Value> Range;
1237   SmallVector<Range, 4> OpenRanges;
1238
1239   for (auto I = Ranges.begin(), E = Ranges.end(); I != E; ++I) {
1240     const MachineInstr *Begin = I->first;
1241     const MachineInstr *End = I->second;
1242     assert(Begin->isDebugValue() && "Invalid History entry");
1243
1244     // Check if a variable is inaccessible in this range.
1245     if (!Begin->isDebugValue() ||
1246         (Begin->getNumOperands() > 1 && Begin->getOperand(0).isReg() &&
1247          !Begin->getOperand(0).getReg())) {
1248       OpenRanges.clear();
1249       continue;
1250     }
1251
1252     // If this piece overlaps with any open ranges, truncate them.
1253     DIVariable DIVar = Begin->getDebugVariable();
1254     auto Last = std::remove_if(OpenRanges.begin(), OpenRanges.end(), [&](Range R){
1255         return piecesOverlap(DIVar, R.first);
1256       });
1257     OpenRanges.erase(Last, OpenRanges.end());
1258
1259     const MCSymbol *StartLabel = getLabelBeforeInsn(Begin);
1260     assert(StartLabel && "Forgot label before DBG_VALUE starting a range!");
1261
1262     const MCSymbol *EndLabel;
1263     if (End != nullptr)
1264       EndLabel = getLabelAfterInsn(End);
1265     else if (std::next(I) == Ranges.end())
1266       EndLabel = FunctionEndSym;
1267     else
1268       EndLabel = getLabelBeforeInsn(std::next(I)->first);
1269     assert(EndLabel && "Forgot label after instruction ending a range!");
1270
1271     DEBUG(dbgs() << "DotDebugLoc: " << *Begin << "\n");
1272
1273     auto Value = getDebugLocValue(Begin);
1274     DebugLocEntry Loc(StartLabel, EndLabel, Value);
1275     bool couldMerge = false;
1276
1277     // If this is a piece, it may belong to the current DebugLocEntry.
1278     if (DIVar.isVariablePiece()) {
1279       // Add this value to the list of open ranges.
1280       OpenRanges.push_back(std::make_pair(DIVar, Value));
1281
1282       // Attempt to add the piece to the last entry.
1283       if (!DebugLoc.empty())
1284         if (DebugLoc.back().MergeValues(Loc))
1285           couldMerge = true;
1286     }
1287
1288     if (!couldMerge) {
1289       // Need to add a new DebugLocEntry. Add all values from still
1290       // valid non-overlapping pieces.
1291       for (auto Range : OpenRanges)
1292         Loc.addValue(Range.second);
1293       DebugLoc.push_back(std::move(Loc));
1294     }
1295
1296     // Attempt to coalesce the ranges of two otherwise identical
1297     // DebugLocEntries.
1298     auto CurEntry = DebugLoc.rbegin();
1299     auto PrevEntry = std::next(CurEntry);
1300     if (PrevEntry != DebugLoc.rend() && PrevEntry->MergeRanges(*CurEntry))
1301       DebugLoc.pop_back();
1302
1303     DEBUG(dbgs() << "Values:\n";
1304           for (auto Value : CurEntry->getValues())
1305             Value.getVariable()->dump();
1306           dbgs() << "-----\n");
1307   }
1308 }
1309
1310
1311 // Find variables for each lexical scope.
1312 void
1313 DwarfDebug::collectVariableInfo(SmallPtrSet<const MDNode *, 16> &Processed) {
1314   LexicalScope *FnScope = LScopes.getCurrentFunctionScope();
1315   DwarfCompileUnit *TheCU = SPMap.lookup(FnScope->getScopeNode());
1316
1317   // Grab the variable info that was squirreled away in the MMI side-table.
1318   collectVariableInfoFromMMITable(Processed);
1319
1320   for (const auto &I : DbgValues) {
1321     DIVariable DV(I.first);
1322     if (Processed.count(DV))
1323       continue;
1324
1325     // Instruction ranges, specifying where DV is accessible.
1326     const auto &Ranges = I.second;
1327     if (Ranges.empty())
1328       continue;
1329
1330     LexicalScope *Scope = nullptr;
1331     if (MDNode *IA = DV.getInlinedAt()) {
1332       DebugLoc DL = DebugLoc::getFromDILocation(IA);
1333       Scope = LScopes.findInlinedScope(DebugLoc::get(
1334           DL.getLine(), DL.getCol(), DV.getContext(), IA));
1335     } else
1336       Scope = LScopes.findLexicalScope(DV.getContext());
1337     // If variable scope is not found then skip this variable.
1338     if (!Scope)
1339       continue;
1340
1341     Processed.insert(getEntireVariable(DV));
1342     const MachineInstr *MInsn = Ranges.front().first;
1343     assert(MInsn->isDebugValue() && "History must begin with debug value");
1344     ensureAbstractVariableIsCreatedIfScoped(DV, Scope->getScopeNode());
1345     ConcreteVariables.push_back(make_unique<DbgVariable>(MInsn, this));
1346     DbgVariable *RegVar = ConcreteVariables.back().get();
1347     addScopeVariable(Scope, RegVar);
1348
1349     // Check if the first DBG_VALUE is valid for the rest of the function.
1350     if (Ranges.size() == 1 && Ranges.front().second == nullptr)
1351       continue;
1352
1353     // Handle multiple DBG_VALUE instructions describing one variable.
1354     RegVar->setDotDebugLocOffset(DotDebugLocEntries.size());
1355
1356     DotDebugLocEntries.resize(DotDebugLocEntries.size() + 1);
1357     DebugLocList &LocList = DotDebugLocEntries.back();
1358     LocList.CU = TheCU;
1359     LocList.Label =
1360         Asm->GetTempSymbol("debug_loc", DotDebugLocEntries.size() - 1);
1361
1362     // Build the location list for this variable.
1363     buildLocationList(LocList.List, Ranges);
1364   }
1365
1366   // Collect info for variables that were optimized out.
1367   DIArray Variables = DISubprogram(FnScope->getScopeNode()).getVariables();
1368   for (unsigned i = 0, e = Variables.getNumElements(); i != e; ++i) {
1369     DIVariable DV(Variables.getElement(i));
1370     assert(DV.isVariable());
1371     if (!Processed.insert(DV))
1372       continue;
1373     if (LexicalScope *Scope = LScopes.findLexicalScope(DV.getContext())) {
1374       ensureAbstractVariableIsCreatedIfScoped(DV, Scope->getScopeNode());
1375       ConcreteVariables.push_back(make_unique<DbgVariable>(DV, this));
1376       addScopeVariable(Scope, ConcreteVariables.back().get());
1377     }
1378   }
1379 }
1380
1381 // Return Label preceding the instruction.
1382 MCSymbol *DwarfDebug::getLabelBeforeInsn(const MachineInstr *MI) {
1383   MCSymbol *Label = LabelsBeforeInsn.lookup(MI);
1384   assert(Label && "Didn't insert label before instruction");
1385   return Label;
1386 }
1387
1388 // Return Label immediately following the instruction.
1389 MCSymbol *DwarfDebug::getLabelAfterInsn(const MachineInstr *MI) {
1390   return LabelsAfterInsn.lookup(MI);
1391 }
1392
1393 // Process beginning of an instruction.
1394 void DwarfDebug::beginInstruction(const MachineInstr *MI) {
1395   assert(CurMI == nullptr);
1396   CurMI = MI;
1397   // Check if source location changes, but ignore DBG_VALUE locations.
1398   if (!MI->isDebugValue()) {
1399     DebugLoc DL = MI->getDebugLoc();
1400     if (DL != PrevInstLoc && (!DL.isUnknown() || UnknownLocations)) {
1401       unsigned Flags = 0;
1402       PrevInstLoc = DL;
1403       if (DL == PrologEndLoc) {
1404         Flags |= DWARF2_FLAG_PROLOGUE_END;
1405         PrologEndLoc = DebugLoc();
1406       }
1407       if (PrologEndLoc.isUnknown())
1408         Flags |= DWARF2_FLAG_IS_STMT;
1409
1410       if (!DL.isUnknown()) {
1411         const MDNode *Scope = DL.getScope(Asm->MF->getFunction()->getContext());
1412         recordSourceLine(DL.getLine(), DL.getCol(), Scope, Flags);
1413       } else
1414         recordSourceLine(0, 0, nullptr, 0);
1415     }
1416   }
1417
1418   // Insert labels where requested.
1419   DenseMap<const MachineInstr *, MCSymbol *>::iterator I =
1420       LabelsBeforeInsn.find(MI);
1421
1422   // No label needed.
1423   if (I == LabelsBeforeInsn.end())
1424     return;
1425
1426   // Label already assigned.
1427   if (I->second)
1428     return;
1429
1430   if (!PrevLabel) {
1431     PrevLabel = MMI->getContext().CreateTempSymbol();
1432     Asm->OutStreamer.EmitLabel(PrevLabel);
1433   }
1434   I->second = PrevLabel;
1435 }
1436
1437 // Process end of an instruction.
1438 void DwarfDebug::endInstruction() {
1439   assert(CurMI != nullptr);
1440   // Don't create a new label after DBG_VALUE instructions.
1441   // They don't generate code.
1442   if (!CurMI->isDebugValue())
1443     PrevLabel = nullptr;
1444
1445   DenseMap<const MachineInstr *, MCSymbol *>::iterator I =
1446       LabelsAfterInsn.find(CurMI);
1447   CurMI = nullptr;
1448
1449   // No label needed.
1450   if (I == LabelsAfterInsn.end())
1451     return;
1452
1453   // Label already assigned.
1454   if (I->second)
1455     return;
1456
1457   // We need a label after this instruction.
1458   if (!PrevLabel) {
1459     PrevLabel = MMI->getContext().CreateTempSymbol();
1460     Asm->OutStreamer.EmitLabel(PrevLabel);
1461   }
1462   I->second = PrevLabel;
1463 }
1464
1465 // Each LexicalScope has first instruction and last instruction to mark
1466 // beginning and end of a scope respectively. Create an inverse map that list
1467 // scopes starts (and ends) with an instruction. One instruction may start (or
1468 // end) multiple scopes. Ignore scopes that are not reachable.
1469 void DwarfDebug::identifyScopeMarkers() {
1470   SmallVector<LexicalScope *, 4> WorkList;
1471   WorkList.push_back(LScopes.getCurrentFunctionScope());
1472   while (!WorkList.empty()) {
1473     LexicalScope *S = WorkList.pop_back_val();
1474
1475     const SmallVectorImpl<LexicalScope *> &Children = S->getChildren();
1476     if (!Children.empty())
1477       WorkList.append(Children.begin(), Children.end());
1478
1479     if (S->isAbstractScope())
1480       continue;
1481
1482     for (const InsnRange &R : S->getRanges()) {
1483       assert(R.first && "InsnRange does not have first instruction!");
1484       assert(R.second && "InsnRange does not have second instruction!");
1485       requestLabelBeforeInsn(R.first);
1486       requestLabelAfterInsn(R.second);
1487     }
1488   }
1489 }
1490
1491 static DebugLoc findPrologueEndLoc(const MachineFunction *MF) {
1492   // First known non-DBG_VALUE and non-frame setup location marks
1493   // the beginning of the function body.
1494   for (const auto &MBB : *MF)
1495     for (const auto &MI : MBB)
1496       if (!MI.isDebugValue() && !MI.getFlag(MachineInstr::FrameSetup) &&
1497           !MI.getDebugLoc().isUnknown())
1498         return MI.getDebugLoc();
1499   return DebugLoc();
1500 }
1501
1502 // Gather pre-function debug information.  Assumes being called immediately
1503 // after the function entry point has been emitted.
1504 void DwarfDebug::beginFunction(const MachineFunction *MF) {
1505   CurFn = MF;
1506
1507   // If there's no debug info for the function we're not going to do anything.
1508   if (!MMI->hasDebugInfo())
1509     return;
1510
1511   auto DI = FunctionDIs.find(MF->getFunction());
1512   if (DI == FunctionDIs.end())
1513     return;
1514
1515   // Grab the lexical scopes for the function, if we don't have any of those
1516   // then we're not going to be able to do anything.
1517   LScopes.initialize(*MF);
1518   if (LScopes.empty())
1519     return;
1520
1521   assert(DbgValues.empty() && "DbgValues map wasn't cleaned!");
1522
1523   // Make sure that each lexical scope will have a begin/end label.
1524   identifyScopeMarkers();
1525
1526   // Set DwarfDwarfCompileUnitID in MCContext to the Compile Unit this function
1527   // belongs to so that we add to the correct per-cu line table in the
1528   // non-asm case.
1529   LexicalScope *FnScope = LScopes.getCurrentFunctionScope();
1530   // FnScope->getScopeNode() and DI->second should represent the same function,
1531   // though they may not be the same MDNode due to inline functions merged in
1532   // LTO where the debug info metadata still differs (either due to distinct
1533   // written differences - two versions of a linkonce_odr function
1534   // written/copied into two separate files, or some sub-optimal metadata that
1535   // isn't structurally identical (see: file path/name info from clang, which
1536   // includes the directory of the cpp file being built, even when the file name
1537   // is absolute (such as an <> lookup header)))
1538   DwarfCompileUnit *TheCU = SPMap.lookup(FnScope->getScopeNode());
1539   assert(TheCU && "Unable to find compile unit!");
1540   if (Asm->OutStreamer.hasRawTextSupport())
1541     // Use a single line table if we are generating assembly.
1542     Asm->OutStreamer.getContext().setDwarfCompileUnitID(0);
1543   else
1544     Asm->OutStreamer.getContext().setDwarfCompileUnitID(TheCU->getUniqueID());
1545
1546   // Emit a label for the function so that we have a beginning address.
1547   FunctionBeginSym = Asm->GetTempSymbol("func_begin", Asm->getFunctionNumber());
1548   // Assumes in correct section after the entry point.
1549   Asm->OutStreamer.EmitLabel(FunctionBeginSym);
1550
1551   // Calculate history for local variables.
1552   calculateDbgValueHistory(MF, Asm->TM.getSubtargetImpl()->getRegisterInfo(),
1553                            DbgValues);
1554
1555   // Request labels for the full history.
1556   for (const auto &I : DbgValues) {
1557     const auto &Ranges = I.second;
1558     if (Ranges.empty())
1559       continue;
1560
1561     // The first mention of a function argument gets the FunctionBeginSym
1562     // label, so arguments are visible when breaking at function entry.
1563     DIVariable DV(Ranges.front().first->getDebugVariable());
1564     if (DV.isVariable() && DV.getTag() == dwarf::DW_TAG_arg_variable &&
1565         getDISubprogram(DV.getContext()).describes(MF->getFunction())) {
1566       if (!DV.isVariablePiece())
1567         LabelsBeforeInsn[Ranges.front().first] = FunctionBeginSym;
1568       else {
1569         // Mark all non-overlapping initial pieces.
1570         for (auto I = Ranges.begin(); I != Ranges.end(); ++I) {
1571           DIVariable Piece = I->first->getDebugVariable();
1572           if (std::all_of(Ranges.begin(), I,
1573                           [&](DbgValueHistoryMap::InstrRange Pred){
1574                 return !piecesOverlap(Piece, Pred.first->getDebugVariable());
1575               }))
1576             LabelsBeforeInsn[I->first] = FunctionBeginSym;
1577           else
1578             break;
1579         }
1580       }
1581     }
1582
1583     for (const auto &Range : Ranges) {
1584       requestLabelBeforeInsn(Range.first);
1585       if (Range.second)
1586         requestLabelAfterInsn(Range.second);
1587     }
1588   }
1589
1590   PrevInstLoc = DebugLoc();
1591   PrevLabel = FunctionBeginSym;
1592
1593   // Record beginning of function.
1594   PrologEndLoc = findPrologueEndLoc(MF);
1595   if (!PrologEndLoc.isUnknown()) {
1596     DebugLoc FnStartDL =
1597         PrologEndLoc.getFnDebugLoc(MF->getFunction()->getContext());
1598     recordSourceLine(
1599         FnStartDL.getLine(), FnStartDL.getCol(),
1600         FnStartDL.getScope(MF->getFunction()->getContext()),
1601         // We'd like to list the prologue as "not statements" but GDB behaves
1602         // poorly if we do that. Revisit this with caution/GDB (7.5+) testing.
1603         DWARF2_FLAG_IS_STMT);
1604   }
1605 }
1606
1607 void DwarfDebug::addScopeVariable(LexicalScope *LS, DbgVariable *Var) {
1608   if (addCurrentFnArgument(Var, LS))
1609     return;
1610   SmallVectorImpl<DbgVariable *> &Vars = ScopeVariables[LS];
1611   DIVariable DV = Var->getVariable();
1612   // Variables with positive arg numbers are parameters.
1613   if (unsigned ArgNum = DV.getArgNumber()) {
1614     // Keep all parameters in order at the start of the variable list to ensure
1615     // function types are correct (no out-of-order parameters)
1616     //
1617     // This could be improved by only doing it for optimized builds (unoptimized
1618     // builds have the right order to begin with), searching from the back (this
1619     // would catch the unoptimized case quickly), or doing a binary search
1620     // rather than linear search.
1621     SmallVectorImpl<DbgVariable *>::iterator I = Vars.begin();
1622     while (I != Vars.end()) {
1623       unsigned CurNum = (*I)->getVariable().getArgNumber();
1624       // A local (non-parameter) variable has been found, insert immediately
1625       // before it.
1626       if (CurNum == 0)
1627         break;
1628       // A later indexed parameter has been found, insert immediately before it.
1629       if (CurNum > ArgNum)
1630         break;
1631       ++I;
1632     }
1633     Vars.insert(I, Var);
1634     return;
1635   }
1636
1637   Vars.push_back(Var);
1638 }
1639
1640 // Gather and emit post-function debug information.
1641 void DwarfDebug::endFunction(const MachineFunction *MF) {
1642   // Every beginFunction(MF) call should be followed by an endFunction(MF) call,
1643   // though the beginFunction may not be called at all.
1644   // We should handle both cases.
1645   if (!CurFn)
1646     CurFn = MF;
1647   else
1648     assert(CurFn == MF);
1649   assert(CurFn != nullptr);
1650
1651   if (!MMI->hasDebugInfo() || LScopes.empty() ||
1652       !FunctionDIs.count(MF->getFunction())) {
1653     // If we don't have a lexical scope for this function then there will
1654     // be a hole in the range information. Keep note of this by setting the
1655     // previously used section to nullptr.
1656     PrevSection = nullptr;
1657     PrevCU = nullptr;
1658     CurFn = nullptr;
1659     return;
1660   }
1661
1662   // Define end label for subprogram.
1663   FunctionEndSym = Asm->GetTempSymbol("func_end", Asm->getFunctionNumber());
1664   // Assumes in correct section after the entry point.
1665   Asm->OutStreamer.EmitLabel(FunctionEndSym);
1666
1667   // Set DwarfDwarfCompileUnitID in MCContext to default value.
1668   Asm->OutStreamer.getContext().setDwarfCompileUnitID(0);
1669
1670   SmallPtrSet<const MDNode *, 16> ProcessedVars;
1671   collectVariableInfo(ProcessedVars);
1672
1673   LexicalScope *FnScope = LScopes.getCurrentFunctionScope();
1674   DwarfCompileUnit &TheCU = *SPMap.lookup(FnScope->getScopeNode());
1675
1676   // Construct abstract scopes.
1677   for (LexicalScope *AScope : LScopes.getAbstractScopesList()) {
1678     DISubprogram SP(AScope->getScopeNode());
1679     assert(SP.isSubprogram());
1680     // Collect info for variables that were optimized out.
1681     DIArray Variables = SP.getVariables();
1682     for (unsigned i = 0, e = Variables.getNumElements(); i != e; ++i) {
1683       DIVariable DV(Variables.getElement(i));
1684       assert(DV && DV.isVariable());
1685       if (!ProcessedVars.insert(DV))
1686         continue;
1687       ensureAbstractVariableIsCreated(DV, DV.getContext());
1688     }
1689     constructAbstractSubprogramScopeDIE(TheCU, AScope);
1690   }
1691
1692   DIE &CurFnDIE = constructSubprogramScopeDIE(TheCU, FnScope);
1693   if (!CurFn->getTarget().Options.DisableFramePointerElim(*CurFn))
1694     TheCU.addFlag(CurFnDIE, dwarf::DW_AT_APPLE_omit_frame_ptr);
1695
1696   // Add the range of this function to the list of ranges for the CU.
1697   RangeSpan Span(FunctionBeginSym, FunctionEndSym);
1698   TheCU.addRange(std::move(Span));
1699   PrevSection = Asm->getCurrentSection();
1700   PrevCU = &TheCU;
1701
1702   // Clear debug info
1703   // Ownership of DbgVariables is a bit subtle - ScopeVariables owns all the
1704   // DbgVariables except those that are also in AbstractVariables (since they
1705   // can be used cross-function)
1706   ScopeVariables.clear();
1707   CurrentFnArguments.clear();
1708   DbgValues.clear();
1709   LabelsBeforeInsn.clear();
1710   LabelsAfterInsn.clear();
1711   PrevLabel = nullptr;
1712   CurFn = nullptr;
1713 }
1714
1715 // Register a source line with debug info. Returns the  unique label that was
1716 // emitted and which provides correspondence to the source line list.
1717 void DwarfDebug::recordSourceLine(unsigned Line, unsigned Col, const MDNode *S,
1718                                   unsigned Flags) {
1719   StringRef Fn;
1720   StringRef Dir;
1721   unsigned Src = 1;
1722   unsigned Discriminator = 0;
1723   if (DIScope Scope = DIScope(S)) {
1724     assert(Scope.isScope());
1725     Fn = Scope.getFilename();
1726     Dir = Scope.getDirectory();
1727     if (Scope.isLexicalBlock())
1728       Discriminator = DILexicalBlock(S).getDiscriminator();
1729
1730     unsigned CUID = Asm->OutStreamer.getContext().getDwarfCompileUnitID();
1731     Src = static_cast<DwarfCompileUnit &>(*InfoHolder.getUnits()[CUID])
1732               .getOrCreateSourceID(Fn, Dir);
1733   }
1734   Asm->OutStreamer.EmitDwarfLocDirective(Src, Line, Col, Flags, 0,
1735                                          Discriminator, Fn);
1736 }
1737
1738 //===----------------------------------------------------------------------===//
1739 // Emit Methods
1740 //===----------------------------------------------------------------------===//
1741
1742 // Emit initial Dwarf sections with a label at the start of each one.
1743 void DwarfDebug::emitSectionLabels() {
1744   const TargetLoweringObjectFile &TLOF = Asm->getObjFileLowering();
1745
1746   // Dwarf sections base addresses.
1747   DwarfInfoSectionSym =
1748       emitSectionSym(Asm, TLOF.getDwarfInfoSection(), "section_info");
1749   if (useSplitDwarf()) {
1750     DwarfInfoDWOSectionSym =
1751         emitSectionSym(Asm, TLOF.getDwarfInfoDWOSection(), "section_info_dwo");
1752     DwarfTypesDWOSectionSym =
1753         emitSectionSym(Asm, TLOF.getDwarfTypesDWOSection(), "section_types_dwo");
1754   }
1755   DwarfAbbrevSectionSym =
1756       emitSectionSym(Asm, TLOF.getDwarfAbbrevSection(), "section_abbrev");
1757   if (useSplitDwarf())
1758     DwarfAbbrevDWOSectionSym = emitSectionSym(
1759         Asm, TLOF.getDwarfAbbrevDWOSection(), "section_abbrev_dwo");
1760   if (GenerateARangeSection)
1761     emitSectionSym(Asm, TLOF.getDwarfARangesSection());
1762
1763   DwarfLineSectionSym =
1764       emitSectionSym(Asm, TLOF.getDwarfLineSection(), "section_line");
1765   if (GenerateGnuPubSections) {
1766     DwarfGnuPubNamesSectionSym =
1767         emitSectionSym(Asm, TLOF.getDwarfGnuPubNamesSection());
1768     DwarfGnuPubTypesSectionSym =
1769         emitSectionSym(Asm, TLOF.getDwarfGnuPubTypesSection());
1770   } else if (HasDwarfPubSections) {
1771     emitSectionSym(Asm, TLOF.getDwarfPubNamesSection());
1772     emitSectionSym(Asm, TLOF.getDwarfPubTypesSection());
1773   }
1774
1775   DwarfStrSectionSym =
1776       emitSectionSym(Asm, TLOF.getDwarfStrSection(), "info_string");
1777   if (useSplitDwarf()) {
1778     DwarfStrDWOSectionSym =
1779         emitSectionSym(Asm, TLOF.getDwarfStrDWOSection(), "skel_string");
1780     DwarfAddrSectionSym =
1781         emitSectionSym(Asm, TLOF.getDwarfAddrSection(), "addr_sec");
1782     DwarfDebugLocSectionSym =
1783         emitSectionSym(Asm, TLOF.getDwarfLocDWOSection(), "skel_loc");
1784   } else
1785     DwarfDebugLocSectionSym =
1786         emitSectionSym(Asm, TLOF.getDwarfLocSection(), "section_debug_loc");
1787   DwarfDebugRangeSectionSym =
1788       emitSectionSym(Asm, TLOF.getDwarfRangesSection(), "debug_range");
1789 }
1790
1791 // Recursively emits a debug information entry.
1792 void DwarfDebug::emitDIE(DIE &Die) {
1793   // Get the abbreviation for this DIE.
1794   const DIEAbbrev &Abbrev = Die.getAbbrev();
1795
1796   // Emit the code (index) for the abbreviation.
1797   if (Asm->isVerbose())
1798     Asm->OutStreamer.AddComment("Abbrev [" + Twine(Abbrev.getNumber()) +
1799                                 "] 0x" + Twine::utohexstr(Die.getOffset()) +
1800                                 ":0x" + Twine::utohexstr(Die.getSize()) + " " +
1801                                 dwarf::TagString(Abbrev.getTag()));
1802   Asm->EmitULEB128(Abbrev.getNumber());
1803
1804   const SmallVectorImpl<DIEValue *> &Values = Die.getValues();
1805   const SmallVectorImpl<DIEAbbrevData> &AbbrevData = Abbrev.getData();
1806
1807   // Emit the DIE attribute values.
1808   for (unsigned i = 0, N = Values.size(); i < N; ++i) {
1809     dwarf::Attribute Attr = AbbrevData[i].getAttribute();
1810     dwarf::Form Form = AbbrevData[i].getForm();
1811     assert(Form && "Too many attributes for DIE (check abbreviation)");
1812
1813     if (Asm->isVerbose()) {
1814       Asm->OutStreamer.AddComment(dwarf::AttributeString(Attr));
1815       if (Attr == dwarf::DW_AT_accessibility)
1816         Asm->OutStreamer.AddComment(dwarf::AccessibilityString(
1817             cast<DIEInteger>(Values[i])->getValue()));
1818     }
1819
1820     // Emit an attribute using the defined form.
1821     Values[i]->EmitValue(Asm, Form);
1822   }
1823
1824   // Emit the DIE children if any.
1825   if (Abbrev.hasChildren()) {
1826     for (auto &Child : Die.getChildren())
1827       emitDIE(*Child);
1828
1829     Asm->OutStreamer.AddComment("End Of Children Mark");
1830     Asm->EmitInt8(0);
1831   }
1832 }
1833
1834 // Emit the debug info section.
1835 void DwarfDebug::emitDebugInfo() {
1836   DwarfFile &Holder = useSplitDwarf() ? SkeletonHolder : InfoHolder;
1837
1838   Holder.emitUnits(this, DwarfAbbrevSectionSym);
1839 }
1840
1841 // Emit the abbreviation section.
1842 void DwarfDebug::emitAbbreviations() {
1843   DwarfFile &Holder = useSplitDwarf() ? SkeletonHolder : InfoHolder;
1844
1845   Holder.emitAbbrevs(Asm->getObjFileLowering().getDwarfAbbrevSection());
1846 }
1847
1848 // Emit the last address of the section and the end of the line matrix.
1849 void DwarfDebug::emitEndOfLineMatrix(unsigned SectionEnd) {
1850   // Define last address of section.
1851   Asm->OutStreamer.AddComment("Extended Op");
1852   Asm->EmitInt8(0);
1853
1854   Asm->OutStreamer.AddComment("Op size");
1855   Asm->EmitInt8(Asm->getDataLayout().getPointerSize() + 1);
1856   Asm->OutStreamer.AddComment("DW_LNE_set_address");
1857   Asm->EmitInt8(dwarf::DW_LNE_set_address);
1858
1859   Asm->OutStreamer.AddComment("Section end label");
1860
1861   Asm->OutStreamer.EmitSymbolValue(
1862       Asm->GetTempSymbol("section_end", SectionEnd),
1863       Asm->getDataLayout().getPointerSize());
1864
1865   // Mark end of matrix.
1866   Asm->OutStreamer.AddComment("DW_LNE_end_sequence");
1867   Asm->EmitInt8(0);
1868   Asm->EmitInt8(1);
1869   Asm->EmitInt8(1);
1870 }
1871
1872 // Emit visible names into a hashed accelerator table section.
1873 void DwarfDebug::emitAccelNames() {
1874   AccelNames.FinalizeTable(Asm, "Names");
1875   Asm->OutStreamer.SwitchSection(
1876       Asm->getObjFileLowering().getDwarfAccelNamesSection());
1877   MCSymbol *SectionBegin = Asm->GetTempSymbol("names_begin");
1878   Asm->OutStreamer.EmitLabel(SectionBegin);
1879
1880   // Emit the full data.
1881   AccelNames.Emit(Asm, SectionBegin, &InfoHolder);
1882 }
1883
1884 // Emit objective C classes and categories into a hashed accelerator table
1885 // section.
1886 void DwarfDebug::emitAccelObjC() {
1887   AccelObjC.FinalizeTable(Asm, "ObjC");
1888   Asm->OutStreamer.SwitchSection(
1889       Asm->getObjFileLowering().getDwarfAccelObjCSection());
1890   MCSymbol *SectionBegin = Asm->GetTempSymbol("objc_begin");
1891   Asm->OutStreamer.EmitLabel(SectionBegin);
1892
1893   // Emit the full data.
1894   AccelObjC.Emit(Asm, SectionBegin, &InfoHolder);
1895 }
1896
1897 // Emit namespace dies into a hashed accelerator table.
1898 void DwarfDebug::emitAccelNamespaces() {
1899   AccelNamespace.FinalizeTable(Asm, "namespac");
1900   Asm->OutStreamer.SwitchSection(
1901       Asm->getObjFileLowering().getDwarfAccelNamespaceSection());
1902   MCSymbol *SectionBegin = Asm->GetTempSymbol("namespac_begin");
1903   Asm->OutStreamer.EmitLabel(SectionBegin);
1904
1905   // Emit the full data.
1906   AccelNamespace.Emit(Asm, SectionBegin, &InfoHolder);
1907 }
1908
1909 // Emit type dies into a hashed accelerator table.
1910 void DwarfDebug::emitAccelTypes() {
1911
1912   AccelTypes.FinalizeTable(Asm, "types");
1913   Asm->OutStreamer.SwitchSection(
1914       Asm->getObjFileLowering().getDwarfAccelTypesSection());
1915   MCSymbol *SectionBegin = Asm->GetTempSymbol("types_begin");
1916   Asm->OutStreamer.EmitLabel(SectionBegin);
1917
1918   // Emit the full data.
1919   AccelTypes.Emit(Asm, SectionBegin, &InfoHolder);
1920 }
1921
1922 // Public name handling.
1923 // The format for the various pubnames:
1924 //
1925 // dwarf pubnames - offset/name pairs where the offset is the offset into the CU
1926 // for the DIE that is named.
1927 //
1928 // gnu pubnames - offset/index value/name tuples where the offset is the offset
1929 // into the CU and the index value is computed according to the type of value
1930 // for the DIE that is named.
1931 //
1932 // For type units the offset is the offset of the skeleton DIE. For split dwarf
1933 // it's the offset within the debug_info/debug_types dwo section, however, the
1934 // reference in the pubname header doesn't change.
1935
1936 /// computeIndexValue - Compute the gdb index value for the DIE and CU.
1937 static dwarf::PubIndexEntryDescriptor computeIndexValue(DwarfUnit *CU,
1938                                                         const DIE *Die) {
1939   dwarf::GDBIndexEntryLinkage Linkage = dwarf::GIEL_STATIC;
1940
1941   // We could have a specification DIE that has our most of our knowledge,
1942   // look for that now.
1943   DIEValue *SpecVal = Die->findAttribute(dwarf::DW_AT_specification);
1944   if (SpecVal) {
1945     DIE &SpecDIE = cast<DIEEntry>(SpecVal)->getEntry();
1946     if (SpecDIE.findAttribute(dwarf::DW_AT_external))
1947       Linkage = dwarf::GIEL_EXTERNAL;
1948   } else if (Die->findAttribute(dwarf::DW_AT_external))
1949     Linkage = dwarf::GIEL_EXTERNAL;
1950
1951   switch (Die->getTag()) {
1952   case dwarf::DW_TAG_class_type:
1953   case dwarf::DW_TAG_structure_type:
1954   case dwarf::DW_TAG_union_type:
1955   case dwarf::DW_TAG_enumeration_type:
1956     return dwarf::PubIndexEntryDescriptor(
1957         dwarf::GIEK_TYPE, CU->getLanguage() != dwarf::DW_LANG_C_plus_plus
1958                               ? dwarf::GIEL_STATIC
1959                               : dwarf::GIEL_EXTERNAL);
1960   case dwarf::DW_TAG_typedef:
1961   case dwarf::DW_TAG_base_type:
1962   case dwarf::DW_TAG_subrange_type:
1963     return dwarf::PubIndexEntryDescriptor(dwarf::GIEK_TYPE, dwarf::GIEL_STATIC);
1964   case dwarf::DW_TAG_namespace:
1965     return dwarf::GIEK_TYPE;
1966   case dwarf::DW_TAG_subprogram:
1967     return dwarf::PubIndexEntryDescriptor(dwarf::GIEK_FUNCTION, Linkage);
1968   case dwarf::DW_TAG_constant:
1969   case dwarf::DW_TAG_variable:
1970     return dwarf::PubIndexEntryDescriptor(dwarf::GIEK_VARIABLE, Linkage);
1971   case dwarf::DW_TAG_enumerator:
1972     return dwarf::PubIndexEntryDescriptor(dwarf::GIEK_VARIABLE,
1973                                           dwarf::GIEL_STATIC);
1974   default:
1975     return dwarf::GIEK_NONE;
1976   }
1977 }
1978
1979 /// emitDebugPubNames - Emit visible names into a debug pubnames section.
1980 ///
1981 void DwarfDebug::emitDebugPubNames(bool GnuStyle) {
1982   const MCSection *PSec =
1983       GnuStyle ? Asm->getObjFileLowering().getDwarfGnuPubNamesSection()
1984                : Asm->getObjFileLowering().getDwarfPubNamesSection();
1985
1986   emitDebugPubSection(GnuStyle, PSec, "Names", &DwarfUnit::getGlobalNames);
1987 }
1988
1989 void DwarfDebug::emitDebugPubSection(
1990     bool GnuStyle, const MCSection *PSec, StringRef Name,
1991     const StringMap<const DIE *> &(DwarfUnit::*Accessor)() const) {
1992   for (const auto &NU : CUMap) {
1993     DwarfCompileUnit *TheU = NU.second;
1994
1995     const auto &Globals = (TheU->*Accessor)();
1996
1997     if (Globals.empty())
1998       continue;
1999
2000     if (auto Skeleton = static_cast<DwarfCompileUnit *>(TheU->getSkeleton()))
2001       TheU = Skeleton;
2002     unsigned ID = TheU->getUniqueID();
2003
2004     // Start the dwarf pubnames section.
2005     Asm->OutStreamer.SwitchSection(PSec);
2006
2007     // Emit the header.
2008     Asm->OutStreamer.AddComment("Length of Public " + Name + " Info");
2009     MCSymbol *BeginLabel = Asm->GetTempSymbol("pub" + Name + "_begin", ID);
2010     MCSymbol *EndLabel = Asm->GetTempSymbol("pub" + Name + "_end", ID);
2011     Asm->EmitLabelDifference(EndLabel, BeginLabel, 4);
2012
2013     Asm->OutStreamer.EmitLabel(BeginLabel);
2014
2015     Asm->OutStreamer.AddComment("DWARF Version");
2016     Asm->EmitInt16(dwarf::DW_PUBNAMES_VERSION);
2017
2018     Asm->OutStreamer.AddComment("Offset of Compilation Unit Info");
2019     Asm->EmitSectionOffset(TheU->getLabelBegin(), TheU->getSectionSym());
2020
2021     Asm->OutStreamer.AddComment("Compilation Unit Length");
2022     Asm->EmitLabelDifference(TheU->getLabelEnd(), TheU->getLabelBegin(), 4);
2023
2024     // Emit the pubnames for this compilation unit.
2025     for (const auto &GI : Globals) {
2026       const char *Name = GI.getKeyData();
2027       const DIE *Entity = GI.second;
2028
2029       Asm->OutStreamer.AddComment("DIE offset");
2030       Asm->EmitInt32(Entity->getOffset());
2031
2032       if (GnuStyle) {
2033         dwarf::PubIndexEntryDescriptor Desc = computeIndexValue(TheU, Entity);
2034         Asm->OutStreamer.AddComment(
2035             Twine("Kind: ") + dwarf::GDBIndexEntryKindString(Desc.Kind) + ", " +
2036             dwarf::GDBIndexEntryLinkageString(Desc.Linkage));
2037         Asm->EmitInt8(Desc.toBits());
2038       }
2039
2040       Asm->OutStreamer.AddComment("External Name");
2041       Asm->OutStreamer.EmitBytes(StringRef(Name, GI.getKeyLength() + 1));
2042     }
2043
2044     Asm->OutStreamer.AddComment("End Mark");
2045     Asm->EmitInt32(0);
2046     Asm->OutStreamer.EmitLabel(EndLabel);
2047   }
2048 }
2049
2050 void DwarfDebug::emitDebugPubTypes(bool GnuStyle) {
2051   const MCSection *PSec =
2052       GnuStyle ? Asm->getObjFileLowering().getDwarfGnuPubTypesSection()
2053                : Asm->getObjFileLowering().getDwarfPubTypesSection();
2054
2055   emitDebugPubSection(GnuStyle, PSec, "Types", &DwarfUnit::getGlobalTypes);
2056 }
2057
2058 // Emit visible names into a debug str section.
2059 void DwarfDebug::emitDebugStr() {
2060   DwarfFile &Holder = useSplitDwarf() ? SkeletonHolder : InfoHolder;
2061   Holder.emitStrings(Asm->getObjFileLowering().getDwarfStrSection());
2062 }
2063
2064 /// Emits an optimal (=sorted) sequence of DW_OP_pieces.
2065 void DwarfDebug::emitLocPieces(ByteStreamer &Streamer,
2066                                const DITypeIdentifierMap &Map,
2067                                ArrayRef<DebugLocEntry::Value> Values) {
2068   assert(std::all_of(Values.begin(), Values.end(), [](DebugLocEntry::Value P) {
2069         return DIVariable(P.getVariable()).isVariablePiece();
2070       }) && "all values are expected to be pieces");
2071   assert(std::is_sorted(Values.begin(), Values.end()) &&
2072          "pieces are expected to be sorted");
2073
2074   unsigned Offset = 0;
2075   for (auto Piece : Values) {
2076     DIVariable Var(Piece.getVariable());
2077     unsigned PieceOffset = Var.getPieceOffset();
2078     unsigned PieceSize = Var.getPieceSize();
2079     assert(Offset <= PieceOffset && "overlapping or duplicate pieces");
2080     if (Offset < PieceOffset) {
2081       // The DWARF spec seriously mandates pieces with no locations for gaps.
2082       Asm->EmitDwarfOpPiece(Streamer, (PieceOffset-Offset)*8);
2083       Offset += PieceOffset-Offset;
2084     }
2085
2086     Offset += PieceSize;
2087
2088     const unsigned SizeOfByte = 8;
2089     assert(!Var.isIndirect() && "indirect address for piece");
2090 #ifndef NDEBUG
2091     unsigned VarSize = Var.getSizeInBits(Map);
2092     assert(PieceSize+PieceOffset <= VarSize/SizeOfByte
2093            && "piece is larger than or outside of variable");
2094     assert(PieceSize*SizeOfByte != VarSize
2095            && "piece covers entire variable");
2096 #endif
2097     if (Piece.isLocation() && Piece.getLoc().isReg())
2098       Asm->EmitDwarfRegOpPiece(Streamer,
2099                                Piece.getLoc(),
2100                                PieceSize*SizeOfByte);
2101     else {
2102       emitDebugLocValue(Streamer, Piece);
2103       Asm->EmitDwarfOpPiece(Streamer, PieceSize*SizeOfByte);
2104     }
2105   }
2106 }
2107
2108
2109 void DwarfDebug::emitDebugLocEntry(ByteStreamer &Streamer,
2110                                    const DebugLocEntry &Entry) {
2111   const DebugLocEntry::Value Value = Entry.getValues()[0];
2112   DIVariable DV(Value.getVariable());
2113   if (DV.isVariablePiece())
2114     // Emit all pieces that belong to the same variable and range.
2115     return emitLocPieces(Streamer, TypeIdentifierMap, Entry.getValues());
2116
2117   assert(Entry.getValues().size() == 1 && "only pieces may have >1 value");
2118   emitDebugLocValue(Streamer, Value);
2119 }
2120
2121 void DwarfDebug::emitDebugLocValue(ByteStreamer &Streamer,
2122                                    const DebugLocEntry::Value &Value) {
2123   DIVariable DV(Value.getVariable());
2124   // Regular entry.
2125   if (Value.isInt()) {
2126     DIBasicType BTy(resolve(DV.getType()));
2127     if (BTy.Verify() && (BTy.getEncoding() == dwarf::DW_ATE_signed ||
2128                          BTy.getEncoding() == dwarf::DW_ATE_signed_char)) {
2129       Streamer.EmitInt8(dwarf::DW_OP_consts, "DW_OP_consts");
2130       Streamer.EmitSLEB128(Value.getInt());
2131     } else {
2132       Streamer.EmitInt8(dwarf::DW_OP_constu, "DW_OP_constu");
2133       Streamer.EmitULEB128(Value.getInt());
2134     }
2135   } else if (Value.isLocation()) {
2136     MachineLocation Loc = Value.getLoc();
2137     if (!DV.hasComplexAddress())
2138       // Regular entry.
2139       Asm->EmitDwarfRegOp(Streamer, Loc, DV.isIndirect());
2140     else {
2141       // Complex address entry.
2142       unsigned N = DV.getNumAddrElements();
2143       unsigned i = 0;
2144       if (N >= 2 && DV.getAddrElement(0) == DIBuilder::OpPlus) {
2145         if (Loc.getOffset()) {
2146           i = 2;
2147           Asm->EmitDwarfRegOp(Streamer, Loc, DV.isIndirect());
2148           Streamer.EmitInt8(dwarf::DW_OP_deref, "DW_OP_deref");
2149           Streamer.EmitInt8(dwarf::DW_OP_plus_uconst, "DW_OP_plus_uconst");
2150           Streamer.EmitSLEB128(DV.getAddrElement(1));
2151         } else {
2152           // If first address element is OpPlus then emit
2153           // DW_OP_breg + Offset instead of DW_OP_reg + Offset.
2154           MachineLocation TLoc(Loc.getReg(), DV.getAddrElement(1));
2155           Asm->EmitDwarfRegOp(Streamer, TLoc, DV.isIndirect());
2156           i = 2;
2157         }
2158       } else {
2159         Asm->EmitDwarfRegOp(Streamer, Loc, DV.isIndirect());
2160       }
2161
2162       // Emit remaining complex address elements.
2163       for (; i < N; ++i) {
2164         uint64_t Element = DV.getAddrElement(i);
2165         if (Element == DIBuilder::OpPlus) {
2166           Streamer.EmitInt8(dwarf::DW_OP_plus_uconst, "DW_OP_plus_uconst");
2167           Streamer.EmitULEB128(DV.getAddrElement(++i));
2168         } else if (Element == DIBuilder::OpDeref) {
2169           if (!Loc.isReg())
2170             Streamer.EmitInt8(dwarf::DW_OP_deref, "DW_OP_deref");
2171         } else if (Element == DIBuilder::OpPiece) {
2172           i += 3;
2173           // handled in emitDebugLocEntry.
2174         } else
2175           llvm_unreachable("unknown Opcode found in complex address");
2176       }
2177     }
2178   }
2179   // else ... ignore constant fp. There is not any good way to
2180   // to represent them here in dwarf.
2181   // FIXME: ^
2182 }
2183
2184 void DwarfDebug::emitDebugLocEntryLocation(const DebugLocEntry &Entry) {
2185   Asm->OutStreamer.AddComment("Loc expr size");
2186   MCSymbol *begin = Asm->OutStreamer.getContext().CreateTempSymbol();
2187   MCSymbol *end = Asm->OutStreamer.getContext().CreateTempSymbol();
2188   Asm->EmitLabelDifference(end, begin, 2);
2189   Asm->OutStreamer.EmitLabel(begin);
2190   // Emit the entry.
2191   APByteStreamer Streamer(*Asm);
2192   emitDebugLocEntry(Streamer, Entry);
2193   // Close the range.
2194   Asm->OutStreamer.EmitLabel(end);
2195 }
2196
2197 // Emit locations into the debug loc section.
2198 void DwarfDebug::emitDebugLoc() {
2199   // Start the dwarf loc section.
2200   Asm->OutStreamer.SwitchSection(
2201       Asm->getObjFileLowering().getDwarfLocSection());
2202   unsigned char Size = Asm->getDataLayout().getPointerSize();
2203   for (const auto &DebugLoc : DotDebugLocEntries) {
2204     Asm->OutStreamer.EmitLabel(DebugLoc.Label);
2205     const DwarfCompileUnit *CU = DebugLoc.CU;
2206     assert(!CU->getRanges().empty());
2207     for (const auto &Entry : DebugLoc.List) {
2208       // Set up the range. This range is relative to the entry point of the
2209       // compile unit. This is a hard coded 0 for low_pc when we're emitting
2210       // ranges, or the DW_AT_low_pc on the compile unit otherwise.
2211       if (CU->getRanges().size() == 1) {
2212         // Grab the begin symbol from the first range as our base.
2213         const MCSymbol *Base = CU->getRanges()[0].getStart();
2214         Asm->EmitLabelDifference(Entry.getBeginSym(), Base, Size);
2215         Asm->EmitLabelDifference(Entry.getEndSym(), Base, Size);
2216       } else {
2217         Asm->OutStreamer.EmitSymbolValue(Entry.getBeginSym(), Size);
2218         Asm->OutStreamer.EmitSymbolValue(Entry.getEndSym(), Size);
2219       }
2220
2221       emitDebugLocEntryLocation(Entry);
2222     }
2223     Asm->OutStreamer.EmitIntValue(0, Size);
2224     Asm->OutStreamer.EmitIntValue(0, Size);
2225   }
2226 }
2227
2228 void DwarfDebug::emitDebugLocDWO() {
2229   Asm->OutStreamer.SwitchSection(
2230       Asm->getObjFileLowering().getDwarfLocDWOSection());
2231   for (const auto &DebugLoc : DotDebugLocEntries) {
2232     Asm->OutStreamer.EmitLabel(DebugLoc.Label);
2233     for (const auto &Entry : DebugLoc.List) {
2234       // Just always use start_length for now - at least that's one address
2235       // rather than two. We could get fancier and try to, say, reuse an
2236       // address we know we've emitted elsewhere (the start of the function?
2237       // The start of the CU or CU subrange that encloses this range?)
2238       Asm->EmitInt8(dwarf::DW_LLE_start_length_entry);
2239       unsigned idx = AddrPool.getIndex(Entry.getBeginSym());
2240       Asm->EmitULEB128(idx);
2241       Asm->EmitLabelDifference(Entry.getEndSym(), Entry.getBeginSym(), 4);
2242
2243       emitDebugLocEntryLocation(Entry);
2244     }
2245     Asm->EmitInt8(dwarf::DW_LLE_end_of_list_entry);
2246   }
2247 }
2248
2249 struct ArangeSpan {
2250   const MCSymbol *Start, *End;
2251 };
2252
2253 // Emit a debug aranges section, containing a CU lookup for any
2254 // address we can tie back to a CU.
2255 void DwarfDebug::emitDebugARanges() {
2256   // Start the dwarf aranges section.
2257   Asm->OutStreamer.SwitchSection(
2258       Asm->getObjFileLowering().getDwarfARangesSection());
2259
2260   typedef DenseMap<DwarfCompileUnit *, std::vector<ArangeSpan>> SpansType;
2261
2262   SpansType Spans;
2263
2264   // Build a list of sections used.
2265   std::vector<const MCSection *> Sections;
2266   for (const auto &it : SectionMap) {
2267     const MCSection *Section = it.first;
2268     Sections.push_back(Section);
2269   }
2270
2271   // Sort the sections into order.
2272   // This is only done to ensure consistent output order across different runs.
2273   std::sort(Sections.begin(), Sections.end(), SectionSort);
2274
2275   // Build a set of address spans, sorted by CU.
2276   for (const MCSection *Section : Sections) {
2277     SmallVector<SymbolCU, 8> &List = SectionMap[Section];
2278     if (List.size() < 2)
2279       continue;
2280
2281     // Sort the symbols by offset within the section.
2282     std::sort(List.begin(), List.end(),
2283               [&](const SymbolCU &A, const SymbolCU &B) {
2284       unsigned IA = A.Sym ? Asm->OutStreamer.GetSymbolOrder(A.Sym) : 0;
2285       unsigned IB = B.Sym ? Asm->OutStreamer.GetSymbolOrder(B.Sym) : 0;
2286
2287       // Symbols with no order assigned should be placed at the end.
2288       // (e.g. section end labels)
2289       if (IA == 0)
2290         return false;
2291       if (IB == 0)
2292         return true;
2293       return IA < IB;
2294     });
2295
2296     // If we have no section (e.g. common), just write out
2297     // individual spans for each symbol.
2298     if (!Section) {
2299       for (const SymbolCU &Cur : List) {
2300         ArangeSpan Span;
2301         Span.Start = Cur.Sym;
2302         Span.End = nullptr;
2303         if (Cur.CU)
2304           Spans[Cur.CU].push_back(Span);
2305       }
2306     } else {
2307       // Build spans between each label.
2308       const MCSymbol *StartSym = List[0].Sym;
2309       for (size_t n = 1, e = List.size(); n < e; n++) {
2310         const SymbolCU &Prev = List[n - 1];
2311         const SymbolCU &Cur = List[n];
2312
2313         // Try and build the longest span we can within the same CU.
2314         if (Cur.CU != Prev.CU) {
2315           ArangeSpan Span;
2316           Span.Start = StartSym;
2317           Span.End = Cur.Sym;
2318           Spans[Prev.CU].push_back(Span);
2319           StartSym = Cur.Sym;
2320         }
2321       }
2322     }
2323   }
2324
2325   unsigned PtrSize = Asm->getDataLayout().getPointerSize();
2326
2327   // Build a list of CUs used.
2328   std::vector<DwarfCompileUnit *> CUs;
2329   for (const auto &it : Spans) {
2330     DwarfCompileUnit *CU = it.first;
2331     CUs.push_back(CU);
2332   }
2333
2334   // Sort the CU list (again, to ensure consistent output order).
2335   std::sort(CUs.begin(), CUs.end(), [](const DwarfUnit *A, const DwarfUnit *B) {
2336     return A->getUniqueID() < B->getUniqueID();
2337   });
2338
2339   // Emit an arange table for each CU we used.
2340   for (DwarfCompileUnit *CU : CUs) {
2341     std::vector<ArangeSpan> &List = Spans[CU];
2342
2343     // Emit size of content not including length itself.
2344     unsigned ContentSize =
2345         sizeof(int16_t) + // DWARF ARange version number
2346         sizeof(int32_t) + // Offset of CU in the .debug_info section
2347         sizeof(int8_t) +  // Pointer Size (in bytes)
2348         sizeof(int8_t);   // Segment Size (in bytes)
2349
2350     unsigned TupleSize = PtrSize * 2;
2351
2352     // 7.20 in the Dwarf specs requires the table to be aligned to a tuple.
2353     unsigned Padding =
2354         OffsetToAlignment(sizeof(int32_t) + ContentSize, TupleSize);
2355
2356     ContentSize += Padding;
2357     ContentSize += (List.size() + 1) * TupleSize;
2358
2359     // For each compile unit, write the list of spans it covers.
2360     Asm->OutStreamer.AddComment("Length of ARange Set");
2361     Asm->EmitInt32(ContentSize);
2362     Asm->OutStreamer.AddComment("DWARF Arange version number");
2363     Asm->EmitInt16(dwarf::DW_ARANGES_VERSION);
2364     Asm->OutStreamer.AddComment("Offset Into Debug Info Section");
2365     Asm->EmitSectionOffset(CU->getLocalLabelBegin(), CU->getLocalSectionSym());
2366     Asm->OutStreamer.AddComment("Address Size (in bytes)");
2367     Asm->EmitInt8(PtrSize);
2368     Asm->OutStreamer.AddComment("Segment Size (in bytes)");
2369     Asm->EmitInt8(0);
2370
2371     Asm->OutStreamer.EmitFill(Padding, 0xff);
2372
2373     for (const ArangeSpan &Span : List) {
2374       Asm->EmitLabelReference(Span.Start, PtrSize);
2375
2376       // Calculate the size as being from the span start to it's end.
2377       if (Span.End) {
2378         Asm->EmitLabelDifference(Span.End, Span.Start, PtrSize);
2379       } else {
2380         // For symbols without an end marker (e.g. common), we
2381         // write a single arange entry containing just that one symbol.
2382         uint64_t Size = SymSize[Span.Start];
2383         if (Size == 0)
2384           Size = 1;
2385
2386         Asm->OutStreamer.EmitIntValue(Size, PtrSize);
2387       }
2388     }
2389
2390     Asm->OutStreamer.AddComment("ARange terminator");
2391     Asm->OutStreamer.EmitIntValue(0, PtrSize);
2392     Asm->OutStreamer.EmitIntValue(0, PtrSize);
2393   }
2394 }
2395
2396 // Emit visible names into a debug ranges section.
2397 void DwarfDebug::emitDebugRanges() {
2398   // Start the dwarf ranges section.
2399   Asm->OutStreamer.SwitchSection(
2400       Asm->getObjFileLowering().getDwarfRangesSection());
2401
2402   // Size for our labels.
2403   unsigned char Size = Asm->getDataLayout().getPointerSize();
2404
2405   // Grab the specific ranges for the compile units in the module.
2406   for (const auto &I : CUMap) {
2407     DwarfCompileUnit *TheCU = I.second;
2408
2409     // Iterate over the misc ranges for the compile units in the module.
2410     for (const RangeSpanList &List : TheCU->getRangeLists()) {
2411       // Emit our symbol so we can find the beginning of the range.
2412       Asm->OutStreamer.EmitLabel(List.getSym());
2413
2414       for (const RangeSpan &Range : List.getRanges()) {
2415         const MCSymbol *Begin = Range.getStart();
2416         const MCSymbol *End = Range.getEnd();
2417         assert(Begin && "Range without a begin symbol?");
2418         assert(End && "Range without an end symbol?");
2419         if (TheCU->getRanges().size() == 1) {
2420           // Grab the begin symbol from the first range as our base.
2421           const MCSymbol *Base = TheCU->getRanges()[0].getStart();
2422           Asm->EmitLabelDifference(Begin, Base, Size);
2423           Asm->EmitLabelDifference(End, Base, Size);
2424         } else {
2425           Asm->OutStreamer.EmitSymbolValue(Begin, Size);
2426           Asm->OutStreamer.EmitSymbolValue(End, Size);
2427         }
2428       }
2429
2430       // And terminate the list with two 0 values.
2431       Asm->OutStreamer.EmitIntValue(0, Size);
2432       Asm->OutStreamer.EmitIntValue(0, Size);
2433     }
2434
2435     // Now emit a range for the CU itself.
2436     if (TheCU->getRanges().size() > 1) {
2437       Asm->OutStreamer.EmitLabel(
2438           Asm->GetTempSymbol("cu_ranges", TheCU->getUniqueID()));
2439       for (const RangeSpan &Range : TheCU->getRanges()) {
2440         const MCSymbol *Begin = Range.getStart();
2441         const MCSymbol *End = Range.getEnd();
2442         assert(Begin && "Range without a begin symbol?");
2443         assert(End && "Range without an end symbol?");
2444         Asm->OutStreamer.EmitSymbolValue(Begin, Size);
2445         Asm->OutStreamer.EmitSymbolValue(End, Size);
2446       }
2447       // And terminate the list with two 0 values.
2448       Asm->OutStreamer.EmitIntValue(0, Size);
2449       Asm->OutStreamer.EmitIntValue(0, Size);
2450     }
2451   }
2452 }
2453
2454 // DWARF5 Experimental Separate Dwarf emitters.
2455
2456 void DwarfDebug::initSkeletonUnit(const DwarfUnit &U, DIE &Die,
2457                                   std::unique_ptr<DwarfUnit> NewU) {
2458   NewU->addLocalString(Die, dwarf::DW_AT_GNU_dwo_name,
2459                        U.getCUNode().getSplitDebugFilename());
2460
2461   if (!CompilationDir.empty())
2462     NewU->addLocalString(Die, dwarf::DW_AT_comp_dir, CompilationDir);
2463
2464   addGnuPubAttributes(*NewU, Die);
2465
2466   SkeletonHolder.addUnit(std::move(NewU));
2467 }
2468
2469 // This DIE has the following attributes: DW_AT_comp_dir, DW_AT_stmt_list,
2470 // DW_AT_low_pc, DW_AT_high_pc, DW_AT_ranges, DW_AT_dwo_name, DW_AT_dwo_id,
2471 // DW_AT_addr_base, DW_AT_ranges_base.
2472 DwarfCompileUnit &DwarfDebug::constructSkeletonCU(const DwarfCompileUnit &CU) {
2473
2474   auto OwnedUnit = make_unique<DwarfCompileUnit>(
2475       CU.getUniqueID(), CU.getCUNode(), Asm, this, &SkeletonHolder);
2476   DwarfCompileUnit &NewCU = *OwnedUnit;
2477   NewCU.initSection(Asm->getObjFileLowering().getDwarfInfoSection(),
2478                     DwarfInfoSectionSym);
2479
2480   NewCU.initStmtList(DwarfLineSectionSym);
2481
2482   initSkeletonUnit(CU, NewCU.getUnitDie(), std::move(OwnedUnit));
2483
2484   return NewCU;
2485 }
2486
2487 // This DIE has the following attributes: DW_AT_comp_dir, DW_AT_dwo_name,
2488 // DW_AT_addr_base.
2489 DwarfTypeUnit &DwarfDebug::constructSkeletonTU(DwarfTypeUnit &TU) {
2490   DwarfCompileUnit &CU = static_cast<DwarfCompileUnit &>(
2491       *SkeletonHolder.getUnits()[TU.getCU().getUniqueID()]);
2492
2493   auto OwnedUnit = make_unique<DwarfTypeUnit>(TU.getUniqueID(), CU, Asm, this,
2494                                               &SkeletonHolder);
2495   DwarfTypeUnit &NewTU = *OwnedUnit;
2496   NewTU.setTypeSignature(TU.getTypeSignature());
2497   NewTU.setType(nullptr);
2498   NewTU.initSection(
2499       Asm->getObjFileLowering().getDwarfTypesSection(TU.getTypeSignature()));
2500
2501   initSkeletonUnit(TU, NewTU.getUnitDie(), std::move(OwnedUnit));
2502   return NewTU;
2503 }
2504
2505 // Emit the .debug_info.dwo section for separated dwarf. This contains the
2506 // compile units that would normally be in debug_info.
2507 void DwarfDebug::emitDebugInfoDWO() {
2508   assert(useSplitDwarf() && "No split dwarf debug info?");
2509   // Don't pass an abbrev symbol, using a constant zero instead so as not to
2510   // emit relocations into the dwo file.
2511   InfoHolder.emitUnits(this, /* AbbrevSymbol */ nullptr);
2512 }
2513
2514 // Emit the .debug_abbrev.dwo section for separated dwarf. This contains the
2515 // abbreviations for the .debug_info.dwo section.
2516 void DwarfDebug::emitDebugAbbrevDWO() {
2517   assert(useSplitDwarf() && "No split dwarf?");
2518   InfoHolder.emitAbbrevs(Asm->getObjFileLowering().getDwarfAbbrevDWOSection());
2519 }
2520
2521 void DwarfDebug::emitDebugLineDWO() {
2522   assert(useSplitDwarf() && "No split dwarf?");
2523   Asm->OutStreamer.SwitchSection(
2524       Asm->getObjFileLowering().getDwarfLineDWOSection());
2525   SplitTypeUnitFileTable.Emit(Asm->OutStreamer);
2526 }
2527
2528 // Emit the .debug_str.dwo section for separated dwarf. This contains the
2529 // string section and is identical in format to traditional .debug_str
2530 // sections.
2531 void DwarfDebug::emitDebugStrDWO() {
2532   assert(useSplitDwarf() && "No split dwarf?");
2533   const MCSection *OffSec =
2534       Asm->getObjFileLowering().getDwarfStrOffDWOSection();
2535   const MCSymbol *StrSym = DwarfStrSectionSym;
2536   InfoHolder.emitStrings(Asm->getObjFileLowering().getDwarfStrDWOSection(),
2537                          OffSec, StrSym);
2538 }
2539
2540 MCDwarfDwoLineTable *DwarfDebug::getDwoLineTable(const DwarfCompileUnit &CU) {
2541   if (!useSplitDwarf())
2542     return nullptr;
2543   if (SingleCU)
2544     SplitTypeUnitFileTable.setCompilationDir(CU.getCUNode().getDirectory());
2545   return &SplitTypeUnitFileTable;
2546 }
2547
2548 static uint64_t makeTypeSignature(StringRef Identifier) {
2549   MD5 Hash;
2550   Hash.update(Identifier);
2551   // ... take the least significant 8 bytes and return those. Our MD5
2552   // implementation always returns its results in little endian, swap bytes
2553   // appropriately.
2554   MD5::MD5Result Result;
2555   Hash.final(Result);
2556   return *reinterpret_cast<support::ulittle64_t *>(Result + 8);
2557 }
2558
2559 void DwarfDebug::addDwarfTypeUnitType(DwarfCompileUnit &CU,
2560                                       StringRef Identifier, DIE &RefDie,
2561                                       DICompositeType CTy) {
2562   // Fast path if we're building some type units and one has already used the
2563   // address pool we know we're going to throw away all this work anyway, so
2564   // don't bother building dependent types.
2565   if (!TypeUnitsUnderConstruction.empty() && AddrPool.hasBeenUsed())
2566     return;
2567
2568   const DwarfTypeUnit *&TU = DwarfTypeUnits[CTy];
2569   if (TU) {
2570     CU.addDIETypeSignature(RefDie, *TU);
2571     return;
2572   }
2573
2574   bool TopLevelType = TypeUnitsUnderConstruction.empty();
2575   AddrPool.resetUsedFlag();
2576
2577   auto OwnedUnit = make_unique<DwarfTypeUnit>(
2578       InfoHolder.getUnits().size() + TypeUnitsUnderConstruction.size(), CU, Asm,
2579       this, &InfoHolder, getDwoLineTable(CU));
2580   DwarfTypeUnit &NewTU = *OwnedUnit;
2581   DIE &UnitDie = NewTU.getUnitDie();
2582   TU = &NewTU;
2583   TypeUnitsUnderConstruction.push_back(
2584       std::make_pair(std::move(OwnedUnit), CTy));
2585
2586   NewTU.addUInt(UnitDie, dwarf::DW_AT_language, dwarf::DW_FORM_data2,
2587                 CU.getLanguage());
2588
2589   uint64_t Signature = makeTypeSignature(Identifier);
2590   NewTU.setTypeSignature(Signature);
2591
2592   if (useSplitDwarf())
2593     NewTU.initSection(Asm->getObjFileLowering().getDwarfTypesDWOSection(),
2594                       DwarfTypesDWOSectionSym);
2595   else {
2596     CU.applyStmtList(UnitDie);
2597     NewTU.initSection(
2598         Asm->getObjFileLowering().getDwarfTypesSection(Signature));
2599   }
2600
2601   NewTU.setType(NewTU.createTypeDIE(CTy));
2602
2603   if (TopLevelType) {
2604     auto TypeUnitsToAdd = std::move(TypeUnitsUnderConstruction);
2605     TypeUnitsUnderConstruction.clear();
2606
2607     // Types referencing entries in the address table cannot be placed in type
2608     // units.
2609     if (AddrPool.hasBeenUsed()) {
2610
2611       // Remove all the types built while building this type.
2612       // This is pessimistic as some of these types might not be dependent on
2613       // the type that used an address.
2614       for (const auto &TU : TypeUnitsToAdd)
2615         DwarfTypeUnits.erase(TU.second);
2616
2617       // Construct this type in the CU directly.
2618       // This is inefficient because all the dependent types will be rebuilt
2619       // from scratch, including building them in type units, discovering that
2620       // they depend on addresses, throwing them out and rebuilding them.
2621       CU.constructTypeDIE(RefDie, CTy);
2622       return;
2623     }
2624
2625     // If the type wasn't dependent on fission addresses, finish adding the type
2626     // and all its dependent types.
2627     for (auto &TU : TypeUnitsToAdd) {
2628       if (useSplitDwarf())
2629         TU.first->setSkeleton(constructSkeletonTU(*TU.first));
2630       InfoHolder.addUnit(std::move(TU.first));
2631     }
2632   }
2633   CU.addDIETypeSignature(RefDie, NewTU);
2634 }
2635
2636 void DwarfDebug::attachLowHighPC(DwarfCompileUnit &Unit, DIE &D,
2637                                  MCSymbol *Begin, MCSymbol *End) {
2638   assert(Begin && "Begin label should not be null!");
2639   assert(End && "End label should not be null!");
2640   assert(Begin->isDefined() && "Invalid starting label");
2641   assert(End->isDefined() && "Invalid end label");
2642
2643   Unit.addLabelAddress(D, dwarf::DW_AT_low_pc, Begin);
2644   if (DwarfVersion < 4)
2645     Unit.addLabelAddress(D, dwarf::DW_AT_high_pc, End);
2646   else
2647     Unit.addLabelDelta(D, dwarf::DW_AT_high_pc, End, Begin);
2648 }
2649
2650 // Accelerator table mutators - add each name along with its companion
2651 // DIE to the proper table while ensuring that the name that we're going
2652 // to reference is in the string table. We do this since the names we
2653 // add may not only be identical to the names in the DIE.
2654 void DwarfDebug::addAccelName(StringRef Name, const DIE &Die) {
2655   if (!useDwarfAccelTables())
2656     return;
2657   AccelNames.AddName(Name, InfoHolder.getStringPool().getSymbol(*Asm, Name),
2658                      &Die);
2659 }
2660
2661 void DwarfDebug::addAccelObjC(StringRef Name, const DIE &Die) {
2662   if (!useDwarfAccelTables())
2663     return;
2664   AccelObjC.AddName(Name, InfoHolder.getStringPool().getSymbol(*Asm, Name),
2665                     &Die);
2666 }
2667
2668 void DwarfDebug::addAccelNamespace(StringRef Name, const DIE &Die) {
2669   if (!useDwarfAccelTables())
2670     return;
2671   AccelNamespace.AddName(Name, InfoHolder.getStringPool().getSymbol(*Asm, Name),
2672                          &Die);
2673 }
2674
2675 void DwarfDebug::addAccelType(StringRef Name, const DIE &Die, char Flags) {
2676   if (!useDwarfAccelTables())
2677     return;
2678   AccelTypes.AddName(Name, InfoHolder.getStringPool().getSymbol(*Asm, Name),
2679                      &Die);
2680 }