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