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