LLVM  8.0.1
ModuleSummaryAnalysis.cpp
Go to the documentation of this file.
1 //===- ModuleSummaryAnalysis.cpp - Module summary index builder -----------===//
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 pass builds a ModuleSummaryIndex object for the module, to be written
11 // to bitcode or LLVM assembly.
12 //
13 //===----------------------------------------------------------------------===//
14 
16 #include "llvm/ADT/ArrayRef.h"
17 #include "llvm/ADT/DenseSet.h"
18 #include "llvm/ADT/MapVector.h"
19 #include "llvm/ADT/STLExtras.h"
20 #include "llvm/ADT/SetVector.h"
21 #include "llvm/ADT/SmallPtrSet.h"
22 #include "llvm/ADT/SmallVector.h"
23 #include "llvm/ADT/StringRef.h"
27 #include "llvm/Analysis/LoopInfo.h"
30 #include "llvm/IR/Attributes.h"
31 #include "llvm/IR/BasicBlock.h"
32 #include "llvm/IR/CallSite.h"
33 #include "llvm/IR/Constant.h"
34 #include "llvm/IR/Constants.h"
35 #include "llvm/IR/Dominators.h"
36 #include "llvm/IR/Function.h"
37 #include "llvm/IR/GlobalAlias.h"
38 #include "llvm/IR/GlobalValue.h"
39 #include "llvm/IR/GlobalVariable.h"
40 #include "llvm/IR/Instructions.h"
41 #include "llvm/IR/IntrinsicInst.h"
42 #include "llvm/IR/Intrinsics.h"
43 #include "llvm/IR/Metadata.h"
44 #include "llvm/IR/Module.h"
46 #include "llvm/IR/Use.h"
47 #include "llvm/IR/User.h"
50 #include "llvm/Pass.h"
51 #include "llvm/Support/Casting.h"
53 #include <algorithm>
54 #include <cassert>
55 #include <cstdint>
56 #include <vector>
57 
58 using namespace llvm;
59 
60 #define DEBUG_TYPE "module-summary-analysis"
61 
62 // Option to force edges cold which will block importing when the
63 // -import-cold-multiplier is set to 0. Useful for debugging.
67  "force-summary-edges-cold", cl::Hidden, cl::location(ForceSummaryEdgesCold),
68  cl::desc("Force all edges in the function summary to cold"),
71  "all-non-critical", "All non-critical edges."),
72  clEnumValN(FunctionSummary::FSHT_All, "all", "All edges.")));
73 
74 // Walk through the operands of a given User via worklist iteration and populate
75 // the set of GlobalValue references encountered. Invoked either on an
76 // Instruction or a GlobalVariable (which walks its initializer).
77 // Return true if any of the operands contains blockaddress. This is important
78 // to know when computing summary for global var, because if global variable
79 // references basic block address we can't import it separately from function
80 // containing that basic block. For simplicity we currently don't import such
81 // global vars at all. When importing function we aren't interested if any
82 // instruction in it takes an address of any basic block, because instruction
83 // can only take an address of basic block located in the same function.
84 static bool findRefEdges(ModuleSummaryIndex &Index, const User *CurUser,
85  SetVector<ValueInfo> &RefEdges,
87  bool HasBlockAddress = false;
89  Worklist.push_back(CurUser);
90 
91  while (!Worklist.empty()) {
92  const User *U = Worklist.pop_back_val();
93 
94  if (!Visited.insert(U).second)
95  continue;
96 
97  ImmutableCallSite CS(U);
98 
99  for (const auto &OI : U->operands()) {
100  const User *Operand = dyn_cast<User>(OI);
101  if (!Operand)
102  continue;
103  if (isa<BlockAddress>(Operand)) {
104  HasBlockAddress = true;
105  continue;
106  }
107  if (auto *GV = dyn_cast<GlobalValue>(Operand)) {
108  // We have a reference to a global value. This should be added to
109  // the reference set unless it is a callee. Callees are handled
110  // specially by WriteFunction and are added to a separate list.
111  if (!(CS && CS.isCallee(&OI)))
112  RefEdges.insert(Index.getOrInsertValueInfo(GV));
113  continue;
114  }
115  Worklist.push_back(Operand);
116  }
117  }
118  return HasBlockAddress;
119 }
120 
122  ProfileSummaryInfo *PSI) {
123  if (!PSI)
125  if (PSI->isHotCount(ProfileCount))
127  if (PSI->isColdCount(ProfileCount))
130 }
131 
132 static bool isNonRenamableLocal(const GlobalValue &GV) {
133  return GV.hasSection() && GV.hasLocalLinkage();
134 }
135 
136 /// Determine whether this call has all constant integer arguments (excluding
137 /// "this") and summarize it to VCalls or ConstVCalls as appropriate.
141  std::vector<uint64_t> Args;
142  // Start from the second argument to skip the "this" pointer.
143  for (auto &Arg : make_range(Call.CS.arg_begin() + 1, Call.CS.arg_end())) {
144  auto *CI = dyn_cast<ConstantInt>(Arg);
145  if (!CI || CI->getBitWidth() > 64) {
146  VCalls.insert({Guid, Call.Offset});
147  return;
148  }
149  Args.push_back(CI->getZExtValue());
150  }
151  ConstVCalls.insert({{Guid, Call.Offset}, std::move(Args)});
152 }
153 
154 /// If this intrinsic call requires that we add information to the function
155 /// summary, do so via the non-constant reference arguments.
157  const CallInst *CI, SetVector<GlobalValue::GUID> &TypeTests,
158  SetVector<FunctionSummary::VFuncId> &TypeTestAssumeVCalls,
159  SetVector<FunctionSummary::VFuncId> &TypeCheckedLoadVCalls,
160  SetVector<FunctionSummary::ConstVCall> &TypeTestAssumeConstVCalls,
161  SetVector<FunctionSummary::ConstVCall> &TypeCheckedLoadConstVCalls,
162  DominatorTree &DT) {
163  switch (CI->getCalledFunction()->getIntrinsicID()) {
164  case Intrinsic::type_test: {
165  auto *TypeMDVal = cast<MetadataAsValue>(CI->getArgOperand(1));
166  auto *TypeId = dyn_cast<MDString>(TypeMDVal->getMetadata());
167  if (!TypeId)
168  break;
169  GlobalValue::GUID Guid = GlobalValue::getGUID(TypeId->getString());
170 
171  // Produce a summary from type.test intrinsics. We only summarize type.test
172  // intrinsics that are used other than by an llvm.assume intrinsic.
173  // Intrinsics that are assumed are relevant only to the devirtualization
174  // pass, not the type test lowering pass.
175  bool HasNonAssumeUses = llvm::any_of(CI->uses(), [](const Use &CIU) {
176  auto *AssumeCI = dyn_cast<CallInst>(CIU.getUser());
177  if (!AssumeCI)
178  return true;
179  Function *F = AssumeCI->getCalledFunction();
180  return !F || F->getIntrinsicID() != Intrinsic::assume;
181  });
182  if (HasNonAssumeUses)
183  TypeTests.insert(Guid);
184 
185  SmallVector<DevirtCallSite, 4> DevirtCalls;
187  findDevirtualizableCallsForTypeTest(DevirtCalls, Assumes, CI, DT);
188  for (auto &Call : DevirtCalls)
189  addVCallToSet(Call, Guid, TypeTestAssumeVCalls,
190  TypeTestAssumeConstVCalls);
191 
192  break;
193  }
194 
196  auto *TypeMDVal = cast<MetadataAsValue>(CI->getArgOperand(2));
197  auto *TypeId = dyn_cast<MDString>(TypeMDVal->getMetadata());
198  if (!TypeId)
199  break;
200  GlobalValue::GUID Guid = GlobalValue::getGUID(TypeId->getString());
201 
202  SmallVector<DevirtCallSite, 4> DevirtCalls;
205  bool HasNonCallUses = false;
206  findDevirtualizableCallsForTypeCheckedLoad(DevirtCalls, LoadedPtrs, Preds,
207  HasNonCallUses, CI, DT);
208  // Any non-call uses of the result of llvm.type.checked.load will
209  // prevent us from optimizing away the llvm.type.test.
210  if (HasNonCallUses)
211  TypeTests.insert(Guid);
212  for (auto &Call : DevirtCalls)
213  addVCallToSet(Call, Guid, TypeCheckedLoadVCalls,
214  TypeCheckedLoadConstVCalls);
215 
216  break;
217  }
218  default:
219  break;
220  }
221 }
222 
223 static bool isNonVolatileLoad(const Instruction *I) {
224  if (const auto *LI = dyn_cast<LoadInst>(I))
225  return !LI->isVolatile();
226 
227  return false;
228 }
229 
231  const Function &F, BlockFrequencyInfo *BFI,
233  bool HasLocalsInUsedOrAsm,
234  DenseSet<GlobalValue::GUID> &CantBePromoted,
235  bool IsThinLTO) {
236  // Summary not currently supported for anonymous functions, they should
237  // have been named.
238  assert(F.hasName());
239 
240  unsigned NumInsts = 0;
241  // Map from callee ValueId to profile count. Used to accumulate profile
242  // counts for all static calls to a given callee.
243  MapVector<ValueInfo, CalleeInfo> CallGraphEdges;
244  SetVector<ValueInfo> RefEdges;
246  SetVector<FunctionSummary::VFuncId> TypeTestAssumeVCalls,
247  TypeCheckedLoadVCalls;
248  SetVector<FunctionSummary::ConstVCall> TypeTestAssumeConstVCalls,
249  TypeCheckedLoadConstVCalls;
250  ICallPromotionAnalysis ICallAnalysis;
252 
253  // Add personality function, prefix data and prologue data to function's ref
254  // list.
255  findRefEdges(Index, &F, RefEdges, Visited);
256  std::vector<const Instruction *> NonVolatileLoads;
257 
258  bool HasInlineAsmMaybeReferencingInternal = false;
259  for (const BasicBlock &BB : F)
260  for (const Instruction &I : BB) {
261  if (isa<DbgInfoIntrinsic>(I))
262  continue;
263  ++NumInsts;
264  if (isNonVolatileLoad(&I)) {
265  // Postpone processing of non-volatile load instructions
266  // See comments below
267  Visited.insert(&I);
268  NonVolatileLoads.push_back(&I);
269  continue;
270  }
271  findRefEdges(Index, &I, RefEdges, Visited);
272  auto CS = ImmutableCallSite(&I);
273  if (!CS)
274  continue;
275 
276  const auto *CI = dyn_cast<CallInst>(&I);
277  // Since we don't know exactly which local values are referenced in inline
278  // assembly, conservatively mark the function as possibly referencing
279  // a local value from inline assembly to ensure we don't export a
280  // reference (which would require renaming and promotion of the
281  // referenced value).
282  if (HasLocalsInUsedOrAsm && CI && CI->isInlineAsm())
283  HasInlineAsmMaybeReferencingInternal = true;
284 
285  auto *CalledValue = CS.getCalledValue();
286  auto *CalledFunction = CS.getCalledFunction();
287  if (CalledValue && !CalledFunction) {
288  CalledValue = CalledValue->stripPointerCastsNoFollowAliases();
289  // Stripping pointer casts can reveal a called function.
290  CalledFunction = dyn_cast<Function>(CalledValue);
291  }
292  // Check if this is an alias to a function. If so, get the
293  // called aliasee for the checks below.
294  if (auto *GA = dyn_cast<GlobalAlias>(CalledValue)) {
295  assert(!CalledFunction && "Expected null called function in callsite for alias");
296  CalledFunction = dyn_cast<Function>(GA->getBaseObject());
297  }
298  // Check if this is a direct call to a known function or a known
299  // intrinsic, or an indirect call with profile data.
300  if (CalledFunction) {
301  if (CI && CalledFunction->isIntrinsic()) {
303  CI, TypeTests, TypeTestAssumeVCalls, TypeCheckedLoadVCalls,
304  TypeTestAssumeConstVCalls, TypeCheckedLoadConstVCalls, DT);
305  continue;
306  }
307  // We should have named any anonymous globals
308  assert(CalledFunction->hasName());
309  auto ScaledCount = PSI->getProfileCount(&I, BFI);
310  auto Hotness = ScaledCount ? getHotness(ScaledCount.getValue(), PSI)
314 
315  // Use the original CalledValue, in case it was an alias. We want
316  // to record the call edge to the alias in that case. Eventually
317  // an alias summary will be created to associate the alias and
318  // aliasee.
319  auto &ValueInfo = CallGraphEdges[Index.getOrInsertValueInfo(
320  cast<GlobalValue>(CalledValue))];
321  ValueInfo.updateHotness(Hotness);
322  // Add the relative block frequency to CalleeInfo if there is no profile
323  // information.
324  if (BFI != nullptr && Hotness == CalleeInfo::HotnessType::Unknown) {
325  uint64_t BBFreq = BFI->getBlockFreq(&BB).getFrequency();
326  uint64_t EntryFreq = BFI->getEntryFreq();
327  ValueInfo.updateRelBlockFreq(BBFreq, EntryFreq);
328  }
329  } else {
330  // Skip inline assembly calls.
331  if (CI && CI->isInlineAsm())
332  continue;
333  // Skip direct calls.
334  if (!CalledValue || isa<Constant>(CalledValue))
335  continue;
336 
337  // Check if the instruction has a callees metadata. If so, add callees
338  // to CallGraphEdges to reflect the references from the metadata, and
339  // to enable importing for subsequent indirect call promotion and
340  // inlining.
341  if (auto *MD = I.getMetadata(LLVMContext::MD_callees)) {
342  for (auto &Op : MD->operands()) {
343  Function *Callee = mdconst::extract_or_null<Function>(Op);
344  if (Callee)
345  CallGraphEdges[Index.getOrInsertValueInfo(Callee)];
346  }
347  }
348 
349  uint32_t NumVals, NumCandidates;
350  uint64_t TotalCount;
351  auto CandidateProfileData =
353  &I, NumVals, TotalCount, NumCandidates);
354  for (auto &Candidate : CandidateProfileData)
355  CallGraphEdges[Index.getOrInsertValueInfo(Candidate.Value)]
356  .updateHotness(getHotness(Candidate.Count, PSI));
357  }
358  }
359 
360  // By now we processed all instructions in a function, except
361  // non-volatile loads. All new refs we add in a loop below
362  // are obviously constant. All constant refs are grouped in the
363  // end of RefEdges vector, so we can use a single integer value
364  // to identify them.
365  unsigned RefCnt = RefEdges.size();
366  for (const Instruction *I : NonVolatileLoads) {
367  Visited.erase(I);
368  findRefEdges(Index, I, RefEdges, Visited);
369  }
370  std::vector<ValueInfo> Refs = RefEdges.takeVector();
371  // Regular LTO module doesn't participate in ThinLTO import,
372  // so no reference from it can be readonly, since this would
373  // require importing variable as local copy
374  if (IsThinLTO)
375  for (; RefCnt < Refs.size(); ++RefCnt)
376  Refs[RefCnt].setReadOnly();
377 
378  // Explicit add hot edges to enforce importing for designated GUIDs for
379  // sample PGO, to enable the same inlines as the profiled optimized binary.
380  for (auto &I : F.getImportGUIDs())
381  CallGraphEdges[Index.getOrInsertValueInfo(I)].updateHotness(
385 
386  bool NonRenamableLocal = isNonRenamableLocal(F);
387  bool NotEligibleForImport =
388  NonRenamableLocal || HasInlineAsmMaybeReferencingInternal;
389  GlobalValueSummary::GVFlags Flags(F.getLinkage(), NotEligibleForImport,
390  /* Live = */ false, F.isDSOLocal());
391  FunctionSummary::FFlags FunFlags{
392  F.hasFnAttribute(Attribute::ReadNone),
393  F.hasFnAttribute(Attribute::ReadOnly),
394  F.hasFnAttribute(Attribute::NoRecurse), F.returnDoesNotAlias(),
395  // FIXME: refactor this to use the same code that inliner is using.
396  // Don't try to import functions with noinline attribute.
397  F.getAttributes().hasFnAttribute(Attribute::NoInline)};
398  auto FuncSummary = llvm::make_unique<FunctionSummary>(
399  Flags, NumInsts, FunFlags, /*EntryCount=*/0, std::move(Refs),
400  CallGraphEdges.takeVector(), TypeTests.takeVector(),
401  TypeTestAssumeVCalls.takeVector(), TypeCheckedLoadVCalls.takeVector(),
402  TypeTestAssumeConstVCalls.takeVector(),
403  TypeCheckedLoadConstVCalls.takeVector());
404  if (NonRenamableLocal)
405  CantBePromoted.insert(F.getGUID());
406  Index.addGlobalValueSummary(F, std::move(FuncSummary));
407 }
408 
409 static void
411  DenseSet<GlobalValue::GUID> &CantBePromoted) {
412  SetVector<ValueInfo> RefEdges;
414  bool HasBlockAddress = findRefEdges(Index, &V, RefEdges, Visited);
415  bool NonRenamableLocal = isNonRenamableLocal(V);
416  GlobalValueSummary::GVFlags Flags(V.getLinkage(), NonRenamableLocal,
417  /* Live = */ false, V.isDSOLocal());
418 
419  // Don't mark variables we won't be able to internalize as read-only.
421  !V.hasComdat() && !V.hasAppendingLinkage() && !V.isInterposable() &&
423  auto GVarSummary = llvm::make_unique<GlobalVarSummary>(Flags, VarFlags,
424  RefEdges.takeVector());
425  if (NonRenamableLocal)
426  CantBePromoted.insert(V.getGUID());
427  if (HasBlockAddress)
428  GVarSummary->setNotEligibleToImport();
429  Index.addGlobalValueSummary(V, std::move(GVarSummary));
430 }
431 
432 static void
434  DenseSet<GlobalValue::GUID> &CantBePromoted) {
435  bool NonRenamableLocal = isNonRenamableLocal(A);
436  GlobalValueSummary::GVFlags Flags(A.getLinkage(), NonRenamableLocal,
437  /* Live = */ false, A.isDSOLocal());
438  auto AS = llvm::make_unique<AliasSummary>(Flags);
439  auto *Aliasee = A.getBaseObject();
440  auto *AliaseeSummary = Index.getGlobalValueSummary(*Aliasee);
441  assert(AliaseeSummary && "Alias expects aliasee summary to be parsed");
442  AS->setAliasee(AliaseeSummary);
443  if (NonRenamableLocal)
444  CantBePromoted.insert(A.getGUID());
445  Index.addGlobalValueSummary(A, std::move(AS));
446 }
447 
448 // Set LiveRoot flag on entries matching the given value name.
450  if (ValueInfo VI = Index.getValueInfo(GlobalValue::getGUID(Name)))
451  for (auto &Summary : VI.getSummaryList())
452  Summary->setLive(true);
453 }
454 
456  const Module &M,
457  std::function<BlockFrequencyInfo *(const Function &F)> GetBFICallback,
458  ProfileSummaryInfo *PSI) {
459  assert(PSI);
460  bool EnableSplitLTOUnit = false;
461  if (auto *MD = mdconst::extract_or_null<ConstantInt>(
462  M.getModuleFlag("EnableSplitLTOUnit")))
463  EnableSplitLTOUnit = MD->getZExtValue();
464  ModuleSummaryIndex Index(/*HaveGVs=*/true, EnableSplitLTOUnit);
465 
466  // Identify the local values in the llvm.used and llvm.compiler.used sets,
467  // which should not be exported as they would then require renaming and
468  // promotion, but we may have opaque uses e.g. in inline asm. We collect them
469  // here because we use this information to mark functions containing inline
470  // assembly calls as not importable.
473  // First collect those in the llvm.used set.
474  collectUsedGlobalVariables(M, Used, /*CompilerUsed*/ false);
475  // Next collect those in the llvm.compiler.used set.
476  collectUsedGlobalVariables(M, Used, /*CompilerUsed*/ true);
477  DenseSet<GlobalValue::GUID> CantBePromoted;
478  for (auto *V : Used) {
479  if (V->hasLocalLinkage()) {
480  LocalsUsed.insert(V);
481  CantBePromoted.insert(V->getGUID());
482  }
483  }
484 
485  bool HasLocalInlineAsmSymbol = false;
486  if (!M.getModuleInlineAsm().empty()) {
487  // Collect the local values defined by module level asm, and set up
488  // summaries for these symbols so that they can be marked as NoRename,
489  // to prevent export of any use of them in regular IR that would require
490  // renaming within the module level asm. Note we don't need to create a
491  // summary for weak or global defs, as they don't need to be flagged as
492  // NoRename, and defs in module level asm can't be imported anyway.
493  // Also, any values used but not defined within module level asm should
494  // be listed on the llvm.used or llvm.compiler.used global and marked as
495  // referenced from there.
498  // Symbols not marked as Weak or Global are local definitions.
499  if (Flags & (object::BasicSymbolRef::SF_Weak |
501  return;
502  HasLocalInlineAsmSymbol = true;
503  GlobalValue *GV = M.getNamedValue(Name);
504  if (!GV)
505  return;
506  assert(GV->isDeclaration() && "Def in module asm already has definition");
508  /* NotEligibleToImport = */ true,
509  /* Live = */ true,
510  /* Local */ GV->isDSOLocal());
511  CantBePromoted.insert(GV->getGUID());
512  // Create the appropriate summary type.
513  if (Function *F = dyn_cast<Function>(GV)) {
514  std::unique_ptr<FunctionSummary> Summary =
515  llvm::make_unique<FunctionSummary>(
516  GVFlags, /*InstCount=*/0,
521  F->returnDoesNotAlias(),
522  /* NoInline = */ false},
523  /*EntryCount=*/0, ArrayRef<ValueInfo>{},
530  Index.addGlobalValueSummary(*GV, std::move(Summary));
531  } else {
532  std::unique_ptr<GlobalVarSummary> Summary =
533  llvm::make_unique<GlobalVarSummary>(
534  GVFlags, GlobalVarSummary::GVarFlags(),
536  Index.addGlobalValueSummary(*GV, std::move(Summary));
537  }
538  });
539  }
540 
541  bool IsThinLTO = true;
542  if (auto *MD =
543  mdconst::extract_or_null<ConstantInt>(M.getModuleFlag("ThinLTO")))
544  IsThinLTO = MD->getZExtValue();
545 
546  // Compute summaries for all functions defined in module, and save in the
547  // index.
548  for (auto &F : M) {
549  if (F.isDeclaration())
550  continue;
551 
552  DominatorTree DT(const_cast<Function &>(F));
553  BlockFrequencyInfo *BFI = nullptr;
554  std::unique_ptr<BlockFrequencyInfo> BFIPtr;
555  if (GetBFICallback)
556  BFI = GetBFICallback(F);
557  else if (F.hasProfileData()) {
558  LoopInfo LI{DT};
559  BranchProbabilityInfo BPI{F, LI};
560  BFIPtr = llvm::make_unique<BlockFrequencyInfo>(F, BPI, LI);
561  BFI = BFIPtr.get();
562  }
563 
564  computeFunctionSummary(Index, M, F, BFI, PSI, DT,
565  !LocalsUsed.empty() || HasLocalInlineAsmSymbol,
566  CantBePromoted, IsThinLTO);
567  }
568 
569  // Compute summaries for all variables defined in module, and save in the
570  // index.
571  for (const GlobalVariable &G : M.globals()) {
572  if (G.isDeclaration())
573  continue;
574  computeVariableSummary(Index, G, CantBePromoted);
575  }
576 
577  // Compute summaries for all aliases defined in module, and save in the
578  // index.
579  for (const GlobalAlias &A : M.aliases())
580  computeAliasSummary(Index, A, CantBePromoted);
581 
582  for (auto *V : LocalsUsed) {
583  auto *Summary = Index.getGlobalValueSummary(*V);
584  assert(Summary && "Missing summary for global value");
585  Summary->setNotEligibleToImport();
586  }
587 
588  // The linker doesn't know about these LLVM produced values, so we need
589  // to flag them as live in the index to ensure index-based dead value
590  // analysis treats them as live roots of the analysis.
591  setLiveRoot(Index, "llvm.used");
592  setLiveRoot(Index, "llvm.compiler.used");
593  setLiveRoot(Index, "llvm.global_ctors");
594  setLiveRoot(Index, "llvm.global_dtors");
595  setLiveRoot(Index, "llvm.global.annotations");
596 
597  for (auto &GlobalList : Index) {
598  // Ignore entries for references that are undefined in the current module.
599  if (GlobalList.second.SummaryList.empty())
600  continue;
601 
602  assert(GlobalList.second.SummaryList.size() == 1 &&
603  "Expected module's index to have one summary per GUID");
604  auto &Summary = GlobalList.second.SummaryList[0];
605  if (!IsThinLTO) {
606  Summary->setNotEligibleToImport();
607  continue;
608  }
609 
610  bool AllRefsCanBeExternallyReferenced =
611  llvm::all_of(Summary->refs(), [&](const ValueInfo &VI) {
612  return !CantBePromoted.count(VI.getGUID());
613  });
614  if (!AllRefsCanBeExternallyReferenced) {
615  Summary->setNotEligibleToImport();
616  continue;
617  }
618 
619  if (auto *FuncSummary = dyn_cast<FunctionSummary>(Summary.get())) {
620  bool AllCallsCanBeExternallyReferenced = llvm::all_of(
621  FuncSummary->calls(), [&](const FunctionSummary::EdgeTy &Edge) {
622  return !CantBePromoted.count(Edge.first.getGUID());
623  });
624  if (!AllCallsCanBeExternallyReferenced)
625  Summary->setNotEligibleToImport();
626  }
627  }
628 
629  return Index;
630 }
631 
632 AnalysisKey ModuleSummaryIndexAnalysis::Key;
633 
637  auto &FAM = AM.getResult<FunctionAnalysisManagerModuleProxy>(M).getManager();
639  M,
640  [&FAM](const Function &F) {
641  return &FAM.getResult<BlockFrequencyAnalysis>(
642  *const_cast<Function *>(&F));
643  },
644  &PSI);
645 }
646 
648 
649 INITIALIZE_PASS_BEGIN(ModuleSummaryIndexWrapperPass, "module-summary-analysis",
650  "Module Summary Analysis", false, true)
654  "Module Summary Analysis", false, true)
655 
657  return new ModuleSummaryIndexWrapperPass();
658 }
659 
661  : ModulePass(ID) {
663 }
664 
666  auto *PSI = &getAnalysis<ProfileSummaryInfoWrapperPass>().getPSI();
667  Index.emplace(buildModuleSummaryIndex(
668  M,
669  [this](const Function &F) {
670  return &(this->getAnalysis<BlockFrequencyInfoWrapperPass>(
671  *const_cast<Function *>(&F))
672  .getBFI());
673  },
674  PSI));
675  return false;
676 }
677 
679  Index.reset();
680  return false;
681 }
682 
684  AU.setPreservesAll();
687 }
ArrayRef< InstrProfValueData > getPromotionCandidatesForInstruction(const Instruction *I, uint32_t &NumVals, uint64_t &TotalCount, uint32_t &NumCandidates)
Returns reference to array of InstrProfValueData for the given instruction I.
const GlobalObject * getBaseObject() const
bool hasDLLExportStorageClass() const
Definition: GlobalValue.h:265
iterator_range< use_iterator > uses()
Definition: Value.h:355
bool hasLocalLinkage() const
Definition: GlobalValue.h:436
static PassRegistry * getPassRegistry()
getPassRegistry - Access the global registry object, which is automatically initialized at applicatio...
PassT::Result & getResult(IRUnitT &IR, ExtraArgTs... ExtraArgs)
Get the result of an analysis pass for a given IR unit.
Definition: PassManager.h:770
uint64_t GUID
Declare a type to represent a global unique identifier for a global value.
Definition: GlobalValue.h:493
This class represents lattice values for constants.
Definition: AllocatorList.h:24
size_type size() const
Determine the number of elements in the SetVector.
Definition: SetVector.h:78
A Module instance is used to store all the information related to an LLVM module. ...
Definition: Module.h:65
GlobalValueSummary * getGlobalValueSummary(const GlobalValue &GV, bool PerModuleIndex=true) const
Returns the first GlobalValueSummary for GV, asserting that there is only one if PerModuleIndex.
void findDevirtualizableCallsForTypeTest(SmallVectorImpl< DevirtCallSite > &DevirtCalls, SmallVectorImpl< CallInst *> &Assumes, const CallInst *CI, DominatorTree &DT)
Given a call to the intrinsic @llvm.type.test, find all devirtualizable call sites based on the call ...
CallSite CS
The call site itself.
This is the interface to build a ModuleSummaryIndex for a module.
Implements a dense probed hash-table based set.
Definition: DenseSet.h:250
bool isColdCount(uint64_t C)
Returns true if count C is considered cold.
Analysis providing profile information.
This class represents a function call, abstracting a target machine&#39;s calling convention.
bool hasAvailableExternallyLinkage() const
Definition: GlobalValue.h:423
This file contains the declarations for metadata subclasses.
uint64_t getFrequency() const
Returns the frequency as a fixpoint number scaled by the entry frequency.
uint64_t Offset
The offset from the address point to the virtual function.
bool isInterposable() const
Return true if this global&#39;s definition can be substituted with an arbitrary definition at link time...
Definition: GlobalValue.h:420
bool hasFnAttribute(Attribute::AttrKind Kind) const
Return true if the function has the attribute.
Definition: Function.h:321
This class implements a map that also provides access to all stored values in a deterministic order...
Definition: MapVector.h:38
bool all_of(R &&range, UnaryPredicate P)
Provide wrappers to std::all_of which take ranges instead of having to pass begin/end explicitly...
Definition: STLExtras.h:1186
Optional< uint64_t > getProfileCount(const Instruction *CallInst, BlockFrequencyInfo *BFI)
Returns the profile count for CallInst.
F(f)
void initializeModuleSummaryIndexWrapperPassPass(PassRegistry &)
block Block Frequency true
This defines the Use class.
bool isHotCount(uint64_t C)
Returns true if count C is considered hot.
ModuleSummaryIndex buildModuleSummaryIndex(const Module &M, std::function< BlockFrequencyInfo *(const Function &F)> GetBFICallback, ProfileSummaryInfo *PSI)
Direct function to compute a ModuleSummaryIndex from a given module.
Value * getArgOperand(unsigned i) const
Definition: InstrTypes.h:1135
void findDevirtualizableCallsForTypeCheckedLoad(SmallVectorImpl< DevirtCallSite > &DevirtCalls, SmallVectorImpl< Instruction *> &LoadedPtrs, SmallVectorImpl< Instruction *> &Preds, bool &HasNonCallUses, const CallInst *CI, DominatorTree &DT)
Given a call to the intrinsic @llvm.type.checked.load, find all devirtualizable call sites based on t...
bool hasSection() const
Definition: GlobalValue.h:270
AnalysisUsage & addRequired()
#define INITIALIZE_PASS_DEPENDENCY(depName)
Definition: PassSupport.h:51
amdgpu Simplify well known AMD library false Value Value const Twine & Name
An analysis pass based on legacy pass manager to deliver ProfileSummaryInfo.
bool isDSOLocal() const
Definition: GlobalValue.h:280
static AnalysisKey * ID()
Returns an opaque, unique ID for this analysis type.
Definition: PassManager.h:399
A Use represents the edge between a Value definition and its users.
Definition: Use.h:56
IterTy arg_end() const
Definition: CallSite.h:575
This file contains the simple types necessary to represent the attributes associated with functions a...
Legacy analysis pass which computes BlockFrequencyInfo.
static void CollectAsmSymbols(const Module &M, function_ref< void(StringRef, object::BasicSymbolRef::Flags)> AsmSymbol)
Parse inline ASM and collect the symbols that are defined or referenced in the current module...
bool insert(const value_type &X)
Insert a new element into the SetVector.
Definition: SetVector.h:142
std::pair< ValueInfo, CalleeInfo > EdgeTy
<CalleeValueInfo, CalleeInfo> call edge pair.
GlobalValue * getNamedValue(StringRef Name) const
Return the global value in the module with the specified name, of arbitrary type. ...
Definition: Module.cpp:114
ArrayRef - Represent a constant reference to an array (0 or more elements consecutively in memory)...
Definition: APInt.h:33
module summary analysis
LinkageTypes getLinkage() const
Definition: GlobalValue.h:451
Class to hold module path string table and global value map, and encapsulate methods for operating on...
Concrete subclass of DominatorTreeBase that is used to compute a normal dominator tree...
Definition: Dominators.h:145
amdgpu Simplify well known AMD library false Value * Callee
bool doFinalization(Module &M) override
doFinalization - Virtual method overriden by subclasses to do any necessary clean up after all passes...
bool hasAppendingLinkage() const
Definition: GlobalValue.h:433
static void computeAliasSummary(ModuleSummaryIndex &Index, const GlobalAlias &A, DenseSet< GlobalValue::GUID > &CantBePromoted)
Interface to identify indirect call promotion candidates.
ForceSummaryHotnessType
Types for -force-summary-edges-cold debugging option.
BlockFrequencyInfo pass uses BlockFrequencyInfoImpl implementation to estimate IR basic block frequen...
bool hasName() const
Definition: Value.h:251
LLVM Basic Block Representation.
Definition: BasicBlock.h:58
A call site that could be devirtualized.
Metadata * getModuleFlag(StringRef Key) const
Return the corresponding value if Key appears in module flags, otherwise return null.
Definition: Module.cpp:312
An analysis pass based on the new PM to deliver ProfileSummaryInfo.
ValuesClass values(OptsTy... Options)
Helper to build a ValuesClass by forwarding a variable number of arguments as an initializer list to ...
Definition: CommandLine.h:643
LLVM_NODISCARD bool empty() const
Definition: SmallPtrSet.h:92
bool returnDoesNotAlias() const
Determine if the parameter or return value is marked with NoAlias attribute.
Definition: Function.h:586
This file contains the declarations for the subclasses of Constant, which represent the different fla...
std::pair< iterator, bool > insert(PtrType Ptr)
Inserts Ptr if and only if there is no element in the container equal to Ptr.
Definition: SmallPtrSet.h:371
Represent the analysis usage information of a pass.
bool any_of(R &&range, UnaryPredicate P)
Provide wrappers to std::any_of which take ranges instead of having to pass begin/end explicitly...
Definition: STLExtras.h:1193
INITIALIZE_PASS_BEGIN(ModuleSummaryIndexWrapperPass, "module-summary-analysis", "Module Summary Analysis", false, true) INITIALIZE_PASS_END(ModuleSummaryIndexWrapperPass
static void addIntrinsicToSummary(const CallInst *CI, SetVector< GlobalValue::GUID > &TypeTests, SetVector< FunctionSummary::VFuncId > &TypeTestAssumeVCalls, SetVector< FunctionSummary::VFuncId > &TypeCheckedLoadVCalls, SetVector< FunctionSummary::ConstVCall > &TypeTestAssumeConstVCalls, SetVector< FunctionSummary::ConstVCall > &TypeCheckedLoadConstVCalls, DominatorTree &DT)
If this intrinsic call requires that we add information to the function summary, do so via the non-co...
op_range operands()
Definition: User.h:238
static GUID getGUID(StringRef GlobalName)
Return a 64-bit global unique ID constructed from global value name (i.e.
Definition: GlobalValue.h:497
static void addVCallToSet(DevirtCallSite Call, GlobalValue::GUID Guid, SetVector< FunctionSummary::VFuncId > &VCalls, SetVector< FunctionSummary::ConstVCall > &ConstVCalls)
Determine whether this call has all constant integer arguments (excluding "this") and summarize it to...
static void computeVariableSummary(ModuleSummaryIndex &Index, const GlobalVariable &V, DenseSet< GlobalValue::GUID > &CantBePromoted)
Class to represent profile counts.
Definition: Function.h:261
VectorType takeVector()
Clear the MapVector and return the underlying vector.
Definition: MapVector.h:56
INITIALIZE_PASS_END(RegBankSelect, DEBUG_TYPE, "Assign register bank of generic virtual registers", false, false) RegBankSelect
Struct that holds a reference to a particular GUID in a global value summary.
iterator_range< T > make_range(T x, T y)
Convenience function for iterating over sub-ranges.
static bool isNonRenamableLocal(const GlobalValue &GV)
GlobalVariable * collectUsedGlobalVariables(const Module &M, SmallPtrSetImpl< GlobalValue *> &Set, bool CompilerUsed)
Given "llvm.used" or "llvm.compiler.used" as a global name, collect the initializer elements of that ...
Definition: Module.cpp:596
Analysis pass which computes BlockFrequencyInfo.
Vector takeVector()
Clear the SetVector and return the underlying vector.
Definition: SetVector.h:67
SmallPtrSet - This class implements a set which is optimized for holding SmallSize or less elements...
Definition: SmallPtrSet.h:418
This is the shared class of boolean and integer constants.
Definition: Constants.h:84
bool erase(PtrType Ptr)
erase - If the set contains the specified pointer, remove it and return true, otherwise return false...
Definition: SmallPtrSet.h:378
static bool findRefEdges(ModuleSummaryIndex &Index, const User *CurUser, SetVector< ValueInfo > &RefEdges, SmallPtrSet< const User *, 8 > &Visited)
IterTy arg_begin() const
Definition: CallSite.h:571
This is a &#39;vector&#39; (really, a variable-sized array), optimized for the case when the array is small...
Definition: SmallVector.h:847
Module.h This file contains the declarations for the Module class.
const DataFlowGraph & G
Definition: RDFGraph.cpp:211
LLVM_NODISCARD T pop_back_val()
Definition: SmallVector.h:381
static void computeFunctionSummary(ModuleSummaryIndex &Index, const Module &M, const Function &F, BlockFrequencyInfo *BFI, ProfileSummaryInfo *PSI, DominatorTree &DT, bool HasLocalsInUsedOrAsm, DenseSet< GlobalValue::GUID > &CantBePromoted, bool IsThinLTO)
Intrinsic::ID getIntrinsicID() const LLVM_READONLY
getIntrinsicID - This method returns the ID number of the specified function, or Intrinsic::not_intri...
Definition: Function.h:194
BlockFrequency getBlockFreq(const BasicBlock *BB) const
getblockFreq - Return block frequency.
Result run(Module &M, ModuleAnalysisManager &AM)
void setPreservesAll()
Set by analyses that do not transform their input at all.
GUID getGUID() const
Return a 64-bit global unique ID constructed from global value name (i.e.
Definition: GlobalValue.h:501
ValueInfo getValueInfo(const GlobalValueSummaryMapTy::value_type &R) const
Return a ValueInfo for the index value_type (convenient when iterating index).
bool hasComdat() const
Definition: GlobalObject.h:100
ValueInfo getOrInsertValueInfo(GlobalValue::GUID GUID)
Return a ValueInfo for GUID.
#define clEnumValN(ENUMVAL, FLAGNAME, DESC)
Definition: CommandLine.h:618
amdgpu Simplify well known AMD library false Value Value * Arg
void getAnalysisUsage(AnalysisUsage &AU) const override
getAnalysisUsage - This function should be overriden by passes that need analysis information to do t...
Analysis providing branch probability information.
LLVM_NODISCARD bool empty() const
Definition: SmallVector.h:56
void addGlobalValueSummary(const GlobalValue &GV, std::unique_ptr< GlobalValueSummary > Summary)
Add a global value summary for a value.
Establish a view to a call site for examination.
Definition: CallSite.h:711
Function * getCalledFunction() const
Returns the function called, or null if this is an indirect function invocation.
Definition: InstrTypes.h:1181
module summary Module Summary Analysis
#define I(x, y, z)
Definition: MD5.cpp:58
ModulePass class - This class is used to implement unstructured interprocedural optimizations and ana...
Definition: Pass.h:225
LLVM_NODISCARD std::enable_if<!is_simple_type< Y >::value, typename cast_retty< X, const Y >::ret_type >::type dyn_cast(const Y &Val)
Definition: Casting.h:323
Rename collisions when linking (static functions).
Definition: GlobalValue.h:56
size_type count(const_arg_type_t< ValueT > V) const
Return 1 if the specified key is in the set, 0 otherwise.
Definition: DenseSet.h:92
Flags specific to function summaries.
static bool isNonVolatileLoad(const Instruction *I)
FunctionSummary::ForceSummaryHotnessType ForceSummaryEdgesCold
cl::opt< FunctionSummary::ForceSummaryHotnessType, true > FSEC("force-summary-edges-cold", cl::Hidden, cl::location(ForceSummaryEdgesCold), cl::desc("Force all edges in the function summary to cold"), cl::values(clEnumValN(FunctionSummary::FSHT_None, "none", "None."), clEnumValN(FunctionSummary::FSHT_AllNonCritical, "all-non-critical", "All non-critical edges."), clEnumValN(FunctionSummary::FSHT_All, "all", "All edges.")))
const std::string & getModuleInlineAsm() const
Get any module-scope inline assembly blocks.
Definition: Module.h:248
bool isDeclaration() const
Return true if the primary definition of this global value is outside of the current translation unit...
Definition: Globals.cpp:206
ModuleSummaryIndex.h This file contains the declarations the classes that hold the module index and s...
assert(ImpDefSCC.getReg()==AMDGPU::SCC &&ImpDefSCC.isDef())
ModulePass * createModuleSummaryIndexWrapperPass()
A vector that has set insertion semantics.
Definition: SetVector.h:41
bool runOnModule(Module &M) override
runOnModule - Virtual method overriden by subclasses to process the module being operated on...
static void setLiveRoot(ModuleSummaryIndex &Index, StringRef Name)
Group flags (Linkage, NotEligibleToImport, etc.) as a bitfield.
print Print MemDeps of function
StringRef - Represent a constant reference to a string, i.e.
Definition: StringRef.h:49
A single uniqued string.
Definition: Metadata.h:604
A container for analyses that lazily runs them and caches their results.
bool hasProfileData() const
Return true if the function is annotated with profile data.
Definition: Function.h:308
A special type used by analysis passes to provide an address that identifies that particular analysis...
Definition: PassManager.h:71
LocationClass< Ty > location(Ty &L)
Definition: CommandLine.h:439
constexpr char Args[]
Key for Kernel::Metadata::mArgs.
static CalleeInfo::HotnessType getHotness(uint64_t ProfileCount, ProfileSummaryInfo *PSI)
Legacy wrapper pass to provide the ModuleSummaryIndex object.
An analysis over an "outer" IR unit that provides access to an analysis manager over an "inner" IR un...
Definition: PassManager.h:1038
bool isCallee(Value::const_user_iterator UI) const
Determine whether the passed iterator points to the callee operand&#39;s Use.
Definition: CallSite.h:143