clang  3.8.0
AnalysisConsumer.cpp
Go to the documentation of this file.
1 //===--- AnalysisConsumer.cpp - ASTConsumer for running Analyses ----------===//
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 // "Meta" ASTConsumer for running different source analyses.
11 //
12 //===----------------------------------------------------------------------===//
13 
15 #include "ModelInjector.h"
16 #include "clang/AST/ASTConsumer.h"
18 #include "clang/AST/Decl.h"
19 #include "clang/AST/DeclCXX.h"
20 #include "clang/AST/DeclObjC.h"
21 #include "clang/AST/ParentMap.h"
23 #include "clang/Analysis/CFG.h"
29 #include "clang/Lex/Preprocessor.h"
39 #include "llvm/ADT/DepthFirstIterator.h"
40 #include "llvm/ADT/PostOrderIterator.h"
41 #include "llvm/ADT/SmallPtrSet.h"
42 #include "llvm/ADT/Statistic.h"
43 #include "llvm/Support/FileSystem.h"
44 #include "llvm/Support/Path.h"
45 #include "llvm/Support/Program.h"
46 #include "llvm/Support/Timer.h"
47 #include "llvm/Support/raw_ostream.h"
48 #include <memory>
49 #include <queue>
50 
51 using namespace clang;
52 using namespace ento;
53 using llvm::SmallPtrSet;
54 
55 #define DEBUG_TYPE "AnalysisConsumer"
56 
57 static std::unique_ptr<ExplodedNode::Auditor> CreateUbiViz();
58 
59 STATISTIC(NumFunctionTopLevel, "The # of functions at top level.");
60 STATISTIC(NumFunctionsAnalyzed,
61  "The # of functions and blocks analyzed (as top level "
62  "with inlining turned on).");
63 STATISTIC(NumBlocksInAnalyzedFunctions,
64  "The # of basic blocks in the analyzed functions.");
65 STATISTIC(PercentReachableBlocks, "The % of reachable basic blocks.");
66 STATISTIC(MaxCFGSize, "The maximum number of basic blocks in a function.");
67 
68 //===----------------------------------------------------------------------===//
69 // Special PathDiagnosticConsumers.
70 //===----------------------------------------------------------------------===//
71 
72 void ento::createPlistHTMLDiagnosticConsumer(AnalyzerOptions &AnalyzerOpts,
74  const std::string &prefix,
75  const Preprocessor &PP) {
76  createHTMLDiagnosticConsumer(AnalyzerOpts, C,
77  llvm::sys::path::parent_path(prefix), PP);
78  createPlistDiagnosticConsumer(AnalyzerOpts, C, prefix, PP);
79 }
80 
81 void ento::createTextPathDiagnosticConsumer(AnalyzerOptions &AnalyzerOpts,
83  const std::string &Prefix,
84  const clang::Preprocessor &PP) {
85  llvm_unreachable("'text' consumer should be enabled on ClangDiags");
86 }
87 
88 namespace {
89 class ClangDiagPathDiagConsumer : public PathDiagnosticConsumer {
91  bool IncludePath;
92 public:
93  ClangDiagPathDiagConsumer(DiagnosticsEngine &Diag)
94  : Diag(Diag), IncludePath(false) {}
95  ~ClangDiagPathDiagConsumer() override {}
96  StringRef getName() const override { return "ClangDiags"; }
97 
98  bool supportsLogicalOpControlFlow() const override { return true; }
99  bool supportsCrossFileDiagnostics() const override { return true; }
100 
101  PathGenerationScheme getGenerationScheme() const override {
102  return IncludePath ? Minimal : None;
103  }
104 
105  void enablePaths() {
106  IncludePath = true;
107  }
108 
109  void FlushDiagnosticsImpl(std::vector<const PathDiagnostic *> &Diags,
110  FilesMade *filesMade) override {
111  unsigned WarnID = Diag.getCustomDiagID(DiagnosticsEngine::Warning, "%0");
112  unsigned NoteID = Diag.getCustomDiagID(DiagnosticsEngine::Note, "%0");
113 
114  for (std::vector<const PathDiagnostic*>::iterator I = Diags.begin(),
115  E = Diags.end(); I != E; ++I) {
116  const PathDiagnostic *PD = *I;
117  SourceLocation WarnLoc = PD->getLocation().asLocation();
118  Diag.Report(WarnLoc, WarnID) << PD->getShortDescription()
119  << PD->path.back()->getRanges();
120 
121  if (!IncludePath)
122  continue;
123 
124  PathPieces FlatPath = PD->path.flatten(/*ShouldFlattenMacros=*/true);
125  for (PathPieces::const_iterator PI = FlatPath.begin(),
126  PE = FlatPath.end();
127  PI != PE; ++PI) {
128  SourceLocation NoteLoc = (*PI)->getLocation().asLocation();
129  Diag.Report(NoteLoc, NoteID) << (*PI)->getString()
130  << (*PI)->getRanges();
131  }
132  }
133  }
134 };
135 } // end anonymous namespace
136 
137 //===----------------------------------------------------------------------===//
138 // AnalysisConsumer declaration.
139 //===----------------------------------------------------------------------===//
140 
141 namespace {
142 
143 class AnalysisConsumer : public AnalysisASTConsumer,
144  public RecursiveASTVisitor<AnalysisConsumer> {
145  enum {
146  AM_None = 0,
147  AM_Syntax = 0x1,
148  AM_Path = 0x2
149  };
150  typedef unsigned AnalysisMode;
151 
152  /// Mode of the analyzes while recursively visiting Decls.
153  AnalysisMode RecVisitorMode;
154  /// Bug Reporter to use while recursively visiting Decls.
155  BugReporter *RecVisitorBR;
156 
157 public:
158  ASTContext *Ctx;
159  const Preprocessor &PP;
160  const std::string OutDir;
161  AnalyzerOptionsRef Opts;
162  ArrayRef<std::string> Plugins;
163  CodeInjector *Injector;
164 
165  /// \brief Stores the declarations from the local translation unit.
166  /// Note, we pre-compute the local declarations at parse time as an
167  /// optimization to make sure we do not deserialize everything from disk.
168  /// The local declaration to all declarations ratio might be very small when
169  /// working with a PCH file.
170  SetOfDecls LocalTUDecls;
171 
172  // Set of PathDiagnosticConsumers. Owned by AnalysisManager.
173  PathDiagnosticConsumers PathConsumers;
174 
175  StoreManagerCreator CreateStoreMgr;
176  ConstraintManagerCreator CreateConstraintMgr;
177 
178  std::unique_ptr<CheckerManager> checkerMgr;
179  std::unique_ptr<AnalysisManager> Mgr;
180 
181  /// Time the analyzes time of each translation unit.
182  static llvm::Timer* TUTotalTimer;
183 
184  /// The information about analyzed functions shared throughout the
185  /// translation unit.
186  FunctionSummariesTy FunctionSummaries;
187 
188  AnalysisConsumer(const Preprocessor& pp,
189  const std::string& outdir,
190  AnalyzerOptionsRef opts,
191  ArrayRef<std::string> plugins,
192  CodeInjector *injector)
193  : RecVisitorMode(0), RecVisitorBR(nullptr), Ctx(nullptr), PP(pp),
194  OutDir(outdir), Opts(opts), Plugins(plugins), Injector(injector) {
195  DigestAnalyzerOptions();
196  if (Opts->PrintStats) {
197  llvm::EnableStatistics();
198  TUTotalTimer = new llvm::Timer("Analyzer Total Time");
199  }
200  }
201 
202  ~AnalysisConsumer() override {
203  if (Opts->PrintStats)
204  delete TUTotalTimer;
205  }
206 
207  void DigestAnalyzerOptions() {
208  if (Opts->AnalysisDiagOpt != PD_NONE) {
209  // Create the PathDiagnosticConsumer.
210  ClangDiagPathDiagConsumer *clangDiags =
211  new ClangDiagPathDiagConsumer(PP.getDiagnostics());
212  PathConsumers.push_back(clangDiags);
213 
214  if (Opts->AnalysisDiagOpt == PD_TEXT) {
215  clangDiags->enablePaths();
216 
217  } else if (!OutDir.empty()) {
218  switch (Opts->AnalysisDiagOpt) {
219  default:
220 #define ANALYSIS_DIAGNOSTICS(NAME, CMDFLAG, DESC, CREATEFN) \
221  case PD_##NAME: \
222  CREATEFN(*Opts.get(), PathConsumers, OutDir, PP); \
223  break;
224 #include "clang/StaticAnalyzer/Core/Analyses.def"
225  }
226  }
227  }
228 
229  // Create the analyzer component creators.
230  switch (Opts->AnalysisStoreOpt) {
231  default:
232  llvm_unreachable("Unknown store manager.");
233 #define ANALYSIS_STORE(NAME, CMDFLAG, DESC, CREATEFN) \
234  case NAME##Model: CreateStoreMgr = CREATEFN; break;
235 #include "clang/StaticAnalyzer/Core/Analyses.def"
236  }
237 
238  switch (Opts->AnalysisConstraintsOpt) {
239  default:
240  llvm_unreachable("Unknown constraint manager.");
241 #define ANALYSIS_CONSTRAINTS(NAME, CMDFLAG, DESC, CREATEFN) \
242  case NAME##Model: CreateConstraintMgr = CREATEFN; break;
243 #include "clang/StaticAnalyzer/Core/Analyses.def"
244  }
245  }
246 
247  void DisplayFunction(const Decl *D, AnalysisMode Mode,
249  if (!Opts->AnalyzerDisplayProgress)
250  return;
251 
252  SourceManager &SM = Mgr->getASTContext().getSourceManager();
254  if (Loc.isValid()) {
255  llvm::errs() << "ANALYZE";
256 
257  if (Mode == AM_Syntax)
258  llvm::errs() << " (Syntax)";
259  else if (Mode == AM_Path) {
260  llvm::errs() << " (Path, ";
261  switch (IMode) {
263  llvm::errs() << " Inline_Minimal";
264  break;
266  llvm::errs() << " Inline_Regular";
267  break;
268  }
269  llvm::errs() << ")";
270  }
271  else
272  assert(Mode == (AM_Syntax | AM_Path) && "Unexpected mode!");
273 
274  llvm::errs() << ": " << Loc.getFilename();
275  if (isa<FunctionDecl>(D) || isa<ObjCMethodDecl>(D)) {
276  const NamedDecl *ND = cast<NamedDecl>(D);
277  llvm::errs() << ' ' << *ND << '\n';
278  }
279  else if (isa<BlockDecl>(D)) {
280  llvm::errs() << ' ' << "block(line:" << Loc.getLine() << ",col:"
281  << Loc.getColumn() << '\n';
282  }
283  else if (const ObjCMethodDecl *MD = dyn_cast<ObjCMethodDecl>(D)) {
284  Selector S = MD->getSelector();
285  llvm::errs() << ' ' << S.getAsString();
286  }
287  }
288  }
289 
290  void Initialize(ASTContext &Context) override {
291  Ctx = &Context;
292  checkerMgr = createCheckerManager(*Opts, PP.getLangOpts(), Plugins,
293  PP.getDiagnostics());
294 
295  Mgr = llvm::make_unique<AnalysisManager>(
296  *Ctx, PP.getDiagnostics(), PP.getLangOpts(), PathConsumers,
297  CreateStoreMgr, CreateConstraintMgr, checkerMgr.get(), *Opts, Injector);
298  }
299 
300  /// \brief Store the top level decls in the set to be processed later on.
301  /// (Doing this pre-processing avoids deserialization of data from PCH.)
302  bool HandleTopLevelDecl(DeclGroupRef D) override;
303  void HandleTopLevelDeclInObjCContainer(DeclGroupRef D) override;
304 
305  void HandleTranslationUnit(ASTContext &C) override;
306 
307  /// \brief Determine which inlining mode should be used when this function is
308  /// analyzed. This allows to redefine the default inlining policies when
309  /// analyzing a given function.
311  getInliningModeForFunction(const Decl *D, const SetOfConstDecls &Visited);
312 
313  /// \brief Build the call graph for all the top level decls of this TU and
314  /// use it to define the order in which the functions should be visited.
315  void HandleDeclsCallGraph(const unsigned LocalTUDeclsSize);
316 
317  /// \brief Run analyzes(syntax or path sensitive) on the given function.
318  /// \param Mode - determines if we are requesting syntax only or path
319  /// sensitive only analysis.
320  /// \param VisitedCallees - The output parameter, which is populated with the
321  /// set of functions which should be considered analyzed after analyzing the
322  /// given root function.
323  void HandleCode(Decl *D, AnalysisMode Mode,
325  SetOfConstDecls *VisitedCallees = nullptr);
326 
327  void RunPathSensitiveChecks(Decl *D,
329  SetOfConstDecls *VisitedCallees);
330  void ActionExprEngine(Decl *D, bool ObjCGCEnabled,
332  SetOfConstDecls *VisitedCallees);
333 
334  /// Visitors for the RecursiveASTVisitor.
335  bool shouldWalkTypesOfTypeLocs() const { return false; }
336 
337  /// Handle callbacks for arbitrary Decls.
338  bool VisitDecl(Decl *D) {
339  AnalysisMode Mode = getModeForDecl(D, RecVisitorMode);
340  if (Mode & AM_Syntax)
341  checkerMgr->runCheckersOnASTDecl(D, *Mgr, *RecVisitorBR);
342  return true;
343  }
344 
345  bool VisitFunctionDecl(FunctionDecl *FD) {
346  IdentifierInfo *II = FD->getIdentifier();
347  if (II && II->getName().startswith("__inline"))
348  return true;
349 
350  // We skip function template definitions, as their semantics is
351  // only determined when they are instantiated.
352  if (FD->isThisDeclarationADefinition() &&
353  !FD->isDependentContext()) {
354  assert(RecVisitorMode == AM_Syntax || Mgr->shouldInlineCall() == false);
355  HandleCode(FD, RecVisitorMode);
356  }
357  return true;
358  }
359 
360  bool VisitObjCMethodDecl(ObjCMethodDecl *MD) {
361  if (MD->isThisDeclarationADefinition()) {
362  assert(RecVisitorMode == AM_Syntax || Mgr->shouldInlineCall() == false);
363  HandleCode(MD, RecVisitorMode);
364  }
365  return true;
366  }
367 
368  bool VisitBlockDecl(BlockDecl *BD) {
369  if (BD->hasBody()) {
370  assert(RecVisitorMode == AM_Syntax || Mgr->shouldInlineCall() == false);
371  // Since we skip function template definitions, we should skip blocks
372  // declared in those functions as well.
373  if (!BD->isDependentContext()) {
374  HandleCode(BD, RecVisitorMode);
375  }
376  }
377  return true;
378  }
379 
380  void AddDiagnosticConsumer(PathDiagnosticConsumer *Consumer) override {
381  PathConsumers.push_back(Consumer);
382  }
383 
384 private:
385  void storeTopLevelDecls(DeclGroupRef DG);
386 
387  /// \brief Check if we should skip (not analyze) the given function.
388  AnalysisMode getModeForDecl(Decl *D, AnalysisMode Mode);
389 
390 };
391 } // end anonymous namespace
392 
393 
394 //===----------------------------------------------------------------------===//
395 // AnalysisConsumer implementation.
396 //===----------------------------------------------------------------------===//
397 llvm::Timer* AnalysisConsumer::TUTotalTimer = nullptr;
398 
399 bool AnalysisConsumer::HandleTopLevelDecl(DeclGroupRef DG) {
400  storeTopLevelDecls(DG);
401  return true;
402 }
403 
404 void AnalysisConsumer::HandleTopLevelDeclInObjCContainer(DeclGroupRef DG) {
405  storeTopLevelDecls(DG);
406 }
407 
408 void AnalysisConsumer::storeTopLevelDecls(DeclGroupRef DG) {
409  for (DeclGroupRef::iterator I = DG.begin(), E = DG.end(); I != E; ++I) {
410 
411  // Skip ObjCMethodDecl, wait for the objc container to avoid
412  // analyzing twice.
413  if (isa<ObjCMethodDecl>(*I))
414  continue;
415 
416  LocalTUDecls.push_back(*I);
417  }
418 }
419 
420 static bool shouldSkipFunction(const Decl *D,
421  const SetOfConstDecls &Visited,
422  const SetOfConstDecls &VisitedAsTopLevel) {
423  if (VisitedAsTopLevel.count(D))
424  return true;
425 
426  // We want to re-analyse the functions as top level in the following cases:
427  // - The 'init' methods should be reanalyzed because
428  // ObjCNonNilReturnValueChecker assumes that '[super init]' never returns
429  // 'nil' and unless we analyze the 'init' functions as top level, we will
430  // not catch errors within defensive code.
431  // - We want to reanalyze all ObjC methods as top level to report Retain
432  // Count naming convention errors more aggressively.
433  if (isa<ObjCMethodDecl>(D))
434  return false;
435 
436  // Otherwise, if we visited the function before, do not reanalyze it.
437  return Visited.count(D);
438 }
439 
441 AnalysisConsumer::getInliningModeForFunction(const Decl *D,
442  const SetOfConstDecls &Visited) {
443  // We want to reanalyze all ObjC methods as top level to report Retain
444  // Count naming convention errors more aggressively. But we should tune down
445  // inlining when reanalyzing an already inlined function.
446  if (Visited.count(D)) {
447  assert(isa<ObjCMethodDecl>(D) &&
448  "We are only reanalyzing ObjCMethods.");
449  const ObjCMethodDecl *ObjCM = cast<ObjCMethodDecl>(D);
450  if (ObjCM->getMethodFamily() != OMF_init)
452  }
453 
455 }
456 
457 void AnalysisConsumer::HandleDeclsCallGraph(const unsigned LocalTUDeclsSize) {
458  // Build the Call Graph by adding all the top level declarations to the graph.
459  // Note: CallGraph can trigger deserialization of more items from a pch
460  // (though HandleInterestingDecl); triggering additions to LocalTUDecls.
461  // We rely on random access to add the initially processed Decls to CG.
462  CallGraph CG;
463  for (unsigned i = 0 ; i < LocalTUDeclsSize ; ++i) {
464  CG.addToCallGraph(LocalTUDecls[i]);
465  }
466 
467  // Walk over all of the call graph nodes in topological order, so that we
468  // analyze parents before the children. Skip the functions inlined into
469  // the previously processed functions. Use external Visited set to identify
470  // inlined functions. The topological order allows the "do not reanalyze
471  // previously inlined function" performance heuristic to be triggered more
472  // often.
473  SetOfConstDecls Visited;
474  SetOfConstDecls VisitedAsTopLevel;
475  llvm::ReversePostOrderTraversal<clang::CallGraph*> RPOT(&CG);
476  for (llvm::ReversePostOrderTraversal<clang::CallGraph*>::rpo_iterator
477  I = RPOT.begin(), E = RPOT.end(); I != E; ++I) {
478  NumFunctionTopLevel++;
479 
480  CallGraphNode *N = *I;
481  Decl *D = N->getDecl();
482 
483  // Skip the abstract root node.
484  if (!D)
485  continue;
486 
487  // Skip the functions which have been processed already or previously
488  // inlined.
489  if (shouldSkipFunction(D, Visited, VisitedAsTopLevel))
490  continue;
491 
492  // Analyze the function.
493  SetOfConstDecls VisitedCallees;
494 
495  HandleCode(D, AM_Path, getInliningModeForFunction(D, Visited),
496  (Mgr->options.InliningMode == All ? nullptr : &VisitedCallees));
497 
498  // Add the visited callees to the global visited set.
499  for (const Decl *Callee : VisitedCallees)
500  // Decls from CallGraph are already canonical. But Decls coming from
501  // CallExprs may be not. We should canonicalize them manually.
502  Visited.insert(isa<ObjCMethodDecl>(Callee) ? Callee
503  : Callee->getCanonicalDecl());
504  VisitedAsTopLevel.insert(D);
505  }
506 }
507 
508 void AnalysisConsumer::HandleTranslationUnit(ASTContext &C) {
509  // Don't run the actions if an error has occurred with parsing the file.
510  DiagnosticsEngine &Diags = PP.getDiagnostics();
511  if (Diags.hasErrorOccurred() || Diags.hasFatalErrorOccurred())
512  return;
513 
514  // Don't analyze if the user explicitly asked for no checks to be performed
515  // on this file.
516  if (Opts->DisableAllChecks)
517  return;
518 
519  {
520  if (TUTotalTimer) TUTotalTimer->startTimer();
521 
522  // Introduce a scope to destroy BR before Mgr.
523  BugReporter BR(*Mgr);
525  checkerMgr->runCheckersOnASTDecl(TU, *Mgr, BR);
526 
527  // Run the AST-only checks using the order in which functions are defined.
528  // If inlining is not turned on, use the simplest function order for path
529  // sensitive analyzes as well.
530  RecVisitorMode = AM_Syntax;
531  if (!Mgr->shouldInlineCall())
532  RecVisitorMode |= AM_Path;
533  RecVisitorBR = &BR;
534 
535  // Process all the top level declarations.
536  //
537  // Note: TraverseDecl may modify LocalTUDecls, but only by appending more
538  // entries. Thus we don't use an iterator, but rely on LocalTUDecls
539  // random access. By doing so, we automatically compensate for iterators
540  // possibly being invalidated, although this is a bit slower.
541  const unsigned LocalTUDeclsSize = LocalTUDecls.size();
542  for (unsigned i = 0 ; i < LocalTUDeclsSize ; ++i) {
543  TraverseDecl(LocalTUDecls[i]);
544  }
545 
546  if (Mgr->shouldInlineCall())
547  HandleDeclsCallGraph(LocalTUDeclsSize);
548 
549  // After all decls handled, run checkers on the entire TranslationUnit.
550  checkerMgr->runCheckersOnEndOfTranslationUnit(TU, *Mgr, BR);
551 
552  RecVisitorBR = nullptr;
553  }
554 
555  // Explicitly destroy the PathDiagnosticConsumer. This will flush its output.
556  // FIXME: This should be replaced with something that doesn't rely on
557  // side-effects in PathDiagnosticConsumer's destructor. This is required when
558  // used with option -disable-free.
559  Mgr.reset();
560 
561  if (TUTotalTimer) TUTotalTimer->stopTimer();
562 
563  // Count how many basic blocks we have not covered.
564  NumBlocksInAnalyzedFunctions = FunctionSummaries.getTotalNumBasicBlocks();
565  if (NumBlocksInAnalyzedFunctions > 0)
566  PercentReachableBlocks =
567  (FunctionSummaries.getTotalNumVisitedBasicBlocks() * 100) /
568  NumBlocksInAnalyzedFunctions;
569 
570 }
571 
572 static std::string getFunctionName(const Decl *D) {
573  if (const ObjCMethodDecl *ID = dyn_cast<ObjCMethodDecl>(D)) {
574  return ID->getSelector().getAsString();
575  }
576  if (const FunctionDecl *ND = dyn_cast<FunctionDecl>(D)) {
577  IdentifierInfo *II = ND->getIdentifier();
578  if (II)
579  return II->getName();
580  }
581  return "";
582 }
583 
584 AnalysisConsumer::AnalysisMode
585 AnalysisConsumer::getModeForDecl(Decl *D, AnalysisMode Mode) {
586  if (!Opts->AnalyzeSpecificFunction.empty() &&
587  getFunctionName(D) != Opts->AnalyzeSpecificFunction)
588  return AM_None;
589 
590  // Unless -analyze-all is specified, treat decls differently depending on
591  // where they came from:
592  // - Main source file: run both path-sensitive and non-path-sensitive checks.
593  // - Header files: run non-path-sensitive checks only.
594  // - System headers: don't run any checks.
595  SourceManager &SM = Ctx->getSourceManager();
596  const Stmt *Body = D->getBody();
597  SourceLocation SL = Body ? Body->getLocStart() : D->getLocation();
598  SL = SM.getExpansionLoc(SL);
599 
600  if (!Opts->AnalyzeAll && !SM.isWrittenInMainFile(SL)) {
601  if (SL.isInvalid() || SM.isInSystemHeader(SL))
602  return AM_None;
603  return Mode & ~AM_Path;
604  }
605 
606  return Mode;
607 }
608 
609 void AnalysisConsumer::HandleCode(Decl *D, AnalysisMode Mode,
611  SetOfConstDecls *VisitedCallees) {
612  if (!D->hasBody())
613  return;
614  Mode = getModeForDecl(D, Mode);
615  if (Mode == AM_None)
616  return;
617 
618  DisplayFunction(D, Mode, IMode);
619  CFG *DeclCFG = Mgr->getCFG(D);
620  if (DeclCFG) {
621  unsigned CFGSize = DeclCFG->size();
622  MaxCFGSize = MaxCFGSize < CFGSize ? CFGSize : MaxCFGSize;
623  }
624 
625  // Clear the AnalysisManager of old AnalysisDeclContexts.
626  Mgr->ClearContexts();
627  BugReporter BR(*Mgr);
628 
629  if (Mode & AM_Syntax)
630  checkerMgr->runCheckersOnASTBody(D, *Mgr, BR);
631  if ((Mode & AM_Path) && checkerMgr->hasPathSensitiveCheckers()) {
632  RunPathSensitiveChecks(D, IMode, VisitedCallees);
633  if (IMode != ExprEngine::Inline_Minimal)
634  NumFunctionsAnalyzed++;
635  }
636 }
637 
638 //===----------------------------------------------------------------------===//
639 // Path-sensitive checking.
640 //===----------------------------------------------------------------------===//
641 
642 void AnalysisConsumer::ActionExprEngine(Decl *D, bool ObjCGCEnabled,
644  SetOfConstDecls *VisitedCallees) {
645  // Construct the analysis engine. First check if the CFG is valid.
646  // FIXME: Inter-procedural analysis will need to handle invalid CFGs.
647  if (!Mgr->getCFG(D))
648  return;
649 
650  // See if the LiveVariables analysis scales.
651  if (!Mgr->getAnalysisDeclContext(D)->getAnalysis<RelaxedLiveVariables>())
652  return;
653 
654  ExprEngine Eng(*Mgr, ObjCGCEnabled, VisitedCallees, &FunctionSummaries,IMode);
655 
656  // Set the graph auditor.
657  std::unique_ptr<ExplodedNode::Auditor> Auditor;
658  if (Mgr->options.visualizeExplodedGraphWithUbiGraph) {
659  Auditor = CreateUbiViz();
660  ExplodedNode::SetAuditor(Auditor.get());
661  }
662 
663  // Execute the worklist algorithm.
664  Eng.ExecuteWorkList(Mgr->getAnalysisDeclContextManager().getStackFrame(D),
665  Mgr->options.getMaxNodesPerTopLevelFunction());
666 
667  // Release the auditor (if any) so that it doesn't monitor the graph
668  // created BugReporter.
669  ExplodedNode::SetAuditor(nullptr);
670 
671  // Visualize the exploded graph.
672  if (Mgr->options.visualizeExplodedGraphWithGraphViz)
673  Eng.ViewGraph(Mgr->options.TrimGraph);
674 
675  // Display warnings.
676  Eng.getBugReporter().FlushReports();
677 }
678 
679 void AnalysisConsumer::RunPathSensitiveChecks(Decl *D,
681  SetOfConstDecls *Visited) {
682 
683  switch (Mgr->getLangOpts().getGC()) {
684  case LangOptions::NonGC:
685  ActionExprEngine(D, false, IMode, Visited);
686  break;
687 
688  case LangOptions::GCOnly:
689  ActionExprEngine(D, true, IMode, Visited);
690  break;
691 
693  ActionExprEngine(D, false, IMode, Visited);
694  ActionExprEngine(D, true, IMode, Visited);
695  break;
696  }
697 }
698 
699 //===----------------------------------------------------------------------===//
700 // AnalysisConsumer creation.
701 //===----------------------------------------------------------------------===//
702 
703 std::unique_ptr<AnalysisASTConsumer>
705  // Disable the effects of '-Werror' when using the AnalysisConsumer.
707 
708  AnalyzerOptionsRef analyzerOpts = CI.getAnalyzerOpts();
709  bool hasModelPath = analyzerOpts->Config.count("model-path") > 0;
710 
711  return llvm::make_unique<AnalysisConsumer>(
712  CI.getPreprocessor(), CI.getFrontendOpts().OutputFile, analyzerOpts,
714  hasModelPath ? new ModelInjector(CI) : nullptr);
715 }
716 
717 //===----------------------------------------------------------------------===//
718 // Ubigraph Visualization. FIXME: Move to separate file.
719 //===----------------------------------------------------------------------===//
720 
721 namespace {
722 
723 class UbigraphViz : public ExplodedNode::Auditor {
724  std::unique_ptr<raw_ostream> Out;
725  std::string Filename;
726  unsigned Cntr;
727 
728  typedef llvm::DenseMap<void*,unsigned> VMap;
729  VMap M;
730 
731 public:
732  UbigraphViz(std::unique_ptr<raw_ostream> Out, StringRef Filename);
733 
734  ~UbigraphViz() override;
735 
736  void AddEdge(ExplodedNode *Src, ExplodedNode *Dst) override;
737 };
738 
739 } // end anonymous namespace
740 
741 static std::unique_ptr<ExplodedNode::Auditor> CreateUbiViz() {
743  int FD;
744  llvm::sys::fs::createTemporaryFile("llvm_ubi", "", FD, P);
745  llvm::errs() << "Writing '" << P << "'.\n";
746 
747  auto Stream = llvm::make_unique<llvm::raw_fd_ostream>(FD, true);
748 
749  return llvm::make_unique<UbigraphViz>(std::move(Stream), P);
750 }
751 
752 void UbigraphViz::AddEdge(ExplodedNode *Src, ExplodedNode *Dst) {
753 
754  assert (Src != Dst && "Self-edges are not allowed.");
755 
756  // Lookup the Src. If it is a new node, it's a root.
757  VMap::iterator SrcI= M.find(Src);
758  unsigned SrcID;
759 
760  if (SrcI == M.end()) {
761  M[Src] = SrcID = Cntr++;
762  *Out << "('vertex', " << SrcID << ", ('color','#00ff00'))\n";
763  }
764  else
765  SrcID = SrcI->second;
766 
767  // Lookup the Dst.
768  VMap::iterator DstI= M.find(Dst);
769  unsigned DstID;
770 
771  if (DstI == M.end()) {
772  M[Dst] = DstID = Cntr++;
773  *Out << "('vertex', " << DstID << ")\n";
774  }
775  else {
776  // We have hit DstID before. Change its style to reflect a cache hit.
777  DstID = DstI->second;
778  *Out << "('change_vertex_style', " << DstID << ", 1)\n";
779  }
780 
781  // Add the edge.
782  *Out << "('edge', " << SrcID << ", " << DstID
783  << ", ('arrow','true'), ('oriented', 'true'))\n";
784 }
785 
786 UbigraphViz::UbigraphViz(std::unique_ptr<raw_ostream> OutStream,
787  StringRef Filename)
788  : Out(std::move(OutStream)), Filename(Filename), Cntr(0) {
789 
790  *Out << "('vertex_style_attribute', 0, ('shape', 'icosahedron'))\n";
791  *Out << "('vertex_style', 1, 0, ('shape', 'sphere'), ('color', '#ffcc66'),"
792  " ('size', '1.5'))\n";
793 }
794 
795 UbigraphViz::~UbigraphViz() {
796  Out.reset();
797  llvm::errs() << "Running 'ubiviz' program... ";
798  std::string ErrMsg;
799  std::string Ubiviz;
800  if (auto Path = llvm::sys::findProgramByName("ubiviz"))
801  Ubiviz = *Path;
802  std::vector<const char*> args;
803  args.push_back(Ubiviz.c_str());
804  args.push_back(Filename.c_str());
805  args.push_back(nullptr);
806 
807  if (llvm::sys::ExecuteAndWait(Ubiviz, &args[0], nullptr, nullptr, 0, 0,
808  &ErrMsg)) {
809  llvm::errs() << "Error viewing graph: " << ErrMsg << "\n";
810  }
811 
812  // Delete the file.
813  llvm::sys::fs::remove(Filename);
814 }
The AST-based call graph.
Definition: CallGraph.h:34
std::string OutputFile
The output file, if any.
FunctionDecl - An instance of this class is created to represent a function declaration or definition...
Definition: Decl.h:1483
static DiagnosticBuilder Diag(DiagnosticsEngine *Diags, const LangOptions &Features, FullSourceLoc TokLoc, const char *TokBegin, const char *TokRangeBegin, const char *TokRangeEnd, unsigned DiagID)
Produce a diagnostic highlighting some portion of a literal.
Smart pointer class that efficiently represents Objective-C method names.
unsigned getColumn() const
Return the presumed column number of this location.
bool isValid() const
Defines the clang::FileManager interface and associated types.
IdentifierInfo * getIdentifier() const
getIdentifier - Get the identifier that names this declaration, if there is one.
Definition: Decl.h:164
STATISTIC(NumFunctionTopLevel,"The # of functions at top level.")
Defines the SourceManager interface.
Decl * getDecl() const
Definition: CallGraph.h:163
iterator end()
Definition: DeclGroup.h:108
Decl - This represents one declaration (or definition), e.g.
Definition: DeclBase.h:77
PathPieces flatten(bool ShouldFlattenMacros) const
bool hasErrorOccurred() const
Definition: Diagnostic.h:573
bool isDependentContext() const
Determines whether this context is dependent on a template parameter.
Definition: DeclBase.cpp:884
PathDiagnosticLocation getLocation() const
ObjCMethodDecl - Represents an instance or class method declaration.
Definition: DeclObjC.h:113
std::unique_ptr< ConstraintManager >(* ConstraintManagerCreator)(ProgramStateManager &, SubEngine *)
Definition: ProgramState.h:42
FullSourceLoc asLocation() const
PathDiagnostic - PathDiagnostic objects represent a single path-sensitive diagnostic.
One of these records is kept for each identifier that is lexed.
Follow the default settings for inlining callees.
Definition: ExprEngine.h:53
Holds long-lived AST nodes (such as types and decls) that can be referred to throughout the semantic ...
Definition: ASTContext.h:91
Defines the clang::CodeInjector interface which is responsible for injecting AST of function definiti...
std::deque< Decl * > SetOfDecls
const LangOptions & getLangOpts() const
Definition: Preprocessor.h:683
bool isThisDeclarationADefinition() const
Returns whether this specific method is a definition.
Definition: DeclObjC.h:497
FrontendOptions & getFrontendOpts()
ObjCMethodFamily getMethodFamily() const
Determines the family of this method.
Definition: DeclObjC.cpp:885
unsigned size() const
size - Return the total number of CFGBlocks within the CFG This is simply a renaming of the getNumBlo...
Definition: CFG.h:936
Concrete class used by the front-end to report problems and issues.
Definition: Diagnostic.h:135
iterator begin()
Definition: DeclGroup.h:102
unsigned getLine() const
Return the presumed line number of this location.
A class that does preorder depth-first traversal on the entire Clang AST and visits each node...
detail::InMemoryDirectory::const_iterator I
Preprocessor & getPreprocessor() const
Return the current preprocessor.
bool isInvalid() const
AnalyzerOptionsRef getAnalyzerOpts()
AnnotatingParser & P
StringRef Filename
Definition: Format.cpp:1723
ASTContext * Context
static bool shouldSkipFunction(const Decl *D, const SetOfConstDecls &Visited, const SetOfConstDecls &VisitedAsTopLevel)
ID
Defines the set of possible language-specific address spaces.
Definition: AddressSpaces.h:27
SourceManager & SM
InliningModes
The modes of inlining, which override the default analysis-wide settings.
Definition: ExprEngine.h:51
BlockDecl - This represents a block literal declaration, which is like an unnamed FunctionDecl...
Definition: Decl.h:3369
std::vector< std::string > Plugins
The list of plugins to load.
StringRef getName() const
Return the actual identifier string.
bool hasFatalErrorOccurred() const
Definition: Diagnostic.h:580
CFG - Represents a source-level, intra-procedural CFG that represents the control-flow of a Stmt...
Definition: CFG.h:721
StringRef getShortDescription() const
TranslationUnitDecl * getTranslationUnitDecl() const
Definition: ASTContext.h:875
Defines the clang::Preprocessor interface.
bool isWrittenInMainFile(SourceLocation Loc) const
Returns true if the spelling location for the given location is in the main file buffer.
bool isInSystemHeader(SourceLocation Loc) const
Returns if a SourceLocation is in a system header.
This file defines the clang::ento::ModelInjector class which implements the clang::CodeInjector inter...
Represents an unpacked "presumed" location which can be presented to the user.
BugReporter is a utility class for generating PathDiagnostics for analysis.
Definition: BugReporter.h:388
#define false
Definition: stdbool.h:33
const char * getFilename() const
Return the presumed filename of this location.
CompilerInstance - Helper class for managing a single instance of the Clang compiler.
Encodes a location in the source.
const TemplateArgument * iterator
Definition: Type.h:4070
std::vector< PathDiagnosticConsumer * > PathDiagnosticConsumers
virtual Stmt * getBody() const
getBody - If this Decl represents a declaration for a body of code, such as a function or method defi...
Definition: DeclBase.h:860
std::string getAsString() const
Derive the full selector name (e.g.
Do minimal inlining of callees.
Definition: ExprEngine.h:55
DiagnosticsEngine & getDiagnostics() const
Definition: Preprocessor.h:680
static std::string getFunctionName(const Decl *D)
CodeInjector is an interface which is responsible for injecting AST of function definitions that may ...
Definition: CodeInjector.h:36
bool isThisDeclarationADefinition() const
isThisDeclarationADefinition - Returns whether this specific declaration of the function is also a de...
Definition: Decl.h:1725
detail::InMemoryDirectory::const_iterator E
std::unique_ptr< AnalysisASTConsumer > CreateAnalysisConsumer(CompilerInstance &CI)
CreateAnalysisConsumer - Creates an ASTConsumer to run various code analysis passes.
void setWarningsAsErrors(bool Val)
When set to true, any warnings reported are issued as errors.
Definition: Diagnostic.h:451
static std::unique_ptr< ExplodedNode::Auditor > CreateUbiViz()
static void SetAuditor(Auditor *A)
Defines the C++ Decl subclasses, other than those for templates (found in DeclTemplate.h) and friends (in DeclFriend.h).
void addToCallGraph(Decl *D)
Populate the call graph with the functions in the given declaration.
Definition: CallGraph.h:53
TranslationUnitDecl - The top declaration context.
Definition: Decl.h:79
SourceLocation getLocation() const
Definition: DeclBase.h:384
NamedDecl - This represents a decl with a name.
Definition: Decl.h:145
SourceLocation getExpansionLoc(SourceLocation Loc) const
Given a SourceLocation object Loc, return the expansion location referenced by the ID...
virtual bool hasBody() const
Returns true if this Decl represents a declaration for a body of code, such as a function or method d...
Definition: DeclBase.h:866
std::unique_ptr< CheckerManager > createCheckerManager(AnalyzerOptions &opts, const LangOptions &langOpts, ArrayRef< std::string > plugins, DiagnosticsEngine &diags)
This class handles loading and caching of source files into memory.
Engages in a tight little dance with the lexer to efficiently preprocess tokens.
Definition: Preprocessor.h:96
std::unique_ptr< StoreManager >(* StoreManagerCreator)(ProgramStateManager &)
Definition: ProgramState.h:44
PresumedLoc getPresumedLoc(SourceLocation Loc, bool UseLineDirectives=true) const
Returns the "presumed" location of a SourceLocation specifies.