xref: /llvm-project-15.0.7/llvm/lib/LTO/LTO.cpp (revision e8ea8296)
1 //===-LTO.cpp - LLVM Link Time Optimizer ----------------------------------===//
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 implements functions and classes used to support LTO.
11 //
12 //===----------------------------------------------------------------------===//
13 
14 #include "llvm/LTO/LTO.h"
15 #include "llvm/Analysis/TargetLibraryInfo.h"
16 #include "llvm/Analysis/TargetTransformInfo.h"
17 #include "llvm/Bitcode/BitcodeReader.h"
18 #include "llvm/Bitcode/BitcodeWriter.h"
19 #include "llvm/CodeGen/Analysis.h"
20 #include "llvm/IR/AutoUpgrade.h"
21 #include "llvm/IR/DiagnosticPrinter.h"
22 #include "llvm/IR/LegacyPassManager.h"
23 #include "llvm/IR/Mangler.h"
24 #include "llvm/IR/Metadata.h"
25 #include "llvm/LTO/LTOBackend.h"
26 #include "llvm/Linker/IRMover.h"
27 #include "llvm/Object/IRObjectFile.h"
28 #include "llvm/Support/Error.h"
29 #include "llvm/Support/ManagedStatic.h"
30 #include "llvm/Support/MemoryBuffer.h"
31 #include "llvm/Support/Path.h"
32 #include "llvm/Support/SHA1.h"
33 #include "llvm/Support/SourceMgr.h"
34 #include "llvm/Support/TargetRegistry.h"
35 #include "llvm/Support/ThreadPool.h"
36 #include "llvm/Support/Threading.h"
37 #include "llvm/Support/VCSRevision.h"
38 #include "llvm/Support/raw_ostream.h"
39 #include "llvm/Target/TargetMachine.h"
40 #include "llvm/Target/TargetOptions.h"
41 #include "llvm/Transforms/IPO.h"
42 #include "llvm/Transforms/IPO/PassManagerBuilder.h"
43 #include "llvm/Transforms/Utils/SplitModule.h"
44 
45 #include <set>
46 
47 using namespace llvm;
48 using namespace lto;
49 using namespace object;
50 
51 #define DEBUG_TYPE "lto"
52 
53 // The values are (type identifier, summary) pairs.
54 typedef DenseMap<
55     GlobalValue::GUID,
56     TinyPtrVector<const std::pair<const std::string, TypeIdSummary> *>>
57     TypeIdSummariesByGuidTy;
58 
59 // Returns a unique hash for the Module considering the current list of
60 // export/import and other global analysis results.
61 // The hash is produced in \p Key.
62 static void computeCacheKey(
63     SmallString<40> &Key, const Config &Conf, const ModuleSummaryIndex &Index,
64     StringRef ModuleID, const FunctionImporter::ImportMapTy &ImportList,
65     const FunctionImporter::ExportSetTy &ExportList,
66     const std::map<GlobalValue::GUID, GlobalValue::LinkageTypes> &ResolvedODR,
67     const GVSummaryMapTy &DefinedGlobals,
68     const TypeIdSummariesByGuidTy &TypeIdSummariesByGuid,
69     const std::set<GlobalValue::GUID> &CfiFunctionDefs,
70     const std::set<GlobalValue::GUID> &CfiFunctionDecls) {
71   // Compute the unique hash for this entry.
72   // This is based on the current compiler version, the module itself, the
73   // export list, the hash for every single module in the import list, the
74   // list of ResolvedODR for the module, and the list of preserved symbols.
75   SHA1 Hasher;
76 
77   // Start with the compiler revision
78   Hasher.update(LLVM_VERSION_STRING);
79 #ifdef LLVM_REVISION
80   Hasher.update(LLVM_REVISION);
81 #endif
82 
83   // Include the parts of the LTO configuration that affect code generation.
84   auto AddString = [&](StringRef Str) {
85     Hasher.update(Str);
86     Hasher.update(ArrayRef<uint8_t>{0});
87   };
88   auto AddUnsigned = [&](unsigned I) {
89     uint8_t Data[4];
90     Data[0] = I;
91     Data[1] = I >> 8;
92     Data[2] = I >> 16;
93     Data[3] = I >> 24;
94     Hasher.update(ArrayRef<uint8_t>{Data, 4});
95   };
96   auto AddUint64 = [&](uint64_t I) {
97     uint8_t Data[8];
98     Data[0] = I;
99     Data[1] = I >> 8;
100     Data[2] = I >> 16;
101     Data[3] = I >> 24;
102     Data[4] = I >> 32;
103     Data[5] = I >> 40;
104     Data[6] = I >> 48;
105     Data[7] = I >> 56;
106     Hasher.update(ArrayRef<uint8_t>{Data, 8});
107   };
108   AddString(Conf.CPU);
109   // FIXME: Hash more of Options. For now all clients initialize Options from
110   // command-line flags (which is unsupported in production), but may set
111   // RelaxELFRelocations. The clang driver can also pass FunctionSections,
112   // DataSections and DebuggerTuning via command line flags.
113   AddUnsigned(Conf.Options.RelaxELFRelocations);
114   AddUnsigned(Conf.Options.FunctionSections);
115   AddUnsigned(Conf.Options.DataSections);
116   AddUnsigned((unsigned)Conf.Options.DebuggerTuning);
117   for (auto &A : Conf.MAttrs)
118     AddString(A);
119   if (Conf.RelocModel)
120     AddUnsigned(*Conf.RelocModel);
121   else
122     AddUnsigned(-1);
123   if (Conf.CodeModel)
124     AddUnsigned(*Conf.CodeModel);
125   else
126     AddUnsigned(-1);
127   AddUnsigned(Conf.CGOptLevel);
128   AddUnsigned(Conf.CGFileType);
129   AddUnsigned(Conf.OptLevel);
130   AddUnsigned(Conf.UseNewPM);
131   AddString(Conf.OptPipeline);
132   AddString(Conf.AAPipeline);
133   AddString(Conf.OverrideTriple);
134   AddString(Conf.DefaultTriple);
135 
136   // Include the hash for the current module
137   auto ModHash = Index.getModuleHash(ModuleID);
138   Hasher.update(ArrayRef<uint8_t>((uint8_t *)&ModHash[0], sizeof(ModHash)));
139   for (auto F : ExportList)
140     // The export list can impact the internalization, be conservative here
141     Hasher.update(ArrayRef<uint8_t>((uint8_t *)&F, sizeof(F)));
142 
143   // Include the hash for every module we import functions from. The set of
144   // imported symbols for each module may affect code generation and is
145   // sensitive to link order, so include that as well.
146   for (auto &Entry : ImportList) {
147     auto ModHash = Index.getModuleHash(Entry.first());
148     Hasher.update(ArrayRef<uint8_t>((uint8_t *)&ModHash[0], sizeof(ModHash)));
149 
150     AddUint64(Entry.second.size());
151     for (auto &Fn : Entry.second)
152       AddUint64(Fn.first);
153   }
154 
155   // Include the hash for the resolved ODR.
156   for (auto &Entry : ResolvedODR) {
157     Hasher.update(ArrayRef<uint8_t>((const uint8_t *)&Entry.first,
158                                     sizeof(GlobalValue::GUID)));
159     Hasher.update(ArrayRef<uint8_t>((const uint8_t *)&Entry.second,
160                                     sizeof(GlobalValue::LinkageTypes)));
161   }
162 
163   // Members of CfiFunctionDefs and CfiFunctionDecls that are referenced or
164   // defined in this module.
165   std::set<GlobalValue::GUID> UsedCfiDefs;
166   std::set<GlobalValue::GUID> UsedCfiDecls;
167 
168   // Typeids used in this module.
169   std::set<GlobalValue::GUID> UsedTypeIds;
170 
171   auto AddUsedCfiGlobal = [&](GlobalValue::GUID ValueGUID) {
172     if (CfiFunctionDefs.count(ValueGUID))
173       UsedCfiDefs.insert(ValueGUID);
174     if (CfiFunctionDecls.count(ValueGUID))
175       UsedCfiDecls.insert(ValueGUID);
176   };
177 
178   auto AddUsedThings = [&](GlobalValueSummary *GS) {
179     if (!GS) return;
180     for (const ValueInfo &VI : GS->refs())
181       AddUsedCfiGlobal(VI.getGUID());
182     if (auto *FS = dyn_cast<FunctionSummary>(GS)) {
183       for (auto &TT : FS->type_tests())
184         UsedTypeIds.insert(TT);
185       for (auto &TT : FS->type_test_assume_vcalls())
186         UsedTypeIds.insert(TT.GUID);
187       for (auto &TT : FS->type_checked_load_vcalls())
188         UsedTypeIds.insert(TT.GUID);
189       for (auto &TT : FS->type_test_assume_const_vcalls())
190         UsedTypeIds.insert(TT.VFunc.GUID);
191       for (auto &TT : FS->type_checked_load_const_vcalls())
192         UsedTypeIds.insert(TT.VFunc.GUID);
193       for (auto &ET : FS->calls())
194         AddUsedCfiGlobal(ET.first.getGUID());
195     }
196   };
197 
198   // Include the hash for the linkage type to reflect internalization and weak
199   // resolution, and collect any used type identifier resolutions.
200   for (auto &GS : DefinedGlobals) {
201     GlobalValue::LinkageTypes Linkage = GS.second->linkage();
202     Hasher.update(
203         ArrayRef<uint8_t>((const uint8_t *)&Linkage, sizeof(Linkage)));
204     AddUsedCfiGlobal(GS.first);
205     AddUsedThings(GS.second);
206   }
207 
208   // Imported functions may introduce new uses of type identifier resolutions,
209   // so we need to collect their used resolutions as well.
210   for (auto &ImpM : ImportList)
211     for (auto &ImpF : ImpM.second)
212       AddUsedThings(Index.findSummaryInModule(ImpF.first, ImpM.first()));
213 
214   auto AddTypeIdSummary = [&](StringRef TId, const TypeIdSummary &S) {
215     AddString(TId);
216 
217     AddUnsigned(S.TTRes.TheKind);
218     AddUnsigned(S.TTRes.SizeM1BitWidth);
219 
220     AddUint64(S.TTRes.AlignLog2);
221     AddUint64(S.TTRes.SizeM1);
222     AddUint64(S.TTRes.BitMask);
223     AddUint64(S.TTRes.InlineBits);
224 
225     AddUint64(S.WPDRes.size());
226     for (auto &WPD : S.WPDRes) {
227       AddUnsigned(WPD.first);
228       AddUnsigned(WPD.second.TheKind);
229       AddString(WPD.second.SingleImplName);
230 
231       AddUint64(WPD.second.ResByArg.size());
232       for (auto &ByArg : WPD.second.ResByArg) {
233         AddUint64(ByArg.first.size());
234         for (uint64_t Arg : ByArg.first)
235           AddUint64(Arg);
236         AddUnsigned(ByArg.second.TheKind);
237         AddUint64(ByArg.second.Info);
238         AddUnsigned(ByArg.second.Byte);
239         AddUnsigned(ByArg.second.Bit);
240       }
241     }
242   };
243 
244   // Include the hash for all type identifiers used by this module.
245   for (GlobalValue::GUID TId : UsedTypeIds) {
246     auto SummariesI = TypeIdSummariesByGuid.find(TId);
247     if (SummariesI != TypeIdSummariesByGuid.end())
248       for (auto *Summary : SummariesI->second)
249         AddTypeIdSummary(Summary->first, Summary->second);
250   }
251 
252   AddUnsigned(UsedCfiDefs.size());
253   for (auto &V : UsedCfiDefs)
254     AddUint64(V);
255 
256   AddUnsigned(UsedCfiDecls.size());
257   for (auto &V : UsedCfiDecls)
258     AddUint64(V);
259 
260   if (!Conf.SampleProfile.empty()) {
261     auto FileOrErr = MemoryBuffer::getFile(Conf.SampleProfile);
262     if (FileOrErr)
263       Hasher.update(FileOrErr.get()->getBuffer());
264   }
265 
266   Key = toHex(Hasher.result());
267 }
268 
269 static void thinLTOResolveWeakForLinkerGUID(
270     GlobalValueSummaryList &GVSummaryList, GlobalValue::GUID GUID,
271     DenseSet<GlobalValueSummary *> &GlobalInvolvedWithAlias,
272     function_ref<bool(GlobalValue::GUID, const GlobalValueSummary *)>
273         isPrevailing,
274     function_ref<void(StringRef, GlobalValue::GUID, GlobalValue::LinkageTypes)>
275         recordNewLinkage) {
276   for (auto &S : GVSummaryList) {
277     GlobalValue::LinkageTypes OriginalLinkage = S->linkage();
278     if (!GlobalValue::isWeakForLinker(OriginalLinkage))
279       continue;
280     // We need to emit only one of these. The prevailing module will keep it,
281     // but turned into a weak, while the others will drop it when possible.
282     // This is both a compile-time optimization and a correctness
283     // transformation. This is necessary for correctness when we have exported
284     // a reference - we need to convert the linkonce to weak to
285     // ensure a copy is kept to satisfy the exported reference.
286     // FIXME: We may want to split the compile time and correctness
287     // aspects into separate routines.
288     if (isPrevailing(GUID, S.get())) {
289       if (GlobalValue::isLinkOnceLinkage(OriginalLinkage))
290         S->setLinkage(GlobalValue::getWeakLinkage(
291             GlobalValue::isLinkOnceODRLinkage(OriginalLinkage)));
292     }
293     // Alias and aliasee can't be turned into available_externally.
294     else if (!isa<AliasSummary>(S.get()) &&
295              !GlobalInvolvedWithAlias.count(S.get()))
296       S->setLinkage(GlobalValue::AvailableExternallyLinkage);
297     if (S->linkage() != OriginalLinkage)
298       recordNewLinkage(S->modulePath(), GUID, S->linkage());
299   }
300 }
301 
302 // Resolve Weak and LinkOnce values in the \p Index.
303 //
304 // We'd like to drop these functions if they are no longer referenced in the
305 // current module. However there is a chance that another module is still
306 // referencing them because of the import. We make sure we always emit at least
307 // one copy.
308 void llvm::thinLTOResolveWeakForLinkerInIndex(
309     ModuleSummaryIndex &Index,
310     function_ref<bool(GlobalValue::GUID, const GlobalValueSummary *)>
311         isPrevailing,
312     function_ref<void(StringRef, GlobalValue::GUID, GlobalValue::LinkageTypes)>
313         recordNewLinkage) {
314   // We won't optimize the globals that are referenced by an alias for now
315   // Ideally we should turn the alias into a global and duplicate the definition
316   // when needed.
317   DenseSet<GlobalValueSummary *> GlobalInvolvedWithAlias;
318   for (auto &I : Index)
319     for (auto &S : I.second.SummaryList)
320       if (auto AS = dyn_cast<AliasSummary>(S.get()))
321         GlobalInvolvedWithAlias.insert(&AS->getAliasee());
322 
323   for (auto &I : Index)
324     thinLTOResolveWeakForLinkerGUID(I.second.SummaryList, I.first,
325                                     GlobalInvolvedWithAlias, isPrevailing,
326                                     recordNewLinkage);
327 }
328 
329 static void thinLTOInternalizeAndPromoteGUID(
330     GlobalValueSummaryList &GVSummaryList, GlobalValue::GUID GUID,
331     function_ref<bool(StringRef, GlobalValue::GUID)> isExported) {
332   for (auto &S : GVSummaryList) {
333     if (isExported(S->modulePath(), GUID)) {
334       if (GlobalValue::isLocalLinkage(S->linkage()))
335         S->setLinkage(GlobalValue::ExternalLinkage);
336     } else if (!GlobalValue::isLocalLinkage(S->linkage()))
337       S->setLinkage(GlobalValue::InternalLinkage);
338   }
339 }
340 
341 // Update the linkages in the given \p Index to mark exported values
342 // as external and non-exported values as internal.
343 void llvm::thinLTOInternalizeAndPromoteInIndex(
344     ModuleSummaryIndex &Index,
345     function_ref<bool(StringRef, GlobalValue::GUID)> isExported) {
346   for (auto &I : Index)
347     thinLTOInternalizeAndPromoteGUID(I.second.SummaryList, I.first, isExported);
348 }
349 
350 // Requires a destructor for std::vector<InputModule>.
351 InputFile::~InputFile() = default;
352 
353 Expected<std::unique_ptr<InputFile>> InputFile::create(MemoryBufferRef Object) {
354   std::unique_ptr<InputFile> File(new InputFile);
355 
356   Expected<IRSymtabFile> FOrErr = readIRSymtab(Object);
357   if (!FOrErr)
358     return FOrErr.takeError();
359 
360   File->TargetTriple = FOrErr->TheReader.getTargetTriple();
361   File->SourceFileName = FOrErr->TheReader.getSourceFileName();
362   File->COFFLinkerOpts = FOrErr->TheReader.getCOFFLinkerOpts();
363   File->ComdatTable = FOrErr->TheReader.getComdatTable();
364 
365   for (unsigned I = 0; I != FOrErr->Mods.size(); ++I) {
366     size_t Begin = File->Symbols.size();
367     for (const irsymtab::Reader::SymbolRef &Sym :
368          FOrErr->TheReader.module_symbols(I))
369       // Skip symbols that are irrelevant to LTO. Note that this condition needs
370       // to match the one in Skip() in LTO::addRegularLTO().
371       if (Sym.isGlobal() && !Sym.isFormatSpecific())
372         File->Symbols.push_back(Sym);
373     File->ModuleSymIndices.push_back({Begin, File->Symbols.size()});
374   }
375 
376   File->Mods = FOrErr->Mods;
377   File->Strtab = std::move(FOrErr->Strtab);
378   return std::move(File);
379 }
380 
381 StringRef InputFile::getName() const {
382   return Mods[0].getModuleIdentifier();
383 }
384 
385 LTO::RegularLTOState::RegularLTOState(unsigned ParallelCodeGenParallelismLevel,
386                                       Config &Conf)
387     : ParallelCodeGenParallelismLevel(ParallelCodeGenParallelismLevel),
388       Ctx(Conf), CombinedModule(llvm::make_unique<Module>("ld-temp.o", Ctx)),
389       Mover(llvm::make_unique<IRMover>(*CombinedModule)) {}
390 
391 LTO::ThinLTOState::ThinLTOState(ThinBackend Backend)
392     : Backend(Backend), CombinedIndex(/*IsPeformingAnalysis*/ false) {
393   if (!Backend)
394     this->Backend =
395         createInProcessThinBackend(llvm::heavyweight_hardware_concurrency());
396 }
397 
398 LTO::LTO(Config Conf, ThinBackend Backend,
399          unsigned ParallelCodeGenParallelismLevel)
400     : Conf(std::move(Conf)),
401       RegularLTO(ParallelCodeGenParallelismLevel, this->Conf),
402       ThinLTO(std::move(Backend)) {}
403 
404 // Requires a destructor for MapVector<BitcodeModule>.
405 LTO::~LTO() = default;
406 
407 // Add the symbols in the given module to the GlobalResolutions map, and resolve
408 // their partitions.
409 void LTO::addModuleToGlobalRes(ArrayRef<InputFile::Symbol> Syms,
410                                ArrayRef<SymbolResolution> Res,
411                                unsigned Partition, bool InSummary) {
412   auto *ResI = Res.begin();
413   auto *ResE = Res.end();
414   (void)ResE;
415   for (const InputFile::Symbol &Sym : Syms) {
416     assert(ResI != ResE);
417     SymbolResolution Res = *ResI++;
418 
419     auto &GlobalRes = GlobalResolutions[Sym.getName()];
420     GlobalRes.UnnamedAddr &= Sym.isUnnamedAddr();
421     if (Res.Prevailing) {
422       assert(GlobalRes.IRName.empty() &&
423              "Multiple prevailing defs are not allowed");
424       GlobalRes.IRName = Sym.getIRName();
425     }
426 
427     // Set the partition to external if we know it is re-defined by the linker
428     // with -defsym or -wrap options, used elsewhere, e.g. it is visible to a
429     // regular object, is referenced from llvm.compiler_used, or was already
430     // recorded as being referenced from a different partition.
431     if (Res.LinkerRedefined || Res.VisibleToRegularObj || Sym.isUsed() ||
432         (GlobalRes.Partition != GlobalResolution::Unknown &&
433          GlobalRes.Partition != Partition)) {
434       GlobalRes.Partition = GlobalResolution::External;
435     } else
436       // First recorded reference, save the current partition.
437       GlobalRes.Partition = Partition;
438 
439     // Flag as visible outside of summary if visible from a regular object or
440     // from a module that does not have a summary.
441     GlobalRes.VisibleOutsideSummary |=
442         (Res.VisibleToRegularObj || Sym.isUsed() || !InSummary);
443   }
444 }
445 
446 static void writeToResolutionFile(raw_ostream &OS, InputFile *Input,
447                                   ArrayRef<SymbolResolution> Res) {
448   StringRef Path = Input->getName();
449   OS << Path << '\n';
450   auto ResI = Res.begin();
451   for (const InputFile::Symbol &Sym : Input->symbols()) {
452     assert(ResI != Res.end());
453     SymbolResolution Res = *ResI++;
454 
455     OS << "-r=" << Path << ',' << Sym.getName() << ',';
456     if (Res.Prevailing)
457       OS << 'p';
458     if (Res.FinalDefinitionInLinkageUnit)
459       OS << 'l';
460     if (Res.VisibleToRegularObj)
461       OS << 'x';
462     if (Res.LinkerRedefined)
463       OS << 'r';
464     OS << '\n';
465   }
466   OS.flush();
467   assert(ResI == Res.end());
468 }
469 
470 Error LTO::add(std::unique_ptr<InputFile> Input,
471                ArrayRef<SymbolResolution> Res) {
472   assert(!CalledGetMaxTasks);
473 
474   if (Conf.ResolutionFile)
475     writeToResolutionFile(*Conf.ResolutionFile, Input.get(), Res);
476 
477   if (RegularLTO.CombinedModule->getTargetTriple().empty())
478     RegularLTO.CombinedModule->setTargetTriple(Input->getTargetTriple());
479 
480   const SymbolResolution *ResI = Res.begin();
481   for (unsigned I = 0; I != Input->Mods.size(); ++I)
482     if (Error Err = addModule(*Input, I, ResI, Res.end()))
483       return Err;
484 
485   assert(ResI == Res.end());
486   return Error::success();
487 }
488 
489 Error LTO::addModule(InputFile &Input, unsigned ModI,
490                      const SymbolResolution *&ResI,
491                      const SymbolResolution *ResE) {
492   Expected<BitcodeLTOInfo> LTOInfo = Input.Mods[ModI].getLTOInfo();
493   if (!LTOInfo)
494     return LTOInfo.takeError();
495 
496   BitcodeModule BM = Input.Mods[ModI];
497   auto ModSyms = Input.module_symbols(ModI);
498   addModuleToGlobalRes(ModSyms, {ResI, ResE},
499                        LTOInfo->IsThinLTO ? ThinLTO.ModuleMap.size() + 1 : 0,
500                        LTOInfo->HasSummary);
501 
502   if (LTOInfo->IsThinLTO)
503     return addThinLTO(BM, ModSyms, ResI, ResE);
504 
505   Expected<RegularLTOState::AddedModule> ModOrErr =
506       addRegularLTO(BM, ModSyms, ResI, ResE);
507   if (!ModOrErr)
508     return ModOrErr.takeError();
509 
510   if (!LTOInfo->HasSummary)
511     return linkRegularLTO(std::move(*ModOrErr), /*LivenessFromIndex=*/false);
512 
513   // Regular LTO module summaries are added to a dummy module that represents
514   // the combined regular LTO module.
515   if (Error Err = BM.readSummary(ThinLTO.CombinedIndex, "", -1ull))
516     return Err;
517   RegularLTO.ModsWithSummaries.push_back(std::move(*ModOrErr));
518   return Error::success();
519 }
520 
521 // Checks whether the given global value is in a non-prevailing comdat
522 // (comdat containing values the linker indicated were not prevailing,
523 // which we then dropped to available_externally), and if so, removes
524 // it from the comdat. This is called for all global values to ensure the
525 // comdat is empty rather than leaving an incomplete comdat. It is needed for
526 // regular LTO modules, in case we are in a mixed-LTO mode (both regular
527 // and thin LTO modules) compilation. Since the regular LTO module will be
528 // linked first in the final native link, we want to make sure the linker
529 // doesn't select any of these incomplete comdats that would be left
530 // in the regular LTO module without this cleanup.
531 static void
532 handleNonPrevailingComdat(GlobalValue &GV,
533                           std::set<const Comdat *> &NonPrevailingComdats) {
534   Comdat *C = GV.getComdat();
535   if (!C)
536     return;
537 
538   if (!NonPrevailingComdats.count(C))
539     return;
540 
541   // Additionally need to drop externally visible global values from the comdat
542   // to available_externally, so that there aren't multiply defined linker
543   // errors.
544   if (!GV.hasLocalLinkage())
545     GV.setLinkage(GlobalValue::AvailableExternallyLinkage);
546 
547   if (auto GO = dyn_cast<GlobalObject>(&GV))
548     GO->setComdat(nullptr);
549 }
550 
551 // Add a regular LTO object to the link.
552 // The resulting module needs to be linked into the combined LTO module with
553 // linkRegularLTO.
554 Expected<LTO::RegularLTOState::AddedModule>
555 LTO::addRegularLTO(BitcodeModule BM, ArrayRef<InputFile::Symbol> Syms,
556                    const SymbolResolution *&ResI,
557                    const SymbolResolution *ResE) {
558   RegularLTOState::AddedModule Mod;
559   Expected<std::unique_ptr<Module>> MOrErr =
560       BM.getLazyModule(RegularLTO.Ctx, /*ShouldLazyLoadMetadata*/ true,
561                        /*IsImporting*/ false);
562   if (!MOrErr)
563     return MOrErr.takeError();
564   Module &M = **MOrErr;
565   Mod.M = std::move(*MOrErr);
566 
567   if (Error Err = M.materializeMetadata())
568     return std::move(Err);
569   UpgradeDebugInfo(M);
570 
571   ModuleSymbolTable SymTab;
572   SymTab.addModule(&M);
573 
574   for (GlobalVariable &GV : M.globals())
575     if (GV.hasAppendingLinkage())
576       Mod.Keep.push_back(&GV);
577 
578   DenseSet<GlobalObject *> AliasedGlobals;
579   for (auto &GA : M.aliases())
580     if (GlobalObject *GO = GA.getBaseObject())
581       AliasedGlobals.insert(GO);
582 
583   // In this function we need IR GlobalValues matching the symbols in Syms
584   // (which is not backed by a module), so we need to enumerate them in the same
585   // order. The symbol enumeration order of a ModuleSymbolTable intentionally
586   // matches the order of an irsymtab, but when we read the irsymtab in
587   // InputFile::create we omit some symbols that are irrelevant to LTO. The
588   // Skip() function skips the same symbols from the module as InputFile does
589   // from the symbol table.
590   auto MsymI = SymTab.symbols().begin(), MsymE = SymTab.symbols().end();
591   auto Skip = [&]() {
592     while (MsymI != MsymE) {
593       auto Flags = SymTab.getSymbolFlags(*MsymI);
594       if ((Flags & object::BasicSymbolRef::SF_Global) &&
595           !(Flags & object::BasicSymbolRef::SF_FormatSpecific))
596         return;
597       ++MsymI;
598     }
599   };
600   Skip();
601 
602   std::set<const Comdat *> NonPrevailingComdats;
603   for (const InputFile::Symbol &Sym : Syms) {
604     assert(ResI != ResE);
605     SymbolResolution Res = *ResI++;
606 
607     assert(MsymI != MsymE);
608     ModuleSymbolTable::Symbol Msym = *MsymI++;
609     Skip();
610 
611     if (GlobalValue *GV = Msym.dyn_cast<GlobalValue *>()) {
612       if (Res.Prevailing) {
613         if (Sym.isUndefined())
614           continue;
615         Mod.Keep.push_back(GV);
616         // For symbols re-defined with linker -wrap and -defsym options,
617         // set the linkage to weak to inhibit IPO. The linkage will be
618         // restored by the linker.
619         if (Res.LinkerRedefined)
620           GV->setLinkage(GlobalValue::WeakAnyLinkage);
621 
622         GlobalValue::LinkageTypes OriginalLinkage = GV->getLinkage();
623         if (GlobalValue::isLinkOnceLinkage(OriginalLinkage))
624           GV->setLinkage(GlobalValue::getWeakLinkage(
625               GlobalValue::isLinkOnceODRLinkage(OriginalLinkage)));
626       } else if (isa<GlobalObject>(GV) &&
627                  (GV->hasLinkOnceODRLinkage() || GV->hasWeakODRLinkage() ||
628                   GV->hasAvailableExternallyLinkage()) &&
629                  !AliasedGlobals.count(cast<GlobalObject>(GV))) {
630         // Any of the above three types of linkage indicates that the
631         // chosen prevailing symbol will have the same semantics as this copy of
632         // the symbol, so we may be able to link it with available_externally
633         // linkage. We will decide later whether to do that when we link this
634         // module (in linkRegularLTO), based on whether it is undefined.
635         Mod.Keep.push_back(GV);
636         GV->setLinkage(GlobalValue::AvailableExternallyLinkage);
637         if (GV->hasComdat())
638           NonPrevailingComdats.insert(GV->getComdat());
639         cast<GlobalObject>(GV)->setComdat(nullptr);
640       }
641 
642       // Set the 'local' flag based on the linker resolution for this symbol.
643       if (Res.FinalDefinitionInLinkageUnit)
644         GV->setDSOLocal(Res.FinalDefinitionInLinkageUnit);
645     }
646     // Common resolution: collect the maximum size/alignment over all commons.
647     // We also record if we see an instance of a common as prevailing, so that
648     // if none is prevailing we can ignore it later.
649     if (Sym.isCommon()) {
650       // FIXME: We should figure out what to do about commons defined by asm.
651       // For now they aren't reported correctly by ModuleSymbolTable.
652       auto &CommonRes = RegularLTO.Commons[Sym.getIRName()];
653       CommonRes.Size = std::max(CommonRes.Size, Sym.getCommonSize());
654       CommonRes.Align = std::max(CommonRes.Align, Sym.getCommonAlignment());
655       CommonRes.Prevailing |= Res.Prevailing;
656     }
657 
658   }
659   if (!M.getComdatSymbolTable().empty())
660     for (GlobalValue &GV : M.global_values())
661       handleNonPrevailingComdat(GV, NonPrevailingComdats);
662   assert(MsymI == MsymE);
663   return std::move(Mod);
664 }
665 
666 Error LTO::linkRegularLTO(RegularLTOState::AddedModule Mod,
667                           bool LivenessFromIndex) {
668   std::vector<GlobalValue *> Keep;
669   for (GlobalValue *GV : Mod.Keep) {
670     if (LivenessFromIndex && !ThinLTO.CombinedIndex.isGUIDLive(GV->getGUID()))
671       continue;
672 
673     if (!GV->hasAvailableExternallyLinkage()) {
674       Keep.push_back(GV);
675       continue;
676     }
677 
678     // Only link available_externally definitions if we don't already have a
679     // definition.
680     GlobalValue *CombinedGV =
681         RegularLTO.CombinedModule->getNamedValue(GV->getName());
682     if (CombinedGV && !CombinedGV->isDeclaration())
683       continue;
684 
685     Keep.push_back(GV);
686   }
687 
688   return RegularLTO.Mover->move(std::move(Mod.M), Keep,
689                                 [](GlobalValue &, IRMover::ValueAdder) {},
690                                 /* IsPerformingImport */ false);
691 }
692 
693 // Add a ThinLTO module to the link.
694 Error LTO::addThinLTO(BitcodeModule BM, ArrayRef<InputFile::Symbol> Syms,
695                       const SymbolResolution *&ResI,
696                       const SymbolResolution *ResE) {
697   if (Error Err =
698           BM.readSummary(ThinLTO.CombinedIndex, BM.getModuleIdentifier(),
699                          ThinLTO.ModuleMap.size()))
700     return Err;
701 
702   for (const InputFile::Symbol &Sym : Syms) {
703     assert(ResI != ResE);
704     SymbolResolution Res = *ResI++;
705 
706     if (!Sym.getIRName().empty()) {
707       auto GUID = GlobalValue::getGUID(GlobalValue::getGlobalIdentifier(
708           Sym.getIRName(), GlobalValue::ExternalLinkage, ""));
709       if (Res.Prevailing) {
710         ThinLTO.PrevailingModuleForGUID[GUID] = BM.getModuleIdentifier();
711 
712         // For linker redefined symbols (via --wrap or --defsym) we want to
713         // switch the linkage to `weak` to prevent IPOs from happening.
714         // Find the summary in the module for this very GV and record the new
715         // linkage so that we can switch it when we import the GV.
716         if (Res.LinkerRedefined)
717           if (auto S = ThinLTO.CombinedIndex.findSummaryInModule(
718                   GUID, BM.getModuleIdentifier()))
719             S->setLinkage(GlobalValue::WeakAnyLinkage);
720       }
721 
722       // If the linker resolved the symbol to a local definition then mark it
723       // as local in the summary for the module we are adding.
724       if (Res.FinalDefinitionInLinkageUnit) {
725         if (auto S = ThinLTO.CombinedIndex.findSummaryInModule(
726                 GUID, BM.getModuleIdentifier())) {
727           S->setDSOLocal(true);
728         }
729       }
730     }
731   }
732 
733   if (!ThinLTO.ModuleMap.insert({BM.getModuleIdentifier(), BM}).second)
734     return make_error<StringError>(
735         "Expected at most one ThinLTO module per bitcode file",
736         inconvertibleErrorCode());
737 
738   return Error::success();
739 }
740 
741 unsigned LTO::getMaxTasks() const {
742   CalledGetMaxTasks = true;
743   return RegularLTO.ParallelCodeGenParallelismLevel + ThinLTO.ModuleMap.size();
744 }
745 
746 Error LTO::run(AddStreamFn AddStream, NativeObjectCache Cache) {
747   // Compute "dead" symbols, we don't want to import/export these!
748   DenseSet<GlobalValue::GUID> GUIDPreservedSymbols;
749   for (auto &Res : GlobalResolutions) {
750     if (Res.second.VisibleOutsideSummary &&
751         // IRName will be defined if we have seen the prevailing copy of
752         // this value. If not, no need to preserve any ThinLTO copies.
753         !Res.second.IRName.empty())
754       GUIDPreservedSymbols.insert(GlobalValue::getGUID(
755           GlobalValue::dropLLVMManglingEscape(Res.second.IRName)));
756   }
757 
758   computeDeadSymbols(ThinLTO.CombinedIndex, GUIDPreservedSymbols);
759 
760   if (auto E = runRegularLTO(AddStream))
761     return E;
762   return runThinLTO(AddStream, Cache);
763 }
764 
765 Error LTO::runRegularLTO(AddStreamFn AddStream) {
766   for (auto &M : RegularLTO.ModsWithSummaries)
767     if (Error Err = linkRegularLTO(std::move(M),
768                                    /*LivenessFromIndex=*/true))
769       return Err;
770 
771   // Make sure commons have the right size/alignment: we kept the largest from
772   // all the prevailing when adding the inputs, and we apply it here.
773   const DataLayout &DL = RegularLTO.CombinedModule->getDataLayout();
774   for (auto &I : RegularLTO.Commons) {
775     if (!I.second.Prevailing)
776       // Don't do anything if no instance of this common was prevailing.
777       continue;
778     GlobalVariable *OldGV = RegularLTO.CombinedModule->getNamedGlobal(I.first);
779     if (OldGV && DL.getTypeAllocSize(OldGV->getValueType()) == I.second.Size) {
780       // Don't create a new global if the type is already correct, just make
781       // sure the alignment is correct.
782       OldGV->setAlignment(I.second.Align);
783       continue;
784     }
785     ArrayType *Ty =
786         ArrayType::get(Type::getInt8Ty(RegularLTO.Ctx), I.second.Size);
787     auto *GV = new GlobalVariable(*RegularLTO.CombinedModule, Ty, false,
788                                   GlobalValue::CommonLinkage,
789                                   ConstantAggregateZero::get(Ty), "");
790     GV->setAlignment(I.second.Align);
791     if (OldGV) {
792       OldGV->replaceAllUsesWith(ConstantExpr::getBitCast(GV, OldGV->getType()));
793       GV->takeName(OldGV);
794       OldGV->eraseFromParent();
795     } else {
796       GV->setName(I.first);
797     }
798   }
799 
800   if (Conf.PreOptModuleHook &&
801       !Conf.PreOptModuleHook(0, *RegularLTO.CombinedModule))
802     return Error::success();
803 
804   if (!Conf.CodeGenOnly) {
805     for (const auto &R : GlobalResolutions) {
806       if (R.second.IRName.empty())
807         continue;
808       if (R.second.Partition != 0 &&
809           R.second.Partition != GlobalResolution::External)
810         continue;
811 
812       GlobalValue *GV =
813           RegularLTO.CombinedModule->getNamedValue(R.second.IRName);
814       // Ignore symbols defined in other partitions.
815       if (!GV || GV->hasLocalLinkage())
816         continue;
817       GV->setUnnamedAddr(R.second.UnnamedAddr ? GlobalValue::UnnamedAddr::Global
818                                               : GlobalValue::UnnamedAddr::None);
819       if (R.second.Partition == 0)
820         GV->setLinkage(GlobalValue::InternalLinkage);
821     }
822 
823     if (Conf.PostInternalizeModuleHook &&
824         !Conf.PostInternalizeModuleHook(0, *RegularLTO.CombinedModule))
825       return Error::success();
826   }
827   return backend(Conf, AddStream, RegularLTO.ParallelCodeGenParallelismLevel,
828                  std::move(RegularLTO.CombinedModule), ThinLTO.CombinedIndex);
829 }
830 
831 /// This class defines the interface to the ThinLTO backend.
832 class lto::ThinBackendProc {
833 protected:
834   Config &Conf;
835   ModuleSummaryIndex &CombinedIndex;
836   const StringMap<GVSummaryMapTy> &ModuleToDefinedGVSummaries;
837 
838 public:
839   ThinBackendProc(Config &Conf, ModuleSummaryIndex &CombinedIndex,
840                   const StringMap<GVSummaryMapTy> &ModuleToDefinedGVSummaries)
841       : Conf(Conf), CombinedIndex(CombinedIndex),
842         ModuleToDefinedGVSummaries(ModuleToDefinedGVSummaries) {}
843 
844   virtual ~ThinBackendProc() {}
845   virtual Error start(
846       unsigned Task, BitcodeModule BM,
847       const FunctionImporter::ImportMapTy &ImportList,
848       const FunctionImporter::ExportSetTy &ExportList,
849       const std::map<GlobalValue::GUID, GlobalValue::LinkageTypes> &ResolvedODR,
850       MapVector<StringRef, BitcodeModule> &ModuleMap) = 0;
851   virtual Error wait() = 0;
852 };
853 
854 namespace {
855 class InProcessThinBackend : public ThinBackendProc {
856   ThreadPool BackendThreadPool;
857   AddStreamFn AddStream;
858   NativeObjectCache Cache;
859   TypeIdSummariesByGuidTy TypeIdSummariesByGuid;
860   std::set<GlobalValue::GUID> CfiFunctionDefs;
861   std::set<GlobalValue::GUID> CfiFunctionDecls;
862 
863   Optional<Error> Err;
864   std::mutex ErrMu;
865 
866 public:
867   InProcessThinBackend(
868       Config &Conf, ModuleSummaryIndex &CombinedIndex,
869       unsigned ThinLTOParallelismLevel,
870       const StringMap<GVSummaryMapTy> &ModuleToDefinedGVSummaries,
871       AddStreamFn AddStream, NativeObjectCache Cache)
872       : ThinBackendProc(Conf, CombinedIndex, ModuleToDefinedGVSummaries),
873         BackendThreadPool(ThinLTOParallelismLevel),
874         AddStream(std::move(AddStream)), Cache(std::move(Cache)) {
875     // Create a mapping from type identifier GUIDs to type identifier summaries.
876     // This allows backends to use the type identifier GUIDs stored in the
877     // function summaries to determine which type identifier summaries affect
878     // each function without needing to compute GUIDs in each backend.
879     for (auto &TId : CombinedIndex.typeIds())
880       TypeIdSummariesByGuid[GlobalValue::getGUID(TId.first)].push_back(&TId);
881     for (auto &Name : CombinedIndex.cfiFunctionDefs())
882       CfiFunctionDefs.insert(
883           GlobalValue::getGUID(GlobalValue::dropLLVMManglingEscape(Name)));
884     for (auto &Name : CombinedIndex.cfiFunctionDecls())
885       CfiFunctionDecls.insert(
886           GlobalValue::getGUID(GlobalValue::dropLLVMManglingEscape(Name)));
887   }
888 
889   Error runThinLTOBackendThread(
890       AddStreamFn AddStream, NativeObjectCache Cache, unsigned Task,
891       BitcodeModule BM, ModuleSummaryIndex &CombinedIndex,
892       const FunctionImporter::ImportMapTy &ImportList,
893       const FunctionImporter::ExportSetTy &ExportList,
894       const std::map<GlobalValue::GUID, GlobalValue::LinkageTypes> &ResolvedODR,
895       const GVSummaryMapTy &DefinedGlobals,
896       MapVector<StringRef, BitcodeModule> &ModuleMap,
897       const TypeIdSummariesByGuidTy &TypeIdSummariesByGuid) {
898     auto RunThinBackend = [&](AddStreamFn AddStream) {
899       LTOLLVMContext BackendContext(Conf);
900       Expected<std::unique_ptr<Module>> MOrErr = BM.parseModule(BackendContext);
901       if (!MOrErr)
902         return MOrErr.takeError();
903 
904       return thinBackend(Conf, Task, AddStream, **MOrErr, CombinedIndex,
905                          ImportList, DefinedGlobals, ModuleMap);
906     };
907 
908     auto ModuleID = BM.getModuleIdentifier();
909 
910     if (!Cache || !CombinedIndex.modulePaths().count(ModuleID) ||
911         all_of(CombinedIndex.getModuleHash(ModuleID),
912                [](uint32_t V) { return V == 0; }))
913       // Cache disabled or no entry for this module in the combined index or
914       // no module hash.
915       return RunThinBackend(AddStream);
916 
917     SmallString<40> Key;
918     // The module may be cached, this helps handling it.
919     computeCacheKey(Key, Conf, CombinedIndex, ModuleID, ImportList, ExportList,
920                     ResolvedODR, DefinedGlobals, TypeIdSummariesByGuid,
921                     CfiFunctionDefs, CfiFunctionDecls);
922     if (AddStreamFn CacheAddStream = Cache(Task, Key))
923       return RunThinBackend(CacheAddStream);
924 
925     return Error::success();
926   }
927 
928   Error start(
929       unsigned Task, BitcodeModule BM,
930       const FunctionImporter::ImportMapTy &ImportList,
931       const FunctionImporter::ExportSetTy &ExportList,
932       const std::map<GlobalValue::GUID, GlobalValue::LinkageTypes> &ResolvedODR,
933       MapVector<StringRef, BitcodeModule> &ModuleMap) override {
934     StringRef ModulePath = BM.getModuleIdentifier();
935     assert(ModuleToDefinedGVSummaries.count(ModulePath));
936     const GVSummaryMapTy &DefinedGlobals =
937         ModuleToDefinedGVSummaries.find(ModulePath)->second;
938     BackendThreadPool.async(
939         [=](BitcodeModule BM, ModuleSummaryIndex &CombinedIndex,
940             const FunctionImporter::ImportMapTy &ImportList,
941             const FunctionImporter::ExportSetTy &ExportList,
942             const std::map<GlobalValue::GUID, GlobalValue::LinkageTypes>
943                 &ResolvedODR,
944             const GVSummaryMapTy &DefinedGlobals,
945             MapVector<StringRef, BitcodeModule> &ModuleMap,
946             const TypeIdSummariesByGuidTy &TypeIdSummariesByGuid) {
947           Error E = runThinLTOBackendThread(
948               AddStream, Cache, Task, BM, CombinedIndex, ImportList, ExportList,
949               ResolvedODR, DefinedGlobals, ModuleMap, TypeIdSummariesByGuid);
950           if (E) {
951             std::unique_lock<std::mutex> L(ErrMu);
952             if (Err)
953               Err = joinErrors(std::move(*Err), std::move(E));
954             else
955               Err = std::move(E);
956           }
957         },
958         BM, std::ref(CombinedIndex), std::ref(ImportList), std::ref(ExportList),
959         std::ref(ResolvedODR), std::ref(DefinedGlobals), std::ref(ModuleMap),
960         std::ref(TypeIdSummariesByGuid));
961     return Error::success();
962   }
963 
964   Error wait() override {
965     BackendThreadPool.wait();
966     if (Err)
967       return std::move(*Err);
968     else
969       return Error::success();
970   }
971 };
972 } // end anonymous namespace
973 
974 ThinBackend lto::createInProcessThinBackend(unsigned ParallelismLevel) {
975   return [=](Config &Conf, ModuleSummaryIndex &CombinedIndex,
976              const StringMap<GVSummaryMapTy> &ModuleToDefinedGVSummaries,
977              AddStreamFn AddStream, NativeObjectCache Cache) {
978     return llvm::make_unique<InProcessThinBackend>(
979         Conf, CombinedIndex, ParallelismLevel, ModuleToDefinedGVSummaries,
980         AddStream, Cache);
981   };
982 }
983 
984 // Given the original \p Path to an output file, replace any path
985 // prefix matching \p OldPrefix with \p NewPrefix. Also, create the
986 // resulting directory if it does not yet exist.
987 std::string lto::getThinLTOOutputFile(const std::string &Path,
988                                       const std::string &OldPrefix,
989                                       const std::string &NewPrefix) {
990   if (OldPrefix.empty() && NewPrefix.empty())
991     return Path;
992   SmallString<128> NewPath(Path);
993   llvm::sys::path::replace_path_prefix(NewPath, OldPrefix, NewPrefix);
994   StringRef ParentPath = llvm::sys::path::parent_path(NewPath.str());
995   if (!ParentPath.empty()) {
996     // Make sure the new directory exists, creating it if necessary.
997     if (std::error_code EC = llvm::sys::fs::create_directories(ParentPath))
998       llvm::errs() << "warning: could not create directory '" << ParentPath
999                    << "': " << EC.message() << '\n';
1000   }
1001   return NewPath.str();
1002 }
1003 
1004 namespace {
1005 class WriteIndexesThinBackend : public ThinBackendProc {
1006   std::string OldPrefix, NewPrefix;
1007   bool ShouldEmitImportsFiles;
1008 
1009   std::string LinkedObjectsFileName;
1010   std::unique_ptr<llvm::raw_fd_ostream> LinkedObjectsFile;
1011 
1012 public:
1013   WriteIndexesThinBackend(
1014       Config &Conf, ModuleSummaryIndex &CombinedIndex,
1015       const StringMap<GVSummaryMapTy> &ModuleToDefinedGVSummaries,
1016       std::string OldPrefix, std::string NewPrefix, bool ShouldEmitImportsFiles,
1017       std::string LinkedObjectsFileName)
1018       : ThinBackendProc(Conf, CombinedIndex, ModuleToDefinedGVSummaries),
1019         OldPrefix(OldPrefix), NewPrefix(NewPrefix),
1020         ShouldEmitImportsFiles(ShouldEmitImportsFiles),
1021         LinkedObjectsFileName(LinkedObjectsFileName) {}
1022 
1023   Error start(
1024       unsigned Task, BitcodeModule BM,
1025       const FunctionImporter::ImportMapTy &ImportList,
1026       const FunctionImporter::ExportSetTy &ExportList,
1027       const std::map<GlobalValue::GUID, GlobalValue::LinkageTypes> &ResolvedODR,
1028       MapVector<StringRef, BitcodeModule> &ModuleMap) override {
1029     StringRef ModulePath = BM.getModuleIdentifier();
1030     std::string NewModulePath =
1031         getThinLTOOutputFile(ModulePath, OldPrefix, NewPrefix);
1032 
1033     std::error_code EC;
1034     if (!LinkedObjectsFileName.empty()) {
1035       if (!LinkedObjectsFile) {
1036         LinkedObjectsFile = llvm::make_unique<raw_fd_ostream>(
1037             LinkedObjectsFileName, EC, sys::fs::OpenFlags::F_None);
1038         if (EC)
1039           return errorCodeToError(EC);
1040       }
1041       *LinkedObjectsFile << NewModulePath << '\n';
1042     }
1043 
1044     std::map<std::string, GVSummaryMapTy> ModuleToSummariesForIndex;
1045     gatherImportedSummariesForModule(ModulePath, ModuleToDefinedGVSummaries,
1046                                      ImportList, ModuleToSummariesForIndex);
1047 
1048     raw_fd_ostream OS(NewModulePath + ".thinlto.bc", EC,
1049                       sys::fs::OpenFlags::F_None);
1050     if (EC)
1051       return errorCodeToError(EC);
1052     WriteIndexToFile(CombinedIndex, OS, &ModuleToSummariesForIndex);
1053 
1054     if (ShouldEmitImportsFiles)
1055       return errorCodeToError(
1056           EmitImportsFiles(ModulePath, NewModulePath + ".imports", ImportList));
1057     return Error::success();
1058   }
1059 
1060   Error wait() override { return Error::success(); }
1061 };
1062 } // end anonymous namespace
1063 
1064 ThinBackend lto::createWriteIndexesThinBackend(std::string OldPrefix,
1065                                                std::string NewPrefix,
1066                                                bool ShouldEmitImportsFiles,
1067                                                std::string LinkedObjectsFile) {
1068   return [=](Config &Conf, ModuleSummaryIndex &CombinedIndex,
1069              const StringMap<GVSummaryMapTy> &ModuleToDefinedGVSummaries,
1070              AddStreamFn AddStream, NativeObjectCache Cache) {
1071     return llvm::make_unique<WriteIndexesThinBackend>(
1072         Conf, CombinedIndex, ModuleToDefinedGVSummaries, OldPrefix, NewPrefix,
1073         ShouldEmitImportsFiles, LinkedObjectsFile);
1074   };
1075 }
1076 
1077 Error LTO::runThinLTO(AddStreamFn AddStream, NativeObjectCache Cache) {
1078   if (ThinLTO.ModuleMap.empty())
1079     return Error::success();
1080 
1081   if (Conf.CombinedIndexHook && !Conf.CombinedIndexHook(ThinLTO.CombinedIndex))
1082     return Error::success();
1083 
1084   // Collect for each module the list of function it defines (GUID ->
1085   // Summary).
1086   StringMap<GVSummaryMapTy>
1087       ModuleToDefinedGVSummaries(ThinLTO.ModuleMap.size());
1088   ThinLTO.CombinedIndex.collectDefinedGVSummariesPerModule(
1089       ModuleToDefinedGVSummaries);
1090   // Create entries for any modules that didn't have any GV summaries
1091   // (either they didn't have any GVs to start with, or we suppressed
1092   // generation of the summaries because they e.g. had inline assembly
1093   // uses that couldn't be promoted/renamed on export). This is so
1094   // InProcessThinBackend::start can still launch a backend thread, which
1095   // is passed the map of summaries for the module, without any special
1096   // handling for this case.
1097   for (auto &Mod : ThinLTO.ModuleMap)
1098     if (!ModuleToDefinedGVSummaries.count(Mod.first))
1099       ModuleToDefinedGVSummaries.try_emplace(Mod.first);
1100 
1101   StringMap<FunctionImporter::ImportMapTy> ImportLists(
1102       ThinLTO.ModuleMap.size());
1103   StringMap<FunctionImporter::ExportSetTy> ExportLists(
1104       ThinLTO.ModuleMap.size());
1105   StringMap<std::map<GlobalValue::GUID, GlobalValue::LinkageTypes>> ResolvedODR;
1106 
1107   if (Conf.OptLevel > 0)
1108     ComputeCrossModuleImport(ThinLTO.CombinedIndex, ModuleToDefinedGVSummaries,
1109                              ImportLists, ExportLists);
1110 
1111   // Figure out which symbols need to be internalized. This also needs to happen
1112   // at -O0 because summary-based DCE is implemented using internalization, and
1113   // we must apply DCE consistently with the full LTO module in order to avoid
1114   // undefined references during the final link.
1115   std::set<GlobalValue::GUID> ExportedGUIDs;
1116   for (auto &Res : GlobalResolutions) {
1117     // First check if the symbol was flagged as having external references.
1118     if (Res.second.Partition != GlobalResolution::External)
1119       continue;
1120     // IRName will be defined if we have seen the prevailing copy of
1121     // this value. If not, no need to mark as exported from a ThinLTO
1122     // partition (and we can't get the GUID).
1123     if (Res.second.IRName.empty())
1124       continue;
1125     auto GUID = GlobalValue::getGUID(
1126         GlobalValue::dropLLVMManglingEscape(Res.second.IRName));
1127     // Mark exported unless index-based analysis determined it to be dead.
1128     if (ThinLTO.CombinedIndex.isGUIDLive(GUID))
1129       ExportedGUIDs.insert(GUID);
1130   }
1131 
1132   // Any functions referenced by the jump table in the regular LTO object must
1133   // be exported.
1134   for (auto &Def : ThinLTO.CombinedIndex.cfiFunctionDefs())
1135     ExportedGUIDs.insert(
1136         GlobalValue::getGUID(GlobalValue::dropLLVMManglingEscape(Def)));
1137 
1138   auto isExported = [&](StringRef ModuleIdentifier, GlobalValue::GUID GUID) {
1139     const auto &ExportList = ExportLists.find(ModuleIdentifier);
1140     return (ExportList != ExportLists.end() &&
1141             ExportList->second.count(GUID)) ||
1142            ExportedGUIDs.count(GUID);
1143   };
1144   thinLTOInternalizeAndPromoteInIndex(ThinLTO.CombinedIndex, isExported);
1145 
1146   auto isPrevailing = [&](GlobalValue::GUID GUID,
1147                           const GlobalValueSummary *S) {
1148     return ThinLTO.PrevailingModuleForGUID[GUID] == S->modulePath();
1149   };
1150   auto recordNewLinkage = [&](StringRef ModuleIdentifier,
1151                               GlobalValue::GUID GUID,
1152                               GlobalValue::LinkageTypes NewLinkage) {
1153     ResolvedODR[ModuleIdentifier][GUID] = NewLinkage;
1154   };
1155   thinLTOResolveWeakForLinkerInIndex(ThinLTO.CombinedIndex, isPrevailing,
1156                                      recordNewLinkage);
1157 
1158   std::unique_ptr<ThinBackendProc> BackendProc =
1159       ThinLTO.Backend(Conf, ThinLTO.CombinedIndex, ModuleToDefinedGVSummaries,
1160                       AddStream, Cache);
1161 
1162   // Tasks 0 through ParallelCodeGenParallelismLevel-1 are reserved for combined
1163   // module and parallel code generation partitions.
1164   unsigned Task = RegularLTO.ParallelCodeGenParallelismLevel;
1165   for (auto &Mod : ThinLTO.ModuleMap) {
1166     if (Error E = BackendProc->start(Task, Mod.second, ImportLists[Mod.first],
1167                                      ExportLists[Mod.first],
1168                                      ResolvedODR[Mod.first], ThinLTO.ModuleMap))
1169       return E;
1170     ++Task;
1171   }
1172 
1173   return BackendProc->wait();
1174 }
1175 
1176 Expected<std::unique_ptr<ToolOutputFile>>
1177 lto::setupOptimizationRemarks(LLVMContext &Context,
1178                               StringRef LTORemarksFilename,
1179                               bool LTOPassRemarksWithHotness, int Count) {
1180   if (LTORemarksFilename.empty())
1181     return nullptr;
1182 
1183   std::string Filename = LTORemarksFilename;
1184   if (Count != -1)
1185     Filename += ".thin." + llvm::utostr(Count) + ".yaml";
1186 
1187   std::error_code EC;
1188   auto DiagnosticFile =
1189       llvm::make_unique<ToolOutputFile>(Filename, EC, sys::fs::F_None);
1190   if (EC)
1191     return errorCodeToError(EC);
1192   Context.setDiagnosticsOutputFile(
1193       llvm::make_unique<yaml::Output>(DiagnosticFile->os()));
1194   if (LTOPassRemarksWithHotness)
1195     Context.setDiagnosticsHotnessRequested(true);
1196   DiagnosticFile->keep();
1197   return std::move(DiagnosticFile);
1198 }
1199