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