1 //===- DeclBase.h - Base Classes for representing declarations --*- C++ -*-===//
2 //
3 // Part of the LLVM Project, under the Apache License v2.0 with LLVM Exceptions.
4 // See https://llvm.org/LICENSE.txt for license information.
5 // SPDX-License-Identifier: Apache-2.0 WITH LLVM-exception
6 //
7 //===----------------------------------------------------------------------===//
8 //
9 //  This file defines the Decl and DeclContext interfaces.
10 //
11 //===----------------------------------------------------------------------===//
12 
13 #ifndef LLVM_CLANG_AST_DECLBASE_H
14 #define LLVM_CLANG_AST_DECLBASE_H
15 
16 #include "clang/AST/ASTDumperUtils.h"
17 #include "clang/AST/AttrIterator.h"
18 #include "clang/AST/DeclarationName.h"
19 #include "clang/Basic/IdentifierTable.h"
20 #include "clang/Basic/LLVM.h"
21 #include "clang/Basic/SourceLocation.h"
22 #include "clang/Basic/Specifiers.h"
23 #include "llvm/ADT/ArrayRef.h"
24 #include "llvm/ADT/PointerIntPair.h"
25 #include "llvm/ADT/PointerUnion.h"
26 #include "llvm/ADT/iterator.h"
27 #include "llvm/ADT/iterator_range.h"
28 #include "llvm/Support/Casting.h"
29 #include "llvm/Support/Compiler.h"
30 #include "llvm/Support/PrettyStackTrace.h"
31 #include "llvm/Support/VersionTuple.h"
32 #include <algorithm>
33 #include <cassert>
34 #include <cstddef>
35 #include <iterator>
36 #include <string>
37 #include <type_traits>
38 #include <utility>
39 
40 namespace clang {
41 
42 class ASTContext;
43 class ASTMutationListener;
44 class Attr;
45 class BlockDecl;
46 class DeclContext;
47 class ExternalSourceSymbolAttr;
48 class FunctionDecl;
49 class FunctionType;
50 class IdentifierInfo;
51 enum Linkage : unsigned char;
52 class LinkageSpecDecl;
53 class Module;
54 class NamedDecl;
55 class ObjCCategoryDecl;
56 class ObjCCategoryImplDecl;
57 class ObjCContainerDecl;
58 class ObjCImplDecl;
59 class ObjCImplementationDecl;
60 class ObjCInterfaceDecl;
61 class ObjCMethodDecl;
62 class ObjCProtocolDecl;
63 struct PrintingPolicy;
64 class RecordDecl;
65 class SourceManager;
66 class Stmt;
67 class StoredDeclsMap;
68 class TemplateDecl;
69 class TemplateParameterList;
70 class TranslationUnitDecl;
71 class UsingDirectiveDecl;
72 
73 /// Captures the result of checking the availability of a
74 /// declaration.
75 enum AvailabilityResult {
76   AR_Available = 0,
77   AR_NotYetIntroduced,
78   AR_Deprecated,
79   AR_Unavailable
80 };
81 
82 /// Decl - This represents one declaration (or definition), e.g. a variable,
83 /// typedef, function, struct, etc.
84 ///
85 /// Note: There are objects tacked on before the *beginning* of Decl
86 /// (and its subclasses) in its Decl::operator new(). Proper alignment
87 /// of all subclasses (not requiring more than the alignment of Decl) is
88 /// asserted in DeclBase.cpp.
89 class alignas(8) Decl {
90 public:
91   /// Lists the kind of concrete classes of Decl.
92   enum Kind {
93 #define DECL(DERIVED, BASE) DERIVED,
94 #define ABSTRACT_DECL(DECL)
95 #define DECL_RANGE(BASE, START, END) \
96         first##BASE = START, last##BASE = END,
97 #define LAST_DECL_RANGE(BASE, START, END) \
98         first##BASE = START, last##BASE = END
99 #include "clang/AST/DeclNodes.inc"
100   };
101 
102   /// A placeholder type used to construct an empty shell of a
103   /// decl-derived type that will be filled in later (e.g., by some
104   /// deserialization method).
105   struct EmptyShell {};
106 
107   /// IdentifierNamespace - The different namespaces in which
108   /// declarations may appear.  According to C99 6.2.3, there are
109   /// four namespaces, labels, tags, members and ordinary
110   /// identifiers.  C++ describes lookup completely differently:
111   /// certain lookups merely "ignore" certain kinds of declarations,
112   /// usually based on whether the declaration is of a type, etc.
113   ///
114   /// These are meant as bitmasks, so that searches in
115   /// C++ can look into the "tag" namespace during ordinary lookup.
116   ///
117   /// Decl currently provides 15 bits of IDNS bits.
118   enum IdentifierNamespace {
119     /// Labels, declared with 'x:' and referenced with 'goto x'.
120     IDNS_Label               = 0x0001,
121 
122     /// Tags, declared with 'struct foo;' and referenced with
123     /// 'struct foo'.  All tags are also types.  This is what
124     /// elaborated-type-specifiers look for in C.
125     /// This also contains names that conflict with tags in the
126     /// same scope but that are otherwise ordinary names (non-type
127     /// template parameters and indirect field declarations).
128     IDNS_Tag                 = 0x0002,
129 
130     /// Types, declared with 'struct foo', typedefs, etc.
131     /// This is what elaborated-type-specifiers look for in C++,
132     /// but note that it's ill-formed to find a non-tag.
133     IDNS_Type                = 0x0004,
134 
135     /// Members, declared with object declarations within tag
136     /// definitions.  In C, these can only be found by "qualified"
137     /// lookup in member expressions.  In C++, they're found by
138     /// normal lookup.
139     IDNS_Member              = 0x0008,
140 
141     /// Namespaces, declared with 'namespace foo {}'.
142     /// Lookup for nested-name-specifiers find these.
143     IDNS_Namespace           = 0x0010,
144 
145     /// Ordinary names.  In C, everything that's not a label, tag,
146     /// member, or function-local extern ends up here.
147     IDNS_Ordinary            = 0x0020,
148 
149     /// Objective C \@protocol.
150     IDNS_ObjCProtocol        = 0x0040,
151 
152     /// This declaration is a friend function.  A friend function
153     /// declaration is always in this namespace but may also be in
154     /// IDNS_Ordinary if it was previously declared.
155     IDNS_OrdinaryFriend      = 0x0080,
156 
157     /// This declaration is a friend class.  A friend class
158     /// declaration is always in this namespace but may also be in
159     /// IDNS_Tag|IDNS_Type if it was previously declared.
160     IDNS_TagFriend           = 0x0100,
161 
162     /// This declaration is a using declaration.  A using declaration
163     /// *introduces* a number of other declarations into the current
164     /// scope, and those declarations use the IDNS of their targets,
165     /// but the actual using declarations go in this namespace.
166     IDNS_Using               = 0x0200,
167 
168     /// This declaration is a C++ operator declared in a non-class
169     /// context.  All such operators are also in IDNS_Ordinary.
170     /// C++ lexical operator lookup looks for these.
171     IDNS_NonMemberOperator   = 0x0400,
172 
173     /// This declaration is a function-local extern declaration of a
174     /// variable or function. This may also be IDNS_Ordinary if it
175     /// has been declared outside any function. These act mostly like
176     /// invisible friend declarations, but are also visible to unqualified
177     /// lookup within the scope of the declaring function.
178     IDNS_LocalExtern         = 0x0800,
179 
180     /// This declaration is an OpenMP user defined reduction construction.
181     IDNS_OMPReduction        = 0x1000,
182 
183     /// This declaration is an OpenMP user defined mapper.
184     IDNS_OMPMapper           = 0x2000,
185   };
186 
187   /// ObjCDeclQualifier - 'Qualifiers' written next to the return and
188   /// parameter types in method declarations.  Other than remembering
189   /// them and mangling them into the method's signature string, these
190   /// are ignored by the compiler; they are consumed by certain
191   /// remote-messaging frameworks.
192   ///
193   /// in, inout, and out are mutually exclusive and apply only to
194   /// method parameters.  bycopy and byref are mutually exclusive and
195   /// apply only to method parameters (?).  oneway applies only to
196   /// results.  All of these expect their corresponding parameter to
197   /// have a particular type.  None of this is currently enforced by
198   /// clang.
199   ///
200   /// This should be kept in sync with ObjCDeclSpec::ObjCDeclQualifier.
201   enum ObjCDeclQualifier {
202     OBJC_TQ_None = 0x0,
203     OBJC_TQ_In = 0x1,
204     OBJC_TQ_Inout = 0x2,
205     OBJC_TQ_Out = 0x4,
206     OBJC_TQ_Bycopy = 0x8,
207     OBJC_TQ_Byref = 0x10,
208     OBJC_TQ_Oneway = 0x20,
209 
210     /// The nullability qualifier is set when the nullability of the
211     /// result or parameter was expressed via a context-sensitive
212     /// keyword.
213     OBJC_TQ_CSNullability = 0x40
214   };
215 
216   /// The kind of ownership a declaration has, for visibility purposes.
217   /// This enumeration is designed such that higher values represent higher
218   /// levels of name hiding.
219   enum class ModuleOwnershipKind : unsigned {
220     /// This declaration is not owned by a module.
221     Unowned,
222 
223     /// This declaration has an owning module, but is globally visible
224     /// (typically because its owning module is visible and we know that
225     /// modules cannot later become hidden in this compilation).
226     /// After serialization and deserialization, this will be converted
227     /// to VisibleWhenImported.
228     Visible,
229 
230     /// This declaration has an owning module, and is visible when that
231     /// module is imported.
232     VisibleWhenImported,
233 
234     /// This declaration has an owning module, but is only visible to
235     /// lookups that occur within that module.
236     ModulePrivate
237   };
238 
239 protected:
240   /// The next declaration within the same lexical
241   /// DeclContext. These pointers form the linked list that is
242   /// traversed via DeclContext's decls_begin()/decls_end().
243   ///
244   /// The extra two bits are used for the ModuleOwnershipKind.
245   llvm::PointerIntPair<Decl *, 2, ModuleOwnershipKind> NextInContextAndBits;
246 
247 private:
248   friend class DeclContext;
249 
250   struct MultipleDC {
251     DeclContext *SemanticDC;
252     DeclContext *LexicalDC;
253   };
254 
255   /// DeclCtx - Holds either a DeclContext* or a MultipleDC*.
256   /// For declarations that don't contain C++ scope specifiers, it contains
257   /// the DeclContext where the Decl was declared.
258   /// For declarations with C++ scope specifiers, it contains a MultipleDC*
259   /// with the context where it semantically belongs (SemanticDC) and the
260   /// context where it was lexically declared (LexicalDC).
261   /// e.g.:
262   ///
263   ///   namespace A {
264   ///      void f(); // SemanticDC == LexicalDC == 'namespace A'
265   ///   }
266   ///   void A::f(); // SemanticDC == namespace 'A'
267   ///                // LexicalDC == global namespace
268   llvm::PointerUnion<DeclContext*, MultipleDC*> DeclCtx;
269 
isInSemaDC()270   bool isInSemaDC() const { return DeclCtx.is<DeclContext*>(); }
isOutOfSemaDC()271   bool isOutOfSemaDC() const { return DeclCtx.is<MultipleDC*>(); }
272 
getMultipleDC()273   MultipleDC *getMultipleDC() const {
274     return DeclCtx.get<MultipleDC*>();
275   }
276 
getSemanticDC()277   DeclContext *getSemanticDC() const {
278     return DeclCtx.get<DeclContext*>();
279   }
280 
281   /// Loc - The location of this decl.
282   SourceLocation Loc;
283 
284   /// DeclKind - This indicates which class this is.
285   unsigned DeclKind : 7;
286 
287   /// InvalidDecl - This indicates a semantic error occurred.
288   unsigned InvalidDecl :  1;
289 
290   /// HasAttrs - This indicates whether the decl has attributes or not.
291   unsigned HasAttrs : 1;
292 
293   /// Implicit - Whether this declaration was implicitly generated by
294   /// the implementation rather than explicitly written by the user.
295   unsigned Implicit : 1;
296 
297   /// Whether this declaration was "used", meaning that a definition is
298   /// required.
299   unsigned Used : 1;
300 
301   /// Whether this declaration was "referenced".
302   /// The difference with 'Used' is whether the reference appears in a
303   /// evaluated context or not, e.g. functions used in uninstantiated templates
304   /// are regarded as "referenced" but not "used".
305   unsigned Referenced : 1;
306 
307   /// Whether this declaration is a top-level declaration (function,
308   /// global variable, etc.) that is lexically inside an objc container
309   /// definition.
310   unsigned TopLevelDeclInObjCContainer : 1;
311 
312   /// Whether statistic collection is enabled.
313   static bool StatisticsEnabled;
314 
315 protected:
316   friend class ASTDeclReader;
317   friend class ASTDeclWriter;
318   friend class ASTNodeImporter;
319   friend class ASTReader;
320   friend class CXXClassMemberWrapper;
321   friend class LinkageComputer;
322   template<typename decl_type> friend class Redeclarable;
323 
324   /// Access - Used by C++ decls for the access specifier.
325   // NOTE: VC++ treats enums as signed, avoid using the AccessSpecifier enum
326   unsigned Access : 2;
327 
328   /// Whether this declaration was loaded from an AST file.
329   unsigned FromASTFile : 1;
330 
331   /// IdentifierNamespace - This specifies what IDNS_* namespace this lives in.
332   unsigned IdentifierNamespace : 14;
333 
334   /// If 0, we have not computed the linkage of this declaration.
335   /// Otherwise, it is the linkage + 1.
336   mutable unsigned CacheValidAndLinkage : 3;
337 
338   /// Allocate memory for a deserialized declaration.
339   ///
340   /// This routine must be used to allocate memory for any declaration that is
341   /// deserialized from a module file.
342   ///
343   /// \param Size The size of the allocated object.
344   /// \param Ctx The context in which we will allocate memory.
345   /// \param ID The global ID of the deserialized declaration.
346   /// \param Extra The amount of extra space to allocate after the object.
347   void *operator new(std::size_t Size, const ASTContext &Ctx, unsigned ID,
348                      std::size_t Extra = 0);
349 
350   /// Allocate memory for a non-deserialized declaration.
351   void *operator new(std::size_t Size, const ASTContext &Ctx,
352                      DeclContext *Parent, std::size_t Extra = 0);
353 
354 private:
355   bool AccessDeclContextSanity() const;
356 
357   /// Get the module ownership kind to use for a local lexical child of \p DC,
358   /// which may be either a local or (rarely) an imported declaration.
getModuleOwnershipKindForChildOf(DeclContext * DC)359   static ModuleOwnershipKind getModuleOwnershipKindForChildOf(DeclContext *DC) {
360     if (DC) {
361       auto *D = cast<Decl>(DC);
362       auto MOK = D->getModuleOwnershipKind();
363       if (MOK != ModuleOwnershipKind::Unowned &&
364           (!D->isFromASTFile() || D->hasLocalOwningModuleStorage()))
365         return MOK;
366       // If D is not local and we have no local module storage, then we don't
367       // need to track module ownership at all.
368     }
369     return ModuleOwnershipKind::Unowned;
370   }
371 
372 public:
373   Decl() = delete;
374   Decl(const Decl&) = delete;
375   Decl(Decl &&) = delete;
376   Decl &operator=(const Decl&) = delete;
377   Decl &operator=(Decl&&) = delete;
378 
379 protected:
Decl(Kind DK,DeclContext * DC,SourceLocation L)380   Decl(Kind DK, DeclContext *DC, SourceLocation L)
381       : NextInContextAndBits(nullptr, getModuleOwnershipKindForChildOf(DC)),
382         DeclCtx(DC), Loc(L), DeclKind(DK), InvalidDecl(false), HasAttrs(false),
383         Implicit(false), Used(false), Referenced(false),
384         TopLevelDeclInObjCContainer(false), Access(AS_none), FromASTFile(0),
385         IdentifierNamespace(getIdentifierNamespaceForKind(DK)),
386         CacheValidAndLinkage(0) {
387     if (StatisticsEnabled) add(DK);
388   }
389 
Decl(Kind DK,EmptyShell Empty)390   Decl(Kind DK, EmptyShell Empty)
391       : DeclKind(DK), InvalidDecl(false), HasAttrs(false), Implicit(false),
392         Used(false), Referenced(false), TopLevelDeclInObjCContainer(false),
393         Access(AS_none), FromASTFile(0),
394         IdentifierNamespace(getIdentifierNamespaceForKind(DK)),
395         CacheValidAndLinkage(0) {
396     if (StatisticsEnabled) add(DK);
397   }
398 
399   virtual ~Decl();
400 
401   /// Update a potentially out-of-date declaration.
402   void updateOutOfDate(IdentifierInfo &II) const;
403 
getCachedLinkage()404   Linkage getCachedLinkage() const {
405     return Linkage(CacheValidAndLinkage - 1);
406   }
407 
setCachedLinkage(Linkage L)408   void setCachedLinkage(Linkage L) const {
409     CacheValidAndLinkage = L + 1;
410   }
411 
hasCachedLinkage()412   bool hasCachedLinkage() const {
413     return CacheValidAndLinkage;
414   }
415 
416 public:
417   /// Source range that this declaration covers.
getSourceRange()418   virtual SourceRange getSourceRange() const LLVM_READONLY {
419     return SourceRange(getLocation(), getLocation());
420   }
421 
getBeginLoc()422   SourceLocation getBeginLoc() const LLVM_READONLY {
423     return getSourceRange().getBegin();
424   }
425 
getEndLoc()426   SourceLocation getEndLoc() const LLVM_READONLY {
427     return getSourceRange().getEnd();
428   }
429 
getLocation()430   SourceLocation getLocation() const { return Loc; }
setLocation(SourceLocation L)431   void setLocation(SourceLocation L) { Loc = L; }
432 
getKind()433   Kind getKind() const { return static_cast<Kind>(DeclKind); }
434   const char *getDeclKindName() const;
435 
getNextDeclInContext()436   Decl *getNextDeclInContext() { return NextInContextAndBits.getPointer(); }
getNextDeclInContext()437   const Decl *getNextDeclInContext() const {return NextInContextAndBits.getPointer();}
438 
getDeclContext()439   DeclContext *getDeclContext() {
440     if (isInSemaDC())
441       return getSemanticDC();
442     return getMultipleDC()->SemanticDC;
443   }
getDeclContext()444   const DeclContext *getDeclContext() const {
445     return const_cast<Decl*>(this)->getDeclContext();
446   }
447 
448   /// Find the innermost non-closure ancestor of this declaration,
449   /// walking up through blocks, lambdas, etc.  If that ancestor is
450   /// not a code context (!isFunctionOrMethod()), returns null.
451   ///
452   /// A declaration may be its own non-closure context.
453   Decl *getNonClosureContext();
getNonClosureContext()454   const Decl *getNonClosureContext() const {
455     return const_cast<Decl*>(this)->getNonClosureContext();
456   }
457 
458   TranslationUnitDecl *getTranslationUnitDecl();
getTranslationUnitDecl()459   const TranslationUnitDecl *getTranslationUnitDecl() const {
460     return const_cast<Decl*>(this)->getTranslationUnitDecl();
461   }
462 
463   bool isInAnonymousNamespace() const;
464 
465   bool isInStdNamespace() const;
466 
467   ASTContext &getASTContext() const LLVM_READONLY;
468 
469   /// Helper to get the language options from the ASTContext.
470   /// Defined out of line to avoid depending on ASTContext.h.
471   const LangOptions &getLangOpts() const LLVM_READONLY;
472 
setAccess(AccessSpecifier AS)473   void setAccess(AccessSpecifier AS) {
474     Access = AS;
475     assert(AccessDeclContextSanity());
476   }
477 
getAccess()478   AccessSpecifier getAccess() const {
479     assert(AccessDeclContextSanity());
480     return AccessSpecifier(Access);
481   }
482 
483   /// Retrieve the access specifier for this declaration, even though
484   /// it may not yet have been properly set.
getAccessUnsafe()485   AccessSpecifier getAccessUnsafe() const {
486     return AccessSpecifier(Access);
487   }
488 
hasAttrs()489   bool hasAttrs() const { return HasAttrs; }
490 
setAttrs(const AttrVec & Attrs)491   void setAttrs(const AttrVec& Attrs) {
492     return setAttrsImpl(Attrs, getASTContext());
493   }
494 
getAttrs()495   AttrVec &getAttrs() {
496     return const_cast<AttrVec&>(const_cast<const Decl*>(this)->getAttrs());
497   }
498 
499   const AttrVec &getAttrs() const;
500   void dropAttrs();
501   void addAttr(Attr *A);
502 
503   using attr_iterator = AttrVec::const_iterator;
504   using attr_range = llvm::iterator_range<attr_iterator>;
505 
attrs()506   attr_range attrs() const {
507     return attr_range(attr_begin(), attr_end());
508   }
509 
attr_begin()510   attr_iterator attr_begin() const {
511     return hasAttrs() ? getAttrs().begin() : nullptr;
512   }
attr_end()513   attr_iterator attr_end() const {
514     return hasAttrs() ? getAttrs().end() : nullptr;
515   }
516 
517   template <typename T>
dropAttr()518   void dropAttr() {
519     if (!HasAttrs) return;
520 
521     AttrVec &Vec = getAttrs();
522     llvm::erase_if(Vec, [](Attr *A) { return isa<T>(A); });
523 
524     if (Vec.empty())
525       HasAttrs = false;
526   }
527 
528   template <typename T>
specific_attrs()529   llvm::iterator_range<specific_attr_iterator<T>> specific_attrs() const {
530     return llvm::make_range(specific_attr_begin<T>(), specific_attr_end<T>());
531   }
532 
533   template <typename T>
specific_attr_begin()534   specific_attr_iterator<T> specific_attr_begin() const {
535     return specific_attr_iterator<T>(attr_begin());
536   }
537 
538   template <typename T>
specific_attr_end()539   specific_attr_iterator<T> specific_attr_end() const {
540     return specific_attr_iterator<T>(attr_end());
541   }
542 
getAttr()543   template<typename T> T *getAttr() const {
544     return hasAttrs() ? getSpecificAttr<T>(getAttrs()) : nullptr;
545   }
546 
hasAttr()547   template<typename T> bool hasAttr() const {
548     return hasAttrs() && hasSpecificAttr<T>(getAttrs());
549   }
550 
551   /// getMaxAlignment - return the maximum alignment specified by attributes
552   /// on this decl, 0 if there are none.
553   unsigned getMaxAlignment() const;
554 
555   /// setInvalidDecl - Indicates the Decl had a semantic error. This
556   /// allows for graceful error recovery.
557   void setInvalidDecl(bool Invalid = true);
isInvalidDecl()558   bool isInvalidDecl() const { return (bool) InvalidDecl; }
559 
560   /// isImplicit - Indicates whether the declaration was implicitly
561   /// generated by the implementation. If false, this declaration
562   /// was written explicitly in the source code.
isImplicit()563   bool isImplicit() const { return Implicit; }
564   void setImplicit(bool I = true) { Implicit = I; }
565 
566   /// Whether *any* (re-)declaration of the entity was used, meaning that
567   /// a definition is required.
568   ///
569   /// \param CheckUsedAttr When true, also consider the "used" attribute
570   /// (in addition to the "used" bit set by \c setUsed()) when determining
571   /// whether the function is used.
572   bool isUsed(bool CheckUsedAttr = true) const;
573 
574   /// Set whether the declaration is used, in the sense of odr-use.
575   ///
576   /// This should only be used immediately after creating a declaration.
577   /// It intentionally doesn't notify any listeners.
setIsUsed()578   void setIsUsed() { getCanonicalDecl()->Used = true; }
579 
580   /// Mark the declaration used, in the sense of odr-use.
581   ///
582   /// This notifies any mutation listeners in addition to setting a bit
583   /// indicating the declaration is used.
584   void markUsed(ASTContext &C);
585 
586   /// Whether any declaration of this entity was referenced.
587   bool isReferenced() const;
588 
589   /// Whether this declaration was referenced. This should not be relied
590   /// upon for anything other than debugging.
isThisDeclarationReferenced()591   bool isThisDeclarationReferenced() const { return Referenced; }
592 
593   void setReferenced(bool R = true) { Referenced = R; }
594 
595   /// Whether this declaration is a top-level declaration (function,
596   /// global variable, etc.) that is lexically inside an objc container
597   /// definition.
isTopLevelDeclInObjCContainer()598   bool isTopLevelDeclInObjCContainer() const {
599     return TopLevelDeclInObjCContainer;
600   }
601 
602   void setTopLevelDeclInObjCContainer(bool V = true) {
603     TopLevelDeclInObjCContainer = V;
604   }
605 
606   /// Looks on this and related declarations for an applicable
607   /// external source symbol attribute.
608   ExternalSourceSymbolAttr *getExternalSourceSymbolAttr() const;
609 
610   /// Whether this declaration was marked as being private to the
611   /// module in which it was defined.
isModulePrivate()612   bool isModulePrivate() const {
613     return getModuleOwnershipKind() == ModuleOwnershipKind::ModulePrivate;
614   }
615 
616   /// Return true if this declaration has an attribute which acts as
617   /// definition of the entity, such as 'alias' or 'ifunc'.
618   bool hasDefiningAttr() const;
619 
620   /// Return this declaration's defining attribute if it has one.
621   const Attr *getDefiningAttr() const;
622 
623 protected:
624   /// Specify that this declaration was marked as being private
625   /// to the module in which it was defined.
setModulePrivate()626   void setModulePrivate() {
627     // The module-private specifier has no effect on unowned declarations.
628     // FIXME: We should track this in some way for source fidelity.
629     if (getModuleOwnershipKind() == ModuleOwnershipKind::Unowned)
630       return;
631     setModuleOwnershipKind(ModuleOwnershipKind::ModulePrivate);
632   }
633 
634 public:
635   /// Set the FromASTFile flag. This indicates that this declaration
636   /// was deserialized and not parsed from source code and enables
637   /// features such as module ownership information.
setFromASTFile()638   void setFromASTFile() {
639     FromASTFile = true;
640   }
641 
642   /// Set the owning module ID.  This may only be called for
643   /// deserialized Decls.
setOwningModuleID(unsigned ID)644   void setOwningModuleID(unsigned ID) {
645     assert(isFromASTFile() && "Only works on a deserialized declaration");
646     *((unsigned*)this - 2) = ID;
647   }
648 
649 public:
650   /// Determine the availability of the given declaration.
651   ///
652   /// This routine will determine the most restrictive availability of
653   /// the given declaration (e.g., preferring 'unavailable' to
654   /// 'deprecated').
655   ///
656   /// \param Message If non-NULL and the result is not \c
657   /// AR_Available, will be set to a (possibly empty) message
658   /// describing why the declaration has not been introduced, is
659   /// deprecated, or is unavailable.
660   ///
661   /// \param EnclosingVersion The version to compare with. If empty, assume the
662   /// deployment target version.
663   ///
664   /// \param RealizedPlatform If non-NULL and the availability result is found
665   /// in an available attribute it will set to the platform which is written in
666   /// the available attribute.
667   AvailabilityResult
668   getAvailability(std::string *Message = nullptr,
669                   VersionTuple EnclosingVersion = VersionTuple(),
670                   StringRef *RealizedPlatform = nullptr) const;
671 
672   /// Retrieve the version of the target platform in which this
673   /// declaration was introduced.
674   ///
675   /// \returns An empty version tuple if this declaration has no 'introduced'
676   /// availability attributes, or the version tuple that's specified in the
677   /// attribute otherwise.
678   VersionTuple getVersionIntroduced() const;
679 
680   /// Determine whether this declaration is marked 'deprecated'.
681   ///
682   /// \param Message If non-NULL and the declaration is deprecated,
683   /// this will be set to the message describing why the declaration
684   /// was deprecated (which may be empty).
685   bool isDeprecated(std::string *Message = nullptr) const {
686     return getAvailability(Message) == AR_Deprecated;
687   }
688 
689   /// Determine whether this declaration is marked 'unavailable'.
690   ///
691   /// \param Message If non-NULL and the declaration is unavailable,
692   /// this will be set to the message describing why the declaration
693   /// was made unavailable (which may be empty).
694   bool isUnavailable(std::string *Message = nullptr) const {
695     return getAvailability(Message) == AR_Unavailable;
696   }
697 
698   /// Determine whether this is a weak-imported symbol.
699   ///
700   /// Weak-imported symbols are typically marked with the
701   /// 'weak_import' attribute, but may also be marked with an
702   /// 'availability' attribute where we're targing a platform prior to
703   /// the introduction of this feature.
704   bool isWeakImported() const;
705 
706   /// Determines whether this symbol can be weak-imported,
707   /// e.g., whether it would be well-formed to add the weak_import
708   /// attribute.
709   ///
710   /// \param IsDefinition Set to \c true to indicate that this
711   /// declaration cannot be weak-imported because it has a definition.
712   bool canBeWeakImported(bool &IsDefinition) const;
713 
714   /// Determine whether this declaration came from an AST file (such as
715   /// a precompiled header or module) rather than having been parsed.
isFromASTFile()716   bool isFromASTFile() const { return FromASTFile; }
717 
718   /// Retrieve the global declaration ID associated with this
719   /// declaration, which specifies where this Decl was loaded from.
getGlobalID()720   unsigned getGlobalID() const {
721     if (isFromASTFile())
722       return *((const unsigned*)this - 1);
723     return 0;
724   }
725 
726   /// Retrieve the global ID of the module that owns this particular
727   /// declaration.
getOwningModuleID()728   unsigned getOwningModuleID() const {
729     if (isFromASTFile())
730       return *((const unsigned*)this - 2);
731     return 0;
732   }
733 
734 private:
735   Module *getOwningModuleSlow() const;
736 
737 protected:
738   bool hasLocalOwningModuleStorage() const;
739 
740 public:
741   /// Get the imported owning module, if this decl is from an imported
742   /// (non-local) module.
getImportedOwningModule()743   Module *getImportedOwningModule() const {
744     if (!isFromASTFile() || !hasOwningModule())
745       return nullptr;
746 
747     return getOwningModuleSlow();
748   }
749 
750   /// Get the local owning module, if known. Returns nullptr if owner is
751   /// not yet known or declaration is not from a module.
getLocalOwningModule()752   Module *getLocalOwningModule() const {
753     if (isFromASTFile() || !hasOwningModule())
754       return nullptr;
755 
756     assert(hasLocalOwningModuleStorage() &&
757            "owned local decl but no local module storage");
758     return reinterpret_cast<Module *const *>(this)[-1];
759   }
setLocalOwningModule(Module * M)760   void setLocalOwningModule(Module *M) {
761     assert(!isFromASTFile() && hasOwningModule() &&
762            hasLocalOwningModuleStorage() &&
763            "should not have a cached owning module");
764     reinterpret_cast<Module **>(this)[-1] = M;
765   }
766 
767   /// Is this declaration owned by some module?
hasOwningModule()768   bool hasOwningModule() const {
769     return getModuleOwnershipKind() != ModuleOwnershipKind::Unowned;
770   }
771 
772   /// Get the module that owns this declaration (for visibility purposes).
getOwningModule()773   Module *getOwningModule() const {
774     return isFromASTFile() ? getImportedOwningModule() : getLocalOwningModule();
775   }
776 
777   /// Get the module that owns this declaration for linkage purposes.
778   /// There only ever is such a module under the C++ Modules TS.
779   ///
780   /// \param IgnoreLinkage Ignore the linkage of the entity; assume that
781   /// all declarations in a global module fragment are unowned.
782   Module *getOwningModuleForLinkage(bool IgnoreLinkage = false) const;
783 
784   /// Determine whether this declaration is definitely visible to name lookup,
785   /// independent of whether the owning module is visible.
786   /// Note: The declaration may be visible even if this returns \c false if the
787   /// owning module is visible within the query context. This is a low-level
788   /// helper function; most code should be calling Sema::isVisible() instead.
isUnconditionallyVisible()789   bool isUnconditionallyVisible() const {
790     return (int)getModuleOwnershipKind() <= (int)ModuleOwnershipKind::Visible;
791   }
792 
793   /// Set that this declaration is globally visible, even if it came from a
794   /// module that is not visible.
setVisibleDespiteOwningModule()795   void setVisibleDespiteOwningModule() {
796     if (!isUnconditionallyVisible())
797       setModuleOwnershipKind(ModuleOwnershipKind::Visible);
798   }
799 
800   /// Get the kind of module ownership for this declaration.
getModuleOwnershipKind()801   ModuleOwnershipKind getModuleOwnershipKind() const {
802     return NextInContextAndBits.getInt();
803   }
804 
805   /// Set whether this declaration is hidden from name lookup.
setModuleOwnershipKind(ModuleOwnershipKind MOK)806   void setModuleOwnershipKind(ModuleOwnershipKind MOK) {
807     assert(!(getModuleOwnershipKind() == ModuleOwnershipKind::Unowned &&
808              MOK != ModuleOwnershipKind::Unowned && !isFromASTFile() &&
809              !hasLocalOwningModuleStorage()) &&
810            "no storage available for owning module for this declaration");
811     NextInContextAndBits.setInt(MOK);
812   }
813 
getIdentifierNamespace()814   unsigned getIdentifierNamespace() const {
815     return IdentifierNamespace;
816   }
817 
isInIdentifierNamespace(unsigned NS)818   bool isInIdentifierNamespace(unsigned NS) const {
819     return getIdentifierNamespace() & NS;
820   }
821 
822   static unsigned getIdentifierNamespaceForKind(Kind DK);
823 
hasTagIdentifierNamespace()824   bool hasTagIdentifierNamespace() const {
825     return isTagIdentifierNamespace(getIdentifierNamespace());
826   }
827 
isTagIdentifierNamespace(unsigned NS)828   static bool isTagIdentifierNamespace(unsigned NS) {
829     // TagDecls have Tag and Type set and may also have TagFriend.
830     return (NS & ~IDNS_TagFriend) == (IDNS_Tag | IDNS_Type);
831   }
832 
833   /// getLexicalDeclContext - The declaration context where this Decl was
834   /// lexically declared (LexicalDC). May be different from
835   /// getDeclContext() (SemanticDC).
836   /// e.g.:
837   ///
838   ///   namespace A {
839   ///      void f(); // SemanticDC == LexicalDC == 'namespace A'
840   ///   }
841   ///   void A::f(); // SemanticDC == namespace 'A'
842   ///                // LexicalDC == global namespace
getLexicalDeclContext()843   DeclContext *getLexicalDeclContext() {
844     if (isInSemaDC())
845       return getSemanticDC();
846     return getMultipleDC()->LexicalDC;
847   }
getLexicalDeclContext()848   const DeclContext *getLexicalDeclContext() const {
849     return const_cast<Decl*>(this)->getLexicalDeclContext();
850   }
851 
852   /// Determine whether this declaration is declared out of line (outside its
853   /// semantic context).
854   virtual bool isOutOfLine() const;
855 
856   /// setDeclContext - Set both the semantic and lexical DeclContext
857   /// to DC.
858   void setDeclContext(DeclContext *DC);
859 
860   void setLexicalDeclContext(DeclContext *DC);
861 
862   /// Determine whether this declaration is a templated entity (whether it is
863   // within the scope of a template parameter).
864   bool isTemplated() const;
865 
866   /// Determine the number of levels of template parameter surrounding this
867   /// declaration.
868   unsigned getTemplateDepth() const;
869 
870   /// isDefinedOutsideFunctionOrMethod - This predicate returns true if this
871   /// scoped decl is defined outside the current function or method.  This is
872   /// roughly global variables and functions, but also handles enums (which
873   /// could be defined inside or outside a function etc).
isDefinedOutsideFunctionOrMethod()874   bool isDefinedOutsideFunctionOrMethod() const {
875     return getParentFunctionOrMethod() == nullptr;
876   }
877 
878   /// Determine whether a substitution into this declaration would occur as
879   /// part of a substitution into a dependent local scope. Such a substitution
880   /// transitively substitutes into all constructs nested within this
881   /// declaration.
882   ///
883   /// This recognizes non-defining declarations as well as members of local
884   /// classes and lambdas:
885   /// \code
886   ///     template<typename T> void foo() { void bar(); }
887   ///     template<typename T> void foo2() { class ABC { void bar(); }; }
888   ///     template<typename T> inline int x = [](){ return 0; }();
889   /// \endcode
890   bool isInLocalScopeForInstantiation() const;
891 
892   /// If this decl is defined inside a function/method/block it returns
893   /// the corresponding DeclContext, otherwise it returns null.
894   const DeclContext *getParentFunctionOrMethod() const;
getParentFunctionOrMethod()895   DeclContext *getParentFunctionOrMethod() {
896     return const_cast<DeclContext*>(
897                     const_cast<const Decl*>(this)->getParentFunctionOrMethod());
898   }
899 
900   /// Retrieves the "canonical" declaration of the given declaration.
getCanonicalDecl()901   virtual Decl *getCanonicalDecl() { return this; }
getCanonicalDecl()902   const Decl *getCanonicalDecl() const {
903     return const_cast<Decl*>(this)->getCanonicalDecl();
904   }
905 
906   /// Whether this particular Decl is a canonical one.
isCanonicalDecl()907   bool isCanonicalDecl() const { return getCanonicalDecl() == this; }
908 
909 protected:
910   /// Returns the next redeclaration or itself if this is the only decl.
911   ///
912   /// Decl subclasses that can be redeclared should override this method so that
913   /// Decl::redecl_iterator can iterate over them.
getNextRedeclarationImpl()914   virtual Decl *getNextRedeclarationImpl() { return this; }
915 
916   /// Implementation of getPreviousDecl(), to be overridden by any
917   /// subclass that has a redeclaration chain.
getPreviousDeclImpl()918   virtual Decl *getPreviousDeclImpl() { return nullptr; }
919 
920   /// Implementation of getMostRecentDecl(), to be overridden by any
921   /// subclass that has a redeclaration chain.
getMostRecentDeclImpl()922   virtual Decl *getMostRecentDeclImpl() { return this; }
923 
924 public:
925   /// Iterates through all the redeclarations of the same decl.
926   class redecl_iterator {
927     /// Current - The current declaration.
928     Decl *Current = nullptr;
929     Decl *Starter;
930 
931   public:
932     using value_type = Decl *;
933     using reference = const value_type &;
934     using pointer = const value_type *;
935     using iterator_category = std::forward_iterator_tag;
936     using difference_type = std::ptrdiff_t;
937 
938     redecl_iterator() = default;
redecl_iterator(Decl * C)939     explicit redecl_iterator(Decl *C) : Current(C), Starter(C) {}
940 
941     reference operator*() const { return Current; }
942     value_type operator->() const { return Current; }
943 
944     redecl_iterator& operator++() {
945       assert(Current && "Advancing while iterator has reached end");
946       // Get either previous decl or latest decl.
947       Decl *Next = Current->getNextRedeclarationImpl();
948       assert(Next && "Should return next redeclaration or itself, never null!");
949       Current = (Next != Starter) ? Next : nullptr;
950       return *this;
951     }
952 
953     redecl_iterator operator++(int) {
954       redecl_iterator tmp(*this);
955       ++(*this);
956       return tmp;
957     }
958 
959     friend bool operator==(redecl_iterator x, redecl_iterator y) {
960       return x.Current == y.Current;
961     }
962 
963     friend bool operator!=(redecl_iterator x, redecl_iterator y) {
964       return x.Current != y.Current;
965     }
966   };
967 
968   using redecl_range = llvm::iterator_range<redecl_iterator>;
969 
970   /// Returns an iterator range for all the redeclarations of the same
971   /// decl. It will iterate at least once (when this decl is the only one).
redecls()972   redecl_range redecls() const {
973     return redecl_range(redecls_begin(), redecls_end());
974   }
975 
redecls_begin()976   redecl_iterator redecls_begin() const {
977     return redecl_iterator(const_cast<Decl *>(this));
978   }
979 
redecls_end()980   redecl_iterator redecls_end() const { return redecl_iterator(); }
981 
982   /// Retrieve the previous declaration that declares the same entity
983   /// as this declaration, or NULL if there is no previous declaration.
getPreviousDecl()984   Decl *getPreviousDecl() { return getPreviousDeclImpl(); }
985 
986   /// Retrieve the previous declaration that declares the same entity
987   /// as this declaration, or NULL if there is no previous declaration.
getPreviousDecl()988   const Decl *getPreviousDecl() const {
989     return const_cast<Decl *>(this)->getPreviousDeclImpl();
990   }
991 
992   /// True if this is the first declaration in its redeclaration chain.
isFirstDecl()993   bool isFirstDecl() const {
994     return getPreviousDecl() == nullptr;
995   }
996 
997   /// Retrieve the most recent declaration that declares the same entity
998   /// as this declaration (which may be this declaration).
getMostRecentDecl()999   Decl *getMostRecentDecl() { return getMostRecentDeclImpl(); }
1000 
1001   /// Retrieve the most recent declaration that declares the same entity
1002   /// as this declaration (which may be this declaration).
getMostRecentDecl()1003   const Decl *getMostRecentDecl() const {
1004     return const_cast<Decl *>(this)->getMostRecentDeclImpl();
1005   }
1006 
1007   /// getBody - If this Decl represents a declaration for a body of code,
1008   ///  such as a function or method definition, this method returns the
1009   ///  top-level Stmt* of that body.  Otherwise this method returns null.
getBody()1010   virtual Stmt* getBody() const { return nullptr; }
1011 
1012   /// Returns true if this \c Decl represents a declaration for a body of
1013   /// code, such as a function or method definition.
1014   /// Note that \c hasBody can also return true if any redeclaration of this
1015   /// \c Decl represents a declaration for a body of code.
hasBody()1016   virtual bool hasBody() const { return getBody() != nullptr; }
1017 
1018   /// getBodyRBrace - Gets the right brace of the body, if a body exists.
1019   /// This works whether the body is a CompoundStmt or a CXXTryStmt.
1020   SourceLocation getBodyRBrace() const;
1021 
1022   // global temp stats (until we have a per-module visitor)
1023   static void add(Kind k);
1024   static void EnableStatistics();
1025   static void PrintStats();
1026 
1027   /// isTemplateParameter - Determines whether this declaration is a
1028   /// template parameter.
1029   bool isTemplateParameter() const;
1030 
1031   /// isTemplateParameter - Determines whether this declaration is a
1032   /// template parameter pack.
1033   bool isTemplateParameterPack() const;
1034 
1035   /// Whether this declaration is a parameter pack.
1036   bool isParameterPack() const;
1037 
1038   /// returns true if this declaration is a template
1039   bool isTemplateDecl() const;
1040 
1041   /// Whether this declaration is a function or function template.
isFunctionOrFunctionTemplate()1042   bool isFunctionOrFunctionTemplate() const {
1043     return (DeclKind >= Decl::firstFunction &&
1044             DeclKind <= Decl::lastFunction) ||
1045            DeclKind == FunctionTemplate;
1046   }
1047 
1048   /// If this is a declaration that describes some template, this
1049   /// method returns that template declaration.
1050   ///
1051   /// Note that this returns nullptr for partial specializations, because they
1052   /// are not modeled as TemplateDecls. Use getDescribedTemplateParams to handle
1053   /// those cases.
1054   TemplateDecl *getDescribedTemplate() const;
1055 
1056   /// If this is a declaration that describes some template or partial
1057   /// specialization, this returns the corresponding template parameter list.
1058   const TemplateParameterList *getDescribedTemplateParams() const;
1059 
1060   /// Returns the function itself, or the templated function if this is a
1061   /// function template.
1062   FunctionDecl *getAsFunction() LLVM_READONLY;
1063 
getAsFunction()1064   const FunctionDecl *getAsFunction() const {
1065     return const_cast<Decl *>(this)->getAsFunction();
1066   }
1067 
1068   /// Changes the namespace of this declaration to reflect that it's
1069   /// a function-local extern declaration.
1070   ///
1071   /// These declarations appear in the lexical context of the extern
1072   /// declaration, but in the semantic context of the enclosing namespace
1073   /// scope.
setLocalExternDecl()1074   void setLocalExternDecl() {
1075     Decl *Prev = getPreviousDecl();
1076     IdentifierNamespace &= ~IDNS_Ordinary;
1077 
1078     // It's OK for the declaration to still have the "invisible friend" flag or
1079     // the "conflicts with tag declarations in this scope" flag for the outer
1080     // scope.
1081     assert((IdentifierNamespace & ~(IDNS_OrdinaryFriend | IDNS_Tag)) == 0 &&
1082            "namespace is not ordinary");
1083 
1084     IdentifierNamespace |= IDNS_LocalExtern;
1085     if (Prev && Prev->getIdentifierNamespace() & IDNS_Ordinary)
1086       IdentifierNamespace |= IDNS_Ordinary;
1087   }
1088 
1089   /// Determine whether this is a block-scope declaration with linkage.
1090   /// This will either be a local variable declaration declared 'extern', or a
1091   /// local function declaration.
isLocalExternDecl()1092   bool isLocalExternDecl() {
1093     return IdentifierNamespace & IDNS_LocalExtern;
1094   }
1095 
1096   /// Changes the namespace of this declaration to reflect that it's
1097   /// the object of a friend declaration.
1098   ///
1099   /// These declarations appear in the lexical context of the friending
1100   /// class, but in the semantic context of the actual entity.  This property
1101   /// applies only to a specific decl object;  other redeclarations of the
1102   /// same entity may not (and probably don't) share this property.
1103   void setObjectOfFriendDecl(bool PerformFriendInjection = false) {
1104     unsigned OldNS = IdentifierNamespace;
1105     assert((OldNS & (IDNS_Tag | IDNS_Ordinary |
1106                      IDNS_TagFriend | IDNS_OrdinaryFriend |
1107                      IDNS_LocalExtern | IDNS_NonMemberOperator)) &&
1108            "namespace includes neither ordinary nor tag");
1109     assert(!(OldNS & ~(IDNS_Tag | IDNS_Ordinary | IDNS_Type |
1110                        IDNS_TagFriend | IDNS_OrdinaryFriend |
1111                        IDNS_LocalExtern | IDNS_NonMemberOperator)) &&
1112            "namespace includes other than ordinary or tag");
1113 
1114     Decl *Prev = getPreviousDecl();
1115     IdentifierNamespace &= ~(IDNS_Ordinary | IDNS_Tag | IDNS_Type);
1116 
1117     if (OldNS & (IDNS_Tag | IDNS_TagFriend)) {
1118       IdentifierNamespace |= IDNS_TagFriend;
1119       if (PerformFriendInjection ||
1120           (Prev && Prev->getIdentifierNamespace() & IDNS_Tag))
1121         IdentifierNamespace |= IDNS_Tag | IDNS_Type;
1122     }
1123 
1124     if (OldNS & (IDNS_Ordinary | IDNS_OrdinaryFriend |
1125                  IDNS_LocalExtern | IDNS_NonMemberOperator)) {
1126       IdentifierNamespace |= IDNS_OrdinaryFriend;
1127       if (PerformFriendInjection ||
1128           (Prev && Prev->getIdentifierNamespace() & IDNS_Ordinary))
1129         IdentifierNamespace |= IDNS_Ordinary;
1130     }
1131   }
1132 
1133   enum FriendObjectKind {
1134     FOK_None,      ///< Not a friend object.
1135     FOK_Declared,  ///< A friend of a previously-declared entity.
1136     FOK_Undeclared ///< A friend of a previously-undeclared entity.
1137   };
1138 
1139   /// Determines whether this declaration is the object of a
1140   /// friend declaration and, if so, what kind.
1141   ///
1142   /// There is currently no direct way to find the associated FriendDecl.
getFriendObjectKind()1143   FriendObjectKind getFriendObjectKind() const {
1144     unsigned mask =
1145         (IdentifierNamespace & (IDNS_TagFriend | IDNS_OrdinaryFriend));
1146     if (!mask) return FOK_None;
1147     return (IdentifierNamespace & (IDNS_Tag | IDNS_Ordinary) ? FOK_Declared
1148                                                              : FOK_Undeclared);
1149   }
1150 
1151   /// Specifies that this declaration is a C++ overloaded non-member.
setNonMemberOperator()1152   void setNonMemberOperator() {
1153     assert(getKind() == Function || getKind() == FunctionTemplate);
1154     assert((IdentifierNamespace & IDNS_Ordinary) &&
1155            "visible non-member operators should be in ordinary namespace");
1156     IdentifierNamespace |= IDNS_NonMemberOperator;
1157   }
1158 
classofKind(Kind K)1159   static bool classofKind(Kind K) { return true; }
1160   static DeclContext *castToDeclContext(const Decl *);
1161   static Decl *castFromDeclContext(const DeclContext *);
1162 
1163   void print(raw_ostream &Out, unsigned Indentation = 0,
1164              bool PrintInstantiation = false) const;
1165   void print(raw_ostream &Out, const PrintingPolicy &Policy,
1166              unsigned Indentation = 0, bool PrintInstantiation = false) const;
1167   static void printGroup(Decl** Begin, unsigned NumDecls,
1168                          raw_ostream &Out, const PrintingPolicy &Policy,
1169                          unsigned Indentation = 0);
1170 
1171   // Debuggers don't usually respect default arguments.
1172   void dump() const;
1173 
1174   // Same as dump(), but forces color printing.
1175   void dumpColor() const;
1176 
1177   void dump(raw_ostream &Out, bool Deserialize = false,
1178             ASTDumpOutputFormat OutputFormat = ADOF_Default) const;
1179 
1180   /// \return Unique reproducible object identifier
1181   int64_t getID() const;
1182 
1183   /// Looks through the Decl's underlying type to extract a FunctionType
1184   /// when possible. Will return null if the type underlying the Decl does not
1185   /// have a FunctionType.
1186   const FunctionType *getFunctionType(bool BlocksToo = true) const;
1187 
1188 private:
1189   void setAttrsImpl(const AttrVec& Attrs, ASTContext &Ctx);
1190   void setDeclContextsImpl(DeclContext *SemaDC, DeclContext *LexicalDC,
1191                            ASTContext &Ctx);
1192 
1193 protected:
1194   ASTMutationListener *getASTMutationListener() const;
1195 };
1196 
1197 /// Determine whether two declarations declare the same entity.
declaresSameEntity(const Decl * D1,const Decl * D2)1198 inline bool declaresSameEntity(const Decl *D1, const Decl *D2) {
1199   if (!D1 || !D2)
1200     return false;
1201 
1202   if (D1 == D2)
1203     return true;
1204 
1205   return D1->getCanonicalDecl() == D2->getCanonicalDecl();
1206 }
1207 
1208 /// PrettyStackTraceDecl - If a crash occurs, indicate that it happened when
1209 /// doing something to a specific decl.
1210 class PrettyStackTraceDecl : public llvm::PrettyStackTraceEntry {
1211   const Decl *TheDecl;
1212   SourceLocation Loc;
1213   SourceManager &SM;
1214   const char *Message;
1215 
1216 public:
PrettyStackTraceDecl(const Decl * theDecl,SourceLocation L,SourceManager & sm,const char * Msg)1217   PrettyStackTraceDecl(const Decl *theDecl, SourceLocation L,
1218                        SourceManager &sm, const char *Msg)
1219       : TheDecl(theDecl), Loc(L), SM(sm), Message(Msg) {}
1220 
1221   void print(raw_ostream &OS) const override;
1222 };
1223 
1224 /// The results of name lookup within a DeclContext. This is either a
1225 /// single result (with no stable storage) or a collection of results (with
1226 /// stable storage provided by the lookup table).
1227 class DeclContextLookupResult {
1228   using ResultTy = ArrayRef<NamedDecl *>;
1229 
1230   ResultTy Result;
1231 
1232   // If there is only one lookup result, it would be invalidated by
1233   // reallocations of the name table, so store it separately.
1234   NamedDecl *Single = nullptr;
1235 
1236   static NamedDecl *const SingleElementDummyList;
1237 
1238 public:
1239   DeclContextLookupResult() = default;
DeclContextLookupResult(ArrayRef<NamedDecl * > Result)1240   DeclContextLookupResult(ArrayRef<NamedDecl *> Result)
1241       : Result(Result) {}
DeclContextLookupResult(NamedDecl * Single)1242   DeclContextLookupResult(NamedDecl *Single)
1243       : Result(SingleElementDummyList), Single(Single) {}
1244 
1245   class iterator;
1246 
1247   using IteratorBase =
1248       llvm::iterator_adaptor_base<iterator, ResultTy::iterator,
1249                                   std::random_access_iterator_tag,
1250                                   NamedDecl *const>;
1251 
1252   class iterator : public IteratorBase {
1253     value_type SingleElement;
1254 
1255   public:
1256     explicit iterator(pointer Pos, value_type Single = nullptr)
IteratorBase(Pos)1257         : IteratorBase(Pos), SingleElement(Single) {}
1258 
1259     reference operator*() const {
1260       return SingleElement ? SingleElement : IteratorBase::operator*();
1261     }
1262   };
1263 
1264   using const_iterator = iterator;
1265   using pointer = iterator::pointer;
1266   using reference = iterator::reference;
1267 
begin()1268   iterator begin() const { return iterator(Result.begin(), Single); }
end()1269   iterator end() const { return iterator(Result.end(), Single); }
1270 
empty()1271   bool empty() const { return Result.empty(); }
data()1272   pointer data() const { return Single ? &Single : Result.data(); }
size()1273   size_t size() const { return Single ? 1 : Result.size(); }
front()1274   reference front() const { return Single ? Single : Result.front(); }
back()1275   reference back() const { return Single ? Single : Result.back(); }
1276   reference operator[](size_t N) const { return Single ? Single : Result[N]; }
1277 
1278   // FIXME: Remove this from the interface
slice(size_t N)1279   DeclContextLookupResult slice(size_t N) const {
1280     DeclContextLookupResult Sliced = Result.slice(N);
1281     Sliced.Single = Single;
1282     return Sliced;
1283   }
1284 };
1285 
1286 /// DeclContext - This is used only as base class of specific decl types that
1287 /// can act as declaration contexts. These decls are (only the top classes
1288 /// that directly derive from DeclContext are mentioned, not their subclasses):
1289 ///
1290 ///   TranslationUnitDecl
1291 ///   ExternCContext
1292 ///   NamespaceDecl
1293 ///   TagDecl
1294 ///   OMPDeclareReductionDecl
1295 ///   OMPDeclareMapperDecl
1296 ///   FunctionDecl
1297 ///   ObjCMethodDecl
1298 ///   ObjCContainerDecl
1299 ///   LinkageSpecDecl
1300 ///   ExportDecl
1301 ///   BlockDecl
1302 ///   CapturedDecl
1303 class DeclContext {
1304   /// For makeDeclVisibleInContextImpl
1305   friend class ASTDeclReader;
1306   /// For reconcileExternalVisibleStorage, CreateStoredDeclsMap,
1307   /// hasNeedToReconcileExternalVisibleStorage
1308   friend class ExternalASTSource;
1309   /// For CreateStoredDeclsMap
1310   friend class DependentDiagnostic;
1311   /// For hasNeedToReconcileExternalVisibleStorage,
1312   /// hasLazyLocalLexicalLookups, hasLazyExternalLexicalLookups
1313   friend class ASTWriter;
1314 
1315   // We use uint64_t in the bit-fields below since some bit-fields
1316   // cross the unsigned boundary and this breaks the packing.
1317 
1318   /// Stores the bits used by DeclContext.
1319   /// If modified NumDeclContextBit, the ctor of DeclContext and the accessor
1320   /// methods in DeclContext should be updated appropriately.
1321   class DeclContextBitfields {
1322     friend class DeclContext;
1323     /// DeclKind - This indicates which class this is.
1324     uint64_t DeclKind : 7;
1325 
1326     /// Whether this declaration context also has some external
1327     /// storage that contains additional declarations that are lexically
1328     /// part of this context.
1329     mutable uint64_t ExternalLexicalStorage : 1;
1330 
1331     /// Whether this declaration context also has some external
1332     /// storage that contains additional declarations that are visible
1333     /// in this context.
1334     mutable uint64_t ExternalVisibleStorage : 1;
1335 
1336     /// Whether this declaration context has had externally visible
1337     /// storage added since the last lookup. In this case, \c LookupPtr's
1338     /// invariant may not hold and needs to be fixed before we perform
1339     /// another lookup.
1340     mutable uint64_t NeedToReconcileExternalVisibleStorage : 1;
1341 
1342     /// If \c true, this context may have local lexical declarations
1343     /// that are missing from the lookup table.
1344     mutable uint64_t HasLazyLocalLexicalLookups : 1;
1345 
1346     /// If \c true, the external source may have lexical declarations
1347     /// that are missing from the lookup table.
1348     mutable uint64_t HasLazyExternalLexicalLookups : 1;
1349 
1350     /// If \c true, lookups should only return identifier from
1351     /// DeclContext scope (for example TranslationUnit). Used in
1352     /// LookupQualifiedName()
1353     mutable uint64_t UseQualifiedLookup : 1;
1354   };
1355 
1356   /// Number of bits in DeclContextBitfields.
1357   enum { NumDeclContextBits = 13 };
1358 
1359   /// Stores the bits used by TagDecl.
1360   /// If modified NumTagDeclBits and the accessor
1361   /// methods in TagDecl should be updated appropriately.
1362   class TagDeclBitfields {
1363     friend class TagDecl;
1364     /// For the bits in DeclContextBitfields
1365     uint64_t : NumDeclContextBits;
1366 
1367     /// The TagKind enum.
1368     uint64_t TagDeclKind : 3;
1369 
1370     /// True if this is a definition ("struct foo {};"), false if it is a
1371     /// declaration ("struct foo;").  It is not considered a definition
1372     /// until the definition has been fully processed.
1373     uint64_t IsCompleteDefinition : 1;
1374 
1375     /// True if this is currently being defined.
1376     uint64_t IsBeingDefined : 1;
1377 
1378     /// True if this tag declaration is "embedded" (i.e., defined or declared
1379     /// for the very first time) in the syntax of a declarator.
1380     uint64_t IsEmbeddedInDeclarator : 1;
1381 
1382     /// True if this tag is free standing, e.g. "struct foo;".
1383     uint64_t IsFreeStanding : 1;
1384 
1385     /// Indicates whether it is possible for declarations of this kind
1386     /// to have an out-of-date definition.
1387     ///
1388     /// This option is only enabled when modules are enabled.
1389     uint64_t MayHaveOutOfDateDef : 1;
1390 
1391     /// Has the full definition of this type been required by a use somewhere in
1392     /// the TU.
1393     uint64_t IsCompleteDefinitionRequired : 1;
1394   };
1395 
1396   /// Number of non-inherited bits in TagDeclBitfields.
1397   enum { NumTagDeclBits = 9 };
1398 
1399   /// Stores the bits used by EnumDecl.
1400   /// If modified NumEnumDeclBit and the accessor
1401   /// methods in EnumDecl should be updated appropriately.
1402   class EnumDeclBitfields {
1403     friend class EnumDecl;
1404     /// For the bits in DeclContextBitfields.
1405     uint64_t : NumDeclContextBits;
1406     /// For the bits in TagDeclBitfields.
1407     uint64_t : NumTagDeclBits;
1408 
1409     /// Width in bits required to store all the non-negative
1410     /// enumerators of this enum.
1411     uint64_t NumPositiveBits : 8;
1412 
1413     /// Width in bits required to store all the negative
1414     /// enumerators of this enum.
1415     uint64_t NumNegativeBits : 8;
1416 
1417     /// True if this tag declaration is a scoped enumeration. Only
1418     /// possible in C++11 mode.
1419     uint64_t IsScoped : 1;
1420 
1421     /// If this tag declaration is a scoped enum,
1422     /// then this is true if the scoped enum was declared using the class
1423     /// tag, false if it was declared with the struct tag. No meaning is
1424     /// associated if this tag declaration is not a scoped enum.
1425     uint64_t IsScopedUsingClassTag : 1;
1426 
1427     /// True if this is an enumeration with fixed underlying type. Only
1428     /// possible in C++11, Microsoft extensions, or Objective C mode.
1429     uint64_t IsFixed : 1;
1430 
1431     /// True if a valid hash is stored in ODRHash.
1432     uint64_t HasODRHash : 1;
1433   };
1434 
1435   /// Number of non-inherited bits in EnumDeclBitfields.
1436   enum { NumEnumDeclBits = 20 };
1437 
1438   /// Stores the bits used by RecordDecl.
1439   /// If modified NumRecordDeclBits and the accessor
1440   /// methods in RecordDecl should be updated appropriately.
1441   class RecordDeclBitfields {
1442     friend class RecordDecl;
1443     /// For the bits in DeclContextBitfields.
1444     uint64_t : NumDeclContextBits;
1445     /// For the bits in TagDeclBitfields.
1446     uint64_t : NumTagDeclBits;
1447 
1448     /// This is true if this struct ends with a flexible
1449     /// array member (e.g. int X[]) or if this union contains a struct that does.
1450     /// If so, this cannot be contained in arrays or other structs as a member.
1451     uint64_t HasFlexibleArrayMember : 1;
1452 
1453     /// Whether this is the type of an anonymous struct or union.
1454     uint64_t AnonymousStructOrUnion : 1;
1455 
1456     /// This is true if this struct has at least one member
1457     /// containing an Objective-C object pointer type.
1458     uint64_t HasObjectMember : 1;
1459 
1460     /// This is true if struct has at least one member of
1461     /// 'volatile' type.
1462     uint64_t HasVolatileMember : 1;
1463 
1464     /// Whether the field declarations of this record have been loaded
1465     /// from external storage. To avoid unnecessary deserialization of
1466     /// methods/nested types we allow deserialization of just the fields
1467     /// when needed.
1468     mutable uint64_t LoadedFieldsFromExternalStorage : 1;
1469 
1470     /// Basic properties of non-trivial C structs.
1471     uint64_t NonTrivialToPrimitiveDefaultInitialize : 1;
1472     uint64_t NonTrivialToPrimitiveCopy : 1;
1473     uint64_t NonTrivialToPrimitiveDestroy : 1;
1474 
1475     /// The following bits indicate whether this is or contains a C union that
1476     /// is non-trivial to default-initialize, destruct, or copy. These bits
1477     /// imply the associated basic non-triviality predicates declared above.
1478     uint64_t HasNonTrivialToPrimitiveDefaultInitializeCUnion : 1;
1479     uint64_t HasNonTrivialToPrimitiveDestructCUnion : 1;
1480     uint64_t HasNonTrivialToPrimitiveCopyCUnion : 1;
1481 
1482     /// Indicates whether this struct is destroyed in the callee.
1483     uint64_t ParamDestroyedInCallee : 1;
1484 
1485     /// Represents the way this type is passed to a function.
1486     uint64_t ArgPassingRestrictions : 2;
1487   };
1488 
1489   /// Number of non-inherited bits in RecordDeclBitfields.
1490   enum { NumRecordDeclBits = 14 };
1491 
1492   /// Stores the bits used by OMPDeclareReductionDecl.
1493   /// If modified NumOMPDeclareReductionDeclBits and the accessor
1494   /// methods in OMPDeclareReductionDecl should be updated appropriately.
1495   class OMPDeclareReductionDeclBitfields {
1496     friend class OMPDeclareReductionDecl;
1497     /// For the bits in DeclContextBitfields
1498     uint64_t : NumDeclContextBits;
1499 
1500     /// Kind of initializer,
1501     /// function call or omp_priv<init_expr> initializtion.
1502     uint64_t InitializerKind : 2;
1503   };
1504 
1505   /// Number of non-inherited bits in OMPDeclareReductionDeclBitfields.
1506   enum { NumOMPDeclareReductionDeclBits = 2 };
1507 
1508   /// Stores the bits used by FunctionDecl.
1509   /// If modified NumFunctionDeclBits and the accessor
1510   /// methods in FunctionDecl and CXXDeductionGuideDecl
1511   /// (for IsCopyDeductionCandidate) should be updated appropriately.
1512   class FunctionDeclBitfields {
1513     friend class FunctionDecl;
1514     /// For IsCopyDeductionCandidate
1515     friend class CXXDeductionGuideDecl;
1516     /// For the bits in DeclContextBitfields.
1517     uint64_t : NumDeclContextBits;
1518 
1519     uint64_t SClass : 3;
1520     uint64_t IsInline : 1;
1521     uint64_t IsInlineSpecified : 1;
1522 
1523     uint64_t IsVirtualAsWritten : 1;
1524     uint64_t IsPure : 1;
1525     uint64_t HasInheritedPrototype : 1;
1526     uint64_t HasWrittenPrototype : 1;
1527     uint64_t IsDeleted : 1;
1528     /// Used by CXXMethodDecl
1529     uint64_t IsTrivial : 1;
1530 
1531     /// This flag indicates whether this function is trivial for the purpose of
1532     /// calls. This is meaningful only when this function is a copy/move
1533     /// constructor or a destructor.
1534     uint64_t IsTrivialForCall : 1;
1535 
1536     uint64_t IsDefaulted : 1;
1537     uint64_t IsExplicitlyDefaulted : 1;
1538     uint64_t HasDefaultedFunctionInfo : 1;
1539     uint64_t HasImplicitReturnZero : 1;
1540     uint64_t IsLateTemplateParsed : 1;
1541 
1542     /// Kind of contexpr specifier as defined by ConstexprSpecKind.
1543     uint64_t ConstexprKind : 2;
1544     uint64_t InstantiationIsPending : 1;
1545 
1546     /// Indicates if the function uses __try.
1547     uint64_t UsesSEHTry : 1;
1548 
1549     /// Indicates if the function was a definition
1550     /// but its body was skipped.
1551     uint64_t HasSkippedBody : 1;
1552 
1553     /// Indicates if the function declaration will
1554     /// have a body, once we're done parsing it.
1555     uint64_t WillHaveBody : 1;
1556 
1557     /// Indicates that this function is a multiversioned
1558     /// function using attribute 'target'.
1559     uint64_t IsMultiVersion : 1;
1560 
1561     /// [C++17] Only used by CXXDeductionGuideDecl. Indicates that
1562     /// the Deduction Guide is the implicitly generated 'copy
1563     /// deduction candidate' (is used during overload resolution).
1564     uint64_t IsCopyDeductionCandidate : 1;
1565 
1566     /// Store the ODRHash after first calculation.
1567     uint64_t HasODRHash : 1;
1568 
1569     /// Indicates if the function uses Floating Point Constrained Intrinsics
1570     uint64_t UsesFPIntrin : 1;
1571   };
1572 
1573   /// Number of non-inherited bits in FunctionDeclBitfields.
1574   enum { NumFunctionDeclBits = 27 };
1575 
1576   /// Stores the bits used by CXXConstructorDecl. If modified
1577   /// NumCXXConstructorDeclBits and the accessor
1578   /// methods in CXXConstructorDecl should be updated appropriately.
1579   class CXXConstructorDeclBitfields {
1580     friend class CXXConstructorDecl;
1581     /// For the bits in DeclContextBitfields.
1582     uint64_t : NumDeclContextBits;
1583     /// For the bits in FunctionDeclBitfields.
1584     uint64_t : NumFunctionDeclBits;
1585 
1586     /// 24 bits to fit in the remaining available space.
1587     /// Note that this makes CXXConstructorDeclBitfields take
1588     /// exactly 64 bits and thus the width of NumCtorInitializers
1589     /// will need to be shrunk if some bit is added to NumDeclContextBitfields,
1590     /// NumFunctionDeclBitfields or CXXConstructorDeclBitfields.
1591     uint64_t NumCtorInitializers : 21;
1592     uint64_t IsInheritingConstructor : 1;
1593 
1594     /// Whether this constructor has a trail-allocated explicit specifier.
1595     uint64_t HasTrailingExplicitSpecifier : 1;
1596     /// If this constructor does't have a trail-allocated explicit specifier.
1597     /// Whether this constructor is explicit specified.
1598     uint64_t IsSimpleExplicit : 1;
1599   };
1600 
1601   /// Number of non-inherited bits in CXXConstructorDeclBitfields.
1602   enum {
1603     NumCXXConstructorDeclBits = 64 - NumDeclContextBits - NumFunctionDeclBits
1604   };
1605 
1606   /// Stores the bits used by ObjCMethodDecl.
1607   /// If modified NumObjCMethodDeclBits and the accessor
1608   /// methods in ObjCMethodDecl should be updated appropriately.
1609   class ObjCMethodDeclBitfields {
1610     friend class ObjCMethodDecl;
1611 
1612     /// For the bits in DeclContextBitfields.
1613     uint64_t : NumDeclContextBits;
1614 
1615     /// The conventional meaning of this method; an ObjCMethodFamily.
1616     /// This is not serialized; instead, it is computed on demand and
1617     /// cached.
1618     mutable uint64_t Family : ObjCMethodFamilyBitWidth;
1619 
1620     /// instance (true) or class (false) method.
1621     uint64_t IsInstance : 1;
1622     uint64_t IsVariadic : 1;
1623 
1624     /// True if this method is the getter or setter for an explicit property.
1625     uint64_t IsPropertyAccessor : 1;
1626 
1627     /// True if this method is a synthesized property accessor stub.
1628     uint64_t IsSynthesizedAccessorStub : 1;
1629 
1630     /// Method has a definition.
1631     uint64_t IsDefined : 1;
1632 
1633     /// Method redeclaration in the same interface.
1634     uint64_t IsRedeclaration : 1;
1635 
1636     /// Is redeclared in the same interface.
1637     mutable uint64_t HasRedeclaration : 1;
1638 
1639     /// \@required/\@optional
1640     uint64_t DeclImplementation : 2;
1641 
1642     /// in, inout, etc.
1643     uint64_t objcDeclQualifier : 7;
1644 
1645     /// Indicates whether this method has a related result type.
1646     uint64_t RelatedResultType : 1;
1647 
1648     /// Whether the locations of the selector identifiers are in a
1649     /// "standard" position, a enum SelectorLocationsKind.
1650     uint64_t SelLocsKind : 2;
1651 
1652     /// Whether this method overrides any other in the class hierarchy.
1653     ///
1654     /// A method is said to override any method in the class's
1655     /// base classes, its protocols, or its categories' protocols, that has
1656     /// the same selector and is of the same kind (class or instance).
1657     /// A method in an implementation is not considered as overriding the same
1658     /// method in the interface or its categories.
1659     uint64_t IsOverriding : 1;
1660 
1661     /// Indicates if the method was a definition but its body was skipped.
1662     uint64_t HasSkippedBody : 1;
1663   };
1664 
1665   /// Number of non-inherited bits in ObjCMethodDeclBitfields.
1666   enum { NumObjCMethodDeclBits = 24 };
1667 
1668   /// Stores the bits used by ObjCContainerDecl.
1669   /// If modified NumObjCContainerDeclBits and the accessor
1670   /// methods in ObjCContainerDecl should be updated appropriately.
1671   class ObjCContainerDeclBitfields {
1672     friend class ObjCContainerDecl;
1673     /// For the bits in DeclContextBitfields
1674     uint32_t : NumDeclContextBits;
1675 
1676     // Not a bitfield but this saves space.
1677     // Note that ObjCContainerDeclBitfields is full.
1678     SourceLocation AtStart;
1679   };
1680 
1681   /// Number of non-inherited bits in ObjCContainerDeclBitfields.
1682   /// Note that here we rely on the fact that SourceLocation is 32 bits
1683   /// wide. We check this with the static_assert in the ctor of DeclContext.
1684   enum { NumObjCContainerDeclBits = 64 - NumDeclContextBits };
1685 
1686   /// Stores the bits used by LinkageSpecDecl.
1687   /// If modified NumLinkageSpecDeclBits and the accessor
1688   /// methods in LinkageSpecDecl should be updated appropriately.
1689   class LinkageSpecDeclBitfields {
1690     friend class LinkageSpecDecl;
1691     /// For the bits in DeclContextBitfields.
1692     uint64_t : NumDeclContextBits;
1693 
1694     /// The language for this linkage specification with values
1695     /// in the enum LinkageSpecDecl::LanguageIDs.
1696     uint64_t Language : 3;
1697 
1698     /// True if this linkage spec has braces.
1699     /// This is needed so that hasBraces() returns the correct result while the
1700     /// linkage spec body is being parsed.  Once RBraceLoc has been set this is
1701     /// not used, so it doesn't need to be serialized.
1702     uint64_t HasBraces : 1;
1703   };
1704 
1705   /// Number of non-inherited bits in LinkageSpecDeclBitfields.
1706   enum { NumLinkageSpecDeclBits = 4 };
1707 
1708   /// Stores the bits used by BlockDecl.
1709   /// If modified NumBlockDeclBits and the accessor
1710   /// methods in BlockDecl should be updated appropriately.
1711   class BlockDeclBitfields {
1712     friend class BlockDecl;
1713     /// For the bits in DeclContextBitfields.
1714     uint64_t : NumDeclContextBits;
1715 
1716     uint64_t IsVariadic : 1;
1717     uint64_t CapturesCXXThis : 1;
1718     uint64_t BlockMissingReturnType : 1;
1719     uint64_t IsConversionFromLambda : 1;
1720 
1721     /// A bit that indicates this block is passed directly to a function as a
1722     /// non-escaping parameter.
1723     uint64_t DoesNotEscape : 1;
1724 
1725     /// A bit that indicates whether it's possible to avoid coying this block to
1726     /// the heap when it initializes or is assigned to a local variable with
1727     /// automatic storage.
1728     uint64_t CanAvoidCopyToHeap : 1;
1729   };
1730 
1731   /// Number of non-inherited bits in BlockDeclBitfields.
1732   enum { NumBlockDeclBits = 5 };
1733 
1734   /// Pointer to the data structure used to lookup declarations
1735   /// within this context (or a DependentStoredDeclsMap if this is a
1736   /// dependent context). We maintain the invariant that, if the map
1737   /// contains an entry for a DeclarationName (and we haven't lazily
1738   /// omitted anything), then it contains all relevant entries for that
1739   /// name (modulo the hasExternalDecls() flag).
1740   mutable StoredDeclsMap *LookupPtr = nullptr;
1741 
1742 protected:
1743   /// This anonymous union stores the bits belonging to DeclContext and classes
1744   /// deriving from it. The goal is to use otherwise wasted
1745   /// space in DeclContext to store data belonging to derived classes.
1746   /// The space saved is especially significient when pointers are aligned
1747   /// to 8 bytes. In this case due to alignment requirements we have a
1748   /// little less than 8 bytes free in DeclContext which we can use.
1749   /// We check that none of the classes in this union is larger than
1750   /// 8 bytes with static_asserts in the ctor of DeclContext.
1751   union {
1752     DeclContextBitfields DeclContextBits;
1753     TagDeclBitfields TagDeclBits;
1754     EnumDeclBitfields EnumDeclBits;
1755     RecordDeclBitfields RecordDeclBits;
1756     OMPDeclareReductionDeclBitfields OMPDeclareReductionDeclBits;
1757     FunctionDeclBitfields FunctionDeclBits;
1758     CXXConstructorDeclBitfields CXXConstructorDeclBits;
1759     ObjCMethodDeclBitfields ObjCMethodDeclBits;
1760     ObjCContainerDeclBitfields ObjCContainerDeclBits;
1761     LinkageSpecDeclBitfields LinkageSpecDeclBits;
1762     BlockDeclBitfields BlockDeclBits;
1763 
1764     static_assert(sizeof(DeclContextBitfields) <= 8,
1765                   "DeclContextBitfields is larger than 8 bytes!");
1766     static_assert(sizeof(TagDeclBitfields) <= 8,
1767                   "TagDeclBitfields is larger than 8 bytes!");
1768     static_assert(sizeof(EnumDeclBitfields) <= 8,
1769                   "EnumDeclBitfields is larger than 8 bytes!");
1770     static_assert(sizeof(RecordDeclBitfields) <= 8,
1771                   "RecordDeclBitfields is larger than 8 bytes!");
1772     static_assert(sizeof(OMPDeclareReductionDeclBitfields) <= 8,
1773                   "OMPDeclareReductionDeclBitfields is larger than 8 bytes!");
1774     static_assert(sizeof(FunctionDeclBitfields) <= 8,
1775                   "FunctionDeclBitfields is larger than 8 bytes!");
1776     static_assert(sizeof(CXXConstructorDeclBitfields) <= 8,
1777                   "CXXConstructorDeclBitfields is larger than 8 bytes!");
1778     static_assert(sizeof(ObjCMethodDeclBitfields) <= 8,
1779                   "ObjCMethodDeclBitfields is larger than 8 bytes!");
1780     static_assert(sizeof(ObjCContainerDeclBitfields) <= 8,
1781                   "ObjCContainerDeclBitfields is larger than 8 bytes!");
1782     static_assert(sizeof(LinkageSpecDeclBitfields) <= 8,
1783                   "LinkageSpecDeclBitfields is larger than 8 bytes!");
1784     static_assert(sizeof(BlockDeclBitfields) <= 8,
1785                   "BlockDeclBitfields is larger than 8 bytes!");
1786   };
1787 
1788   /// FirstDecl - The first declaration stored within this declaration
1789   /// context.
1790   mutable Decl *FirstDecl = nullptr;
1791 
1792   /// LastDecl - The last declaration stored within this declaration
1793   /// context. FIXME: We could probably cache this value somewhere
1794   /// outside of the DeclContext, to reduce the size of DeclContext by
1795   /// another pointer.
1796   mutable Decl *LastDecl = nullptr;
1797 
1798   /// Build up a chain of declarations.
1799   ///
1800   /// \returns the first/last pair of declarations.
1801   static std::pair<Decl *, Decl *>
1802   BuildDeclChain(ArrayRef<Decl*> Decls, bool FieldsAlreadyLoaded);
1803 
1804   DeclContext(Decl::Kind K);
1805 
1806 public:
1807   ~DeclContext();
1808 
getDeclKind()1809   Decl::Kind getDeclKind() const {
1810     return static_cast<Decl::Kind>(DeclContextBits.DeclKind);
1811   }
1812 
1813   const char *getDeclKindName() const;
1814 
1815   /// getParent - Returns the containing DeclContext.
getParent()1816   DeclContext *getParent() {
1817     return cast<Decl>(this)->getDeclContext();
1818   }
getParent()1819   const DeclContext *getParent() const {
1820     return const_cast<DeclContext*>(this)->getParent();
1821   }
1822 
1823   /// getLexicalParent - Returns the containing lexical DeclContext. May be
1824   /// different from getParent, e.g.:
1825   ///
1826   ///   namespace A {
1827   ///      struct S;
1828   ///   }
1829   ///   struct A::S {}; // getParent() == namespace 'A'
1830   ///                   // getLexicalParent() == translation unit
1831   ///
getLexicalParent()1832   DeclContext *getLexicalParent() {
1833     return cast<Decl>(this)->getLexicalDeclContext();
1834   }
getLexicalParent()1835   const DeclContext *getLexicalParent() const {
1836     return const_cast<DeclContext*>(this)->getLexicalParent();
1837   }
1838 
1839   DeclContext *getLookupParent();
1840 
getLookupParent()1841   const DeclContext *getLookupParent() const {
1842     return const_cast<DeclContext*>(this)->getLookupParent();
1843   }
1844 
getParentASTContext()1845   ASTContext &getParentASTContext() const {
1846     return cast<Decl>(this)->getASTContext();
1847   }
1848 
isClosure()1849   bool isClosure() const { return getDeclKind() == Decl::Block; }
1850 
1851   /// Return this DeclContext if it is a BlockDecl. Otherwise, return the
1852   /// innermost enclosing BlockDecl or null if there are no enclosing blocks.
1853   const BlockDecl *getInnermostBlockDecl() const;
1854 
isObjCContainer()1855   bool isObjCContainer() const {
1856     switch (getDeclKind()) {
1857     case Decl::ObjCCategory:
1858     case Decl::ObjCCategoryImpl:
1859     case Decl::ObjCImplementation:
1860     case Decl::ObjCInterface:
1861     case Decl::ObjCProtocol:
1862       return true;
1863     default:
1864       return false;
1865     }
1866   }
1867 
isFunctionOrMethod()1868   bool isFunctionOrMethod() const {
1869     switch (getDeclKind()) {
1870     case Decl::Block:
1871     case Decl::Captured:
1872     case Decl::ObjCMethod:
1873       return true;
1874     default:
1875       return getDeclKind() >= Decl::firstFunction &&
1876              getDeclKind() <= Decl::lastFunction;
1877     }
1878   }
1879 
1880   /// Test whether the context supports looking up names.
isLookupContext()1881   bool isLookupContext() const {
1882     return !isFunctionOrMethod() && getDeclKind() != Decl::LinkageSpec &&
1883            getDeclKind() != Decl::Export;
1884   }
1885 
isFileContext()1886   bool isFileContext() const {
1887     return getDeclKind() == Decl::TranslationUnit ||
1888            getDeclKind() == Decl::Namespace;
1889   }
1890 
isTranslationUnit()1891   bool isTranslationUnit() const {
1892     return getDeclKind() == Decl::TranslationUnit;
1893   }
1894 
isRecord()1895   bool isRecord() const {
1896     return getDeclKind() >= Decl::firstRecord &&
1897            getDeclKind() <= Decl::lastRecord;
1898   }
1899 
isNamespace()1900   bool isNamespace() const { return getDeclKind() == Decl::Namespace; }
1901 
1902   bool isStdNamespace() const;
1903 
1904   bool isInlineNamespace() const;
1905 
1906   /// Determines whether this context is dependent on a
1907   /// template parameter.
1908   bool isDependentContext() const;
1909 
1910   /// isTransparentContext - Determines whether this context is a
1911   /// "transparent" context, meaning that the members declared in this
1912   /// context are semantically declared in the nearest enclosing
1913   /// non-transparent (opaque) context but are lexically declared in
1914   /// this context. For example, consider the enumerators of an
1915   /// enumeration type:
1916   /// @code
1917   /// enum E {
1918   ///   Val1
1919   /// };
1920   /// @endcode
1921   /// Here, E is a transparent context, so its enumerator (Val1) will
1922   /// appear (semantically) that it is in the same context of E.
1923   /// Examples of transparent contexts include: enumerations (except for
1924   /// C++0x scoped enums), and C++ linkage specifications.
1925   bool isTransparentContext() const;
1926 
1927   /// Determines whether this context or some of its ancestors is a
1928   /// linkage specification context that specifies C linkage.
1929   bool isExternCContext() const;
1930 
1931   /// Retrieve the nearest enclosing C linkage specification context.
1932   const LinkageSpecDecl *getExternCContext() const;
1933 
1934   /// Determines whether this context or some of its ancestors is a
1935   /// linkage specification context that specifies C++ linkage.
1936   bool isExternCXXContext() const;
1937 
1938   /// Determine whether this declaration context is equivalent
1939   /// to the declaration context DC.
Equals(const DeclContext * DC)1940   bool Equals(const DeclContext *DC) const {
1941     return DC && this->getPrimaryContext() == DC->getPrimaryContext();
1942   }
1943 
1944   /// Determine whether this declaration context encloses the
1945   /// declaration context DC.
1946   bool Encloses(const DeclContext *DC) const;
1947 
1948   /// Find the nearest non-closure ancestor of this context,
1949   /// i.e. the innermost semantic parent of this context which is not
1950   /// a closure.  A context may be its own non-closure ancestor.
1951   Decl *getNonClosureAncestor();
getNonClosureAncestor()1952   const Decl *getNonClosureAncestor() const {
1953     return const_cast<DeclContext*>(this)->getNonClosureAncestor();
1954   }
1955 
1956   /// getPrimaryContext - There may be many different
1957   /// declarations of the same entity (including forward declarations
1958   /// of classes, multiple definitions of namespaces, etc.), each with
1959   /// a different set of declarations. This routine returns the
1960   /// "primary" DeclContext structure, which will contain the
1961   /// information needed to perform name lookup into this context.
1962   DeclContext *getPrimaryContext();
getPrimaryContext()1963   const DeclContext *getPrimaryContext() const {
1964     return const_cast<DeclContext*>(this)->getPrimaryContext();
1965   }
1966 
1967   /// getRedeclContext - Retrieve the context in which an entity conflicts with
1968   /// other entities of the same name, or where it is a redeclaration if the
1969   /// two entities are compatible. This skips through transparent contexts.
1970   DeclContext *getRedeclContext();
getRedeclContext()1971   const DeclContext *getRedeclContext() const {
1972     return const_cast<DeclContext *>(this)->getRedeclContext();
1973   }
1974 
1975   /// Retrieve the nearest enclosing namespace context.
1976   DeclContext *getEnclosingNamespaceContext();
getEnclosingNamespaceContext()1977   const DeclContext *getEnclosingNamespaceContext() const {
1978     return const_cast<DeclContext *>(this)->getEnclosingNamespaceContext();
1979   }
1980 
1981   /// Retrieve the outermost lexically enclosing record context.
1982   RecordDecl *getOuterLexicalRecordContext();
getOuterLexicalRecordContext()1983   const RecordDecl *getOuterLexicalRecordContext() const {
1984     return const_cast<DeclContext *>(this)->getOuterLexicalRecordContext();
1985   }
1986 
1987   /// Test if this context is part of the enclosing namespace set of
1988   /// the context NS, as defined in C++0x [namespace.def]p9. If either context
1989   /// isn't a namespace, this is equivalent to Equals().
1990   ///
1991   /// The enclosing namespace set of a namespace is the namespace and, if it is
1992   /// inline, its enclosing namespace, recursively.
1993   bool InEnclosingNamespaceSetOf(const DeclContext *NS) const;
1994 
1995   /// Collects all of the declaration contexts that are semantically
1996   /// connected to this declaration context.
1997   ///
1998   /// For declaration contexts that have multiple semantically connected but
1999   /// syntactically distinct contexts, such as C++ namespaces, this routine
2000   /// retrieves the complete set of such declaration contexts in source order.
2001   /// For example, given:
2002   ///
2003   /// \code
2004   /// namespace N {
2005   ///   int x;
2006   /// }
2007   /// namespace N {
2008   ///   int y;
2009   /// }
2010   /// \endcode
2011   ///
2012   /// The \c Contexts parameter will contain both definitions of N.
2013   ///
2014   /// \param Contexts Will be cleared and set to the set of declaration
2015   /// contexts that are semanticaly connected to this declaration context,
2016   /// in source order, including this context (which may be the only result,
2017   /// for non-namespace contexts).
2018   void collectAllContexts(SmallVectorImpl<DeclContext *> &Contexts);
2019 
2020   /// decl_iterator - Iterates through the declarations stored
2021   /// within this context.
2022   class decl_iterator {
2023     /// Current - The current declaration.
2024     Decl *Current = nullptr;
2025 
2026   public:
2027     using value_type = Decl *;
2028     using reference = const value_type &;
2029     using pointer = const value_type *;
2030     using iterator_category = std::forward_iterator_tag;
2031     using difference_type = std::ptrdiff_t;
2032 
2033     decl_iterator() = default;
decl_iterator(Decl * C)2034     explicit decl_iterator(Decl *C) : Current(C) {}
2035 
2036     reference operator*() const { return Current; }
2037 
2038     // This doesn't meet the iterator requirements, but it's convenient
2039     value_type operator->() const { return Current; }
2040 
2041     decl_iterator& operator++() {
2042       Current = Current->getNextDeclInContext();
2043       return *this;
2044     }
2045 
2046     decl_iterator operator++(int) {
2047       decl_iterator tmp(*this);
2048       ++(*this);
2049       return tmp;
2050     }
2051 
2052     friend bool operator==(decl_iterator x, decl_iterator y) {
2053       return x.Current == y.Current;
2054     }
2055 
2056     friend bool operator!=(decl_iterator x, decl_iterator y) {
2057       return x.Current != y.Current;
2058     }
2059   };
2060 
2061   using decl_range = llvm::iterator_range<decl_iterator>;
2062 
2063   /// decls_begin/decls_end - Iterate over the declarations stored in
2064   /// this context.
decls()2065   decl_range decls() const { return decl_range(decls_begin(), decls_end()); }
2066   decl_iterator decls_begin() const;
decls_end()2067   decl_iterator decls_end() const { return decl_iterator(); }
2068   bool decls_empty() const;
2069 
2070   /// noload_decls_begin/end - Iterate over the declarations stored in this
2071   /// context that are currently loaded; don't attempt to retrieve anything
2072   /// from an external source.
noload_decls()2073   decl_range noload_decls() const {
2074     return decl_range(noload_decls_begin(), noload_decls_end());
2075   }
noload_decls_begin()2076   decl_iterator noload_decls_begin() const { return decl_iterator(FirstDecl); }
noload_decls_end()2077   decl_iterator noload_decls_end() const { return decl_iterator(); }
2078 
2079   /// specific_decl_iterator - Iterates over a subrange of
2080   /// declarations stored in a DeclContext, providing only those that
2081   /// are of type SpecificDecl (or a class derived from it). This
2082   /// iterator is used, for example, to provide iteration over just
2083   /// the fields within a RecordDecl (with SpecificDecl = FieldDecl).
2084   template<typename SpecificDecl>
2085   class specific_decl_iterator {
2086     /// Current - The current, underlying declaration iterator, which
2087     /// will either be NULL or will point to a declaration of
2088     /// type SpecificDecl.
2089     DeclContext::decl_iterator Current;
2090 
2091     /// SkipToNextDecl - Advances the current position up to the next
2092     /// declaration of type SpecificDecl that also meets the criteria
2093     /// required by Acceptable.
SkipToNextDecl()2094     void SkipToNextDecl() {
2095       while (*Current && !isa<SpecificDecl>(*Current))
2096         ++Current;
2097     }
2098 
2099   public:
2100     using value_type = SpecificDecl *;
2101     // TODO: Add reference and pointer types (with some appropriate proxy type)
2102     // if we ever have a need for them.
2103     using reference = void;
2104     using pointer = void;
2105     using difference_type =
2106         std::iterator_traits<DeclContext::decl_iterator>::difference_type;
2107     using iterator_category = std::forward_iterator_tag;
2108 
2109     specific_decl_iterator() = default;
2110 
2111     /// specific_decl_iterator - Construct a new iterator over a
2112     /// subset of the declarations the range [C,
2113     /// end-of-declarations). If A is non-NULL, it is a pointer to a
2114     /// member function of SpecificDecl that should return true for
2115     /// all of the SpecificDecl instances that will be in the subset
2116     /// of iterators. For example, if you want Objective-C instance
2117     /// methods, SpecificDecl will be ObjCMethodDecl and A will be
2118     /// &ObjCMethodDecl::isInstanceMethod.
specific_decl_iterator(DeclContext::decl_iterator C)2119     explicit specific_decl_iterator(DeclContext::decl_iterator C) : Current(C) {
2120       SkipToNextDecl();
2121     }
2122 
2123     value_type operator*() const { return cast<SpecificDecl>(*Current); }
2124 
2125     // This doesn't meet the iterator requirements, but it's convenient
2126     value_type operator->() const { return **this; }
2127 
2128     specific_decl_iterator& operator++() {
2129       ++Current;
2130       SkipToNextDecl();
2131       return *this;
2132     }
2133 
2134     specific_decl_iterator operator++(int) {
2135       specific_decl_iterator tmp(*this);
2136       ++(*this);
2137       return tmp;
2138     }
2139 
2140     friend bool operator==(const specific_decl_iterator& x,
2141                            const specific_decl_iterator& y) {
2142       return x.Current == y.Current;
2143     }
2144 
2145     friend bool operator!=(const specific_decl_iterator& x,
2146                            const specific_decl_iterator& y) {
2147       return x.Current != y.Current;
2148     }
2149   };
2150 
2151   /// Iterates over a filtered subrange of declarations stored
2152   /// in a DeclContext.
2153   ///
2154   /// This iterator visits only those declarations that are of type
2155   /// SpecificDecl (or a class derived from it) and that meet some
2156   /// additional run-time criteria. This iterator is used, for
2157   /// example, to provide access to the instance methods within an
2158   /// Objective-C interface (with SpecificDecl = ObjCMethodDecl and
2159   /// Acceptable = ObjCMethodDecl::isInstanceMethod).
2160   template<typename SpecificDecl, bool (SpecificDecl::*Acceptable)() const>
2161   class filtered_decl_iterator {
2162     /// Current - The current, underlying declaration iterator, which
2163     /// will either be NULL or will point to a declaration of
2164     /// type SpecificDecl.
2165     DeclContext::decl_iterator Current;
2166 
2167     /// SkipToNextDecl - Advances the current position up to the next
2168     /// declaration of type SpecificDecl that also meets the criteria
2169     /// required by Acceptable.
SkipToNextDecl()2170     void SkipToNextDecl() {
2171       while (*Current &&
2172              (!isa<SpecificDecl>(*Current) ||
2173               (Acceptable && !(cast<SpecificDecl>(*Current)->*Acceptable)())))
2174         ++Current;
2175     }
2176 
2177   public:
2178     using value_type = SpecificDecl *;
2179     // TODO: Add reference and pointer types (with some appropriate proxy type)
2180     // if we ever have a need for them.
2181     using reference = void;
2182     using pointer = void;
2183     using difference_type =
2184         std::iterator_traits<DeclContext::decl_iterator>::difference_type;
2185     using iterator_category = std::forward_iterator_tag;
2186 
2187     filtered_decl_iterator() = default;
2188 
2189     /// filtered_decl_iterator - Construct a new iterator over a
2190     /// subset of the declarations the range [C,
2191     /// end-of-declarations). If A is non-NULL, it is a pointer to a
2192     /// member function of SpecificDecl that should return true for
2193     /// all of the SpecificDecl instances that will be in the subset
2194     /// of iterators. For example, if you want Objective-C instance
2195     /// methods, SpecificDecl will be ObjCMethodDecl and A will be
2196     /// &ObjCMethodDecl::isInstanceMethod.
filtered_decl_iterator(DeclContext::decl_iterator C)2197     explicit filtered_decl_iterator(DeclContext::decl_iterator C) : Current(C) {
2198       SkipToNextDecl();
2199     }
2200 
2201     value_type operator*() const { return cast<SpecificDecl>(*Current); }
2202     value_type operator->() const { return cast<SpecificDecl>(*Current); }
2203 
2204     filtered_decl_iterator& operator++() {
2205       ++Current;
2206       SkipToNextDecl();
2207       return *this;
2208     }
2209 
2210     filtered_decl_iterator operator++(int) {
2211       filtered_decl_iterator tmp(*this);
2212       ++(*this);
2213       return tmp;
2214     }
2215 
2216     friend bool operator==(const filtered_decl_iterator& x,
2217                            const filtered_decl_iterator& y) {
2218       return x.Current == y.Current;
2219     }
2220 
2221     friend bool operator!=(const filtered_decl_iterator& x,
2222                            const filtered_decl_iterator& y) {
2223       return x.Current != y.Current;
2224     }
2225   };
2226 
2227   /// Add the declaration D into this context.
2228   ///
2229   /// This routine should be invoked when the declaration D has first
2230   /// been declared, to place D into the context where it was
2231   /// (lexically) defined. Every declaration must be added to one
2232   /// (and only one!) context, where it can be visited via
2233   /// [decls_begin(), decls_end()). Once a declaration has been added
2234   /// to its lexical context, the corresponding DeclContext owns the
2235   /// declaration.
2236   ///
2237   /// If D is also a NamedDecl, it will be made visible within its
2238   /// semantic context via makeDeclVisibleInContext.
2239   void addDecl(Decl *D);
2240 
2241   /// Add the declaration D into this context, but suppress
2242   /// searches for external declarations with the same name.
2243   ///
2244   /// Although analogous in function to addDecl, this removes an
2245   /// important check.  This is only useful if the Decl is being
2246   /// added in response to an external search; in all other cases,
2247   /// addDecl() is the right function to use.
2248   /// See the ASTImporter for use cases.
2249   void addDeclInternal(Decl *D);
2250 
2251   /// Add the declaration D to this context without modifying
2252   /// any lookup tables.
2253   ///
2254   /// This is useful for some operations in dependent contexts where
2255   /// the semantic context might not be dependent;  this basically
2256   /// only happens with friends.
2257   void addHiddenDecl(Decl *D);
2258 
2259   /// Removes a declaration from this context.
2260   void removeDecl(Decl *D);
2261 
2262   /// Checks whether a declaration is in this context.
2263   bool containsDecl(Decl *D) const;
2264 
2265   /// Checks whether a declaration is in this context.
2266   /// This also loads the Decls from the external source before the check.
2267   bool containsDeclAndLoad(Decl *D) const;
2268 
2269   using lookup_result = DeclContextLookupResult;
2270   using lookup_iterator = lookup_result::iterator;
2271 
2272   /// lookup - Find the declarations (if any) with the given Name in
2273   /// this context. Returns a range of iterators that contains all of
2274   /// the declarations with this name, with object, function, member,
2275   /// and enumerator names preceding any tag name. Note that this
2276   /// routine will not look into parent contexts.
2277   lookup_result lookup(DeclarationName Name) const;
2278 
2279   /// Find the declarations with the given name that are visible
2280   /// within this context; don't attempt to retrieve anything from an
2281   /// external source.
2282   lookup_result noload_lookup(DeclarationName Name);
2283 
2284   /// A simplistic name lookup mechanism that performs name lookup
2285   /// into this declaration context without consulting the external source.
2286   ///
2287   /// This function should almost never be used, because it subverts the
2288   /// usual relationship between a DeclContext and the external source.
2289   /// See the ASTImporter for the (few, but important) use cases.
2290   ///
2291   /// FIXME: This is very inefficient; replace uses of it with uses of
2292   /// noload_lookup.
2293   void localUncachedLookup(DeclarationName Name,
2294                            SmallVectorImpl<NamedDecl *> &Results);
2295 
2296   /// Makes a declaration visible within this context.
2297   ///
2298   /// This routine makes the declaration D visible to name lookup
2299   /// within this context and, if this is a transparent context,
2300   /// within its parent contexts up to the first enclosing
2301   /// non-transparent context. Making a declaration visible within a
2302   /// context does not transfer ownership of a declaration, and a
2303   /// declaration can be visible in many contexts that aren't its
2304   /// lexical context.
2305   ///
2306   /// If D is a redeclaration of an existing declaration that is
2307   /// visible from this context, as determined by
2308   /// NamedDecl::declarationReplaces, the previous declaration will be
2309   /// replaced with D.
2310   void makeDeclVisibleInContext(NamedDecl *D);
2311 
2312   /// all_lookups_iterator - An iterator that provides a view over the results
2313   /// of looking up every possible name.
2314   class all_lookups_iterator;
2315 
2316   using lookups_range = llvm::iterator_range<all_lookups_iterator>;
2317 
2318   lookups_range lookups() const;
2319   // Like lookups(), but avoids loading external declarations.
2320   // If PreserveInternalState, avoids building lookup data structures too.
2321   lookups_range noload_lookups(bool PreserveInternalState) const;
2322 
2323   /// Iterators over all possible lookups within this context.
2324   all_lookups_iterator lookups_begin() const;
2325   all_lookups_iterator lookups_end() const;
2326 
2327   /// Iterators over all possible lookups within this context that are
2328   /// currently loaded; don't attempt to retrieve anything from an external
2329   /// source.
2330   all_lookups_iterator noload_lookups_begin() const;
2331   all_lookups_iterator noload_lookups_end() const;
2332 
2333   struct udir_iterator;
2334 
2335   using udir_iterator_base =
2336       llvm::iterator_adaptor_base<udir_iterator, lookup_iterator,
2337                                   std::random_access_iterator_tag,
2338                                   UsingDirectiveDecl *>;
2339 
2340   struct udir_iterator : udir_iterator_base {
udir_iteratorudir_iterator2341     udir_iterator(lookup_iterator I) : udir_iterator_base(I) {}
2342 
2343     UsingDirectiveDecl *operator*() const;
2344   };
2345 
2346   using udir_range = llvm::iterator_range<udir_iterator>;
2347 
2348   udir_range using_directives() const;
2349 
2350   // These are all defined in DependentDiagnostic.h.
2351   class ddiag_iterator;
2352 
2353   using ddiag_range = llvm::iterator_range<DeclContext::ddiag_iterator>;
2354 
2355   inline ddiag_range ddiags() const;
2356 
2357   // Low-level accessors
2358 
2359   /// Mark that there are external lexical declarations that we need
2360   /// to include in our lookup table (and that are not available as external
2361   /// visible lookups). These extra lookup results will be found by walking
2362   /// the lexical declarations of this context. This should be used only if
2363   /// setHasExternalLexicalStorage() has been called on any decl context for
2364   /// which this is the primary context.
setMustBuildLookupTable()2365   void setMustBuildLookupTable() {
2366     assert(this == getPrimaryContext() &&
2367            "should only be called on primary context");
2368     DeclContextBits.HasLazyExternalLexicalLookups = true;
2369   }
2370 
2371   /// Retrieve the internal representation of the lookup structure.
2372   /// This may omit some names if we are lazily building the structure.
getLookupPtr()2373   StoredDeclsMap *getLookupPtr() const { return LookupPtr; }
2374 
2375   /// Ensure the lookup structure is fully-built and return it.
2376   StoredDeclsMap *buildLookup();
2377 
2378   /// Whether this DeclContext has external storage containing
2379   /// additional declarations that are lexically in this context.
hasExternalLexicalStorage()2380   bool hasExternalLexicalStorage() const {
2381     return DeclContextBits.ExternalLexicalStorage;
2382   }
2383 
2384   /// State whether this DeclContext has external storage for
2385   /// declarations lexically in this context.
2386   void setHasExternalLexicalStorage(bool ES = true) const {
2387     DeclContextBits.ExternalLexicalStorage = ES;
2388   }
2389 
2390   /// Whether this DeclContext has external storage containing
2391   /// additional declarations that are visible in this context.
hasExternalVisibleStorage()2392   bool hasExternalVisibleStorage() const {
2393     return DeclContextBits.ExternalVisibleStorage;
2394   }
2395 
2396   /// State whether this DeclContext has external storage for
2397   /// declarations visible in this context.
2398   void setHasExternalVisibleStorage(bool ES = true) const {
2399     DeclContextBits.ExternalVisibleStorage = ES;
2400     if (ES && LookupPtr)
2401       DeclContextBits.NeedToReconcileExternalVisibleStorage = true;
2402   }
2403 
2404   /// Determine whether the given declaration is stored in the list of
2405   /// declarations lexically within this context.
isDeclInLexicalTraversal(const Decl * D)2406   bool isDeclInLexicalTraversal(const Decl *D) const {
2407     return D && (D->NextInContextAndBits.getPointer() || D == FirstDecl ||
2408                  D == LastDecl);
2409   }
2410 
2411   bool setUseQualifiedLookup(bool use = true) const {
2412     bool old_value = DeclContextBits.UseQualifiedLookup;
2413     DeclContextBits.UseQualifiedLookup = use;
2414     return old_value;
2415   }
2416 
shouldUseQualifiedLookup()2417   bool shouldUseQualifiedLookup() const {
2418     return DeclContextBits.UseQualifiedLookup;
2419   }
2420 
2421   static bool classof(const Decl *D);
classof(const DeclContext * D)2422   static bool classof(const DeclContext *D) { return true; }
2423 
2424   void dumpDeclContext() const;
2425   void dumpLookups() const;
2426   void dumpLookups(llvm::raw_ostream &OS, bool DumpDecls = false,
2427                    bool Deserialize = false) const;
2428 
2429 private:
2430   /// Whether this declaration context has had externally visible
2431   /// storage added since the last lookup. In this case, \c LookupPtr's
2432   /// invariant may not hold and needs to be fixed before we perform
2433   /// another lookup.
hasNeedToReconcileExternalVisibleStorage()2434   bool hasNeedToReconcileExternalVisibleStorage() const {
2435     return DeclContextBits.NeedToReconcileExternalVisibleStorage;
2436   }
2437 
2438   /// State that this declaration context has had externally visible
2439   /// storage added since the last lookup. In this case, \c LookupPtr's
2440   /// invariant may not hold and needs to be fixed before we perform
2441   /// another lookup.
2442   void setNeedToReconcileExternalVisibleStorage(bool Need = true) const {
2443     DeclContextBits.NeedToReconcileExternalVisibleStorage = Need;
2444   }
2445 
2446   /// If \c true, this context may have local lexical declarations
2447   /// that are missing from the lookup table.
hasLazyLocalLexicalLookups()2448   bool hasLazyLocalLexicalLookups() const {
2449     return DeclContextBits.HasLazyLocalLexicalLookups;
2450   }
2451 
2452   /// If \c true, this context may have local lexical declarations
2453   /// that are missing from the lookup table.
2454   void setHasLazyLocalLexicalLookups(bool HasLLLL = true) const {
2455     DeclContextBits.HasLazyLocalLexicalLookups = HasLLLL;
2456   }
2457 
2458   /// If \c true, the external source may have lexical declarations
2459   /// that are missing from the lookup table.
hasLazyExternalLexicalLookups()2460   bool hasLazyExternalLexicalLookups() const {
2461     return DeclContextBits.HasLazyExternalLexicalLookups;
2462   }
2463 
2464   /// If \c true, the external source may have lexical declarations
2465   /// that are missing from the lookup table.
2466   void setHasLazyExternalLexicalLookups(bool HasLELL = true) const {
2467     DeclContextBits.HasLazyExternalLexicalLookups = HasLELL;
2468   }
2469 
2470   void reconcileExternalVisibleStorage() const;
2471   bool LoadLexicalDeclsFromExternalStorage() const;
2472 
2473   /// Makes a declaration visible within this context, but
2474   /// suppresses searches for external declarations with the same
2475   /// name.
2476   ///
2477   /// Analogous to makeDeclVisibleInContext, but for the exclusive
2478   /// use of addDeclInternal().
2479   void makeDeclVisibleInContextInternal(NamedDecl *D);
2480 
2481   StoredDeclsMap *CreateStoredDeclsMap(ASTContext &C) const;
2482 
2483   void loadLazyLocalLexicalLookups();
2484   void buildLookupImpl(DeclContext *DCtx, bool Internal);
2485   void makeDeclVisibleInContextWithFlags(NamedDecl *D, bool Internal,
2486                                          bool Rediscoverable);
2487   void makeDeclVisibleInContextImpl(NamedDecl *D, bool Internal);
2488 };
2489 
isTemplateParameter()2490 inline bool Decl::isTemplateParameter() const {
2491   return getKind() == TemplateTypeParm || getKind() == NonTypeTemplateParm ||
2492          getKind() == TemplateTemplateParm;
2493 }
2494 
2495 // Specialization selected when ToTy is not a known subclass of DeclContext.
2496 template <class ToTy,
2497           bool IsKnownSubtype = ::std::is_base_of<DeclContext, ToTy>::value>
2498 struct cast_convert_decl_context {
doitcast_convert_decl_context2499   static const ToTy *doit(const DeclContext *Val) {
2500     return static_cast<const ToTy*>(Decl::castFromDeclContext(Val));
2501   }
2502 
doitcast_convert_decl_context2503   static ToTy *doit(DeclContext *Val) {
2504     return static_cast<ToTy*>(Decl::castFromDeclContext(Val));
2505   }
2506 };
2507 
2508 // Specialization selected when ToTy is a known subclass of DeclContext.
2509 template <class ToTy>
2510 struct cast_convert_decl_context<ToTy, true> {
2511   static const ToTy *doit(const DeclContext *Val) {
2512     return static_cast<const ToTy*>(Val);
2513   }
2514 
2515   static ToTy *doit(DeclContext *Val) {
2516     return static_cast<ToTy*>(Val);
2517   }
2518 };
2519 
2520 } // namespace clang
2521 
2522 namespace llvm {
2523 
2524 /// isa<T>(DeclContext*)
2525 template <typename To>
2526 struct isa_impl<To, ::clang::DeclContext> {
2527   static bool doit(const ::clang::DeclContext &Val) {
2528     return To::classofKind(Val.getDeclKind());
2529   }
2530 };
2531 
2532 /// cast<T>(DeclContext*)
2533 template<class ToTy>
2534 struct cast_convert_val<ToTy,
2535                         const ::clang::DeclContext,const ::clang::DeclContext> {
2536   static const ToTy &doit(const ::clang::DeclContext &Val) {
2537     return *::clang::cast_convert_decl_context<ToTy>::doit(&Val);
2538   }
2539 };
2540 
2541 template<class ToTy>
2542 struct cast_convert_val<ToTy, ::clang::DeclContext, ::clang::DeclContext> {
2543   static ToTy &doit(::clang::DeclContext &Val) {
2544     return *::clang::cast_convert_decl_context<ToTy>::doit(&Val);
2545   }
2546 };
2547 
2548 template<class ToTy>
2549 struct cast_convert_val<ToTy,
2550                      const ::clang::DeclContext*, const ::clang::DeclContext*> {
2551   static const ToTy *doit(const ::clang::DeclContext *Val) {
2552     return ::clang::cast_convert_decl_context<ToTy>::doit(Val);
2553   }
2554 };
2555 
2556 template<class ToTy>
2557 struct cast_convert_val<ToTy, ::clang::DeclContext*, ::clang::DeclContext*> {
2558   static ToTy *doit(::clang::DeclContext *Val) {
2559     return ::clang::cast_convert_decl_context<ToTy>::doit(Val);
2560   }
2561 };
2562 
2563 /// Implement cast_convert_val for Decl -> DeclContext conversions.
2564 template<class FromTy>
2565 struct cast_convert_val< ::clang::DeclContext, FromTy, FromTy> {
2566   static ::clang::DeclContext &doit(const FromTy &Val) {
2567     return *FromTy::castToDeclContext(&Val);
2568   }
2569 };
2570 
2571 template<class FromTy>
2572 struct cast_convert_val< ::clang::DeclContext, FromTy*, FromTy*> {
2573   static ::clang::DeclContext *doit(const FromTy *Val) {
2574     return FromTy::castToDeclContext(Val);
2575   }
2576 };
2577 
2578 template<class FromTy>
2579 struct cast_convert_val< const ::clang::DeclContext, FromTy, FromTy> {
2580   static const ::clang::DeclContext &doit(const FromTy &Val) {
2581     return *FromTy::castToDeclContext(&Val);
2582   }
2583 };
2584 
2585 template<class FromTy>
2586 struct cast_convert_val< const ::clang::DeclContext, FromTy*, FromTy*> {
2587   static const ::clang::DeclContext *doit(const FromTy *Val) {
2588     return FromTy::castToDeclContext(Val);
2589   }
2590 };
2591 
2592 } // namespace llvm
2593 
2594 #endif // LLVM_CLANG_AST_DECLBASE_H
2595