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