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