clang
9.0.0
|
Sema - This implements semantic analysis and AST building for C. More...
#include "clang/Sema/Sema.h"
Classes | |
struct | ActOnMemberAccessExtraArgs |
class | ArgumentPackSubstitutionIndexRAII |
RAII object used to change the argument pack substitution index within a Sema object. More... | |
class | BoundTypeDiagnoser |
struct | CodeCompleteExpressionData |
struct | CodeSynthesisContext |
A context in which code is being synthesized (where a source location alone is not sufficient to identify the context). More... | |
class | CompoundScopeRAII |
A RAII object to enter scope of a compound statement. More... | |
class | ConditionResult |
class | ContextRAII |
A RAII object to temporarily push a declaration context. More... | |
class | ContextualImplicitConverter |
Abstract base class used to perform a contextual implicit conversion from an expression to any type passing a filter. More... | |
class | CXXThisScopeRAII |
RAII object used to temporarily allow the C++ 'this' expression to be used, with the given qualifiers on the current class type. More... | |
class | DelayedDiagnostics |
A class which encapsulates the logic for delaying diagnostics during parsing and other processing. More... | |
class | DelayedDiagnosticsState |
class | DeviceDiagBuilder |
Diagnostic builder for CUDA/OpenMP devices errors which may or may not be deferred. More... | |
struct | ExpressionEvaluationContextRecord |
Data structure used to record current or nested expression evaluation contexts. More... | |
class | ExtParameterInfoBuilder |
A helper class for building up ExtParameterInfos. More... | |
class | FPContractStateRAII |
Records and restores the FP_CONTRACT state on entry/exit of compound statements. More... | |
class | FullExprArg |
struct | FunctionDeclAndLoc |
A pair of a canonical FunctionDecl and a SourceLocation. More... | |
struct | FunctionScopeRAII |
An RAII helper that pops function a function scope on exit. More... | |
class | GlobalEagerInstantiationScope |
class | ICEConvertDiagnoser |
class | ImplicitExceptionSpecification |
Helper class that collects exception specifications for implicitly-declared special member functions. More... | |
class | InheritedConstructorInfo |
struct | InstantiatingTemplate |
A stack object to be created when performing template instantiation. More... | |
struct | LateInstantiatedAttribute |
class | LocalEagerInstantiationScope |
class | NameClassification |
struct | NestedNameSpecInfo |
Keeps information about an identifier in a nested-name-spec. More... | |
struct | ObjCArgInfo |
struct | OffsetOfComponent |
struct | OriginalCallArg |
brief A function argument from which we performed template argument More... | |
struct | PackIncludeState |
class | PoppedFunctionScopeDeleter |
Custom deleter to allow FunctionScopeInfos to be kept alive for a short time after they've been popped. More... | |
struct | PragmaAttributeEntry |
This an attribute introduced by #pragma clang attribute. More... | |
struct | PragmaAttributeGroup |
A push'd group of PragmaAttributeEntries. More... | |
struct | PragmaClangSection |
struct | PragmaStack |
class | PragmaStackSentinelRAII |
class | SemaDiagnosticBuilder |
Helper class that creates diagnostics with optional template instantiation stacks. More... | |
class | SFINAETrap |
RAII class used to determine whether SFINAE has trapped any errors that occur during template argument deduction. More... | |
struct | SkipBodyInfo |
class | SpecialMemberOverloadResult |
SpecialMemberOverloadResult - The overloading result for a special member function. More... | |
class | SpecialMemberOverloadResultEntry |
class | SynthesizedFunctionScope |
RAII object to handle the state changes required to synthesize a function body. More... | |
class | TentativeAnalysisScope |
RAII class used to indicate that we are performing provisional semantic analysis to determine the validity of a construct, so typo-correction and diagnostics in the immediate context (not within implicitly-instantiated templates) should be suppressed. More... | |
struct | TypeDiagnoser |
Abstract class used to diagnose incomplete types. More... | |
struct | TypeTagData |
class | VerifyICEDiagnoser |
Abstract base class used for diagnosing integer constant expression violations. More... | |
Public Member Functions | |
NamedDecl * | findLocallyScopedExternCDecl (DeclarationName Name) |
Look for a locally scoped extern "C" declaration by the given name. More... | |
void | SetLateTemplateParser (LateTemplateParserCB *LTP, LateTemplateParserCleanupCB *LTPCleanup, void *P) |
bool | isConstantEvaluated () |
void | LoadExternalWeakUndeclaredIdentifiers () |
Load weak undeclared identifiers from the external source. More... | |
void | WarnOnPendingNoDerefs (ExpressionEvaluationContextRecord &Rec) |
Emit a warning for all pending noderef expressions that we recorded. More... | |
MangleNumberingContext * | getCurrentMangleNumberContext (const DeclContext *DC, Decl *&ManglingContextDecl) |
Compute the mangling number context for a lambda expression or block literal. More... | |
bool | isExternalWithNoLinkageType (ValueDecl *VD) |
Determine if VD, which must be a variable or function, is an external symbol that nonetheless can't be referenced from outside this translation unit because its type has no linkage and it's not extern "C". More... | |
void | getUndefinedButUsed (SmallVectorImpl< std::pair< NamedDecl *, SourceLocation > > &Undefined) |
Obtain a sorted list of functions that are undefined but ODR-used. More... | |
const llvm::MapVector< FieldDecl *, DeleteLocs > & | getMismatchingDeleteExpressions () const |
Retrieves list of suspicious delete-expressions that will be checked at the end of translation unit. More... | |
void | ReadMethodPool (Selector Sel) |
Read the contents of the method pool for a given selector from external storage. More... | |
void | updateOutOfDateSelector (Selector Sel) |
void | EmitCurrentDiagnostic (unsigned DiagID) |
Cause the active diagnostic on the DiagosticsEngine to be emitted. More... | |
void | addImplicitTypedef (StringRef Name, QualType T) |
Sema (Preprocessor &pp, ASTContext &ctxt, ASTConsumer &consumer, TranslationUnitKind TUKind=TU_Complete, CodeCompleteConsumer *CompletionConsumer=nullptr) | |
~Sema () | |
void | Initialize () |
Perform initialization that occurs after the parser has been initialized but before it parses anything. More... | |
const LangOptions & | getLangOpts () const |
OpenCLOptions & | getOpenCLOptions () |
FPOptions & | getFPOptions () |
DiagnosticsEngine & | getDiagnostics () const |
SourceManager & | getSourceManager () const |
Preprocessor & | getPreprocessor () const |
ASTContext & | getASTContext () const |
ASTConsumer & | getASTConsumer () const |
ASTMutationListener * | getASTMutationListener () const |
ExternalSemaSource * | getExternalSource () const |
void | addExternalSource (ExternalSemaSource *E) |
Registers an external source. More... | |
void | PrintStats () const |
Print out statistics about the semantic analysis. More... | |
SemaDiagnosticBuilder | Diag (SourceLocation Loc, unsigned DiagID) |
Emit a diagnostic. More... | |
SemaDiagnosticBuilder | Diag (SourceLocation Loc, const PartialDiagnostic &PD) |
Emit a partial diagnostic. More... | |
PartialDiagnostic | PDiag (unsigned DiagID=0) |
Build a partial diagnostic. More... | |
bool | findMacroSpelling (SourceLocation &loc, StringRef name) |
Looks through the macro-expansion chain for the given location, looking for a macro expansion with the given name. More... | |
std::string | getFixItZeroInitializerForType (QualType T, SourceLocation Loc) const |
Get a string to suggest for zero-initialization of a type. More... | |
std::string | getFixItZeroLiteralForType (QualType T, SourceLocation Loc) const |
SourceLocation | getLocForEndOfToken (SourceLocation Loc, unsigned Offset=0) |
Calls Lexer::getLocForEndOfToken() More... | |
ModuleLoader & | getModuleLoader () const |
Retrieve the module loader associated with the preprocessor. More... | |
void | emitAndClearUnusedLocalTypedefWarnings () |
void | ActOnStartOfTranslationUnit () |
This is called before the very first declaration in the translation unit is parsed. More... | |
void | ActOnEndOfTranslationUnit () |
ActOnEndOfTranslationUnit - This is called at the very end of the translation unit when EOF is reached and all but the top-level scope is popped. More... | |
void | ActOnEndOfTranslationUnitFragment (TUFragmentKind Kind) |
void | CheckDelegatingCtorCycles () |
Scope * | getScopeForContext (DeclContext *Ctx) |
Determines the active Scope associated with the given declaration context. More... | |
void | PushFunctionScope () |
Enter a new function scope. More... | |
void | PushBlockScope (Scope *BlockScope, BlockDecl *Block) |
sema::LambdaScopeInfo * | PushLambdaScope () |
void | RecordParsingTemplateParameterDepth (unsigned Depth) |
This is used to inform Sema what the current TemplateParameterDepth is during Parsing. More... | |
void | PushCapturedRegionScope (Scope *RegionScope, CapturedDecl *CD, RecordDecl *RD, CapturedRegionKind K) |
PoppedFunctionScopePtr | PopFunctionScopeInfo (const sema::AnalysisBasedWarnings::Policy *WP=nullptr, const Decl *D=nullptr, QualType BlockType=QualType()) |
Pop a function (or block or lambda or captured region) scope from the stack. More... | |
sema::FunctionScopeInfo * | getCurFunction () const |
sema::FunctionScopeInfo * | getEnclosingFunction () const |
void | setFunctionHasBranchIntoScope () |
void | setFunctionHasBranchProtectedScope () |
void | setFunctionHasIndirectGoto () |
void | PushCompoundScope (bool IsStmtExpr) |
void | PopCompoundScope () |
sema::CompoundScopeInfo & | getCurCompoundScope () const |
bool | hasAnyUnrecoverableErrorsInThisFunction () const |
Determine whether any errors occurred within this function/method/ block. More... | |
sema::BlockScopeInfo * | getCurBlock () |
Retrieve the current block, if any. More... | |
sema::LambdaScopeInfo * | getCurLambda (bool IgnoreNonLambdaCapturingScope=false) |
Retrieve the current lambda scope info, if any. More... | |
sema::LambdaScopeInfo * | getCurGenericLambda () |
Retrieve the current generic lambda info, if any. More... | |
sema::CapturedRegionScopeInfo * | getCurCapturedRegion () |
Retrieve the current captured region, if any. More... | |
SmallVectorImpl< Decl * > & | WeakTopLevelDecls () |
WeakTopLevelDeclDecls - access to #pragma weak-generated Decls. More... | |
void | ActOnComment (SourceRange Comment) |
QualType | BuildQualifiedType (QualType T, SourceLocation Loc, Qualifiers Qs, const DeclSpec *DS=nullptr) |
QualType | BuildQualifiedType (QualType T, SourceLocation Loc, unsigned CVRA, const DeclSpec *DS=nullptr) |
QualType | BuildPointerType (QualType T, SourceLocation Loc, DeclarationName Entity) |
Build a pointer type. More... | |
QualType | BuildReferenceType (QualType T, bool LValueRef, SourceLocation Loc, DeclarationName Entity) |
Build a reference type. More... | |
QualType | BuildArrayType (QualType T, ArrayType::ArraySizeModifier ASM, Expr *ArraySize, unsigned Quals, SourceRange Brackets, DeclarationName Entity) |
Build an array type. More... | |
QualType | BuildVectorType (QualType T, Expr *VecSize, SourceLocation AttrLoc) |
QualType | BuildExtVectorType (QualType T, Expr *ArraySize, SourceLocation AttrLoc) |
Build an ext-vector type. More... | |
QualType | BuildAddressSpaceAttr (QualType &T, LangAS ASIdx, Expr *AddrSpace, SourceLocation AttrLoc) |
BuildAddressSpaceAttr - Builds a DependentAddressSpaceType if an expression is uninstantiated. More... | |
QualType | BuildAddressSpaceAttr (QualType &T, Expr *AddrSpace, SourceLocation AttrLoc) |
Same as above, but constructs the AddressSpace index if not provided. More... | |
bool | CheckFunctionReturnType (QualType T, SourceLocation Loc) |
QualType | BuildFunctionType (QualType T, MutableArrayRef< QualType > ParamTypes, SourceLocation Loc, DeclarationName Entity, const FunctionProtoType::ExtProtoInfo &EPI) |
Build a function type. More... | |
QualType | BuildMemberPointerType (QualType T, QualType Class, SourceLocation Loc, DeclarationName Entity) |
Build a member pointer type T Class::*. More... | |
QualType | BuildBlockPointerType (QualType T, SourceLocation Loc, DeclarationName Entity) |
Build a block pointer type. More... | |
QualType | BuildParenType (QualType T) |
Build a paren type including T . More... | |
QualType | BuildAtomicType (QualType T, SourceLocation Loc) |
QualType | BuildReadPipeType (QualType T, SourceLocation Loc) |
Build a Read-only Pipe type. More... | |
QualType | BuildWritePipeType (QualType T, SourceLocation Loc) |
Build a Write-only Pipe type. More... | |
TypeSourceInfo * | GetTypeForDeclarator (Declarator &D, Scope *S) |
GetTypeForDeclarator - Convert the type for the specified declarator to Type instances. More... | |
TypeSourceInfo * | GetTypeForDeclaratorCast (Declarator &D, QualType FromTy) |
ParsedType | CreateParsedType (QualType T, TypeSourceInfo *TInfo) |
Package the given type and TSI into a ParsedType. More... | |
DeclarationNameInfo | GetNameForDeclarator (Declarator &D) |
GetNameForDeclarator - Determine the full declaration name for the given Declarator. More... | |
DeclarationNameInfo | GetNameFromUnqualifiedId (const UnqualifiedId &Name) |
Retrieves the declaration name from a parsed unqualified-id. More... | |
CanThrowResult | canThrow (const Expr *E) |
const FunctionProtoType * | ResolveExceptionSpec (SourceLocation Loc, const FunctionProtoType *FPT) |
void | UpdateExceptionSpec (FunctionDecl *FD, const FunctionProtoType::ExceptionSpecInfo &ESI) |
bool | CheckSpecifiedExceptionType (QualType &T, SourceRange Range) |
CheckSpecifiedExceptionType - Check if the given type is valid in an exception specification. More... | |
bool | CheckDistantExceptionSpec (QualType T) |
CheckDistantExceptionSpec - Check if the given type is a pointer or pointer to member to a function with an exception specification. More... | |
bool | CheckEquivalentExceptionSpec (FunctionDecl *Old, FunctionDecl *New) |
bool | CheckEquivalentExceptionSpec (const FunctionProtoType *Old, SourceLocation OldLoc, const FunctionProtoType *New, SourceLocation NewLoc) |
CheckEquivalentExceptionSpec - Check if the two types have equivalent exception specifications. More... | |
bool | CheckEquivalentExceptionSpec (const PartialDiagnostic &DiagID, const PartialDiagnostic &NoteID, const FunctionProtoType *Old, SourceLocation OldLoc, const FunctionProtoType *New, SourceLocation NewLoc) |
bool | handlerCanCatch (QualType HandlerType, QualType ExceptionType) |
bool | CheckExceptionSpecSubset (const PartialDiagnostic &DiagID, const PartialDiagnostic &NestedDiagID, const PartialDiagnostic &NoteID, const PartialDiagnostic &NoThrowDiagID, const FunctionProtoType *Superset, SourceLocation SuperLoc, const FunctionProtoType *Subset, SourceLocation SubLoc) |
CheckExceptionSpecSubset - Check whether the second function type's exception specification is a subset (or equivalent) of the first function type. More... | |
bool | CheckParamExceptionSpec (const PartialDiagnostic &NestedDiagID, const PartialDiagnostic &NoteID, const FunctionProtoType *Target, SourceLocation TargetLoc, const FunctionProtoType *Source, SourceLocation SourceLoc) |
CheckParamExceptionSpec - Check if the parameter and return types of the two functions have equivalent exception specs. More... | |
TypeResult | ActOnTypeName (Scope *S, Declarator &D) |
ParsedType | ActOnObjCInstanceType (SourceLocation Loc) |
The parser has parsed the context-sensitive type 'instancetype' in an Objective-C message declaration. More... | |
Module * | getOwningModule (Decl *Entity) |
Get the module owning an entity. More... | |
void | makeMergedDefinitionVisible (NamedDecl *ND) |
Make a merged definition of an existing hidden definition ND visible at the specified location. More... | |
bool | isModuleVisible (const Module *M, bool ModulePrivate=false) |
bool | isVisible (const NamedDecl *D) |
Determine whether a declaration is visible to name lookup. More... | |
bool | hasVisibleDeclaration (const NamedDecl *D, llvm::SmallVectorImpl< Module *> *Modules=nullptr) |
Determine whether any declaration of an entity is visible. More... | |
bool | hasVisibleDeclarationSlow (const NamedDecl *D, llvm::SmallVectorImpl< Module *> *Modules) |
bool | hasVisibleMergedDefinition (NamedDecl *Def) |
bool | hasMergedDefinitionInCurrentModule (NamedDecl *Def) |
bool | hasStructuralCompatLayout (Decl *D, Decl *Suggested) |
Determine if D and Suggested have a structurally compatible layout as described in C11 6.2.7/1. More... | |
bool | hasVisibleDefinition (NamedDecl *D, NamedDecl **Suggested, bool OnlyNeedComplete=false) |
Determine if D has a visible definition. More... | |
bool | hasVisibleDefinition (const NamedDecl *D) |
bool | hasVisibleDefaultArgument (const NamedDecl *D, llvm::SmallVectorImpl< Module *> *Modules=nullptr) |
Determine if the template parameter D has a visible default argument. More... | |
bool | hasVisibleExplicitSpecialization (const NamedDecl *D, llvm::SmallVectorImpl< Module *> *Modules=nullptr) |
Determine if there is a visible declaration of D that is an explicit specialization declaration for a specialization of a template. More... | |
bool | hasVisibleMemberSpecialization (const NamedDecl *D, llvm::SmallVectorImpl< Module *> *Modules=nullptr) |
Determine if there is a visible declaration of D that is a member specialization declaration (as opposed to an instantiated declaration). More... | |
bool | isEquivalentInternalLinkageDeclaration (const NamedDecl *A, const NamedDecl *B) |
Determine if A and B are equivalent internal linkage declarations from different modules, and thus an ambiguity error can be downgraded to an extension warning. More... | |
void | diagnoseEquivalentInternalLinkageDeclarations (SourceLocation Loc, const NamedDecl *D, ArrayRef< const NamedDecl *> Equiv) |
bool | isUsualDeallocationFunction (const CXXMethodDecl *FD) |
bool | isCompleteType (SourceLocation Loc, QualType T) |
bool | RequireCompleteType (SourceLocation Loc, QualType T, TypeDiagnoser &Diagnoser) |
Ensure that the type T is a complete type. More... | |
bool | RequireCompleteType (SourceLocation Loc, QualType T, unsigned DiagID) |
template<typename... Ts> | |
bool | RequireCompleteType (SourceLocation Loc, QualType T, unsigned DiagID, const Ts &...Args) |
void | completeExprArrayBound (Expr *E) |
bool | RequireCompleteExprType (Expr *E, TypeDiagnoser &Diagnoser) |
Ensure that the type of the given expression is complete. More... | |
bool | RequireCompleteExprType (Expr *E, unsigned DiagID) |
template<typename... Ts> | |
bool | RequireCompleteExprType (Expr *E, unsigned DiagID, const Ts &...Args) |
bool | RequireLiteralType (SourceLocation Loc, QualType T, TypeDiagnoser &Diagnoser) |
Ensure that the type T is a literal type. More... | |
bool | RequireLiteralType (SourceLocation Loc, QualType T, unsigned DiagID) |
template<typename... Ts> | |
bool | RequireLiteralType (SourceLocation Loc, QualType T, unsigned DiagID, const Ts &...Args) |
QualType | getElaboratedType (ElaboratedTypeKeyword Keyword, const CXXScopeSpec &SS, QualType T, TagDecl *OwnedTagDecl=nullptr) |
Retrieve a version of the type 'T' that is elaborated by Keyword, qualified by the nested-name-specifier contained in SS, and that is (re)declared by OwnedTagDecl, which is nullptr if this is not a (re)declaration. More... | |
QualType | BuildTypeofExprType (Expr *E, SourceLocation Loc) |
QualType | BuildDecltypeType (Expr *E, SourceLocation Loc, bool AsUnevaluated=true) |
If AsUnevaluated is false, E is treated as though it were an evaluated context, such as when building a type for decltype(auto). More... | |
QualType | BuildUnaryTransformType (QualType BaseType, UnaryTransformType::UTTKind UKind, SourceLocation Loc) |
DeclGroupPtrTy | ConvertDeclToDeclGroup (Decl *Ptr, Decl *OwnedType=nullptr) |
void | DiagnoseUseOfUnimplementedSelectors () |
bool | isSimpleTypeSpecifier (tok::TokenKind Kind) const |
Determine whether the token kind starts a simple-type-specifier. More... | |
ParsedType | getTypeName (const IdentifierInfo &II, SourceLocation NameLoc, Scope *S, CXXScopeSpec *SS=nullptr, bool isClassName=false, bool HasTrailingDot=false, ParsedType ObjectType=nullptr, bool IsCtorOrDtorName=false, bool WantNontrivialTypeSourceInfo=false, bool IsClassTemplateDeductionContext=true, IdentifierInfo **CorrectedII=nullptr) |
If the identifier refers to a type name within this scope, return the declaration of that type. More... | |
TypeSpecifierType | isTagName (IdentifierInfo &II, Scope *S) |
isTagName() - This method is called for error recovery purposes only to determine if the specified name is a valid tag name ("struct foo"). More... | |
bool | isMicrosoftMissingTypename (const CXXScopeSpec *SS, Scope *S) |
isMicrosoftMissingTypename - In Microsoft mode, within class scope, if a CXXScopeSpec's type is equal to the type of one of the base classes then downgrade the missing typename error to a warning. More... | |
void | DiagnoseUnknownTypeName (IdentifierInfo *&II, SourceLocation IILoc, Scope *S, CXXScopeSpec *SS, ParsedType &SuggestedType, bool IsTemplateName=false) |
ParsedType | ActOnMSVCUnknownTypeName (const IdentifierInfo &II, SourceLocation NameLoc, bool IsTemplateTypeArg) |
Attempt to behave like MSVC in situations where lookup of an unqualified type name has failed in a dependent context. More... | |
NameClassification | ClassifyName (Scope *S, CXXScopeSpec &SS, IdentifierInfo *&Name, SourceLocation NameLoc, const Token &NextToken, bool IsAddressOfOperand, CorrectionCandidateCallback *CCC=nullptr) |
Perform name lookup on the given name, classifying it based on the results of name lookup and the following token. More... | |
TemplateNameKindForDiagnostics | getTemplateNameKindForDiagnostics (TemplateName Name) |
bool | mightBeIntendedToBeTemplateName (ExprResult E, bool &Dependent) |
Determine whether it's plausible that E was intended to be a template-name. More... | |
void | diagnoseExprIntendedAsTemplateName (Scope *S, ExprResult TemplateName, SourceLocation Less, SourceLocation Greater) |
Decl * | ActOnDeclarator (Scope *S, Declarator &D) |
NamedDecl * | HandleDeclarator (Scope *S, Declarator &D, MultiTemplateParamsArg TemplateParameterLists) |
void | RegisterLocallyScopedExternCDecl (NamedDecl *ND, Scope *S) |
Register the given locally-scoped extern "C" declaration so that it can be found later for redeclarations. More... | |
bool | DiagnoseClassNameShadow (DeclContext *DC, DeclarationNameInfo Info) |
DiagnoseClassNameShadow - Implement C++ [class.mem]p13: If T is the name of a class, then each of the following shall have a name different from T: More... | |
bool | diagnoseQualifiedDeclaration (CXXScopeSpec &SS, DeclContext *DC, DeclarationName Name, SourceLocation Loc, bool IsTemplateId) |
Diagnose a declaration whose declarator-id has the given nested-name-specifier. More... | |
void | diagnoseIgnoredQualifiers (unsigned DiagID, unsigned Quals, SourceLocation FallbackLoc, SourceLocation ConstQualLoc=SourceLocation(), SourceLocation VolatileQualLoc=SourceLocation(), SourceLocation RestrictQualLoc=SourceLocation(), SourceLocation AtomicQualLoc=SourceLocation(), SourceLocation UnalignedQualLoc=SourceLocation()) |
void | DiagnoseFunctionSpecifiers (const DeclSpec &DS) |
Diagnose function specifiers on a declaration of an identifier that does not identify a function. More... | |
NamedDecl * | getShadowedDeclaration (const TypedefNameDecl *D, const LookupResult &R) |
Return the declaration shadowed by the given typedef D , or null if it doesn't shadow any declaration or shadowing warnings are disabled. More... | |
NamedDecl * | getShadowedDeclaration (const VarDecl *D, const LookupResult &R) |
Return the declaration shadowed by the given variable D , or null if it doesn't shadow any declaration or shadowing warnings are disabled. More... | |
void | CheckShadow (NamedDecl *D, NamedDecl *ShadowedDecl, const LookupResult &R) |
Diagnose variable or built-in function shadowing. More... | |
void | CheckShadow (Scope *S, VarDecl *D) |
Check -Wshadow without the advantage of a previous lookup. More... | |
void | CheckShadowingDeclModification (Expr *E, SourceLocation Loc) |
Warn if 'E', which is an expression that is about to be modified, refers to a shadowing declaration. More... | |
void | DiagnoseShadowingLambdaDecls (const sema::LambdaScopeInfo *LSI) |
Diagnose shadowing for variables shadowed in the lambda record LambdaRD when these variables are captured by the lambda. More... | |
void | CheckCastAlign (Expr *Op, QualType T, SourceRange TRange) |
CheckCastAlign - Implements -Wcast-align, which warns when a pointer cast increases the alignment requirements. More... | |
void | handleTagNumbering (const TagDecl *Tag, Scope *TagScope) |
void | setTagNameForLinkagePurposes (TagDecl *TagFromDeclSpec, TypedefNameDecl *NewTD) |
void | CheckTypedefForVariablyModifiedType (Scope *S, TypedefNameDecl *D) |
NamedDecl * | ActOnTypedefDeclarator (Scope *S, Declarator &D, DeclContext *DC, TypeSourceInfo *TInfo, LookupResult &Previous) |
NamedDecl * | ActOnTypedefNameDecl (Scope *S, DeclContext *DC, TypedefNameDecl *D, LookupResult &Previous, bool &Redeclaration) |
ActOnTypedefNameDecl - Perform semantic checking for a declaration which declares a typedef-name, either using the 'typedef' type specifier or via a C++0x [dcl.typedef]p2 alias-declaration: 'using T = A;'. More... | |
NamedDecl * | ActOnVariableDeclarator (Scope *S, Declarator &D, DeclContext *DC, TypeSourceInfo *TInfo, LookupResult &Previous, MultiTemplateParamsArg TemplateParamLists, bool &AddToScope, ArrayRef< BindingDecl *> Bindings=None) |
NamedDecl * | ActOnDecompositionDeclarator (Scope *S, Declarator &D, MultiTemplateParamsArg TemplateParamLists) |
bool | CheckVariableDeclaration (VarDecl *NewVD, LookupResult &Previous) |
Perform semantic checking on a newly-created variable declaration. More... | |
void | CheckVariableDeclarationType (VarDecl *NewVD) |
bool | DeduceVariableDeclarationType (VarDecl *VDecl, bool DirectInit, Expr *Init) |
void | CheckCompleteVariableDeclaration (VarDecl *VD) |
void | CheckCompleteDecompositionDeclaration (DecompositionDecl *DD) |
void | MaybeSuggestAddingStaticToDecl (const FunctionDecl *D) |
NamedDecl * | ActOnFunctionDeclarator (Scope *S, Declarator &D, DeclContext *DC, TypeSourceInfo *TInfo, LookupResult &Previous, MultiTemplateParamsArg TemplateParamLists, bool &AddToScope) |
bool | AddOverriddenMethods (CXXRecordDecl *DC, CXXMethodDecl *MD) |
AddOverriddenMethods - See if a method overrides any in the base classes, and if so, check that it's a valid override and remember it. More... | |
bool | CheckConstexprFunctionDecl (const FunctionDecl *FD) |
bool | CheckConstexprFunctionBody (const FunctionDecl *FD, Stmt *Body) |
Check the body for the given constexpr function declaration only contains the permitted types of statement. More... | |
void | DiagnoseHiddenVirtualMethods (CXXMethodDecl *MD) |
Diagnose methods which overload virtual methods in a base class without overriding any. More... | |
void | FindHiddenVirtualMethods (CXXMethodDecl *MD, SmallVectorImpl< CXXMethodDecl *> &OverloadedMethods) |
Check if a method overloads virtual methods in a base class without overriding any. More... | |
void | NoteHiddenVirtualMethods (CXXMethodDecl *MD, SmallVectorImpl< CXXMethodDecl *> &OverloadedMethods) |
bool | CheckFunctionDeclaration (Scope *S, FunctionDecl *NewFD, LookupResult &Previous, bool IsMemberSpecialization) |
Perform semantic checking of a new function declaration. More... | |
bool | shouldLinkDependentDeclWithPrevious (Decl *D, Decl *OldDecl) |
Checks if the new declaration declared in dependent context must be put in the same redeclaration chain as the specified declaration. More... | |
bool | canFullyTypeCheckRedeclaration (ValueDecl *NewD, ValueDecl *OldD, QualType NewT, QualType OldT) |
Determines if we can perform a correct type check for D as a redeclaration of PrevDecl . More... | |
void | CheckMain (FunctionDecl *FD, const DeclSpec &D) |
void | CheckMSVCRTEntryPoint (FunctionDecl *FD) |
Attr * | getImplicitCodeSegOrSectionAttrForFunction (const FunctionDecl *FD, bool IsDefinition) |
Returns an implicit CodeSegAttr if a __declspec(code_seg) is found on a containing class. More... | |
void | CheckFunctionOrTemplateParamDeclarator (Scope *S, Declarator &D) |
Common checks for a parameter-declaration that should apply to both function parameters and non-type template parameters. More... | |
Decl * | ActOnParamDeclarator (Scope *S, Declarator &D) |
ActOnParamDeclarator - Called from Parser::ParseFunctionDeclarator() to introduce parameters into function prototype scope. More... | |
ParmVarDecl * | BuildParmVarDeclForTypedef (DeclContext *DC, SourceLocation Loc, QualType T) |
Synthesizes a variable for a parameter arising from a typedef. More... | |
ParmVarDecl * | CheckParameter (DeclContext *DC, SourceLocation StartLoc, SourceLocation NameLoc, IdentifierInfo *Name, QualType T, TypeSourceInfo *TSInfo, StorageClass SC) |
void | ActOnParamDefaultArgument (Decl *param, SourceLocation EqualLoc, Expr *defarg) |
ActOnParamDefaultArgument - Check whether the default argument provided for a function parameter is well-formed. More... | |
void | ActOnParamUnparsedDefaultArgument (Decl *param, SourceLocation EqualLoc, SourceLocation ArgLoc) |
ActOnParamUnparsedDefaultArgument - We've seen a default argument for a function parameter, but we can't parse it yet because we're inside a class definition. More... | |
void | ActOnParamDefaultArgumentError (Decl *param, SourceLocation EqualLoc) |
ActOnParamDefaultArgumentError - Parsing or semantic analysis of the default argument for the parameter param failed. More... | |
bool | SetParamDefaultArgument (ParmVarDecl *Param, Expr *DefaultArg, SourceLocation EqualLoc) |
void | checkNonTrivialCUnionInInitializer (const Expr *Init, SourceLocation Loc) |
Emit diagnostics if the initializer or any of its explicit or implicitly-generated subexpressions require copying or default-initializing a type that is or contains a C union type that is non-trivial to copy or default-initialize. More... | |
void | checkNonTrivialCUnion (QualType QT, SourceLocation Loc, NonTrivialCUnionContext UseContext, unsigned NonTrivialKind) |
Emit diagnostics if a non-trivial C union type or a struct that contains a non-trivial C union is used in an invalid context. More... | |
void | AddInitializerToDecl (Decl *dcl, Expr *init, bool DirectInit) |
AddInitializerToDecl - Adds the initializer Init to the declaration dcl. More... | |
void | ActOnUninitializedDecl (Decl *dcl) |
void | ActOnInitializerError (Decl *Dcl) |
ActOnInitializerError - Given that there was an error parsing an initializer for the given declaration, try to return to some form of sanity. More... | |
void | ActOnPureSpecifier (Decl *D, SourceLocation PureSpecLoc) |
void | ActOnCXXForRangeDecl (Decl *D) |
StmtResult | ActOnCXXForRangeIdentifier (Scope *S, SourceLocation IdentLoc, IdentifierInfo *Ident, ParsedAttributes &Attrs, SourceLocation AttrEnd) |
void | SetDeclDeleted (Decl *dcl, SourceLocation DelLoc) |
void | SetDeclDefaulted (Decl *dcl, SourceLocation DefaultLoc) |
void | CheckStaticLocalForDllExport (VarDecl *VD) |
Check if VD needs to be dllexport/dllimport due to being in a dllexport/import function. More... | |
void | FinalizeDeclaration (Decl *D) |
FinalizeDeclaration - called by ParseDeclarationAfterDeclarator to perform any semantic actions necessary after any initializer has been attached. More... | |
DeclGroupPtrTy | FinalizeDeclaratorGroup (Scope *S, const DeclSpec &DS, ArrayRef< Decl *> Group) |
DeclGroupPtrTy | BuildDeclaratorGroup (MutableArrayRef< Decl *> Group) |
BuildDeclaratorGroup - convert a list of declarations into a declaration group, performing any necessary semantic checking. More... | |
void | ActOnDocumentableDecl (Decl *D) |
Should be called on all declarations that might have attached documentation comments. More... | |
void | ActOnDocumentableDecls (ArrayRef< Decl *> Group) |
void | ActOnFinishKNRParamDeclarations (Scope *S, Declarator &D, SourceLocation LocAfterDecls) |
void | CheckForFunctionRedefinition (FunctionDecl *FD, const FunctionDecl *EffectiveDefinition=nullptr, SkipBodyInfo *SkipBody=nullptr) |
Decl * | ActOnStartOfFunctionDef (Scope *S, Declarator &D, MultiTemplateParamsArg TemplateParamLists, SkipBodyInfo *SkipBody=nullptr) |
Decl * | ActOnStartOfFunctionDef (Scope *S, Decl *D, SkipBodyInfo *SkipBody=nullptr) |
void | ActOnStartOfObjCMethodDef (Scope *S, Decl *D) |
ActOnStartOfObjCMethodDef - This routine sets up parameters; invisible and user declared, in the method definition's AST. More... | |
bool | isObjCMethodDecl (Decl *D) |
bool | canDelayFunctionBody (const Declarator &D) |
Determine whether we can delay parsing the body of a function or function template until it is used, assuming we don't care about emitting code for that function. More... | |
bool | canSkipFunctionBody (Decl *D) |
Determine whether we can skip parsing the body of a function definition, assuming we don't care about analyzing its body or emitting code for that function. More... | |
void | computeNRVO (Stmt *Body, sema::FunctionScopeInfo *Scope) |
Given the set of return statements within a function body, compute the variables that are subject to the named return value optimization. More... | |
Decl * | ActOnFinishFunctionBody (Decl *Decl, Stmt *Body) |
Decl * | ActOnFinishFunctionBody (Decl *Decl, Stmt *Body, bool IsInstantiation) |
Decl * | ActOnSkippedFunctionBody (Decl *Decl) |
void | ActOnFinishInlineFunctionDef (FunctionDecl *D) |
void | ActOnFinishDelayedAttribute (Scope *S, Decl *D, ParsedAttributes &Attrs) |
ActOnFinishDelayedAttribute - Invoked when we have finished parsing an attribute for which parsing is delayed. More... | |
void | DiagnoseUnusedParameters (ArrayRef< ParmVarDecl *> Parameters) |
Diagnose any unused parameters in the given sequence of ParmVarDecl pointers. More... | |
void | DiagnoseSizeOfParametersAndReturnValue (ArrayRef< ParmVarDecl *> Parameters, QualType ReturnTy, NamedDecl *D) |
Diagnose whether the size of parameters or return value of a function or obj-c method definition is pass-by-value and larger than a specified threshold. More... | |
void | DiagnoseInvalidJumps (Stmt *Body) |
Decl * | ActOnFileScopeAsmDecl (Expr *expr, SourceLocation AsmLoc, SourceLocation RParenLoc) |
Decl * | ActOnEmptyDeclaration (Scope *S, const ParsedAttributesView &AttrList, SourceLocation SemiLoc) |
Handle a C++11 empty-declaration and attribute-declaration. More... | |
DeclGroupPtrTy | ActOnModuleDecl (SourceLocation StartLoc, SourceLocation ModuleLoc, ModuleDeclKind MDK, ModuleIdPath Path, bool IsFirstDecl) |
The parser has processed a module-declaration that begins the definition of a module interface or implementation. More... | |
DeclGroupPtrTy | ActOnGlobalModuleFragmentDecl (SourceLocation ModuleLoc) |
The parser has processed a global-module-fragment declaration that begins the definition of the global module fragment of the current module unit. More... | |
DeclGroupPtrTy | ActOnPrivateModuleFragmentDecl (SourceLocation ModuleLoc, SourceLocation PrivateLoc) |
The parser has processed a private-module-fragment declaration that begins the definition of the private module fragment of the current module unit. More... | |
DeclResult | ActOnModuleImport (SourceLocation StartLoc, SourceLocation ExportLoc, SourceLocation ImportLoc, ModuleIdPath Path) |
The parser has processed a module import declaration. More... | |
DeclResult | ActOnModuleImport (SourceLocation StartLoc, SourceLocation ExportLoc, SourceLocation ImportLoc, Module *M, ModuleIdPath Path={}) |
void | ActOnModuleInclude (SourceLocation DirectiveLoc, Module *Mod) |
The parser has processed a module import translated from a #include or similar preprocessing directive. More... | |
void | BuildModuleInclude (SourceLocation DirectiveLoc, Module *Mod) |
void | ActOnModuleBegin (SourceLocation DirectiveLoc, Module *Mod) |
The parsed has entered a submodule. More... | |
void | ActOnModuleEnd (SourceLocation DirectiveLoc, Module *Mod) |
The parser has left a submodule. More... | |
void | createImplicitModuleImportForErrorRecovery (SourceLocation Loc, Module *Mod) |
Create an implicit import of the given module at the given source location, for error recovery, if possible. More... | |
void | diagnoseMissingImport (SourceLocation Loc, NamedDecl *Decl, MissingImportKind MIK, bool Recover=true) |
Diagnose that the specified declaration needs to be visible but isn't, and suggest a module import that would resolve the problem. More... | |
void | diagnoseMissingImport (SourceLocation Loc, NamedDecl *Decl, SourceLocation DeclLoc, ArrayRef< Module *> Modules, MissingImportKind MIK, bool Recover) |
Decl * | ActOnStartExportDecl (Scope *S, SourceLocation ExportLoc, SourceLocation LBraceLoc) |
We have parsed the start of an export declaration, including the '{' (if present). More... | |
Decl * | ActOnFinishExportDecl (Scope *S, Decl *ExportDecl, SourceLocation RBraceLoc) |
Complete the definition of an export declaration. More... | |
void | checkSpecializationVisibility (SourceLocation Loc, NamedDecl *Spec) |
We've found a use of a templated declaration that would trigger an implicit instantiation. More... | |
void | checkPartialSpecializationVisibility (SourceLocation Loc, NamedDecl *Spec) |
We've found a use of a template specialization that would select a partial specialization. More... | |
PrintingPolicy | getPrintingPolicy () const |
Retrieve a suitable printing policy for diagnostics. More... | |
void | ActOnPopScope (SourceLocation Loc, Scope *S) |
Scope actions. More... | |
void | ActOnTranslationUnitScope (Scope *S) |
Decl * | ParsedFreeStandingDeclSpec (Scope *S, AccessSpecifier AS, DeclSpec &DS, RecordDecl *&AnonRecord) |
ParsedFreeStandingDeclSpec - This method is invoked when a declspec with no declarator (e.g. More... | |
Decl * | ParsedFreeStandingDeclSpec (Scope *S, AccessSpecifier AS, DeclSpec &DS, MultiTemplateParamsArg TemplateParams, bool IsExplicitInstantiation, RecordDecl *&AnonRecord) |
ParsedFreeStandingDeclSpec - This method is invoked when a declspec with no declarator (e.g. More... | |
Decl * | BuildAnonymousStructOrUnion (Scope *S, DeclSpec &DS, AccessSpecifier AS, RecordDecl *Record, const PrintingPolicy &Policy) |
BuildAnonymousStructOrUnion - Handle the declaration of an anonymous structure or union. More... | |
Decl * | BuildMicrosoftCAnonymousStruct (Scope *S, DeclSpec &DS, RecordDecl *Record) |
BuildMicrosoftCAnonymousStruct - Handle the declaration of an Microsoft C anonymous structure. More... | |
NonTagKind | getNonTagTypeDeclKind (const Decl *D, TagTypeKind TTK) |
Given a non-tag type declaration, returns an enum useful for indicating what kind of non-tag type this is. More... | |
bool | isAcceptableTagRedeclaration (const TagDecl *Previous, TagTypeKind NewTag, bool isDefinition, SourceLocation NewTagLoc, const IdentifierInfo *Name) |
Determine whether a tag with a given kind is acceptable as a redeclaration of the given tag declaration. More... | |
Decl * | ActOnTag (Scope *S, unsigned TagSpec, TagUseKind TUK, SourceLocation KWLoc, CXXScopeSpec &SS, IdentifierInfo *Name, SourceLocation NameLoc, const ParsedAttributesView &Attr, AccessSpecifier AS, SourceLocation ModulePrivateLoc, MultiTemplateParamsArg TemplateParameterLists, bool &OwnedDecl, bool &IsDependent, SourceLocation ScopedEnumKWLoc, bool ScopedEnumUsesClassTag, TypeResult UnderlyingType, bool IsTypeSpecifier, bool IsTemplateParamOrArg, SkipBodyInfo *SkipBody=nullptr) |
This is invoked when we see 'struct foo' or 'struct {'. More... | |
Decl * | ActOnTemplatedFriendTag (Scope *S, SourceLocation FriendLoc, unsigned TagSpec, SourceLocation TagLoc, CXXScopeSpec &SS, IdentifierInfo *Name, SourceLocation NameLoc, const ParsedAttributesView &Attr, MultiTemplateParamsArg TempParamLists) |
Handle a friend tag declaration where the scope specifier was templated. More... | |
TypeResult | ActOnDependentTag (Scope *S, unsigned TagSpec, TagUseKind TUK, const CXXScopeSpec &SS, IdentifierInfo *Name, SourceLocation TagLoc, SourceLocation NameLoc) |
void | ActOnDefs (Scope *S, Decl *TagD, SourceLocation DeclStart, IdentifierInfo *ClassName, SmallVectorImpl< Decl *> &Decls) |
Called whenever @defs(ClassName) is encountered in the source. More... | |
Decl * | ActOnField (Scope *S, Decl *TagD, SourceLocation DeclStart, Declarator &D, Expr *BitfieldWidth) |
ActOnField - Each field of a C struct/union is passed into this in order to create a FieldDecl object for it. More... | |
FieldDecl * | HandleField (Scope *S, RecordDecl *TagD, SourceLocation DeclStart, Declarator &D, Expr *BitfieldWidth, InClassInitStyle InitStyle, AccessSpecifier AS) |
HandleField - Analyze a field of a C struct or a C++ data member. More... | |
MSPropertyDecl * | HandleMSProperty (Scope *S, RecordDecl *TagD, SourceLocation DeclStart, Declarator &D, Expr *BitfieldWidth, InClassInitStyle InitStyle, AccessSpecifier AS, const ParsedAttr &MSPropertyAttr) |
HandleMSProperty - Analyze a __delcspec(property) field of a C++ class. More... | |
FieldDecl * | CheckFieldDecl (DeclarationName Name, QualType T, TypeSourceInfo *TInfo, RecordDecl *Record, SourceLocation Loc, bool Mutable, Expr *BitfieldWidth, InClassInitStyle InitStyle, SourceLocation TSSL, AccessSpecifier AS, NamedDecl *PrevDecl, Declarator *D=nullptr) |
Build a new FieldDecl and check its well-formedness. More... | |
bool | CheckNontrivialField (FieldDecl *FD) |
void | DiagnoseNontrivial (const CXXRecordDecl *Record, CXXSpecialMember CSM) |
Diagnose why the specified class does not have a trivial special member of the given kind. More... | |
bool | SpecialMemberIsTrivial (CXXMethodDecl *MD, CXXSpecialMember CSM, TrivialABIHandling TAH=TAH_IgnoreTrivialABI, bool Diagnose=false) |
Determine whether a defaulted or deleted special member function is trivial, as specified in C++11 [class.ctor]p5, C++11 [class.copy]p12, C++11 [class.copy]p25, and C++11 [class.dtor]p5. More... | |
CXXSpecialMember | getSpecialMember (const CXXMethodDecl *MD) |
getSpecialMember - get the special member enum for a method. More... | |
void | ActOnLastBitfield (SourceLocation DeclStart, SmallVectorImpl< Decl *> &AllIvarDecls) |
ActOnLastBitfield - This routine handles synthesized bitfields rules for class and class extensions. More... | |
Decl * | ActOnIvar (Scope *S, SourceLocation DeclStart, Declarator &D, Expr *BitfieldWidth, tok::ObjCKeywordKind visibility) |
ActOnIvar - Each ivar field of an objective-c class is passed into this in order to create an IvarDecl object for it. More... | |
void | ActOnFields (Scope *S, SourceLocation RecLoc, Decl *TagDecl, ArrayRef< Decl *> Fields, SourceLocation LBrac, SourceLocation RBrac, const ParsedAttributesView &AttrList) |
void | ActOnTagStartDefinition (Scope *S, Decl *TagDecl) |
ActOnTagStartDefinition - Invoked when we have entered the scope of a tag's definition (e.g., for an enumeration, class, struct, or union). More... | |
bool | ActOnDuplicateDefinition (DeclSpec &DS, Decl *Prev, SkipBodyInfo &SkipBody) |
Perform ODR-like check for C/ObjC when merging tag types from modules. More... | |
SkippedDefinitionContext | ActOnTagStartSkippedDefinition (Scope *S, Decl *TD) |
Invoked when we enter a tag definition that we're skipping. More... | |
Decl * | ActOnObjCContainerStartDefinition (Decl *IDecl) |
void | ActOnStartCXXMemberDeclarations (Scope *S, Decl *TagDecl, SourceLocation FinalLoc, bool IsFinalSpelledSealed, SourceLocation LBraceLoc) |
ActOnStartCXXMemberDeclarations - Invoked when we have parsed a C++ record definition's base-specifiers clause and are starting its member declarations. More... | |
void | ActOnTagFinishDefinition (Scope *S, Decl *TagDecl, SourceRange BraceRange) |
ActOnTagFinishDefinition - Invoked once we have finished parsing the definition of a tag (enumeration, class, struct, or union). More... | |
void | ActOnTagFinishSkippedDefinition (SkippedDefinitionContext Context) |
void | ActOnObjCContainerFinishDefinition () |
void | ActOnObjCTemporaryExitContainerContext (DeclContext *DC) |
Invoked when we must temporarily exit the objective-c container scope for parsing/looking-up C constructs. More... | |
void | ActOnObjCReenterContainerContext (DeclContext *DC) |
void | ActOnTagDefinitionError (Scope *S, Decl *TagDecl) |
ActOnTagDefinitionError - Invoked when there was an unrecoverable error parsing the definition of a tag. More... | |
EnumConstantDecl * | CheckEnumConstant (EnumDecl *Enum, EnumConstantDecl *LastEnumConst, SourceLocation IdLoc, IdentifierInfo *Id, Expr *val) |
bool | CheckEnumUnderlyingType (TypeSourceInfo *TI) |
Check that this is a valid underlying type for an enum declaration. More... | |
bool | CheckEnumRedeclaration (SourceLocation EnumLoc, bool IsScoped, QualType EnumUnderlyingTy, bool IsFixed, const EnumDecl *Prev) |
Check whether this is a valid redeclaration of a previous enumeration. More... | |
SkipBodyInfo | shouldSkipAnonEnumBody (Scope *S, IdentifierInfo *II, SourceLocation IILoc) |
Determine whether the body of an anonymous enumeration should be skipped. More... | |
Decl * | ActOnEnumConstant (Scope *S, Decl *EnumDecl, Decl *LastEnumConstant, SourceLocation IdLoc, IdentifierInfo *Id, const ParsedAttributesView &Attrs, SourceLocation EqualLoc, Expr *Val) |
void | ActOnEnumBody (SourceLocation EnumLoc, SourceRange BraceRange, Decl *EnumDecl, ArrayRef< Decl *> Elements, Scope *S, const ParsedAttributesView &Attr) |
DeclContext * | getContainingDC (DeclContext *DC) |
void | PushDeclContext (Scope *S, DeclContext *DC) |
Set the current declaration context until it gets popped. More... | |
void | PopDeclContext () |
void | EnterDeclaratorContext (Scope *S, DeclContext *DC) |
EnterDeclaratorContext - Used when we must lookup names in the context of a declarator's nested name specifier. More... | |
void | ExitDeclaratorContext (Scope *S) |
void | ActOnReenterFunctionContext (Scope *S, Decl *D) |
Push the parameters of D, which must be a function, into scope. More... | |
void | ActOnExitFunctionContext () |
DeclContext * | getFunctionLevelDeclContext () |
FunctionDecl * | getCurFunctionDecl () |
getCurFunctionDecl - If inside of a function body, this returns a pointer to the function decl for the function being parsed. More... | |
ObjCMethodDecl * | getCurMethodDecl () |
getCurMethodDecl - If inside of a method body, this returns a pointer to the method decl for the method being parsed. More... | |
NamedDecl * | getCurFunctionOrMethodDecl () |
getCurFunctionOrMethodDecl - Return the Decl for the current ObjC method or C function we're in, otherwise return null. More... | |
void | PushOnScopeChains (NamedDecl *D, Scope *S, bool AddToContext=true) |
Add this decl to the scope shadowed decl chains. More... | |
bool | isDeclInScope (NamedDecl *D, DeclContext *Ctx, Scope *S=nullptr, bool AllowInlineNamespace=false) |
isDeclInScope - If 'Ctx' is a function/method, isDeclInScope returns true if 'D' is in Scope 'S', otherwise 'S' is ignored and isDeclInScope returns true if 'D' belongs to the given declaration context. More... | |
TypedefDecl * | ParseTypedefDecl (Scope *S, Declarator &D, QualType T, TypeSourceInfo *TInfo) |
Subroutines of ActOnDeclarator(). More... | |
bool | isIncompatibleTypedef (TypeDecl *Old, TypedefNameDecl *New) |
AvailabilityAttr * | mergeAvailabilityAttr (NamedDecl *D, SourceRange Range, IdentifierInfo *Platform, bool Implicit, VersionTuple Introduced, VersionTuple Deprecated, VersionTuple Obsoleted, bool IsUnavailable, StringRef Message, bool IsStrict, StringRef Replacement, AvailabilityMergeKind AMK, int Priority, unsigned AttrSpellingListIndex) |
Attribute merging methods. Return true if a new attribute was added. More... | |
TypeVisibilityAttr * | mergeTypeVisibilityAttr (Decl *D, SourceRange Range, TypeVisibilityAttr::VisibilityType Vis, unsigned AttrSpellingListIndex) |
VisibilityAttr * | mergeVisibilityAttr (Decl *D, SourceRange Range, VisibilityAttr::VisibilityType Vis, unsigned AttrSpellingListIndex) |
UuidAttr * | mergeUuidAttr (Decl *D, SourceRange Range, unsigned AttrSpellingListIndex, StringRef Uuid) |
DLLImportAttr * | mergeDLLImportAttr (Decl *D, SourceRange Range, unsigned AttrSpellingListIndex) |
DLLExportAttr * | mergeDLLExportAttr (Decl *D, SourceRange Range, unsigned AttrSpellingListIndex) |
MSInheritanceAttr * | mergeMSInheritanceAttr (Decl *D, SourceRange Range, bool BestCase, unsigned AttrSpellingListIndex, MSInheritanceAttr::Spelling SemanticSpelling) |
FormatAttr * | mergeFormatAttr (Decl *D, SourceRange Range, IdentifierInfo *Format, int FormatIdx, int FirstArg, unsigned AttrSpellingListIndex) |
SectionAttr * | mergeSectionAttr (Decl *D, SourceRange Range, StringRef Name, unsigned AttrSpellingListIndex) |
CodeSegAttr * | mergeCodeSegAttr (Decl *D, SourceRange Range, StringRef Name, unsigned AttrSpellingListIndex) |
AlwaysInlineAttr * | mergeAlwaysInlineAttr (Decl *D, SourceRange Range, IdentifierInfo *Ident, unsigned AttrSpellingListIndex) |
MinSizeAttr * | mergeMinSizeAttr (Decl *D, SourceRange Range, unsigned AttrSpellingListIndex) |
NoSpeculativeLoadHardeningAttr * | mergeNoSpeculativeLoadHardeningAttr (Decl *D, const NoSpeculativeLoadHardeningAttr &AL) |
SpeculativeLoadHardeningAttr * | mergeSpeculativeLoadHardeningAttr (Decl *D, const SpeculativeLoadHardeningAttr &AL) |
OptimizeNoneAttr * | mergeOptimizeNoneAttr (Decl *D, SourceRange Range, unsigned AttrSpellingListIndex) |
InternalLinkageAttr * | mergeInternalLinkageAttr (Decl *D, const ParsedAttr &AL) |
InternalLinkageAttr * | mergeInternalLinkageAttr (Decl *D, const InternalLinkageAttr &AL) |
CommonAttr * | mergeCommonAttr (Decl *D, const ParsedAttr &AL) |
CommonAttr * | mergeCommonAttr (Decl *D, const CommonAttr &AL) |
void | mergeDeclAttributes (NamedDecl *New, Decl *Old, AvailabilityMergeKind AMK=AMK_Redeclaration) |
mergeDeclAttributes - Copy attributes from the Old decl to the New one. More... | |
void | MergeTypedefNameDecl (Scope *S, TypedefNameDecl *New, LookupResult &OldDecls) |
MergeTypedefNameDecl - We just parsed a typedef 'New' which has the same name and scope as a previous declaration 'Old'. More... | |
bool | MergeFunctionDecl (FunctionDecl *New, NamedDecl *&Old, Scope *S, bool MergeTypeWithOld) |
MergeFunctionDecl - We just parsed a function 'New' from declarator D which has the same name and scope as a previous declaration 'Old'. More... | |
bool | MergeCompatibleFunctionDecls (FunctionDecl *New, FunctionDecl *Old, Scope *S, bool MergeTypeWithOld) |
Completes the merge of two function declarations that are known to be compatible. More... | |
void | mergeObjCMethodDecls (ObjCMethodDecl *New, ObjCMethodDecl *Old) |
void | MergeVarDecl (VarDecl *New, LookupResult &Previous) |
MergeVarDecl - We just parsed a variable 'New' which has the same name and scope as a previous declaration 'Old'. More... | |
void | MergeVarDeclTypes (VarDecl *New, VarDecl *Old, bool MergeTypeWithOld) |
MergeVarDeclTypes - We parsed a variable 'New' which has the same name and scope as a previous declaration 'Old'. More... | |
void | MergeVarDeclExceptionSpecs (VarDecl *New, VarDecl *Old) |
Merge the exception specifications of two variable declarations. More... | |
bool | checkVarDeclRedefinition (VarDecl *OldDefn, VarDecl *NewDefn) |
We've just determined that Old and New both appear to be definitions of the same variable. More... | |
void | notePreviousDefinition (const NamedDecl *Old, SourceLocation New) |
bool | MergeCXXFunctionDecl (FunctionDecl *New, FunctionDecl *Old, Scope *S) |
MergeCXXFunctionDecl - Merge two declarations of the same C++ function, once we already know that they have the same type. More... | |
OverloadKind | CheckOverload (Scope *S, FunctionDecl *New, const LookupResult &OldDecls, NamedDecl *&OldDecl, bool IsForUsingDecl) |
Determine whether the given New declaration is an overload of the declarations in Old. More... | |
bool | IsOverload (FunctionDecl *New, FunctionDecl *Old, bool IsForUsingDecl, bool ConsiderCudaAttrs=true) |
ImplicitConversionSequence | TryImplicitConversion (Expr *From, QualType ToType, bool SuppressUserConversions, bool AllowExplicit, bool InOverloadResolution, bool CStyle, bool AllowObjCWritebackConversion) |
bool | IsIntegralPromotion (Expr *From, QualType FromType, QualType ToType) |
IsIntegralPromotion - Determines whether the conversion from the expression From (whose potentially-adjusted type is FromType) to ToType is an integral promotion (C++ 4.5). More... | |
bool | IsFloatingPointPromotion (QualType FromType, QualType ToType) |
IsFloatingPointPromotion - Determines whether the conversion from FromType to ToType is a floating point promotion (C++ 4.6). More... | |
bool | IsComplexPromotion (QualType FromType, QualType ToType) |
Determine if a conversion is a complex promotion. More... | |
bool | IsPointerConversion (Expr *From, QualType FromType, QualType ToType, bool InOverloadResolution, QualType &ConvertedType, bool &IncompatibleObjC) |
IsPointerConversion - Determines whether the conversion of the expression From, which has the (possibly adjusted) type FromType, can be converted to the type ToType via a pointer conversion (C++ 4.10). More... | |
bool | isObjCPointerConversion (QualType FromType, QualType ToType, QualType &ConvertedType, bool &IncompatibleObjC) |
isObjCPointerConversion - Determines whether this is an Objective-C pointer conversion. More... | |
bool | isObjCWritebackConversion (QualType FromType, QualType ToType, QualType &ConvertedType) |
Determine whether this is an Objective-C writeback conversion, used for parameter passing when performing automatic reference counting. More... | |
bool | IsBlockPointerConversion (QualType FromType, QualType ToType, QualType &ConvertedType) |
bool | FunctionParamTypesAreEqual (const FunctionProtoType *OldType, const FunctionProtoType *NewType, unsigned *ArgPos=nullptr) |
FunctionParamTypesAreEqual - This routine checks two function proto types for equality of their argument types. More... | |
void | HandleFunctionTypeMismatch (PartialDiagnostic &PDiag, QualType FromType, QualType ToType) |
HandleFunctionTypeMismatch - Gives diagnostic information for differeing function types. More... | |
void | maybeExtendBlockObject (ExprResult &E) |
Do an explicit extend of the given block pointer if we're in ARC. More... | |
CastKind | PrepareCastToObjCObjectPointer (ExprResult &E) |
Prepare a conversion of the given expression to an ObjC object pointer type. More... | |
bool | CheckPointerConversion (Expr *From, QualType ToType, CastKind &Kind, CXXCastPath &BasePath, bool IgnoreBaseAccess, bool Diagnose=true) |
CheckPointerConversion - Check the pointer conversion from the expression From to the type ToType. More... | |
bool | IsMemberPointerConversion (Expr *From, QualType FromType, QualType ToType, bool InOverloadResolution, QualType &ConvertedType) |
IsMemberPointerConversion - Determines whether the conversion of the expression From, which has the (possibly adjusted) type FromType, can be converted to the type ToType via a member pointer conversion (C++ 4.11). More... | |
bool | CheckMemberPointerConversion (Expr *From, QualType ToType, CastKind &Kind, CXXCastPath &BasePath, bool IgnoreBaseAccess) |
CheckMemberPointerConversion - Check the member pointer conversion from the expression From to the type ToType. More... | |
bool | IsQualificationConversion (QualType FromType, QualType ToType, bool CStyle, bool &ObjCLifetimeConversion) |
IsQualificationConversion - Determines whether the conversion from an rvalue of type FromType to ToType is a qualification conversion (C++ 4.4). More... | |
bool | IsFunctionConversion (QualType FromType, QualType ToType, QualType &ResultTy) |
Determine whether the conversion from FromType to ToType is a valid conversion that strips "noexcept" or "noreturn" off the nested function type. More... | |
bool | DiagnoseMultipleUserDefinedConversion (Expr *From, QualType ToType) |
bool | isSameOrCompatibleFunctionType (CanQualType Param, CanQualType Arg) |
Compare types for equality with respect to possibly compatible function types (noreturn adjustment, implicit calling conventions). More... | |
ExprResult | PerformMoveOrCopyInitialization (const InitializedEntity &Entity, const VarDecl *NRVOCandidate, QualType ResultType, Expr *Value, bool AllowNRVO=true) |
Perform the initialization of a potentially-movable value, which is the result of return value. More... | |
bool | CanPerformCopyInitialization (const InitializedEntity &Entity, ExprResult Init) |
ExprResult | PerformCopyInitialization (const InitializedEntity &Entity, SourceLocation EqualLoc, ExprResult Init, bool TopLevelOfInitList=false, bool AllowExplicit=false) |
ExprResult | PerformObjectArgumentInitialization (Expr *From, NestedNameSpecifier *Qualifier, NamedDecl *FoundDecl, CXXMethodDecl *Method) |
PerformObjectArgumentInitialization - Perform initialization of the implicit object parameter for the given Method with the given expression. More... | |
void | checkInitializerLifetime (const InitializedEntity &Entity, Expr *Init) |
Check that the lifetime of the initializer (and its subobjects) is sufficient for initializing the entity, and perform lifetime extension (when permitted) if not. More... | |
ExprResult | PerformContextuallyConvertToBool (Expr *From) |
PerformContextuallyConvertToBool - Perform a contextual conversion of the expression From to bool (C++0x [conv]p3). More... | |
ExprResult | PerformContextuallyConvertToObjCPointer (Expr *From) |
PerformContextuallyConvertToObjCPointer - Perform a contextual conversion of the expression From to an Objective-C pointer type. More... | |
ExprResult | CheckConvertedConstantExpression (Expr *From, QualType T, llvm::APSInt &Value, CCEKind CCE) |
ExprResult | CheckConvertedConstantExpression (Expr *From, QualType T, APValue &Value, CCEKind CCE) |
ExprResult | PerformContextualImplicitConversion (SourceLocation Loc, Expr *FromE, ContextualImplicitConverter &Converter) |
Perform a contextual implicit conversion. More... | |
ObjCSubscriptKind | CheckSubscriptingKind (Expr *FromE) |
CheckSubscriptingKind - This routine decide what type of indexing represented by "FromE" is being done. More... | |
ObjCLiteralKind | CheckLiteralKind (Expr *FromE) |
ExprResult | PerformObjectMemberConversion (Expr *From, NestedNameSpecifier *Qualifier, NamedDecl *FoundDecl, NamedDecl *Member) |
Cast a base object to a member's actual type. More... | |
void | AddOverloadCandidate (FunctionDecl *Function, DeclAccessPair FoundDecl, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool SuppressUserConversions=false, bool PartialOverloading=false, bool AllowExplicit=true, bool AllowExplicitConversion=false, ADLCallKind IsADLCandidate=ADLCallKind::NotADL, ConversionSequenceList EarlyConversions=None) |
AddOverloadCandidate - Adds the given function to the set of candidate functions, using the given function call arguments. More... | |
void | AddFunctionCandidates (const UnresolvedSetImpl &Functions, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, TemplateArgumentListInfo *ExplicitTemplateArgs=nullptr, bool SuppressUserConversions=false, bool PartialOverloading=false, bool FirstArgumentIsBase=false) |
Add all of the function declarations in the given function set to the overload candidate set. More... | |
void | AddMethodCandidate (DeclAccessPair FoundDecl, QualType ObjectType, Expr::Classification ObjectClassification, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool SuppressUserConversion=false) |
AddMethodCandidate - Adds a named decl (which is some kind of method) as a method candidate to the given overload set. More... | |
void | AddMethodCandidate (CXXMethodDecl *Method, DeclAccessPair FoundDecl, CXXRecordDecl *ActingContext, QualType ObjectType, Expr::Classification ObjectClassification, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool SuppressUserConversions=false, bool PartialOverloading=false, ConversionSequenceList EarlyConversions=None) |
AddMethodCandidate - Adds the given C++ member function to the set of candidate functions, using the given function call arguments and the object argument (Object ). More... | |
void | AddMethodTemplateCandidate (FunctionTemplateDecl *MethodTmpl, DeclAccessPair FoundDecl, CXXRecordDecl *ActingContext, TemplateArgumentListInfo *ExplicitTemplateArgs, QualType ObjectType, Expr::Classification ObjectClassification, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool SuppressUserConversions=false, bool PartialOverloading=false) |
Add a C++ member function template as a candidate to the candidate set, using template argument deduction to produce an appropriate member function template specialization. More... | |
void | AddTemplateOverloadCandidate (FunctionTemplateDecl *FunctionTemplate, DeclAccessPair FoundDecl, TemplateArgumentListInfo *ExplicitTemplateArgs, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool SuppressUserConversions=false, bool PartialOverloading=false, bool AllowExplicit=true, ADLCallKind IsADLCandidate=ADLCallKind::NotADL) |
Add a C++ function template specialization as a candidate in the candidate set, using template argument deduction to produce an appropriate function template specialization. More... | |
bool | CheckNonDependentConversions (FunctionTemplateDecl *FunctionTemplate, ArrayRef< QualType > ParamTypes, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, ConversionSequenceList &Conversions, bool SuppressUserConversions, CXXRecordDecl *ActingContext=nullptr, QualType ObjectType=QualType(), Expr::Classification ObjectClassification={}) |
Check that implicit conversion sequences can be formed for each argument whose corresponding parameter has a non-dependent type, per DR1391's [temp.deduct.call]p10. More... | |
void | AddConversionCandidate (CXXConversionDecl *Conversion, DeclAccessPair FoundDecl, CXXRecordDecl *ActingContext, Expr *From, QualType ToType, OverloadCandidateSet &CandidateSet, bool AllowObjCConversionOnExplicit, bool AllowExplicit, bool AllowResultConversion=true) |
AddConversionCandidate - Add a C++ conversion function as a candidate in the candidate set (C++ [over.match.conv], C++ [over.match.copy]). More... | |
void | AddTemplateConversionCandidate (FunctionTemplateDecl *FunctionTemplate, DeclAccessPair FoundDecl, CXXRecordDecl *ActingContext, Expr *From, QualType ToType, OverloadCandidateSet &CandidateSet, bool AllowObjCConversionOnExplicit, bool AllowExplicit, bool AllowResultConversion=true) |
Adds a conversion function template specialization candidate to the overload set, using template argument deduction to deduce the template arguments of the conversion function template from the type that we are converting to (C++ [temp.deduct.conv]). More... | |
void | AddSurrogateCandidate (CXXConversionDecl *Conversion, DeclAccessPair FoundDecl, CXXRecordDecl *ActingContext, const FunctionProtoType *Proto, Expr *Object, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet) |
AddSurrogateCandidate - Adds a "surrogate" candidate function that converts the given Object to a function pointer via the conversion function Conversion , and then attempts to call it with the given arguments (C++ [over.call.object]p2-4). More... | |
void | AddMemberOperatorCandidates (OverloadedOperatorKind Op, SourceLocation OpLoc, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, SourceRange OpRange=SourceRange()) |
Add overload candidates for overloaded operators that are member functions. More... | |
void | AddBuiltinCandidate (QualType *ParamTys, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool IsAssignmentOperator=false, unsigned NumContextualBoolArguments=0) |
AddBuiltinCandidate - Add a candidate for a built-in operator. More... | |
void | AddBuiltinOperatorCandidates (OverloadedOperatorKind Op, SourceLocation OpLoc, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet) |
AddBuiltinOperatorCandidates - Add the appropriate built-in operator overloads to the candidate set (C++ [over.built]), based on the operator Op and the arguments given. More... | |
void | AddArgumentDependentLookupCandidates (DeclarationName Name, SourceLocation Loc, ArrayRef< Expr *> Args, TemplateArgumentListInfo *ExplicitTemplateArgs, OverloadCandidateSet &CandidateSet, bool PartialOverloading=false) |
Add function candidates found via argument-dependent lookup to the set of overloading candidates. More... | |
void | NoteOverloadCandidate (NamedDecl *Found, FunctionDecl *Fn, QualType DestType=QualType(), bool TakingAddress=false) |
void | NoteAllOverloadCandidates (Expr *E, QualType DestType=QualType(), bool TakingAddress=false) |
EnableIfAttr * | CheckEnableIf (FunctionDecl *Function, ArrayRef< Expr *> Args, bool MissingImplicitThis=false) |
Check the enable_if expressions on the given function. More... | |
std::pair< Expr *, std::string > | findFailedBooleanCondition (Expr *Cond) |
Find the failed Boolean condition within a given Boolean constant expression, and describe it with a string. More... | |
bool | diagnoseArgDependentDiagnoseIfAttrs (const FunctionDecl *Function, const Expr *ThisArg, ArrayRef< const Expr *> Args, SourceLocation Loc) |
Emit diagnostics for the diagnose_if attributes on Function, ignoring any non-ArgDependent DiagnoseIfAttrs. More... | |
bool | diagnoseArgIndependentDiagnoseIfAttrs (const NamedDecl *ND, SourceLocation Loc) |
Emit diagnostics for the diagnose_if attributes on Function, ignoring any ArgDependent DiagnoseIfAttrs. More... | |
bool | checkAddressOfFunctionIsAvailable (const FunctionDecl *Function, bool Complain=false, SourceLocation Loc=SourceLocation()) |
Returns whether the given function's address can be taken or not, optionally emitting a diagnostic if the address can't be taken. More... | |
QualType | ExtractUnqualifiedFunctionType (QualType PossiblyAFunctionType) |
FunctionDecl * | ResolveAddressOfOverloadedFunction (Expr *AddressOfExpr, QualType TargetType, bool Complain, DeclAccessPair &Found, bool *pHadMultipleCandidates=nullptr) |
ResolveAddressOfOverloadedFunction - Try to resolve the address of an overloaded function (C++ [over.over]), where From is an expression with overloaded function type and ToType is the type we're trying to resolve to. More... | |
FunctionDecl * | resolveAddressOfOnlyViableOverloadCandidate (Expr *E, DeclAccessPair &FoundResult) |
Given an expression that refers to an overloaded function, try to resolve that function to a single function that can have its address taken. More... | |
bool | resolveAndFixAddressOfOnlyViableOverloadCandidate (ExprResult &SrcExpr, bool DoFunctionPointerConversion=false) |
Given an overloaded function, tries to turn it into a non-overloaded function reference using resolveAddressOfOnlyViableOverloadCandidate. More... | |
FunctionDecl * | ResolveSingleFunctionTemplateSpecialization (OverloadExpr *ovl, bool Complain=false, DeclAccessPair *Found=nullptr) |
Given an expression that refers to an overloaded function, try to resolve that overloaded function expression down to a single function. More... | |
bool | ResolveAndFixSingleFunctionTemplateSpecialization (ExprResult &SrcExpr, bool DoFunctionPointerConverion=false, bool Complain=false, SourceRange OpRangeForComplaining=SourceRange(), QualType DestTypeForComplaining=QualType(), unsigned DiagIDForComplaining=0) |
Expr * | FixOverloadedFunctionReference (Expr *E, DeclAccessPair FoundDecl, FunctionDecl *Fn) |
FixOverloadedFunctionReference - E is an expression that refers to a C++ overloaded function (possibly with some parentheses and perhaps a '&' around it). More... | |
ExprResult | FixOverloadedFunctionReference (ExprResult, DeclAccessPair FoundDecl, FunctionDecl *Fn) |
void | AddOverloadedCallCandidates (UnresolvedLookupExpr *ULE, ArrayRef< Expr *> Args, OverloadCandidateSet &CandidateSet, bool PartialOverloading=false) |
Add the overload candidates named by callee and/or found by argument dependent lookup to the given overload set. More... | |
ForRangeStatus | BuildForRangeBeginEndCall (SourceLocation Loc, SourceLocation RangeLoc, const DeclarationNameInfo &NameInfo, LookupResult &MemberLookup, OverloadCandidateSet *CandidateSet, Expr *Range, ExprResult *CallExpr) |
Build a call to 'begin' or 'end' for a C++11 for-range statement. More... | |
ExprResult | BuildOverloadedCallExpr (Scope *S, Expr *Fn, UnresolvedLookupExpr *ULE, SourceLocation LParenLoc, MultiExprArg Args, SourceLocation RParenLoc, Expr *ExecConfig, bool AllowTypoCorrection=true, bool CalleesAddressIsTaken=false) |
BuildOverloadedCallExpr - Given the call expression that calls Fn (which eventually refers to the declaration Func) and the call arguments Args/NumArgs, attempt to resolve the function call down to a specific function. More... | |
bool | buildOverloadedCallSet (Scope *S, Expr *Fn, UnresolvedLookupExpr *ULE, MultiExprArg Args, SourceLocation RParenLoc, OverloadCandidateSet *CandidateSet, ExprResult *Result) |
Constructs and populates an OverloadedCandidateSet from the given function. More... | |
ExprResult | CreateOverloadedUnaryOp (SourceLocation OpLoc, UnaryOperatorKind Opc, const UnresolvedSetImpl &Fns, Expr *input, bool RequiresADL=true) |
Create a unary operation that may resolve to an overloaded operator. More... | |
ExprResult | CreateOverloadedBinOp (SourceLocation OpLoc, BinaryOperatorKind Opc, const UnresolvedSetImpl &Fns, Expr *LHS, Expr *RHS, bool RequiresADL=true) |
Create a binary operation that may resolve to an overloaded operator. More... | |
ExprResult | CreateOverloadedArraySubscriptExpr (SourceLocation LLoc, SourceLocation RLoc, Expr *Base, Expr *Idx) |
ExprResult | BuildCallToMemberFunction (Scope *S, Expr *MemExpr, SourceLocation LParenLoc, MultiExprArg Args, SourceLocation RParenLoc) |
BuildCallToMemberFunction - Build a call to a member function. More... | |
ExprResult | BuildCallToObjectOfClassType (Scope *S, Expr *Object, SourceLocation LParenLoc, MultiExprArg Args, SourceLocation RParenLoc) |
BuildCallToObjectOfClassType - Build a call to an object of class type (C++ [over.call.object]), which can end up invoking an overloaded function call operator (operator() ) or performing a user-defined conversion on the object argument. More... | |
ExprResult | BuildOverloadedArrowExpr (Scope *S, Expr *Base, SourceLocation OpLoc, bool *NoArrowOperatorFound=nullptr) |
BuildOverloadedArrowExpr - Build a call to an overloaded operator-> (if one exists), where Base is an expression of class type and Member is the name of the member we're trying to find. More... | |
bool | CheckCallReturnType (QualType ReturnType, SourceLocation Loc, CallExpr *CE, FunctionDecl *FD) |
CheckCallReturnType - Checks that a call expression's return type is complete. More... | |
bool | CheckParmsForFunctionDef (ArrayRef< ParmVarDecl *> Parameters, bool CheckParameterNames) |
Helpers for dealing with blocks and functions. More... | |
void | CheckCXXDefaultArguments (FunctionDecl *FD) |
CheckCXXDefaultArguments - Verify that the default arguments for a function declaration are well-formed according to C++ [dcl.fct.default]. More... | |
void | CheckExtraCXXDefaultArguments (Declarator &D) |
CheckExtraCXXDefaultArguments - Check for any extra default arguments in the declarator, which is not a function declaration or definition and therefore is not permitted to have default arguments. More... | |
Scope * | getNonFieldDeclScope (Scope *S) |
getNonFieldDeclScope - Retrieves the innermost scope, starting from S, where a non-field would be declared. More... | |
ObjCInterfaceDecl * | getObjCInterfaceDecl (IdentifierInfo *&Id, SourceLocation IdLoc, bool TypoCorrection=false) |
Look for an Objective-C class in the translation unit. More... | |
NamedDecl * | LazilyCreateBuiltin (IdentifierInfo *II, unsigned ID, Scope *S, bool ForRedeclaration, SourceLocation Loc) |
LazilyCreateBuiltin - The specified Builtin-ID was first used at file scope. More... | |
NamedDecl * | ImplicitlyDefineFunction (SourceLocation Loc, IdentifierInfo &II, Scope *S) |
ImplicitlyDefineFunction - An undeclared identifier was used in a function call, forming a call to an implicitly defined function (per C99 6.5.1p2). More... | |
void | AddKnownFunctionAttributes (FunctionDecl *FD) |
Adds any function attributes that we know a priori based on the declaration of this function. More... | |
void | ProcessPragmaWeak (Scope *S, Decl *D) |
void | ProcessDeclAttributes (Scope *S, Decl *D, const Declarator &PD) |
void | ProcessDeclAttributeDelayed (Decl *D, const ParsedAttributesView &AttrList) |
void | ProcessDeclAttributeList (Scope *S, Decl *D, const ParsedAttributesView &AL, bool IncludeCXX11Attributes=true) |
bool | ProcessAccessDeclAttributeList (AccessSpecDecl *ASDecl, const ParsedAttributesView &AttrList) |
void | checkUnusedDeclAttributes (Declarator &D) |
bool | isValidPointerAttrType (QualType T, bool RefOkay=false) |
Determine if type T is a valid subject for a nonnull and similar attributes. More... | |
bool | CheckRegparmAttr (const ParsedAttr &attr, unsigned &value) |
bool | CheckCallingConvAttr (const ParsedAttr &attr, CallingConv &CC, const FunctionDecl *FD=nullptr) |
bool | CheckAttrTarget (const ParsedAttr &CurrAttr) |
bool | CheckAttrNoArgs (const ParsedAttr &CurrAttr) |
bool | checkStringLiteralArgumentAttr (const ParsedAttr &Attr, unsigned ArgNum, StringRef &Str, SourceLocation *ArgLocation=nullptr) |
Check if the argument ArgNum of Attr is a ASCII string literal. More... | |
bool | checkSectionName (SourceLocation LiteralLoc, StringRef Str) |
bool | checkTargetAttr (SourceLocation LiteralLoc, StringRef Str) |
bool | checkMSInheritanceAttrOnDefinition (CXXRecordDecl *RD, SourceRange Range, bool BestCase, MSInheritanceAttr::Spelling SemanticSpelling) |
void | CheckAlignasUnderalignment (Decl *D) |
void | adjustMemberFunctionCC (QualType &T, bool IsStatic, bool IsCtorOrDtor, SourceLocation Loc) |
Adjust the calling convention of a method to be the ABI default if it wasn't specified explicitly. More... | |
bool | hasExplicitCallingConv (QualType T) |
const AttributedType * | getCallingConvAttributedType (QualType T) const |
Get the outermost AttributedType node that sets a calling convention. More... | |
StmtResult | ProcessStmtAttributes (Stmt *Stmt, const ParsedAttributesView &Attrs, SourceRange Range) |
Stmt attributes - this routine is the top level dispatcher. More... | |
void | WarnConflictingTypedMethods (ObjCMethodDecl *Method, ObjCMethodDecl *MethodDecl, bool IsProtocolMethodDecl) |
void | CheckConflictingOverridingMethod (ObjCMethodDecl *Method, ObjCMethodDecl *Overridden, bool IsProtocolMethodDecl) |
void | WarnExactTypedMethods (ObjCMethodDecl *Method, ObjCMethodDecl *MethodDecl, bool IsProtocolMethodDecl) |
WarnExactTypedMethods - This routine issues a warning if method implementation declaration matches exactly that of its declaration. More... | |
void | CheckImplementationIvars (ObjCImplementationDecl *ImpDecl, ObjCIvarDecl **Fields, unsigned nIvars, SourceLocation Loc) |
CheckImplementationIvars - This routine checks if the instance variables listed in the implelementation match those listed in the interface. More... | |
void | ImplMethodsVsClassMethods (Scope *S, ObjCImplDecl *IMPDecl, ObjCContainerDecl *IDecl, bool IncompleteImpl=false) |
ImplMethodsVsClassMethods - This is main routine to warn if any method remains unimplemented in the class or category @implementation. More... | |
void | DiagnoseUnimplementedProperties (Scope *S, ObjCImplDecl *IMPDecl, ObjCContainerDecl *CDecl, bool SynthesizeProperties) |
DiagnoseUnimplementedProperties - This routine warns on those properties which must be implemented by this implementation. More... | |
void | diagnoseNullResettableSynthesizedSetters (const ObjCImplDecl *impDecl) |
Diagnose any null-resettable synthesized setters. More... | |
void | DefaultSynthesizeProperties (Scope *S, ObjCImplDecl *IMPDecl, ObjCInterfaceDecl *IDecl, SourceLocation AtEnd) |
DefaultSynthesizeProperties - This routine default synthesizes all properties which must be synthesized in the class's @implementation. More... | |
void | DefaultSynthesizeProperties (Scope *S, Decl *D, SourceLocation AtEnd) |
bool | IvarBacksCurrentMethodAccessor (ObjCInterfaceDecl *IFace, ObjCMethodDecl *Method, ObjCIvarDecl *IV) |
IvarBacksCurrentMethodAccessor - This routine returns 'true' if 'IV' is an ivar synthesized for 'Method' and 'Method' is a property accessor declared in class 'IFace'. More... | |
void | DiagnoseUnusedBackingIvarInAccessor (Scope *S, const ObjCImplementationDecl *ImplD) |
DiagnoseUnusedBackingIvarInAccessor - Issue an 'unused' warning if ivar which backs the property is not used in the property's accessor. More... | |
ObjCIvarDecl * | GetIvarBackingPropertyAccessor (const ObjCMethodDecl *Method, const ObjCPropertyDecl *&PDecl) const |
GetIvarBackingPropertyAccessor - If method is a property setter/getter and it property has a backing ivar, returns this ivar; otherwise, returns NULL. More... | |
ObjCPropertyDecl * | HandlePropertyInClassExtension (Scope *S, SourceLocation AtLoc, SourceLocation LParenLoc, FieldDeclarator &FD, Selector GetterSel, SourceLocation GetterNameLoc, Selector SetterSel, SourceLocation SetterNameLoc, const bool isReadWrite, unsigned &Attributes, const unsigned AttributesAsWritten, QualType T, TypeSourceInfo *TSI, tok::ObjCKeywordKind MethodImplKind) |
Called by ActOnProperty to handle @property declarations in class extensions. More... | |
ObjCPropertyDecl * | CreatePropertyDecl (Scope *S, ObjCContainerDecl *CDecl, SourceLocation AtLoc, SourceLocation LParenLoc, FieldDeclarator &FD, Selector GetterSel, SourceLocation GetterNameLoc, Selector SetterSel, SourceLocation SetterNameLoc, const bool isReadWrite, const unsigned Attributes, const unsigned AttributesAsWritten, QualType T, TypeSourceInfo *TSI, tok::ObjCKeywordKind MethodImplKind, DeclContext *lexicalDC=nullptr) |
Called by ActOnProperty and HandlePropertyInClassExtension to handle creating the ObjcPropertyDecl for a category or @interface. More... | |
void | AtomicPropertySetterGetterRules (ObjCImplDecl *IMPDecl, ObjCInterfaceDecl *IDecl) |
AtomicPropertySetterGetterRules - This routine enforces the rule (via warning) when atomic property has one but not the other user-declared setter or getter. More... | |
void | DiagnoseOwningPropertyGetterSynthesis (const ObjCImplementationDecl *D) |
void | DiagnoseMissingDesignatedInitOverrides (const ObjCImplementationDecl *ImplD, const ObjCInterfaceDecl *IFD) |
void | DiagnoseDuplicateIvars (ObjCInterfaceDecl *ID, ObjCInterfaceDecl *SID) |
DiagnoseDuplicateIvars - Check for duplicate ivars in the entire class at the start of @implementation. More... | |
bool | MatchTwoMethodDeclarations (const ObjCMethodDecl *Method, const ObjCMethodDecl *PrevMethod, MethodMatchStrategy strategy=MMS_strict) |
MatchTwoMethodDeclarations - Checks if two methods' type match and returns true, or false, accordingly. More... | |
void | MatchAllMethodDeclarations (const SelectorSet &InsMap, const SelectorSet &ClsMap, SelectorSet &InsMapSeen, SelectorSet &ClsMapSeen, ObjCImplDecl *IMPDecl, ObjCContainerDecl *IDecl, bool &IncompleteImpl, bool ImmediateClass, bool WarnCategoryMethodImpl=false) |
MatchAllMethodDeclarations - Check methods declaraed in interface or or protocol against those declared in their implementations. More... | |
void | CheckCategoryVsClassMethodMatches (ObjCCategoryImplDecl *CatIMP) |
CheckCategoryVsClassMethodMatches - Checks that methods implemented in category matches with those implemented in its primary class and warns each time an exact match is found. More... | |
void | addMethodToGlobalList (ObjCMethodList *List, ObjCMethodDecl *Method) |
Add the given method to the list of globally-known methods. More... | |
bool | CollectMultipleMethodsInGlobalPool (Selector Sel, SmallVectorImpl< ObjCMethodDecl *> &Methods, bool InstanceFirst, bool CheckTheOther, const ObjCObjectType *TypeBound=nullptr) |
We first select the type of the method: Instance or Factory, then collect all methods with that type. More... | |
bool | AreMultipleMethodsInGlobalPool (Selector Sel, ObjCMethodDecl *BestMethod, SourceRange R, bool receiverIdOrClass, SmallVectorImpl< ObjCMethodDecl *> &Methods) |
void | DiagnoseMultipleMethodInGlobalPool (SmallVectorImpl< ObjCMethodDecl *> &Methods, Selector Sel, SourceRange R, bool receiverIdOrClass) |
void | AddInstanceMethodToGlobalPool (ObjCMethodDecl *Method, bool impl=false) |
AddInstanceMethodToGlobalPool - All instance methods in a translation unit are added to a global pool. More... | |
void | AddFactoryMethodToGlobalPool (ObjCMethodDecl *Method, bool impl=false) |
AddFactoryMethodToGlobalPool - Same as above, but for factory methods. More... | |
void | AddAnyMethodToGlobalPool (Decl *D) |
AddAnyMethodToGlobalPool - Add any method, instance or factory to global pool. More... | |
ObjCMethodDecl * | LookupInstanceMethodInGlobalPool (Selector Sel, SourceRange R, bool receiverIdOrClass=false) |
LookupInstanceMethodInGlobalPool - Returns the method and warns if there are multiple signatures. More... | |
ObjCMethodDecl * | LookupFactoryMethodInGlobalPool (Selector Sel, SourceRange R, bool receiverIdOrClass=false) |
LookupFactoryMethodInGlobalPool - Returns the method and warns if there are multiple signatures. More... | |
const ObjCMethodDecl * | SelectorsForTypoCorrection (Selector Sel, QualType ObjectType=QualType()) |
ObjCMethodDecl * | LookupImplementedMethodInGlobalPool (Selector Sel) |
LookupImplementedMethodInGlobalPool - Returns the method which has an implementation. More... | |
void | CollectIvarsToConstructOrDestruct (ObjCInterfaceDecl *OI, SmallVectorImpl< ObjCIvarDecl *> &Ivars) |
CollectIvarsToConstructOrDestruct - Collect those ivars which require initialization. More... | |
FullExprArg | MakeFullExpr (Expr *Arg) |
FullExprArg | MakeFullExpr (Expr *Arg, SourceLocation CC) |
FullExprArg | MakeFullDiscardedValueExpr (Expr *Arg) |
StmtResult | ActOnExprStmt (ExprResult Arg, bool DiscardedValue=true) |
StmtResult | ActOnExprStmtError () |
StmtResult | ActOnNullStmt (SourceLocation SemiLoc, bool HasLeadingEmptyMacro=false) |
void | ActOnStartOfCompoundStmt (bool IsStmtExpr) |
void | ActOnFinishOfCompoundStmt () |
StmtResult | ActOnCompoundStmt (SourceLocation L, SourceLocation R, ArrayRef< Stmt *> Elts, bool isStmtExpr) |
StmtResult | ActOnDeclStmt (DeclGroupPtrTy Decl, SourceLocation StartLoc, SourceLocation EndLoc) |
void | ActOnForEachDeclStmt (DeclGroupPtrTy Decl) |
StmtResult | ActOnForEachLValueExpr (Expr *E) |
In an Objective C collection iteration statement: for (x in y) x can be an arbitrary l-value expression. More... | |
ExprResult | ActOnCaseExpr (SourceLocation CaseLoc, ExprResult Val) |
StmtResult | ActOnCaseStmt (SourceLocation CaseLoc, ExprResult LHS, SourceLocation DotDotDotLoc, ExprResult RHS, SourceLocation ColonLoc) |
void | ActOnCaseStmtBody (Stmt *CaseStmt, Stmt *SubStmt) |
ActOnCaseStmtBody - This installs a statement as the body of a case. More... | |
StmtResult | ActOnDefaultStmt (SourceLocation DefaultLoc, SourceLocation ColonLoc, Stmt *SubStmt, Scope *CurScope) |
StmtResult | ActOnLabelStmt (SourceLocation IdentLoc, LabelDecl *TheDecl, SourceLocation ColonLoc, Stmt *SubStmt) |
StmtResult | ActOnAttributedStmt (SourceLocation AttrLoc, ArrayRef< const Attr *> Attrs, Stmt *SubStmt) |
StmtResult | ActOnIfStmt (SourceLocation IfLoc, bool IsConstexpr, Stmt *InitStmt, ConditionResult Cond, Stmt *ThenVal, SourceLocation ElseLoc, Stmt *ElseVal) |
StmtResult | BuildIfStmt (SourceLocation IfLoc, bool IsConstexpr, Stmt *InitStmt, ConditionResult Cond, Stmt *ThenVal, SourceLocation ElseLoc, Stmt *ElseVal) |
StmtResult | ActOnStartOfSwitchStmt (SourceLocation SwitchLoc, Stmt *InitStmt, ConditionResult Cond) |
StmtResult | ActOnFinishSwitchStmt (SourceLocation SwitchLoc, Stmt *Switch, Stmt *Body) |
StmtResult | ActOnWhileStmt (SourceLocation WhileLoc, ConditionResult Cond, Stmt *Body) |
StmtResult | ActOnDoStmt (SourceLocation DoLoc, Stmt *Body, SourceLocation WhileLoc, SourceLocation CondLParen, Expr *Cond, SourceLocation CondRParen) |
StmtResult | ActOnForStmt (SourceLocation ForLoc, SourceLocation LParenLoc, Stmt *First, ConditionResult Second, FullExprArg Third, SourceLocation RParenLoc, Stmt *Body) |
ExprResult | CheckObjCForCollectionOperand (SourceLocation forLoc, Expr *collection) |
StmtResult | ActOnObjCForCollectionStmt (SourceLocation ForColLoc, Stmt *First, Expr *collection, SourceLocation RParenLoc) |
StmtResult | FinishObjCForCollectionStmt (Stmt *ForCollection, Stmt *Body) |
FinishObjCForCollectionStmt - Attach the body to a objective-C foreach statement. More... | |
StmtResult | ActOnCXXForRangeStmt (Scope *S, SourceLocation ForLoc, SourceLocation CoawaitLoc, Stmt *InitStmt, Stmt *LoopVar, SourceLocation ColonLoc, Expr *Collection, SourceLocation RParenLoc, BuildForRangeKind Kind) |
ActOnCXXForRangeStmt - Check and build a C++11 for-range statement. More... | |
StmtResult | BuildCXXForRangeStmt (SourceLocation ForLoc, SourceLocation CoawaitLoc, Stmt *InitStmt, SourceLocation ColonLoc, Stmt *RangeDecl, Stmt *Begin, Stmt *End, Expr *Cond, Expr *Inc, Stmt *LoopVarDecl, SourceLocation RParenLoc, BuildForRangeKind Kind) |
BuildCXXForRangeStmt - Build or instantiate a C++11 for-range statement. More... | |
StmtResult | FinishCXXForRangeStmt (Stmt *ForRange, Stmt *Body) |
FinishCXXForRangeStmt - Attach the body to a C++0x for-range statement. More... | |
StmtResult | ActOnGotoStmt (SourceLocation GotoLoc, SourceLocation LabelLoc, LabelDecl *TheDecl) |
StmtResult | ActOnIndirectGotoStmt (SourceLocation GotoLoc, SourceLocation StarLoc, Expr *DestExp) |
StmtResult | ActOnContinueStmt (SourceLocation ContinueLoc, Scope *CurScope) |
StmtResult | ActOnBreakStmt (SourceLocation BreakLoc, Scope *CurScope) |
void | ActOnCapturedRegionStart (SourceLocation Loc, Scope *CurScope, CapturedRegionKind Kind, unsigned NumParams) |
void | ActOnCapturedRegionStart (SourceLocation Loc, Scope *CurScope, CapturedRegionKind Kind, ArrayRef< CapturedParamNameType > Params) |
StmtResult | ActOnCapturedRegionEnd (Stmt *S) |
void | ActOnCapturedRegionError () |
RecordDecl * | CreateCapturedStmtRecordDecl (CapturedDecl *&CD, SourceLocation Loc, unsigned NumParams) |
VarDecl * | getCopyElisionCandidate (QualType ReturnType, Expr *E, CopyElisionSemanticsKind CESK) |
Determine whether the given expression is a candidate for copy elision in either a return statement or a throw expression. More... | |
bool | isCopyElisionCandidate (QualType ReturnType, const VarDecl *VD, CopyElisionSemanticsKind CESK) |
StmtResult | ActOnReturnStmt (SourceLocation ReturnLoc, Expr *RetValExp, Scope *CurScope) |
StmtResult | BuildReturnStmt (SourceLocation ReturnLoc, Expr *RetValExp) |
StmtResult | ActOnCapScopeReturnStmt (SourceLocation ReturnLoc, Expr *RetValExp) |
ActOnCapScopeReturnStmt - Utility routine to type-check return statements for capturing scopes. More... | |
StmtResult | ActOnGCCAsmStmt (SourceLocation AsmLoc, bool IsSimple, bool IsVolatile, unsigned NumOutputs, unsigned NumInputs, IdentifierInfo **Names, MultiExprArg Constraints, MultiExprArg Exprs, Expr *AsmString, MultiExprArg Clobbers, unsigned NumLabels, SourceLocation RParenLoc) |
void | FillInlineAsmIdentifierInfo (Expr *Res, llvm::InlineAsmIdentifierInfo &Info) |
ExprResult | LookupInlineAsmIdentifier (CXXScopeSpec &SS, SourceLocation TemplateKWLoc, UnqualifiedId &Id, bool IsUnevaluatedContext) |
bool | LookupInlineAsmField (StringRef Base, StringRef Member, unsigned &Offset, SourceLocation AsmLoc) |
ExprResult | LookupInlineAsmVarDeclField (Expr *RefExpr, StringRef Member, SourceLocation AsmLoc) |
StmtResult | ActOnMSAsmStmt (SourceLocation AsmLoc, SourceLocation LBraceLoc, ArrayRef< Token > AsmToks, StringRef AsmString, unsigned NumOutputs, unsigned NumInputs, ArrayRef< StringRef > Constraints, ArrayRef< StringRef > Clobbers, ArrayRef< Expr *> Exprs, SourceLocation EndLoc) |
LabelDecl * | GetOrCreateMSAsmLabel (StringRef ExternalLabelName, SourceLocation Location, bool AlwaysCreate) |
VarDecl * | BuildObjCExceptionDecl (TypeSourceInfo *TInfo, QualType ExceptionType, SourceLocation StartLoc, SourceLocation IdLoc, IdentifierInfo *Id, bool Invalid=false) |
Build a type-check a new Objective-C exception variable declaration. More... | |
Decl * | ActOnObjCExceptionDecl (Scope *S, Declarator &D) |
StmtResult | ActOnObjCAtCatchStmt (SourceLocation AtLoc, SourceLocation RParen, Decl *Parm, Stmt *Body) |
StmtResult | ActOnObjCAtFinallyStmt (SourceLocation AtLoc, Stmt *Body) |
StmtResult | ActOnObjCAtTryStmt (SourceLocation AtLoc, Stmt *Try, MultiStmtArg Catch, Stmt *Finally) |
StmtResult | BuildObjCAtThrowStmt (SourceLocation AtLoc, Expr *Throw) |
StmtResult | ActOnObjCAtThrowStmt (SourceLocation AtLoc, Expr *Throw, Scope *CurScope) |
ExprResult | ActOnObjCAtSynchronizedOperand (SourceLocation atLoc, Expr *operand) |
StmtResult | ActOnObjCAtSynchronizedStmt (SourceLocation AtLoc, Expr *SynchExpr, Stmt *SynchBody) |
StmtResult | ActOnObjCAutoreleasePoolStmt (SourceLocation AtLoc, Stmt *Body) |
VarDecl * | BuildExceptionDeclaration (Scope *S, TypeSourceInfo *TInfo, SourceLocation StartLoc, SourceLocation IdLoc, IdentifierInfo *Id) |
Perform semantic analysis for the variable declaration that occurs within a C++ catch clause, returning the newly-created variable. More... | |
Decl * | ActOnExceptionDeclarator (Scope *S, Declarator &D) |
ActOnExceptionDeclarator - Parsed the exception-declarator in a C++ catch handler. More... | |
StmtResult | ActOnCXXCatchBlock (SourceLocation CatchLoc, Decl *ExDecl, Stmt *HandlerBlock) |
ActOnCXXCatchBlock - Takes an exception declaration and a handler block and creates a proper catch handler from them. More... | |
StmtResult | ActOnCXXTryBlock (SourceLocation TryLoc, Stmt *TryBlock, ArrayRef< Stmt *> Handlers) |
ActOnCXXTryBlock - Takes a try compound-statement and a number of handlers and creates a try statement from them. More... | |
StmtResult | ActOnSEHTryBlock (bool IsCXXTry, SourceLocation TryLoc, Stmt *TryBlock, Stmt *Handler) |
StmtResult | ActOnSEHExceptBlock (SourceLocation Loc, Expr *FilterExpr, Stmt *Block) |
void | ActOnStartSEHFinallyBlock () |
void | ActOnAbortSEHFinallyBlock () |
StmtResult | ActOnFinishSEHFinallyBlock (SourceLocation Loc, Stmt *Block) |
StmtResult | ActOnSEHLeaveStmt (SourceLocation Loc, Scope *CurScope) |
void | DiagnoseReturnInConstructorExceptionHandler (CXXTryStmt *TryBlock) |
bool | ShouldWarnIfUnusedFileScopedDecl (const DeclaratorDecl *D) const |
void | MarkUnusedFileScopedDecl (const DeclaratorDecl *D) |
If it's a file scoped decl that must warn if not used, keep track of it. More... | |
void | DiagnoseUnusedExprResult (const Stmt *S) |
DiagnoseUnusedExprResult - If the statement passed in is an expression whose result is unused, warn. More... | |
void | DiagnoseUnusedNestedTypedefs (const RecordDecl *D) |
void | DiagnoseUnusedDecl (const NamedDecl *ND) |
DiagnoseUnusedDecl - Emit warnings about declarations that are not used unless they are marked attr(unused). More... | |
void | DiagnoseEmptyStmtBody (SourceLocation StmtLoc, const Stmt *Body, unsigned DiagID) |
Emit DiagID if statement located on StmtLoc has a suspicious null statement as a Body , and it is located on the same line. More... | |
void | DiagnoseEmptyLoopBody (const Stmt *S, const Stmt *PossibleBody) |
Warn if a for/while loop statement S , which is followed by PossibleBody , has a suspicious null statement as a body. More... | |
void | DiagnoseSelfMove (const Expr *LHSExpr, const Expr *RHSExpr, SourceLocation OpLoc) |
Warn if a value is moved to itself. More... | |
void | diagnoseNullableToNonnullConversion (QualType DstType, QualType SrcType, SourceLocation Loc) |
Warn if we're implicitly casting from a _Nullable pointer type to a _Nonnull one. More... | |
void | diagnoseZeroToNullptrConversion (CastKind Kind, const Expr *E) |
Warn when implicitly casting 0 to nullptr. More... | |
ParsingDeclState | PushParsingDeclaration (sema::DelayedDiagnosticPool &pool) |
void | PopParsingDeclaration (ParsingDeclState state, Decl *decl) |
ParsingClassState | PushParsingClass () |
void | PopParsingClass (ParsingClassState state) |
void | redelayDiagnostics (sema::DelayedDiagnosticPool &pool) |
void | DiagnoseAvailabilityOfDecl (NamedDecl *D, ArrayRef< SourceLocation > Locs, const ObjCInterfaceDecl *UnknownObjCClass, bool ObjCPropertyAccess, bool AvoidPartialAvailabilityChecks=false, ObjCInterfaceDecl *ClassReceiver=nullptr) |
bool | makeUnavailableInSystemHeader (SourceLocation loc, UnavailableAttr::ImplicitReason reason) |
makeUnavailableInSystemHeader - There is an error in the current context. More... | |
void | DiagnoseUnguardedAvailabilityViolations (Decl *FD) |
Issue any -Wunguarded-availability warnings in FD . More... | |
bool | CanUseDecl (NamedDecl *D, bool TreatUnavailableAsInvalid) |
Determine whether the use of this declaration is valid, without emitting diagnostics. More... | |
bool | DiagnoseUseOfDecl (NamedDecl *D, ArrayRef< SourceLocation > Locs, const ObjCInterfaceDecl *UnknownObjCClass=nullptr, bool ObjCPropertyAccess=false, bool AvoidPartialAvailabilityChecks=false, ObjCInterfaceDecl *ClassReciever=nullptr) |
Determine whether the use of this declaration is valid, and emit any corresponding diagnostics. More... | |
void | NoteDeletedFunction (FunctionDecl *FD) |
Emit a note explaining that this function is deleted. More... | |
void | NoteDeletedInheritingConstructor (CXXConstructorDecl *CD) |
bool | DiagnosePropertyAccessorMismatch (ObjCPropertyDecl *PD, ObjCMethodDecl *Getter, SourceLocation Loc) |
void | DiagnoseSentinelCalls (NamedDecl *D, SourceLocation Loc, ArrayRef< Expr *> Args) |
DiagnoseSentinelCalls - This routine checks whether a call or message-send is to a declaration with the sentinel attribute, and if so, it checks that the requirements of the sentinel are satisfied. More... | |
void | PushExpressionEvaluationContext (ExpressionEvaluationContext NewContext, Decl *LambdaContextDecl=nullptr, ExpressionEvaluationContextRecord::ExpressionKind Type=ExpressionEvaluationContextRecord::EK_Other) |
void | PushExpressionEvaluationContext (ExpressionEvaluationContext NewContext, ReuseLambdaContextDecl_t, ExpressionEvaluationContextRecord::ExpressionKind Type=ExpressionEvaluationContextRecord::EK_Other) |
void | PopExpressionEvaluationContext () |
void | DiscardCleanupsInEvaluationContext () |
ExprResult | TransformToPotentiallyEvaluated (Expr *E) |
ExprResult | HandleExprEvaluationContextForTypeof (Expr *E) |
ExprResult | ActOnConstantExpression (ExprResult Res) |
void | MarkAnyDeclReferenced (SourceLocation Loc, Decl *D, bool MightBeOdrUse) |
Perform marking for a reference to an arbitrary declaration. More... | |
void | MarkFunctionReferenced (SourceLocation Loc, FunctionDecl *Func, bool MightBeOdrUse=true) |
Mark a function referenced, and check whether it is odr-used (C++ [basic.def.odr]p2, C99 6.9p3) More... | |
void | MarkVariableReferenced (SourceLocation Loc, VarDecl *Var) |
Mark a variable referenced, and check whether it is odr-used (C++ [basic.def.odr]p2, C99 6.9p3). More... | |
void | MarkDeclRefReferenced (DeclRefExpr *E, const Expr *Base=nullptr) |
Perform reference-marking and odr-use handling for a DeclRefExpr. More... | |
void | MarkMemberReferenced (MemberExpr *E) |
Perform reference-marking and odr-use handling for a MemberExpr. More... | |
void | MarkFunctionParmPackReferenced (FunctionParmPackExpr *E) |
Perform reference-marking and odr-use handling for a FunctionParmPackExpr. More... | |
void | MarkCaptureUsedInEnclosingContext (VarDecl *Capture, SourceLocation Loc, unsigned CapturingScopeIndex) |
ExprResult | CheckLValueToRValueConversionOperand (Expr *E) |
void | CleanupVarDeclMarking () |
bool | tryCaptureVariable (VarDecl *Var, SourceLocation Loc, TryCaptureKind Kind, SourceLocation EllipsisLoc, bool BuildAndDiagnose, QualType &CaptureType, QualType &DeclRefType, const unsigned *const FunctionScopeIndexToStopAt) |
Try to capture the given variable. More... | |
bool | tryCaptureVariable (VarDecl *Var, SourceLocation Loc, TryCaptureKind Kind=TryCapture_Implicit, SourceLocation EllipsisLoc=SourceLocation()) |
Try to capture the given variable. More... | |
bool | NeedToCaptureVariable (VarDecl *Var, SourceLocation Loc) |
Checks if the variable must be captured. More... | |
QualType | getCapturedDeclRefType (VarDecl *Var, SourceLocation Loc) |
Given a variable, determine the type that a reference to that variable will have in the given scope. More... | |
void | MarkDeclarationsReferencedInType (SourceLocation Loc, QualType T) |
Mark all of the declarations referenced within a particular AST node as referenced. More... | |
void | MarkDeclarationsReferencedInExpr (Expr *E, bool SkipLocalVariables=false) |
Mark any declarations that appear within this expression or any potentially-evaluated subexpressions as "referenced". More... | |
bool | tryToRecoverWithCall (ExprResult &E, const PartialDiagnostic &PD, bool ForceComplain=false, bool(*IsPlausibleResult)(QualType)=nullptr) |
Try to recover by turning the given expression into a call. More... | |
bool | tryExprAsCall (Expr &E, QualType &ZeroArgCallReturnTy, UnresolvedSetImpl &NonTemplateOverloads) |
Figure out if an expression could be turned into a call. More... | |
bool | DiagRuntimeBehavior (SourceLocation Loc, const Stmt *Statement, const PartialDiagnostic &PD) |
Conditionally issue a diagnostic based on the current evaluation context. More... | |
bool | DiagRuntimeBehavior (SourceLocation Loc, ArrayRef< const Stmt *> Stmts, const PartialDiagnostic &PD) |
Similar, but diagnostic is only produced if all the specified statements are reachable. More... | |
SourceRange | getExprRange (Expr *E) const |
ExprResult | ActOnIdExpression (Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, UnqualifiedId &Id, bool HasTrailingLParen, bool IsAddressOfOperand, CorrectionCandidateCallback *CCC=nullptr, bool IsInlineAsmIdentifier=false, Token *KeywordReplacement=nullptr) |
void | DecomposeUnqualifiedId (const UnqualifiedId &Id, TemplateArgumentListInfo &Buffer, DeclarationNameInfo &NameInfo, const TemplateArgumentListInfo *&TemplateArgs) |
Decomposes the given name into a DeclarationNameInfo, its location, and possibly a list of template arguments. More... | |
bool | DiagnoseEmptyLookup (Scope *S, CXXScopeSpec &SS, LookupResult &R, CorrectionCandidateCallback &CCC, TemplateArgumentListInfo *ExplicitTemplateArgs=nullptr, ArrayRef< Expr *> Args=None, TypoExpr **Out=nullptr) |
Diagnose an empty lookup. More... | |
ExprResult | LookupInObjCMethod (LookupResult &LookUp, Scope *S, IdentifierInfo *II, bool AllowBuiltinCreation=false) |
LookupInObjCMethod - The parser has read a name in, and Sema has detected that we're currently inside an ObjC method. More... | |
ExprResult | ActOnDependentIdExpression (const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, const DeclarationNameInfo &NameInfo, bool isAddressOfOperand, const TemplateArgumentListInfo *TemplateArgs) |
ActOnDependentIdExpression - Handle a dependent id-expression that was just parsed. More... | |
NonOdrUseReason | getNonOdrUseReasonInCurrentContext (ValueDecl *D) |
If D cannot be odr-used in the current expression evaluation context, return a reason explaining why. More... | |
DeclRefExpr * | BuildDeclRefExpr (ValueDecl *D, QualType Ty, ExprValueKind VK, SourceLocation Loc, const CXXScopeSpec *SS=nullptr) |
DeclRefExpr * | BuildDeclRefExpr (ValueDecl *D, QualType Ty, ExprValueKind VK, const DeclarationNameInfo &NameInfo, const CXXScopeSpec *SS=nullptr, NamedDecl *FoundD=nullptr, SourceLocation TemplateKWLoc=SourceLocation(), const TemplateArgumentListInfo *TemplateArgs=nullptr) |
DeclRefExpr * | BuildDeclRefExpr (ValueDecl *D, QualType Ty, ExprValueKind VK, const DeclarationNameInfo &NameInfo, NestedNameSpecifierLoc NNS, NamedDecl *FoundD=nullptr, SourceLocation TemplateKWLoc=SourceLocation(), const TemplateArgumentListInfo *TemplateArgs=nullptr) |
BuildDeclRefExpr - Build an expression that references a declaration that does not require a closure capture. More... | |
ExprResult | BuildAnonymousStructUnionMemberReference (const CXXScopeSpec &SS, SourceLocation nameLoc, IndirectFieldDecl *indirectField, DeclAccessPair FoundDecl=DeclAccessPair::make(nullptr, AS_none), Expr *baseObjectExpr=nullptr, SourceLocation opLoc=SourceLocation()) |
ExprResult | BuildPossibleImplicitMemberExpr (const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, LookupResult &R, const TemplateArgumentListInfo *TemplateArgs, const Scope *S) |
Builds an expression which might be an implicit member expression. More... | |
ExprResult | BuildImplicitMemberExpr (const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, LookupResult &R, const TemplateArgumentListInfo *TemplateArgs, bool IsDefiniteInstance, const Scope *S) |
Builds an implicit member access expression. More... | |
bool | UseArgumentDependentLookup (const CXXScopeSpec &SS, const LookupResult &R, bool HasTrailingLParen) |
ExprResult | BuildQualifiedDeclarationNameExpr (CXXScopeSpec &SS, const DeclarationNameInfo &NameInfo, bool IsAddressOfOperand, const Scope *S, TypeSourceInfo **RecoveryTSI=nullptr) |
BuildQualifiedDeclarationNameExpr - Build a C++ qualified declaration name, generally during template instantiation. More... | |
ExprResult | BuildDependentDeclRefExpr (const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, const DeclarationNameInfo &NameInfo, const TemplateArgumentListInfo *TemplateArgs) |
ExprResult | BuildDeclarationNameExpr (const CXXScopeSpec &SS, LookupResult &R, bool NeedsADL, bool AcceptInvalidDecl=false) |
ExprResult | BuildDeclarationNameExpr (const CXXScopeSpec &SS, const DeclarationNameInfo &NameInfo, NamedDecl *D, NamedDecl *FoundD=nullptr, const TemplateArgumentListInfo *TemplateArgs=nullptr, bool AcceptInvalidDecl=false) |
Complete semantic analysis for a reference to the given declaration. More... | |
ExprResult | BuildLiteralOperatorCall (LookupResult &R, DeclarationNameInfo &SuffixInfo, ArrayRef< Expr *> Args, SourceLocation LitEndLoc, TemplateArgumentListInfo *ExplicitTemplateArgs=nullptr) |
BuildLiteralOperatorCall - Build a UserDefinedLiteral by creating a call to a literal operator described by the provided lookup results. More... | |
ExprResult | BuildPredefinedExpr (SourceLocation Loc, PredefinedExpr::IdentKind IK) |
ExprResult | ActOnPredefinedExpr (SourceLocation Loc, tok::TokenKind Kind) |
ExprResult | ActOnIntegerConstant (SourceLocation Loc, uint64_t Val) |
bool | CheckLoopHintExpr (Expr *E, SourceLocation Loc) |
ExprResult | ActOnNumericConstant (const Token &Tok, Scope *UDLScope=nullptr) |
ExprResult | ActOnCharacterConstant (const Token &Tok, Scope *UDLScope=nullptr) |
ExprResult | ActOnParenExpr (SourceLocation L, SourceLocation R, Expr *E) |
ExprResult | ActOnParenListExpr (SourceLocation L, SourceLocation R, MultiExprArg Val) |
ExprResult | ActOnStringLiteral (ArrayRef< Token > StringToks, Scope *UDLScope=nullptr) |
ActOnStringLiteral - The specified tokens were lexed as pasted string fragments (e.g. More... | |
ExprResult | ActOnGenericSelectionExpr (SourceLocation KeyLoc, SourceLocation DefaultLoc, SourceLocation RParenLoc, Expr *ControllingExpr, ArrayRef< ParsedType > ArgTypes, ArrayRef< Expr *> ArgExprs) |
ExprResult | CreateGenericSelectionExpr (SourceLocation KeyLoc, SourceLocation DefaultLoc, SourceLocation RParenLoc, Expr *ControllingExpr, ArrayRef< TypeSourceInfo *> Types, ArrayRef< Expr *> Exprs) |
ExprResult | CreateBuiltinUnaryOp (SourceLocation OpLoc, UnaryOperatorKind Opc, Expr *InputExpr) |
ExprResult | BuildUnaryOp (Scope *S, SourceLocation OpLoc, UnaryOperatorKind Opc, Expr *Input) |
ExprResult | ActOnUnaryOp (Scope *S, SourceLocation OpLoc, tok::TokenKind Op, Expr *Input) |
bool | isQualifiedMemberAccess (Expr *E) |
Determine whether the given expression is a qualified member access expression, of a form that could be turned into a pointer to member with the address-of operator. More... | |
QualType | CheckAddressOfOperand (ExprResult &Operand, SourceLocation OpLoc) |
CheckAddressOfOperand - The operand of & must be either a function designator or an lvalue designating an object. More... | |
ExprResult | CreateUnaryExprOrTypeTraitExpr (TypeSourceInfo *TInfo, SourceLocation OpLoc, UnaryExprOrTypeTrait ExprKind, SourceRange R) |
Build a sizeof or alignof expression given a type operand. More... | |
ExprResult | CreateUnaryExprOrTypeTraitExpr (Expr *E, SourceLocation OpLoc, UnaryExprOrTypeTrait ExprKind) |
Build a sizeof or alignof expression given an expression operand. More... | |
ExprResult | ActOnUnaryExprOrTypeTraitExpr (SourceLocation OpLoc, UnaryExprOrTypeTrait ExprKind, bool IsType, void *TyOrEx, SourceRange ArgRange) |
ActOnUnaryExprOrTypeTraitExpr - Handle sizeof(type) and sizeof expr and the same for alignof and __alignof Note that the ArgRange is invalid if isType is false. More... | |
ExprResult | CheckPlaceholderExpr (Expr *E) |
Check for operands with placeholder types and complain if found. More... | |
bool | CheckVecStepExpr (Expr *E) |
bool | CheckUnaryExprOrTypeTraitOperand (Expr *E, UnaryExprOrTypeTrait ExprKind) |
Check the constraints on expression operands to unary type expression and type traits. More... | |
bool | CheckUnaryExprOrTypeTraitOperand (QualType ExprType, SourceLocation OpLoc, SourceRange ExprRange, UnaryExprOrTypeTrait ExprKind) |
Check the constraints on operands to unary expression and type traits. More... | |
ExprResult | ActOnSizeofParameterPackExpr (Scope *S, SourceLocation OpLoc, IdentifierInfo &Name, SourceLocation NameLoc, SourceLocation RParenLoc) |
Called when an expression computing the size of a parameter pack is parsed. More... | |
ExprResult | ActOnPostfixUnaryOp (Scope *S, SourceLocation OpLoc, tok::TokenKind Kind, Expr *Input) |
ExprResult | ActOnArraySubscriptExpr (Scope *S, Expr *Base, SourceLocation LLoc, Expr *Idx, SourceLocation RLoc) |
ExprResult | CreateBuiltinArraySubscriptExpr (Expr *Base, SourceLocation LLoc, Expr *Idx, SourceLocation RLoc) |
ExprResult | ActOnOMPArraySectionExpr (Expr *Base, SourceLocation LBLoc, Expr *LowerBound, SourceLocation ColonLoc, Expr *Length, SourceLocation RBLoc) |
ExprResult | BuildMemberReferenceExpr (Expr *Base, QualType BaseType, SourceLocation OpLoc, bool IsArrow, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, NamedDecl *FirstQualifierInScope, const DeclarationNameInfo &NameInfo, const TemplateArgumentListInfo *TemplateArgs, const Scope *S, ActOnMemberAccessExtraArgs *ExtraArgs=nullptr) |
ExprResult | BuildMemberReferenceExpr (Expr *Base, QualType BaseType, SourceLocation OpLoc, bool IsArrow, const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, NamedDecl *FirstQualifierInScope, LookupResult &R, const TemplateArgumentListInfo *TemplateArgs, const Scope *S, bool SuppressQualifierCheck=false, ActOnMemberAccessExtraArgs *ExtraArgs=nullptr) |
ExprResult | BuildFieldReferenceExpr (Expr *BaseExpr, bool IsArrow, SourceLocation OpLoc, const CXXScopeSpec &SS, FieldDecl *Field, DeclAccessPair FoundDecl, const DeclarationNameInfo &MemberNameInfo) |
ExprResult | PerformMemberExprBaseConversion (Expr *Base, bool IsArrow) |
Perform conversions on the LHS of a member access expression. More... | |
bool | CheckQualifiedMemberReference (Expr *BaseExpr, QualType BaseType, const CXXScopeSpec &SS, const LookupResult &R) |
ExprResult | ActOnDependentMemberExpr (Expr *Base, QualType BaseType, bool IsArrow, SourceLocation OpLoc, const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, NamedDecl *FirstQualifierInScope, const DeclarationNameInfo &NameInfo, const TemplateArgumentListInfo *TemplateArgs) |
ExprResult | ActOnMemberAccessExpr (Scope *S, Expr *Base, SourceLocation OpLoc, tok::TokenKind OpKind, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, UnqualifiedId &Member, Decl *ObjCImpDecl) |
The main callback when the parser finds something like expression . More... | |
MemberExpr * | BuildMemberExpr (Expr *Base, bool IsArrow, SourceLocation OpLoc, const CXXScopeSpec *SS, SourceLocation TemplateKWLoc, ValueDecl *Member, DeclAccessPair FoundDecl, bool HadMultipleCandidates, const DeclarationNameInfo &MemberNameInfo, QualType Ty, ExprValueKind VK, ExprObjectKind OK, const TemplateArgumentListInfo *TemplateArgs=nullptr) |
MemberExpr * | BuildMemberExpr (Expr *Base, bool IsArrow, SourceLocation OpLoc, NestedNameSpecifierLoc NNS, SourceLocation TemplateKWLoc, ValueDecl *Member, DeclAccessPair FoundDecl, bool HadMultipleCandidates, const DeclarationNameInfo &MemberNameInfo, QualType Ty, ExprValueKind VK, ExprObjectKind OK, const TemplateArgumentListInfo *TemplateArgs=nullptr) |
void | ActOnDefaultCtorInitializers (Decl *CDtorDecl) |
bool | ConvertArgumentsForCall (CallExpr *Call, Expr *Fn, FunctionDecl *FDecl, const FunctionProtoType *Proto, ArrayRef< Expr *> Args, SourceLocation RParenLoc, bool ExecConfig=false) |
ConvertArgumentsForCall - Converts the arguments specified in Args/NumArgs to the parameter types of the function FDecl with function prototype Proto. More... | |
void | CheckStaticArrayArgument (SourceLocation CallLoc, ParmVarDecl *Param, const Expr *ArgExpr) |
CheckStaticArrayArgument - If the given argument corresponds to a static array parameter, check that it is non-null, and that if it is formed by array-to-pointer decay, the underlying array is sufficiently large. More... | |
ExprResult | ActOnCallExpr (Scope *S, Expr *Fn, SourceLocation LParenLoc, MultiExprArg ArgExprs, SourceLocation RParenLoc, Expr *ExecConfig=nullptr) |
ActOnCallExpr - Handle a call to Fn with the specified array of arguments. More... | |
ExprResult | BuildCallExpr (Scope *S, Expr *Fn, SourceLocation LParenLoc, MultiExprArg ArgExprs, SourceLocation RParenLoc, Expr *ExecConfig=nullptr, bool IsExecConfig=false) |
BuildCallExpr - Handle a call to Fn with the specified array of arguments. More... | |
ExprResult | BuildResolvedCallExpr (Expr *Fn, NamedDecl *NDecl, SourceLocation LParenLoc, ArrayRef< Expr *> Arg, SourceLocation RParenLoc, Expr *Config=nullptr, bool IsExecConfig=false, ADLCallKind UsesADL=ADLCallKind::NotADL) |
BuildResolvedCallExpr - Build a call to a resolved expression, i.e. More... | |
ExprResult | ActOnCUDAExecConfigExpr (Scope *S, SourceLocation LLLLoc, MultiExprArg ExecConfig, SourceLocation GGGLoc) |
ExprResult | ActOnCastExpr (Scope *S, SourceLocation LParenLoc, Declarator &D, ParsedType &Ty, SourceLocation RParenLoc, Expr *CastExpr) |
ExprResult | BuildCStyleCastExpr (SourceLocation LParenLoc, TypeSourceInfo *Ty, SourceLocation RParenLoc, Expr *Op) |
CastKind | PrepareScalarCast (ExprResult &src, QualType destType) |
Prepares for a scalar cast, performing all the necessary stages except the final cast and returning the kind required. More... | |
ExprResult | BuildVectorLiteral (SourceLocation LParenLoc, SourceLocation RParenLoc, Expr *E, TypeSourceInfo *TInfo) |
Build an altivec or OpenCL literal. More... | |
ExprResult | MaybeConvertParenListExprToParenExpr (Scope *S, Expr *ME) |
This is not an AltiVec-style cast or or C++ direct-initialization, so turn the ParenListExpr into a sequence of comma binary operators. More... | |
ExprResult | ActOnCompoundLiteral (SourceLocation LParenLoc, ParsedType Ty, SourceLocation RParenLoc, Expr *InitExpr) |
ExprResult | BuildCompoundLiteralExpr (SourceLocation LParenLoc, TypeSourceInfo *TInfo, SourceLocation RParenLoc, Expr *LiteralExpr) |
ExprResult | ActOnInitList (SourceLocation LBraceLoc, MultiExprArg InitArgList, SourceLocation RBraceLoc) |
ExprResult | ActOnDesignatedInitializer (Designation &Desig, SourceLocation Loc, bool GNUSyntax, ExprResult Init) |
ExprResult | ActOnBinOp (Scope *S, SourceLocation TokLoc, tok::TokenKind Kind, Expr *LHSExpr, Expr *RHSExpr) |
ExprResult | BuildBinOp (Scope *S, SourceLocation OpLoc, BinaryOperatorKind Opc, Expr *LHSExpr, Expr *RHSExpr) |
ExprResult | CreateBuiltinBinOp (SourceLocation OpLoc, BinaryOperatorKind Opc, Expr *LHSExpr, Expr *RHSExpr) |
CreateBuiltinBinOp - Creates a new built-in binary operation with operator Opc at location TokLoc . More... | |
void | DiagnoseCommaOperator (const Expr *LHS, SourceLocation Loc) |
ExprResult | ActOnConditionalOp (SourceLocation QuestionLoc, SourceLocation ColonLoc, Expr *CondExpr, Expr *LHSExpr, Expr *RHSExpr) |
ActOnConditionalOp - Parse a ?: operation. More... | |
ExprResult | ActOnAddrLabel (SourceLocation OpLoc, SourceLocation LabLoc, LabelDecl *TheDecl) |
ActOnAddrLabel - Parse the GNU address of label extension: "&&foo". More... | |
void | ActOnStartStmtExpr () |
ExprResult | ActOnStmtExpr (SourceLocation LPLoc, Stmt *SubStmt, SourceLocation RPLoc) |
ExprResult | ActOnStmtExprResult (ExprResult E) |
void | ActOnStmtExprError () |
ExprResult | BuildBuiltinOffsetOf (SourceLocation BuiltinLoc, TypeSourceInfo *TInfo, ArrayRef< OffsetOfComponent > Components, SourceLocation RParenLoc) |
__builtin_offsetof(type, a.b[123][456].c) More... | |
ExprResult | ActOnBuiltinOffsetOf (Scope *S, SourceLocation BuiltinLoc, SourceLocation TypeLoc, ParsedType ParsedArgTy, ArrayRef< OffsetOfComponent > Components, SourceLocation RParenLoc) |
ExprResult | ActOnChooseExpr (SourceLocation BuiltinLoc, Expr *CondExpr, Expr *LHSExpr, Expr *RHSExpr, SourceLocation RPLoc) |
ExprResult | ActOnVAArg (SourceLocation BuiltinLoc, Expr *E, ParsedType Ty, SourceLocation RPLoc) |
ExprResult | BuildVAArgExpr (SourceLocation BuiltinLoc, Expr *E, TypeSourceInfo *TInfo, SourceLocation RPLoc) |
ExprResult | ActOnSourceLocExpr (SourceLocExpr::IdentKind Kind, SourceLocation BuiltinLoc, SourceLocation RPLoc) |
ExprResult | BuildSourceLocExpr (SourceLocExpr::IdentKind Kind, SourceLocation BuiltinLoc, SourceLocation RPLoc, DeclContext *ParentContext) |
ExprResult | ActOnGNUNullExpr (SourceLocation TokenLoc) |
bool | CheckCaseExpression (Expr *E) |
IfExistsResult | CheckMicrosoftIfExistsSymbol (Scope *S, CXXScopeSpec &SS, const DeclarationNameInfo &TargetNameInfo) |
IfExistsResult | CheckMicrosoftIfExistsSymbol (Scope *S, SourceLocation KeywordLoc, bool IsIfExists, CXXScopeSpec &SS, UnqualifiedId &Name) |
StmtResult | BuildMSDependentExistsStmt (SourceLocation KeywordLoc, bool IsIfExists, NestedNameSpecifierLoc QualifierLoc, DeclarationNameInfo NameInfo, Stmt *Nested) |
StmtResult | ActOnMSDependentExistsStmt (SourceLocation KeywordLoc, bool IsIfExists, CXXScopeSpec &SS, UnqualifiedId &Name, Stmt *Nested) |
void | ActOnBlockStart (SourceLocation CaretLoc, Scope *CurScope) |
ActOnBlockStart - This callback is invoked when a block literal is started. More... | |
void | ActOnBlockArguments (SourceLocation CaretLoc, Declarator &ParamInfo, Scope *CurScope) |
ActOnBlockArguments - This callback allows processing of block arguments. More... | |
void | ActOnBlockError (SourceLocation CaretLoc, Scope *CurScope) |
ActOnBlockError - If there is an error parsing a block, this callback is invoked to pop the information about the block from the action impl. More... | |
ExprResult | ActOnBlockStmtExpr (SourceLocation CaretLoc, Stmt *Body, Scope *CurScope) |
ActOnBlockStmtExpr - This is called when the body of a block statement literal was successfully completed. More... | |
ExprResult | ActOnConvertVectorExpr (Expr *E, ParsedType ParsedDestTy, SourceLocation BuiltinLoc, SourceLocation RParenLoc) |
__builtin_convertvector(...) More... | |
ExprResult | ActOnAsTypeExpr (Expr *E, ParsedType ParsedDestTy, SourceLocation BuiltinLoc, SourceLocation RParenLoc) |
__builtin_astype(...) More... | |
Decl * | ActOnStartNamespaceDef (Scope *S, SourceLocation InlineLoc, SourceLocation NamespaceLoc, SourceLocation IdentLoc, IdentifierInfo *Ident, SourceLocation LBrace, const ParsedAttributesView &AttrList, UsingDirectiveDecl *&UsingDecl) |
ActOnStartNamespaceDef - This is called at the start of a namespace definition. More... | |
void | ActOnFinishNamespaceDef (Decl *Dcl, SourceLocation RBrace) |
ActOnFinishNamespaceDef - This callback is called after a namespace is exited. More... | |
NamespaceDecl * | getStdNamespace () const |
NamespaceDecl * | getOrCreateStdNamespace () |
Retrieve the special "std" namespace, which may require us to implicitly define the namespace. More... | |
NamespaceDecl * | lookupStdExperimentalNamespace () |
CXXRecordDecl * | getStdBadAlloc () const |
EnumDecl * | getStdAlignValT () const |
QualType | CheckComparisonCategoryType (ComparisonCategoryType Kind, SourceLocation Loc) |
Lookup the specified comparison category types in the standard library, an check the VarDecls possibly returned by the operator<=> builtins for that type. More... | |
bool | isStdInitializerList (QualType Ty, QualType *Element) |
Tests whether Ty is an instance of std::initializer_list and, if it is and Element is not NULL, assigns the element type to Element. More... | |
QualType | BuildStdInitializerList (QualType Element, SourceLocation Loc) |
Looks for the std::initializer_list template and instantiates it with Element, or emits an error if it's not found. More... | |
bool | isInitListConstructor (const FunctionDecl *Ctor) |
Determine whether Ctor is an initializer-list constructor, as defined in [dcl.init.list]p2. More... | |
Decl * | ActOnUsingDirective (Scope *CurScope, SourceLocation UsingLoc, SourceLocation NamespcLoc, CXXScopeSpec &SS, SourceLocation IdentLoc, IdentifierInfo *NamespcName, const ParsedAttributesView &AttrList) |
void | PushUsingDirective (Scope *S, UsingDirectiveDecl *UDir) |
Decl * | ActOnNamespaceAliasDef (Scope *CurScope, SourceLocation NamespaceLoc, SourceLocation AliasLoc, IdentifierInfo *Alias, CXXScopeSpec &SS, SourceLocation IdentLoc, IdentifierInfo *Ident) |
void | HideUsingShadowDecl (Scope *S, UsingShadowDecl *Shadow) |
Hides a using shadow declaration. More... | |
bool | CheckUsingShadowDecl (UsingDecl *UD, NamedDecl *Target, const LookupResult &PreviousDecls, UsingShadowDecl *&PrevShadow) |
Determines whether to create a using shadow decl for a particular decl, given the set of decls existing prior to this using lookup. More... | |
UsingShadowDecl * | BuildUsingShadowDecl (Scope *S, UsingDecl *UD, NamedDecl *Target, UsingShadowDecl *PrevDecl) |
Builds a shadow declaration corresponding to a 'using' declaration. More... | |
bool | CheckUsingDeclRedeclaration (SourceLocation UsingLoc, bool HasTypenameKeyword, const CXXScopeSpec &SS, SourceLocation NameLoc, const LookupResult &Previous) |
Checks that the given using declaration is not an invalid redeclaration. More... | |
bool | CheckUsingDeclQualifier (SourceLocation UsingLoc, bool HasTypename, const CXXScopeSpec &SS, const DeclarationNameInfo &NameInfo, SourceLocation NameLoc) |
Checks that the given nested-name qualifier used in a using decl in the current context is appropriately related to the current scope. More... | |
NamedDecl * | BuildUsingDeclaration (Scope *S, AccessSpecifier AS, SourceLocation UsingLoc, bool HasTypenameKeyword, SourceLocation TypenameLoc, CXXScopeSpec &SS, DeclarationNameInfo NameInfo, SourceLocation EllipsisLoc, const ParsedAttributesView &AttrList, bool IsInstantiation) |
Builds a using declaration. More... | |
NamedDecl * | BuildUsingPackDecl (NamedDecl *InstantiatedFrom, ArrayRef< NamedDecl *> Expansions) |
bool | CheckInheritingConstructorUsingDecl (UsingDecl *UD) |
Additional checks for a using declaration referring to a constructor name. More... | |
CXXConstructorDecl * | findInheritingConstructor (SourceLocation Loc, CXXConstructorDecl *BaseCtor, ConstructorUsingShadowDecl *DerivedShadow) |
Given a derived-class using shadow declaration for a constructor and the correspnding base class constructor, find or create the implicit synthesized derived class constructor to use for this initialization. More... | |
Decl * | ActOnUsingDeclaration (Scope *CurScope, AccessSpecifier AS, SourceLocation UsingLoc, SourceLocation TypenameLoc, CXXScopeSpec &SS, UnqualifiedId &Name, SourceLocation EllipsisLoc, const ParsedAttributesView &AttrList) |
Decl * | ActOnAliasDeclaration (Scope *CurScope, AccessSpecifier AS, MultiTemplateParamsArg TemplateParams, SourceLocation UsingLoc, UnqualifiedId &Name, const ParsedAttributesView &AttrList, TypeResult Type, Decl *DeclFromDeclSpec) |
ExprResult | BuildCXXConstructExpr (SourceLocation ConstructLoc, QualType DeclInitType, NamedDecl *FoundDecl, CXXConstructorDecl *Constructor, MultiExprArg Exprs, bool HadMultipleCandidates, bool IsListInitialization, bool IsStdInitListInitialization, bool RequiresZeroInit, unsigned ConstructKind, SourceRange ParenRange) |
BuildCXXConstructExpr - Creates a complete call to a constructor, including handling of its default argument expressions. More... | |
ExprResult | BuildCXXConstructExpr (SourceLocation ConstructLoc, QualType DeclInitType, CXXConstructorDecl *Constructor, bool Elidable, MultiExprArg Exprs, bool HadMultipleCandidates, bool IsListInitialization, bool IsStdInitListInitialization, bool RequiresZeroInit, unsigned ConstructKind, SourceRange ParenRange) |
Build a CXXConstructExpr whose constructor has already been resolved if it denotes an inherited constructor. More... | |
ExprResult | BuildCXXConstructExpr (SourceLocation ConstructLoc, QualType DeclInitType, NamedDecl *FoundDecl, CXXConstructorDecl *Constructor, bool Elidable, MultiExprArg Exprs, bool HadMultipleCandidates, bool IsListInitialization, bool IsStdInitListInitialization, bool RequiresZeroInit, unsigned ConstructKind, SourceRange ParenRange) |
ExprResult | BuildCXXDefaultInitExpr (SourceLocation Loc, FieldDecl *Field) |
bool | CheckCXXDefaultArgExpr (SourceLocation CallLoc, FunctionDecl *FD, ParmVarDecl *Param) |
Instantiate or parse a C++ default argument expression as necessary. More... | |
ExprResult | BuildCXXDefaultArgExpr (SourceLocation CallLoc, FunctionDecl *FD, ParmVarDecl *Param) |
BuildCXXDefaultArgExpr - Creates a CXXDefaultArgExpr, instantiating the default expr if needed. More... | |
void | FinalizeVarWithDestructor (VarDecl *VD, const RecordType *DeclInitType) |
FinalizeVarWithDestructor - Prepare for calling destructor on the constructed variable. More... | |
ImplicitExceptionSpecification | ComputeDefaultedDefaultCtorExceptionSpec (SourceLocation Loc, CXXMethodDecl *MD) |
Determine what sort of exception specification a defaulted copy constructor of a class will have. More... | |
ImplicitExceptionSpecification | ComputeDefaultedCopyCtorExceptionSpec (CXXMethodDecl *MD) |
Determine what sort of exception specification a defaulted default constructor of a class will have, and whether the parameter will be const. More... | |
ImplicitExceptionSpecification | ComputeDefaultedCopyAssignmentExceptionSpec (CXXMethodDecl *MD) |
Determine what sort of exception specification a defaulted copy assignment operator of a class will have, and whether the parameter will be const. More... | |
ImplicitExceptionSpecification | ComputeDefaultedMoveCtorExceptionSpec (CXXMethodDecl *MD) |
Determine what sort of exception specification a defaulted move constructor of a class will have. More... | |
ImplicitExceptionSpecification | ComputeDefaultedMoveAssignmentExceptionSpec (CXXMethodDecl *MD) |
Determine what sort of exception specification a defaulted move assignment operator of a class will have. More... | |
ImplicitExceptionSpecification | ComputeDefaultedDtorExceptionSpec (CXXMethodDecl *MD) |
Determine what sort of exception specification a defaulted destructor of a class will have. More... | |
ImplicitExceptionSpecification | ComputeInheritingCtorExceptionSpec (SourceLocation Loc, CXXConstructorDecl *CD) |
Determine what sort of exception specification an inheriting constructor of a class will have. More... | |
void | EvaluateImplicitExceptionSpec (SourceLocation Loc, CXXMethodDecl *MD) |
Evaluate the implicit exception specification for a defaulted special member function. More... | |
ExprResult | ActOnNoexceptSpec (SourceLocation NoexceptLoc, Expr *NoexceptExpr, ExceptionSpecificationType &EST) |
Check the given noexcept-specifier, convert its expression, and compute the appropriate ExceptionSpecificationType. More... | |
void | checkExceptionSpecification (bool IsTopLevel, ExceptionSpecificationType EST, ArrayRef< ParsedType > DynamicExceptions, ArrayRef< SourceRange > DynamicExceptionRanges, Expr *NoexceptExpr, SmallVectorImpl< QualType > &Exceptions, FunctionProtoType::ExceptionSpecInfo &ESI) |
Check the given exception-specification and update the exception specification information with the results. More... | |
bool | isLibstdcxxEagerExceptionSpecHack (const Declarator &D) |
Determine if we're in a case where we need to (incorrectly) eagerly parse an exception specification to work around a libstdc++ bug. More... | |
void | actOnDelayedExceptionSpecification (Decl *Method, ExceptionSpecificationType EST, SourceRange SpecificationRange, ArrayRef< ParsedType > DynamicExceptions, ArrayRef< SourceRange > DynamicExceptionRanges, Expr *NoexceptExpr) |
Add an exception-specification to the given member function (or member function template). More... | |
bool | ShouldDeleteSpecialMember (CXXMethodDecl *MD, CXXSpecialMember CSM, InheritedConstructorInfo *ICI=nullptr, bool Diagnose=false) |
Determine if a special member function should have a deleted definition when it is defaulted. More... | |
CXXConstructorDecl * | DeclareImplicitDefaultConstructor (CXXRecordDecl *ClassDecl) |
Declare the implicit default constructor for the given class. More... | |
void | DefineImplicitDefaultConstructor (SourceLocation CurrentLocation, CXXConstructorDecl *Constructor) |
DefineImplicitDefaultConstructor - Checks for feasibility of defining this constructor as the default constructor. More... | |
CXXDestructorDecl * | DeclareImplicitDestructor (CXXRecordDecl *ClassDecl) |
Declare the implicit destructor for the given class. More... | |
void | DefineImplicitDestructor (SourceLocation CurrentLocation, CXXDestructorDecl *Destructor) |
DefineImplicitDestructor - Checks for feasibility of defining this destructor as the default destructor. More... | |
void | AdjustDestructorExceptionSpec (CXXDestructorDecl *Destructor) |
Build an exception spec for destructors that don't have one. More... | |
void | DefineInheritingConstructor (SourceLocation UseLoc, CXXConstructorDecl *Constructor) |
Define the specified inheriting constructor. More... | |
CXXConstructorDecl * | DeclareImplicitCopyConstructor (CXXRecordDecl *ClassDecl) |
Declare the implicit copy constructor for the given class. More... | |
void | DefineImplicitCopyConstructor (SourceLocation CurrentLocation, CXXConstructorDecl *Constructor) |
DefineImplicitCopyConstructor - Checks for feasibility of defining this constructor as the copy constructor. More... | |
CXXConstructorDecl * | DeclareImplicitMoveConstructor (CXXRecordDecl *ClassDecl) |
Declare the implicit move constructor for the given class. More... | |
void | DefineImplicitMoveConstructor (SourceLocation CurrentLocation, CXXConstructorDecl *Constructor) |
DefineImplicitMoveConstructor - Checks for feasibility of defining this constructor as the move constructor. More... | |
CXXMethodDecl * | DeclareImplicitCopyAssignment (CXXRecordDecl *ClassDecl) |
Declare the implicit copy assignment operator for the given class. More... | |
void | DefineImplicitCopyAssignment (SourceLocation CurrentLocation, CXXMethodDecl *MethodDecl) |
Defines an implicitly-declared copy assignment operator. More... | |
CXXMethodDecl * | DeclareImplicitMoveAssignment (CXXRecordDecl *ClassDecl) |
Declare the implicit move assignment operator for the given class. More... | |
void | DefineImplicitMoveAssignment (SourceLocation CurrentLocation, CXXMethodDecl *MethodDecl) |
Defines an implicitly-declared move assignment operator. More... | |
void | ForceDeclarationOfImplicitMembers (CXXRecordDecl *Class) |
Force the declaration of any implicitly-declared members of this class. More... | |
void | CheckImplicitSpecialMemberDeclaration (Scope *S, FunctionDecl *FD) |
Check a completed declaration of an implicit special member. More... | |
bool | isImplicitlyDeleted (FunctionDecl *FD) |
Determine whether the given function is an implicitly-deleted special member function. More... | |
bool | checkThisInStaticMemberFunctionType (CXXMethodDecl *Method) |
Check whether 'this' shows up in the type of a static member function after the (naturally empty) cv-qualifier-seq would be. More... | |
bool | checkThisInStaticMemberFunctionExceptionSpec (CXXMethodDecl *Method) |
Whether this' shows up in the exception specification of a static member function. More... | |
bool | checkThisInStaticMemberFunctionAttributes (CXXMethodDecl *Method) |
Check whether 'this' shows up in the attributes of the given static member function. More... | |
ExprResult | MaybeBindToTemporary (Expr *E) |
MaybeBindToTemporary - If the passed in expression has a record type with a non-trivial destructor, this will return CXXBindTemporaryExpr. More... | |
bool | CompleteConstructorCall (CXXConstructorDecl *Constructor, MultiExprArg ArgsPtr, SourceLocation Loc, SmallVectorImpl< Expr *> &ConvertedArgs, bool AllowExplicit=false, bool IsListInitialization=false) |
Given a constructor and the set of arguments provided for the constructor, convert the arguments and add any required default arguments to form a proper call to this constructor. More... | |
ParsedType | getInheritingConstructorName (CXXScopeSpec &SS, SourceLocation NameLoc, IdentifierInfo &Name) |
Handle the result of the special case name lookup for inheriting constructor declarations. More... | |
ParsedType | getConstructorName (IdentifierInfo &II, SourceLocation NameLoc, Scope *S, CXXScopeSpec &SS, bool EnteringContext) |
ParsedType | getDestructorName (SourceLocation TildeLoc, IdentifierInfo &II, SourceLocation NameLoc, Scope *S, CXXScopeSpec &SS, ParsedType ObjectType, bool EnteringContext) |
ParsedType | getDestructorTypeForDecltype (const DeclSpec &DS, ParsedType ObjectType) |
void | CheckCompatibleReinterpretCast (QualType SrcType, QualType DestType, bool IsDereference, SourceRange Range) |
ExprResult | ActOnCXXNamedCast (SourceLocation OpLoc, tok::TokenKind Kind, SourceLocation LAngleBracketLoc, Declarator &D, SourceLocation RAngleBracketLoc, SourceLocation LParenLoc, Expr *E, SourceLocation RParenLoc) |
ActOnCXXNamedCast - Parse {dynamic,static,reinterpret,const}_cast's. More... | |
ExprResult | BuildCXXNamedCast (SourceLocation OpLoc, tok::TokenKind Kind, TypeSourceInfo *Ty, Expr *E, SourceRange AngleBrackets, SourceRange Parens) |
ExprResult | ActOnBuiltinBitCastExpr (SourceLocation KWLoc, Declarator &Dcl, ExprResult Operand, SourceLocation RParenLoc) |
ExprResult | BuildBuiltinBitCastExpr (SourceLocation KWLoc, TypeSourceInfo *TSI, Expr *Operand, SourceLocation RParenLoc) |
ExprResult | BuildCXXTypeId (QualType TypeInfoType, SourceLocation TypeidLoc, TypeSourceInfo *Operand, SourceLocation RParenLoc) |
Build a C++ typeid expression with a type operand. More... | |
ExprResult | BuildCXXTypeId (QualType TypeInfoType, SourceLocation TypeidLoc, Expr *Operand, SourceLocation RParenLoc) |
Build a C++ typeid expression with an expression operand. More... | |
ExprResult | ActOnCXXTypeid (SourceLocation OpLoc, SourceLocation LParenLoc, bool isType, void *TyOrExpr, SourceLocation RParenLoc) |
ActOnCXXTypeid - Parse typeid( something ). More... | |
ExprResult | BuildCXXUuidof (QualType TypeInfoType, SourceLocation TypeidLoc, TypeSourceInfo *Operand, SourceLocation RParenLoc) |
Build a Microsoft __uuidof expression with a type operand. More... | |
ExprResult | BuildCXXUuidof (QualType TypeInfoType, SourceLocation TypeidLoc, Expr *Operand, SourceLocation RParenLoc) |
Build a Microsoft __uuidof expression with an expression operand. More... | |
ExprResult | ActOnCXXUuidof (SourceLocation OpLoc, SourceLocation LParenLoc, bool isType, void *TyOrExpr, SourceLocation RParenLoc) |
ActOnCXXUuidof - Parse __uuidof( something ). More... | |
ExprResult | ActOnCXXFoldExpr (SourceLocation LParenLoc, Expr *LHS, tok::TokenKind Operator, SourceLocation EllipsisLoc, Expr *RHS, SourceLocation RParenLoc) |
Handle a C++1z fold-expression: ( expr op ... op expr ). More... | |
ExprResult | BuildCXXFoldExpr (SourceLocation LParenLoc, Expr *LHS, BinaryOperatorKind Operator, SourceLocation EllipsisLoc, Expr *RHS, SourceLocation RParenLoc, Optional< unsigned > NumExpansions) |
ExprResult | BuildEmptyCXXFoldExpr (SourceLocation EllipsisLoc, BinaryOperatorKind Operator) |
ExprResult | ActOnCXXThis (SourceLocation loc) |
Expr * | BuildCXXThisExpr (SourceLocation Loc, QualType Type, bool IsImplicit) |
Build a CXXThisExpr and mark it referenced in the current context. More... | |
void | MarkThisReferenced (CXXThisExpr *This) |
QualType | getCurrentThisType () |
Try to retrieve the type of the 'this' pointer. More... | |
bool | CheckCXXThisCapture (SourceLocation Loc, bool Explicit=false, bool BuildAndDiagnose=true, const unsigned *const FunctionScopeIndexToStopAt=nullptr, bool ByCopy=false) |
Make sure the value of 'this' is actually available in the current context, if it is a potentially evaluated context. More... | |
bool | isThisOutsideMemberFunctionBody (QualType BaseType) |
Determine whether the given type is the type of *this that is used outside of the body of a member function for a type that is currently being defined. More... | |
ExprResult | ActOnCXXBoolLiteral (SourceLocation OpLoc, tok::TokenKind Kind) |
ActOnCXXBoolLiteral - Parse {true,false} literals. More... | |
ExprResult | ActOnObjCBoolLiteral (SourceLocation OpLoc, tok::TokenKind Kind) |
ActOnObjCBoolLiteral - Parse {__objc_yes,__objc_no} literals. More... | |
ExprResult | ActOnObjCAvailabilityCheckExpr (llvm::ArrayRef< AvailabilitySpec > AvailSpecs, SourceLocation AtLoc, SourceLocation RParen) |
ExprResult | ActOnCXXNullPtrLiteral (SourceLocation Loc) |
ActOnCXXNullPtrLiteral - Parse 'nullptr'. More... | |
ExprResult | ActOnCXXThrow (Scope *S, SourceLocation OpLoc, Expr *expr) |
ActOnCXXThrow - Parse throw expressions. More... | |
ExprResult | BuildCXXThrow (SourceLocation OpLoc, Expr *Ex, bool IsThrownVarInScope) |
bool | CheckCXXThrowOperand (SourceLocation ThrowLoc, QualType ThrowTy, Expr *E) |
CheckCXXThrowOperand - Validate the operand of a throw. More... | |
ExprResult | ActOnCXXTypeConstructExpr (ParsedType TypeRep, SourceLocation LParenOrBraceLoc, MultiExprArg Exprs, SourceLocation RParenOrBraceLoc, bool ListInitialization) |
ActOnCXXTypeConstructExpr - Parse construction of a specified type. More... | |
ExprResult | BuildCXXTypeConstructExpr (TypeSourceInfo *Type, SourceLocation LParenLoc, MultiExprArg Exprs, SourceLocation RParenLoc, bool ListInitialization) |
ExprResult | ActOnCXXNew (SourceLocation StartLoc, bool UseGlobal, SourceLocation PlacementLParen, MultiExprArg PlacementArgs, SourceLocation PlacementRParen, SourceRange TypeIdParens, Declarator &D, Expr *Initializer) |
ActOnCXXNew - Parsed a C++ 'new' expression. More... | |
ExprResult | BuildCXXNew (SourceRange Range, bool UseGlobal, SourceLocation PlacementLParen, MultiExprArg PlacementArgs, SourceLocation PlacementRParen, SourceRange TypeIdParens, QualType AllocType, TypeSourceInfo *AllocTypeInfo, Optional< Expr *> ArraySize, SourceRange DirectInitRange, Expr *Initializer) |
bool | isUnavailableAlignedAllocationFunction (const FunctionDecl &FD) const |
Determine whether FD is an aligned allocation or deallocation function that is unavailable. More... | |
void | diagnoseUnavailableAlignedAllocation (const FunctionDecl &FD, SourceLocation Loc) |
Produce diagnostics if FD is an aligned allocation or deallocation function that is unavailable. More... | |
bool | CheckAllocatedType (QualType AllocType, SourceLocation Loc, SourceRange R) |
Checks that a type is suitable as the allocated type in a new-expression. More... | |
bool | FindAllocationFunctions (SourceLocation StartLoc, SourceRange Range, AllocationFunctionScope NewScope, AllocationFunctionScope DeleteScope, QualType AllocType, bool IsArray, bool &PassAlignment, MultiExprArg PlaceArgs, FunctionDecl *&OperatorNew, FunctionDecl *&OperatorDelete, bool Diagnose=true) |
Finds the overloads of operator new and delete that are appropriate for the allocation. More... | |
void | DeclareGlobalNewDelete () |
DeclareGlobalNewDelete - Declare the global forms of operator new and delete. More... | |
void | DeclareGlobalAllocationFunction (DeclarationName Name, QualType Return, ArrayRef< QualType > Params) |
DeclareGlobalAllocationFunction - Declares a single implicit global allocation function if it doesn't already exist. More... | |
bool | FindDeallocationFunction (SourceLocation StartLoc, CXXRecordDecl *RD, DeclarationName Name, FunctionDecl *&Operator, bool Diagnose=true) |
FunctionDecl * | FindUsualDeallocationFunction (SourceLocation StartLoc, bool CanProvideSize, bool Overaligned, DeclarationName Name) |
FunctionDecl * | FindDeallocationFunctionForDestructor (SourceLocation StartLoc, CXXRecordDecl *RD) |
ExprResult | ActOnCXXDelete (SourceLocation StartLoc, bool UseGlobal, bool ArrayForm, Expr *Operand) |
ActOnCXXDelete - Parsed a C++ 'delete' expression. More... | |
void | CheckVirtualDtorCall (CXXDestructorDecl *dtor, SourceLocation Loc, bool IsDelete, bool CallCanBeVirtual, bool WarnOnNonAbstractTypes, SourceLocation DtorLoc) |
ExprResult | ActOnNoexceptExpr (SourceLocation KeyLoc, SourceLocation LParen, Expr *Operand, SourceLocation RParen) |
ExprResult | BuildCXXNoexceptExpr (SourceLocation KeyLoc, Expr *Operand, SourceLocation RParen) |
ExprResult | ActOnTypeTrait (TypeTrait Kind, SourceLocation KWLoc, ArrayRef< ParsedType > Args, SourceLocation RParenLoc) |
Parsed one of the type trait support pseudo-functions. More... | |
ExprResult | BuildTypeTrait (TypeTrait Kind, SourceLocation KWLoc, ArrayRef< TypeSourceInfo *> Args, SourceLocation RParenLoc) |
ExprResult | ActOnArrayTypeTrait (ArrayTypeTrait ATT, SourceLocation KWLoc, ParsedType LhsTy, Expr *DimExpr, SourceLocation RParen) |
ActOnArrayTypeTrait - Parsed one of the binary type trait support pseudo-functions. More... | |
ExprResult | BuildArrayTypeTrait (ArrayTypeTrait ATT, SourceLocation KWLoc, TypeSourceInfo *TSInfo, Expr *DimExpr, SourceLocation RParen) |
ExprResult | ActOnExpressionTrait (ExpressionTrait OET, SourceLocation KWLoc, Expr *Queried, SourceLocation RParen) |
ActOnExpressionTrait - Parsed one of the unary type trait support pseudo-functions. More... | |
ExprResult | BuildExpressionTrait (ExpressionTrait OET, SourceLocation KWLoc, Expr *Queried, SourceLocation RParen) |
ExprResult | ActOnStartCXXMemberReference (Scope *S, Expr *Base, SourceLocation OpLoc, tok::TokenKind OpKind, ParsedType &ObjectType, bool &MayBePseudoDestructor) |
ExprResult | BuildPseudoDestructorExpr (Expr *Base, SourceLocation OpLoc, tok::TokenKind OpKind, const CXXScopeSpec &SS, TypeSourceInfo *ScopeType, SourceLocation CCLoc, SourceLocation TildeLoc, PseudoDestructorTypeStorage DestroyedType) |
ExprResult | ActOnPseudoDestructorExpr (Scope *S, Expr *Base, SourceLocation OpLoc, tok::TokenKind OpKind, CXXScopeSpec &SS, UnqualifiedId &FirstTypeName, SourceLocation CCLoc, SourceLocation TildeLoc, UnqualifiedId &SecondTypeName) |
ExprResult | ActOnPseudoDestructorExpr (Scope *S, Expr *Base, SourceLocation OpLoc, tok::TokenKind OpKind, SourceLocation TildeLoc, const DeclSpec &DS) |
Expr * | MaybeCreateExprWithCleanups (Expr *SubExpr) |
MaybeCreateExprWithCleanups - If the current full-expression requires any cleanups, surround it with a ExprWithCleanups node. More... | |
Stmt * | MaybeCreateStmtWithCleanups (Stmt *SubStmt) |
ExprResult | MaybeCreateExprWithCleanups (ExprResult SubExpr) |
MaterializeTemporaryExpr * | CreateMaterializeTemporaryExpr (QualType T, Expr *Temporary, bool BoundToLvalueReference) |
ExprResult | ActOnFinishFullExpr (Expr *Expr, bool DiscardedValue) |
ExprResult | ActOnFinishFullExpr (Expr *Expr, SourceLocation CC, bool DiscardedValue, bool IsConstexpr=false) |
StmtResult | ActOnFinishFullStmt (Stmt *Stmt) |
bool | RequireCompleteDeclContext (CXXScopeSpec &SS, DeclContext *DC) |
Require that the context specified by SS be complete. More... | |
DeclContext * | computeDeclContext (QualType T) |
Compute the DeclContext that is associated with the given type. More... | |
DeclContext * | computeDeclContext (const CXXScopeSpec &SS, bool EnteringContext=false) |
Compute the DeclContext that is associated with the given scope specifier. More... | |
bool | isDependentScopeSpecifier (const CXXScopeSpec &SS) |
CXXRecordDecl * | getCurrentInstantiationOf (NestedNameSpecifier *NNS) |
If the given nested name specifier refers to the current instantiation, return the declaration that corresponds to that current instantiation (C++0x [temp.dep.type]p1). More... | |
bool | ActOnCXXGlobalScopeSpecifier (SourceLocation CCLoc, CXXScopeSpec &SS) |
The parser has parsed a global nested-name-specifier '::'. More... | |
bool | ActOnSuperScopeSpecifier (SourceLocation SuperLoc, SourceLocation ColonColonLoc, CXXScopeSpec &SS) |
The parser has parsed a '__super' nested-name-specifier. More... | |
bool | isAcceptableNestedNameSpecifier (const NamedDecl *SD, bool *CanCorrect=nullptr) |
Determines whether the given declaration is an valid acceptable result for name lookup of a nested-name-specifier. More... | |
NamedDecl * | FindFirstQualifierInScope (Scope *S, NestedNameSpecifier *NNS) |
If the given nested-name-specifier begins with a bare identifier (e.g., Base::), perform name lookup for that identifier as a nested-name-specifier within the given scope, and return the result of that name lookup. More... | |
bool | isNonTypeNestedNameSpecifier (Scope *S, CXXScopeSpec &SS, NestedNameSpecInfo &IdInfo) |
bool | BuildCXXNestedNameSpecifier (Scope *S, NestedNameSpecInfo &IdInfo, bool EnteringContext, CXXScopeSpec &SS, NamedDecl *ScopeLookupResult, bool ErrorRecoveryLookup, bool *IsCorrectedToColon=nullptr, bool OnlyNamespace=false) |
Build a new nested-name-specifier for "identifier::", as described by ActOnCXXNestedNameSpecifier. More... | |
bool | ActOnCXXNestedNameSpecifier (Scope *S, NestedNameSpecInfo &IdInfo, bool EnteringContext, CXXScopeSpec &SS, bool ErrorRecoveryLookup=false, bool *IsCorrectedToColon=nullptr, bool OnlyNamespace=false) |
The parser has parsed a nested-name-specifier 'identifier::'. More... | |
ExprResult | ActOnDecltypeExpression (Expr *E) |
Process the expression contained within a decltype. More... | |
bool | ActOnCXXNestedNameSpecifierDecltype (CXXScopeSpec &SS, const DeclSpec &DS, SourceLocation ColonColonLoc) |
bool | IsInvalidUnlessNestedName (Scope *S, CXXScopeSpec &SS, NestedNameSpecInfo &IdInfo, bool EnteringContext) |
IsInvalidUnlessNestedName - This method is used for error recovery purposes to determine whether the specified identifier is only valid as a nested name specifier, for example a namespace name. More... | |
bool | ActOnCXXNestedNameSpecifier (Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, TemplateTy TemplateName, SourceLocation TemplateNameLoc, SourceLocation LAngleLoc, ASTTemplateArgsPtr TemplateArgs, SourceLocation RAngleLoc, SourceLocation CCLoc, bool EnteringContext) |
The parser has parsed a nested-name-specifier 'template[opt] template-name < template-args >::'. More... | |
void * | SaveNestedNameSpecifierAnnotation (CXXScopeSpec &SS) |
Given a C++ nested-name-specifier, produce an annotation value that the parser can use later to reconstruct the given nested-name-specifier. More... | |
void | RestoreNestedNameSpecifierAnnotation (void *Annotation, SourceRange AnnotationRange, CXXScopeSpec &SS) |
Given an annotation pointer for a nested-name-specifier, restore the nested-name-specifier structure. More... | |
bool | ShouldEnterDeclaratorScope (Scope *S, const CXXScopeSpec &SS) |
bool | ActOnCXXEnterDeclaratorScope (Scope *S, CXXScopeSpec &SS) |
ActOnCXXEnterDeclaratorScope - Called when a C++ scope specifier (global scope or nested-name-specifier) is parsed, part of a declarator-id. More... | |
void | ActOnCXXExitDeclaratorScope (Scope *S, const CXXScopeSpec &SS) |
ActOnCXXExitDeclaratorScope - Called when a declarator that previously invoked ActOnCXXEnterDeclaratorScope(), is finished. More... | |
void | ActOnCXXEnterDeclInitializer (Scope *S, Decl *Dcl) |
ActOnCXXEnterDeclInitializer - Invoked when we are about to parse an initializer for the declaration 'Dcl'. More... | |
void | ActOnCXXExitDeclInitializer (Scope *S, Decl *Dcl) |
ActOnCXXExitDeclInitializer - Invoked after we are finished parsing an initializer for the declaration 'Dcl'. More... | |
CXXRecordDecl * | createLambdaClosureType (SourceRange IntroducerRange, TypeSourceInfo *Info, bool KnownDependent, LambdaCaptureDefault CaptureDefault) |
Create a new lambda closure type. More... | |
CXXMethodDecl * | startLambdaDefinition (CXXRecordDecl *Class, SourceRange IntroducerRange, TypeSourceInfo *MethodType, SourceLocation EndLoc, ArrayRef< ParmVarDecl *> Params, ConstexprSpecKind ConstexprKind, Optional< std::pair< unsigned, Decl *>> Mangling=None) |
Start the definition of a lambda expression. More... | |
void | buildLambdaScope (sema::LambdaScopeInfo *LSI, CXXMethodDecl *CallOperator, SourceRange IntroducerRange, LambdaCaptureDefault CaptureDefault, SourceLocation CaptureDefaultLoc, bool ExplicitParams, bool ExplicitResultType, bool Mutable) |
Endow the lambda scope info with the relevant properties. More... | |
ParsedType | actOnLambdaInitCaptureInitialization (SourceLocation Loc, bool ByRef, SourceLocation EllipsisLoc, IdentifierInfo *Id, LambdaCaptureInitKind InitKind, Expr *&Init) |
Perform initialization analysis of the init-capture and perform any implicit conversions such as an lvalue-to-rvalue conversion if not being used to initialize a reference. More... | |
QualType | buildLambdaInitCaptureInitialization (SourceLocation Loc, bool ByRef, SourceLocation EllipsisLoc, Optional< unsigned > NumExpansions, IdentifierInfo *Id, bool DirectInit, Expr *&Init) |
VarDecl * | createLambdaInitCaptureVarDecl (SourceLocation Loc, QualType InitCaptureType, SourceLocation EllipsisLoc, IdentifierInfo *Id, unsigned InitStyle, Expr *Init) |
Create a dummy variable within the declcontext of the lambda's call operator, for name lookup purposes for a lambda init capture. More... | |
void | addInitCapture (sema::LambdaScopeInfo *LSI, VarDecl *Var) |
Add an init-capture to a lambda scope. More... | |
void | finishLambdaExplicitCaptures (sema::LambdaScopeInfo *LSI) |
Note that we have finished the explicit captures for the given lambda. More... | |
void | ActOnLambdaExplicitTemplateParameterList (SourceLocation LAngleLoc, ArrayRef< NamedDecl *> TParams, SourceLocation RAngleLoc) |
This is called after parsing the explicit template parameter list on a lambda (if it exists) in C++2a. More... | |
void | addLambdaParameters (ArrayRef< LambdaIntroducer::LambdaCapture > Captures, CXXMethodDecl *CallOperator, Scope *CurScope) |
Introduce the lambda parameters into scope. More... | |
void | deduceClosureReturnType (sema::CapturingScopeInfo &CSI) |
Deduce a block or lambda's return type based on the return statements present in the body. More... | |
void | ActOnStartOfLambdaDefinition (LambdaIntroducer &Intro, Declarator &ParamInfo, Scope *CurScope) |
ActOnStartOfLambdaDefinition - This is called just before we start parsing the body of a lambda; it analyzes the explicit captures and arguments, and sets up various data-structures for the body of the lambda. More... | |
void | ActOnLambdaError (SourceLocation StartLoc, Scope *CurScope, bool IsInstantiation=false) |
ActOnLambdaError - If there is an error parsing a lambda, this callback is invoked to pop the information about the lambda. More... | |
ExprResult | ActOnLambdaExpr (SourceLocation StartLoc, Stmt *Body, Scope *CurScope) |
ActOnLambdaExpr - This is called when the body of a lambda expression was successfully completed. More... | |
bool | CaptureHasSideEffects (const sema::Capture &From) |
Does copying/destroying the captured variable have side effects? More... | |
bool | DiagnoseUnusedLambdaCapture (SourceRange CaptureRange, const sema::Capture &From) |
Diagnose if an explicit lambda capture is unused. More... | |
FieldDecl * | BuildCaptureField (RecordDecl *RD, const sema::Capture &Capture) |
Build a FieldDecl suitable to hold the given capture. More... | |
ExprResult | BuildCaptureInit (const sema::Capture &Capture, SourceLocation ImplicitCaptureLoc, bool IsOpenMPMapping=false) |
Initialize the given capture with a suitable expression. More... | |
ExprResult | BuildLambdaExpr (SourceLocation StartLoc, SourceLocation EndLoc, sema::LambdaScopeInfo *LSI) |
Complete a lambda-expression having processed and attached the lambda body. More... | |
QualType | getLambdaConversionFunctionResultType (const FunctionProtoType *CallOpType) |
Get the return type to use for a lambda's conversion function(s) to function pointer type, given the type of the call operator. More... | |
void | DefineImplicitLambdaToFunctionPointerConversion (SourceLocation CurrentLoc, CXXConversionDecl *Conv) |
Define the "body" of the conversion from a lambda object to a function pointer. More... | |
void | DefineImplicitLambdaToBlockPointerConversion (SourceLocation CurrentLoc, CXXConversionDecl *Conv) |
Define the "body" of the conversion from a lambda object to a block pointer. More... | |
ExprResult | BuildBlockForLambdaConversion (SourceLocation CurrentLocation, SourceLocation ConvLocation, CXXConversionDecl *Conv, Expr *Src) |
ExprResult | ParseObjCStringLiteral (SourceLocation *AtLocs, ArrayRef< Expr *> Strings) |
ExprResult | BuildObjCStringLiteral (SourceLocation AtLoc, StringLiteral *S) |
ExprResult | BuildCXXMemberCallExpr (Expr *Exp, NamedDecl *FoundDecl, CXXConversionDecl *Method, bool HadMultipleCandidates) |
Decl * | ActOnStartLinkageSpecification (Scope *S, SourceLocation ExternLoc, Expr *LangStr, SourceLocation LBraceLoc) |
ActOnStartLinkageSpecification - Parsed the beginning of a C++ linkage specification, including the language and (if present) the '{'. More... | |
Decl * | ActOnFinishLinkageSpecification (Scope *S, Decl *LinkageSpec, SourceLocation RBraceLoc) |
ActOnFinishLinkageSpecification - Complete the definition of the C++ linkage specification LinkageSpec. More... | |
CXXRecordDecl * | getCurrentClass (Scope *S, const CXXScopeSpec *SS) |
Get the class that is directly named by the current context. More... | |
bool | isCurrentClassName (const IdentifierInfo &II, Scope *S, const CXXScopeSpec *SS=nullptr) |
isCurrentClassName - Determine whether the identifier II is the name of the class type currently being defined. More... | |
bool | isCurrentClassNameTypo (IdentifierInfo *&II, const CXXScopeSpec *SS) |
Determine whether the identifier II is a typo for the name of the class type currently being defined. More... | |
bool | ActOnAccessSpecifier (AccessSpecifier Access, SourceLocation ASLoc, SourceLocation ColonLoc, const ParsedAttributesView &Attrs) |
ActOnAccessSpecifier - Parsed an access specifier followed by a colon. More... | |
NamedDecl * | ActOnCXXMemberDeclarator (Scope *S, AccessSpecifier AS, Declarator &D, MultiTemplateParamsArg TemplateParameterLists, Expr *BitfieldWidth, const VirtSpecifiers &VS, InClassInitStyle InitStyle) |
ActOnCXXMemberDeclarator - This is invoked when a C++ class member declarator is parsed. More... | |
void | ActOnStartCXXInClassMemberInitializer () |
Enter a new C++ default initializer scope. More... | |
void | ActOnFinishCXXInClassMemberInitializer (Decl *VarDecl, SourceLocation EqualLoc, Expr *Init) |
This is invoked after parsing an in-class initializer for a non-static C++ class member, and after instantiating an in-class initializer in a class template. More... | |
MemInitResult | ActOnMemInitializer (Decl *ConstructorD, Scope *S, CXXScopeSpec &SS, IdentifierInfo *MemberOrBase, ParsedType TemplateTypeTy, const DeclSpec &DS, SourceLocation IdLoc, SourceLocation LParenLoc, ArrayRef< Expr *> Args, SourceLocation RParenLoc, SourceLocation EllipsisLoc) |
Handle a C++ member initializer using parentheses syntax. More... | |
MemInitResult | ActOnMemInitializer (Decl *ConstructorD, Scope *S, CXXScopeSpec &SS, IdentifierInfo *MemberOrBase, ParsedType TemplateTypeTy, const DeclSpec &DS, SourceLocation IdLoc, Expr *InitList, SourceLocation EllipsisLoc) |
Handle a C++ member initializer using braced-init-list syntax. More... | |
MemInitResult | BuildMemInitializer (Decl *ConstructorD, Scope *S, CXXScopeSpec &SS, IdentifierInfo *MemberOrBase, ParsedType TemplateTypeTy, const DeclSpec &DS, SourceLocation IdLoc, Expr *Init, SourceLocation EllipsisLoc) |
Handle a C++ member initializer. More... | |
MemInitResult | BuildMemberInitializer (ValueDecl *Member, Expr *Init, SourceLocation IdLoc) |
MemInitResult | BuildBaseInitializer (QualType BaseType, TypeSourceInfo *BaseTInfo, Expr *Init, CXXRecordDecl *ClassDecl, SourceLocation EllipsisLoc) |
MemInitResult | BuildDelegatingInitializer (TypeSourceInfo *TInfo, Expr *Init, CXXRecordDecl *ClassDecl) |
bool | SetDelegatingInitializer (CXXConstructorDecl *Constructor, CXXCtorInitializer *Initializer) |
bool | SetCtorInitializers (CXXConstructorDecl *Constructor, bool AnyErrors, ArrayRef< CXXCtorInitializer *> Initializers=None) |
void | SetIvarInitializers (ObjCImplementationDecl *ObjCImplementation) |
SetIvarInitializers - This routine builds initialization ASTs for the Objective-C implementation whose ivars need be initialized. More... | |
void | MarkBaseAndMemberDestructorsReferenced (SourceLocation Loc, CXXRecordDecl *Record) |
MarkBaseAndMemberDestructorsReferenced - Given a record decl, mark all the non-trivial destructors of its members and bases as referenced. More... | |
void | LoadExternalVTableUses () |
Load any externally-stored vtable uses. More... | |
void | MarkVTableUsed (SourceLocation Loc, CXXRecordDecl *Class, bool DefinitionRequired=false) |
Note that the vtable for the given class was used at the given location. More... | |
void | MarkVirtualMemberExceptionSpecsNeeded (SourceLocation Loc, const CXXRecordDecl *RD) |
Mark the exception specifications of all virtual member functions in the given class as needed. More... | |
void | MarkVirtualMembersReferenced (SourceLocation Loc, const CXXRecordDecl *RD, bool ConstexprOnly=false) |
MarkVirtualMembersReferenced - Will mark all members of the given CXXRecordDecl referenced. More... | |
bool | DefineUsedVTables () |
Define all of the vtables that have been used in this translation unit and reference any virtual members used by those vtables. More... | |
void | AddImplicitlyDeclaredMembersToClass (CXXRecordDecl *ClassDecl) |
AddImplicitlyDeclaredMembersToClass - Adds any implicitly-declared special functions, such as the default constructor, copy constructor, or destructor, to the given C++ class (C++ [special]p1). More... | |
void | ActOnMemInitializers (Decl *ConstructorDecl, SourceLocation ColonLoc, ArrayRef< CXXCtorInitializer *> MemInits, bool AnyErrors) |
ActOnMemInitializers - Handle the member initializers for a constructor. More... | |
void | checkClassLevelDLLAttribute (CXXRecordDecl *Class) |
Check class-level dllimport/dllexport attribute. More... | |
void | checkClassLevelCodeSegAttribute (CXXRecordDecl *Class) |
void | referenceDLLExportedClassMethods () |
void | propagateDLLAttrToBaseClassTemplate (CXXRecordDecl *Class, Attr *ClassAttr, ClassTemplateSpecializationDecl *BaseTemplateSpec, SourceLocation BaseLoc) |
Perform propagation of DLL attributes from a derived class to a templated base class for MS compatibility. More... | |
void | CheckCompletedCXXClass (CXXRecordDecl *Record) |
Perform semantic checks on a class definition that has been completing, introducing implicitly-declared members, checking for abstract types, etc. More... | |
void | checkIllFormedTrivialABIStruct (CXXRecordDecl &RD) |
Check that the C++ class annoated with "trivial_abi" satisfies all the conditions that are needed for the attribute to have an effect. More... | |
void | ActOnFinishCXXMemberSpecification (Scope *S, SourceLocation RLoc, Decl *TagDecl, SourceLocation LBrac, SourceLocation RBrac, const ParsedAttributesView &AttrList) |
void | ActOnFinishCXXMemberDecls () |
Perform any semantic analysis which needs to be delayed until all pending class member declarations have been parsed. More... | |
void | ActOnFinishCXXNonNestedClass (Decl *D) |
void | ActOnReenterCXXMethodParameter (Scope *S, ParmVarDecl *Param) |
This is used to implement the constant expression evaluation part of the attribute enable_if extension. More... | |
unsigned | ActOnReenterTemplateScope (Scope *S, Decl *Template) |
void | ActOnStartDelayedMemberDeclarations (Scope *S, Decl *Record) |
void | ActOnStartDelayedCXXMethodDeclaration (Scope *S, Decl *Method) |
ActOnStartDelayedCXXMethodDeclaration - We have completed parsing a top-level (non-nested) C++ class, and we are now parsing those parts of the given Method declaration that could not be parsed earlier (C++ [class.mem]p2), such as default arguments. More... | |
void | ActOnDelayedCXXMethodParameter (Scope *S, Decl *Param) |
ActOnDelayedCXXMethodParameter - We've already started a delayed C++ method declaration. More... | |
void | ActOnFinishDelayedMemberDeclarations (Scope *S, Decl *Record) |
void | ActOnFinishDelayedCXXMethodDeclaration (Scope *S, Decl *Method) |
ActOnFinishDelayedCXXMethodDeclaration - We have finished processing the delayed method declaration for Method. More... | |
void | ActOnFinishDelayedMemberInitializers (Decl *Record) |
void | MarkAsLateParsedTemplate (FunctionDecl *FD, Decl *FnD, CachedTokens &Toks) |
void | UnmarkAsLateParsedTemplate (FunctionDecl *FD) |
bool | IsInsideALocalClassWithinATemplateFunction () |
Decl * | ActOnStaticAssertDeclaration (SourceLocation StaticAssertLoc, Expr *AssertExpr, Expr *AssertMessageExpr, SourceLocation RParenLoc) |
Decl * | BuildStaticAssertDeclaration (SourceLocation StaticAssertLoc, Expr *AssertExpr, StringLiteral *AssertMessageExpr, SourceLocation RParenLoc, bool Failed) |
FriendDecl * | CheckFriendTypeDecl (SourceLocation LocStart, SourceLocation FriendLoc, TypeSourceInfo *TSInfo) |
Perform semantic analysis of the given friend type declaration. More... | |
Decl * | ActOnFriendTypeDecl (Scope *S, const DeclSpec &DS, MultiTemplateParamsArg TemplateParams) |
Handle a friend type declaration. More... | |
NamedDecl * | ActOnFriendFunctionDecl (Scope *S, Declarator &D, MultiTemplateParamsArg TemplateParams) |
QualType | CheckConstructorDeclarator (Declarator &D, QualType R, StorageClass &SC) |
CheckConstructorDeclarator - Called by ActOnDeclarator to check the well-formedness of the constructor declarator D with type R . More... | |
void | CheckConstructor (CXXConstructorDecl *Constructor) |
CheckConstructor - Checks a fully-formed constructor for well-formedness, issuing any diagnostics required. More... | |
QualType | CheckDestructorDeclarator (Declarator &D, QualType R, StorageClass &SC) |
CheckDestructorDeclarator - Called by ActOnDeclarator to check the well-formednes of the destructor declarator D with type R . More... | |
bool | CheckDestructor (CXXDestructorDecl *Destructor) |
CheckDestructor - Checks a fully-formed destructor definition for well-formedness, issuing any diagnostics required. More... | |
void | CheckConversionDeclarator (Declarator &D, QualType &R, StorageClass &SC) |
CheckConversionDeclarator - Called by ActOnDeclarator to check the well-formednes of the conversion function declarator D with type R . More... | |
Decl * | ActOnConversionDeclarator (CXXConversionDecl *Conversion) |
ActOnConversionDeclarator - Called by ActOnDeclarator to complete the declaration of the given C++ conversion function. More... | |
void | CheckDeductionGuideDeclarator (Declarator &D, QualType &R, StorageClass &SC) |
Check the validity of a declarator that we parsed for a deduction-guide. More... | |
void | CheckDeductionGuideTemplate (FunctionTemplateDecl *TD) |
void | CheckExplicitlyDefaultedSpecialMember (CXXMethodDecl *MD) |
void | CheckDelayedMemberExceptionSpecs () |
CXXBaseSpecifier * | CheckBaseSpecifier (CXXRecordDecl *Class, SourceRange SpecifierRange, bool Virtual, AccessSpecifier Access, TypeSourceInfo *TInfo, SourceLocation EllipsisLoc) |
ActOnBaseSpecifier - Parsed a base specifier. More... | |
BaseResult | ActOnBaseSpecifier (Decl *classdecl, SourceRange SpecifierRange, ParsedAttributes &Attrs, bool Virtual, AccessSpecifier Access, ParsedType basetype, SourceLocation BaseLoc, SourceLocation EllipsisLoc) |
ActOnBaseSpecifier - Parsed a base specifier. More... | |
bool | AttachBaseSpecifiers (CXXRecordDecl *Class, MutableArrayRef< CXXBaseSpecifier *> Bases) |
Performs the actual work of attaching the given base class specifiers to a C++ class. More... | |
void | ActOnBaseSpecifiers (Decl *ClassDecl, MutableArrayRef< CXXBaseSpecifier *> Bases) |
ActOnBaseSpecifiers - Attach the given base specifiers to the class, after checking whether there are any duplicate base classes. More... | |
bool | IsDerivedFrom (SourceLocation Loc, QualType Derived, QualType Base) |
Determine whether the type Derived is a C++ class that is derived from the type Base . More... | |
bool | IsDerivedFrom (SourceLocation Loc, QualType Derived, QualType Base, CXXBasePaths &Paths) |
Determine whether the type Derived is a C++ class that is derived from the type Base . More... | |
void | BuildBasePathArray (const CXXBasePaths &Paths, CXXCastPath &BasePath) |
bool | CheckDerivedToBaseConversion (QualType Derived, QualType Base, SourceLocation Loc, SourceRange Range, CXXCastPath *BasePath=nullptr, bool IgnoreAccess=false) |
bool | CheckDerivedToBaseConversion (QualType Derived, QualType Base, unsigned InaccessibleBaseID, unsigned AmbigiousBaseConvID, SourceLocation Loc, SourceRange Range, DeclarationName Name, CXXCastPath *BasePath, bool IgnoreAccess=false) |
CheckDerivedToBaseConversion - Check whether the Derived-to-Base conversion (where Derived and Base are class types) is well-formed, meaning that the conversion is unambiguous (and that all of the base classes are accessible). More... | |
std::string | getAmbiguousPathsDisplayString (CXXBasePaths &Paths) |
Builds a string representing ambiguous paths from a specific derived class to different subobjects of the same base class. More... | |
bool | CheckOverridingFunctionAttributes (const CXXMethodDecl *New, const CXXMethodDecl *Old) |
bool | CheckOverridingFunctionReturnType (const CXXMethodDecl *New, const CXXMethodDecl *Old) |
CheckOverridingFunctionReturnType - Checks whether the return types are covariant, according to C++ [class.virtual]p5. More... | |
bool | CheckOverridingFunctionExceptionSpec (const CXXMethodDecl *New, const CXXMethodDecl *Old) |
CheckOverridingFunctionExceptionSpec - Checks whether the exception spec is a subset of base spec. More... | |
bool | CheckPureMethod (CXXMethodDecl *Method, SourceRange InitRange) |
Mark the given method pure. More... | |
void | CheckOverrideControl (NamedDecl *D) |
CheckOverrideControl - Check C++11 override control semantics. More... | |
void | DiagnoseAbsenceOfOverrideControl (NamedDecl *D) |
DiagnoseAbsenceOfOverrideControl - Diagnose if 'override' keyword was not used in the declaration of an overriding method. More... | |
bool | CheckIfOverriddenFunctionIsMarkedFinal (const CXXMethodDecl *New, const CXXMethodDecl *Old) |
CheckForFunctionMarkedFinal - Checks whether a virtual member function overrides a virtual member function marked 'final', according to C++11 [class.virtual]p4. More... | |
bool | SetMemberAccessSpecifier (NamedDecl *MemberDecl, NamedDecl *PrevMemberDecl, AccessSpecifier LexicalAS) |
SetMemberAccessSpecifier - Set the access specifier of a member. More... | |
AccessResult | CheckUnresolvedMemberAccess (UnresolvedMemberExpr *E, DeclAccessPair FoundDecl) |
Perform access-control checking on a previously-unresolved member access which has now been resolved to a member. More... | |
AccessResult | CheckUnresolvedLookupAccess (UnresolvedLookupExpr *E, DeclAccessPair FoundDecl) |
AccessResult | CheckAllocationAccess (SourceLocation OperatorLoc, SourceRange PlacementRange, CXXRecordDecl *NamingClass, DeclAccessPair FoundDecl, bool Diagnose=true) |
Checks access to an overloaded operator new or delete. More... | |
AccessResult | CheckConstructorAccess (SourceLocation Loc, CXXConstructorDecl *D, DeclAccessPair FoundDecl, const InitializedEntity &Entity, bool IsCopyBindingRefToTemp=false) |
Checks access to a constructor. More... | |
AccessResult | CheckConstructorAccess (SourceLocation Loc, CXXConstructorDecl *D, DeclAccessPair FoundDecl, const InitializedEntity &Entity, const PartialDiagnostic &PDiag) |
Checks access to a constructor. More... | |
AccessResult | CheckDestructorAccess (SourceLocation Loc, CXXDestructorDecl *Dtor, const PartialDiagnostic &PDiag, QualType objectType=QualType()) |
AccessResult | CheckFriendAccess (NamedDecl *D) |
Checks access to the target of a friend declaration. More... | |
AccessResult | CheckMemberAccess (SourceLocation UseLoc, CXXRecordDecl *NamingClass, DeclAccessPair Found) |
Checks access to a member. More... | |
AccessResult | CheckStructuredBindingMemberAccess (SourceLocation UseLoc, CXXRecordDecl *DecomposedClass, DeclAccessPair Field) |
Checks implicit access to a member in a structured binding. More... | |
AccessResult | CheckMemberOperatorAccess (SourceLocation Loc, Expr *ObjectExpr, Expr *ArgExpr, DeclAccessPair FoundDecl) |
Checks access to an overloaded member operator, including conversion operators. More... | |
AccessResult | CheckAddressOfMemberAccess (Expr *OvlExpr, DeclAccessPair FoundDecl) |
AccessResult | CheckBaseClassAccess (SourceLocation AccessLoc, QualType Base, QualType Derived, const CXXBasePath &Path, unsigned DiagID, bool ForceCheck=false, bool ForceUnprivileged=false) |
Checks access for a hierarchy conversion. More... | |
void | CheckLookupAccess (const LookupResult &R) |
Checks access to all the declarations in the given result set. More... | |
bool | IsSimplyAccessible (NamedDecl *Decl, CXXRecordDecl *NamingClass, QualType BaseType) |
Checks access to Target from the given class. More... | |
bool | isSpecialMemberAccessibleForDeletion (CXXMethodDecl *decl, AccessSpecifier access, QualType objectType) |
Is the given special member function accessible for the purposes of deciding whether to define a special member function as deleted? More... | |
void | HandleDependentAccessCheck (const DependentDiagnostic &DD, const MultiLevelTemplateArgumentList &TemplateArgs) |
void | PerformDependentDiagnostics (const DeclContext *Pattern, const MultiLevelTemplateArgumentList &TemplateArgs) |
void | HandleDelayedAccessCheck (sema::DelayedDiagnostic &DD, Decl *Ctx) |
bool | isAbstractType (SourceLocation Loc, QualType T) |
bool | RequireNonAbstractType (SourceLocation Loc, QualType T, TypeDiagnoser &Diagnoser) |
template<typename... Ts> | |
bool | RequireNonAbstractType (SourceLocation Loc, QualType T, unsigned DiagID, const Ts &...Args) |
void | DiagnoseAbstractType (const CXXRecordDecl *RD) |
bool | CheckOverloadedOperatorDeclaration (FunctionDecl *FnDecl) |
CheckOverloadedOperatorDeclaration - Check whether the declaration of this overloaded operator is well-formed. More... | |
bool | CheckLiteralOperatorDeclaration (FunctionDecl *FnDecl) |
CheckLiteralOperatorDeclaration - Check whether the declaration of this literal operator function is well-formed. More... | |
void | FilterAcceptableTemplateNames (LookupResult &R, bool AllowFunctionTemplates=true, bool AllowDependent=true) |
bool | hasAnyAcceptableTemplateNames (LookupResult &R, bool AllowFunctionTemplates=true, bool AllowDependent=true, bool AllowNonTemplateFunctions=false) |
NamedDecl * | getAsTemplateNameDecl (NamedDecl *D, bool AllowFunctionTemplates=true, bool AllowDependent=true) |
Try to interpret the lookup result D as a template-name. More... | |
bool | LookupTemplateName (LookupResult &R, Scope *S, CXXScopeSpec &SS, QualType ObjectType, bool EnteringContext, bool &MemberOfUnknownSpecialization, SourceLocation TemplateKWLoc=SourceLocation(), AssumedTemplateKind *ATK=nullptr) |
TemplateNameKind | isTemplateName (Scope *S, CXXScopeSpec &SS, bool hasTemplateKeyword, const UnqualifiedId &Name, ParsedType ObjectType, bool EnteringContext, TemplateTy &Template, bool &MemberOfUnknownSpecialization) |
void | ActOnUndeclaredTypeTemplateName (Scope *S, TemplateTy &Name, TemplateNameKind &TNK, SourceLocation NameLoc, IdentifierInfo *&II) |
Try to resolve an undeclared template name as a type template. More... | |
bool | resolveAssumedTemplateNameAsType (Scope *S, TemplateName &Name, SourceLocation NameLoc, bool Diagnose=true) |
bool | isDeductionGuideName (Scope *S, const IdentifierInfo &Name, SourceLocation NameLoc, ParsedTemplateTy *Template=nullptr) |
Determine whether a particular identifier might be the name in a C++1z deduction-guide declaration. More... | |
bool | DiagnoseUnknownTemplateName (const IdentifierInfo &II, SourceLocation IILoc, Scope *S, const CXXScopeSpec *SS, TemplateTy &SuggestedTemplate, TemplateNameKind &SuggestedKind) |
bool | DiagnoseUninstantiableTemplate (SourceLocation PointOfInstantiation, NamedDecl *Instantiation, bool InstantiatedFromMember, const NamedDecl *Pattern, const NamedDecl *PatternDef, TemplateSpecializationKind TSK, bool Complain=true) |
Determine whether we would be unable to instantiate this template (because it either has no definition, or is in the process of being instantiated). More... | |
void | DiagnoseTemplateParameterShadow (SourceLocation Loc, Decl *PrevDecl) |
DiagnoseTemplateParameterShadow - Produce a diagnostic complaining that the template parameter 'PrevDecl' is being shadowed by a new declaration at location Loc. More... | |
TemplateDecl * | AdjustDeclIfTemplate (Decl *&Decl) |
AdjustDeclIfTemplate - If the given decl happens to be a template, reset the parameter D to reference the templated declaration and return a pointer to the template declaration. More... | |
NamedDecl * | ActOnTypeParameter (Scope *S, bool Typename, SourceLocation EllipsisLoc, SourceLocation KeyLoc, IdentifierInfo *ParamName, SourceLocation ParamNameLoc, unsigned Depth, unsigned Position, SourceLocation EqualLoc, ParsedType DefaultArg) |
ActOnTypeParameter - Called when a C++ template type parameter (e.g., "typename T") has been parsed. More... | |
QualType | CheckNonTypeTemplateParameterType (TypeSourceInfo *&TSI, SourceLocation Loc) |
Check that the type of a non-type template parameter is well-formed. More... | |
QualType | CheckNonTypeTemplateParameterType (QualType T, SourceLocation Loc) |
NamedDecl * | ActOnNonTypeTemplateParameter (Scope *S, Declarator &D, unsigned Depth, unsigned Position, SourceLocation EqualLoc, Expr *DefaultArg) |
NamedDecl * | ActOnTemplateTemplateParameter (Scope *S, SourceLocation TmpLoc, TemplateParameterList *Params, SourceLocation EllipsisLoc, IdentifierInfo *ParamName, SourceLocation ParamNameLoc, unsigned Depth, unsigned Position, SourceLocation EqualLoc, ParsedTemplateArgument DefaultArg) |
ActOnTemplateTemplateParameter - Called when a C++ template template parameter (e.g. More... | |
TemplateParameterList * | ActOnTemplateParameterList (unsigned Depth, SourceLocation ExportLoc, SourceLocation TemplateLoc, SourceLocation LAngleLoc, ArrayRef< NamedDecl *> Params, SourceLocation RAngleLoc, Expr *RequiresClause) |
ActOnTemplateParameterList - Builds a TemplateParameterList, optionally constrained by RequiresClause, that contains the template parameters in Params. More... | |
bool | CheckTemplateParameterList (TemplateParameterList *NewParams, TemplateParameterList *OldParams, TemplateParamListContext TPC, SkipBodyInfo *SkipBody=nullptr) |
Checks the validity of a template parameter list, possibly considering the template parameter list from a previous declaration. More... | |
TemplateParameterList * | MatchTemplateParametersToScopeSpecifier (SourceLocation DeclStartLoc, SourceLocation DeclLoc, const CXXScopeSpec &SS, TemplateIdAnnotation *TemplateId, ArrayRef< TemplateParameterList *> ParamLists, bool IsFriend, bool &IsMemberSpecialization, bool &Invalid) |
Match the given template parameter lists to the given scope specifier, returning the template parameter list that applies to the name. More... | |
DeclResult | CheckClassTemplate (Scope *S, unsigned TagSpec, TagUseKind TUK, SourceLocation KWLoc, CXXScopeSpec &SS, IdentifierInfo *Name, SourceLocation NameLoc, const ParsedAttributesView &Attr, TemplateParameterList *TemplateParams, AccessSpecifier AS, SourceLocation ModulePrivateLoc, SourceLocation FriendLoc, unsigned NumOuterTemplateParamLists, TemplateParameterList **OuterTemplateParamLists, SkipBodyInfo *SkipBody=nullptr) |
TemplateArgumentLoc | getTrivialTemplateArgumentLoc (const TemplateArgument &Arg, QualType NTTPType, SourceLocation Loc) |
Allocate a TemplateArgumentLoc where all locations have been initialized to the given location. More... | |
void | translateTemplateArguments (const ASTTemplateArgsPtr &In, TemplateArgumentListInfo &Out) |
Translates template arguments as provided by the parser into template arguments used by semantic analysis. More... | |
ParsedTemplateArgument | ActOnTemplateTypeArgument (TypeResult ParsedType) |
Convert a parsed type into a parsed template argument. More... | |
void | NoteAllFoundTemplates (TemplateName Name) |
QualType | CheckTemplateIdType (TemplateName Template, SourceLocation TemplateLoc, TemplateArgumentListInfo &TemplateArgs) |
TypeResult | ActOnTemplateIdType (Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, TemplateTy Template, IdentifierInfo *TemplateII, SourceLocation TemplateIILoc, SourceLocation LAngleLoc, ASTTemplateArgsPtr TemplateArgs, SourceLocation RAngleLoc, bool IsCtorOrDtorName=false, bool IsClassName=false) |
TypeResult | ActOnTagTemplateIdType (TagUseKind TUK, TypeSpecifierType TagSpec, SourceLocation TagLoc, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, TemplateTy TemplateD, SourceLocation TemplateLoc, SourceLocation LAngleLoc, ASTTemplateArgsPtr TemplateArgsIn, SourceLocation RAngleLoc) |
Parsed an elaborated-type-specifier that refers to a template-id, such as class T::template apply<U>. More... | |
DeclResult | ActOnVarTemplateSpecialization (Scope *S, Declarator &D, TypeSourceInfo *DI, SourceLocation TemplateKWLoc, TemplateParameterList *TemplateParams, StorageClass SC, bool IsPartialSpecialization) |
DeclResult | CheckVarTemplateId (VarTemplateDecl *Template, SourceLocation TemplateLoc, SourceLocation TemplateNameLoc, const TemplateArgumentListInfo &TemplateArgs) |
ExprResult | CheckVarTemplateId (const CXXScopeSpec &SS, const DeclarationNameInfo &NameInfo, VarTemplateDecl *Template, SourceLocation TemplateLoc, const TemplateArgumentListInfo *TemplateArgs) |
ExprResult | CheckConceptTemplateId (const CXXScopeSpec &SS, const DeclarationNameInfo &NameInfo, ConceptDecl *Template, SourceLocation TemplateLoc, const TemplateArgumentListInfo *TemplateArgs) |
void | diagnoseMissingTemplateArguments (TemplateName Name, SourceLocation Loc) |
ExprResult | BuildTemplateIdExpr (const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, LookupResult &R, bool RequiresADL, const TemplateArgumentListInfo *TemplateArgs) |
ExprResult | BuildQualifiedTemplateIdExpr (CXXScopeSpec &SS, SourceLocation TemplateKWLoc, const DeclarationNameInfo &NameInfo, const TemplateArgumentListInfo *TemplateArgs) |
TemplateNameKind | ActOnDependentTemplateName (Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, const UnqualifiedId &Name, ParsedType ObjectType, bool EnteringContext, TemplateTy &Template, bool AllowInjectedClassName=false) |
Form a dependent template name. More... | |
DeclResult | ActOnClassTemplateSpecialization (Scope *S, unsigned TagSpec, TagUseKind TUK, SourceLocation KWLoc, SourceLocation ModulePrivateLoc, TemplateIdAnnotation &TemplateId, const ParsedAttributesView &Attr, MultiTemplateParamsArg TemplateParameterLists, SkipBodyInfo *SkipBody=nullptr) |
bool | CheckTemplatePartialSpecializationArgs (SourceLocation Loc, TemplateDecl *PrimaryTemplate, unsigned NumExplicitArgs, ArrayRef< TemplateArgument > Args) |
Check the non-type template arguments of a class template partial specialization according to C++ [temp.class.spec]p9. More... | |
void | CheckTemplatePartialSpecialization (ClassTemplatePartialSpecializationDecl *Partial) |
void | CheckTemplatePartialSpecialization (VarTemplatePartialSpecializationDecl *Partial) |
Decl * | ActOnTemplateDeclarator (Scope *S, MultiTemplateParamsArg TemplateParameterLists, Declarator &D) |
bool | CheckSpecializationInstantiationRedecl (SourceLocation NewLoc, TemplateSpecializationKind NewTSK, NamedDecl *PrevDecl, TemplateSpecializationKind PrevTSK, SourceLocation PrevPtOfInstantiation, bool &SuppressNew) |
Diagnose cases where we have an explicit template specialization before/after an explicit template instantiation, producing diagnostics for those cases where they are required and determining whether the new specialization/instantiation will have any effect. More... | |
bool | CheckDependentFunctionTemplateSpecialization (FunctionDecl *FD, const TemplateArgumentListInfo &ExplicitTemplateArgs, LookupResult &Previous) |
Perform semantic analysis for the given dependent function template specialization. More... | |
bool | CheckFunctionTemplateSpecialization (FunctionDecl *FD, TemplateArgumentListInfo *ExplicitTemplateArgs, LookupResult &Previous, bool QualifiedFriend=false) |
Perform semantic analysis for the given function template specialization. More... | |
bool | CheckMemberSpecialization (NamedDecl *Member, LookupResult &Previous) |
Perform semantic analysis for the given non-template member specialization. More... | |
void | CompleteMemberSpecialization (NamedDecl *Member, LookupResult &Previous) |
DeclResult | ActOnExplicitInstantiation (Scope *S, SourceLocation ExternLoc, SourceLocation TemplateLoc, unsigned TagSpec, SourceLocation KWLoc, const CXXScopeSpec &SS, TemplateTy Template, SourceLocation TemplateNameLoc, SourceLocation LAngleLoc, ASTTemplateArgsPtr TemplateArgs, SourceLocation RAngleLoc, const ParsedAttributesView &Attr) |
DeclResult | ActOnExplicitInstantiation (Scope *S, SourceLocation ExternLoc, SourceLocation TemplateLoc, unsigned TagSpec, SourceLocation KWLoc, CXXScopeSpec &SS, IdentifierInfo *Name, SourceLocation NameLoc, const ParsedAttributesView &Attr) |
DeclResult | ActOnExplicitInstantiation (Scope *S, SourceLocation ExternLoc, SourceLocation TemplateLoc, Declarator &D) |
TemplateArgumentLoc | SubstDefaultTemplateArgumentIfAvailable (TemplateDecl *Template, SourceLocation TemplateLoc, SourceLocation RAngleLoc, Decl *Param, SmallVectorImpl< TemplateArgument > &Converted, bool &HasDefaultArg) |
If the given template parameter has a default template argument, substitute into that default template argument and return the corresponding template argument. More... | |
bool | CheckTemplateArgument (NamedDecl *Param, TemplateArgumentLoc &Arg, NamedDecl *Template, SourceLocation TemplateLoc, SourceLocation RAngleLoc, unsigned ArgumentPackIndex, SmallVectorImpl< TemplateArgument > &Converted, CheckTemplateArgumentKind CTAK=CTAK_Specified) |
Check that the given template argument corresponds to the given template parameter. More... | |
bool | CheckTemplateArgumentList (TemplateDecl *Template, SourceLocation TemplateLoc, TemplateArgumentListInfo &TemplateArgs, bool PartialTemplateArgs, SmallVectorImpl< TemplateArgument > &Converted, bool UpdateArgsWithConversions=true) |
Check that the given template arguments can be be provided to the given template, converting the arguments along the way. More... | |
bool | CheckTemplateTypeArgument (TemplateTypeParmDecl *Param, TemplateArgumentLoc &Arg, SmallVectorImpl< TemplateArgument > &Converted) |
bool | CheckTemplateArgument (TemplateTypeParmDecl *Param, TypeSourceInfo *Arg) |
Check a template argument against its corresponding template type parameter. More... | |
ExprResult | CheckTemplateArgument (NonTypeTemplateParmDecl *Param, QualType InstantiatedParamType, Expr *Arg, TemplateArgument &Converted, CheckTemplateArgumentKind CTAK=CTAK_Specified) |
Check a template argument against its corresponding non-type template parameter. More... | |
bool | CheckTemplateTemplateArgument (TemplateParameterList *Params, TemplateArgumentLoc &Arg) |
Check a template argument against its corresponding template template parameter. More... | |
ExprResult | BuildExpressionFromDeclTemplateArgument (const TemplateArgument &Arg, QualType ParamType, SourceLocation Loc) |
Given a non-type template argument that refers to a declaration and the type of its corresponding non-type template parameter, produce an expression that properly refers to that declaration. More... | |
ExprResult | BuildExpressionFromIntegralTemplateArgument (const TemplateArgument &Arg, SourceLocation Loc) |
Construct a new expression that refers to the given integral template argument with the given source-location information. More... | |
bool | TemplateParameterListsAreEqual (TemplateParameterList *New, TemplateParameterList *Old, bool Complain, TemplateParameterListEqualKind Kind, SourceLocation TemplateArgLoc=SourceLocation()) |
Determine whether the given template parameter lists are equivalent. More... | |
bool | CheckTemplateDeclScope (Scope *S, TemplateParameterList *TemplateParams) |
Check whether a template can be declared within this scope. More... | |
TypeResult | ActOnTypenameType (Scope *S, SourceLocation TypenameLoc, const CXXScopeSpec &SS, const IdentifierInfo &II, SourceLocation IdLoc) |
Called when the parser has parsed a C++ typename specifier, e.g., "typename T::type". More... | |
TypeResult | ActOnTypenameType (Scope *S, SourceLocation TypenameLoc, const CXXScopeSpec &SS, SourceLocation TemplateLoc, TemplateTy TemplateName, IdentifierInfo *TemplateII, SourceLocation TemplateIILoc, SourceLocation LAngleLoc, ASTTemplateArgsPtr TemplateArgs, SourceLocation RAngleLoc) |
Called when the parser has parsed a C++ typename specifier that ends in a template-id, e.g., "typename MetaFun::template apply<T1, T2>". More... | |
QualType | CheckTypenameType (ElaboratedTypeKeyword Keyword, SourceLocation KeywordLoc, NestedNameSpecifierLoc QualifierLoc, const IdentifierInfo &II, SourceLocation IILoc) |
Build the type that describes a C++ typename specifier, e.g., "typename T::type". More... | |
TypeSourceInfo * | RebuildTypeInCurrentInstantiation (TypeSourceInfo *T, SourceLocation Loc, DeclarationName Name) |
Rebuilds a type within the context of the current instantiation. More... | |
bool | RebuildNestedNameSpecifierInCurrentInstantiation (CXXScopeSpec &SS) |
ExprResult | RebuildExprInCurrentInstantiation (Expr *E) |
bool | RebuildTemplateParamsInCurrentInstantiation (TemplateParameterList *Params) |
Rebuild the template parameters now that we know we're in a current instantiation. More... | |
std::string | getTemplateArgumentBindingsText (const TemplateParameterList *Params, const TemplateArgumentList &Args) |
Produces a formatted string that describes the binding of template parameters to template arguments. More... | |
std::string | getTemplateArgumentBindingsText (const TemplateParameterList *Params, const TemplateArgument *Args, unsigned NumArgs) |
Decl * | ActOnConceptDefinition (Scope *S, MultiTemplateParamsArg TemplateParameterLists, IdentifierInfo *Name, SourceLocation NameLoc, Expr *ConstraintExpr) |
bool | isUnexpandedParameterPackPermitted () |
Determine whether an unexpanded parameter pack might be permitted in this location. More... | |
bool | DiagnoseUnexpandedParameterPacks (SourceLocation Loc, UnexpandedParameterPackContext UPPC, ArrayRef< UnexpandedParameterPack > Unexpanded) |
Diagnose unexpanded parameter packs. More... | |
bool | DiagnoseUnexpandedParameterPack (SourceLocation Loc, TypeSourceInfo *T, UnexpandedParameterPackContext UPPC) |
If the given type contains an unexpanded parameter pack, diagnose the error. More... | |
bool | DiagnoseUnexpandedParameterPack (Expr *E, UnexpandedParameterPackContext UPPC=UPPC_Expression) |
If the given expression contains an unexpanded parameter pack, diagnose the error. More... | |
bool | DiagnoseUnexpandedParameterPack (const CXXScopeSpec &SS, UnexpandedParameterPackContext UPPC) |
If the given nested-name-specifier contains an unexpanded parameter pack, diagnose the error. More... | |
bool | DiagnoseUnexpandedParameterPack (const DeclarationNameInfo &NameInfo, UnexpandedParameterPackContext UPPC) |
If the given name contains an unexpanded parameter pack, diagnose the error. More... | |
bool | DiagnoseUnexpandedParameterPack (SourceLocation Loc, TemplateName Template, UnexpandedParameterPackContext UPPC) |
If the given template name contains an unexpanded parameter pack, diagnose the error. More... | |
bool | DiagnoseUnexpandedParameterPack (TemplateArgumentLoc Arg, UnexpandedParameterPackContext UPPC) |
If the given template argument contains an unexpanded parameter pack, diagnose the error. More... | |
void | collectUnexpandedParameterPacks (TemplateArgument Arg, SmallVectorImpl< UnexpandedParameterPack > &Unexpanded) |
Collect the set of unexpanded parameter packs within the given template argument. More... | |
void | collectUnexpandedParameterPacks (TemplateArgumentLoc Arg, SmallVectorImpl< UnexpandedParameterPack > &Unexpanded) |
Collect the set of unexpanded parameter packs within the given template argument. More... | |
void | collectUnexpandedParameterPacks (QualType T, SmallVectorImpl< UnexpandedParameterPack > &Unexpanded) |
Collect the set of unexpanded parameter packs within the given type. More... | |
void | collectUnexpandedParameterPacks (TypeLoc TL, SmallVectorImpl< UnexpandedParameterPack > &Unexpanded) |
Collect the set of unexpanded parameter packs within the given type. More... | |
void | collectUnexpandedParameterPacks (NestedNameSpecifierLoc NNS, SmallVectorImpl< UnexpandedParameterPack > &Unexpanded) |
Collect the set of unexpanded parameter packs within the given nested-name-specifier. More... | |
void | collectUnexpandedParameterPacks (const DeclarationNameInfo &NameInfo, SmallVectorImpl< UnexpandedParameterPack > &Unexpanded) |
Collect the set of unexpanded parameter packs within the given name. More... | |
ParsedTemplateArgument | ActOnPackExpansion (const ParsedTemplateArgument &Arg, SourceLocation EllipsisLoc) |
Invoked when parsing a template argument followed by an ellipsis, which creates a pack expansion. More... | |
TypeResult | ActOnPackExpansion (ParsedType Type, SourceLocation EllipsisLoc) |
Invoked when parsing a type followed by an ellipsis, which creates a pack expansion. More... | |
TypeSourceInfo * | CheckPackExpansion (TypeSourceInfo *Pattern, SourceLocation EllipsisLoc, Optional< unsigned > NumExpansions) |
Construct a pack expansion type from the pattern of the pack expansion. More... | |
QualType | CheckPackExpansion (QualType Pattern, SourceRange PatternRange, SourceLocation EllipsisLoc, Optional< unsigned > NumExpansions) |
Construct a pack expansion type from the pattern of the pack expansion. More... | |
ExprResult | ActOnPackExpansion (Expr *Pattern, SourceLocation EllipsisLoc) |
Invoked when parsing an expression followed by an ellipsis, which creates a pack expansion. More... | |
ExprResult | CheckPackExpansion (Expr *Pattern, SourceLocation EllipsisLoc, Optional< unsigned > NumExpansions) |
Invoked when parsing an expression followed by an ellipsis, which creates a pack expansion. More... | |
bool | CheckParameterPacksForExpansion (SourceLocation EllipsisLoc, SourceRange PatternRange, ArrayRef< UnexpandedParameterPack > Unexpanded, const MultiLevelTemplateArgumentList &TemplateArgs, bool &ShouldExpand, bool &RetainExpansion, Optional< unsigned > &NumExpansions) |
Determine whether we could expand a pack expansion with the given set of parameter packs into separate arguments by repeatedly transforming the pattern. More... | |
Optional< unsigned > | getNumArgumentsInExpansion (QualType T, const MultiLevelTemplateArgumentList &TemplateArgs) |
Determine the number of arguments in the given pack expansion type. More... | |
bool | containsUnexpandedParameterPacks (Declarator &D) |
Determine whether the given declarator contains any unexpanded parameter packs. More... | |
TemplateArgumentLoc | getTemplateArgumentPackExpansionPattern (TemplateArgumentLoc OrigLoc, SourceLocation &Ellipsis, Optional< unsigned > &NumExpansions) const |
Returns the pattern of the pack expansion for a template argument. More... | |
Optional< unsigned > | getFullyPackExpandedSize (TemplateArgument Arg) |
Given a template argument that contains an unexpanded parameter pack, but which has already been substituted, attempt to determine the number of elements that will be produced once this argument is fully-expanded. More... | |
QualType | adjustCCAndNoReturn (QualType ArgFunctionType, QualType FunctionType, bool AdjustExceptionSpec=false) |
Adjust the type ArgFunctionType to match the calling convention, noreturn, and optionally the exception specification of FunctionType . More... | |
TemplateDeductionResult | DeduceTemplateArguments (ClassTemplatePartialSpecializationDecl *Partial, const TemplateArgumentList &TemplateArgs, sema::TemplateDeductionInfo &Info) |
Perform template argument deduction to determine whether the given template arguments match the given class template partial specialization per C++ [temp.class.spec.match]. More... | |
TemplateDeductionResult | DeduceTemplateArguments (VarTemplatePartialSpecializationDecl *Partial, const TemplateArgumentList &TemplateArgs, sema::TemplateDeductionInfo &Info) |
Perform template argument deduction to determine whether the given template arguments match the given variable template partial specialization per C++ [temp.class.spec.match]. More... | |
TemplateDeductionResult | SubstituteExplicitTemplateArguments (FunctionTemplateDecl *FunctionTemplate, TemplateArgumentListInfo &ExplicitTemplateArgs, SmallVectorImpl< DeducedTemplateArgument > &Deduced, SmallVectorImpl< QualType > &ParamTypes, QualType *FunctionType, sema::TemplateDeductionInfo &Info) |
Substitute the explicitly-provided template arguments into the given function template according to C++ [temp.arg.explicit]. More... | |
TemplateDeductionResult | FinishTemplateArgumentDeduction (FunctionTemplateDecl *FunctionTemplate, SmallVectorImpl< DeducedTemplateArgument > &Deduced, unsigned NumExplicitlySpecified, FunctionDecl *&Specialization, sema::TemplateDeductionInfo &Info, SmallVectorImpl< OriginalCallArg > const *OriginalCallArgs=nullptr, bool PartialOverloading=false, llvm::function_ref< bool()> CheckNonDependent=[]{ return false;}) |
Finish template argument deduction for a function template, checking the deduced template arguments for completeness and forming the function template specialization. More... | |
TemplateDeductionResult | DeduceTemplateArguments (FunctionTemplateDecl *FunctionTemplate, TemplateArgumentListInfo *ExplicitTemplateArgs, ArrayRef< Expr *> Args, FunctionDecl *&Specialization, sema::TemplateDeductionInfo &Info, bool PartialOverloading, llvm::function_ref< bool(ArrayRef< QualType >)> CheckNonDependent) |
Perform template argument deduction from a function call (C++ [temp.deduct.call]). More... | |
TemplateDeductionResult | DeduceTemplateArguments (FunctionTemplateDecl *FunctionTemplate, TemplateArgumentListInfo *ExplicitTemplateArgs, QualType ArgFunctionType, FunctionDecl *&Specialization, sema::TemplateDeductionInfo &Info, bool IsAddressOfFunction=false) |
Deduce template arguments when taking the address of a function template (C++ [temp.deduct.funcaddr]) or matching a specialization to a template. More... | |
TemplateDeductionResult | DeduceTemplateArguments (FunctionTemplateDecl *FunctionTemplate, QualType ToType, CXXConversionDecl *&Specialization, sema::TemplateDeductionInfo &Info) |
Deduce template arguments for a templated conversion function (C++ [temp.deduct.conv]) and, if successful, produce a conversion function template specialization. More... | |
TemplateDeductionResult | DeduceTemplateArguments (FunctionTemplateDecl *FunctionTemplate, TemplateArgumentListInfo *ExplicitTemplateArgs, FunctionDecl *&Specialization, sema::TemplateDeductionInfo &Info, bool IsAddressOfFunction=false) |
Deduce template arguments for a function template when there is nothing to deduce against (C++0x [temp.arg.explicit]p3). More... | |
QualType | SubstAutoType (QualType TypeWithAuto, QualType Replacement) |
Substitute Replacement for auto in TypeWithAuto . More... | |
TypeSourceInfo * | SubstAutoTypeSourceInfo (TypeSourceInfo *TypeWithAuto, QualType Replacement) |
Substitute Replacement for auto in TypeWithAuto. More... | |
QualType | ReplaceAutoType (QualType TypeWithAuto, QualType Replacement) |
Completely replace the auto in TypeWithAuto by Replacement . More... | |
DeduceAutoResult | DeduceAutoType (TypeSourceInfo *AutoType, Expr *&Initializer, QualType &Result, Optional< unsigned > DependentDeductionDepth=None) |
DeduceAutoResult | DeduceAutoType (TypeLoc AutoTypeLoc, Expr *&Initializer, QualType &Result, Optional< unsigned > DependentDeductionDepth=None) |
Deduce the type for an auto type-specifier (C++11 [dcl.spec.auto]p6) More... | |
void | DiagnoseAutoDeductionFailure (VarDecl *VDecl, Expr *Init) |
bool | DeduceReturnType (FunctionDecl *FD, SourceLocation Loc, bool Diagnose=true) |
void | DeclareImplicitDeductionGuides (TemplateDecl *Template, SourceLocation Loc) |
Declare implicit deduction guides for a class template if we've not already done so. More... | |
QualType | DeduceTemplateSpecializationFromInitializer (TypeSourceInfo *TInfo, const InitializedEntity &Entity, const InitializationKind &Kind, MultiExprArg Init) |
QualType | deduceVarTypeFromInitializer (VarDecl *VDecl, DeclarationName Name, QualType Type, TypeSourceInfo *TSI, SourceRange Range, bool DirectInit, Expr *Init) |
TypeLoc | getReturnTypeLoc (FunctionDecl *FD) const |
bool | DeduceFunctionTypeFromReturnExpr (FunctionDecl *FD, SourceLocation ReturnLoc, Expr *&RetExpr, AutoType *AT) |
Deduce the return type for a function from a returned expression, per C++1y [dcl.spec.auto]p6. More... | |
FunctionTemplateDecl * | getMoreSpecializedTemplate (FunctionTemplateDecl *FT1, FunctionTemplateDecl *FT2, SourceLocation Loc, TemplatePartialOrderingContext TPOC, unsigned NumCallArguments1, unsigned NumCallArguments2) |
Returns the more specialized function template according to the rules of function template partial ordering (C++ [temp.func.order]). More... | |
UnresolvedSetIterator | getMostSpecialized (UnresolvedSetIterator SBegin, UnresolvedSetIterator SEnd, TemplateSpecCandidateSet &FailedCandidates, SourceLocation Loc, const PartialDiagnostic &NoneDiag, const PartialDiagnostic &AmbigDiag, const PartialDiagnostic &CandidateDiag, bool Complain=true, QualType TargetType=QualType()) |
Retrieve the most specialized of the given function template specializations. More... | |
ClassTemplatePartialSpecializationDecl * | getMoreSpecializedPartialSpecialization (ClassTemplatePartialSpecializationDecl *PS1, ClassTemplatePartialSpecializationDecl *PS2, SourceLocation Loc) |
Returns the more specialized class template partial specialization according to the rules of partial ordering of class template partial specializations (C++ [temp.class.order]). More... | |
bool | isMoreSpecializedThanPrimary (ClassTemplatePartialSpecializationDecl *T, sema::TemplateDeductionInfo &Info) |
VarTemplatePartialSpecializationDecl * | getMoreSpecializedPartialSpecialization (VarTemplatePartialSpecializationDecl *PS1, VarTemplatePartialSpecializationDecl *PS2, SourceLocation Loc) |
bool | isMoreSpecializedThanPrimary (VarTemplatePartialSpecializationDecl *T, sema::TemplateDeductionInfo &Info) |
bool | isTemplateTemplateParameterAtLeastAsSpecializedAs (TemplateParameterList *P, TemplateDecl *AArg, SourceLocation Loc) |
void | MarkUsedTemplateParameters (const TemplateArgumentList &TemplateArgs, bool OnlyDeduced, unsigned Depth, llvm::SmallBitVector &Used) |
Mark which template parameters can be deduced from a given template argument list. More... | |
void | MarkDeducedTemplateParameters (const FunctionTemplateDecl *FunctionTemplate, llvm::SmallBitVector &Deduced) |
MultiLevelTemplateArgumentList | getTemplateInstantiationArgs (NamedDecl *D, const TemplateArgumentList *Innermost=nullptr, bool RelativeToPrimary=false, const FunctionDecl *Pattern=nullptr) |
Retrieve the template argument list(s) that should be used to instantiate the definition of the given declaration. More... | |
llvm::DenseSet< Module * > & | getLookupModules () |
Get the set of additional modules that should be checked during name lookup. More... | |
void | pushCodeSynthesisContext (CodeSynthesisContext Ctx) |
void | popCodeSynthesisContext () |
bool | inTemplateInstantiation () const |
Determine whether we are currently performing template instantiation. More... | |
void | PrintContextStack () |
void | PrintInstantiationStack () |
Prints the current instantiation stack through a series of notes. More... | |
void | PrintPragmaAttributeInstantiationPoint () |
Optional< sema::TemplateDeductionInfo * > | isSFINAEContext () const |
Determines whether we are currently in a context where template argument substitution failures are not considered errors. More... | |
bool | isUnevaluatedContext () const |
Determines whether we are currently in a context that is not evaluated as per C++ [expr] p5. More... | |
void | PerformPendingInstantiations (bool LocalOnly=false) |
Performs template instantiation for all implicit template instantiations we have seen until this point. More... | |
TypeSourceInfo * | SubstType (TypeSourceInfo *T, const MultiLevelTemplateArgumentList &TemplateArgs, SourceLocation Loc, DeclarationName Entity, bool AllowDeducedTST=false) |
Perform substitution on the type T with a given set of template arguments. More... | |
QualType | SubstType (QualType T, const MultiLevelTemplateArgumentList &TemplateArgs, SourceLocation Loc, DeclarationName Entity) |
Deprecated form of the above. More... | |
TypeSourceInfo * | SubstType (TypeLoc TL, const MultiLevelTemplateArgumentList &TemplateArgs, SourceLocation Loc, DeclarationName Entity) |
TypeSourceInfo * | SubstFunctionDeclType (TypeSourceInfo *T, const MultiLevelTemplateArgumentList &TemplateArgs, SourceLocation Loc, DeclarationName Entity, CXXRecordDecl *ThisContext, Qualifiers ThisTypeQuals) |
A form of SubstType intended specifically for instantiating the type of a FunctionDecl. More... | |
void | SubstExceptionSpec (FunctionDecl *New, const FunctionProtoType *Proto, const MultiLevelTemplateArgumentList &Args) |
bool | SubstExceptionSpec (SourceLocation Loc, FunctionProtoType::ExceptionSpecInfo &ESI, SmallVectorImpl< QualType > &ExceptionStorage, const MultiLevelTemplateArgumentList &Args) |
ParmVarDecl * | SubstParmVarDecl (ParmVarDecl *D, const MultiLevelTemplateArgumentList &TemplateArgs, int indexAdjustment, Optional< unsigned > NumExpansions, bool ExpectParameterPack) |
bool | SubstParmTypes (SourceLocation Loc, ArrayRef< ParmVarDecl *> Params, const FunctionProtoType::ExtParameterInfo *ExtParamInfos, const MultiLevelTemplateArgumentList &TemplateArgs, SmallVectorImpl< QualType > &ParamTypes, SmallVectorImpl< ParmVarDecl *> *OutParams, ExtParameterInfoBuilder &ParamInfos) |
Substitute the given template arguments into the given set of parameters, producing the set of parameter types that would be generated from such a substitution. More... | |
ExprResult | SubstExpr (Expr *E, const MultiLevelTemplateArgumentList &TemplateArgs) |
bool | SubstExprs (ArrayRef< Expr *> Exprs, bool IsCall, const MultiLevelTemplateArgumentList &TemplateArgs, SmallVectorImpl< Expr *> &Outputs) |
Substitute the given template arguments into a list of expressions, expanding pack expansions if required. More... | |
StmtResult | SubstStmt (Stmt *S, const MultiLevelTemplateArgumentList &TemplateArgs) |
TemplateParameterList * | SubstTemplateParams (TemplateParameterList *Params, DeclContext *Owner, const MultiLevelTemplateArgumentList &TemplateArgs) |
Decl * | SubstDecl (Decl *D, DeclContext *Owner, const MultiLevelTemplateArgumentList &TemplateArgs) |
ExprResult | SubstInitializer (Expr *E, const MultiLevelTemplateArgumentList &TemplateArgs, bool CXXDirectInit) |
bool | SubstBaseSpecifiers (CXXRecordDecl *Instantiation, CXXRecordDecl *Pattern, const MultiLevelTemplateArgumentList &TemplateArgs) |
Perform substitution on the base class specifiers of the given class template specialization. More... | |
bool | InstantiateClass (SourceLocation PointOfInstantiation, CXXRecordDecl *Instantiation, CXXRecordDecl *Pattern, const MultiLevelTemplateArgumentList &TemplateArgs, TemplateSpecializationKind TSK, bool Complain=true) |
Instantiate the definition of a class from a given pattern. More... | |
bool | InstantiateEnum (SourceLocation PointOfInstantiation, EnumDecl *Instantiation, EnumDecl *Pattern, const MultiLevelTemplateArgumentList &TemplateArgs, TemplateSpecializationKind TSK) |
Instantiate the definition of an enum from a given pattern. More... | |
bool | InstantiateInClassInitializer (SourceLocation PointOfInstantiation, FieldDecl *Instantiation, FieldDecl *Pattern, const MultiLevelTemplateArgumentList &TemplateArgs) |
Instantiate the definition of a field from the given pattern. More... | |
void | InstantiateAttrs (const MultiLevelTemplateArgumentList &TemplateArgs, const Decl *Pattern, Decl *Inst, LateInstantiatedAttrVec *LateAttrs=nullptr, LocalInstantiationScope *OuterMostScope=nullptr) |
void | InstantiateAttrsForDecl (const MultiLevelTemplateArgumentList &TemplateArgs, const Decl *Pattern, Decl *Inst, LateInstantiatedAttrVec *LateAttrs=nullptr, LocalInstantiationScope *OuterMostScope=nullptr) |
bool | usesPartialOrExplicitSpecialization (SourceLocation Loc, ClassTemplateSpecializationDecl *ClassTemplateSpec) |
bool | InstantiateClassTemplateSpecialization (SourceLocation PointOfInstantiation, ClassTemplateSpecializationDecl *ClassTemplateSpec, TemplateSpecializationKind TSK, bool Complain=true) |
void | InstantiateClassMembers (SourceLocation PointOfInstantiation, CXXRecordDecl *Instantiation, const MultiLevelTemplateArgumentList &TemplateArgs, TemplateSpecializationKind TSK) |
Instantiates the definitions of all of the member of the given class, which is an instantiation of a class template or a member class of a template. More... | |
void | InstantiateClassTemplateSpecializationMembers (SourceLocation PointOfInstantiation, ClassTemplateSpecializationDecl *ClassTemplateSpec, TemplateSpecializationKind TSK) |
Instantiate the definitions of all of the members of the given class template specialization, which was named as part of an explicit instantiation. More... | |
NestedNameSpecifierLoc | SubstNestedNameSpecifierLoc (NestedNameSpecifierLoc NNS, const MultiLevelTemplateArgumentList &TemplateArgs) |
DeclarationNameInfo | SubstDeclarationNameInfo (const DeclarationNameInfo &NameInfo, const MultiLevelTemplateArgumentList &TemplateArgs) |
Do template substitution on declaration name info. More... | |
TemplateName | SubstTemplateName (NestedNameSpecifierLoc QualifierLoc, TemplateName Name, SourceLocation Loc, const MultiLevelTemplateArgumentList &TemplateArgs) |
bool | Subst (const TemplateArgumentLoc *Args, unsigned NumArgs, TemplateArgumentListInfo &Result, const MultiLevelTemplateArgumentList &TemplateArgs) |
void | InstantiateExceptionSpec (SourceLocation PointOfInstantiation, FunctionDecl *Function) |
FunctionDecl * | InstantiateFunctionDeclaration (FunctionTemplateDecl *FTD, const TemplateArgumentList *Args, SourceLocation Loc) |
Instantiate (or find existing instantiation of) a function template with a given set of template arguments. More... | |
void | InstantiateFunctionDefinition (SourceLocation PointOfInstantiation, FunctionDecl *Function, bool Recursive=false, bool DefinitionRequired=false, bool AtEndOfTU=false) |
Instantiate the definition of the given function from its template. More... | |
VarTemplateSpecializationDecl * | BuildVarTemplateInstantiation (VarTemplateDecl *VarTemplate, VarDecl *FromVar, const TemplateArgumentList &TemplateArgList, const TemplateArgumentListInfo &TemplateArgsInfo, SmallVectorImpl< TemplateArgument > &Converted, SourceLocation PointOfInstantiation, void *InsertPos, LateInstantiatedAttrVec *LateAttrs=nullptr, LocalInstantiationScope *StartingScope=nullptr) |
VarTemplateSpecializationDecl * | CompleteVarTemplateSpecializationDecl (VarTemplateSpecializationDecl *VarSpec, VarDecl *PatternDecl, const MultiLevelTemplateArgumentList &TemplateArgs) |
Instantiates a variable template specialization by completing it with appropriate type information and initializer. More... | |
void | BuildVariableInstantiation (VarDecl *NewVar, VarDecl *OldVar, const MultiLevelTemplateArgumentList &TemplateArgs, LateInstantiatedAttrVec *LateAttrs, DeclContext *Owner, LocalInstantiationScope *StartingScope, bool InstantiatingVarTemplate=false, VarTemplateSpecializationDecl *PrevVTSD=nullptr) |
BuildVariableInstantiation - Used after a new variable has been created. More... | |
void | InstantiateVariableInitializer (VarDecl *Var, VarDecl *OldVar, const MultiLevelTemplateArgumentList &TemplateArgs) |
Instantiate the initializer of a variable. More... | |
void | InstantiateVariableDefinition (SourceLocation PointOfInstantiation, VarDecl *Var, bool Recursive=false, bool DefinitionRequired=false, bool AtEndOfTU=false) |
Instantiate the definition of the given variable from its template. More... | |
void | InstantiateMemInitializers (CXXConstructorDecl *New, const CXXConstructorDecl *Tmpl, const MultiLevelTemplateArgumentList &TemplateArgs) |
NamedDecl * | FindInstantiatedDecl (SourceLocation Loc, NamedDecl *D, const MultiLevelTemplateArgumentList &TemplateArgs, bool FindingInstantiatedContext=false) |
Find the instantiation of the given declaration within the current instantiation. More... | |
DeclContext * | FindInstantiatedContext (SourceLocation Loc, DeclContext *DC, const MultiLevelTemplateArgumentList &TemplateArgs) |
Finds the instantiation of the given declaration context within the current instantiation. More... | |
ObjCContainerKind | getObjCContainerKind () const |
DeclResult | actOnObjCTypeParam (Scope *S, ObjCTypeParamVariance variance, SourceLocation varianceLoc, unsigned index, IdentifierInfo *paramName, SourceLocation paramLoc, SourceLocation colonLoc, ParsedType typeBound) |
ObjCTypeParamList * | actOnObjCTypeParamList (Scope *S, SourceLocation lAngleLoc, ArrayRef< Decl *> typeParams, SourceLocation rAngleLoc) |
void | popObjCTypeParamList (Scope *S, ObjCTypeParamList *typeParamList) |
Decl * | ActOnStartClassInterface (Scope *S, SourceLocation AtInterfaceLoc, IdentifierInfo *ClassName, SourceLocation ClassLoc, ObjCTypeParamList *typeParamList, IdentifierInfo *SuperName, SourceLocation SuperLoc, ArrayRef< ParsedType > SuperTypeArgs, SourceRange SuperTypeArgsRange, Decl *const *ProtoRefs, unsigned NumProtoRefs, const SourceLocation *ProtoLocs, SourceLocation EndProtoLoc, const ParsedAttributesView &AttrList) |
void | ActOnSuperClassOfClassInterface (Scope *S, SourceLocation AtInterfaceLoc, ObjCInterfaceDecl *IDecl, IdentifierInfo *ClassName, SourceLocation ClassLoc, IdentifierInfo *SuperName, SourceLocation SuperLoc, ArrayRef< ParsedType > SuperTypeArgs, SourceRange SuperTypeArgsRange) |
void | ActOnTypedefedProtocols (SmallVectorImpl< Decl *> &ProtocolRefs, SmallVectorImpl< SourceLocation > &ProtocolLocs, IdentifierInfo *SuperName, SourceLocation SuperLoc) |
ActOnTypedefedProtocols - this action finds protocol list as part of the typedef'ed use for a qualified super class and adds them to the list of the protocols. More... | |
Decl * | ActOnCompatibilityAlias (SourceLocation AtCompatibilityAliasLoc, IdentifierInfo *AliasName, SourceLocation AliasLocation, IdentifierInfo *ClassName, SourceLocation ClassLocation) |
ActOnCompatibilityAlias - this action is called after complete parsing of a @compatibility_alias declaration. More... | |
bool | CheckForwardProtocolDeclarationForCircularDependency (IdentifierInfo *PName, SourceLocation &PLoc, SourceLocation PrevLoc, const ObjCList< ObjCProtocolDecl > &PList) |
Decl * | ActOnStartProtocolInterface (SourceLocation AtProtoInterfaceLoc, IdentifierInfo *ProtocolName, SourceLocation ProtocolLoc, Decl *const *ProtoRefNames, unsigned NumProtoRefs, const SourceLocation *ProtoLocs, SourceLocation EndProtoLoc, const ParsedAttributesView &AttrList) |
Decl * | ActOnStartCategoryInterface (SourceLocation AtInterfaceLoc, IdentifierInfo *ClassName, SourceLocation ClassLoc, ObjCTypeParamList *typeParamList, IdentifierInfo *CategoryName, SourceLocation CategoryLoc, Decl *const *ProtoRefs, unsigned NumProtoRefs, const SourceLocation *ProtoLocs, SourceLocation EndProtoLoc, const ParsedAttributesView &AttrList) |
Decl * | ActOnStartClassImplementation (SourceLocation AtClassImplLoc, IdentifierInfo *ClassName, SourceLocation ClassLoc, IdentifierInfo *SuperClassname, SourceLocation SuperClassLoc, const ParsedAttributesView &AttrList) |
Decl * | ActOnStartCategoryImplementation (SourceLocation AtCatImplLoc, IdentifierInfo *ClassName, SourceLocation ClassLoc, IdentifierInfo *CatName, SourceLocation CatLoc, const ParsedAttributesView &AttrList) |
ActOnStartCategoryImplementation - Perform semantic checks on the category implementation declaration and build an ObjCCategoryImplDecl object. More... | |
DeclGroupPtrTy | ActOnFinishObjCImplementation (Decl *ObjCImpDecl, ArrayRef< Decl *> Decls) |
DeclGroupPtrTy | ActOnForwardClassDeclaration (SourceLocation Loc, IdentifierInfo **IdentList, SourceLocation *IdentLocs, ArrayRef< ObjCTypeParamList *> TypeParamLists, unsigned NumElts) |
DeclGroupPtrTy | ActOnForwardProtocolDeclaration (SourceLocation AtProtoclLoc, ArrayRef< IdentifierLocPair > IdentList, const ParsedAttributesView &attrList) |
ActOnForwardProtocolDeclaration - Handle @protocol foo;. More... | |
void | FindProtocolDeclaration (bool WarnOnDeclarations, bool ForObjCContainer, ArrayRef< IdentifierLocPair > ProtocolId, SmallVectorImpl< Decl *> &Protocols) |
FindProtocolDeclaration - This routine looks up protocols and issues an error if they are not declared. More... | |
void | DiagnoseTypeArgsAndProtocols (IdentifierInfo *ProtocolId, SourceLocation ProtocolLoc, IdentifierInfo *TypeArgId, SourceLocation TypeArgLoc, bool SelectProtocolFirst=false) |
void | actOnObjCTypeArgsOrProtocolQualifiers (Scope *S, ParsedType baseType, SourceLocation lAngleLoc, ArrayRef< IdentifierInfo *> identifiers, ArrayRef< SourceLocation > identifierLocs, SourceLocation rAngleLoc, SourceLocation &typeArgsLAngleLoc, SmallVectorImpl< ParsedType > &typeArgs, SourceLocation &typeArgsRAngleLoc, SourceLocation &protocolLAngleLoc, SmallVectorImpl< Decl *> &protocols, SourceLocation &protocolRAngleLoc, bool warnOnIncompleteProtocols) |
Given a list of identifiers (and their locations), resolve the names to either Objective-C protocol qualifiers or type arguments, as appropriate. More... | |
TypeResult | actOnObjCProtocolQualifierType (SourceLocation lAngleLoc, ArrayRef< Decl *> protocols, ArrayRef< SourceLocation > protocolLocs, SourceLocation rAngleLoc) |
Build a an Objective-C protocol-qualified 'id' type where no base type was specified. More... | |
TypeResult | actOnObjCTypeArgsAndProtocolQualifiers (Scope *S, SourceLocation Loc, ParsedType BaseType, SourceLocation TypeArgsLAngleLoc, ArrayRef< ParsedType > TypeArgs, SourceLocation TypeArgsRAngleLoc, SourceLocation ProtocolLAngleLoc, ArrayRef< Decl *> Protocols, ArrayRef< SourceLocation > ProtocolLocs, SourceLocation ProtocolRAngleLoc) |
Build a specialized and/or protocol-qualified Objective-C type. More... | |
QualType | BuildObjCTypeParamType (const ObjCTypeParamDecl *Decl, SourceLocation ProtocolLAngleLoc, ArrayRef< ObjCProtocolDecl *> Protocols, ArrayRef< SourceLocation > ProtocolLocs, SourceLocation ProtocolRAngleLoc, bool FailOnError=false) |
Build an Objective-C type parameter type. More... | |
QualType | BuildObjCObjectType (QualType BaseType, SourceLocation Loc, SourceLocation TypeArgsLAngleLoc, ArrayRef< TypeSourceInfo *> TypeArgs, SourceLocation TypeArgsRAngleLoc, SourceLocation ProtocolLAngleLoc, ArrayRef< ObjCProtocolDecl *> Protocols, ArrayRef< SourceLocation > ProtocolLocs, SourceLocation ProtocolRAngleLoc, bool FailOnError=false) |
Build an Objective-C object pointer type. More... | |
void | CheckObjCPropertyAttributes (Decl *PropertyPtrTy, SourceLocation Loc, unsigned &Attributes, bool propertyInPrimaryClass) |
Ensure attributes are consistent with type. More... | |
void | ProcessPropertyDecl (ObjCPropertyDecl *property) |
Process the specified property declaration and create decls for the setters and getters as needed. More... | |
void | DiagnosePropertyMismatch (ObjCPropertyDecl *Property, ObjCPropertyDecl *SuperProperty, const IdentifierInfo *Name, bool OverridingProtocolProperty) |
DiagnosePropertyMismatch - Compares two properties for their attributes and types and warns on a variety of inconsistencies. More... | |
void | DiagnoseClassExtensionDupMethods (ObjCCategoryDecl *CAT, ObjCInterfaceDecl *ID) |
DiagnoseClassExtensionDupMethods - Check for duplicate declaration of a class method in its extension. More... | |
Decl * | ActOnAtEnd (Scope *S, SourceRange AtEnd, ArrayRef< Decl *> allMethods=None, ArrayRef< DeclGroupPtrTy > allTUVars=None) |
Decl * | ActOnProperty (Scope *S, SourceLocation AtLoc, SourceLocation LParenLoc, FieldDeclarator &FD, ObjCDeclSpec &ODS, Selector GetterSel, Selector SetterSel, tok::ObjCKeywordKind MethodImplKind, DeclContext *lexicalDC=nullptr) |
Decl * | ActOnPropertyImplDecl (Scope *S, SourceLocation AtLoc, SourceLocation PropertyLoc, bool ImplKind, IdentifierInfo *PropertyId, IdentifierInfo *PropertyIvar, SourceLocation PropertyIvarLoc, ObjCPropertyQueryKind QueryKind) |
ActOnPropertyImplDecl - This routine performs semantic checks and builds the AST node for a property implementation declaration; declared as @synthesize or @dynamic. More... | |
Decl * | ActOnMethodDeclaration (Scope *S, SourceLocation BeginLoc, SourceLocation EndLoc, tok::TokenKind MethodType, ObjCDeclSpec &ReturnQT, ParsedType ReturnType, ArrayRef< SourceLocation > SelectorLocs, Selector Sel, ObjCArgInfo *ArgInfo, DeclaratorChunk::ParamInfo *CParamInfo, unsigned CNumArgs, const ParsedAttributesView &AttrList, tok::ObjCKeywordKind MethodImplKind, bool isVariadic, bool MethodDefinition) |
bool | CheckARCMethodDecl (ObjCMethodDecl *method) |
Check a method declaration for compatibility with the Objective-C ARC conventions. More... | |
bool | inferObjCARCLifetime (ValueDecl *decl) |
bool | ConversionToObjCStringLiteralCheck (QualType DstType, Expr *&SrcExpr, bool Diagnose=true) |
bool | checkInitMethod (ObjCMethodDecl *method, QualType receiverTypeIfCall) |
Check whether the given method, which must be in the 'init' family, is a valid member of that family. More... | |
void | CheckObjCMethodOverride (ObjCMethodDecl *NewMethod, const ObjCMethodDecl *Overridden) |
Check whether the given new method is a valid override of the given overridden method, and set any properties that should be inherited. More... | |
void | CheckObjCMethodOverrides (ObjCMethodDecl *ObjCMethod, ObjCInterfaceDecl *CurrentClass, ResultTypeCompatibilityKind RTC) |
void | ActOnPragmaClangSection (SourceLocation PragmaLoc, PragmaClangSectionAction Action, PragmaClangSectionKind SecKind, StringRef SecName) |
ActOnPragmaClangSection - Called on well formed #pragma clang section. More... | |
void | ActOnPragmaOptionsAlign (PragmaOptionsAlignKind Kind, SourceLocation PragmaLoc) |
ActOnPragmaOptionsAlign - Called on well formed #pragma options align. More... | |
void | ActOnPragmaPack (SourceLocation PragmaLoc, PragmaMsStackAction Action, StringRef SlotLabel, Expr *Alignment) |
ActOnPragmaPack - Called on well formed #pragma pack(...). More... | |
void | DiagnoseNonDefaultPragmaPack (PragmaPackDiagnoseKind Kind, SourceLocation IncludeLoc) |
void | DiagnoseUnterminatedPragmaPack () |
void | ActOnPragmaMSStruct (PragmaMSStructKind Kind) |
ActOnPragmaMSStruct - Called on well formed #pragma ms_struct [on|off]. More... | |
void | ActOnPragmaMSComment (SourceLocation CommentLoc, PragmaMSCommentKind Kind, StringRef Arg) |
ActOnPragmaMSComment - Called on well formed #pragma comment(kind, "arg"). More... | |
void | ActOnPragmaMSPointersToMembers (LangOptions::PragmaMSPointersToMembersKind Kind, SourceLocation PragmaLoc) |
ActOnPragmaMSPointersToMembers - called on well formed #pragma pointers_to_members(representation method[, general purpose representation]). More... | |
void | ActOnPragmaMSVtorDisp (PragmaMsStackAction Action, SourceLocation PragmaLoc, MSVtorDispAttr::Mode Value) |
Called on well formed #pragma vtordisp(). More... | |
bool | UnifySection (StringRef SectionName, int SectionFlags, DeclaratorDecl *TheDecl) |
bool | UnifySection (StringRef SectionName, int SectionFlags, SourceLocation PragmaSectionLocation) |
void | ActOnPragmaMSSeg (SourceLocation PragmaLocation, PragmaMsStackAction Action, llvm::StringRef StackSlotLabel, StringLiteral *SegmentName, llvm::StringRef PragmaName) |
Called on well formed #pragma bss_seg/data_seg/const_seg/code_seg. More... | |
void | ActOnPragmaMSSection (SourceLocation PragmaLocation, int SectionFlags, StringLiteral *SegmentName) |
Called on well formed #pragma section(). More... | |
void | ActOnPragmaMSInitSeg (SourceLocation PragmaLocation, StringLiteral *SegmentName) |
Called on well-formed #pragma init_seg(). More... | |
void | ActOnPragmaDump (Scope *S, SourceLocation Loc, IdentifierInfo *II) |
Called on #pragma clang __debug dump II. More... | |
void | ActOnPragmaDetectMismatch (SourceLocation Loc, StringRef Name, StringRef Value) |
ActOnPragmaDetectMismatch - Call on well-formed #pragma detect_mismatch. More... | |
void | ActOnPragmaUnused (const Token &Identifier, Scope *curScope, SourceLocation PragmaLoc) |
ActOnPragmaUnused - Called on well-formed '#pragma unused'. More... | |
void | ActOnPragmaVisibility (const IdentifierInfo *VisType, SourceLocation PragmaLoc) |
ActOnPragmaVisibility - Called on well formed #pragma GCC visibility... . More... | |
NamedDecl * | DeclClonePragmaWeak (NamedDecl *ND, IdentifierInfo *II, SourceLocation Loc) |
void | DeclApplyPragmaWeak (Scope *S, NamedDecl *ND, WeakInfo &W) |
void | ActOnPragmaWeakID (IdentifierInfo *WeakName, SourceLocation PragmaLoc, SourceLocation WeakNameLoc) |
ActOnPragmaWeakID - Called on well formed #pragma weak ident. More... | |
void | ActOnPragmaRedefineExtname (IdentifierInfo *WeakName, IdentifierInfo *AliasName, SourceLocation PragmaLoc, SourceLocation WeakNameLoc, SourceLocation AliasNameLoc) |
ActOnPragmaRedefineExtname - Called on well formed #pragma redefine_extname oldname newname. More... | |
void | ActOnPragmaWeakAlias (IdentifierInfo *WeakName, IdentifierInfo *AliasName, SourceLocation PragmaLoc, SourceLocation WeakNameLoc, SourceLocation AliasNameLoc) |
ActOnPragmaWeakAlias - Called on well formed #pragma weak ident = ident. More... | |
void | ActOnPragmaFPContract (LangOptions::FPContractModeKind FPC) |
ActOnPragmaFPContract - Called on well formed #pragma {STDC,OPENCL} FP_CONTRACT and #pragma clang fp contract. More... | |
void | ActOnPragmaFEnvAccess (LangOptions::FEnvAccessModeKind FPC) |
ActOnPragmaFenvAccess - Called on well formed #pragma STDC FENV_ACCESS. More... | |
void | AddAlignmentAttributesForRecord (RecordDecl *RD) |
AddAlignmentAttributesForRecord - Adds any needed alignment attributes to a the record decl, to handle '#pragma pack' and '#pragma options align'. More... | |
void | AddMsStructLayoutForRecord (RecordDecl *RD) |
AddMsStructLayoutForRecord - Adds ms_struct layout attribute to record. More... | |
void | FreePackedContext () |
FreePackedContext - Deallocate and null out PackContext. More... | |
void | PushNamespaceVisibilityAttr (const VisibilityAttr *Attr, SourceLocation Loc) |
PushNamespaceVisibilityAttr - Note that we've entered a namespace with a visibility attribute. More... | |
void | AddPushedVisibilityAttribute (Decl *RD) |
AddPushedVisibilityAttribute - If '#pragma GCC visibility' was used, add an appropriate visibility attribute. More... | |
void | PopPragmaVisibility (bool IsNamespaceEnd, SourceLocation EndLoc) |
PopPragmaVisibility - Pop the top element of the visibility stack; used for '#pragma GCC visibility' and visibility attributes on namespaces. More... | |
void | FreeVisContext () |
FreeVisContext - Deallocate and null out VisContext. More... | |
void | AddCFAuditedAttribute (Decl *D) |
AddCFAuditedAttribute - Check whether we're currently within '#pragma clang arc_cf_code_audited' and, if so, consider adding the appropriate attribute. More... | |
void | ActOnPragmaAttributeAttribute (ParsedAttr &Attribute, SourceLocation PragmaLoc, attr::ParsedSubjectMatchRuleSet Rules) |
void | ActOnPragmaAttributeEmptyPush (SourceLocation PragmaLoc, const IdentifierInfo *Namespace) |
void | ActOnPragmaAttributePop (SourceLocation PragmaLoc, const IdentifierInfo *Namespace) |
Called on well-formed '#pragma clang attribute pop'. More... | |
void | AddPragmaAttributes (Scope *S, Decl *D) |
Adds the attributes that have been specified using the '#pragma clang attribute push' directives to the given declaration. More... | |
void | DiagnoseUnterminatedPragmaAttribute () |
void | ActOnPragmaOptimize (bool On, SourceLocation PragmaLoc) |
Called on well formed #pragma clang optimize. More... | |
SourceLocation | getOptimizeOffPragmaLocation () const |
Get the location for the currently active "\#pragma clang optimize
off". If this location is invalid, then the state of the pragma is "on". More... | |
void | AddRangeBasedOptnone (FunctionDecl *FD) |
Only called on function definitions; if there is a pragma in scope with the effect of a range-based optnone, consider marking the function with attribute optnone. More... | |
void | AddOptnoneAttributeIfNoConflicts (FunctionDecl *FD, SourceLocation Loc) |
Adds the 'optnone' attribute to the function declaration if there are no conflicts; Loc represents the location causing the 'optnone' attribute to be added (usually because of a pragma). More... | |
void | AddAlignedAttr (SourceRange AttrRange, Decl *D, Expr *E, unsigned SpellingListIndex, bool IsPackExpansion) |
AddAlignedAttr - Adds an aligned attribute to a particular declaration. More... | |
void | AddAlignedAttr (SourceRange AttrRange, Decl *D, TypeSourceInfo *T, unsigned SpellingListIndex, bool IsPackExpansion) |
void | AddAssumeAlignedAttr (SourceRange AttrRange, Decl *D, Expr *E, Expr *OE, unsigned SpellingListIndex) |
AddAssumeAlignedAttr - Adds an assume_aligned attribute to a particular declaration. More... | |
void | AddAllocAlignAttr (SourceRange AttrRange, Decl *D, Expr *ParamExpr, unsigned SpellingListIndex) |
AddAllocAlignAttr - Adds an alloc_align attribute to a particular declaration. More... | |
void | AddAlignValueAttr (SourceRange AttrRange, Decl *D, Expr *E, unsigned SpellingListIndex) |
AddAlignValueAttr - Adds an align_value attribute to a particular declaration. More... | |
void | AddLaunchBoundsAttr (SourceRange AttrRange, Decl *D, Expr *MaxThreads, Expr *MinBlocks, unsigned SpellingListIndex) |
AddLaunchBoundsAttr - Adds a launch_bounds attribute to a particular declaration. More... | |
void | AddModeAttr (SourceRange AttrRange, Decl *D, IdentifierInfo *Name, unsigned SpellingListIndex, bool InInstantiation=false) |
AddModeAttr - Adds a mode attribute to a particular declaration. More... | |
void | AddParameterABIAttr (SourceRange AttrRange, Decl *D, ParameterABI ABI, unsigned SpellingListIndex) |
void | AddXConsumedAttr (Decl *D, SourceRange SR, unsigned SpellingIndex, RetainOwnershipKind K, bool IsTemplateInstantiation) |
void | addAMDGPUFlatWorkGroupSizeAttr (SourceRange AttrRange, Decl *D, Expr *Min, Expr *Max, unsigned SpellingListIndex) |
addAMDGPUFlatWorkGroupSizeAttr - Adds an amdgpu_flat_work_group_size attribute to a particular declaration. More... | |
void | addAMDGPUWavesPerEUAttr (SourceRange AttrRange, Decl *D, Expr *Min, Expr *Max, unsigned SpellingListIndex) |
addAMDGPUWavePersEUAttr - Adds an amdgpu_waves_per_eu attribute to a particular declaration. More... | |
bool | checkNSReturnsRetainedReturnType (SourceLocation loc, QualType type) |
bool | ActOnCoroutineBodyStart (Scope *S, SourceLocation KwLoc, StringRef Keyword) |
ExprResult | ActOnCoawaitExpr (Scope *S, SourceLocation KwLoc, Expr *E) |
ExprResult | ActOnCoyieldExpr (Scope *S, SourceLocation KwLoc, Expr *E) |
StmtResult | ActOnCoreturnStmt (Scope *S, SourceLocation KwLoc, Expr *E) |
ExprResult | BuildResolvedCoawaitExpr (SourceLocation KwLoc, Expr *E, bool IsImplicit=false) |
ExprResult | BuildUnresolvedCoawaitExpr (SourceLocation KwLoc, Expr *E, UnresolvedLookupExpr *Lookup) |
ExprResult | BuildCoyieldExpr (SourceLocation KwLoc, Expr *E) |
StmtResult | BuildCoreturnStmt (SourceLocation KwLoc, Expr *E, bool IsImplicit=false) |
StmtResult | BuildCoroutineBodyStmt (CoroutineBodyStmt::CtorArgs) |
bool | buildCoroutineParameterMoves (SourceLocation Loc) |
VarDecl * | buildCoroutinePromise (SourceLocation Loc) |
void | CheckCompletedCoroutineBody (FunctionDecl *FD, Stmt *&Body) |
ClassTemplateDecl * | lookupCoroutineTraits (SourceLocation KwLoc, SourceLocation FuncLoc) |
llvm::StringRef | getCurrentOpenCLExtension () const |
std::string | getOpenCLExtensionsFromDeclExtMap (FunctionDecl *FD) |
Check if a function declaration FD associates with any extensions present in OpenCLDeclExtMap and if so return the extension(s) name(s). More... | |
std::string | getOpenCLExtensionsFromTypeExtMap (FunctionType *FT) |
Check if a function type FT associates with any extensions present in OpenCLTypeExtMap and if so return the extension(s) name(s). More... | |
template<typename T , typename MapT > | |
std::string | getOpenCLExtensionsFromExtMap (T *FT, MapT &Map) |
Find an extension in an appropriate extension map and return its name. More... | |
void | setCurrentOpenCLExtension (llvm::StringRef Ext) |
void | setOpenCLExtensionForType (QualType T, llvm::StringRef Exts) |
Set OpenCL extensions for a type which can only be used when these OpenCL extensions are enabled. More... | |
void | setOpenCLExtensionForDecl (Decl *FD, llvm::StringRef Exts) |
Set OpenCL extensions for a declaration which can only be used when these OpenCL extensions are enabled. More... | |
void | setCurrentOpenCLExtensionForType (QualType T) |
Set current OpenCL extensions for a type which can only be used when these OpenCL extensions are enabled. More... | |
void | setCurrentOpenCLExtensionForDecl (Decl *FD) |
Set current OpenCL extensions for a declaration which can only be used when these OpenCL extensions are enabled. More... | |
bool | isOpenCLDisabledDecl (Decl *FD) |
bool | checkOpenCLDisabledTypeDeclSpec (const DeclSpec &DS, QualType T) |
Check if type T corresponding to declaration specifier DS is disabled due to required OpenCL extensions being disabled. More... | |
bool | checkOpenCLDisabledDecl (const NamedDecl &D, const Expr &E) |
Check if declaration D used by expression E is disabled due to required OpenCL extensions being disabled. More... | |
void | tryCaptureOpenMPLambdas (ValueDecl *V) |
Function tries to capture lambda's captured variables in the OpenMP region before the original lambda is captured. More... | |
bool | isOpenMPCapturedByRef (const ValueDecl *D, unsigned Level) const |
Return true if the provided declaration VD should be captured by reference. More... | |
VarDecl * | isOpenMPCapturedDecl (ValueDecl *D, bool CheckScopeInfo=false, unsigned StopAt=0) |
Check if the specified variable is used in one of the private clauses (private, firstprivate, lastprivate, reduction etc.) in OpenMP constructs. More... | |
ExprResult | getOpenMPCapturedExpr (VarDecl *Capture, ExprValueKind VK, ExprObjectKind OK, SourceLocation Loc) |
void | startOpenMPLoop () |
If the current region is a loop-based region, mark the start of the loop construct. More... | |
bool | isOpenMPPrivateDecl (const ValueDecl *D, unsigned Level) const |
Check if the specified variable is used in 'private' clause. More... | |
void | setOpenMPCaptureKind (FieldDecl *FD, const ValueDecl *D, unsigned Level) |
Sets OpenMP capture kind (OMPC_private, OMPC_firstprivate, OMPC_map etc.) for FD based on DSA for the provided corresponding captured declaration D . More... | |
bool | isOpenMPTargetCapturedDecl (const ValueDecl *D, unsigned Level) const |
Check if the specified variable is captured by 'target' directive. More... | |
ExprResult | PerformOpenMPImplicitIntegerConversion (SourceLocation OpLoc, Expr *Op) |
void | StartOpenMPDSABlock (OpenMPDirectiveKind K, const DeclarationNameInfo &DirName, Scope *CurScope, SourceLocation Loc) |
Called on start of new data sharing attribute block. More... | |
void | StartOpenMPClause (OpenMPClauseKind K) |
Start analysis of clauses. More... | |
void | EndOpenMPClause () |
End analysis of clauses. More... | |
void | EndOpenMPDSABlock (Stmt *CurDirective) |
Called on end of data sharing attribute block. More... | |
void | ActOnOpenMPLoopInitialization (SourceLocation ForLoc, Stmt *Init) |
Check if the current region is an OpenMP loop region and if it is, mark loop control variable, used in Init for loop initialization, as private by default. More... | |
ExprResult | ActOnOpenMPIdExpression (Scope *CurScope, CXXScopeSpec &ScopeSpec, const DeclarationNameInfo &Id, OpenMPDirectiveKind Kind) |
Called on correct id-expression from the '#pragma omp threadprivate'. More... | |
DeclGroupPtrTy | ActOnOpenMPThreadprivateDirective (SourceLocation Loc, ArrayRef< Expr *> VarList) |
Called on well-formed '#pragma omp threadprivate'. More... | |
OMPThreadPrivateDecl * | CheckOMPThreadPrivateDecl (SourceLocation Loc, ArrayRef< Expr *> VarList) |
Builds a new OpenMPThreadPrivateDecl and checks its correctness. More... | |
DeclGroupPtrTy | ActOnOpenMPAllocateDirective (SourceLocation Loc, ArrayRef< Expr *> VarList, ArrayRef< OMPClause *> Clauses, DeclContext *Owner=nullptr) |
Called on well-formed '#pragma omp allocate'. More... | |
DeclGroupPtrTy | ActOnOpenMPRequiresDirective (SourceLocation Loc, ArrayRef< OMPClause *> ClauseList) |
Called on well-formed '#pragma omp requires'. More... | |
OMPRequiresDecl * | CheckOMPRequiresDecl (SourceLocation Loc, ArrayRef< OMPClause *> Clauses) |
Check restrictions on Requires directive. More... | |
QualType | ActOnOpenMPDeclareReductionType (SourceLocation TyLoc, TypeResult ParsedType) |
Check if the specified type is allowed to be used in 'omp declare reduction' construct. More... | |
DeclGroupPtrTy | ActOnOpenMPDeclareReductionDirectiveStart (Scope *S, DeclContext *DC, DeclarationName Name, ArrayRef< std::pair< QualType, SourceLocation >> ReductionTypes, AccessSpecifier AS, Decl *PrevDeclInScope=nullptr) |
Called on start of '#pragma omp declare reduction'. More... | |
void | ActOnOpenMPDeclareReductionCombinerStart (Scope *S, Decl *D) |
Initialize declare reduction construct initializer. More... | |
void | ActOnOpenMPDeclareReductionCombinerEnd (Decl *D, Expr *Combiner) |
Finish current declare reduction construct initializer. More... | |
VarDecl * | ActOnOpenMPDeclareReductionInitializerStart (Scope *S, Decl *D) |
Initialize declare reduction construct initializer. More... | |
void | ActOnOpenMPDeclareReductionInitializerEnd (Decl *D, Expr *Initializer, VarDecl *OmpPrivParm) |
Finish current declare reduction construct initializer. More... | |
DeclGroupPtrTy | ActOnOpenMPDeclareReductionDirectiveEnd (Scope *S, DeclGroupPtrTy DeclReductions, bool IsValid) |
Called at the end of '#pragma omp declare reduction'. More... | |
TypeResult | ActOnOpenMPDeclareMapperVarDecl (Scope *S, Declarator &D) |
Check variable declaration in 'omp declare mapper' construct. More... | |
QualType | ActOnOpenMPDeclareMapperType (SourceLocation TyLoc, TypeResult ParsedType) |
Check if the specified type is allowed to be used in 'omp declare mapper' construct. More... | |
OMPDeclareMapperDecl * | ActOnOpenMPDeclareMapperDirectiveStart (Scope *S, DeclContext *DC, DeclarationName Name, QualType MapperType, SourceLocation StartLoc, DeclarationName VN, AccessSpecifier AS, Decl *PrevDeclInScope=nullptr) |
Called on start of '#pragma omp declare mapper'. More... | |
void | ActOnOpenMPDeclareMapperDirectiveVarDecl (OMPDeclareMapperDecl *DMD, Scope *S, QualType MapperType, SourceLocation StartLoc, DeclarationName VN) |
Build the mapper variable of '#pragma omp declare mapper'. More... | |
DeclGroupPtrTy | ActOnOpenMPDeclareMapperDirectiveEnd (OMPDeclareMapperDecl *D, Scope *S, ArrayRef< OMPClause *> ClauseList) |
Called at the end of '#pragma omp declare mapper'. More... | |
bool | ActOnStartOpenMPDeclareTargetDirective (SourceLocation Loc) |
Called on the start of target region i.e. '#pragma omp declare target'. More... | |
void | ActOnFinishOpenMPDeclareTargetDirective () |
Called at the end of target region i.e. '#pragme omp end declare target'. More... | |
void | ActOnOpenMPDeclareTargetName (Scope *CurScope, CXXScopeSpec &ScopeSpec, const DeclarationNameInfo &Id, OMPDeclareTargetDeclAttr::MapTypeTy MT, NamedDeclSetType &SameDirectiveDecls) |
Called on correct id-expression from the '#pragma omp declare target'. More... | |
void | checkDeclIsAllowedInOpenMPTarget (Expr *E, Decl *D, SourceLocation IdLoc=SourceLocation()) |
Check declaration inside target region. More... | |
bool | isInOpenMPDeclareTargetContext () const |
Return true inside OpenMP declare target region. More... | |
bool | isInOpenMPTargetExecutionDirective () const |
Return true inside OpenMP target region. More... | |
void | ActOnOpenMPRegionStart (OpenMPDirectiveKind DKind, Scope *CurScope) |
Initialization of captured region for OpenMP region. More... | |
StmtResult | ActOnOpenMPRegionEnd (StmtResult S, ArrayRef< OMPClause *> Clauses) |
End of OpenMP region. More... | |
StmtResult | ActOnOpenMPExecutableDirective (OpenMPDirectiveKind Kind, const DeclarationNameInfo &DirName, OpenMPDirectiveKind CancelRegion, ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
StmtResult | ActOnOpenMPParallelDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp parallel' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPForDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp for' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPForSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp for simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPSectionsDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp sections' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPSectionDirective (Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp section' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPSingleDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp single' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPMasterDirective (Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp master' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPCriticalDirective (const DeclarationNameInfo &DirName, ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp critical' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPParallelForDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp parallel for' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPParallelForSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp parallel for simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPParallelSectionsDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp parallel sections' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTaskDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp task' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTaskyieldDirective (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp taskyield'. More... | |
StmtResult | ActOnOpenMPBarrierDirective (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp barrier'. More... | |
StmtResult | ActOnOpenMPTaskwaitDirective (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp taskwait'. More... | |
StmtResult | ActOnOpenMPTaskgroupDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp taskgroup'. More... | |
StmtResult | ActOnOpenMPFlushDirective (ArrayRef< OMPClause *> Clauses, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp flush'. More... | |
StmtResult | ActOnOpenMPOrderedDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp ordered' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPAtomicDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp atomic' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp target' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetDataDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp target data' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetEnterDataDirective (ArrayRef< OMPClause *> Clauses, SourceLocation StartLoc, SourceLocation EndLoc, Stmt *AStmt) |
Called on well-formed '#pragma omp target enter data' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetExitDataDirective (ArrayRef< OMPClause *> Clauses, SourceLocation StartLoc, SourceLocation EndLoc, Stmt *AStmt) |
Called on well-formed '#pragma omp target exit data' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetParallelDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp target parallel' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetParallelForDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target parallel for' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTeamsDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp teams' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPCancellationPointDirective (SourceLocation StartLoc, SourceLocation EndLoc, OpenMPDirectiveKind CancelRegion) |
Called on well-formed '#pragma omp cancellation point'. More... | |
StmtResult | ActOnOpenMPCancelDirective (ArrayRef< OMPClause *> Clauses, SourceLocation StartLoc, SourceLocation EndLoc, OpenMPDirectiveKind CancelRegion) |
Called on well-formed '#pragma omp cancel'. More... | |
StmtResult | ActOnOpenMPTaskLoopDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp taskloop' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTaskLoopSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp taskloop simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPDistributeDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp distribute' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetUpdateDirective (ArrayRef< OMPClause *> Clauses, SourceLocation StartLoc, SourceLocation EndLoc, Stmt *AStmt) |
Called on well-formed '#pragma omp target update'. More... | |
StmtResult | ActOnOpenMPDistributeParallelForDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp distribute parallel for' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPDistributeParallelForSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp distribute parallel for simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPDistributeSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp distribute simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetParallelForSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target parallel for simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTeamsDistributeDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp teams distribute' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTeamsDistributeSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp teams distribute simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTeamsDistributeParallelForSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp teams distribute parallel for simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTeamsDistributeParallelForDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp teams distribute parallel for' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetTeamsDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed '#pragma omp target teams' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetTeamsDistributeDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target teams distribute' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetTeamsDistributeParallelForDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target teams distribute parallel for' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetTeamsDistributeParallelForSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target teams distribute parallel for simd' after parsing of the associated statement. More... | |
StmtResult | ActOnOpenMPTargetTeamsDistributeSimdDirective (ArrayRef< OMPClause *> Clauses, Stmt *AStmt, SourceLocation StartLoc, SourceLocation EndLoc, VarsWithInheritedDSAType &VarsWithImplicitDSA) |
Called on well-formed '#pragma omp target teams distribute simd' after parsing of the associated statement. More... | |
bool | CheckOpenMPLinearModifier (OpenMPLinearClauseKind LinKind, SourceLocation LinLoc) |
Checks correctness of linear modifiers. More... | |
bool | CheckOpenMPLinearDecl (const ValueDecl *D, SourceLocation ELoc, OpenMPLinearClauseKind LinKind, QualType Type) |
Checks that the specified declaration matches requirements for the linear decls. More... | |
DeclGroupPtrTy | ActOnOpenMPDeclareSimdDirective (DeclGroupPtrTy DG, OMPDeclareSimdDeclAttr::BranchStateTy BS, Expr *Simdlen, ArrayRef< Expr *> Uniforms, ArrayRef< Expr *> Aligneds, ArrayRef< Expr *> Alignments, ArrayRef< Expr *> Linears, ArrayRef< unsigned > LinModifiers, ArrayRef< Expr *> Steps, SourceRange SR) |
Called on well-formed '#pragma omp declare simd' after parsing of the associated method/function. More... | |
OMPClause * | ActOnOpenMPSingleExprClause (OpenMPClauseKind Kind, Expr *Expr, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
OMPClause * | ActOnOpenMPAllocatorClause (Expr *Allocator, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'allocator' clause. More... | |
OMPClause * | ActOnOpenMPIfClause (OpenMPDirectiveKind NameModifier, Expr *Condition, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation NameModifierLoc, SourceLocation ColonLoc, SourceLocation EndLoc) |
Called on well-formed 'if' clause. More... | |
OMPClause * | ActOnOpenMPFinalClause (Expr *Condition, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'final' clause. More... | |
OMPClause * | ActOnOpenMPNumThreadsClause (Expr *NumThreads, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'num_threads' clause. More... | |
OMPClause * | ActOnOpenMPSafelenClause (Expr *Length, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'safelen' clause. More... | |
OMPClause * | ActOnOpenMPSimdlenClause (Expr *Length, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'simdlen' clause. More... | |
OMPClause * | ActOnOpenMPCollapseClause (Expr *NumForLoops, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'collapse' clause. More... | |
OMPClause * | ActOnOpenMPOrderedClause (SourceLocation StartLoc, SourceLocation EndLoc, SourceLocation LParenLoc=SourceLocation(), Expr *NumForLoops=nullptr) |
Called on well-formed 'ordered' clause. More... | |
OMPClause * | ActOnOpenMPGrainsizeClause (Expr *Size, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'grainsize' clause. More... | |
OMPClause * | ActOnOpenMPNumTasksClause (Expr *NumTasks, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'num_tasks' clause. More... | |
OMPClause * | ActOnOpenMPHintClause (Expr *Hint, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'hint' clause. More... | |
OMPClause * | ActOnOpenMPSimpleClause (OpenMPClauseKind Kind, unsigned Argument, SourceLocation ArgumentLoc, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
OMPClause * | ActOnOpenMPDefaultClause (OpenMPDefaultClauseKind Kind, SourceLocation KindLoc, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'default' clause. More... | |
OMPClause * | ActOnOpenMPProcBindClause (OpenMPProcBindClauseKind Kind, SourceLocation KindLoc, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'proc_bind' clause. More... | |
OMPClause * | ActOnOpenMPSingleExprWithArgClause (OpenMPClauseKind Kind, ArrayRef< unsigned > Arguments, Expr *Expr, SourceLocation StartLoc, SourceLocation LParenLoc, ArrayRef< SourceLocation > ArgumentsLoc, SourceLocation DelimLoc, SourceLocation EndLoc) |
OMPClause * | ActOnOpenMPScheduleClause (OpenMPScheduleClauseModifier M1, OpenMPScheduleClauseModifier M2, OpenMPScheduleClauseKind Kind, Expr *ChunkSize, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation M1Loc, SourceLocation M2Loc, SourceLocation KindLoc, SourceLocation CommaLoc, SourceLocation EndLoc) |
Called on well-formed 'schedule' clause. More... | |
OMPClause * | ActOnOpenMPClause (OpenMPClauseKind Kind, SourceLocation StartLoc, SourceLocation EndLoc) |
OMPClause * | ActOnOpenMPNowaitClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'nowait' clause. More... | |
OMPClause * | ActOnOpenMPUntiedClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'untied' clause. More... | |
OMPClause * | ActOnOpenMPMergeableClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'mergeable' clause. More... | |
OMPClause * | ActOnOpenMPReadClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'read' clause. More... | |
OMPClause * | ActOnOpenMPWriteClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'write' clause. More... | |
OMPClause * | ActOnOpenMPUpdateClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'update' clause. More... | |
OMPClause * | ActOnOpenMPCaptureClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'capture' clause. More... | |
OMPClause * | ActOnOpenMPSeqCstClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'seq_cst' clause. More... | |
OMPClause * | ActOnOpenMPThreadsClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'threads' clause. More... | |
OMPClause * | ActOnOpenMPSIMDClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'simd' clause. More... | |
OMPClause * | ActOnOpenMPNogroupClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'nogroup' clause. More... | |
OMPClause * | ActOnOpenMPUnifiedAddressClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'unified_address' clause. More... | |
OMPClause * | ActOnOpenMPUnifiedSharedMemoryClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'unified_address' clause. More... | |
OMPClause * | ActOnOpenMPReverseOffloadClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'reverse_offload' clause. More... | |
OMPClause * | ActOnOpenMPDynamicAllocatorsClause (SourceLocation StartLoc, SourceLocation EndLoc) |
Called on well-formed 'dynamic_allocators' clause. More... | |
OMPClause * | ActOnOpenMPAtomicDefaultMemOrderClause (OpenMPAtomicDefaultMemOrderClauseKind Kind, SourceLocation KindLoc, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'atomic_default_mem_order' clause. More... | |
OMPClause * | ActOnOpenMPVarListClause (OpenMPClauseKind Kind, ArrayRef< Expr *> Vars, Expr *TailExpr, const OMPVarListLocTy &Locs, SourceLocation ColonLoc, CXXScopeSpec &ReductionOrMapperIdScopeSpec, DeclarationNameInfo &ReductionOrMapperId, OpenMPDependClauseKind DepKind, OpenMPLinearClauseKind LinKind, ArrayRef< OpenMPMapModifierKind > MapTypeModifiers, ArrayRef< SourceLocation > MapTypeModifiersLoc, OpenMPMapClauseKind MapType, bool IsMapTypeImplicit, SourceLocation DepLinMapLoc) |
OMPClause * | ActOnOpenMPAllocateClause (Expr *Allocator, ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation ColonLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'allocate' clause. More... | |
OMPClause * | ActOnOpenMPPrivateClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'private' clause. More... | |
OMPClause * | ActOnOpenMPFirstprivateClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'firstprivate' clause. More... | |
OMPClause * | ActOnOpenMPLastprivateClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'lastprivate' clause. More... | |
OMPClause * | ActOnOpenMPSharedClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'shared' clause. More... | |
OMPClause * | ActOnOpenMPReductionClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation ColonLoc, SourceLocation EndLoc, CXXScopeSpec &ReductionIdScopeSpec, const DeclarationNameInfo &ReductionId, ArrayRef< Expr *> UnresolvedReductions=llvm::None) |
Called on well-formed 'reduction' clause. More... | |
OMPClause * | ActOnOpenMPTaskReductionClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation ColonLoc, SourceLocation EndLoc, CXXScopeSpec &ReductionIdScopeSpec, const DeclarationNameInfo &ReductionId, ArrayRef< Expr *> UnresolvedReductions=llvm::None) |
Called on well-formed 'task_reduction' clause. More... | |
OMPClause * | ActOnOpenMPInReductionClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation ColonLoc, SourceLocation EndLoc, CXXScopeSpec &ReductionIdScopeSpec, const DeclarationNameInfo &ReductionId, ArrayRef< Expr *> UnresolvedReductions=llvm::None) |
Called on well-formed 'in_reduction' clause. More... | |
OMPClause * | ActOnOpenMPLinearClause (ArrayRef< Expr *> VarList, Expr *Step, SourceLocation StartLoc, SourceLocation LParenLoc, OpenMPLinearClauseKind LinKind, SourceLocation LinLoc, SourceLocation ColonLoc, SourceLocation EndLoc) |
Called on well-formed 'linear' clause. More... | |
OMPClause * | ActOnOpenMPAlignedClause (ArrayRef< Expr *> VarList, Expr *Alignment, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation ColonLoc, SourceLocation EndLoc) |
Called on well-formed 'aligned' clause. More... | |
OMPClause * | ActOnOpenMPCopyinClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'copyin' clause. More... | |
OMPClause * | ActOnOpenMPCopyprivateClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'copyprivate' clause. More... | |
OMPClause * | ActOnOpenMPFlushClause (ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'flush' pseudo clause. More... | |
OMPClause * | ActOnOpenMPDependClause (OpenMPDependClauseKind DepKind, SourceLocation DepLoc, SourceLocation ColonLoc, ArrayRef< Expr *> VarList, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'depend' clause. More... | |
OMPClause * | ActOnOpenMPDeviceClause (Expr *Device, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'device' clause. More... | |
OMPClause * | ActOnOpenMPMapClause (ArrayRef< OpenMPMapModifierKind > MapTypeModifiers, ArrayRef< SourceLocation > MapTypeModifiersLoc, CXXScopeSpec &MapperIdScopeSpec, DeclarationNameInfo &MapperId, OpenMPMapClauseKind MapType, bool IsMapTypeImplicit, SourceLocation MapLoc, SourceLocation ColonLoc, ArrayRef< Expr *> VarList, const OMPVarListLocTy &Locs, ArrayRef< Expr *> UnresolvedMappers=llvm::None) |
Called on well-formed 'map' clause. More... | |
OMPClause * | ActOnOpenMPNumTeamsClause (Expr *NumTeams, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'num_teams' clause. More... | |
OMPClause * | ActOnOpenMPThreadLimitClause (Expr *ThreadLimit, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'thread_limit' clause. More... | |
OMPClause * | ActOnOpenMPPriorityClause (Expr *Priority, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation EndLoc) |
Called on well-formed 'priority' clause. More... | |
OMPClause * | ActOnOpenMPDistScheduleClause (OpenMPDistScheduleClauseKind Kind, Expr *ChunkSize, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation KindLoc, SourceLocation CommaLoc, SourceLocation EndLoc) |
Called on well-formed 'dist_schedule' clause. More... | |
OMPClause * | ActOnOpenMPDefaultmapClause (OpenMPDefaultmapClauseModifier M, OpenMPDefaultmapClauseKind Kind, SourceLocation StartLoc, SourceLocation LParenLoc, SourceLocation MLoc, SourceLocation KindLoc, SourceLocation EndLoc) |
Called on well-formed 'defaultmap' clause. More... | |
OMPClause * | ActOnOpenMPToClause (ArrayRef< Expr *> VarList, CXXScopeSpec &MapperIdScopeSpec, DeclarationNameInfo &MapperId, const OMPVarListLocTy &Locs, ArrayRef< Expr *> UnresolvedMappers=llvm::None) |
Called on well-formed 'to' clause. More... | |
OMPClause * | ActOnOpenMPFromClause (ArrayRef< Expr *> VarList, CXXScopeSpec &MapperIdScopeSpec, DeclarationNameInfo &MapperId, const OMPVarListLocTy &Locs, ArrayRef< Expr *> UnresolvedMappers=llvm::None) |
Called on well-formed 'from' clause. More... | |
OMPClause * | ActOnOpenMPUseDevicePtrClause (ArrayRef< Expr *> VarList, const OMPVarListLocTy &Locs) |
Called on well-formed 'use_device_ptr' clause. More... | |
OMPClause * | ActOnOpenMPIsDevicePtrClause (ArrayRef< Expr *> VarList, const OMPVarListLocTy &Locs) |
Called on well-formed 'is_device_ptr' clause. More... | |
ExprResult | ImpCastExprToType (Expr *E, QualType Type, CastKind CK, ExprValueKind VK=VK_RValue, const CXXCastPath *BasePath=nullptr, CheckedConversionKind CCK=CCK_ImplicitConversion) |
ImpCastExprToType - If Expr is not of type 'Type', insert an implicit cast. More... | |
ExprResult | IgnoredValueConversions (Expr *E) |
IgnoredValueConversions - Given that an expression's result is syntactically ignored, perform any conversions that are required. More... | |
ExprResult | UsualUnaryConversions (Expr *E) |
UsualUnaryConversions - Performs various conversions that are common to most operators (C99 6.3). More... | |
ExprResult | CallExprUnaryConversions (Expr *E) |
CallExprUnaryConversions - a special case of an unary conversion performed on a function designator of a call expression. More... | |
ExprResult | DefaultFunctionArrayConversion (Expr *E, bool Diagnose=true) |
DefaultFunctionArrayConversion (C99 6.3.2.1p3, C99 6.3.2.1p4). More... | |
ExprResult | DefaultFunctionArrayLvalueConversion (Expr *E, bool Diagnose=true) |
ExprResult | DefaultLvalueConversion (Expr *E) |
ExprResult | DefaultArgumentPromotion (Expr *E) |
DefaultArgumentPromotion (C99 6.5.2.2p6). More... | |
ExprResult | TemporaryMaterializationConversion (Expr *E) |
If E is a prvalue denoting an unmaterialized temporary, materialize it as an xvalue. More... | |
VariadicCallType | getVariadicCallType (FunctionDecl *FDecl, const FunctionProtoType *Proto, Expr *Fn) |
VarArgKind | isValidVarArgType (const QualType &Ty) |
Determine the degree of POD-ness for an expression. More... | |
void | checkVariadicArgument (const Expr *E, VariadicCallType CT) |
Check to see if the given expression is a valid argument to a variadic function, issuing a diagnostic if not. More... | |
bool | hasCStrMethod (const Expr *E) |
Check to see if a given expression could have '.c_str()' called on it. More... | |
bool | GatherArgumentsForCall (SourceLocation CallLoc, FunctionDecl *FDecl, const FunctionProtoType *Proto, unsigned FirstParam, ArrayRef< Expr *> Args, SmallVectorImpl< Expr *> &AllArgs, VariadicCallType CallType=VariadicDoesNotApply, bool AllowExplicit=false, bool IsListInitialization=false) |
GatherArgumentsForCall - Collector argument expressions for various form of call prototypes. More... | |
ExprResult | DefaultVariadicArgumentPromotion (Expr *E, VariadicCallType CT, FunctionDecl *FDecl) |
DefaultVariadicArgumentPromotion - Like DefaultArgumentPromotion, but will create a trap if the resulting type is not a POD type. More... | |
QualType | UsualArithmeticConversions (ExprResult &LHS, ExprResult &RHS, bool IsCompAssign=false) |
UsualArithmeticConversions - Performs various conversions that are common to binary operators (C99 6.3.1.8). More... | |
bool | DiagnoseAssignmentResult (AssignConvertType ConvTy, SourceLocation Loc, QualType DstType, QualType SrcType, Expr *SrcExpr, AssignmentAction Action, bool *Complained=nullptr) |
DiagnoseAssignmentResult - Emit a diagnostic, if required, for the assignment conversion type specified by ConvTy. More... | |
bool | IsValueInFlagEnum (const EnumDecl *ED, const llvm::APInt &Val, bool AllowMask) const |
IsValueInFlagEnum - Determine if a value is allowed as part of a flag enum. More... | |
void | DiagnoseAssignmentEnum (QualType DstType, QualType SrcType, Expr *SrcExpr) |
DiagnoseAssignmentEnum - Warn if assignment to enum is a constant integer not in the range of enum values. More... | |
AssignConvertType | CheckAssignmentConstraints (SourceLocation Loc, QualType LHSType, QualType RHSType) |
CheckAssignmentConstraints - Perform type checking for assignment, argument passing, variable initialization, and function return values. More... | |
AssignConvertType | CheckAssignmentConstraints (QualType LHSType, ExprResult &RHS, CastKind &Kind, bool ConvertRHS=true) |
Check assignment constraints and optionally prepare for a conversion of the RHS to the LHS type. More... | |
AssignConvertType | CheckSingleAssignmentConstraints (QualType LHSType, ExprResult &RHS, bool Diagnose=true, bool DiagnoseCFAudited=false, bool ConvertRHS=true) |
Check assignment constraints for an assignment of RHS to LHSType. More... | |
AssignConvertType | CheckTransparentUnionArgumentConstraints (QualType ArgType, ExprResult &RHS) |
bool | IsStringLiteralToNonConstPointerConversion (Expr *From, QualType ToType) |
Helper function to determine whether this is the (deprecated) C++ conversion from a string literal to a pointer to non-const char or non-const wchar_t (for narrow and wide string literals, respectively). More... | |
bool | CheckExceptionSpecCompatibility (Expr *From, QualType ToType) |
ExprResult | PerformImplicitConversion (Expr *From, QualType ToType, AssignmentAction Action, bool AllowExplicit=false) |
PerformImplicitConversion - Perform an implicit conversion of the expression From to the type ToType. More... | |
ExprResult | PerformImplicitConversion (Expr *From, QualType ToType, AssignmentAction Action, bool AllowExplicit, ImplicitConversionSequence &ICS) |
ExprResult | PerformImplicitConversion (Expr *From, QualType ToType, const ImplicitConversionSequence &ICS, AssignmentAction Action, CheckedConversionKind CCK=CCK_ImplicitConversion) |
PerformImplicitConversion - Perform an implicit conversion of the expression From to the type ToType using the pre-computed implicit conversion sequence ICS. More... | |
ExprResult | PerformImplicitConversion (Expr *From, QualType ToType, const StandardConversionSequence &SCS, AssignmentAction Action, CheckedConversionKind CCK) |
PerformImplicitConversion - Perform an implicit conversion of the expression From to the type ToType by following the standard conversion sequence SCS. More... | |
ExprResult | PerformQualificationConversion (Expr *E, QualType Ty, ExprValueKind VK=VK_RValue, CheckedConversionKind CCK=CCK_ImplicitConversion) |
QualType | InvalidOperands (SourceLocation Loc, ExprResult &LHS, ExprResult &RHS) |
the following "Check" methods will return a valid/converted QualType or a null QualType (indicating an error diagnostic was issued). More... | |
QualType | InvalidLogicalVectorOperands (SourceLocation Loc, ExprResult &LHS, ExprResult &RHS) |
QualType | CheckPointerToMemberOperands (ExprResult &LHS, ExprResult &RHS, ExprValueKind &VK, SourceLocation OpLoc, bool isIndirect) |
QualType | CheckMultiplyDivideOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, bool IsCompAssign, bool IsDivide) |
QualType | CheckRemainderOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, bool IsCompAssign=false) |
QualType | CheckAdditionOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, BinaryOperatorKind Opc, QualType *CompLHSTy=nullptr) |
QualType | CheckSubtractionOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, QualType *CompLHSTy=nullptr) |
QualType | CheckShiftOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, BinaryOperatorKind Opc, bool IsCompAssign=false) |
QualType | CheckCompareOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, BinaryOperatorKind Opc) |
QualType | CheckBitwiseOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, BinaryOperatorKind Opc) |
QualType | CheckLogicalOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, BinaryOperatorKind Opc) |
QualType | CheckAssignmentOperands (Expr *LHSExpr, ExprResult &RHS, SourceLocation Loc, QualType CompoundType) |
ExprResult | checkPseudoObjectIncDec (Scope *S, SourceLocation OpLoc, UnaryOperatorKind Opcode, Expr *Op) |
Check an increment or decrement of a pseudo-object expression. More... | |
ExprResult | checkPseudoObjectAssignment (Scope *S, SourceLocation OpLoc, BinaryOperatorKind Opcode, Expr *LHS, Expr *RHS) |
ExprResult | checkPseudoObjectRValue (Expr *E) |
Expr * | recreateSyntacticForm (PseudoObjectExpr *E) |
Given a pseudo-object expression, recreate what it looks like syntactically without the attendant OpaqueValueExprs. More... | |
QualType | CheckConditionalOperands (ExprResult &Cond, ExprResult &LHS, ExprResult &RHS, ExprValueKind &VK, ExprObjectKind &OK, SourceLocation QuestionLoc) |
Note that LHS is not null here, even if this is the gnu "x ?: y" extension. More... | |
QualType | CXXCheckConditionalOperands (ExprResult &cond, ExprResult &lhs, ExprResult &rhs, ExprValueKind &VK, ExprObjectKind &OK, SourceLocation questionLoc) |
Check the operands of ?: under C++ semantics. More... | |
QualType | FindCompositePointerType (SourceLocation Loc, Expr *&E1, Expr *&E2, bool ConvertArgs=true) |
Find a merged pointer type and convert the two expressions to it. More... | |
QualType | FindCompositePointerType (SourceLocation Loc, ExprResult &E1, ExprResult &E2, bool ConvertArgs=true) |
QualType | FindCompositeObjCPointerType (ExprResult &LHS, ExprResult &RHS, SourceLocation QuestionLoc) |
FindCompositeObjCPointerType - Helper method to find composite type of two objective-c pointer types of the two input expressions. More... | |
bool | DiagnoseConditionalForNull (Expr *LHSExpr, Expr *RHSExpr, SourceLocation QuestionLoc) |
Emit a specialized diagnostic when one expression is a null pointer constant and the other is not a pointer. More... | |
void | DiagnoseAlwaysNonNullPointer (Expr *E, Expr::NullPointerConstantKind NullType, bool IsEqual, SourceRange Range) |
Diagnose pointers that are always non-null. More... | |
QualType | CheckVectorOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, bool IsCompAssign, bool AllowBothBool, bool AllowBoolConversion) |
type checking for vector binary operators. More... | |
QualType | GetSignedVectorType (QualType V) |
QualType | CheckVectorCompareOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc, BinaryOperatorKind Opc) |
CheckVectorCompareOperands - vector comparisons are a clang extension that operates on extended vector types. More... | |
QualType | CheckVectorLogicalOperands (ExprResult &LHS, ExprResult &RHS, SourceLocation Loc) |
bool | areLaxCompatibleVectorTypes (QualType srcType, QualType destType) |
Are the two types lax-compatible vector types? That is, given that one of them is a vector, do they have equal storage sizes, where the storage size is the number of elements times the element size? More... | |
bool | isLaxVectorConversion (QualType srcType, QualType destType) |
Is this a legal conversion between two types, one of which is known to be a vector type? More... | |
bool | CheckForConstantInitializer (Expr *e, QualType t) |
type checking declaration initializers (C99 6.7.8) More... | |
ReferenceCompareResult | CompareReferenceRelationship (SourceLocation Loc, QualType T1, QualType T2, bool &DerivedToBase, bool &ObjCConversion, bool &ObjCLifetimeConversion) |
CompareReferenceRelationship - Compare the two types T1 and T2 to determine whether they are reference-related, reference-compatible, reference-compatible with added qualification, or incompatible, for use in C++ initialization by reference (C++ [dcl.ref.init]p4). More... | |
ExprResult | checkUnknownAnyCast (SourceRange TypeRange, QualType CastType, Expr *CastExpr, CastKind &CastKind, ExprValueKind &VK, CXXCastPath &Path) |
Check a cast of an unknown-any type. More... | |
ExprResult | forceUnknownAnyToType (Expr *E, QualType ToType) |
Force an expression with unknown-type to an expression of the given type. More... | |
ExprResult | checkUnknownAnyArg (SourceLocation callLoc, Expr *result, QualType ¶mType) |
Type-check an expression that's being passed to an __unknown_anytype parameter. More... | |
bool | CheckVectorCast (SourceRange R, QualType VectorTy, QualType Ty, CastKind &Kind) |
ExprResult | prepareVectorSplat (QualType VectorTy, Expr *SplattedExpr) |
Prepare SplattedExpr for a vector splat operation, adding implicit casts if necessary. More... | |
ExprResult | CheckExtVectorCast (SourceRange R, QualType DestTy, Expr *CastExpr, CastKind &Kind) |
ExprResult | BuildCXXFunctionalCastExpr (TypeSourceInfo *TInfo, QualType Type, SourceLocation LParenLoc, Expr *CastExpr, SourceLocation RParenLoc) |
void | checkRetainCycles (ObjCMessageExpr *msg) |
checkRetainCycles - Check whether an Objective-C message send might create an obvious retain cycle. More... | |
void | checkRetainCycles (Expr *receiver, Expr *argument) |
Check a property assign to see if it's likely to cause a retain cycle. More... | |
void | checkRetainCycles (VarDecl *Var, Expr *Init) |
bool | checkUnsafeAssigns (SourceLocation Loc, QualType LHS, Expr *RHS) |
checkUnsafeAssigns - Check whether +1 expr is being assigned to weak/__unsafe_unretained type. More... | |
void | checkUnsafeExprAssigns (SourceLocation Loc, Expr *LHS, Expr *RHS) |
checkUnsafeExprAssigns - Check whether +1 expr is being assigned to weak/__unsafe_unretained expression. More... | |
ConditionResult | ActOnCondition (Scope *S, SourceLocation Loc, Expr *SubExpr, ConditionKind CK) |
ConditionResult | ActOnConditionVariable (Decl *ConditionVar, SourceLocation StmtLoc, ConditionKind CK) |
DeclResult | ActOnCXXConditionDeclaration (Scope *S, Declarator &D) |
ActOnCXXConditionDeclarationExpr - Parsed a condition declaration of a C++ if/switch/while/for statement. More... | |
ExprResult | CheckConditionVariable (VarDecl *ConditionVar, SourceLocation StmtLoc, ConditionKind CK) |
Check the use of the given variable as a C++ condition in an if, while, do-while, or switch statement. More... | |
ExprResult | CheckSwitchCondition (SourceLocation SwitchLoc, Expr *Cond) |
ExprResult | CheckBooleanCondition (SourceLocation Loc, Expr *E, bool IsConstexpr=false) |
CheckBooleanCondition - Diagnose problems involving the use of the given expression as a boolean condition (e.g. More... | |
ExplicitSpecifier | ActOnExplicitBoolSpecifier (Expr *E) |
ActOnExplicitBoolSpecifier - Build an ExplicitSpecifier from an expression found in an explicit(bool) specifier. More... | |
bool | tryResolveExplicitSpecifier (ExplicitSpecifier &ExplicitSpec) |
tryResolveExplicitSpecifier - Attempt to resolve the explict specifier. More... | |
void | DiagnoseAssignmentAsCondition (Expr *E) |
DiagnoseAssignmentAsCondition - Given that an expression is being used as a boolean condition, warn if it's an assignment. More... | |
void | DiagnoseEqualityWithExtraParens (ParenExpr *ParenE) |
Redundant parentheses over an equality comparison can indicate that the user intended an assignment used as condition. More... | |
ExprResult | CheckCXXBooleanCondition (Expr *CondExpr, bool IsConstexpr=false) |
CheckCXXBooleanCondition - Returns true if conversion to bool is invalid. More... | |
void | ConvertIntegerToTypeWarnOnOverflow (llvm::APSInt &OldVal, unsigned NewWidth, bool NewSign, SourceLocation Loc, unsigned DiagID) |
ConvertIntegerToTypeWarnOnOverflow - Convert the specified APInt to have the specified width and sign. More... | |
bool | CheckObjCDeclScope (Decl *D) |
Checks that the Objective-C declaration is declared in the global scope. More... | |
ExprResult | VerifyIntegerConstantExpression (Expr *E, llvm::APSInt *Result, VerifyICEDiagnoser &Diagnoser, bool AllowFold=true) |
VerifyIntegerConstantExpression - Verifies that an expression is an ICE, and reports the appropriate diagnostics. More... | |
ExprResult | VerifyIntegerConstantExpression (Expr *E, llvm::APSInt *Result, unsigned DiagID, bool AllowFold=true) |
ExprResult | VerifyIntegerConstantExpression (Expr *E, llvm::APSInt *Result=nullptr) |
ExprResult | VerifyBitField (SourceLocation FieldLoc, IdentifierInfo *FieldName, QualType FieldTy, bool IsMsStruct, Expr *BitWidth, bool *ZeroWidth=nullptr) |
VerifyBitField - verifies that a bit field expression is an ICE and has the correct width, and that the field type is valid. More... | |
void | PushForceCUDAHostDevice () |
Increments our count of the number of times we've seen a pragma forcing functions to be host device. More... | |
bool | PopForceCUDAHostDevice () |
Decrements our count of the number of times we've seen a pragma forcing functions to be host device. More... | |
void | markKnownEmitted (Sema &S, FunctionDecl *OrigCaller, FunctionDecl *OrigCallee, SourceLocation OrigLoc, const llvm::function_ref< bool(Sema &, FunctionDecl *)> IsKnownEmitted) |
Indicate that this function (and thus everything it transtively calls) will be codegen'ed, and emit any deferred diagnostics on this function and its (transitive) callees. More... | |
DeviceDiagBuilder | CUDADiagIfDeviceCode (SourceLocation Loc, unsigned DiagID) |
Creates a DeviceDiagBuilder that emits the diagnostic if the current context is "used as device code". More... | |
DeviceDiagBuilder | CUDADiagIfHostCode (SourceLocation Loc, unsigned DiagID) |
Creates a DeviceDiagBuilder that emits the diagnostic if the current context is "used as host code". More... | |
DeviceDiagBuilder | diagIfOpenMPDeviceCode (SourceLocation Loc, unsigned DiagID) |
Creates a DeviceDiagBuilder that emits the diagnostic if the current context is "used as device code". More... | |
DeviceDiagBuilder | targetDiag (SourceLocation Loc, unsigned DiagID) |
CUDAFunctionTarget | IdentifyCUDATarget (const FunctionDecl *D, bool IgnoreImplicitHDAttr=false) |
Determines whether the given function is a CUDA device/host/kernel/etc. More... | |
CUDAFunctionTarget | IdentifyCUDATarget (const ParsedAttributesView &Attrs) |
CUDAFunctionTarget | CurrentCUDATarget () |
Gets the CUDA target for the current context. More... | |
CUDAFunctionPreference | IdentifyCUDAPreference (const FunctionDecl *Caller, const FunctionDecl *Callee) |
Identifies relative preference of a given Caller/Callee combination, based on their host/device attributes. More... | |
bool | IsAllowedCUDACall (const FunctionDecl *Caller, const FunctionDecl *Callee) |
Determines whether Caller may invoke Callee, based on their CUDA host/device attributes. More... | |
void | maybeAddCUDAHostDeviceAttrs (FunctionDecl *FD, const LookupResult &Previous) |
May add implicit CUDAHostAttr and CUDADeviceAttr attributes to FD, depending on FD and the current compilation settings. More... | |
bool | CheckCUDACall (SourceLocation Loc, FunctionDecl *Callee) |
Check whether we're allowed to call Callee from the current context. More... | |
void | CUDASetLambdaAttrs (CXXMethodDecl *Method) |
Set device or host device attributes on the given lambda operator() method. More... | |
void | EraseUnwantedCUDAMatches (const FunctionDecl *Caller, SmallVectorImpl< std::pair< DeclAccessPair, FunctionDecl *>> &Matches) |
Finds a function in Matches with highest calling priority from Caller context and erases all functions with lower calling priority. More... | |
bool | inferCUDATargetForImplicitSpecialMember (CXXRecordDecl *ClassDecl, CXXSpecialMember CSM, CXXMethodDecl *MemberDecl, bool ConstRHS, bool Diagnose) |
Given a implicit special member, infer its CUDA target from the calls it needs to make to underlying base/field special members. More... | |
bool | isEmptyCudaConstructor (SourceLocation Loc, CXXConstructorDecl *CD) |
bool | isEmptyCudaDestructor (SourceLocation Loc, CXXDestructorDecl *CD) |
void | checkAllowedCUDAInitializer (VarDecl *VD) |
void | checkCUDATargetOverload (FunctionDecl *NewFD, const LookupResult &Previous) |
Check whether NewFD is a valid overload for CUDA. More... | |
void | inheritCUDATargetAttrs (FunctionDecl *FD, const FunctionTemplateDecl &TD) |
Copies target attributes from the template TD to the function FD. More... | |
std::string | getCudaConfigureFuncName () const |
Returns the name of the launch configuration function. More... | |
SourceLocation | getLocationOfStringLiteralByte (const StringLiteral *SL, unsigned ByteNo) const |
ExprResult | SemaBuiltinShuffleVector (CallExpr *TheCall) |
SemaBuiltinShuffleVector - Handle __builtin_shufflevector. More... | |
ExprResult | SemaConvertVectorExpr (Expr *E, TypeSourceInfo *TInfo, SourceLocation BuiltinLoc, SourceLocation RParenLoc) |
SemaConvertVectorExpr - Handle __builtin_convertvector. More... | |
bool | FormatStringHasSArg (const StringLiteral *FExpr) |
void | CheckFloatComparison (SourceLocation Loc, Expr *LHS, Expr *RHS) |
Check for comparisons of floating point operands using != and ==. More... | |
void | RegisterTypeTagForDatatype (const IdentifierInfo *ArgumentKind, uint64_t MagicValue, QualType Type, bool LayoutCompatible, bool MustBeNull) |
Register a magic integral constant to be used as a type tag. More... | |
IdentifierInfo * | getNullabilityKeyword (NullabilityKind nullability) |
Retrieve the keyword associated. More... | |
IdentifierInfo * | getNSErrorIdent () |
Retrieve the identifier "NSError". More... | |
Scope * | getCurScope () const |
Retrieve the parser's current scope. More... | |
void | incrementMSManglingNumber () const |
IdentifierInfo * | getSuperIdentifier () const |
IdentifierInfo * | getFloat128Identifier () const |
Decl * | getObjCDeclContext () const |
DeclContext * | getCurLexicalContext () const |
const DeclContext * | getCurObjCLexicalContext () const |
void | DiagnoseMisalignedMembers () |
Diagnoses the current set of gathered accesses. More... | |
void | DiscardMisalignedMemberAddress (const Type *T, Expr *E) |
This function checks if the expression is in the sef of potentially misaligned members and it is converted to some pointer type T with lower or equal alignment requirements. More... | |
void | RefersToMemberWithReducedAlignment (Expr *E, llvm::function_ref< void(Expr *, RecordDecl *, FieldDecl *, CharUnits)> Action) |
This function calls Action when it determines that E designates a misaligned member due to the packed attribute. More... | |
bool | isSelfExpr (Expr *RExpr) |
Private Helper predicate to check for 'self'. More... | |
bool | isSelfExpr (Expr *RExpr, const ObjCMethodDecl *Method) |
ExprResult | BuildObjCNumericLiteral (SourceLocation AtLoc, Expr *Number) |
BuildObjCNumericLiteral - builds an ObjCBoxedExpr AST node for the numeric literal expression. More... | |
ExprResult | ActOnObjCBoolLiteral (SourceLocation AtLoc, SourceLocation ValueLoc, bool Value) |
ExprResult | BuildObjCArrayLiteral (SourceRange SR, MultiExprArg Elements) |
ExprResult | BuildObjCBoxedExpr (SourceRange SR, Expr *ValueExpr) |
BuildObjCBoxedExpr - builds an ObjCBoxedExpr AST node for the '@' prefixed parenthesized expression. More... | |
ExprResult | BuildObjCSubscriptExpression (SourceLocation RB, Expr *BaseExpr, Expr *IndexExpr, ObjCMethodDecl *getterMethod, ObjCMethodDecl *setterMethod) |
Build an ObjC subscript pseudo-object expression, given that that's supported by the runtime. More... | |
ExprResult | BuildObjCDictionaryLiteral (SourceRange SR, MutableArrayRef< ObjCDictionaryElement > Elements) |
ExprResult | BuildObjCEncodeExpression (SourceLocation AtLoc, TypeSourceInfo *EncodedTypeInfo, SourceLocation RParenLoc) |
ExprResult | ParseObjCEncodeExpression (SourceLocation AtLoc, SourceLocation EncodeLoc, SourceLocation LParenLoc, ParsedType Ty, SourceLocation RParenLoc) |
ExprResult | ParseObjCSelectorExpression (Selector Sel, SourceLocation AtLoc, SourceLocation SelLoc, SourceLocation LParenLoc, SourceLocation RParenLoc, bool WarnMultipleSelectors) |
ParseObjCSelectorExpression - Build selector expression for @selector. More... | |
ExprResult | ParseObjCProtocolExpression (IdentifierInfo *ProtocolName, SourceLocation AtLoc, SourceLocation ProtoLoc, SourceLocation LParenLoc, SourceLocation ProtoIdLoc, SourceLocation RParenLoc) |
ParseObjCProtocolExpression - Build protocol expression for @protocol. More... | |
ObjCMethodDecl * | LookupMethodInQualifiedType (Selector Sel, const ObjCObjectPointerType *OPT, bool IsInstance) |
LookupMethodInQualifiedType - Lookups up a method in protocol qualifier list of a qualified objective pointer type. More... | |
ObjCMethodDecl * | LookupMethodInObjectType (Selector Sel, QualType Ty, bool IsInstance) |
LookupMethodInType - Look up a method in an ObjCObjectType. More... | |
ExprResult | HandleExprPropertyRefExpr (const ObjCObjectPointerType *OPT, Expr *BaseExpr, SourceLocation OpLoc, DeclarationName MemberName, SourceLocation MemberLoc, SourceLocation SuperLoc, QualType SuperType, bool Super) |
HandleExprPropertyRefExpr - Handle foo.bar where foo is a pointer to an objective C interface. More... | |
ExprResult | ActOnClassPropertyRefExpr (IdentifierInfo &receiverName, IdentifierInfo &propertyName, SourceLocation receiverNameLoc, SourceLocation propertyNameLoc) |
ObjCMethodDecl * | tryCaptureObjCSelf (SourceLocation Loc) |
Try to capture an implicit reference to 'self'. More... | |
ObjCMessageKind | getObjCMessageKind (Scope *S, IdentifierInfo *Name, SourceLocation NameLoc, bool IsSuper, bool HasTrailingDot, ParsedType &ReceiverType) |
ExprResult | ActOnSuperMessage (Scope *S, SourceLocation SuperLoc, Selector Sel, SourceLocation LBracLoc, ArrayRef< SourceLocation > SelectorLocs, SourceLocation RBracLoc, MultiExprArg Args) |
ExprResult | BuildClassMessage (TypeSourceInfo *ReceiverTypeInfo, QualType ReceiverType, SourceLocation SuperLoc, Selector Sel, ObjCMethodDecl *Method, SourceLocation LBracLoc, ArrayRef< SourceLocation > SelectorLocs, SourceLocation RBracLoc, MultiExprArg Args, bool isImplicit=false) |
Build an Objective-C class message expression. More... | |
ExprResult | BuildClassMessageImplicit (QualType ReceiverType, bool isSuperReceiver, SourceLocation Loc, Selector Sel, ObjCMethodDecl *Method, MultiExprArg Args) |
ExprResult | ActOnClassMessage (Scope *S, ParsedType Receiver, Selector Sel, SourceLocation LBracLoc, ArrayRef< SourceLocation > SelectorLocs, SourceLocation RBracLoc, MultiExprArg Args) |
ExprResult | BuildInstanceMessage (Expr *Receiver, QualType ReceiverType, SourceLocation SuperLoc, Selector Sel, ObjCMethodDecl *Method, SourceLocation LBracLoc, ArrayRef< SourceLocation > SelectorLocs, SourceLocation RBracLoc, MultiExprArg Args, bool isImplicit=false) |
Build an Objective-C instance message expression. More... | |
ExprResult | BuildInstanceMessageImplicit (Expr *Receiver, QualType ReceiverType, SourceLocation Loc, Selector Sel, ObjCMethodDecl *Method, MultiExprArg Args) |
ExprResult | ActOnInstanceMessage (Scope *S, Expr *Receiver, Selector Sel, SourceLocation LBracLoc, ArrayRef< SourceLocation > SelectorLocs, SourceLocation RBracLoc, MultiExprArg Args) |
ExprResult | BuildObjCBridgedCast (SourceLocation LParenLoc, ObjCBridgeCastKind Kind, SourceLocation BridgeKeywordLoc, TypeSourceInfo *TSInfo, Expr *SubExpr) |
ExprResult | ActOnObjCBridgedCast (Scope *S, SourceLocation LParenLoc, ObjCBridgeCastKind Kind, SourceLocation BridgeKeywordLoc, ParsedType Type, SourceLocation RParenLoc, Expr *SubExpr) |
void | CheckTollFreeBridgeCast (QualType castType, Expr *castExpr) |
void | CheckObjCBridgeRelatedCast (QualType castType, Expr *castExpr) |
bool | CheckTollFreeBridgeStaticCast (QualType castType, Expr *castExpr, CastKind &Kind) |
bool | checkObjCBridgeRelatedComponents (SourceLocation Loc, QualType DestType, QualType SrcType, ObjCInterfaceDecl *&RelatedClass, ObjCMethodDecl *&ClassMethod, ObjCMethodDecl *&InstanceMethod, TypedefNameDecl *&TDNDecl, bool CfToNs, bool Diagnose=true) |
bool | CheckObjCBridgeRelatedConversions (SourceLocation Loc, QualType DestType, QualType SrcType, Expr *&SrcExpr, bool Diagnose=true) |
ARCConversionResult | CheckObjCConversion (SourceRange castRange, QualType castType, Expr *&op, CheckedConversionKind CCK, bool Diagnose=true, bool DiagnoseCFAudited=false, BinaryOperatorKind Opc=BO_PtrMemD) |
Checks for invalid conversions and casts between retainable pointers and other pointer kinds for ARC and Weak. More... | |
Expr * | stripARCUnbridgedCast (Expr *e) |
stripARCUnbridgedCast - Given an expression of ARCUnbridgedCast type, remove the placeholder cast. More... | |
void | diagnoseARCUnbridgedCast (Expr *e) |
Given that we saw an expression with the ARCUnbridgedCastTy placeholder type, complain bitterly. More... | |
bool | CheckObjCARCUnavailableWeakConversion (QualType castType, QualType ExprType) |
bool | CheckMessageArgumentTypes (const Expr *Receiver, QualType ReceiverType, MultiExprArg Args, Selector Sel, ArrayRef< SourceLocation > SelectorLocs, ObjCMethodDecl *Method, bool isClassMessage, bool isSuperMessage, SourceLocation lbrac, SourceLocation rbrac, SourceRange RecRange, QualType &ReturnType, ExprValueKind &VK) |
CheckMessageArgumentTypes - Check types in an Obj-C message send. More... | |
QualType | getMessageSendResultType (const Expr *Receiver, QualType ReceiverType, ObjCMethodDecl *Method, bool isClassMessage, bool isSuperMessage) |
Determine the result of a message send expression based on the type of the receiver, the method expected to receive the message, and the form of the message send. More... | |
void | EmitRelatedResultTypeNote (const Expr *E) |
If the given expression involves a message send to a method with a related result type, emit a note describing what happened. More... | |
void | EmitRelatedResultTypeNoteForReturn (QualType destType) |
Given that we had incompatible pointer types in a return statement, check whether we're in a method with a related result type, and if so, emit a note describing what happened. More... | |
Static Public Member Functions | |
static QualType | GetTypeFromParser (ParsedType Ty, TypeSourceInfo **TInfo=nullptr) |
static int | getPrintable (int I) |
static unsigned | getPrintable (unsigned I) |
static bool | getPrintable (bool B) |
static const char * | getPrintable (const char *S) |
static StringRef | getPrintable (StringRef S) |
static const std::string & | getPrintable (const std::string &S) |
static const IdentifierInfo * | getPrintable (const IdentifierInfo *II) |
static DeclarationName | getPrintable (DeclarationName N) |
static QualType | getPrintable (QualType T) |
static SourceRange | getPrintable (SourceRange R) |
static SourceRange | getPrintable (SourceLocation L) |
static SourceRange | getPrintable (const Expr *E) |
static SourceRange | getPrintable (TypeLoc TL) |
static bool | adjustContextForLocalExternDecl (DeclContext *&DC) |
Adjust the DeclContext for a function or variable that might be a function-local external declaration. More... | |
static PrintingPolicy | getPrintingPolicy (const ASTContext &Ctx, const Preprocessor &PP) |
Retrieve a suitable printing policy for diagnostics. More... | |
static Scope * | getScopeForDeclContext (Scope *S, DeclContext *DC) |
Finds the scope corresponding to the given decl context, if it happens to be an enclosing scope. More... | |
static void | MarkDeducedTemplateParameters (ASTContext &Ctx, const FunctionTemplateDecl *FunctionTemplate, llvm::SmallBitVector &Deduced) |
Marks all of the template parameters that will be deduced by a call to the given function template. More... | |
static int | getOpenMPCaptureLevels (OpenMPDirectiveKind Kind) |
Return the number of captured regions created for an OpenMP directive. More... | |
static bool | isCast (CheckedConversionKind CCK) |
static CastKind | ScalarTypeToBooleanCastKind (QualType ScalarTy) |
ScalarTypeToBooleanCastKind - Returns the cast kind corresponding to the conversion from scalar type ScalarTy to the Boolean type. More... | |
static ConditionResult | ConditionError () |
static FormatStringType | GetFormatStringType (const FormatAttr *Format) |
static bool | GetFormatNSStringIdx (const FormatAttr *Format, unsigned &Idx) |
static bool | TooManyArguments (size_t NumParams, size_t NumArgs, bool PartialOverloading=false) |
To be used for checking whether the arguments being passed to function exceeds the number of parameters expected for it. More... | |
Public Attributes | |
OpenCLOptions | OpenCLFeatures |
FPOptions | FPFeatures |
const LangOptions & | LangOpts |
Preprocessor & | PP |
ASTContext & | Context |
ASTConsumer & | Consumer |
DiagnosticsEngine & | Diags |
SourceManager & | SourceMgr |
bool | CollectStats |
Flag indicating whether or not to collect detailed statistics. More... | |
CodeCompleteConsumer * | CodeCompleter |
Code-completion consumer. More... | |
DeclContext * | CurContext |
CurContext - This is the current declaration context of parsing. More... | |
DeclContext * | OriginalLexicalContext |
Generally null except when we temporarily switch decl contexts, like in. More... | |
DeclarationName | VAListTagName |
VAListTagName - The declaration name corresponding to __va_list_tag. More... | |
bool | MSStructPragmaOn |
LangOptions::PragmaMSPointersToMembersKind | MSPointerToMemberRepresentationMethod |
Controls member pointer representation format under the MS ABI. More... | |
SmallVector< Scope *, 2 > | CurrentSEHFinally |
Stack of active SEH __finally scopes. Can be empty. More... | |
SourceLocation | ImplicitMSInheritanceAttrLoc |
Source location for newly created implicit MSInheritanceAttrs. More... | |
PragmaClangSection | PragmaClangBSSSection |
PragmaClangSection | PragmaClangDataSection |
PragmaClangSection | PragmaClangRodataSection |
PragmaClangSection | PragmaClangTextSection |
PragmaStack< MSVtorDispAttr::Mode > | VtorDispStack |
Whether to insert vtordisps prior to virtual bases in the Microsoft C++ ABI. More... | |
PragmaStack< unsigned > | PackStack |
SmallVector< PackIncludeState, 8 > | PackIncludeStack |
PragmaStack< StringLiteral * > | DataSegStack |
PragmaStack< StringLiteral * > | BSSSegStack |
PragmaStack< StringLiteral * > | ConstSegStack |
PragmaStack< StringLiteral * > | CodeSegStack |
FileNullabilityMap | NullabilityMap |
A mapping that describes the nullability we've seen in each header file. More... | |
StringLiteral * | CurInitSeg |
Last section used with #pragma init_seg. More... | |
SourceLocation | CurInitSegLoc |
void * | VisContext |
VisContext - Manages the stack for #pragma GCC visibility. More... | |
SmallVector< PragmaAttributeGroup, 2 > | PragmaAttributeStack |
const Decl * | PragmaAttributeCurrentTargetDecl |
The declaration that is currently receiving an attribute from the #pragma attribute stack. More... | |
SourceLocation | OptimizeOffPragmaLocation |
This represents the last location of a "#pragma clang optimize off" directive if such a directive has not been closed by an "on" yet. More... | |
bool | IsBuildingRecoveryCallExpr |
Flag indicating if Sema is building a recovery call expression. More... | |
CleanupInfo | Cleanup |
Used to control the generation of ExprWithCleanups. More... | |
SmallVector< BlockDecl *, 8 > | ExprCleanupObjects |
ExprCleanupObjects - This is the stack of objects requiring cleanup that are created by the current full expression. More... | |
MaybeODRUseExprSet | MaybeODRUseExprs |
std::unique_ptr< sema::FunctionScopeInfo > | CachedFunctionScope |
SmallVector< sema::FunctionScopeInfo *, 4 > | FunctionScopes |
Stack containing information about each of the nested function, block, and method scopes that are currently active. More... | |
ExtVectorDeclsType | ExtVectorDecls |
ExtVectorDecls - This is a list all the extended vector types. More... | |
std::unique_ptr< CXXFieldCollector > | FieldCollector |
FieldCollector - Collects CXXFieldDecls during parsing of C++ classes. More... | |
NamedDeclSetType | UnusedPrivateFields |
Set containing all declared private fields that are not used. More... | |
llvm::SmallSetVector< const TypedefNameDecl *, 4 > | UnusedLocalTypedefNameCandidates |
Set containing all typedefs that are likely unused. More... | |
llvm::MapVector< FieldDecl *, DeleteLocs > | DeleteExprs |
std::unique_ptr< RecordDeclSetTy > | PureVirtualClassDiagSet |
PureVirtualClassDiagSet - a set of class declarations which we have emitted a list of pure virtual functions. More... | |
llvm::SmallPtrSet< const Decl *, 4 > | ParsingInitForAutoVars |
ParsingInitForAutoVars - a set of declarations with auto types for which we are currently parsing the initializer. More... | |
TentativeDefinitionsType | TentativeDefinitions |
All the tentative definitions encountered in the TU. More... | |
UnusedFileScopedDeclsType | UnusedFileScopedDecls |
The set of file scoped decls seen so far that have not been used and must warn if not used. More... | |
DelegatingCtorDeclsType | DelegatingCtorDecls |
All the delegating constructors seen so far in the file, used for cycle detection at the end of the TU. More... | |
SmallVector< std::pair< const CXXMethodDecl *, const CXXMethodDecl * >, 2 > | DelayedOverridingExceptionSpecChecks |
All the overriding functions seen during a class definition that had their exception spec checks delayed, plus the overridden function. More... | |
SmallVector< std::pair< FunctionDecl *, FunctionDecl * >, 2 > | DelayedEquivalentExceptionSpecChecks |
All the function redeclarations seen during a class definition that had their exception spec checks delayed, plus the prior declaration they should be checked against. More... | |
LateParsedTemplateMapT | LateParsedTemplateMap |
LateTemplateParserCB * | LateTemplateParser |
LateTemplateParserCleanupCB * | LateTemplateParserCleanup |
void * | OpaqueParser |
class clang::Sema::DelayedDiagnostics | DelayedDiagnostics |
bool | isConstantEvaluatedOverride |
Used to change context to isConstantEvaluated without pushing a heavy ExpressionEvaluationContextRecord object. More... | |
llvm::MapVector< IdentifierInfo *, WeakInfo > | WeakUndeclaredIdentifiers |
WeakUndeclaredIdentifiers - Identifiers contained in #pragma weak before declared. More... | |
llvm::DenseMap< IdentifierInfo *, AsmLabelAttr * > | ExtnameUndeclaredIdentifiers |
ExtnameUndeclaredIdentifiers - Identifiers contained in #pragma redefine_extname before declared. More... | |
SmallVector< Decl *, 2 > | WeakTopLevelDecl |
WeakTopLevelDecl - Translation-unit scoped declarations generated by #pragma weak during processing of other Decls. More... | |
IdentifierResolver | IdResolver |
Scope * | TUScope |
Translation Unit Scope - useful to Objective-C actions that need to lookup file scope declarations in the "ordinary" C decl namespace. More... | |
LazyDeclPtr | StdNamespace |
The C++ "std" namespace, where the standard library resides. More... | |
LazyDeclPtr | StdBadAlloc |
The C++ "std::bad_alloc" class, which is defined by the C++ standard library. More... | |
LazyDeclPtr | StdAlignValT |
The C++ "std::align_val_t" enum class, which is defined by the C++ standard library. More... | |
NamespaceDecl * | StdExperimentalNamespaceCache |
The C++ "std::experimental" namespace, where the experimental parts of the standard library resides. More... | |
ClassTemplateDecl * | StdInitializerList |
The C++ "std::initializer_list" template, which is defined in <initializer_list>. More... | |
ClassTemplateDecl * | StdCoroutineTraitsCache |
The C++ "std::coroutine_traits" template, which is defined in <coroutine_traits> More... | |
RecordDecl * | CXXTypeInfoDecl |
The C++ "type_info" declaration, which is defined in <typeinfo>. More... | |
RecordDecl * | MSVCGuidDecl |
The MSVC "_GUID" struct, which is defined in MSVC header files. More... | |
std::unique_ptr< NSAPI > | NSAPIObj |
Caches identifiers/selectors for NSFoundation APIs. More... | |
ObjCInterfaceDecl * | NSNumberDecl |
The declaration of the Objective-C NSNumber class. More... | |
ObjCInterfaceDecl * | NSValueDecl |
The declaration of the Objective-C NSValue class. More... | |
QualType | NSNumberPointer |
Pointer to NSNumber type (NSNumber *). More... | |
QualType | NSValuePointer |
Pointer to NSValue type (NSValue *). More... | |
ObjCMethodDecl * | NSNumberLiteralMethods [NSAPI::NumNSNumberLiteralMethods] |
The Objective-C NSNumber methods used to create NSNumber literals. More... | |
ObjCInterfaceDecl * | NSStringDecl |
The declaration of the Objective-C NSString class. More... | |
QualType | NSStringPointer |
Pointer to NSString type (NSString *). More... | |
ObjCMethodDecl * | StringWithUTF8StringMethod |
The declaration of the stringWithUTF8String: method. More... | |
ObjCMethodDecl * | ValueWithBytesObjCTypeMethod |
The declaration of the valueWithBytes:objCType: method. More... | |
ObjCInterfaceDecl * | NSArrayDecl |
The declaration of the Objective-C NSArray class. More... | |
ObjCMethodDecl * | ArrayWithObjectsMethod |
The declaration of the arrayWithObjects:count: method. More... | |
ObjCInterfaceDecl * | NSDictionaryDecl |
The declaration of the Objective-C NSDictionary class. More... | |
ObjCMethodDecl * | DictionaryWithObjectsMethod |
The declaration of the dictionaryWithObjects:forKeys:count: method. More... | |
QualType | QIDNSCopying |
id<NSCopying> type. More... | |
Selector | RespondsToSelectorSel |
will hold 'respondsToSelector:' More... | |
bool | GlobalNewDeleteDeclared |
A flag to remember whether the implicit forms of operator new and delete have been declared. More... | |
bool | AllowAbstractFieldReference |
A flag to indicate that we're in a context that permits abstract references to fields. More... | |
SmallVector< ExpressionEvaluationContextRecord, 8 > | ExprEvalContexts |
A stack of expression evaluation contexts. More... | |
llvm::FoldingSet< SpecialMemberOverloadResultEntry > | SpecialMemberCache |
A cache of special member function overload resolution results for C++ records. More... | |
llvm::DenseMap< const EnumDecl *, llvm::APInt > | FlagBitsCache |
A cache of the flags available in enumerations with the flag_bits attribute. More... | |
TranslationUnitKind | TUKind |
The kind of translation unit we are processing. More... | |
llvm::BumpPtrAllocator | BumpAlloc |
unsigned | NumSFINAEErrors |
The number of SFINAE diagnostics that have been trapped. More... | |
UnparsedDefaultArgInstantiationsMap | UnparsedDefaultArgInstantiations |
A mapping from parameters with unparsed default arguments to the set of instantiations of each parameter. More... | |
llvm::DenseMap< ParmVarDecl *, SourceLocation > | UnparsedDefaultArgLocs |
llvm::MapVector< NamedDecl *, SourceLocation > | UndefinedButUsed |
UndefinedInternals - all the used, undefined objects which require a definition in this translation unit. More... | |
GlobalMethodPool | MethodPool |
Method Pool - allows efficient lookup when typechecking messages to "id". More... | |
llvm::MapVector< Selector, SourceLocation > | ReferencedSelectors |
Method selectors used in a @selector expression. More... | |
llvm::SmallVector< std::pair< SourceLocation, const BlockDecl * >, 1 > | ImplicitlyRetainedSelfLocs |
List of SourceLocations where 'self' is implicitly retained inside a block. More... | |
llvm::SmallPtrSet< SpecialMemberDecl, 4 > | SpecialMembersBeingDeclared |
The C++ special members which we are currently in the process of declaring. More... | |
llvm::SmallPtrSet< const NamedDecl *, 4 > | TypoCorrectedFunctionDefinitions |
The function definitions which were renamed as part of typo-correction to match their respective declarations. More... | |
llvm::SmallVector< QualType, 4 > | CurrentParameterCopyTypes |
Stack of types that correspond to the parameter entities that are currently being copy-initialized. More... | |
QualType | CXXThisTypeOverride |
When non-NULL, the C++ 'this' expression is allowed despite the current context not being a non-static member function. More... | |
SmallVector< VTableUse, 16 > | VTableUses |
The list of vtables that are required but have not yet been materialized. More... | |
llvm::DenseMap< CXXRecordDecl *, bool > | VTablesUsed |
The set of classes whose vtables have been used within this translation unit, and a bit that will be true if the vtable is required to be emitted (otherwise, it should be emitted only if needed by code generation). More... | |
bool | AccessCheckingSFINAE |
When true, access checking violations are treated as SFINAE failures rather than hard errors. More... | |
SmallVector< CodeSynthesisContext, 16 > | CodeSynthesisContexts |
List of active code synthesis contexts. More... | |
llvm::DenseSet< std::pair< Decl *, unsigned > > | InstantiatingSpecializations |
Specializations whose definitions are currently being instantiated. More... | |
llvm::DenseSet< QualType > | InstantiatedNonDependentTypes |
Non-dependent types used in templates that have already been instantiated by some template instantiation. More... | |
SmallVector< Module *, 16 > | CodeSynthesisContextLookupModules |
Extra modules inspected when performing a lookup during a template instantiation. More... | |
llvm::DenseSet< Module * > | LookupModulesCache |
Cache of additional modules that should be used for name lookup within the current template instantiation. More... | |
llvm::DenseMap< NamedDecl *, NamedDecl * > | VisibleNamespaceCache |
Map from the most recent declaration of a namespace to the most recent visible declaration of that namespace. More... | |
bool | InNonInstantiationSFINAEContext |
Whether we are in a SFINAE context that is not associated with template instantiation. More... | |
unsigned | NonInstantiationEntries |
The number of CodeSynthesisContexts that are not template instantiations and, therefore, should not be counted as part of the instantiation depth. More... | |
unsigned | LastEmittedCodeSynthesisContextDepth = 0 |
The depth of the context stack at the point when the most recent error or warning was produced. More... | |
std::vector< std::unique_ptr< TemplateInstantiationCallback > > | TemplateInstCallbacks |
The template instantiation callbacks to trace or track instantiations (objects can be chained). More... | |
int | ArgumentPackSubstitutionIndex |
The current index into pack expansion arguments that will be used for substitution of parameter packs. More... | |
SuppressedDiagnosticsMap | SuppressedDiagnostics |
LocalInstantiationScope * | CurrentInstantiationScope |
The current instantiation scope used to store local variables. More... | |
bool | DisableTypoCorrection |
Tracks whether we are in a context where typo correction is disabled. More... | |
unsigned | TyposCorrected |
The number of typos corrected by CorrectTypo. More... | |
IdentifierSourceLocations | TypoCorrectionFailures |
A cache containing identifiers for which typo correction failed and their locations, so that repeated attempts to correct an identifier in a given location are ignored if typo correction already failed for it. More... | |
sema::AnalysisBasedWarnings | AnalysisWarnings |
Worker object for performing CFG-based warnings. More... | |
threadSafety::BeforeSet * | ThreadSafetyDeclCache |
std::deque< PendingImplicitInstantiation > | PendingInstantiations |
The queue of implicit template instantiations that are required but have not yet been performed. More... | |
SmallVector< PendingImplicitInstantiation, 1 > | LateParsedInstantiations |
Queue of implicit template instantiations that cannot be performed eagerly. More... | |
std::deque< PendingImplicitInstantiation > | PendingLocalImplicitInstantiations |
The queue of implicit template instantiations that are required and must be performed within the current local scope. More... | |
llvm::DenseMap< CanonicalDeclPtr< FunctionDecl >, std::vector< PartialDiagnosticAt > > | DeviceDeferredDiags |
Diagnostics that are emitted only if we discover that the given function must be codegen'ed. More... | |
llvm::DenseSet< FunctionDeclAndLoc > | LocsWithCUDACallDiags |
FunctionDecls and SourceLocations for which CheckCUDACall has emitted a (maybe deferred) "bad call" diagnostic. More... | |
llvm::DenseMap< CanonicalDeclPtr< FunctionDecl >, FunctionDeclAndLoc > | DeviceKnownEmittedFns |
An inverse call graph, mapping known-emitted functions to one of their known-emitted callers (plus the location of the call). More... | |
llvm::DenseMap< CanonicalDeclPtr< FunctionDecl >, llvm::MapVector< CanonicalDeclPtr< FunctionDecl >, SourceLocation > > | DeviceCallGraph |
A partial call graph maintained during CUDA/OpenMP device code compilation to support deferred diagnostics. More... | |
RecordDecl * | CFError = nullptr |
The struct behind the CFErrorRef pointer. More... | |
SmallVector< CXXRecordDecl *, 4 > | DelayedDllExportClasses |
SmallVector< CXXMethodDecl *, 4 > | DelayedDllExportMemberFunctions |
Static Public Attributes | |
static const unsigned | kMac68kAlignmentSentinel = ~0U |
Friends | |
class | ArgumentPackSubstitutionRAII |
class | Parser |
class | InitializationSequence |
class | ASTReader |
class | ASTDeclReader |
class | ASTWriter |
Name lookup | |
These routines provide name lookup that is used during semantic analysis to resolve the various kinds of names (identifiers, overloaded operator names, constructor names, etc.) into zero or more declarations within a particular scope. The major entry points are LookupName, which performs unqualified name lookup, and LookupQualifiedName, which performs qualified name lookup. All name lookup is performed based on some specific criteria, which specify what names will be visible to name lookup and how far name lookup should work. These criteria are important both for capturing language semantics (certain lookups will ignore certain names, for example) and for performance, since name lookup is often a bottleneck in the compilation of C++. Name lookup criteria is specified via the LookupCriteria enumeration. The results of name lookup can vary based on the kind of name lookup performed, the current language, and the translation unit. In C, for example, name lookup will either return nothing (no entity found) or a single declaration. In C++, name lookup can additionally refer to a set of overloaded functions or result in an ambiguity. All of the possible results of name lookup are captured by the LookupResult class, which provides the ability to distinguish among them. | |
enum | LookupNameKind { LookupOrdinaryName = 0, LookupTagName, LookupLabel, LookupMemberName, LookupOperatorName, LookupNestedNameSpecifierName, LookupNamespaceName, LookupUsingDeclName, LookupRedeclarationWithLinkage, LookupLocalFriendName, LookupObjCProtocolName, LookupObjCImplicitSelfParam, LookupOMPReductionName, LookupOMPMapperName, LookupAnyName } |
Describes the kind of name lookup to perform. More... | |
enum | RedeclarationKind { NotForRedeclaration = 0, ForVisibleRedeclaration, ForExternalRedeclaration } |
Specifies whether (or how) name lookup is being performed for a redeclaration (vs. More... | |
enum | LiteralOperatorLookupResult { LOLR_Error, LOLR_ErrorNoDiagnostic, LOLR_Cooked, LOLR_Raw, LOLR_Template, LOLR_StringTemplate } |
The possible outcomes of name lookup for a literal operator. More... | |
enum | CorrectTypoKind { CTK_NonError, CTK_ErrorRecovery } |
typedef std::function< void(const TypoCorrection &)> | TypoDiagnosticGenerator |
typedef std::function< ExprResult(Sema &, TypoExpr *, TypoCorrection)> | TypoRecoveryCallback |
RedeclarationKind | forRedeclarationInCurContext () |
SpecialMemberOverloadResult | LookupSpecialMember (CXXRecordDecl *D, CXXSpecialMember SM, bool ConstArg, bool VolatileArg, bool RValueThis, bool ConstThis, bool VolatileThis) |
const TypoExprState & | getTypoExprState (TypoExpr *TE) const |
void | clearDelayedTypo (TypoExpr *TE) |
Clears the state of the given TypoExpr. More... | |
NamedDecl * | LookupSingleName (Scope *S, DeclarationName Name, SourceLocation Loc, LookupNameKind NameKind, RedeclarationKind Redecl=NotForRedeclaration) |
Look up a name, looking for a single declaration. More... | |
bool | LookupName (LookupResult &R, Scope *S, bool AllowBuiltinCreation=false) |
Perform unqualified name lookup starting from a given scope. More... | |
bool | LookupQualifiedName (LookupResult &R, DeclContext *LookupCtx, bool InUnqualifiedLookup=false) |
Perform qualified name lookup into a given context. More... | |
bool | LookupQualifiedName (LookupResult &R, DeclContext *LookupCtx, CXXScopeSpec &SS) |
Performs qualified name lookup or special type of lookup for "__super::" scope specifier. More... | |
bool | LookupParsedName (LookupResult &R, Scope *S, CXXScopeSpec *SS, bool AllowBuiltinCreation=false, bool EnteringContext=false) |
Performs name lookup for a name that was parsed in the source code, and may contain a C++ scope specifier. More... | |
ObjCProtocolDecl * | LookupProtocol (IdentifierInfo *II, SourceLocation IdLoc, RedeclarationKind Redecl=NotForRedeclaration) |
Find the protocol with the given name, if any. More... | |
bool | LookupInSuper (LookupResult &R, CXXRecordDecl *Class) |
Perform qualified name lookup into all base classes of the given class. More... | |
void | LookupOverloadedOperatorName (OverloadedOperatorKind Op, Scope *S, QualType T1, QualType T2, UnresolvedSetImpl &Functions) |
LabelDecl * | LookupOrCreateLabel (IdentifierInfo *II, SourceLocation IdentLoc, SourceLocation GnuLabelLoc=SourceLocation()) |
LookupOrCreateLabel - Do a name lookup of a label with the specified name. More... | |
DeclContextLookupResult | LookupConstructors (CXXRecordDecl *Class) |
Look up the constructors for the given class. More... | |
CXXConstructorDecl * | LookupDefaultConstructor (CXXRecordDecl *Class) |
Look up the default constructor for the given class. More... | |
CXXConstructorDecl * | LookupCopyingConstructor (CXXRecordDecl *Class, unsigned Quals) |
Look up the copying constructor for the given class. More... | |
CXXMethodDecl * | LookupCopyingAssignment (CXXRecordDecl *Class, unsigned Quals, bool RValueThis, unsigned ThisQuals) |
Look up the copying assignment operator for the given class. More... | |
CXXConstructorDecl * | LookupMovingConstructor (CXXRecordDecl *Class, unsigned Quals) |
Look up the moving constructor for the given class. More... | |
CXXMethodDecl * | LookupMovingAssignment (CXXRecordDecl *Class, unsigned Quals, bool RValueThis, unsigned ThisQuals) |
Look up the moving assignment operator for the given class. More... | |
CXXDestructorDecl * | LookupDestructor (CXXRecordDecl *Class) |
Look for the destructor of the given class. More... | |
bool | checkLiteralOperatorId (const CXXScopeSpec &SS, const UnqualifiedId &Id) |
LiteralOperatorLookupResult | LookupLiteralOperator (Scope *S, LookupResult &R, ArrayRef< QualType > ArgTys, bool AllowRaw, bool AllowTemplate, bool AllowStringTemplate, bool DiagnoseMissing) |
LookupLiteralOperator - Determine which literal operator should be used for a user-defined literal, per C++11 [lex.ext]. More... | |
bool | isKnownName (StringRef name) |
void | ArgumentDependentLookup (DeclarationName Name, SourceLocation Loc, ArrayRef< Expr *> Args, ADLResult &Functions) |
void | LookupVisibleDecls (Scope *S, LookupNameKind Kind, VisibleDeclConsumer &Consumer, bool IncludeGlobalScope=true, bool LoadExternal=true) |
void | LookupVisibleDecls (DeclContext *Ctx, LookupNameKind Kind, VisibleDeclConsumer &Consumer, bool IncludeGlobalScope=true, bool IncludeDependentBases=false, bool LoadExternal=true) |
TypoCorrection | CorrectTypo (const DeclarationNameInfo &Typo, Sema::LookupNameKind LookupKind, Scope *S, CXXScopeSpec *SS, CorrectionCandidateCallback &CCC, CorrectTypoKind Mode, DeclContext *MemberContext=nullptr, bool EnteringContext=false, const ObjCObjectPointerType *OPT=nullptr, bool RecordFailure=true) |
Try to "correct" a typo in the source code by finding visible declarations whose names are similar to the name that was present in the source code. More... | |
TypoExpr * | CorrectTypoDelayed (const DeclarationNameInfo &Typo, Sema::LookupNameKind LookupKind, Scope *S, CXXScopeSpec *SS, CorrectionCandidateCallback &CCC, TypoDiagnosticGenerator TDG, TypoRecoveryCallback TRC, CorrectTypoKind Mode, DeclContext *MemberContext=nullptr, bool EnteringContext=false, const ObjCObjectPointerType *OPT=nullptr) |
Try to "correct" a typo in the source code by finding visible declarations whose names are similar to the name that was present in the source code. More... | |
ExprResult | CorrectDelayedTyposInExpr (Expr *E, VarDecl *InitDecl=nullptr, llvm::function_ref< ExprResult(Expr *)> Filter=[](Expr *E) -> ExprResult { return E;}) |
Process any TypoExprs in the given Expr and its children, generating diagnostics as appropriate and returning a new Expr if there were typos that were all successfully corrected and ExprError if one or more typos could not be corrected. More... | |
ExprResult | CorrectDelayedTyposInExpr (Expr *E, llvm::function_ref< ExprResult(Expr *)> Filter) |
ExprResult | CorrectDelayedTyposInExpr (ExprResult ER, VarDecl *InitDecl=nullptr, llvm::function_ref< ExprResult(Expr *)> Filter=[](Expr *E) -> ExprResult { return E;}) |
ExprResult | CorrectDelayedTyposInExpr (ExprResult ER, llvm::function_ref< ExprResult(Expr *)> Filter) |
void | diagnoseTypo (const TypoCorrection &Correction, const PartialDiagnostic &TypoDiag, bool ErrorRecovery=true) |
void | diagnoseTypo (const TypoCorrection &Correction, const PartialDiagnostic &TypoDiag, const PartialDiagnostic &PrevNote, bool ErrorRecovery=true) |
Diagnose a successfully-corrected typo. More... | |
void | MarkTypoCorrectedFunctionDefinition (const NamedDecl *F) |
void | FindAssociatedClassesAndNamespaces (SourceLocation InstantiationLoc, ArrayRef< Expr *> Args, AssociatedNamespaceSet &AssociatedNamespaces, AssociatedClassSet &AssociatedClasses) |
Find the associated classes and namespaces for argument-dependent lookup for a call with the given set of arguments. More... | |
void | FilterLookupForScope (LookupResult &R, DeclContext *Ctx, Scope *S, bool ConsiderLinkage, bool AllowInlineNamespace) |
Filters out lookup results that don't fall within the given scope as determined by isDeclInScope. More... | |
bool | CheckRedeclarationModuleOwnership (NamedDecl *New, NamedDecl *Old) |
We've determined that New is a redeclaration of Old . More... | |
void | DiagnoseAmbiguousLookup (LookupResult &Result) |
Produce a diagnostic describing the ambiguity that resulted from name lookup. More... | |
Sema - This implements semantic analysis and AST building for C.
typedef llvm::SmallSetVector<CXXRecordDecl *, 16> clang::Sema::AssociatedClassSet |
typedef llvm::SmallSetVector<DeclContext *, 16> clang::Sema::AssociatedNamespaceSet |
typedef std::pair<StringRef, QualType> clang::Sema::CapturedParamNameType |
typedef std::pair<SourceLocation, bool> clang::Sema::DeleteExprLoc |
typedef llvm::SmallVector<DeleteExprLoc, 4> clang::Sema::DeleteLocs |
typedef llvm::DenseMap<Selector, GlobalMethods> clang::Sema::GlobalMethodPool |
typedef std::pair<ObjCMethodList, ObjCMethodList> clang::Sema::GlobalMethods |
typedef llvm::DenseMap<IdentifierInfo *, SrcLocSet> clang::Sema::IdentifierSourceLocations |
typedef llvm::MapVector<const FunctionDecl *, std::unique_ptr<LateParsedTemplate> > clang::Sema::LateParsedTemplateMapT |
typedef void clang::Sema::LateTemplateParserCB(void *P, LateParsedTemplate &LPT) |
typedef void clang::Sema::LateTemplateParserCleanupCB(void *P) |
using clang::Sema::MaybeODRUseExprSet = llvm::SmallPtrSet<Expr *, 2> |
Store a set of either DeclRefExprs or MemberExprs that contain a reference to a variable (constant) that may or may not be odr-used in this Expr, and we won't know until all lvalue-to-rvalue and discarded value conversions have been applied to all subexpressions of the enclosing full expression.
This is cleared at the end of each full expression.
typedef llvm::SmallSetVector<NamedDecl *, 16> clang::Sema::NamedDeclSetType |
typedef std::pair<ValueDecl *, SourceLocation> clang::Sema::PendingImplicitInstantiation |
An entity for which implicit template instantiation is required.
The source location associated with the declaration is the first place in the source code where the declaration was "used". It is not necessarily the point of instantiation (which will be either before or after the namespace-scope declaration that triggered this implicit instantiation), However, it is the location that diagnostics should generally refer to, because users will need to know what code triggered the instantiation.
using clang::Sema::PoppedFunctionScopePtr = std::unique_ptr<sema::FunctionScopeInfo, PoppedFunctionScopeDeleter> |
typedef llvm::SmallPtrSet<const CXXRecordDecl*, 8> clang::Sema::RecordDeclSetTy |
typedef llvm::SmallPtrSet<Selector, 8> clang::Sema::SelectorSet |
typedef void* clang::Sema::SkippedDefinitionContext |
typedef llvm::PointerIntPair<CXXRecordDecl *, 3, CXXSpecialMember> clang::Sema::SpecialMemberDecl |
typedef llvm::SmallSet<SourceLocation, 2> clang::Sema::SrcLocSet |
typedef llvm::DenseMap<Decl *, SmallVector<PartialDiagnosticAt, 1> > clang::Sema::SuppressedDiagnosticsMap |
typedef OpaquePtr<TemplateName> clang::Sema::TemplateTy |
typedef std::pair<const IdentifierInfo *, uint64_t> clang::Sema::TypeTagMagicValue |
typedef OpaquePtr<QualType> clang::Sema::TypeTy |
typedef std::function<void(const TypoCorrection &)> clang::Sema::TypoDiagnosticGenerator |
typedef std::function<ExprResult(Sema &, TypoExpr *, TypoCorrection)> clang::Sema::TypoRecoveryCallback |
typedef llvm::DenseMap<ParmVarDecl *, llvm::TinyPtrVector<ParmVarDecl *> > clang::Sema::UnparsedDefaultArgInstantiationsMap |
using clang::Sema::VarsWithInheritedDSAType = llvm::SmallDenseMap<const ValueDecl *, const Expr *, 4> |
typedef std::pair<CXXRecordDecl*, SourceLocation> clang::Sema::VTableUse |
The scope in which to find allocation functions.
AssignConvertType - All of the 'assignment' semantic checks return this enum to indicate whether the assignment was allowed.
These checks are done for simple assignments, as well as initialization, return from function, argument passing, etc. The query is phrased in terms of a source and destination type.
|
strong |
Describes the kind of merge to perform for availability attributes (including "deprecated", "unavailable", and "availability").
enum clang::Sema::AvailabilityPriority : int |
Describes the kind of priority given to an availability attribute.
The sum of priorities deteremines the final priority of the attribute. The final priority determines how the attribute will be merged. An attribute with a lower priority will always remove higher priority attributes for the specified platform when it is being applied. An attribute with a higher priority will not be applied if the declaration already has an availability attribute with a lower priority for the specified platform. The final prirority values are not expected to match the values in this enumeration, but instead should be treated as a plain integer value. This enumeration just names the priority weights that are used to calculate that final vaue.
|
strong |
enum clang::Sema::CCEKind |
Contexts in which a converted constant expression is required.
The kind of conversion being performed.
Specifies the context in which a particular template argument is being checked.
|
strong |
|
strong |
Describes how the expressions currently being parsed are evaluated at run-time, if at all.
The possible outcomes of name lookup for a literal operator.
Describes the kind of name lookup to perform.
|
strong |
|
strong |
Describes the result of the name lookup and resolution performed by ClassifyName()
.
Enumerator | |
---|---|
NC_Unknown | |
NC_Error | |
NC_Keyword | |
NC_Type | |
NC_Expression | |
NC_NestedNameSpecifier | |
NC_TypeTemplate | |
NC_VarTemplate | |
NC_FunctionTemplate | |
NC_UndeclaredTemplate |
C++ Overloading.
Describes the context in which code completion occurs.
|
strong |
Specifies whether (or how) name lookup is being performed for a redeclaration (vs.
a reference).
ReferenceCompareResult - Expresses the result of comparing two types (cv1 T1 and cv2 T2) to determine their compatibility for the purposes of initialization by reference (C++ [dcl.init.ref]p4).
|
strong |
Describes the result of template argument deduction.
The TemplateDeductionResult enumeration describes the result of template argument deduction, as returned from DeduceTemplateArguments(). The separate TemplateDeductionInfo structure provides additional information about the results of template argument deduction, e.g., the deduced template argument list (if successful) or the specific template parameters or deduced arguments that were involved in the failure.
|
strong |
Enumeration describing how template parameter lists are compared for equality.
The context in which an unexpanded parameter pack is being diagnosed.
Note that the values of this enumeration line up with the first argument to the err_unexpanded_parameter_pack
diagnostic.
Sema::Sema | ( | Preprocessor & | pp, |
ASTContext & | ctxt, | ||
ASTConsumer & | consumer, | ||
TranslationUnitKind | TUKind = TU_Complete , |
||
CodeCompleteConsumer * | CompletionConsumer = nullptr |
||
) |
Sema::~Sema | ( | ) |
Definition at line 351 of file Sema.cpp.
References Consumer, Context, FreeVisContext(), FunctionScopes, clang::ASTContext::getExternalSource(), clang::sema::SemaPPCallbacks::reset(), clang::threadSafety::threadSafetyCleanup(), ThreadSafetyDeclCache, and VisContext.
void Sema::ActOnAbortSEHFinallyBlock | ( | ) |
Definition at line 4156 of file SemaStmt.cpp.
bool Sema::ActOnAccessSpecifier | ( | AccessSpecifier | Access, |
SourceLocation | ASLoc, | ||
SourceLocation | ColonLoc, | ||
const ParsedAttributesView & | Attrs | ||
) |
ActOnAccessSpecifier - Parsed an access specifier followed by a colon.
Definition at line 2760 of file SemaDeclCXX.cpp.
References clang::AS_none, and clang::AccessSpecDecl::Create().
ExprResult Sema::ActOnAddrLabel | ( | SourceLocation | OpLoc, |
SourceLocation | LabLoc, | ||
LabelDecl * | TheDecl | ||
) |
ActOnAddrLabel - Parse the GNU address of label extension: "&&foo".
Definition at line 13411 of file SemaExpr.cpp.
References clang::Decl::markUsed().
Decl * Sema::ActOnAliasDeclaration | ( | Scope * | CurScope, |
AccessSpecifier | AS, | ||
MultiTemplateParamsArg | TemplateParams, | ||
SourceLocation | UsingLoc, | ||
UnqualifiedId & | Name, | ||
const ParsedAttributesView & | AttrList, | ||
TypeResult | Type, | ||
Decl * | DeclFromDeclSpec | ||
) |
Definition at line 10550 of file SemaDeclCXX.cpp.
ExprResult Sema::ActOnArraySubscriptExpr | ( | Scope * | S, |
Expr * | Base, | ||
SourceLocation | LLoc, | ||
Expr * | Idx, | ||
SourceLocation | RLoc | ||
) |
Definition at line 4306 of file SemaExpr.cpp.
ExprResult Sema::ActOnArrayTypeTrait | ( | ArrayTypeTrait | ATT, |
SourceLocation | KWLoc, | ||
ParsedType | LhsTy, | ||
Expr * | DimExpr, | ||
SourceLocation | RParen | ||
) |
ActOnArrayTypeTrait - Parsed one of the binary type trait support pseudo-functions.
Definition at line 5261 of file SemaExprCXX.cpp.
References BuildArrayTypeTrait(), Context, clang::ASTContext::getTrivialTypeSourceInfo(), and GetTypeFromParser().
Referenced by TypeTraitArity().
ExprResult Sema::ActOnAsTypeExpr | ( | Expr * | E, |
ParsedType | ParsedDestTy, | ||
SourceLocation | BuiltinLoc, | ||
SourceLocation | RParenLoc | ||
) |
__builtin_astype(...)
ActOnAsTypeExpr - create a new asType (bitcast) from the arguments.
__builtin_astype( value, dst type )
Definition at line 5710 of file SemaExpr.cpp.
References clang::Expr::getType(), clang::OK_Ordinary, and clang::VK_RValue.
Decl * Sema::ActOnAtEnd | ( | Scope * | S, |
SourceRange | AtEnd, | ||
ArrayRef< Decl *> | allMethods = None , |
||
ArrayRef< DeclGroupPtrTy > | allTUVars = None |
||
) |
Check for instance method of the same name with incompatible types
The following allows us to typecheck messages to "id".
Check for class method of the same name with incompatible types
Definition at line 3893 of file SemaDeclObjC.cpp.
StmtResult Sema::ActOnAttributedStmt | ( | SourceLocation | AttrLoc, |
ArrayRef< const Attr *> | Attrs, | ||
Stmt * | SubStmt | ||
) |
Definition at line 503 of file SemaStmt.cpp.
References clang::AttributedStmt::Create().
Referenced by clang::TreeTransform< Derived >::RebuildAttributedStmt().
BaseResult Sema::ActOnBaseSpecifier | ( | Decl * | classdecl, |
SourceRange | SpecifierRange, | ||
ParsedAttributes & | Attributes, | ||
bool | Virtual, | ||
AccessSpecifier | Access, | ||
ParsedType | basetype, | ||
SourceLocation | BaseLoc, | ||
SourceLocation | EllipsisLoc | ||
) |
ActOnBaseSpecifier - Parsed a base specifier.
A base specifier is one entry in the base class list of a class specifier, for example: class foo : public bar, virtual private baz { 'public bar' and 'virtual private baz' are each base-specifiers.
Definition at line 2358 of file SemaDeclCXX.cpp.
References Diag(), clang::SourceRange::getBegin(), clang::ParsedAttr::IgnoredAttribute, clang::SourceLocation::isInvalid(), clang::Decl::setInvalidDecl(), clang::CXXRecordDecl::setIsParsingBaseSpecifiers(), and clang::ParsedAttr::UnknownAttribute.
void Sema::ActOnBaseSpecifiers | ( | Decl * | ClassDecl, |
MutableArrayRef< CXXBaseSpecifier *> | Bases | ||
) |
ActOnBaseSpecifiers - Attach the given base specifiers to the class, after checking whether there are any duplicate base classes.
Definition at line 2536 of file SemaDeclCXX.cpp.
ExprResult Sema::ActOnBinOp | ( | Scope * | S, |
SourceLocation | TokLoc, | ||
tok::TokenKind | Kind, | ||
Expr * | LHSExpr, | ||
Expr * | RHSExpr | ||
) |
Definition at line 12931 of file SemaExpr.cpp.
References DiagnoseBinOpPrecedence().
Referenced by clang::Parser::ParseConstraintExpression().
void Sema::ActOnBlockArguments | ( | SourceLocation | CaretLoc, |
Declarator & | ParamInfo, | ||
Scope * | CurScope | ||
) |
ActOnBlockArguments - This callback allows processing of block arguments.
If there are no arguments, this is still invoked.
Definition at line 13755 of file SemaExpr.cpp.
References clang::Qualifiers::addConst(), clang::BlockLiteralContext, clang::Declarator::getContext(), clang::Declarator::getIdentifier(), clang::TypeSourceInfo::getType(), clang::FunctionProtoType::ExtProtoInfo::HasTrailingReturn, and clang::FunctionProtoType::ExtProtoInfo::TypeQuals.
void Sema::ActOnBlockError | ( | SourceLocation | CaretLoc, |
Scope * | CurScope | ||
) |
ActOnBlockError - If there is an error parsing a block, this callback is invoked to pop the information about the block from the action impl.
Definition at line 13872 of file SemaExpr.cpp.
void Sema::ActOnBlockStart | ( | SourceLocation | CaretLoc, |
Scope * | CurScope | ||
) |
ActOnBlockStart - This callback is invoked when a block literal is started.
Definition at line 13727 of file SemaExpr.cpp.
References clang::BlockDecl::Create().
ExprResult Sema::ActOnBlockStmtExpr | ( | SourceLocation | CaretLoc, |
Stmt * | Body, | ||
Scope * | CurScope | ||
) |
ActOnBlockStmtExpr - This is called when the body of a block statement literal was successfully completed.
^(int x){...}
Definition at line 13884 of file SemaExpr.cpp.
References Diag(), clang::sema::CapturingScopeInfo::HasImplicitReturnType, and clang::sema::BlockScopeInfo::TheDecl.
StmtResult Sema::ActOnBreakStmt | ( | SourceLocation | BreakLoc, |
Scope * | CurScope | ||
) |
Definition at line 2890 of file SemaStmt.cpp.
ExprResult Sema::ActOnBuiltinBitCastExpr | ( | SourceLocation | KWLoc, |
Declarator & | Dcl, | ||
ExprResult | Operand, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 335 of file SemaCast.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::Declarator::isInvalidType().
Referenced by TypeTraitArity().
ExprResult Sema::ActOnBuiltinOffsetOf | ( | Scope * | S, |
SourceLocation | BuiltinLoc, | ||
SourceLocation | TypeLoc, | ||
ParsedType | ParsedArgTy, | ||
ArrayRef< OffsetOfComponent > | Components, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 13664 of file SemaExpr.cpp.
ExprResult Sema::ActOnCallExpr | ( | Scope * | S, |
Expr * | Fn, | ||
SourceLocation | LParenLoc, | ||
MultiExprArg | ArgExprs, | ||
SourceLocation | RParenLoc, | ||
Expr * | ExecConfig = nullptr |
||
) |
ActOnCallExpr - Handle a call to Fn with the specified array of arguments.
This provides the location of the left/right parens and a list of comma locations.
Definition at line 5542 of file SemaExpr.cpp.
References Diag(), clang::Expr::getExprLoc(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
StmtResult Sema::ActOnCapScopeReturnStmt | ( | SourceLocation | ReturnLoc, |
Expr * | RetValExp | ||
) |
ActOnCapScopeReturnStmt - Utility routine to type-check return statements for capturing scopes.
Definition at line 3196 of file SemaStmt.cpp.
References clang::sema::LambdaScopeInfo::CallOperator, clang::ReturnStmt::Create(), clang::ActionResult< PtrTy, CompressInvalid >::get(), hasDeducedReturnType(), clang::sema::CapturingScopeInfo::HasImplicitReturnType, clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::sema::CapturingScopeInfo::ReturnType, and clang::StmtError().
StmtResult Sema::ActOnCapturedRegionEnd | ( | Stmt * | S | ) |
Definition at line 4370 of file SemaStmt.cpp.
void Sema::ActOnCapturedRegionError | ( | ) |
Definition at line 4355 of file SemaStmt.cpp.
References clang::Decl::setInvalidDecl(), and clang::sema::CapturedRegionScopeInfo::TheRecordDecl.
void Sema::ActOnCapturedRegionStart | ( | SourceLocation | Loc, |
Scope * | CurScope, | ||
CapturedRegionKind | Kind, | ||
unsigned | NumParams | ||
) |
Definition at line 4268 of file SemaStmt.cpp.
References clang::CapturedDecl::castToDeclContext().
void Sema::ActOnCapturedRegionStart | ( | SourceLocation | Loc, |
Scope * | CurScope, | ||
CapturedRegionKind | Kind, | ||
ArrayRef< CapturedParamNameType > | Params | ||
) |
Definition at line 4297 of file SemaStmt.cpp.
References clang::CapturedDecl::castToDeclContext().
ExprResult Sema::ActOnCaseExpr | ( | SourceLocation | CaseLoc, |
ExprResult | Val | ||
) |
Definition at line 386 of file SemaStmt.cpp.
References CheckConvertedConstantExpression(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Type::isDependentType(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by clang::Parser::ParseCaseExpression().
StmtResult Sema::ActOnCaseStmt | ( | SourceLocation | CaseLoc, |
ExprResult | LHS, | ||
SourceLocation | DotDotDotLoc, | ||
ExprResult | RHS, | ||
SourceLocation | ColonLoc | ||
) |
Definition at line 437 of file SemaStmt.cpp.
References clang::CaseStmt::Create(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceLocation::isInvalid(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::ActionResult< PtrTy, CompressInvalid >::isUnset(), and clang::StmtError().
ActOnCaseStmtBody - This installs a statement as the body of a case.
Definition at line 462 of file SemaStmt.cpp.
ExprResult Sema::ActOnCastExpr | ( | Scope * | S, |
SourceLocation | LParenLoc, | ||
Declarator & | D, | ||
ParsedType & | Ty, | ||
SourceLocation | RParenLoc, | ||
Expr * | CastExpr | ||
) |
Definition at line 6518 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getSourceRange(), clang::ParenExpr::getSubExpr(), clang::TypeSourceInfo::getType(), clang::Expr::getType(), clang::QualType::getTypePtr(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Declarator::isInvalidType(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Type::isVectorType(), and clang::Type::isVoidType().
Referenced by TypeTraitArity().
ExprResult Sema::ActOnCharacterConstant | ( | const Token & | Tok, |
Scope * | UDLScope = nullptr |
||
) |
Definition at line 3252 of file SemaExpr.cpp.
References clang::ExprError(), clang::Token::getKind(), and clang::Token::getLocation().
ExprResult Sema::ActOnChooseExpr | ( | SourceLocation | BuiltinLoc, |
Expr * | CondExpr, | ||
Expr * | LHSExpr, | ||
Expr * | RHSExpr, | ||
SourceLocation | RPLoc | ||
) |
Definition at line 13683 of file SemaExpr.cpp.
References clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), clang::OK_Ordinary, and clang::VK_RValue.
Referenced by clang::TreeTransform< Derived >::RebuildChooseExpr().
ExprResult Sema::ActOnClassMessage | ( | Scope * | S, |
ParsedType | Receiver, | ||
Selector | Sel, | ||
SourceLocation | LBracLoc, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
SourceLocation | RBracLoc, | ||
MultiExprArg | Args | ||
) |
Definition at line 2591 of file SemaExprObjC.cpp.
References clang::ExprError(), and clang::QualType::isNull().
ExprResult Sema::ActOnClassPropertyRefExpr | ( | IdentifierInfo & | receiverName, |
IdentifierInfo & | propertyName, | ||
SourceLocation | receiverNameLoc, | ||
SourceLocation | propertyNameLoc | ||
) |
Definition at line 1999 of file SemaExprObjC.cpp.
References Diag(), clang::ExprError(), clang::QualType::isNull(), and clang::IdentifierInfo::isStr().
DeclResult Sema::ActOnClassTemplateSpecialization | ( | Scope * | S, |
unsigned | TagSpec, | ||
TagUseKind | TUK, | ||
SourceLocation | KWLoc, | ||
SourceLocation | ModulePrivateLoc, | ||
TemplateIdAnnotation & | TemplateId, | ||
const ParsedAttributesView & | Attr, | ||
MultiTemplateParamsArg | TemplateParameterLists, | ||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
Definition at line 7638 of file SemaTemplate.cpp.
References clang::TemplateIdAnnotation::LAngleLoc, clang::TemplateIdAnnotation::RAngleLoc, clang::TemplateIdAnnotation::SS, and clang::TemplateIdAnnotation::TemplateNameLoc.
ExprResult Sema::ActOnCoawaitExpr | ( | Scope * | S, |
SourceLocation | KwLoc, | ||
Expr * | E | ||
) |
Definition at line 692 of file SemaCoroutine.cpp.
Referenced by BuildNonArrayForRange().
void Sema::ActOnComment | ( | SourceRange | Comment | ) |
Definition at line 1827 of file Sema.cpp.
References clang::ASTContext::addComment(), clang::LangOptions::CommentOpts, Context, clang::FixItHint::CreateReplacement(), Diag(), clang::SourceRange::getBegin(), clang::RawComment::getKind(), clang::SourceLocation::getLocWithOffset(), clang::RawComment::isAlmostTrailingComment(), clang::SourceManager::isInSystemHeader(), LangOpts, clang::RawComment::RCK_OrdinaryBCPL, clang::RawComment::RCK_OrdinaryC, and SourceMgr.
Decl * Sema::ActOnCompatibilityAlias | ( | SourceLocation | AtLoc, |
IdentifierInfo * | AliasName, | ||
SourceLocation | AliasLocation, | ||
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassLocation | ||
) |
ActOnCompatibilityAlias - this action is called after complete parsing of a @compatibility_alias declaration.
It sets up the alias relationships.
Definition at line 1132 of file SemaDeclObjC.cpp.
References CheckObjCDeclScope(), Context, clang::ObjCCompatibleAliasDecl::Create(), CurContext, Diag(), forRedeclarationInCurContext(), clang::Type::getAs(), clang::ObjCObjectType::getInterface(), clang::Decl::getLocation(), clang::Type::isObjCObjectType(), LookupOrdinaryName, LookupSingleName(), PushOnScopeChains(), and TUScope.
ExprResult Sema::ActOnCompoundLiteral | ( | SourceLocation | LParenLoc, |
ParsedType | Ty, | ||
SourceLocation | RParenLoc, | ||
Expr * | InitExpr | ||
) |
Definition at line 5991 of file SemaExpr.cpp.
StmtResult Sema::ActOnCompoundStmt | ( | SourceLocation | L, |
SourceLocation | R, | ||
ArrayRef< Stmt *> | Elts, | ||
bool | isStmtExpr | ||
) |
Definition at line 350 of file SemaStmt.cpp.
References clang::frontend::C99, clang::frontend::CPlusPlus, clang::CompoundStmt::Create(), Diag(), clang::Decl::getLocation(), and i.
Decl * Sema::ActOnConceptDefinition | ( | Scope * | S, |
MultiTemplateParamsArg | TemplateParameterLists, | ||
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
Expr * | ConstraintExpr | ||
) |
Definition at line 8013 of file SemaTemplate.cpp.
Sema::ConditionResult Sema::ActOnCondition | ( | Scope * | S, |
SourceLocation | Loc, | ||
Expr * | SubExpr, | ||
ConditionKind | CK | ||
) |
Definition at line 16893 of file SemaExpr.cpp.
ExprResult Sema::ActOnConditionalOp | ( | SourceLocation | QuestionLoc, |
SourceLocation | ColonLoc, | ||
Expr * | CondExpr, | ||
Expr * | LHSExpr, | ||
Expr * | RHSExpr | ||
) |
ActOnConditionalOp - Parse a ?: operation.
Note that 'LHS' may be null in the case of a the GNU conditional expr extension.
Definition at line 7647 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getValueKind(), clang::Expr::hasPlaceholderType(), clang::Expr::isGLValue(), clang::Expr::isOrdinaryOrBitFieldObject(), clang::Expr::isTypeDependent(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), and result.
Referenced by checkOpenMPLoop(), and clang::Parser::ParseConstraintExpression().
Sema::ConditionResult Sema::ActOnConditionVariable | ( | Decl * | ConditionVar, |
SourceLocation | StmtLoc, | ||
ConditionKind | CK | ||
) |
Definition at line 3608 of file SemaExprCXX.cpp.
References CheckConditionVariable(), ConditionError(), ConstexprIf, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and MakeFullExpr().
ExprResult Sema::ActOnConstantExpression | ( | ExprResult | Res | ) |
Definition at line 16243 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isUsable().
Referenced by clang::Parser::ParseConstantExpressionInExprEvalContext().
StmtResult Sema::ActOnContinueStmt | ( | SourceLocation | ContinueLoc, |
Scope * | CurScope | ||
) |
Definition at line 2878 of file SemaStmt.cpp.
Decl * Sema::ActOnConversionDeclarator | ( | CXXConversionDecl * | Conversion | ) |
ActOnConversionDeclarator - Called by ActOnDeclarator to complete the declaration of the given C++ conversion function.
This routine is responsible for recording the conversion function in the C++ class, if possible.
Definition at line 8661 of file SemaDeclCXX.cpp.
References clang::Decl::getDeclContext().
ExprResult Sema::ActOnConvertVectorExpr | ( | Expr * | E, |
ParsedType | ParsedDestTy, | ||
SourceLocation | BuiltinLoc, | ||
SourceLocation | RParenLoc | ||
) |
__builtin_convertvector(...)
ActOnConvertVectorExpr - create a new convert-vector expression from the provided arguments.
__builtin_convertvector( value, dst type )
Definition at line 5731 of file SemaExpr.cpp.
StmtResult Sema::ActOnCoreturnStmt | ( | Scope * | S, |
SourceLocation | KwLoc, | ||
Expr * | E | ||
) |
Definition at line 846 of file SemaCoroutine.cpp.
bool Sema::ActOnCoroutineBodyStart | ( | Scope * | S, |
SourceLocation | KwLoc, | ||
StringRef | Keyword | ||
) |
Definition at line 599 of file SemaCoroutine.cpp.
References checkCoroutineContext().
ExprResult Sema::ActOnCoyieldExpr | ( | Scope * | S, |
SourceLocation | KwLoc, | ||
Expr * | E | ||
) |
Definition at line 791 of file SemaCoroutine.cpp.
ExprResult Sema::ActOnCUDAExecConfigExpr | ( | Scope * | S, |
SourceLocation | LLLLoc, | ||
MultiExprArg | ExecConfig, | ||
SourceLocation | GGGLoc | ||
) |
Definition at line 40 of file SemaCUDA.cpp.
ExprResult Sema::ActOnCXXBoolLiteral | ( | SourceLocation | OpLoc, |
tok::TokenKind | Kind | ||
) |
ActOnCXXBoolLiteral - Parse {true,false} literals.
Definition at line 698 of file SemaExprCXX.cpp.
Referenced by clang::Sema::ImplicitExceptionSpecification::getExceptionSpec().
StmtResult Sema::ActOnCXXCatchBlock | ( | SourceLocation | CatchLoc, |
Decl * | ExDecl, | ||
Stmt * | HandlerBlock | ||
) |
ActOnCXXCatchBlock - Takes an exception declaration and a handler block and creates a proper catch handler from them.
Definition at line 3889 of file SemaStmt.cpp.
DeclResult Sema::ActOnCXXConditionDeclaration | ( | Scope * | S, |
Declarator & | D | ||
) |
ActOnCXXConditionDeclarationExpr - Parsed a condition declaration of a C++ if/switch/while/for statement.
e.g: "if (int x = f()) {...}"
Definition at line 15063 of file SemaDeclCXX.cpp.
References Diag(), clang::Declarator::getDeclSpec(), clang::Declarator::getSourceRange(), clang::DeclSpec::getStorageClassSpec(), and clang::DeclSpec::SCS_typedef.
ExprResult Sema::ActOnCXXDelete | ( | SourceLocation | StartLoc, |
bool | UseGlobal, | ||
bool | ArrayForm, | ||
Expr * | ExE | ||
) |
ActOnCXXDelete - Parsed a C++ 'delete' expression.
ActOnCXXDelete - Parsed a C++ 'delete' expression (C++ 5.3.5), as in:
or
Definition at line 3212 of file SemaExprCXX.cpp.
References AA_Passing, clang::AS_public, CheckDestructorAccess(), CheckVirtualDtorCall(), Context, clang::FixItHint::CreateInsertion(), clang::ASTContext::DeclarationNames, clang::Default, DefaultLvalueConversion(), Diag(), DiagnoseUseOfDecl(), doesUsualArrayDeleteWantSize(), clang::ExprError(), FindDeallocationFunction(), FindUsualDeallocationFunction(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::QualType::getAddressSpace(), clang::Qualifiers::getAddressSpaceAttributePrintValue(), clang::Type::getAs(), clang::ASTContext::getBaseElementType(), clang::DeclarationNameTable::getCXXOperatorName(), clang::CXXRecordDecl::getDestructor(), getLangOpts(), clang::Decl::getLocation(), getLocForEndOfToken(), clang::FunctionDecl::getParamDecl(), clang::Type::getPointeeType(), clang::ASTContext::getPointerType(), clang::ASTContext::getQualifiedType(), clang::QualType::getQualifiers(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::Qualifiers::hasCVRQualifiers(), clang::CXXRecordDecl::hasIrrelevantDestructor(), hasNewExtendedAlignment(), ImpCastExprToType(), clang::Type::isArrayType(), isCompleteType(), clang::Type::isDependentType(), clang::QualType::isDestructedType(), clang::Type::isFunctionType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), isSFINAEContext(), clang::Type::isVoidType(), LookupDestructor(), clang::DeclAccessPair::make(), MarkFunctionReferenced(), clang::ast_matchers::match(), PDiag(), PerformContextualImplicitConversion(), PerformImplicitConversion(), clang::Qualifiers::removeCVRQualifiers(), RequireCompleteType(), clang::Result, and clang::ASTContext::VoidTy.
Referenced by clang::Parser::ParseUnqualifiedId().
bool Sema::ActOnCXXEnterDeclaratorScope | ( | Scope * | S, |
CXXScopeSpec & | SS | ||
) |
ActOnCXXEnterDeclaratorScope - Called when a C++ scope specifier (global scope or nested-name-specifier) is parsed, part of a declarator-id.
After this method is called, according to [C++ 3.4.3p3], names should be looked up in the declarator-id's scope, until the declarator is parsed and ActOnCXXExitDeclaratorScope is called. The 'SS' should be a non-empty valid CXXScopeSpec.
Definition at line 1069 of file SemaCXXScopeSpec.cpp.
ActOnCXXEnterDeclInitializer - Invoked when we are about to parse an initializer for the declaration 'Dcl'.
Invoked when we are about to parse an initializer for the declaration 'Dcl'.
After this method is called, according to [C++ 3.4.1p13], if 'Dcl' is a static data member of class X, names should be looked up in the scope of class X.
After this method is called, according to [C++ 3.4.1p13], if 'Dcl' is a static data member of class X, names should be looked up in the scope of class X. If the declaration had a scope specifier, a scope will have been created and passed in for this purpose. Otherwise, S will be null.
Definition at line 15027 of file SemaDeclCXX.cpp.
References clang::Decl::getDeclContext(), clang::Decl::isInvalidDecl(), isNonlocalVariable(), and clang::Decl::isOutOfLine().
void Sema::ActOnCXXExitDeclaratorScope | ( | Scope * | S, |
const CXXScopeSpec & | SS | ||
) |
ActOnCXXExitDeclaratorScope - Called when a declarator that previously invoked ActOnCXXEnterDeclaratorScope(), is finished.
'SS' is the same CXXScopeSpec that was passed to ActOnCXXEnterDeclaratorScope as well. Used to indicate that names should revert to being looked up in the defining scope.
Definition at line 1096 of file SemaCXXScopeSpec.cpp.
ActOnCXXExitDeclInitializer - Invoked after we are finished parsing an initializer for the declaration 'Dcl'.
Invoked after we are finished parsing an initializer for the declaration D.
Definition at line 15048 of file SemaDeclCXX.cpp.
References clang::Decl::isInvalidDecl(), isNonlocalVariable(), and clang::Decl::isOutOfLine().
ExprResult Sema::ActOnCXXFoldExpr | ( | SourceLocation | LParenLoc, |
Expr * | LHS, | ||
tok::TokenKind | Operator, | ||
SourceLocation | EllipsisLoc, | ||
Expr * | RHS, | ||
SourceLocation | RParenLoc | ||
) |
Handle a C++1z fold-expression: ( expr op ... op expr ).
Definition at line 1142 of file SemaTemplateVariadic.cpp.
References CheckFoldOperand(), clang::Expr::containsUnexpandedParameterPack(), Diag(), clang::Stmt::getSourceRange(), and clang::None.
void Sema::ActOnCXXForRangeDecl | ( | Decl * | D | ) |
Definition at line 12083 of file SemaDecl.cpp.
References Diag(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::DeclaratorDecl::getOuterLocStart(), clang::VarDecl::getStorageClass(), clang::SC_Auto, clang::SC_Extern, clang::SC_None, clang::SC_PrivateExtern, clang::SC_Register, clang::SC_Static, clang::VarDecl::setCXXForRangeDecl(), and clang::Decl::setInvalidDecl().
StmtResult Sema::ActOnCXXForRangeIdentifier | ( | Scope * | S, |
SourceLocation | IdentLoc, | ||
IdentifierInfo * | Ident, | ||
ParsedAttributes & | Attrs, | ||
SourceLocation | AttrEnd | ||
) |
Definition at line 12126 of file SemaDecl.cpp.
StmtResult Sema::ActOnCXXForRangeStmt | ( | Scope * | S, |
SourceLocation | ForLoc, | ||
SourceLocation | CoawaitLoc, | ||
Stmt * | InitStmt, | ||
Stmt * | First, | ||
SourceLocation | ColonLoc, | ||
Expr * | Range, | ||
SourceLocation | RParenLoc, | ||
BuildForRangeKind | Kind | ||
) |
ActOnCXXForRangeStmt - Check and build a C++11 for-range statement.
C++11 [stmt.ranged]: A range-based for statement is equivalent to
{ auto && __range = range-init; for ( auto __begin = begin-expr, __end = end-expr; __begin != __end; ++__begin ) { for-range-declaration = *__begin; statement } }
The body of the loop is not available yet, since it cannot be analysed until we have determined the type of the for-range-declaration.
Definition at line 2056 of file SemaStmt.cpp.
bool Sema::ActOnCXXGlobalScopeSpecifier | ( | SourceLocation | CCLoc, |
CXXScopeSpec & | SS | ||
) |
The parser has parsed a global nested-name-specifier '::'.
CCLoc | The location of the '::'. |
SS | The nested-name-specifier, which will be updated in-place to reflect the parsed nested-name-specifier. |
Definition at line 272 of file SemaCXXScopeSpec.cpp.
References Context, and clang::CXXScopeSpec::MakeGlobal().
NamedDecl * Sema::ActOnCXXMemberDeclarator | ( | Scope * | S, |
AccessSpecifier | AS, | ||
Declarator & | D, | ||
MultiTemplateParamsArg | TemplateParameterLists, | ||
Expr * | BW, | ||
const VirtSpecifiers & | VS, | ||
InClassInitStyle | InitStyle | ||
) |
ActOnCXXMemberDeclarator - This is invoked when a C++ class member declarator is parsed.
'AS' is the access specifier, 'BW' specifies the bitfield width if there is one, 'InitExpr' specifies the initializer if one has been parsed, and 'InitStyle' is set if an in-class initializer is present (but parsing it has been deferred).
Definition at line 2957 of file SemaDeclCXX.cpp.
References clang::Declarator::getDeclSpec().
ExprResult Sema::ActOnCXXNamedCast | ( | SourceLocation | OpLoc, |
tok::TokenKind | Kind, | ||
SourceLocation | LAngleBracketLoc, | ||
Declarator & | D, | ||
SourceLocation | RAngleBracketLoc, | ||
SourceLocation | LParenLoc, | ||
Expr * | E, | ||
SourceLocation | RParenLoc | ||
) |
ActOnCXXNamedCast - Parse {dynamic,static,reinterpret,const}_cast's.
Definition at line 235 of file SemaCast.cpp.
References clang::ExprError(), clang::Expr::getType(), and clang::Declarator::isInvalidType().
Referenced by addConstevalToLambdaDeclSpecifier().
bool Sema::ActOnCXXNestedNameSpecifier | ( | Scope * | S, |
NestedNameSpecInfo & | IdInfo, | ||
bool | EnteringContext, | ||
CXXScopeSpec & | SS, | ||
bool | ErrorRecoveryLookup = false , |
||
bool * | IsCorrectedToColon = nullptr , |
||
bool | OnlyNamespace = false |
||
) |
The parser has parsed a nested-name-specifier 'identifier::'.
S | The scope in which this nested-name-specifier occurs. |
IdInfo | Parser information about an identifier in the nested-name-spec. |
EnteringContext | Whether we're entering the context nominated by this nested-name-specifier. |
SS | The nested-name-specifier, which is both an input parameter (the nested-name-specifier before this type) and an output parameter (containing the full nested-name-specifier, including this new type). |
ErrorRecoveryLookup | If true, then this method is called to improve error recovery. In this case do not emit error message. |
IsCorrectedToColon | If not null, suggestions to replace '::' -> ':' are allowed. The bool value pointed by this parameter is set to 'true' if the identifier is treated as if it was followed by ':', not '::'. |
OnlyNamespace | If true, only considers namespaces in lookup. |
Definition at line 833 of file SemaCXXScopeSpec.cpp.
bool Sema::ActOnCXXNestedNameSpecifier | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
TemplateTy | TemplateName, | ||
SourceLocation | TemplateNameLoc, | ||
SourceLocation | LAngleLoc, | ||
ASTTemplateArgsPtr | TemplateArgs, | ||
SourceLocation | RAngleLoc, | ||
SourceLocation | CCLoc, | ||
bool | EnteringContext | ||
) |
The parser has parsed a nested-name-specifier 'template[opt] template-name < template-args >::'.
S | The scope in which this nested-name-specifier occurs. |
SS | The nested-name-specifier, which is both an input parameter (the nested-name-specifier before this type) and an output parameter (containing the full nested-name-specifier, including this new type). |
TemplateKWLoc | the location of the 'template' keyword, if any. |
TemplateName | the template name. |
TemplateNameLoc | The location of the template name. |
LAngleLoc | The location of the opening angle bracket ('<'). |
TemplateArgs | The template arguments. |
RAngleLoc | The location of the closing angle bracket ('>'). |
CCLoc | The location of the '::'. |
EnteringContext | Whether we're entering the context of the nested-name-specifier. |
Definition at line 888 of file SemaCXXScopeSpec.cpp.
bool Sema::ActOnCXXNestedNameSpecifierDecltype | ( | CXXScopeSpec & | SS, |
const DeclSpec & | DS, | ||
SourceLocation | ColonColonLoc | ||
) |
Definition at line 846 of file SemaCXXScopeSpec.cpp.
References BuildDecltypeType(), Context, Diag(), clang::CXXScopeSpec::Extend(), getLangOpts(), clang::DeclSpec::getRepAsExpr(), clang::TypeLocBuilder::getTypeLocInContext(), clang::DeclSpec::getTypeSpecType(), clang::DeclSpec::getTypeSpecTypeLoc(), clang::CXXScopeSpec::isInvalid(), clang::TypeLocBuilder::push(), clang::TypeSpecTypeLoc::setNameLoc(), clang::DeclSpec::TST_decltype, and clang::DeclSpec::TST_error.
ExprResult Sema::ActOnCXXNew | ( | SourceLocation | StartLoc, |
bool | UseGlobal, | ||
SourceLocation | PlacementLParen, | ||
MultiExprArg | PlacementArgs, | ||
SourceLocation | PlacementRParen, | ||
SourceRange | TypeIdParens, | ||
Declarator & | D, | ||
Expr * | Initializer | ||
) |
ActOnCXXNew - Parsed a C++ 'new' expression.
Parsed a C++ 'new' expression (C++ 5.3.4).
E.g.:
or
StartLoc | The first location of the expression. |
UseGlobal | True if 'new' was prefixed with '::'. |
PlacementLParen | Opening paren of the placement arguments. |
PlacementArgs | Placement new arguments. |
PlacementRParen | Closing paren of the placement arguments. |
TypeIdParens | If the type is in parens, the source range. |
D | The type to be allocated, as well as array dimensions. |
Initializer | The initializing expression or initializer-list, or null if there is none. |
Definition at line 1641 of file SemaExprCXX.cpp.
References clang::DeclaratorChunk::Arr, clang::DeclaratorChunk::Array, CCEK_NewExpr, CheckConvertedConstantExpression(), Context, Diag(), clang::Declarator::DropFirstTypeObject(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Declarator::getDeclSpec(), clang::TargetInfo::getIntWidth(), getLangOpts(), clang::Declarator::getNumTypeObjects(), clang::ASTContext::getSizeType(), clang::Declarator::getSourceRange(), clang::ASTContext::getTargetInfo(), clang::TypeSourceInfo::getType(), GetTypeForDeclarator(), clang::Declarator::getTypeObject(), clang::DeclSpec::hasAutoTypeSpec(), clang::DeclaratorChunk::ArrayTypeInfo::hasStatic, clang::Declarator::isInvalidType(), clang::DeclaratorChunk::Kind, clang::DeclaratorChunk::Loc, clang::DeclaratorChunk::ArrayTypeInfo::NumElts, and VerifyIntegerConstantExpression().
Referenced by clang::Parser::ParseUnqualifiedId().
ExprResult Sema::ActOnCXXNullPtrLiteral | ( | SourceLocation | Loc | ) |
ActOnCXXNullPtrLiteral - Parse 'nullptr'.
Definition at line 707 of file SemaExprCXX.cpp.
ExprResult Sema::ActOnCXXThis | ( | SourceLocation | loc | ) |
C++ 9.3.2: In the body of a non-static member function, the keyword this is a non-lvalue expression whose value is the address of the object for which the function is called.
Definition at line 1249 of file SemaExprCXX.cpp.
References BuildCXXThisExpr(), Diag(), getCurrentThisType(), and clang::QualType::isNull().
Referenced by diagReturnOnAllocFailure().
ExprResult Sema::ActOnCXXThrow | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
Expr * | expr | ||
) |
ActOnCXXThrow - Parse throw expressions.
Definition at line 713 of file SemaExprCXX.cpp.
StmtResult Sema::ActOnCXXTryBlock | ( | SourceLocation | TryLoc, |
Stmt * | TryBlock, | ||
ArrayRef< Stmt *> | Handlers | ||
) |
ActOnCXXTryBlock - Takes a try compound-statement and a number of handlers and creates a try statement from them.
Definition at line 4006 of file SemaStmt.cpp.
References Diag(), clang::sema::FunctionScopeInfo::FirstSEHTryLoc, clang::CXXCatchStmt::getBeginLoc(), clang::CXXCatchStmt::getExceptionDecl(), i, clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), and clang::StmtError().
ExprResult Sema::ActOnCXXTypeConstructExpr | ( | ParsedType | TypeRep, |
SourceLocation | LParenOrBraceLoc, | ||
MultiExprArg | exprs, | ||
SourceLocation | RParenOrBraceLoc, | ||
bool | ListInitialization | ||
) |
ActOnCXXTypeConstructExpr - Parse construction of a specified type.
Parse construction of a specified type.
Can be interpreted either as function-style casting ("int(x)") or class type construction ("ClassType(x,y,z)") or creation of a value-initialized type ("int()").
Definition at line 1288 of file SemaExprCXX.cpp.
References BuildCXXTypeConstructExpr(), Context, CorrectDelayedTyposInExpr(), clang::ExprError(), clang::ASTContext::getTrivialTypeSourceInfo(), GetTypeFromParser(), and clang::Result.
ExprResult Sema::ActOnCXXTypeid | ( | SourceLocation | OpLoc, |
SourceLocation | LParenLoc, | ||
bool | isType, | ||
void * | TyOrExpr, | ||
SourceLocation | RParenLoc | ||
) |
ActOnCXXTypeid - Parse typeid( something ).
ActOnCXXTypeidOfType - Parse typeid( type-id ) or typeid (expression);.
Definition at line 530 of file SemaExprCXX.cpp.
References Diag(), clang::ExprError(), and clang::LookupResult::getAsSingle().
Referenced by addConstevalToLambdaDeclSpecifier().
ExprResult Sema::ActOnCXXUuidof | ( | SourceLocation | OpLoc, |
SourceLocation | LParenLoc, | ||
bool | isType, | ||
void * | TyOrExpr, | ||
SourceLocation | RParenLoc | ||
) |
ActOnCXXUuidof - Parse __uuidof( something ).
ActOnCXXUuidof - Parse __uuidof( type-id ) or __uuidof (expression);.
Definition at line 664 of file SemaExprCXX.cpp.
Referenced by addConstevalToLambdaDeclSpecifier().
Decl * Sema::ActOnDeclarator | ( | Scope * | S, |
Declarator & | D | ||
) |
Definition at line 5253 of file SemaDecl.cpp.
StmtResult Sema::ActOnDeclStmt | ( | DeclGroupPtrTy | Decl, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 72 of file SemaStmt.cpp.
References clang::OpaquePtr< PtrTy >::get(), clang::DeclGroupRef::isNull(), and clang::StmtError().
Referenced by clang::CoroutineStmtBuilder::buildDependentStatements(), and noteMemberDeclaredHere().
ExprResult Sema::ActOnDecltypeExpression | ( | Expr * | E | ) |
Process the expression contained within a decltype.
For such expressions, certain semantic checks on temporaries are delayed until this point, and are omitted for the 'topmost' call in the decltype expression. If the topmost call bound a temporary, strip that temporary off the expression.
Definition at line 6553 of file SemaExprCXX.cpp.
References ActOnParenExpr(), CheckCallReturnType(), CheckPlaceholderExpr(), Context, clang::Sema::ExpressionEvaluationContextRecord::EK_Decltype, clang::Sema::ExpressionEvaluationContextRecord::EK_Other, clang::ExprError(), ExprEvalContexts, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::CallExpr::getBeginLoc(), clang::CallExpr::getCallReturnType(), clang::CallExpr::getDirectCallee(), getLangOpts(), clang::CXXBindTemporaryExpr::getSubExpr(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Result.
NamedDecl * Sema::ActOnDecompositionDeclarator | ( | Scope * | S, |
Declarator & | D, | ||
MultiTemplateParamsArg | TemplateParamLists | ||
) |
Definition at line 686 of file SemaDeclCXX.cpp.
void Sema::ActOnDefaultCtorInitializers | ( | Decl * | CDtorDecl | ) |
Definition at line 5299 of file SemaDeclCXX.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
StmtResult Sema::ActOnDefaultStmt | ( | SourceLocation | DefaultLoc, |
SourceLocation | ColonLoc, | ||
Stmt * | SubStmt, | ||
Scope * | CurScope | ||
) |
Definition at line 467 of file SemaStmt.cpp.
References Diag().
void Sema::ActOnDefs | ( | Scope * | S, |
Decl * | TagD, | ||
SourceLocation | DeclStart, | ||
IdentifierInfo * | ClassName, | ||
SmallVectorImpl< Decl *> & | Decls | ||
) |
Called whenever @defs(ClassName) is encountered in the source.
Inserts the instance variables of ClassName into Decls.
Definition at line 4812 of file SemaDeclObjC.cpp.
ActOnDelayedCXXMethodParameter - We've already started a delayed C++ method declaration.
We're (re-)introducing the given function parameter into scope for use in parsing later parts of the method declaration. For example, we could see an ActOnParamDefaultArgument event for this parameter.
Definition at line 8149 of file SemaDeclCXX.cpp.
References clang::Scope::AddDecl(), clang::NamedDecl::getDeclName(), clang::ParmVarDecl::hasUnparsedDefaultArg(), and clang::ParmVarDecl::setDefaultArg().
void Sema::actOnDelayedExceptionSpecification | ( | Decl * | Method, |
ExceptionSpecificationType | EST, | ||
SourceRange | SpecificationRange, | ||
ArrayRef< ParsedType > | DynamicExceptions, | ||
ArrayRef< SourceRange > | DynamicExceptionRanges, | ||
Expr * | NoexceptExpr | ||
) |
Add an exception-specification to the given member function (or member function template).
The exception-specification was parsed after the method itself was declared.
Definition at line 15625 of file SemaDeclCXX.cpp.
ExprResult Sema::ActOnDependentIdExpression | ( | const CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
const DeclarationNameInfo & | NameInfo, | ||
bool | isAddressOfOperand, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
ActOnDependentIdExpression - Handle a dependent id-expression that was just parsed.
This is only possible with an explicit scope specifier naming a dependent type.
Definition at line 689 of file SemaTemplate.cpp.
References clang::CXXDependentScopeMemberExpr::Create(), and clang::CXXScopeSpec::getScopeRep().
ExprResult Sema::ActOnDependentMemberExpr | ( | Expr * | Base, |
QualType | BaseType, | ||
bool | IsArrow, | ||
SourceLocation | OpLoc, | ||
const CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
NamedDecl * | FirstQualifierInScope, | ||
const DeclarationNameInfo & | NameInfo, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
Definition at line 480 of file SemaExprMember.cpp.
References clang::CXXDependentScopeMemberExpr::Create(), Diag(), clang::ExprError(), clang::Type::getAs(), clang::DeclarationNameInfo::getName(), clang::PointerType::getPointeeType(), clang::DeclarationNameInfo::getSourceRange(), clang::Stmt::getSourceRange(), clang::DeclarationName::isDependentName(), clang::Type::isDependentType(), and clang::Type::isRecordType().
TypeResult Sema::ActOnDependentTag | ( | Scope * | S, |
unsigned | TagSpec, | ||
TagUseKind | TUK, | ||
const CXXScopeSpec & | SS, | ||
IdentifierInfo * | Name, | ||
SourceLocation | TagLoc, | ||
SourceLocation | NameLoc | ||
) |
Definition at line 9743 of file SemaTemplate.cpp.
TemplateNameKind Sema::ActOnDependentTemplateName | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
const UnqualifiedId & | Name, | ||
ParsedType | ObjectType, | ||
bool | EnteringContext, | ||
TemplateTy & | Result, | ||
bool | AllowInjectedClassName = false |
||
) |
Form a dependent template name.
This action forms a dependent template name given the template name and its (presumably dependent) scope specifier. For example, given "MetaFun::template apply", the scope specifier SS
will be "MetaFun::", TemplateKWLoc
contains the location of the "template" keyword, and "apply" is the Name
.
Definition at line 4374 of file SemaTemplate.cpp.
Referenced by clang::Parser::ParseUnqualifiedId().
ExprResult Sema::ActOnDesignatedInitializer | ( | Designation & | Desig, |
SourceLocation | Loc, | ||
bool | GNUSyntax, | ||
ExprResult | Init | ||
) |
Definition at line 2990 of file SemaInit.cpp.
References clang::Designator::ArrayDesignator, clang::Designator::FieldDesignator, clang::Designation::getDesignator(), clang::Designator::getDotLoc(), clang::Designator::getField(), clang::Designator::getFieldLoc(), clang::Designator::getKind(), and clang::Designation::getNumDesignators().
Referenced by CheckArrayDesignatorSyntax(), and clang::TreeTransform< Derived >::RebuildDesignatedInitExpr().
void Sema::ActOnDocumentableDecl | ( | Decl * | D | ) |
Should be called on all declarations that might have attached documentation comments.
Definition at line 12720 of file SemaDecl.cpp.
Definition at line 12724 of file SemaDecl.cpp.
StmtResult Sema::ActOnDoStmt | ( | SourceLocation | DoLoc, |
Stmt * | Body, | ||
SourceLocation | WhileLoc, | ||
SourceLocation | CondLParen, | ||
Expr * | Cond, | ||
SourceLocation | CondRParen | ||
) |
Definition at line 1299 of file SemaStmt.cpp.
References clang::frontend::C99, clang::frontend::CPlusPlus, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getExprLoc(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::StmtError().
bool Sema::ActOnDuplicateDefinition | ( | DeclSpec & | DS, |
Decl * | Prev, | ||
SkipBodyInfo & | SkipBody | ||
) |
Perform ODR-like check for C/ObjC when merging tag types from modules.
Differently from C++, actually parse the body and reject / error out in case of a structural mismatch.
Definition at line 15459 of file SemaDecl.cpp.
References clang::Sema::SkipBodyInfo::New, and clang::Sema::SkipBodyInfo::Previous.
Decl * Sema::ActOnEmptyDeclaration | ( | Scope * | S, |
const ParsedAttributesView & | AttrList, | ||
SourceLocation | SemiLoc | ||
) |
Handle a C++11 empty-declaration and attribute-declaration.
Definition at line 13809 of file SemaDeclCXX.cpp.
References clang::EmptyDecl::Create().
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::ActOnEndOfTranslationUnit | ( | ) |
ActOnEndOfTranslationUnit - This is called at the very end of the translation unit when EOF is reached and all but the top-level scope is popped.
Definition at line 918 of file Sema.cpp.
References ActOnEndOfTranslationUnitFragment(), clang::LazyVector< T, Source, Loader, LoadedStorage, LocalStorage >::begin(), CheckDelayedMemberExceptionSpecs(), CheckDelegatingCtorCycles(), checkUndefinedButUsed(), clang::LangOptions::CMK_ModuleInterface, DelayedDllExportClasses, DelayedDllExportMemberFunctions, DelayedEquivalentExceptionSpecChecks, DelayedOverridingExceptionSpecChecks, Diag(), DiagnoseUnterminatedPragmaAttribute(), DiagnoseUnterminatedPragmaPack(), DiagnoseUseOfUnimplementedSelectors(), Diags, clang::LazyVector< T, Source, Loader, LoadedStorage, LocalStorage >::end(), clang::LazyVector< T, Source, Loader, LoadedStorage, LocalStorage >::erase(), clang::ExpectedVariableOrFunction, clang::Preprocessor::getCurrentModule(), clang::Sema::DelayedDiagnostics::getCurrentPool(), clang::Preprocessor::getHeaderSearchInfo(), getLangOpts(), clang::HeaderSearch::getModuleMap(), getSourceManager(), clang::Module::GlobalModuleFragment, clang::DiagnosticsEngine::hasErrorOccurred(), clang::Preprocessor::isCodeCompletionEnabled(), clang::DiagnosticsEngine::isIgnored(), clang::Preprocessor::isIncrementalProcessingEnabled(), LangOpts, LateParsedInstantiations, LateTemplateParserCleanup, LoadExternalWeakUndeclaredIdentifiers(), LookupOrdinaryName, LookupSingleName(), OpaqueParser, PendingInstantiations, PP, clang::Module::PrivateModuleFragment, clang::ExternalSemaSource::ReadUndefinedButUsed(), ShouldRemoveFromUnused(), clang::TU_Module, clang::TU_Prefix, TUKind, TUScope, UndefinedButUsed, UnusedFileScopedDecls, and WeakUndeclaredIdentifiers.
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::ActOnEndOfTranslationUnitFragment | ( | TUFragmentKind | Kind | ) |
Definition at line 860 of file Sema.cpp.
References DefineUsedVTables(), LateParsedInstantiations, PendingInstantiations, PerformPendingInstantiations(), and clang::ExternalSemaSource::ReadPendingInstantiations().
Referenced by ActOnEndOfTranslationUnit().
void Sema::ActOnEnumBody | ( | SourceLocation | EnumLoc, |
SourceRange | BraceRange, | ||
Decl * | EnumDecl, | ||
ArrayRef< Decl *> | Elements, | ||
Scope * | S, | ||
const ParsedAttributesView & | Attr | ||
) |
Definition at line 17139 of file SemaDecl.cpp.
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition().
Decl * Sema::ActOnEnumConstant | ( | Scope * | S, |
Decl * | EnumDecl, | ||
Decl * | LastEnumConstant, | ||
SourceLocation | IdLoc, | ||
IdentifierInfo * | Id, | ||
const ParsedAttributesView & | Attrs, | ||
SourceLocation | EqualLoc, | ||
Expr * | Val | ||
) |
Definition at line 16888 of file SemaDecl.cpp.
Decl * Sema::ActOnExceptionDeclarator | ( | Scope * | S, |
Declarator & | D | ||
) |
ActOnExceptionDeclarator - Parsed the exception-declarator in a C++ catch handler.
Definition at line 13951 of file SemaDeclCXX.cpp.
References clang::Declarator::getIdentifierLoc(), and clang::Declarator::isInvalidType().
void Sema::ActOnExitFunctionContext | ( | ) |
Definition at line 1338 of file SemaDecl.cpp.
ExplicitSpecifier Sema::ActOnExplicitBoolSpecifier | ( | Expr * | E | ) |
ActOnExplicitBoolSpecifier - Build an ExplicitSpecifier from an expression found in an explicit(bool) specifier.
Definition at line 10892 of file SemaDeclCXX.cpp.
References clang::Expr::isTypeDependent(), and clang::Unresolved.
DeclResult Sema::ActOnExplicitInstantiation | ( | Scope * | S, |
SourceLocation | ExternLoc, | ||
SourceLocation | TemplateLoc, | ||
unsigned | TagSpec, | ||
SourceLocation | KWLoc, | ||
const CXXScopeSpec & | SS, | ||
TemplateTy | Template, | ||
SourceLocation | TemplateNameLoc, | ||
SourceLocation | LAngleLoc, | ||
ASTTemplateArgsPtr | TemplateArgs, | ||
SourceLocation | RAngleLoc, | ||
const ParsedAttributesView & | Attr | ||
) |
Definition at line 8927 of file SemaTemplate.cpp.
DeclResult Sema::ActOnExplicitInstantiation | ( | Scope * | S, |
SourceLocation | ExternLoc, | ||
SourceLocation | TemplateLoc, | ||
unsigned | TagSpec, | ||
SourceLocation | KWLoc, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
const ParsedAttributesView & | Attr | ||
) |
Definition at line 9226 of file SemaTemplate.cpp.
DeclResult Sema::ActOnExplicitInstantiation | ( | Scope * | S, |
SourceLocation | ExternLoc, | ||
SourceLocation | TemplateLoc, | ||
Declarator & | D | ||
) |
Definition at line 9340 of file SemaTemplate.cpp.
ExprResult Sema::ActOnExpressionTrait | ( | ExpressionTrait | OET, |
SourceLocation | KWLoc, | ||
Expr * | Queried, | ||
SourceLocation | RParen | ||
) |
ActOnExpressionTrait - Parsed one of the unary type trait support pseudo-functions.
Definition at line 5350 of file SemaExprCXX.cpp.
References BuildExpressionTrait(), clang::ExprError(), and clang::Result.
Referenced by TypeTraitArity().
StmtResult Sema::ActOnExprStmt | ( | ExprResult | Arg, |
bool | DiscardedValue = true |
||
) |
Definition at line 45 of file SemaStmt.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::getAs(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::StmtError().
StmtResult Sema::ActOnExprStmtError | ( | ) |
Definition at line 62 of file SemaStmt.cpp.
References clang::StmtError().
Decl * Sema::ActOnField | ( | Scope * | S, |
Decl * | TagD, | ||
SourceLocation | DeclStart, | ||
Declarator & | D, | ||
Expr * | BitfieldWidth | ||
) |
ActOnField - Each field of a C struct/union is passed into this in order to create a FieldDecl object for it.
Definition at line 15672 of file SemaDecl.cpp.
void Sema::ActOnFields | ( | Scope * | S, |
SourceLocation | RecLoc, | ||
Decl * | TagDecl, | ||
ArrayRef< Decl *> | Fields, | ||
SourceLocation | LBrac, | ||
SourceLocation | RBrac, | ||
const ParsedAttributesView & | AttrList | ||
) |
A field cannot be an Objective-c object
Definition at line 16211 of file SemaDecl.cpp.
Decl * Sema::ActOnFileScopeAsmDecl | ( | Expr * | expr, |
SourceLocation | AsmLoc, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 17375 of file SemaDecl.cpp.
References clang::FileScopeAsmDecl::Create(), and clang::ast_matchers::expr.
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::ActOnFinishCXXInClassMemberInitializer | ( | Decl * | D, |
SourceLocation | InitLoc, | ||
Expr * | InitExpr | ||
) |
This is invoked after parsing an in-class initializer for a non-static C++ class member, and after instantiating an in-class initializer in a class template.
Such actions are deferred until the class is complete.
Definition at line 3675 of file SemaDeclCXX.cpp.
References clang::InitializationKind::CreateCopy(), clang::InitializationKind::CreateDirectList(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), clang::Stmt::getEndLoc(), clang::FieldDecl::getInClassInitStyle(), clang::ValueDecl::getType(), clang::ICIS_ListInit, clang::ICIS_NoInit, clang::InitializedEntity::InitializeMemberFromDefaultMemberInitializer(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), clang::FieldDecl::removeInClassInitializer(), clang::FieldDecl::setInClassInitializer(), and clang::Decl::setInvalidDecl().
Referenced by InstantiateInClassInitializer().
void Sema::ActOnFinishCXXMemberDecls | ( | ) |
Perform any semantic analysis which needs to be delayed until all pending class member declarations have been parsed.
Definition at line 11406 of file SemaDeclCXX.cpp.
References checkForMultipleExportedDefaultConstructors().
void Sema::ActOnFinishCXXMemberSpecification | ( | Scope * | S, |
SourceLocation | RLoc, | ||
Decl * | TagDecl, | ||
SourceLocation | LBrac, | ||
SourceLocation | RBrac, | ||
const ParsedAttributesView & | AttrList | ||
) |
Definition at line 7955 of file SemaDeclCXX.cpp.
References Diag().
void Sema::ActOnFinishCXXNonNestedClass | ( | Decl * | D | ) |
Definition at line 11418 of file SemaDeclCXX.cpp.
References DefineImplicitSpecialMember(), and clang::TSK_ExplicitInstantiationDefinition.
void Sema::ActOnFinishDelayedAttribute | ( | Scope * | S, |
Decl * | D, | ||
ParsedAttributes & | Attrs | ||
) |
ActOnFinishDelayedAttribute - Invoked when we have finished parsing an attribute for which parsing is delayed.
When we finish delayed parsing of an attribute, we must attach it to the relevant Decl.
Definition at line 13894 of file SemaDecl.cpp.
ActOnFinishDelayedCXXMethodDeclaration - We have finished processing the delayed method declaration for Method.
The method declaration is now considered finished. There may be a separate ActOnStartOfFunctionDef action later (not necessarily immediately!) for this method, if it was also defined inside the class body.
Definition at line 8171 of file SemaDeclCXX.cpp.
References clang::Decl::isInvalidDecl().
Definition at line 8116 of file SemaDeclCXX.cpp.
void Sema::ActOnFinishDelayedMemberInitializers | ( | Decl * | Record | ) |
Definition at line 11124 of file SemaDeclCXX.cpp.
Decl * Sema::ActOnFinishExportDecl | ( | Scope * | S, |
Decl * | ExportDecl, | ||
SourceLocation | RBraceLoc | ||
) |
Complete the definition of an export declaration.
Definition at line 689 of file SemaModule.cpp.
References checkExportedDecl(), diagExportedUnnamedDecl(), clang::Decl::isInvalidDecl(), and clang::SourceLocation::isValid().
|
inline |
Definition at line 5584 of file Sema.h.
References getCurrentInstantiationOf(), and clang::Expr::getExprLoc().
Referenced by checkOpenMPLoop(), checkTupleLikeDecomposition(), diagReturnOnAllocFailure(), FinishOpenMPLinearClause(), and noteMemberDeclaredHere().
ExprResult Sema::ActOnFinishFullExpr | ( | Expr * | Expr, |
SourceLocation | CC, | ||
bool | DiscardedValue, | ||
bool | IsConstexpr = false |
||
) |
Definition at line 7791 of file SemaExprCXX.cpp.
References CheckIfAnyEnclosingLambdasMustCaptureAnyPotentialCaptures(), CheckPlaceholderExpr(), Context, CorrectDelayedTyposInExpr(), CurContext, DiagnoseUnexpandedParameterPack(), DiagnoseUnusedExprResult(), clang::ExprError(), forceUnknownAnyToType(), clang::ActionResult< PtrTy, CompressInvalid >::get(), getCurLambda(), getLangOpts(), clang::ASTContext::getObjCIdType(), clang::DeclContext::getParent(), IgnoredValueConversions(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::isLambdaCallOperator(), MaybeCreateExprWithCleanups(), and clang::ASTContext::UnknownAnyTy.
StmtResult Sema::ActOnFinishFullStmt | ( | Stmt * | Stmt | ) |
Definition at line 7885 of file SemaExprCXX.cpp.
References MaybeCreateStmtWithCleanups(), and clang::StmtError().
Referenced by diagReturnOnAllocFailure().
Definition at line 13523 of file SemaDecl.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
Definition at line 13571 of file SemaDecl.cpp.
References clang::frontend::CPlusPlus14, Diag(), clang::Type::getAs(), clang::Decl::getAsFunction(), clang::Decl::getLocation(), clang::FunctionDecl::getReturnType(), clang::DeclContext::isDependentContext(), clang::Decl::isInvalidDecl(), clang::isLambdaCallOperator(), clang::Type::isUndeducedType(), clang::FunctionDecl::setBody(), clang::Decl::setInvalidDecl(), and clang::FunctionDecl::setWillHaveBody().
void Sema::ActOnFinishInlineFunctionDef | ( | FunctionDecl * | D | ) |
Definition at line 13090 of file SemaDecl.cpp.
void Sema::ActOnFinishKNRParamDeclarations | ( | Scope * | S, |
Declarator & | D, | ||
SourceLocation | LocAfterDecls | ||
) |
Definition at line 13041 of file SemaDecl.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
Decl * Sema::ActOnFinishLinkageSpecification | ( | Scope * | S, |
Decl * | LinkageSpec, | ||
SourceLocation | RBraceLoc | ||
) |
ActOnFinishLinkageSpecification - Complete the definition of the C++ linkage specification LinkageSpec.
If RBraceLoc is valid, it's the position of the closing '}' brace in a linkage specification that uses braces.
Definition at line 13798 of file SemaDeclCXX.cpp.
References clang::SourceLocation::isValid(), and clang::LinkageSpecDecl::setRBraceLoc().
void Sema::ActOnFinishNamespaceDef | ( | Decl * | Dcl, |
SourceLocation | RBrace | ||
) |
ActOnFinishNamespaceDef - This callback is called after a namespace is exited.
Decl is the DeclTy returned by ActOnStartNamespaceDef.
Definition at line 9049 of file SemaDeclCXX.cpp.
References clang::Decl::hasAttr(), clang::Decl::setModuleOwnershipKind(), clang::NamespaceDecl::setRBraceLoc(), and clang::Decl::VisibleWhenImported.
Sema::DeclGroupPtrTy Sema::ActOnFinishObjCImplementation | ( | Decl * | ObjCImpDecl, |
ArrayRef< Decl *> | Decls | ||
) |
Definition at line 2092 of file SemaDeclObjC.cpp.
References BuildDeclaratorGroup(), clang::Decl::getDeclContext(), i, clang::DeclContext::isFileContext(), and clang::Decl::setTopLevelDeclInObjCContainer().
void Sema::ActOnFinishOfCompoundStmt | ( | ) |
Definition at line 342 of file SemaStmt.cpp.
void Sema::ActOnFinishOpenMPDeclareTargetDirective | ( | ) |
Called at the end of target region i.e. '#pragme omp end declare target'.
Definition at line 14919 of file SemaOpenMP.cpp.
StmtResult Sema::ActOnFinishSEHFinallyBlock | ( | SourceLocation | Loc, |
Stmt * | Block | ||
) |
Definition at line 4160 of file SemaStmt.cpp.
References clang::SEHFinallyStmt::Create().
StmtResult Sema::ActOnFinishSwitchStmt | ( | SourceLocation | SwitchLoc, |
Stmt * | Switch, | ||
Stmt * | Body | ||
) |
Definition at line 810 of file SemaStmt.cpp.
References clang::SwitchStmt::getCond(), clang::Expr::getType(), GetTypeBeforeIntegralPromotion(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), clang::SwitchStmt::setBody(), and clang::StmtError().
void Sema::ActOnForEachDeclStmt | ( | DeclGroupPtrTy | Decl | ) |
Definition at line 82 of file SemaStmt.cpp.
References clang::ast_matchers::decl, Diag(), clang::OpaquePtr< PtrTy >::get(), clang::QualType::getLocalQualifiers(), clang::Decl::getLocation(), clang::Qualifiers::getObjCLifetime(), clang::DeclGroupRef::getSingleDecl(), clang::ValueDecl::getType(), clang::Decl::isInvalidDecl(), clang::DeclGroupRef::isNull(), clang::DeclGroupRef::isSingleDecl(), clang::Qualifiers::OCL_Strong, clang::VarDecl::setARCPseudoStrong(), clang::VarDecl::setInit(), clang::Decl::setInvalidDecl(), clang::ValueDecl::setType(), and clang::QualType::withConst().
StmtResult Sema::ActOnForEachLValueExpr | ( | Expr * | E | ) |
In an Objective C collection iteration statement: for (x in y) x can be an arbitrary l-value expression.
Bind it up as a full-expression.
Definition at line 1776 of file SemaStmt.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), result, and clang::StmtError().
StmtResult Sema::ActOnForStmt | ( | SourceLocation | ForLoc, |
SourceLocation | LParenLoc, | ||
Stmt * | First, | ||
ConditionResult | Second, | ||
FullExprArg | Third, | ||
SourceLocation | RParenLoc, | ||
Stmt * | Body | ||
) |
Definition at line 1726 of file SemaStmt.cpp.
References Diag(), clang::Sema::FullExprArg::get(), clang::Sema::ConditionResult::get(), clang::ActionResult< PtrTy, CompressInvalid >::getAs(), clang::VarDecl::hasLocalStorage(), clang::Sema::ConditionResult::isInvalid(), clang::VarDecl::isLocalVarDecl(), clang::Sema::FullExprArg::release(), and clang::StmtError().
Sema::DeclGroupPtrTy Sema::ActOnForwardClassDeclaration | ( | SourceLocation | Loc, |
IdentifierInfo ** | IdentList, | ||
SourceLocation * | IdentLocs, | ||
ArrayRef< ObjCTypeParamList *> | TypeParamLists, | ||
unsigned | NumElts | ||
) |
Definition at line 3032 of file SemaDeclObjC.cpp.
References BuildDeclaratorGroup(), CheckObjCDeclScope(), checkTypeParamListConsistency(), Context, clang::ObjCInterfaceDecl::Create(), CurContext, Diag(), forRedeclarationInCurContext(), clang::ObjCInterfaceDecl::getDefinition(), clang::NamedDecl::getIdentifier(), clang::Decl::getLocation(), clang::ObjCTypeParamList::getSourceRange(), clang::ObjCInterfaceDecl::getTypeParamList(), clang::TypedefNameDecl::getUnderlyingType(), i, clang::Type::isObjCObjectType(), LookupOrdinaryName, LookupSingleName(), PushOnScopeChains(), clang::ObjCContainerDecl::setAtEndRange(), tryMatchRecordTypes(), and TUScope.
Sema::DeclGroupPtrTy Sema::ActOnForwardProtocolDeclaration | ( | SourceLocation | AtProtoclLoc, |
ArrayRef< IdentifierLocPair > | IdentList, | ||
const ParsedAttributesView & | attrList | ||
) |
ActOnForwardProtocolDeclaration - Handle @protocol foo;.
Definition at line 1769 of file SemaDeclObjC.cpp.
References AddPragmaAttributes(), BuildDeclaratorGroup(), CheckObjCDeclScope(), Context, clang::ObjCProtocolDecl::Create(), CurContext, forRedeclarationInCurContext(), LookupProtocol(), mergeDeclAttributes(), ProcessDeclAttributeList(), PushOnScopeChains(), and TUScope.
NamedDecl * Sema::ActOnFriendFunctionDecl | ( | Scope * | S, |
Declarator & | D, | ||
MultiTemplateParamsArg | TemplateParams | ||
) |
Definition at line 14375 of file SemaDeclCXX.cpp.
References Diag(), clang::Declarator::getCXXScopeSpec(), clang::Declarator::getDeclSpec(), clang::Declarator::getIdentifierLoc(), clang::DeclarationNameInfo::getName(), clang::DeclSpec::getStorageClassSpec(), clang::TypeSourceInfo::getType(), clang::DeclSpec::isFriendSpecified(), clang::Type::isFunctionType(), and clang::DeclSpec::SCS_unspecified.
Decl * Sema::ActOnFriendTypeDecl | ( | Scope * | S, |
const DeclSpec & | DS, | ||
MultiTemplateParamsArg | TempParams | ||
) |
Handle a friend type declaration.
This works in tandem with ActOnTag.
Notes on friend class templates:
We generally treat friend class declarations as if they were declaring a class. So, for example, the elaborated type specifier in a friend declaration is required to obey the restrictions of a class-head (i.e. no typedefs in the scope chain), template parameters are required to match up with simple template-ids, &c. However, unlike when declaring a template specialization, it's okay to refer to a template specialization without an empty template parameter declaration, e.g. friend class A<T>::B<unsigned>; We permit this as a special case; if there are any template parameters present at all, require proper matching, i.e. template <> template <class T> friend class A<int>::B;
Definition at line 14284 of file SemaDeclCXX.cpp.
References clang::FriendTemplateDecl::Create(), Diag(), clang::DeclSpec::getAtomicSpecLoc(), clang::DeclSpec::getBeginLoc(), clang::DeclSpec::getConstSpecLoc(), clang::DeclSpec::getRestrictSpecLoc(), clang::DeclSpec::getSourceRange(), clang::DeclSpec::getStorageClassSpec(), clang::TypeSourceInfo::getType(), clang::DeclSpec::getTypeQualifiers(), clang::DeclSpec::getUnalignedSpecLoc(), clang::DeclSpec::getVolatileSpecLoc(), clang::Type::isElaboratedTypeSpecifier(), clang::DeclSpec::isFriendSpecified(), clang::Declarator::isInvalidType(), clang::MemberContext, clang::DeclSpec::SCS_unspecified, clang::DeclSpec::TQ_atomic, clang::DeclSpec::TQ_const, clang::DeclSpec::TQ_restrict, clang::DeclSpec::TQ_unaligned, and clang::DeclSpec::TQ_volatile.
NamedDecl * Sema::ActOnFunctionDeclarator | ( | Scope * | S, |
Declarator & | D, | ||
DeclContext * | DC, | ||
TypeSourceInfo * | TInfo, | ||
LookupResult & | Previous, | ||
MultiTemplateParamsArg | TemplateParamLists, | ||
bool & | AddToScope | ||
) |
Definition at line 8404 of file SemaDecl.cpp.
StmtResult Sema::ActOnGCCAsmStmt | ( | SourceLocation | AsmLoc, |
bool | IsSimple, | ||
bool | IsVolatile, | ||
unsigned | NumOutputs, | ||
unsigned | NumInputs, | ||
IdentifierInfo ** | Names, | ||
MultiExprArg | Constraints, | ||
MultiExprArg | Exprs, | ||
Expr * | AsmString, | ||
MultiExprArg | Clobbers, | ||
unsigned | NumLabels, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 240 of file SemaStmtAsm.cpp.
References clang::IdentifierInfo::getName(), clang::StringLiteral::getString(), i, and clang::StringLiteral::isAscii().
ExprResult Sema::ActOnGenericSelectionExpr | ( | SourceLocation | KeyLoc, |
SourceLocation | DefaultLoc, | ||
SourceLocation | RParenLoc, | ||
Expr * | ControllingExpr, | ||
ArrayRef< ParsedType > | ArgTypes, | ||
ArrayRef< Expr *> | ArgExprs | ||
) |
Definition at line 1420 of file SemaExpr.cpp.
Sema::DeclGroupPtrTy Sema::ActOnGlobalModuleFragmentDecl | ( | SourceLocation | ModuleLoc | ) |
The parser has processed a global-module-fragment declaration that begins the definition of the global module fragment of the current module unit.
ModuleLoc | The location of the 'module' keyword. |
Definition at line 58 of file SemaModule.cpp.
References clang::Module::GlobalModuleFragment.
Referenced by ActOnStartOfTranslationUnit().
ExprResult Sema::ActOnGNUNullExpr | ( | SourceLocation | TokenLoc | ) |
Definition at line 14190 of file SemaExpr.cpp.
StmtResult Sema::ActOnGotoStmt | ( | SourceLocation | GotoLoc, |
SourceLocation | LabelLoc, | ||
LabelDecl * | TheDecl | ||
) |
Definition at line 2834 of file SemaStmt.cpp.
References clang::Decl::markUsed().
ExprResult Sema::ActOnIdExpression | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
UnqualifiedId & | Id, | ||
bool | HasTrailingLParen, | ||
bool | IsAddressOfOperand, | ||
CorrectionCandidateCallback * | CCC = nullptr , |
||
bool | IsInlineAsmIdentifier = false , |
||
Token * | KeywordReplacement = nullptr |
||
) |
Definition at line 2169 of file SemaExpr.cpp.
References clang::ExprError(), and clang::CXXScopeSpec::isInvalid().
Referenced by HandleAddressSpaceTypeAttribute(), HandleExtVectorTypeAttr(), and HandleVectorSizeAttr().
StmtResult Sema::ActOnIfStmt | ( | SourceLocation | IfLoc, |
bool | IsConstexpr, | ||
Stmt * | InitStmt, | ||
ConditionResult | Cond, | ||
Stmt * | ThenVal, | ||
SourceLocation | ElseLoc, | ||
Stmt * | ElseVal | ||
) |
Definition at line 526 of file SemaStmt.cpp.
References clang::Sema::ConditionResult::isInvalid().
StmtResult Sema::ActOnIndirectGotoStmt | ( | SourceLocation | GotoLoc, |
SourceLocation | StarLoc, | ||
Expr * | DestExp | ||
) |
Definition at line 2843 of file SemaStmt.cpp.
References clang::Expr::getType(), and clang::Expr::isTypeDependent().
void Sema::ActOnInitializerError | ( | Decl * | D | ) |
ActOnInitializerError - Given that there was an error parsing an initializer for the given declaration, try to return to some form of sanity.
Definition at line 11804 of file SemaDecl.cpp.
References clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::Type::isDependentType(), clang::Decl::isInvalidDecl(), and clang::Decl::setInvalidDecl().
ExprResult Sema::ActOnInitList | ( | SourceLocation | LBraceLoc, |
MultiExprArg | InitArgList, | ||
SourceLocation | RBraceLoc | ||
) |
Definition at line 6104 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and result.
Referenced by CheckArrayDesignatorSyntax(), and clang::TreeTransform< Derived >::RebuildInitList().
ExprResult Sema::ActOnInstanceMessage | ( | Scope * | S, |
Expr * | Receiver, | ||
Selector | Sel, | ||
SourceLocation | LBracLoc, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
SourceLocation | RBracLoc, | ||
MultiExprArg | Args | ||
) |
Definition at line 3211 of file SemaExprObjC.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
ExprResult Sema::ActOnIntegerConstant | ( | SourceLocation | Loc, |
uint64_t | Val | ||
) |
Definition at line 3309 of file SemaExpr.cpp.
Referenced by checkArrayLikeDecomposition(), checkOpenMPLoop(), and FinishOpenMPLinearClause().
Decl * Sema::ActOnIvar | ( | Scope * | S, |
SourceLocation | DeclStart, | ||
Declarator & | D, | ||
Expr * | BitfieldWidth, | ||
tok::ObjCKeywordKind | Visibility | ||
) |
ActOnIvar - Each ivar field of an objective-c class is passed into this in order to create an IvarDecl object for it.
Definition at line 16063 of file SemaDecl.cpp.
StmtResult Sema::ActOnLabelStmt | ( | SourceLocation | IdentLoc, |
LabelDecl * | TheDecl, | ||
SourceLocation | ColonLoc, | ||
Stmt * | SubStmt | ||
) |
Definition at line 480 of file SemaStmt.cpp.
References Diag(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), and clang::LabelDecl::getStmt().
Referenced by clang::TreeTransform< Derived >::RebuildLabelStmt().
void Sema::ActOnLambdaError | ( | SourceLocation | StartLoc, |
Scope * | CurScope, | ||
bool | IsInstantiation = false |
||
) |
ActOnLambdaError - If there is an error parsing a lambda, this callback is invoked to pop the information about the lambda.
Definition at line 1198 of file SemaLambda.cpp.
References clang::RecordDecl::fields(), clang::Decl::getLocation(), clang::sema::LambdaScopeInfo::Lambda, and clang::Decl::setInvalidDecl().
Referenced by addConstevalToLambdaDeclSpecifier().
void Sema::ActOnLambdaExplicitTemplateParameterList | ( | SourceLocation | LAngleLoc, |
ArrayRef< NamedDecl *> | TParams, | ||
SourceLocation | RAngleLoc | ||
) |
This is called after parsing the explicit template parameter list on a lambda (if it exists) in C++2a.
Definition at line 490 of file SemaLambda.cpp.
References clang::sema::LambdaScopeInfo::ExplicitTemplateParamsRange, clang::sema::LambdaScopeInfo::NumExplicitTemplateParams, and clang::sema::LambdaScopeInfo::TemplateParams.
Referenced by addConstevalToLambdaDeclSpecifier().
ExprResult Sema::ActOnLambdaExpr | ( | SourceLocation | StartLoc, |
Stmt * | Body, | ||
Scope * | CurScope | ||
) |
ActOnLambdaExpr - This is called when the body of a lambda expression was successfully completed.
Definition at line 1496 of file SemaLambda.cpp.
References clang::sema::LambdaScopeInfo::CallOperator, and clang::Stmt::getEndLoc().
Referenced by addConstevalToLambdaDeclSpecifier().
|
inline |
void Sema::ActOnLastBitfield | ( | SourceLocation | DeclLoc, |
SmallVectorImpl< Decl *> & | AllIvarDecls | ||
) |
ActOnLastBitfield - This routine handles synthesized bitfields rules for class and class extensions.
For every class @interface and class extension @interface, if the last ivar is a bitfield of any type, then add an implicit char :0
ivar to the end of that interface.
Definition at line 16177 of file SemaDecl.cpp.
References clang::FieldDecl::isBitField(), and clang::FieldDecl::isZeroLengthBitField().
ExprResult Sema::ActOnMemberAccessExpr | ( | Scope * | S, |
Expr * | Base, | ||
SourceLocation | OpLoc, | ||
tok::TokenKind | OpKind, | ||
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
UnqualifiedId & | Id, | ||
Decl * | ObjCImpDecl | ||
) |
The main callback when the parser finds something like expression .
[nested-name-specifier] identifier expression -> [nested-name-specifier] identifier where 'identifier' encompasses a fairly broad spectrum of possibilities, including destructor and operator references.
OpKind | either tok::arrow or tok::period |
ObjCImpDecl | the current Objective-C @implementation decl; this is an ugly hack around the fact that Objective-C @implementations aren't properly put in the context chain |
Definition at line 1685 of file SemaExprMember.cpp.
References Diag(), clang::ExprError(), clang::SourceRange::getBegin(), clang::UnqualifiedId::getKind(), clang::UnqualifiedId::getSourceRange(), clang::IK_ConstructorName, clang::CXXScopeSpec::isInvalid(), and clang::CXXScopeSpec::isSet().
MemInitResult Sema::ActOnMemInitializer | ( | Decl * | ConstructorD, |
Scope * | S, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | MemberOrBase, | ||
ParsedType | TemplateTypeTy, | ||
const DeclSpec & | DS, | ||
SourceLocation | IdLoc, | ||
SourceLocation | LParenLoc, | ||
ArrayRef< Expr *> | Args, | ||
SourceLocation | RParenLoc, | ||
SourceLocation | EllipsisLoc | ||
) |
Handle a C++ member initializer using parentheses syntax.
Definition at line 3792 of file SemaDeclCXX.cpp.
MemInitResult Sema::ActOnMemInitializer | ( | Decl * | ConstructorD, |
Scope * | S, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | MemberOrBase, | ||
ParsedType | TemplateTypeTy, | ||
const DeclSpec & | DS, | ||
SourceLocation | IdLoc, | ||
Expr * | InitList, | ||
SourceLocation | EllipsisLoc | ||
) |
Handle a C++ member initializer using braced-init-list syntax.
Definition at line 3776 of file SemaDeclCXX.cpp.
void Sema::ActOnMemInitializers | ( | Decl * | ConstructorDecl, |
SourceLocation | ColonLoc, | ||
ArrayRef< CXXCtorInitializer *> | MemInits, | ||
bool | AnyErrors | ||
) |
ActOnMemInitializers - Handle the member initializers for a constructor.
Definition at line 5109 of file SemaDeclCXX.cpp.
References Diag(), GetKeyForMember(), i, clang::CXXCtorInitializer::isAnyMemberInitializer(), and clang::CXXCtorInitializer::setSourceOrder().
Decl * Sema::ActOnMethodDeclaration | ( | Scope * | S, |
SourceLocation | BeginLoc, | ||
SourceLocation | EndLoc, | ||
tok::TokenKind | MethodType, | ||
ObjCDeclSpec & | ReturnQT, | ||
ParsedType | ReturnType, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
Selector | Sel, | ||
ObjCArgInfo * | ArgInfo, | ||
DeclaratorChunk::ParamInfo * | CParamInfo, | ||
unsigned | CNumArgs, | ||
const ParsedAttributesView & | AttrList, | ||
tok::ObjCKeywordKind | MethodImplKind, | ||
bool | isVariadic, | ||
bool | MethodDefinition | ||
) |
Definition at line 4541 of file SemaDeclObjC.cpp.
void Sema::ActOnModuleBegin | ( | SourceLocation | DirectiveLoc, |
Module * | Mod | ||
) |
The parsed has entered a submodule.
Definition at line 438 of file SemaModule.cpp.
References checkModuleImportContext(), clang::Decl::Visible, and clang::Decl::VisibleWhenImported.
Referenced by clang::Parser::ParseTopLevelDecl().
Sema::DeclGroupPtrTy Sema::ActOnModuleDecl | ( | SourceLocation | StartLoc, |
SourceLocation | ModuleLoc, | ||
ModuleDeclKind | MDK, | ||
ModuleIdPath | Path, | ||
bool | IsFirstDecl | ||
) |
The parser has processed a module-declaration that begins the definition of a module interface or implementation.
Definition at line 91 of file SemaModule.cpp.
References clang::Module::AllVisible, clang::LangOptions::CMK_HeaderModule, clang::LangOptions::CMK_ModuleInterface, clang::LangOptions::CMK_ModuleMap, clang::LangOptions::CMK_None, clang::FixItHint::CreateInsertion(), Diag(), clang::Module::GlobalModuleFragment, clang::SourceLocation::isValid(), and clang::Module::Module().
void Sema::ActOnModuleEnd | ( | SourceLocation | DirectiveLoc, |
Module * | Mod | ||
) |
The parser has left a submodule.
Definition at line 462 of file SemaModule.cpp.
References clang::Decl::Unowned.
Referenced by clang::Parser::ParseTopLevelDecl().
DeclResult Sema::ActOnModuleImport | ( | SourceLocation | StartLoc, |
SourceLocation | ExportLoc, | ||
SourceLocation | ImportLoc, | ||
ModuleIdPath | Path | ||
) |
The parser has processed a module import declaration.
StartLoc | The location of the first token in the declaration. This could be the location of an '@', 'export', or 'import'. |
ExportLoc | The location of the 'export' keyword, if any. |
ImportLoc | The location of the 'import' keyword. |
Path | The module access path. |
Definition at line 307 of file SemaModule.cpp.
References clang::Module::AllVisible.
DeclResult Sema::ActOnModuleImport | ( | SourceLocation | StartLoc, |
SourceLocation | ExportLoc, | ||
SourceLocation | ImportLoc, | ||
Module * | M, | ||
ModuleIdPath | Path = {} |
||
) |
Definition at line 341 of file SemaModule.cpp.
References checkModuleImportContext(), clang::ImportDecl::Create(), Diag(), clang::Module::getFullModuleName(), clang::Module::getTopLevelModuleName(), and clang::Module::Parent.
void Sema::ActOnModuleInclude | ( | SourceLocation | DirectiveLoc, |
Module * | Mod | ||
) |
The parser has processed a module import translated from a #include or similar preprocessing directive.
Definition at line 404 of file SemaModule.cpp.
References checkModuleImportContext().
Referenced by clang::Parser::ParseTopLevelDecl().
StmtResult Sema::ActOnMSAsmStmt | ( | SourceLocation | AsmLoc, |
SourceLocation | LBraceLoc, | ||
ArrayRef< Token > | AsmToks, | ||
StringRef | AsmString, | ||
unsigned | NumOutputs, | ||
unsigned | NumInputs, | ||
ArrayRef< StringRef > | Constraints, | ||
ArrayRef< StringRef > | Clobbers, | ||
ArrayRef< Expr *> | Exprs, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 875 of file SemaStmtAsm.cpp.
StmtResult Sema::ActOnMSDependentExistsStmt | ( | SourceLocation | KeywordLoc, |
bool | IsIfExists, | ||
CXXScopeSpec & | SS, | ||
UnqualifiedId & | Name, | ||
Stmt * | Nested | ||
) |
Definition at line 4190 of file SemaStmt.cpp.
ParsedType Sema::ActOnMSVCUnknownTypeName | ( | const IdentifierInfo & | II, |
SourceLocation | NameLoc, | ||
bool | IsTemplateTypeArg | ||
) |
Attempt to behave like MSVC in situations where lookup of an unqualified type name has failed in a dependent context.
In these situations, we automatically form a DependentTypeName that will retry lookup in a related scope during instantiation.
Definition at line 555 of file SemaDecl.cpp.
References synthesizeCurrentNestedNameSpecifier().
Decl * Sema::ActOnNamespaceAliasDef | ( | Scope * | CurScope, |
SourceLocation | NamespaceLoc, | ||
SourceLocation | AliasLoc, | ||
IdentifierInfo * | Alias, | ||
CXXScopeSpec & | SS, | ||
SourceLocation | IdentLoc, | ||
IdentifierInfo * | Ident | ||
) |
Definition at line 10706 of file SemaDeclCXX.cpp.
References clang::LookupResult::clear(), clang::NamespaceAliasDecl::Create(), Diag(), clang::LookupResult::empty(), clang::LookupResult::getFoundDecl(), clang::Decl::getLocation(), getNamespaceDecl(), clang::CXXScopeSpec::getRange(), clang::LookupResult::getRepresentativeDecl(), clang::NamedDecl::getUnderlyingDecl(), clang::LookupResult::isAmbiguous(), clang::LookupResult::isSingleResult(), clang::Decl::isTemplateParameter(), and TryNamespaceTypoCorrection().
ExprResult Sema::ActOnNoexceptExpr | ( | SourceLocation | KeyLoc, |
SourceLocation | LParen, | ||
Expr * | Operand, | ||
SourceLocation | RParen | ||
) |
Definition at line 7244 of file SemaExprCXX.cpp.
References BuildCXXNoexceptExpr().
ExprResult clang::Sema::ActOnNoexceptSpec | ( | SourceLocation | NoexceptLoc, |
Expr * | NoexceptExpr, | ||
ExceptionSpecificationType & | EST | ||
) |
Check the given noexcept-specifier, convert its expression, and compute the appropriate ExceptionSpecificationType.
Definition at line 78 of file SemaExceptionSpec.cpp.
References CheckBooleanCondition(), clang::EST_DependentNoexcept, clang::EST_NoexceptFalse, clang::EST_NoexceptTrue, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Result, and VerifyIntegerConstantExpression().
NamedDecl * Sema::ActOnNonTypeTemplateParameter | ( | Scope * | S, |
Declarator & | D, | ||
unsigned | Depth, | ||
unsigned | Position, | ||
SourceLocation | EqualLoc, | ||
Expr * | DefaultArg | ||
) |
Definition at line 1123 of file SemaTemplate.cpp.
StmtResult Sema::ActOnNullStmt | ( | SourceLocation | SemiLoc, |
bool | HasLeadingEmptyMacro = false |
||
) |
Definition at line 67 of file SemaStmt.cpp.
ExprResult Sema::ActOnNumericConstant | ( | const Token & | Tok, |
Scope * | UDLScope = nullptr |
||
) |
Definition at line 3375 of file SemaExpr.cpp.
References clang::ExprError(), clang::Token::getLength(), and clang::Token::getLocation().
StmtResult Sema::ActOnObjCAtCatchStmt | ( | SourceLocation | AtLoc, |
SourceLocation | RParen, | ||
Decl * | Parm, | ||
Stmt * | Body | ||
) |
Definition at line 3770 of file SemaStmt.cpp.
References clang::Decl::isInvalidDecl(), and clang::StmtError().
StmtResult Sema::ActOnObjCAtFinallyStmt | ( | SourceLocation | AtLoc, |
Stmt * | Body | ||
) |
Definition at line 3781 of file SemaStmt.cpp.
ExprResult Sema::ActOnObjCAtSynchronizedOperand | ( | SourceLocation | atLoc, |
Expr * | operand | ||
) |
Definition at line 3841 of file SemaStmt.cpp.
References Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::PointerType::getPointeeType(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isObjCObjectPointerType(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Type::isVoidType(), clang::ast_matchers::pointerType, and result.
StmtResult Sema::ActOnObjCAtSynchronizedStmt | ( | SourceLocation | AtLoc, |
Expr * | SynchExpr, | ||
Stmt * | SynchBody | ||
) |
Definition at line 3879 of file SemaStmt.cpp.
StmtResult Sema::ActOnObjCAtThrowStmt | ( | SourceLocation | AtLoc, |
Expr * | Throw, | ||
Scope * | CurScope | ||
) |
Definition at line 3823 of file SemaStmt.cpp.
References Diag(), clang::Scope::getParent(), clang::Scope::isAtCatchScope(), and clang::StmtError().
StmtResult Sema::ActOnObjCAtTryStmt | ( | SourceLocation | AtLoc, |
Stmt * | Try, | ||
MultiStmtArg | Catch, | ||
Stmt * | Finally | ||
) |
Definition at line 3786 of file SemaStmt.cpp.
References clang::ObjCAtTryStmt::Create(), and Diag().
StmtResult Sema::ActOnObjCAutoreleasePoolStmt | ( | SourceLocation | AtLoc, |
Stmt * | Body | ||
) |
Definition at line 3897 of file SemaStmt.cpp.
ExprResult Sema::ActOnObjCAvailabilityCheckExpr | ( | llvm::ArrayRef< AvailabilitySpec > | AvailSpecs, |
SourceLocation | AtLoc, | ||
SourceLocation | RParen | ||
) |
Definition at line 17587 of file SemaExpr.cpp.
References clang::AvailabilitySpec::getPlatform(), and clang::AvailabilitySpec::getVersion().
ExprResult Sema::ActOnObjCBoolLiteral | ( | SourceLocation | OpLoc, |
tok::TokenKind | Kind | ||
) |
ActOnObjCBoolLiteral - Parse {__objc_yes,__objc_no} literals.
Definition at line 17568 of file SemaExpr.cpp.
ExprResult Sema::ActOnObjCBoolLiteral | ( | SourceLocation | AtLoc, |
SourceLocation | ValueLoc, | ||
bool | Value | ||
) |
Definition at line 365 of file SemaExprObjC.cpp.
ExprResult Sema::ActOnObjCBridgedCast | ( | Scope * | S, |
SourceLocation | LParenLoc, | ||
ObjCBridgeCastKind | Kind, | ||
SourceLocation | BridgeKeywordLoc, | ||
ParsedType | Type, | ||
SourceLocation | RParenLoc, | ||
Expr * | SubExpr | ||
) |
Definition at line 4544 of file SemaExprObjC.cpp.
References clang::OBC_Bridge.
void Sema::ActOnObjCContainerFinishDefinition | ( | ) |
Definition at line 15544 of file SemaDecl.cpp.
Definition at line 15469 of file SemaDecl.cpp.
Referenced by ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), and ActOnStartProtocolInterface().
Decl * Sema::ActOnObjCExceptionDecl | ( | Scope * | S, |
Declarator & | D | ||
) |
Definition at line 4899 of file SemaDeclObjC.cpp.
StmtResult Sema::ActOnObjCForCollectionStmt | ( | SourceLocation | ForColLoc, |
Stmt * | First, | ||
Expr * | collection, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 1865 of file SemaStmt.cpp.
References Diag(), clang::Type::getContainedAutoType(), clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::VarDecl::hasLocalStorage(), clang::Decl::isInvalidDecl(), and clang::StmtError().
ParsedType Sema::ActOnObjCInstanceType | ( | SourceLocation | Loc | ) |
The parser has parsed the context-sensitive type 'instancetype' in an Objective-C message declaration.
Return the appropriate type.
Definition at line 5844 of file SemaType.cpp.
TypeResult Sema::actOnObjCProtocolQualifierType | ( | SourceLocation | lAngleLoc, |
ArrayRef< Decl *> | protocols, | ||
ArrayRef< SourceLocation > | protocolLocs, | ||
SourceLocation | rAngleLoc | ||
) |
Build a an Objective-C protocol-qualified 'id' type where no base type was specified.
Definition at line 1097 of file SemaType.cpp.
References clang::Result.
void Sema::ActOnObjCReenterContainerContext | ( | DeclContext * | DC | ) |
Definition at line 15555 of file SemaDecl.cpp.
Referenced by clang::Parser::getTypeAnnotation().
void Sema::ActOnObjCTemporaryExitContainerContext | ( | DeclContext * | DC | ) |
Invoked when we must temporarily exit the objective-c container scope for parsing/looking-up C constructs.
Must be followed by a call to
Definition at line 15549 of file SemaDecl.cpp.
Referenced by clang::Parser::getTypeAnnotation().
TypeResult Sema::actOnObjCTypeArgsAndProtocolQualifiers | ( | Scope * | S, |
SourceLocation | Loc, | ||
ParsedType | BaseType, | ||
SourceLocation | TypeArgsLAngleLoc, | ||
ArrayRef< ParsedType > | TypeArgs, | ||
SourceLocation | TypeArgsRAngleLoc, | ||
SourceLocation | ProtocolLAngleLoc, | ||
ArrayRef< Decl *> | Protocols, | ||
ArrayRef< SourceLocation > | ProtocolLocs, | ||
SourceLocation | ProtocolRAngleLoc | ||
) |
Build a specialized and/or protocol-qualified Objective-C type.
Definition at line 1136 of file SemaType.cpp.
void Sema::actOnObjCTypeArgsOrProtocolQualifiers | ( | Scope * | S, |
ParsedType | baseType, | ||
SourceLocation | lAngleLoc, | ||
ArrayRef< IdentifierInfo *> | identifiers, | ||
ArrayRef< SourceLocation > | identifierLocs, | ||
SourceLocation | rAngleLoc, | ||
SourceLocation & | typeArgsLAngleLoc, | ||
SmallVectorImpl< ParsedType > & | typeArgs, | ||
SourceLocation & | typeArgsRAngleLoc, | ||
SourceLocation & | protocolLAngleLoc, | ||
SmallVectorImpl< Decl *> & | protocols, | ||
SourceLocation & | protocolRAngleLoc, | ||
bool | warnOnIncompleteProtocols | ||
) |
Given a list of identifiers (and their locations), resolve the names to either Objective-C protocol qualifiers or type arguments, as appropriate.
Definition at line 1405 of file SemaDeclObjC.cpp.
DeclResult Sema::actOnObjCTypeParam | ( | Scope * | S, |
ObjCTypeParamVariance | variance, | ||
SourceLocation | varianceLoc, | ||
unsigned | index, | ||
IdentifierInfo * | paramName, | ||
SourceLocation | paramLoc, | ||
SourceLocation | colonLoc, | ||
ParsedType | typeBound | ||
) |
Definition at line 665 of file SemaDeclObjC.cpp.
ObjCTypeParamList * Sema::actOnObjCTypeParamList | ( | Scope * | S, |
SourceLocation | lAngleLoc, | ||
ArrayRef< Decl *> | typeParams, | ||
SourceLocation | rAngleLoc | ||
) |
Definition at line 769 of file SemaDeclObjC.cpp.
ExprResult Sema::ActOnOMPArraySectionExpr | ( | Expr * | Base, |
SourceLocation | LBLoc, | ||
Expr * | LowerBound, | ||
SourceLocation | ColonLoc, | ||
Expr * | Length, | ||
SourceLocation | RBLoc | ||
) |
Definition at line 4431 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isNonOverloadPlaceholderType(), clang::Type::isPlaceholderType(), clang::Type::isSpecificPlaceholderType(), clang::Expr::isTypeDependent(), and clang::Expr::isValueDependent().
OMPClause * Sema::ActOnOpenMPAlignedClause | ( | ArrayRef< Expr *> | VarList, |
Expr * | Alignment, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'aligned' clause.
Definition at line 12815 of file SemaOpenMP.cpp.
References Diag(), clang::QualType::getCanonicalType(), clang::QualType::getNonReferenceType(), getPrivateItem(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::Type::isArrayType(), and clang::Type::isPointerType().
OMPClause * Sema::ActOnOpenMPAllocateClause | ( | Expr * | Allocator, |
ArrayRef< Expr *> | VarList, | ||
SourceLocation | StartLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'allocate' clause.
Definition at line 15250 of file SemaOpenMP.cpp.
Sema::DeclGroupPtrTy Sema::ActOnOpenMPAllocateDirective | ( | SourceLocation | Loc, |
ArrayRef< Expr *> | VarList, | ||
ArrayRef< OMPClause *> | Clauses, | ||
DeclContext * | Owner = nullptr |
||
) |
Called on well-formed '#pragma omp allocate'.
Definition at line 2421 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPAllocatorClause | ( | Expr * | Allocator, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'allocator' clause.
Definition at line 10063 of file SemaOpenMP.cpp.
References DSAStack, findOMPAllocatorHandleT(), and clang::Expr::getExprLoc().
OMPClause * Sema::ActOnOpenMPAtomicDefaultMemOrderClause | ( | OpenMPAtomicDefaultMemOrderClauseKind | Kind, |
SourceLocation | KindLoc, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'atomic_default_mem_order' clause.
Definition at line 10273 of file SemaOpenMP.cpp.
References Diag(), getListOfPossibleValues(), clang::getOpenMPClauseName(), and clang::OMPC_ATOMIC_DEFAULT_MEM_ORDER_unknown.
StmtResult Sema::ActOnOpenMPAtomicDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp atomic' after parsing of the associated statement.
Definition at line 7501 of file SemaOpenMP.cpp.
References clang::C, Diag(), clang::First, clang::Stmt::getBeginLoc(), clang::CapturedStmt::getCapturedStmt(), clang::Expr::getExprLoc(), clang::BinaryOperator::getExprLoc(), clang::BinaryOperator::getLHS(), clang::BinaryOperator::getOpcode(), clang::getOpenMPClauseName(), clang::BinaryOperator::getOperatorLoc(), clang::BinaryOperator::getRHS(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Expr::IgnoreParenImpCasts(), clang::Expr::isInstantiationDependent(), clang::Expr::isLValue(), clang::Type::isScalarType(), clang::OMPC_unknown, clang::StmtError(), V, and X.
StmtResult Sema::ActOnOpenMPBarrierDirective | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp barrier'.
Definition at line 7149 of file SemaOpenMP.cpp.
References clang::OMPBarrierDirective::Create().
StmtResult Sema::ActOnOpenMPCancelDirective | ( | ArrayRef< OMPClause *> | Clauses, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
OpenMPDirectiveKind | CancelRegion | ||
) |
Called on well-formed '#pragma omp cancel'.
Definition at line 8265 of file SemaOpenMP.cpp.
References clang::OMPCancelDirective::Create(), Diag(), DSAStack, and clang::StmtError().
StmtResult Sema::ActOnOpenMPCancellationPointDirective | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc, | ||
OpenMPDirectiveKind | CancelRegion | ||
) |
Called on well-formed '#pragma omp cancellation point'.
Definition at line 8250 of file SemaOpenMP.cpp.
References clang::OMPCancellationPointDirective::Create(), Diag(), DSAStack, and clang::StmtError().
OMPClause * Sema::ActOnOpenMPCaptureClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'capture' clause.
Definition at line 10624 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPClause | ( | OpenMPClauseKind | Kind, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 10493 of file SemaOpenMP.cpp.
References clang::OMPC_threadprivate, clang::OMPC_uniform, and clang::OMPC_unknown.
OMPClause * Sema::ActOnOpenMPCollapseClause | ( | Expr * | NumForLoops, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'collapse' clause.
Definition at line 10084 of file SemaOpenMP.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
OMPClause * Sema::ActOnOpenMPCopyinClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'copyin' clause.
Definition at line 12889 of file SemaOpenMP.cpp.
References Diag(), DSAStack, clang::getOpenMPClauseName(), and clang::getOpenMPDirectiveName().
OMPClause * Sema::ActOnOpenMPCopyprivateClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'copyprivate' clause.
Definition at line 12983 of file SemaOpenMP.cpp.
References Diag(), DSAStack, clang::getOpenMPClauseName(), clang::getOpenMPDirectiveName(), getPrivateItem(), clang::ValueDecl::getType(), clang::Type::isAnyPointerType(), clang::Type::isVariablyModifiedType(), clang::OMPC_unknown, and reportOriginalDsa().
StmtResult Sema::ActOnOpenMPCriticalDirective | ( | const DeclarationNameInfo & | DirName, |
ArrayRef< OMPClause *> | Clauses, | ||
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp critical' after parsing of the associated statement.
Definition at line 6939 of file SemaOpenMP.cpp.
References clang::C, Diag(), clang::Expr::EvaluateKnownConstInt(), clang::DeclarationNameInfo::getName(), clang::Expr::isInstantiationDependent(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), and clang::StmtError().
Sema::DeclGroupPtrTy Sema::ActOnOpenMPDeclareMapperDirectiveEnd | ( | OMPDeclareMapperDecl * | D, |
Scope * | S, | ||
ArrayRef< OMPClause *> | ClauseList | ||
) |
Called at the end of '#pragma omp declare mapper'.
Definition at line 14692 of file SemaOpenMP.cpp.
References clang::OMPDeclareMapperDecl::CreateClauses().
OMPDeclareMapperDecl * Sema::ActOnOpenMPDeclareMapperDirectiveStart | ( | Scope * | S, |
DeclContext * | DC, | ||
DeclarationName | Name, | ||
QualType | MapperType, | ||
SourceLocation | StartLoc, | ||
DeclarationName | VN, | ||
AccessSpecifier | AS, | ||
Decl * | PrevDeclInScope = nullptr |
||
) |
Called on start of '#pragma omp declare mapper'.
Definition at line 14599 of file SemaOpenMP.cpp.
void Sema::ActOnOpenMPDeclareMapperDirectiveVarDecl | ( | OMPDeclareMapperDecl * | DMD, |
Scope * | S, | ||
QualType | MapperType, | ||
SourceLocation | StartLoc, | ||
DeclarationName | VN | ||
) |
Build the mapper variable of '#pragma omp declare mapper'.
Definition at line 14677 of file SemaOpenMP.cpp.
References clang::DeclContext::addDecl(), buildDeclRefExpr(), buildVarDecl(), clang::DeclarationName::getAsString(), and clang::OMPDeclareMapperDecl::setMapperVarRef().
QualType Sema::ActOnOpenMPDeclareMapperType | ( | SourceLocation | TyLoc, |
TypeResult | ParsedType | ||
) |
Check if the specified type is allowed to be used in 'omp declare mapper' construct.
Definition at line 14583 of file SemaOpenMP.cpp.
References Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isUsable().
TypeResult Sema::ActOnOpenMPDeclareMapperVarDecl | ( | Scope * | S, |
Declarator & | D | ||
) |
Check variable declaration in 'omp declare mapper' construct.
Definition at line 14569 of file SemaOpenMP.cpp.
References clang::TypeSourceInfo::getType(), and clang::Declarator::isInvalidType().
Finish current declare reduction construct initializer.
Definition at line 14473 of file SemaOpenMP.cpp.
Initialize declare reduction construct initializer.
Definition at line 14426 of file SemaOpenMP.cpp.
References buildDeclRefExpr(), buildVarDecl(), and clang::Decl::getLocation().
Sema::DeclGroupPtrTy Sema::ActOnOpenMPDeclareReductionDirectiveEnd | ( | Scope * | S, |
DeclGroupPtrTy | DeclReductions, | ||
bool | IsValid | ||
) |
Called at the end of '#pragma omp declare reduction'.
Definition at line 14555 of file SemaOpenMP.cpp.
References clang::OpaquePtr< PtrTy >::get(), and clang::Decl::setInvalidDecl().
Sema::DeclGroupPtrTy Sema::ActOnOpenMPDeclareReductionDirectiveStart | ( | Scope * | S, |
DeclContext * | DC, | ||
DeclarationName | Name, | ||
ArrayRef< std::pair< QualType, SourceLocation >> | ReductionTypes, | ||
AccessSpecifier | AS, | ||
Decl * | PrevDeclInScope = nullptr |
||
) |
Called on start of '#pragma omp declare reduction'.
Definition at line 14344 of file SemaOpenMP.cpp.
void Sema::ActOnOpenMPDeclareReductionInitializerEnd | ( | Decl * | D, |
Expr * | Initializer, | ||
VarDecl * | OmpPrivParm | ||
) |
Finish current declare reduction construct initializer.
Definition at line 14534 of file SemaOpenMP.cpp.
References clang::OMPDeclareReductionDecl::CallInit, clang::OMPDeclareReductionDecl::CopyInit, clang::OMPDeclareReductionDecl::DirectInit, clang::VarDecl::getInit(), clang::VarDecl::hasInit(), and clang::VarDecl::isDirectInit().
Initialize declare reduction construct initializer.
Definition at line 14487 of file SemaOpenMP.cpp.
References buildDeclRefExpr(), buildVarDecl(), and clang::Decl::getLocation().
QualType Sema::ActOnOpenMPDeclareReductionType | ( | SourceLocation | TyLoc, |
TypeResult | ParsedType | ||
) |
Check if the specified type is allowed to be used in 'omp declare reduction' construct.
Definition at line 14312 of file SemaOpenMP.cpp.
References Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isUsable().
Sema::DeclGroupPtrTy Sema::ActOnOpenMPDeclareSimdDirective | ( | DeclGroupPtrTy | DG, |
OMPDeclareSimdDeclAttr::BranchStateTy | BS, | ||
Expr * | Simdlen, | ||
ArrayRef< Expr *> | Uniforms, | ||
ArrayRef< Expr *> | Aligneds, | ||
ArrayRef< Expr *> | Alignments, | ||
ArrayRef< Expr *> | Linears, | ||
ArrayRef< unsigned > | LinModifiers, | ||
ArrayRef< Expr *> | Steps, | ||
SourceRange | SR | ||
) |
Called on well-formed '#pragma omp declare simd' after parsing of the associated method/function.
Definition at line 4444 of file SemaOpenMP.cpp.
References clang::Expr::containsUnexpandedParameterPack(), Diag(), clang::OpaquePtr< PtrTy >::get(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceRange::getBegin(), getCanonicalDecl(), clang::Decl::getCanonicalDecl(), clang::VarDecl::getCanonicalDecl(), clang::Expr::getExprLoc(), clang::Decl::getLocation(), clang::getOpenMPClauseName(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::ValueDecl::getType(), clang::QualType::getTypePtrOrNull(), clang::Type::hasIntegerRepresentation(), clang::Expr::IgnoreParenImpCasts(), clang::Type::isArrayType(), clang::Expr::isInstantiationDependent(), clang::Type::isPointerType(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), clang::OMPC_uniform, and Step.
void Sema::ActOnOpenMPDeclareTargetName | ( | Scope * | CurScope, |
CXXScopeSpec & | ScopeSpec, | ||
const DeclarationNameInfo & | Id, | ||
OMPDeclareTargetDeclAttr::MapTypeTy | MT, | ||
NamedDeclSetType & | SameDirectiveDecls | ||
) |
Called on correct id-expression from the '#pragma omp declare target'.
Definition at line 14925 of file SemaOpenMP.cpp.
References Diag(), clang::LookupResult::getAsSingle(), clang::Decl::getCanonicalDecl(), clang::DeclarationNameInfo::getLoc(), clang::DeclarationNameInfo::getName(), clang::LookupResult::isAmbiguous(), clang::LookupResult::isSingleResult(), and clang::LookupResult::suppressDiagnostics().
OMPClause * Sema::ActOnOpenMPDefaultClause | ( | OpenMPDefaultClauseKind | Kind, |
SourceLocation | KindLoc, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'default' clause.
Definition at line 10228 of file SemaOpenMP.cpp.
References Diag(), DSAStack, getListOfPossibleValues(), clang::getOpenMPClauseName(), and clang::OMPC_DEFAULT_unknown.
OMPClause * Sema::ActOnOpenMPDefaultmapClause | ( | OpenMPDefaultmapClauseModifier | M, |
OpenMPDefaultmapClauseKind | Kind, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | MLoc, | ||
SourceLocation | KindLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'defaultmap' clause.
Definition at line 14874 of file SemaOpenMP.cpp.
References Diag(), DSAStack, clang::getOpenMPClauseName(), and clang::getOpenMPSimpleClauseTypeName().
OMPClause * Sema::ActOnOpenMPDependClause | ( | OpenMPDependClauseKind | DepKind, |
SourceLocation | DepLoc, | ||
SourceLocation | ColonLoc, | ||
ArrayRef< Expr *> | VarList, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'depend' clause.
Definition at line 13107 of file SemaOpenMP.cpp.
References Diag(), DSAStack, getListOfPossibleValues(), clang::getOpenMPClauseName(), and clang::OMPC_DEPEND_unknown.
OMPClause * Sema::ActOnOpenMPDeviceClause | ( | Expr * | Device, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'device' clause.
Definition at line 13270 of file SemaOpenMP.cpp.
References buildPreInits(), DSAStack, getOpenMPCaptureRegionForClause(), isNonNegativeIntegerValue(), and clang::OMPD_unknown.
StmtResult Sema::ActOnOpenMPDistributeDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp distribute' after parsing of the associated statement.
Definition at line 8418 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), checkOpenMPLoop(), clang::OMPDistributeDirective::Create(), DSAStack, getCollapseNumberExpr(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPDistributeParallelForDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp distribute parallel for' after parsing of the associated statement.
Definition at line 8443 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), checkOpenMPLoop(), clang::OMPDistributeParallelForDirective::Create(), DSAStack, clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPDistributeParallelForSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp distribute parallel for simd' after parsing of the associated statement.
Definition at line 8487 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPDistributeParallelForSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPDistributeSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp distribute simd' after parsing of the associated statement.
Definition at line 8544 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPDistributeSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
OMPClause * Sema::ActOnOpenMPDistScheduleClause | ( | OpenMPDistScheduleClauseKind | Kind, |
Expr * | ChunkSize, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | KindLoc, | ||
SourceLocation | CommaLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'dist_schedule' clause.
Definition at line 14820 of file SemaOpenMP.cpp.
References clang::Expr::containsUnexpandedParameterPack(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), clang::getOpenMPClauseName(), clang::getOpenMPSimpleClauseTypeName(), clang::Expr::isInstantiationDependent(), clang::Expr::isIntegerConstantExpr(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), clang::OMPC_DIST_SCHEDULE_unknown, and clang::Result.
OMPClause * Sema::ActOnOpenMPDynamicAllocatorsClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'dynamic_allocators' clause.
Definition at line 10664 of file SemaOpenMP.cpp.
StmtResult Sema::ActOnOpenMPExecutableDirective | ( | OpenMPDirectiveKind | Kind, |
const DeclarationNameInfo & | DirName, | ||
OpenMPDirectiveKind | CancelRegion, | ||
ArrayRef< OMPClause *> | Clauses, | ||
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 3992 of file SemaOpenMP.cpp.
References checkCancelRegion(), checkNestingOfRegions(), DSAStack, and clang::StmtError().
OMPClause * Sema::ActOnOpenMPFinalClause | ( | Expr * | Condition, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'final' clause.
Definition at line 9847 of file SemaOpenMP.cpp.
References clang::Expr::containsUnexpandedParameterPack(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::isInstantiationDependent(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), and clang::Expr::isValueDependent().
OMPClause * Sema::ActOnOpenMPFirstprivateClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'firstprivate' clause.
Definition at line 10972 of file SemaOpenMP.cpp.
References DSAStack, clang::QualType::getNonReferenceType(), getPrivateItem(), clang::ValueDecl::getType(), Inits, and clang::SourceLocation::isInvalid().
OMPClause * Sema::ActOnOpenMPFlushClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'flush' pseudo clause.
Definition at line 13096 of file SemaOpenMP.cpp.
References OMPFlushClause::Create().
StmtResult Sema::ActOnOpenMPFlushDirective | ( | ArrayRef< OMPClause *> | Clauses, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp flush'.
Definition at line 7175 of file SemaOpenMP.cpp.
References clang::OMPFlushDirective::Create().
StmtResult Sema::ActOnOpenMPForDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp for' after parsing of the associated statement.
Definition at line 6768 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), clang::OMPForDirective::Create(), DSAStack, FinishOpenMPLinearClause(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, and clang::StmtError().
StmtResult Sema::ActOnOpenMPForSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp for simd' after parsing of the associated statement.
Definition at line 6803 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPForSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, and clang::StmtError().
OMPClause * Sema::ActOnOpenMPFromClause | ( | ArrayRef< Expr *> | VarList, |
CXXScopeSpec & | MapperIdScopeSpec, | ||
DeclarationNameInfo & | MapperId, | ||
const OMPVarListLocTy & | Locs, | ||
ArrayRef< Expr *> | UnresolvedMappers = llvm::None |
||
) |
Called on well-formed 'from' clause.
Definition at line 15066 of file SemaOpenMP.cpp.
References checkMappableExpressionList(), OMPFromClause::Create(), DSAStack, and clang::OMPVarListLocTy::StartLoc.
OMPClause * Sema::ActOnOpenMPGrainsizeClause | ( | Expr * | Size, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'grainsize' clause.
Definition at line 14775 of file SemaOpenMP.cpp.
References isNonNegativeIntegerValue().
OMPClause * Sema::ActOnOpenMPHintClause | ( | Expr * | Hint, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'hint' clause.
Definition at line 14807 of file SemaOpenMP.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
ExprResult Sema::ActOnOpenMPIdExpression | ( | Scope * | CurScope, |
CXXScopeSpec & | ScopeSpec, | ||
const DeclarationNameInfo & | Id, | ||
OpenMPDirectiveKind | Kind | ||
) |
Called on correct id-expression from the '#pragma omp threadprivate'.
Definition at line 2080 of file SemaOpenMP.cpp.
References Diag(), clang::LookupResult::empty(), clang::ExprError(), clang::LookupResult::getAsSingle(), clang::LookupResult::getFoundDecl(), clang::DeclarationNameInfo::getLoc(), clang::Decl::getLocation(), clang::DeclarationNameInfo::getName(), clang::getOpenMPDirectiveName(), clang::VarDecl::hasGlobalStorage(), clang::LookupResult::isAmbiguous(), clang::LookupResult::isSingleResult(), clang::VarDecl::isStaticLocal(), clang::VarDecl::isThisDeclarationADefinition(), and clang::LookupResult::suppressDiagnostics().
OMPClause * Sema::ActOnOpenMPIfClause | ( | OpenMPDirectiveKind | NameModifier, |
Expr * | Condition, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | NameModifierLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'if' clause.
Definition at line 9813 of file SemaOpenMP.cpp.
References buildPreInits(), clang::Expr::containsUnexpandedParameterPack(), DSAStack, clang::ActionResult< PtrTy, CompressInvalid >::get(), getOpenMPCaptureRegionForClause(), clang::Expr::isInstantiationDependent(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), and clang::OMPD_unknown.
OMPClause * Sema::ActOnOpenMPInReductionClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | EndLoc, | ||
CXXScopeSpec & | ReductionIdScopeSpec, | ||
const DeclarationNameInfo & | ReductionId, | ||
ArrayRef< Expr *> | UnresolvedReductions = llvm::None |
||
) |
Called on well-formed 'in_reduction' clause.
Definition at line 12516 of file SemaOpenMP.cpp.
References actOnOMPReductionKindClause(), clang::OMPInReductionClause::Create(), and DSAStack.
OMPClause * Sema::ActOnOpenMPIsDevicePtrClause | ( | ArrayRef< Expr *> | VarList, |
const OMPVarListLocTy & | Locs | ||
) |
Called on well-formed 'is_device_ptr' clause.
Definition at line 15168 of file SemaOpenMP.cpp.
References OMPIsDevicePtrClause::Create(), Diag(), DSAStack, clang::Expr::getExprLoc(), clang::QualType::getNonReferenceType(), clang::getOpenMPClauseName(), clang::getOpenMPDirectiveName(), getPrivateItem(), clang::Stmt::getSourceRange(), clang::ValueDecl::getType(), clang::Type::isArrayType(), clang::isOpenMPPrivate(), clang::Type::isPointerType(), and reportOriginalDsa().
OMPClause * Sema::ActOnOpenMPLastprivateClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'lastprivate' clause.
Definition at line 11243 of file SemaOpenMP.cpp.
References Diag(), DSAStack, clang::QualType::getNonReferenceType(), clang::getOpenMPClauseName(), getPrivateItem(), clang::ValueDecl::getType(), clang::isOpenMPDistributeDirective(), clang::isOpenMPParallelDirective(), clang::isOpenMPTeamsDirective(), clang::isOpenMPWorksharingDirective(), clang::OMPC_unknown, rejectConstNotMutableType(), and reportOriginalDsa().
OMPClause * Sema::ActOnOpenMPLinearClause | ( | ArrayRef< Expr *> | VarList, |
Expr * | Step, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
OpenMPLinearClauseKind | LinKind, | ||
SourceLocation | LinLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'linear' clause.
Definition at line 12587 of file SemaOpenMP.cpp.
References buildCapture(), buildDeclRefExpr(), buildVarDecl(), CalcStep, clang::Expr::containsUnexpandedParameterPack(), Diag(), DSAStack, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Decl::getAttrs(), clang::Stmt::getBeginLoc(), clang::QualType::getCanonicalType(), clang::DeclRefExpr::getDecl(), clang::NamedDecl::getName(), clang::QualType::getNonReferenceType(), clang::getOpenMPClauseName(), getPrivateItem(), clang::Expr::getType(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::Decl::hasAttr(), clang::Decl::hasAttrs(), Inits, clang::Expr::isInstantiationDependent(), clang::Expr::isIntegerConstantExpr(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Expr::isValueDependent(), Privates, reportOriginalDsa(), clang::Result, and Step.
void Sema::ActOnOpenMPLoopInitialization | ( | SourceLocation | ForLoc, |
Stmt * | Init | ||
) |
Check if the current region is an OpenMP loop region and if it is, mark loop control variable, used in Init
for loop initialization, as private by default.
Init | First part of the for loop. |
Definition at line 5611 of file SemaOpenMP.cpp.
References buildCapture(), buildDeclRefExpr(), DSAStack, clang::Decl::getCanonicalDecl(), and clang::isOpenMPLoopDirective().
OMPClause * Sema::ActOnOpenMPMapClause | ( | ArrayRef< OpenMPMapModifierKind > | MapTypeModifiers, |
ArrayRef< SourceLocation > | MapTypeModifiersLoc, | ||
CXXScopeSpec & | MapperIdScopeSpec, | ||
DeclarationNameInfo & | MapperId, | ||
OpenMPMapClauseKind | MapType, | ||
bool | IsMapTypeImplicit, | ||
SourceLocation | MapLoc, | ||
SourceLocation | ColonLoc, | ||
ArrayRef< Expr *> | VarList, | ||
const OMPVarListLocTy & | Locs, | ||
ArrayRef< Expr *> | UnresolvedMappers = llvm::None |
||
) |
Called on well-formed 'map' clause.
Definition at line 14271 of file SemaOpenMP.cpp.
References checkMappableExpressionList(), OMPMapClause::Create(), Diag(), DSAStack, OMPMapClause::NumberOfModifiers, clang::OMPC_MAP_MODIFIER_unknown, and clang::OMPVarListLocTy::StartLoc.
StmtResult Sema::ActOnOpenMPMasterDirective | ( | Stmt * | AStmt, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp master' after parsing of the associated statement.
Definition at line 6926 of file SemaOpenMP.cpp.
References clang::OMPMasterDirective::Create(), and clang::StmtError().
OMPClause * Sema::ActOnOpenMPMergeableClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'mergeable' clause.
Definition at line 10604 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPNogroupClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'nogroup' clause.
Definition at line 10644 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPNowaitClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'nowait' clause.
Definition at line 10593 of file SemaOpenMP.cpp.
References DSAStack.
OMPClause * Sema::ActOnOpenMPNumTasksClause | ( | Expr * | NumTasks, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'num_tasks' clause.
Definition at line 14791 of file SemaOpenMP.cpp.
References isNonNegativeIntegerValue().
OMPClause * Sema::ActOnOpenMPNumTeamsClause | ( | Expr * | NumTeams, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'num_teams' clause.
Definition at line 14706 of file SemaOpenMP.cpp.
References buildPreInits(), DSAStack, getOpenMPCaptureRegionForClause(), isNonNegativeIntegerValue(), and clang::OMPD_unknown.
OMPClause * Sema::ActOnOpenMPNumThreadsClause | ( | Expr * | NumThreads, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'num_threads' clause.
Definition at line 9935 of file SemaOpenMP.cpp.
References buildPreInits(), DSAStack, getOpenMPCaptureRegionForClause(), isNonNegativeIntegerValue(), and clang::OMPD_unknown.
OMPClause * Sema::ActOnOpenMPOrderedClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc, | ||
SourceLocation | LParenLoc = SourceLocation() , |
||
Expr * | NumForLoops = nullptr |
||
) |
Called on well-formed 'ordered' clause.
Definition at line 10101 of file SemaOpenMP.cpp.
References clang::OMPOrderedClause::Create(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::SourceLocation::isValid().
StmtResult Sema::ActOnOpenMPOrderedDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp ordered' after parsing of the associated statement.
Definition at line 7182 of file SemaOpenMP.cpp.
References clang::C, clang::OMPOrderedDirective::Create(), Diag(), DSAStack, clang::OMPClause::getBeginLoc(), clang::getOpenMPClauseName(), clang::getOpenMPDirectiveName(), clang::isOpenMPSimdDirective(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPParallelDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp parallel' after parsing of the associated statement.
Definition at line 4690 of file SemaOpenMP.cpp.
References clang::OMPParallelDirective::Create(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPParallelForDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp parallel for' after parsing of the associated statement.
Definition at line 6998 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), clang::OMPParallelForDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPParallelForSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp parallel for simd' after parsing of the associated statement.
Definition at line 7042 of file SemaOpenMP.cpp.
References clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPParallelForSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPParallelSectionsDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp parallel sections' after parsing of the associated statement.
Definition at line 7086 of file SemaOpenMP.cpp.
References clang::C, clang::OMPParallelSectionsDirective::Create(), Diag(), DSAStack, clang::Stmt::getBeginLoc(), clang::CapturedStmt::getCapturedStmt(), and clang::StmtError().
OMPClause * Sema::ActOnOpenMPPriorityClause | ( | Expr * | Priority, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'priority' clause.
Definition at line 14760 of file SemaOpenMP.cpp.
References isNonNegativeIntegerValue().
OMPClause * Sema::ActOnOpenMPPrivateClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'private' clause.
Definition at line 10818 of file SemaOpenMP.cpp.
References Diag(), DSAStack, clang::QualType::getNonReferenceType(), clang::getOpenMPClauseName(), clang::getOpenMPDirectiveName(), getPrivateItem(), clang::ValueDecl::getType(), clang::Type::isAnyPointerType(), clang::isOpenMPTaskingDirective(), clang::Type::isVariablyModifiedType(), clang::OMPC_unknown, rejectConstNotMutableType(), and reportOriginalDsa().
OMPClause * Sema::ActOnOpenMPProcBindClause | ( | OpenMPProcBindClauseKind | Kind, |
SourceLocation | KindLoc, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'proc_bind' clause.
Definition at line 10257 of file SemaOpenMP.cpp.
References Diag(), getListOfPossibleValues(), clang::getOpenMPClauseName(), and clang::OMPC_PROC_BIND_unknown.
OMPClause * Sema::ActOnOpenMPReadClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'read' clause.
Definition at line 10609 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPReductionClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | EndLoc, | ||
CXXScopeSpec & | ReductionIdScopeSpec, | ||
const DeclarationNameInfo & | ReductionId, | ||
ArrayRef< Expr *> | UnresolvedReductions = llvm::None |
||
) |
Called on well-formed 'reduction' clause.
Definition at line 12476 of file SemaOpenMP.cpp.
References actOnOMPReductionKindClause(), clang::OMPReductionClause::Create(), and DSAStack.
StmtResult Sema::ActOnOpenMPRegionEnd | ( | StmtResult | S, |
ArrayRef< OMPClause *> | Clauses | ||
) |
End of OpenMP region.
S | Statement associated with the current OpenMP region. |
Clauses | List of clauses for the current OpenMP region. |
Definition at line 3395 of file SemaOpenMP.cpp.
References clang::C, clang::OMPClause::children(), Diag(), DSAStack, clang::OMPClauseWithPreInit::get(), clang::OMPClauseWithPostUpdate::get(), clang::OMPClause::getClauseKind(), clang::OMPScheduleClause::getFirstScheduleModifier(), clang::OMPScheduleClause::getFirstScheduleModifierLoc(), clang::getOpenMPCaptureRegions(), clang::getOpenMPDirectiveName(), clang::OMPScheduleClause::getSecondScheduleModifier(), clang::OMPScheduleClause::getSecondScheduleModifierLoc(), clang::isOpenMPPrivate(), clang::isOpenMPSimdDirective(), clang::isOpenMPTaskingDirective(), clang::isOpenMPWorksharingDirective(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::OMPD_unknown, and clang::StmtError().
void Sema::ActOnOpenMPRegionStart | ( | OpenMPDirectiveKind | DKind, |
Scope * | CurScope | ||
) |
Initialization of captured region for OpenMP region.
Definition at line 2916 of file SemaOpenMP.cpp.
Sema::DeclGroupPtrTy Sema::ActOnOpenMPRequiresDirective | ( | SourceLocation | Loc, |
ArrayRef< OMPClause *> | ClauseList | ||
) |
Called on well-formed '#pragma omp requires'.
Definition at line 2490 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPReverseOffloadClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'reverse_offload' clause.
Definition at line 10659 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPSafelenClause | ( | Expr * | Length, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'safelen' clause.
Definition at line 9993 of file SemaOpenMP.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
OMPClause * Sema::ActOnOpenMPScheduleClause | ( | OpenMPScheduleClauseModifier | M1, |
OpenMPScheduleClauseModifier | M2, | ||
OpenMPScheduleClauseKind | Kind, | ||
Expr * | ChunkSize, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | M1Loc, | ||
SourceLocation | M2Loc, | ||
SourceLocation | KindLoc, | ||
SourceLocation | CommaLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'schedule' clause.
Definition at line 10406 of file SemaOpenMP.cpp.
References checkScheduleModifiers(), clang::Expr::containsUnexpandedParameterPack(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), getListOfPossibleValues(), clang::getOpenMPClauseName(), clang::getOpenMPSimpleClauseTypeName(), clang::Expr::isInstantiationDependent(), clang::Expr::isIntegerConstantExpr(), clang::SourceLocation::isInvalid(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), clang::OMPC_SCHEDULE_MODIFIER_last, clang::OMPC_SCHEDULE_MODIFIER_unknown, clang::OMPC_SCHEDULE_unknown, and clang::Result.
StmtResult Sema::ActOnOpenMPSectionDirective | ( | Stmt * | AStmt, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp section' after parsing of the associated statement.
Definition at line 6880 of file SemaOpenMP.cpp.
References clang::OMPSectionDirective::Create(), DSAStack, and clang::StmtError().
StmtResult Sema::ActOnOpenMPSectionsDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp sections' after parsing of the associated statement.
Definition at line 6842 of file SemaOpenMP.cpp.
References clang::C, clang::OMPSectionsDirective::Create(), Diag(), DSAStack, clang::Stmt::getBeginLoc(), clang::CapturedStmt::getCapturedStmt(), and clang::StmtError().
OMPClause * Sema::ActOnOpenMPSeqCstClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'seq_cst' clause.
Definition at line 10629 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPSharedClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'shared' clause.
Definition at line 11404 of file SemaOpenMP.cpp.
References buildCapture(), clang::OMPSharedClause::Create(), Diag(), DSAStack, clang::getOpenMPClauseName(), getPrivateItem(), clang::OMPC_unknown, and reportOriginalDsa().
OMPClause * Sema::ActOnOpenMPSIMDClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'simd' clause.
Definition at line 10639 of file SemaOpenMP.cpp.
StmtResult Sema::ActOnOpenMPSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp simd' after parsing of the associated statement.
Definition at line 6729 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, and clang::StmtError().
OMPClause * Sema::ActOnOpenMPSimdlenClause | ( | Expr * | Length, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'simdlen' clause.
Definition at line 10006 of file SemaOpenMP.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
OMPClause * Sema::ActOnOpenMPSimpleClause | ( | OpenMPClauseKind | Kind, |
unsigned | Argument, | ||
SourceLocation | ArgumentLoc, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 10126 of file SemaOpenMP.cpp.
References clang::OMPC_threadprivate, clang::OMPC_uniform, and clang::OMPC_unknown.
StmtResult Sema::ActOnOpenMPSingleDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp single' after parsing of the associated statement.
Definition at line 6895 of file SemaOpenMP.cpp.
References clang::OMPSingleDirective::Create(), Diag(), clang::OMPClause::getBeginLoc(), clang::OMPClause::getClauseKind(), and clang::StmtError().
OMPClause * Sema::ActOnOpenMPSingleExprClause | ( | OpenMPClauseKind | Kind, |
Expr * | Expr, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 9174 of file SemaOpenMP.cpp.
References clang::OMPC_threadprivate, clang::OMPC_uniform, and clang::OMPC_unknown.
OMPClause * Sema::ActOnOpenMPSingleExprWithArgClause | ( | OpenMPClauseKind | Kind, |
ArrayRef< unsigned > | Arguments, | ||
Expr * | Expr, | ||
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
ArrayRef< SourceLocation > | ArgumentsLoc, | ||
SourceLocation | DelimLoc, | ||
SourceLocation | EndLoc | ||
) |
Definition at line 10288 of file SemaOpenMP.cpp.
References Modifier, clang::OMPC_threadprivate, clang::OMPC_uniform, and clang::OMPC_unknown.
StmtResult Sema::ActOnOpenMPTargetDataDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp target data' after parsing of the associated statement.
Definition at line 8097 of file SemaOpenMP.cpp.
References clang::OMPTargetDataDirective::Create(), Diag(), clang::getOpenMPDirectiveName(), hasClauses(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp target' after parsing of the associated statement.
Definition at line 7934 of file SemaOpenMP.cpp.
References DSAStack, clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), clang::Stmt::IgnoreContainers(), clang::isOpenMPTeamsDirective(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetEnterDataDirective | ( | ArrayRef< OMPClause *> | Clauses, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
Stmt * | AStmt | ||
) |
Called on well-formed '#pragma omp target enter data' after parsing of the associated statement.
Definition at line 8122 of file SemaOpenMP.cpp.
References clang::OMPTargetEnterDataDirective::Create(), Diag(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), clang::getOpenMPDirectiveName(), hasClauses(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetExitDataDirective | ( | ArrayRef< OMPClause *> | Clauses, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
Stmt * | AStmt | ||
) |
Called on well-formed '#pragma omp target exit data' after parsing of the associated statement.
Definition at line 8159 of file SemaOpenMP.cpp.
References clang::OMPTargetExitDataDirective::Create(), Diag(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), clang::getOpenMPDirectiveName(), hasClauses(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetParallelDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp target parallel' after parsing of the associated statement.
Definition at line 8000 of file SemaOpenMP.cpp.
References clang::OMPTargetParallelDirective::Create(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetParallelForDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target parallel for' after parsing of the associated statement.
Definition at line 8030 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), clang::OMPTargetParallelForDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetParallelForSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target parallel for simd' after parsing of the associated statement.
Definition at line 8600 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPTargetParallelForSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target simd' after parsing of the associated statement.
Definition at line 8655 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPTargetSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), getOrderedNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetTeamsDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp target teams' after parsing of the associated statement.
Definition at line 8929 of file SemaOpenMP.cpp.
References clang::OMPTargetTeamsDirective::Create(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetTeamsDistributeDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target teams distribute' after parsing of the associated statement.
Definition at line 8960 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), checkOpenMPLoop(), clang::OMPTargetTeamsDistributeDirective::Create(), DSAStack, clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetTeamsDistributeParallelForDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target teams distribute parallel for' after parsing of the associated statement.
Definition at line 9003 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), clang::OMPTargetTeamsDistributeParallelForDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetTeamsDistributeParallelForSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target teams distribute parallel for simd' after parsing of the associated statement.
Definition at line 9058 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPTargetTeamsDistributeParallelForSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetTeamsDistributeSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp target teams distribute simd' after parsing of the associated statement.
Definition at line 9117 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPTargetTeamsDistributeSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTargetUpdateDirective | ( | ArrayRef< OMPClause *> | Clauses, |
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
Stmt * | AStmt | ||
) |
Called on well-formed '#pragma omp target update'.
Definition at line 8195 of file SemaOpenMP.cpp.
References clang::OMPTargetUpdateDirective::Create(), Diag(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), hasClauses(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTaskDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp task' after parsing of the associated statement.
Definition at line 7124 of file SemaOpenMP.cpp.
References clang::OMPTaskDirective::Create(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTaskgroupDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp taskgroup'.
Definition at line 7159 of file SemaOpenMP.cpp.
References clang::OMPTaskgroupDirective::Create(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTaskLoopDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp taskloop' after parsing of the associated statement.
Definition at line 8333 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), checkGrainsizeNumTasksClauses(), checkOpenMPLoop(), checkReductionClauseWithNogroup(), clang::OMPTaskLoopDirective::Create(), DSAStack, getCollapseNumberExpr(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTaskLoopSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp taskloop simd' after parsing of the associated statement.
Definition at line 8369 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkGrainsizeNumTasksClauses(), checkOpenMPLoop(), checkReductionClauseWithNogroup(), checkSimdlenSafelenSpecified(), clang::OMPTaskLoopSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, and clang::StmtError().
OMPClause * Sema::ActOnOpenMPTaskReductionClause | ( | ArrayRef< Expr *> | VarList, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | ColonLoc, | ||
SourceLocation | EndLoc, | ||
CXXScopeSpec & | ReductionIdScopeSpec, | ||
const DeclarationNameInfo & | ReductionId, | ||
ArrayRef< Expr *> | UnresolvedReductions = llvm::None |
||
) |
Called on well-formed 'task_reduction' clause.
Definition at line 12496 of file SemaOpenMP.cpp.
References actOnOMPReductionKindClause(), clang::OMPTaskReductionClause::Create(), and DSAStack.
StmtResult Sema::ActOnOpenMPTaskwaitDirective | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp taskwait'.
Definition at line 7154 of file SemaOpenMP.cpp.
References clang::OMPTaskwaitDirective::Create().
StmtResult Sema::ActOnOpenMPTaskyieldDirective | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp taskyield'.
Definition at line 7144 of file SemaOpenMP.cpp.
References clang::OMPTaskyieldDirective::Create().
StmtResult Sema::ActOnOpenMPTeamsDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed '#pragma omp teams' after parsing of the associated statement.
Definition at line 8228 of file SemaOpenMP.cpp.
References clang::OMPTeamsDirective::Create(), DSAStack, clang::CapturedStmt::getCapturedDecl(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTeamsDistributeDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp teams distribute' after parsing of the associated statement.
Definition at line 8711 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), checkOpenMPLoop(), clang::OMPTeamsDistributeDirective::Create(), DSAStack, clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTeamsDistributeParallelForDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp teams distribute parallel for' after parsing of the associated statement.
Definition at line 8880 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), checkOpenMPLoop(), clang::OMPTeamsDistributeParallelForDirective::Create(), DSAStack, clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTeamsDistributeParallelForSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp teams distribute parallel for simd' after parsing of the associated statement.
Definition at line 8818 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPTeamsDistributeParallelForSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
StmtResult Sema::ActOnOpenMPTeamsDistributeSimdDirective | ( | ArrayRef< OMPClause *> | Clauses, |
Stmt * | AStmt, | ||
SourceLocation | StartLoc, | ||
SourceLocation | EndLoc, | ||
VarsWithInheritedDSAType & | VarsWithImplicitDSA | ||
) |
Called on well-formed '#pragma omp teams distribute simd' after parsing of the associated statement.
Definition at line 8756 of file SemaOpenMP.cpp.
References clang::OMPLoopDirective::HelperExprs::builtAll(), clang::C, checkOpenMPLoop(), checkSimdlenSafelenSpecified(), clang::OMPTeamsDistributeSimdDirective::Create(), DSAStack, FinishOpenMPLinearClause(), clang::CapturedStmt::getCapturedDecl(), clang::CapturedStmt::getCapturedStmt(), getCollapseNumberExpr(), clang::OMPLoopDirective::HelperExprs::IterationVarRef, clang::OMPLoopDirective::HelperExprs::NumIterations, clang::CapturedDecl::setNothrow(), and clang::StmtError().
OMPClause * Sema::ActOnOpenMPThreadLimitClause | ( | Expr * | ThreadLimit, |
SourceLocation | StartLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | EndLoc | ||
) |
Called on well-formed 'thread_limit' clause.
Definition at line 14733 of file SemaOpenMP.cpp.
References buildPreInits(), DSAStack, getOpenMPCaptureRegionForClause(), isNonNegativeIntegerValue(), and clang::OMPD_unknown.
Sema::DeclGroupPtrTy Sema::ActOnOpenMPThreadprivateDirective | ( | SourceLocation | Loc, |
ArrayRef< Expr *> | VarList | ||
) |
Called on well-formed '#pragma omp threadprivate'.
Definition at line 2208 of file SemaOpenMP.cpp.
References clang::Stmt::children(), Diag(), clang::DeclRefExpr::getBeginLoc(), clang::DeclRefExpr::getDecl(), and clang::Stmt::getSourceRange().
OMPClause * Sema::ActOnOpenMPThreadsClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'threads' clause.
Definition at line 10634 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPToClause | ( | ArrayRef< Expr *> | VarList, |
CXXScopeSpec & | MapperIdScopeSpec, | ||
DeclarationNameInfo & | MapperId, | ||
const OMPVarListLocTy & | Locs, | ||
ArrayRef< Expr *> | UnresolvedMappers = llvm::None |
||
) |
Called on well-formed 'to' clause.
Definition at line 15049 of file SemaOpenMP.cpp.
References checkMappableExpressionList(), OMPToClause::Create(), DSAStack, and clang::OMPVarListLocTy::StartLoc.
OMPClause * Sema::ActOnOpenMPUnifiedAddressClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'unified_address' clause.
Definition at line 10649 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPUnifiedSharedMemoryClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'unified_address' clause.
Definition at line 10654 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPUntiedClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'untied' clause.
Definition at line 10599 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPUpdateClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'update' clause.
Definition at line 10619 of file SemaOpenMP.cpp.
OMPClause * Sema::ActOnOpenMPUseDevicePtrClause | ( | ArrayRef< Expr *> | VarList, |
const OMPVarListLocTy & | Locs | ||
) |
Called on well-formed 'use_device_ptr' clause.
Definition at line 15083 of file SemaOpenMP.cpp.
References buildCapture(), buildDeclRefExpr(), buildVarDecl(), OMPUseDevicePtrClause::Create(), Diag(), DSAStack, clang::Decl::getAttrs(), clang::NamedDecl::getName(), clang::QualType::getNonReferenceType(), getPrivateItem(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::Decl::hasAttrs(), Inits, and clang::Type::isPointerType().
OMPClause * Sema::ActOnOpenMPVarListClause | ( | OpenMPClauseKind | Kind, |
ArrayRef< Expr *> | Vars, | ||
Expr * | TailExpr, | ||
const OMPVarListLocTy & | Locs, | ||
SourceLocation | ColonLoc, | ||
CXXScopeSpec & | ReductionOrMapperIdScopeSpec, | ||
DeclarationNameInfo & | ReductionOrMapperId, | ||
OpenMPDependClauseKind | DepKind, | ||
OpenMPLinearClauseKind | LinKind, | ||
ArrayRef< OpenMPMapModifierKind > | MapTypeModifiers, | ||
ArrayRef< SourceLocation > | MapTypeModifiersLoc, | ||
OpenMPMapClauseKind | MapType, | ||
bool | IsMapTypeImplicit, | ||
SourceLocation | DepLinMapLoc | ||
) |
Definition at line 10669 of file SemaOpenMP.cpp.
References clang::OMPVarListLocTy::EndLoc, clang::OMPVarListLocTy::LParenLoc, clang::OMPC_threadprivate, clang::OMPC_uniform, clang::OMPC_unknown, and clang::OMPVarListLocTy::StartLoc.
OMPClause * Sema::ActOnOpenMPWriteClause | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc | ||
) |
Called on well-formed 'write' clause.
Definition at line 10614 of file SemaOpenMP.cpp.
ParsedTemplateArgument Sema::ActOnPackExpansion | ( | const ParsedTemplateArgument & | Arg, |
SourceLocation | EllipsisLoc | ||
) |
Invoked when parsing a template argument followed by an ellipsis, which creates a pack expansion.
Arg | The template argument preceding the ellipsis, which may already be invalid. |
EllipsisLoc | The location of the ellipsis. |
Definition at line 515 of file SemaTemplateVariadic.cpp.
References clang::TemplateName::containsUnexpandedParameterPack(), Diag(), clang::OpaquePtr< PtrTy >::get(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ParsedTemplateArgument::getAsExpr(), clang::ParsedTemplateArgument::getAsTemplate(), clang::ParsedTemplateArgument::getAsType(), clang::CXXScopeSpec::getBeginLoc(), clang::ParsedTemplateArgument::getKind(), clang::ParsedTemplateArgument::getLocation(), clang::ParsedTemplateArgument::getScopeSpec(), clang::ParsedTemplateArgument::getTemplatePackExpansion(), clang::ParsedTemplateArgument::isInvalid(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::CXXScopeSpec::isValid(), clang::ParsedTemplateArgument::NonType, clang::Result, clang::SourceRange::setBegin(), clang::ParsedTemplateArgument::Template, and clang::ParsedTemplateArgument::Type.
Referenced by CheckArrayDesignatorSyntax(), and TypeTraitArity().
TypeResult Sema::ActOnPackExpansion | ( | ParsedType | Type, |
SourceLocation | EllipsisLoc | ||
) |
Invoked when parsing a type followed by an ellipsis, which creates a pack expansion.
Type | The type preceding the ellipsis, which will become the pattern of the pack expansion. |
EllipsisLoc | The location of the ellipsis. |
Definition at line 554 of file SemaTemplateVariadic.cpp.
References clang::TypeSourceInfo::getType(), and clang::None.
ExprResult Sema::ActOnPackExpansion | ( | Expr * | Pattern, |
SourceLocation | EllipsisLoc | ||
) |
Invoked when parsing an expression followed by an ellipsis, which creates a pack expansion.
Pattern | The expression preceding the ellipsis, which will become the pattern of the pack expansion. |
EllipsisLoc | The location of the ellipsis. |
Definition at line 606 of file SemaTemplateVariadic.cpp.
References clang::None.
Decl * Sema::ActOnParamDeclarator | ( | Scope * | S, |
Declarator & | D | ||
) |
ActOnParamDeclarator - Called from Parser::ParseFunctionDeclarator() to introduce parameters into function prototype scope.
Definition at line 12806 of file SemaDecl.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::ActOnParamDefaultArgument | ( | Decl * | param, |
SourceLocation | EqualLoc, | ||
Expr * | DefaultArg | ||
) |
ActOnParamDefaultArgument - Check whether the default argument provided for a function parameter is well-formed.
If so, attach it to the parameter declaration.
Definition at line 298 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, Diag(), clang::Stmt::getSourceRange(), clang::VarDecl::isParameterPack(), and clang::Decl::setInvalidDecl().
void Sema::ActOnParamDefaultArgumentError | ( | Decl * | param, |
SourceLocation | EqualLoc | ||
) |
ActOnParamDefaultArgumentError - Parsing or semantic analysis of the default argument for the parameter param failed.
Definition at line 356 of file SemaDeclCXX.cpp.
References clang::ParmVarDecl::setDefaultArg(), and clang::Decl::setInvalidDecl().
void Sema::ActOnParamUnparsedDefaultArgument | ( | Decl * | param, |
SourceLocation | EqualLoc, | ||
SourceLocation | ArgLoc | ||
) |
ActOnParamUnparsedDefaultArgument - We've seen a default argument for a function parameter, but we can't parse it yet because we're inside a class definition.
Note that this default argument will be parsed later.
Definition at line 343 of file SemaDeclCXX.cpp.
References clang::ParmVarDecl::setUnparsedDefaultArg().
ExprResult Sema::ActOnParenExpr | ( | SourceLocation | L, |
SourceLocation | R, | ||
Expr * | E | ||
) |
Definition at line 3712 of file SemaExpr.cpp.
Referenced by ActOnDecltypeExpression(), buildCounterUpdate(), and TypeTraitArity().
ExprResult Sema::ActOnParenListExpr | ( | SourceLocation | L, |
SourceLocation | R, | ||
MultiExprArg | Val | ||
) |
Definition at line 6691 of file SemaExpr.cpp.
References clang::ParenListExpr::Create().
Referenced by clang::Parser::ParseUnqualifiedId(), and clang::InitializationSequence::Perform().
void Sema::ActOnPopScope | ( | SourceLocation | Loc, |
Scope * | S | ||
) |
Scope actions.
Definition at line 1829 of file SemaDecl.cpp.
Referenced by clang::Parser::ExitScope().
ExprResult Sema::ActOnPostfixUnaryOp | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
tok::TokenKind | Kind, | ||
Expr * | Input | ||
) |
Definition at line 4264 of file SemaExpr.cpp.
void Sema::ActOnPragmaAttributeAttribute | ( | ParsedAttr & | Attribute, |
SourceLocation | PragmaLoc, | ||
attr::ParsedSubjectMatchRuleSet | Rules | ||
) |
Definition at line 528 of file SemaAttr.cpp.
References clang::FixItHint::CreateRemoval(), Diag(), clang::ParsedAttr::getMatchRules(), clang::ParsedAttr::getName(), clang::attr::getSubjectMatchRuleSpelling(), LangOpts, PragmaAttributeStack, and clang::ParsedAttr::setIsPragmaClangAttribute().
void Sema::ActOnPragmaAttributeEmptyPush | ( | SourceLocation | PragmaLoc, |
const IdentifierInfo * | Namespace | ||
) |
Definition at line 640 of file SemaAttr.cpp.
References PragmaAttributeStack.
void Sema::ActOnPragmaAttributePop | ( | SourceLocation | PragmaLoc, |
const IdentifierInfo * | Namespace | ||
) |
Called on well-formed '#pragma clang attribute pop'.
Definition at line 647 of file SemaAttr.cpp.
References Diag(), and PragmaAttributeStack.
void Sema::ActOnPragmaClangSection | ( | SourceLocation | PragmaLoc, |
PragmaClangSectionAction | Action, | ||
PragmaClangSectionKind | SecKind, | ||
StringRef | SecName | ||
) |
ActOnPragmaClangSection - Called on well formed #pragma clang section.
Definition at line 139 of file SemaAttr.cpp.
References PragmaClangBSSSection, PragmaClangDataSection, PragmaClangRodataSection, PragmaClangTextSection, clang::Sema::PragmaClangSection::PragmaLocation, clang::Sema::PragmaClangSection::SectionName, and clang::Sema::PragmaClangSection::Valid.
void Sema::ActOnPragmaDetectMismatch | ( | SourceLocation | Loc, |
StringRef | Name, | ||
StringRef | Value | ||
) |
ActOnPragmaDetectMismatch - Call on well-formed #pragma detect_mismatch.
Definition at line 282 of file SemaAttr.cpp.
void Sema::ActOnPragmaDump | ( | Scope * | S, |
SourceLocation | Loc, | ||
IdentifierInfo * | II | ||
) |
Called on #pragma clang __debug dump II.
Definition at line 5378 of file SemaLookup.cpp.
void Sema::ActOnPragmaFEnvAccess | ( | LangOptions::FEnvAccessModeKind | FPC | ) |
ActOnPragmaFenvAccess - Called on well formed #pragma STDC FENV_ACCESS.
Definition at line 818 of file SemaAttr.cpp.
References clang::LangOptions::FEA_Off, clang::LangOptions::FEA_On, FPFeatures, clang::FPOptions::setAllowFEnvAccess(), and clang::FPOptions::setDisallowFEnvAccess().
void Sema::ActOnPragmaFPContract | ( | LangOptions::FPContractModeKind | FPC | ) |
ActOnPragmaFPContract - Called on well formed #pragma {STDC,OPENCL} FP_CONTRACT and #pragma clang fp contract.
Definition at line 804 of file SemaAttr.cpp.
References clang::LangOptions::FPC_Fast, clang::LangOptions::FPC_Off, clang::LangOptions::FPC_On, FPFeatures, clang::FPOptions::setAllowFPContractAcrossStatement(), clang::FPOptions::setAllowFPContractWithinStatement(), and clang::FPOptions::setDisallowFPContract().
void Sema::ActOnPragmaMSComment | ( | SourceLocation | CommentLoc, |
PragmaMSCommentKind | Kind, | ||
StringRef | Arg | ||
) |
ActOnPragmaMSComment - Called on well formed #pragma comment(kind, "arg").
Definition at line 274 of file SemaAttr.cpp.
References clang::DeclContext::addDecl(), Consumer, Context, clang::PragmaCommentDecl::Create(), clang::ASTContext::getTranslationUnitDecl(), and clang::ASTConsumer::HandleTopLevelDecl().
void Sema::ActOnPragmaMSInitSeg | ( | SourceLocation | PragmaLocation, |
StringLiteral * | SegmentName | ||
) |
Called on well-formed #pragma init_seg().
Definition at line 424 of file SemaAttr.cpp.
References CurInitSeg, CurInitSegLoc, and clang::StringLiteral::getString().
void Sema::ActOnPragmaMSPointersToMembers | ( | LangOptions::PragmaMSPointersToMembersKind | Kind, |
SourceLocation | PragmaLoc | ||
) |
ActOnPragmaMSPointersToMembers - called on well formed #pragma pointers_to_members(representation method[, general purpose representation]).
Definition at line 290 of file SemaAttr.cpp.
References ImplicitMSInheritanceAttrLoc, and MSPointerToMemberRepresentationMethod.
void Sema::ActOnPragmaMSSection | ( | SourceLocation | PragmaLocation, |
int | SectionFlags, | ||
StringLiteral * | SegmentName | ||
) |
Called on well formed #pragma section().
Called on well formed #pragma bss_seg().
Definition at line 419 of file SemaAttr.cpp.
References clang::StringLiteral::getString(), and UnifySection().
void Sema::ActOnPragmaMSSeg | ( | SourceLocation | PragmaLocation, |
PragmaMsStackAction | Action, | ||
llvm::StringRef | StackSlotLabel, | ||
StringLiteral * | SegmentName, | ||
llvm::StringRef | PragmaName | ||
) |
Called on well formed #pragma bss_seg/data_seg/const_seg/code_seg.
Called on well formed #pragma bss_seg().
Definition at line 392 of file SemaAttr.cpp.
void Sema::ActOnPragmaMSStruct | ( | PragmaMSStructKind | Kind | ) |
ActOnPragmaMSStruct - Called on well formed #pragma ms_struct [on|off].
Definition at line 270 of file SemaAttr.cpp.
References MSStructPragmaOn, and clang::PMSST_ON.
void Sema::ActOnPragmaMSVtorDisp | ( | PragmaMsStackAction | Action, |
SourceLocation | PragmaLoc, | ||
MSVtorDispAttr::Mode | Value | ||
) |
Called on well formed #pragma vtordisp().
Definition at line 297 of file SemaAttr.cpp.
References clang::Sema::PragmaStack< ValueType >::Act(), Diag(), PSK_Pop, clang::Sema::PragmaStack< ValueType >::Stack, and VtorDispStack.
void Sema::ActOnPragmaOptimize | ( | bool | On, |
SourceLocation | PragmaLoc | ||
) |
Called on well formed #pragma clang optimize.
Definition at line 724 of file SemaAttr.cpp.
References OptimizeOffPragmaLocation.
void Sema::ActOnPragmaOptionsAlign | ( | PragmaOptionsAlignKind | Kind, |
SourceLocation | PragmaLoc | ||
) |
ActOnPragmaOptionsAlign - Called on well formed #pragma options align.
Definition at line 88 of file SemaAttr.cpp.
References clang::Sema::PragmaStack< ValueType >::Act(), Context, clang::Sema::PragmaStack< ValueType >::CurrentValue, Diag(), clang::ASTContext::getTargetInfo(), clang::TargetInfo::hasAlignMac68kSupport(), kMac68kAlignmentSentinel, PackStack, POAK_Mac68k, POAK_Native, POAK_Natural, POAK_Packed, POAK_Power, POAK_Reset, PSK_Pop, PSK_Push_Set, PSK_Reset, and clang::Sema::PragmaStack< ValueType >::Stack.
void Sema::ActOnPragmaPack | ( | SourceLocation | PragmaLoc, |
PragmaMsStackAction | Action, | ||
StringRef | SlotLabel, | ||
Expr * | Alignment | ||
) |
ActOnPragmaPack - Called on well formed #pragma pack(...).
Definition at line 169 of file SemaAttr.cpp.
References clang::Sema::PragmaStack< ValueType >::Act(), Context, clang::Sema::PragmaStack< ValueType >::CurrentValue, Diag(), clang::Expr::isIntegerConstantExpr(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), kMac68kAlignmentSentinel, PackStack, PSK_Pop, PSK_Show, and clang::Sema::PragmaStack< ValueType >::Stack.
void Sema::ActOnPragmaRedefineExtname | ( | IdentifierInfo * | WeakName, |
IdentifierInfo * | AliasName, | ||
SourceLocation | PragmaLoc, | ||
SourceLocation | WeakNameLoc, | ||
SourceLocation | AliasNameLoc | ||
) |
ActOnPragmaRedefineExtname - Called on well formed #pragma redefine_extname oldname newname.
Definition at line 17387 of file SemaDecl.cpp.
void Sema::ActOnPragmaUnused | ( | const Token & | Identifier, |
Scope * | curScope, | ||
SourceLocation | PragmaLoc | ||
) |
ActOnPragmaUnused - Called on well-formed '#pragma unused'.
Definition at line 433 of file SemaAttr.cpp.
void Sema::ActOnPragmaVisibility | ( | const IdentifierInfo * | VisType, |
SourceLocation | PragmaLoc | ||
) |
ActOnPragmaVisibility - Called on well formed #pragma GCC visibility... .
Definition at line 789 of file SemaAttr.cpp.
References Diag(), clang::IdentifierInfo::getName(), PopPragmaVisibility(), and PushPragmaVisibility().
void Sema::ActOnPragmaWeakAlias | ( | IdentifierInfo * | WeakName, |
IdentifierInfo * | AliasName, | ||
SourceLocation | PragmaLoc, | ||
SourceLocation | WeakNameLoc, | ||
SourceLocation | AliasNameLoc | ||
) |
ActOnPragmaWeakAlias - Called on well formed #pragma weak ident = ident.
Definition at line 17426 of file SemaDecl.cpp.
void Sema::ActOnPragmaWeakID | ( | IdentifierInfo * | WeakName, |
SourceLocation | PragmaLoc, | ||
SourceLocation | WeakNameLoc | ||
) |
ActOnPragmaWeakID - Called on well formed #pragma weak ident.
Definition at line 17412 of file SemaDecl.cpp.
ExprResult Sema::ActOnPredefinedExpr | ( | SourceLocation | Loc, |
tok::TokenKind | Kind | ||
) |
Sema::DeclGroupPtrTy Sema::ActOnPrivateModuleFragmentDecl | ( | SourceLocation | ModuleLoc, |
SourceLocation | PrivateLoc | ||
) |
The parser has processed a private-module-fragment declaration that begins the definition of the private module fragment of the current module unit.
ModuleLoc | The location of the 'module' keyword. |
PrivateLoc | The location of the 'private' keyword. |
Definition at line 246 of file SemaModule.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::Module::GlobalModuleFragment, clang::Module::ModuleInterfaceUnit, clang::Module::ModuleMapModule, and clang::Module::PrivateModuleFragment.
Decl * Sema::ActOnProperty | ( | Scope * | S, |
SourceLocation | AtLoc, | ||
SourceLocation | LParenLoc, | ||
FieldDeclarator & | FD, | ||
ObjCDeclSpec & | ODS, | ||
Selector | GetterSel, | ||
Selector | SetterSel, | ||
tok::ObjCKeywordKind | MethodImplKind, | ||
DeclContext * | lexicalDC = nullptr |
||
) |
Definition at line 177 of file SemaObjCProperty.cpp.
Decl * Sema::ActOnPropertyImplDecl | ( | Scope * | S, |
SourceLocation | AtLoc, | ||
SourceLocation | PropertyLoc, | ||
bool | ImplKind, | ||
IdentifierInfo * | PropertyId, | ||
IdentifierInfo * | PropertyIvar, | ||
SourceLocation | PropertyIvarLoc, | ||
ObjCPropertyQueryKind | QueryKind | ||
) |
ActOnPropertyImplDecl - This routine performs semantic checks and builds the AST node for a property implementation declaration; declared as @synthesize or @dynamic.
Definition at line 1044 of file SemaObjCProperty.cpp.
ExprResult Sema::ActOnPseudoDestructorExpr | ( | Scope * | S, |
Expr * | Base, | ||
SourceLocation | OpLoc, | ||
tok::TokenKind | OpKind, | ||
CXXScopeSpec & | SS, | ||
UnqualifiedId & | FirstTypeName, | ||
SourceLocation | CCLoc, | ||
SourceLocation | TildeLoc, | ||
UnqualifiedId & | SecondTypeName | ||
) |
Definition at line 6992 of file SemaExprCXX.cpp.
References ActOnTemplateIdType(), BuildPseudoDestructorExpr(), CheckArrow(), computeDeclContext(), Context, clang::ASTContext::DependentTy, Diag(), clang::ExprError(), clang::UnqualifiedId::getKind(), clang::TemplateIdAnnotation::getTemplateArgs(), clang::ASTContext::getTrivialTypeSourceInfo(), GetTypeFromParser(), getTypeName(), clang::UnqualifiedId::Identifier, clang::IK_Identifier, clang::IK_TemplateId, clang::Type::isDependentType(), clang::QualType::isNull(), clang::Type::isRecordType(), clang::CXXScopeSpec::isSet(), isSFINAEContext(), clang::TemplateIdAnnotation::LAngleLoc, clang::OpaquePtr< QualType >::make(), clang::TemplateIdAnnotation::Name, clang::TemplateIdAnnotation::NumArgs, clang::TemplateIdAnnotation::RAngleLoc, clang::TemplateIdAnnotation::SS, clang::UnqualifiedId::StartLocation, clang::TemplateIdAnnotation::Template, clang::UnqualifiedId::TemplateId, clang::TemplateIdAnnotation::TemplateKWLoc, and clang::TemplateIdAnnotation::TemplateNameLoc.
Referenced by addConstevalToLambdaDeclSpecifier().
ExprResult Sema::ActOnPseudoDestructorExpr | ( | Scope * | S, |
Expr * | Base, | ||
SourceLocation | OpLoc, | ||
tok::TokenKind | OpKind, | ||
SourceLocation | TildeLoc, | ||
const DeclSpec & | DS | ||
) |
Definition at line 7137 of file SemaExprCXX.cpp.
References BuildDecltypeType(), BuildPseudoDestructorExpr(), CheckArrow(), Context, clang::ExprError(), clang::DeclSpec::getRepAsExpr(), clang::DeclSpec::getTypeSpecTypeLoc(), and clang::TypeSpecTypeLoc::setNameLoc().
void Sema::ActOnPureSpecifier | ( | Decl * | D, |
SourceLocation | PureSpecLoc | ||
) |
Definition at line 15002 of file SemaDeclCXX.cpp.
References Diag(), clang::Decl::getFriendObjectKind(), and clang::Decl::getLocation().
void Sema::ActOnReenterCXXMethodParameter | ( | Scope * | S, |
ParmVarDecl * | Param | ||
) |
This is used to implement the constant expression evaluation part of the attribute enable_if extension.
There is nothing in standard C++ which would require reentering parameters.
Definition at line 8124 of file SemaDeclCXX.cpp.
References clang::Scope::AddDecl(), and clang::NamedDecl::getDeclName().
Push the parameters of D, which must be a function, into scope.
Definition at line 1314 of file SemaDecl.cpp.
Definition at line 8058 of file SemaDeclCXX.cpp.
References clang::Scope::AddDecl(), clang::CXXRecordDecl::getDescribedClassTemplate(), and i.
StmtResult Sema::ActOnReturnStmt | ( | SourceLocation | ReturnLoc, |
Expr * | RetValExp, | ||
Scope * | CurScope | ||
) |
Definition at line 3504 of file SemaStmt.cpp.
References clang::Scope::addNRVOCandidate(), CheckJumpOutOfSEHFinally(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Scope::getFnParent(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Scope::setNoNRVO(), and clang::StmtError().
StmtResult Sema::ActOnSEHExceptBlock | ( | SourceLocation | Loc, |
Expr * | FilterExpr, | ||
Stmt * | Block | ||
) |
Definition at line 4138 of file SemaStmt.cpp.
References clang::SEHExceptStmt::Create(), Diag(), clang::Expr::getExprLoc(), clang::Expr::getType(), clang::Type::isIntegerType(), and clang::StmtError().
StmtResult Sema::ActOnSEHLeaveStmt | ( | SourceLocation | Loc, |
Scope * | CurScope | ||
) |
Definition at line 4167 of file SemaStmt.cpp.
References CheckJumpOutOfSEHFinally(), Diag(), clang::Scope::getParent(), clang::Scope::isSEHTryScope(), and clang::StmtError().
StmtResult Sema::ActOnSEHTryBlock | ( | bool | IsCXXTry, |
SourceLocation | TryLoc, | ||
Stmt * | TryBlock, | ||
Stmt * | Handler | ||
) |
Definition at line 4102 of file SemaStmt.cpp.
References Diag(), clang::sema::FunctionScopeInfo::FirstCXXTryLoc, clang::DeclContext::getParent(), clang::DeclContext::isFunctionOrMethod(), clang::SourceLocation::isValid(), clang::sema::FunctionScopeInfo::setHasSEHTry(), and clang::FunctionDecl::setUsesSEHTry().
ExprResult Sema::ActOnSizeofParameterPackExpr | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
IdentifierInfo & | Name, | ||
SourceLocation | NameLoc, | ||
SourceLocation | RParenLoc | ||
) |
Called when an expression computing the size of a parameter pack is parsed.
OpLoc | The location of the "sizeof" keyword. |
Name | The name of the parameter pack whose size will be determined. |
NameLoc | The source location of the name of the parameter pack. |
RParenLoc | The location of the closing parentheses. |
Definition at line 960 of file SemaTemplateVariadic.cpp.
Definition at line 13513 of file SemaDecl.cpp.
References clang::Decl::getAsFunction().
Referenced by clang::Parser::ParseTopLevelDecl().
ExprResult Sema::ActOnSourceLocExpr | ( | SourceLocExpr::IdentKind | Kind, |
SourceLocation | BuiltinLoc, | ||
SourceLocation | RPLoc | ||
) |
Definition at line 14208 of file SemaExpr.cpp.
Decl * Sema::ActOnStartCategoryImplementation | ( | SourceLocation | AtCatImplLoc, |
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassLoc, | ||
IdentifierInfo * | CatName, | ||
SourceLocation | CatLoc, | ||
const ParsedAttributesView & | Attrs | ||
) |
ActOnStartCategoryImplementation - Perform semantic checks on the category implementation declaration and build an ObjCCategoryImplDecl object.
Check that class of this category is already completely declared.
Check that CatName, category name, is not used in another implementation.
Definition at line 1893 of file SemaDeclObjC.cpp.
References ActOnObjCContainerStartDefinition(), clang::DeclContext::addDecl(), AddPragmaAttributes(), CheckObjCDeclScope(), Context, clang::ObjCCategoryDecl::Create(), clang::ObjCCategoryImplDecl::Create(), CurContext, Diag(), DiagnoseObjCImplementedDeprecations(), clang::ObjCInterfaceDecl::FindCategoryDeclaration(), clang::NamedDecl::getDeclName(), clang::ObjCCategoryDecl::getImplementation(), clang::Decl::getLocation(), getObjCInterfaceDecl(), clang::ASTContext::getObjCInterfaceType(), clang::Decl::hasAttr(), clang::ObjCInterfaceDecl::hasDefinition(), ProcessDeclAttributeList(), RequireCompleteType(), clang::ObjCCategoryDecl::setImplementation(), clang::Decl::setImplicit(), clang::Decl::setInvalidDecl(), and TUScope.
Decl * Sema::ActOnStartCategoryInterface | ( | SourceLocation | AtInterfaceLoc, |
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassLoc, | ||
ObjCTypeParamList * | typeParamList, | ||
IdentifierInfo * | CategoryName, | ||
SourceLocation | CategoryLoc, | ||
Decl *const * | ProtoRefs, | ||
unsigned | NumProtoRefs, | ||
const SourceLocation * | ProtoLocs, | ||
SourceLocation | EndProtoLoc, | ||
const ParsedAttributesView & | AttrList | ||
) |
Check that class of this category is already completely declared.
Check for duplicate interface declaration for this category
Definition at line 1797 of file SemaDeclObjC.cpp.
References ActOnObjCContainerStartDefinition(), clang::DeclContext::addDecl(), AddPragmaAttributes(), Category, CheckObjCDeclScope(), checkTypeParamListConsistency(), Context, clang::ObjCCategoryDecl::Create(), CurContext, Diag(), diagnoseUseOfProtocols(), clang::ObjCInterfaceDecl::FindCategoryDeclaration(), clang::ObjCInterfaceDecl::getImplementation(), clang::ObjCTypeParamList::getLAngleLoc(), clang::Decl::getLocation(), getObjCInterfaceDecl(), clang::ASTContext::getObjCInterfaceType(), clang::ObjCTypeParamList::getSourceRange(), clang::ObjCInterfaceDecl::getTypeParamList(), clang::ObjCCategoryDecl::IsClassExtension(), clang::ObjCInterfaceDecl::mergeClassExtensionProtocolList(), Previous, ProcessDeclAttributeList(), RequireCompleteType(), clang::Decl::setInvalidDecl(), clang::ObjCCategoryDecl::setProtocolList(), and TUScope.
Decl * Sema::ActOnStartClassImplementation | ( | SourceLocation | AtClassImplLoc, |
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassLoc, | ||
IdentifierInfo * | SuperClassname, | ||
SourceLocation | SuperClassLoc, | ||
const ParsedAttributesView & | AttrList | ||
) |
Definition at line 1959 of file SemaDeclObjC.cpp.
References ActOnObjCContainerStartDefinition(), AddPragmaAttributes(), CheckObjCDeclScope(), Context, CorrectTypo(), clang::ObjCInterfaceDecl::Create(), clang::ObjCImplementationDecl::Create(), CTK_NonError, CurContext, clang::declaresSameEntity(), Diag(), DiagnoseObjCImplementedDeprecations(), diagnoseTypo(), forRedeclarationInCurContext(), clang::TypoCorrection::getCorrectionDeclAs(), clang::NamedDecl::getDeclName(), clang::ObjCInterfaceDecl::getImplementation(), clang::Decl::getLocation(), clang::ASTContext::getObjCInterfaceType(), clang::ObjCInterfaceDecl::getSuperClass(), clang::ASTContext::getTrivialTypeSourceInfo(), clang::Decl::hasAttr(), clang::ObjCInterfaceDecl::hasDefinition(), LookupOrdinaryName, LookupSingleName(), PDiag(), ProcessDeclAttributeList(), PushOnScopeChains(), RequireCompleteType(), clang::ObjCInterfaceDecl::setEndOfDefinitionLoc(), clang::ObjCInterfaceDecl::setImplementation(), clang::Decl::setInvalidDecl(), clang::ObjCInterfaceDecl::setSuperClass(), clang::ObjCInterfaceDecl::startDefinition(), and TUScope.
Decl * Sema::ActOnStartClassInterface | ( | Scope * | S, |
SourceLocation | AtInterfaceLoc, | ||
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassLoc, | ||
ObjCTypeParamList * | typeParamList, | ||
IdentifierInfo * | SuperName, | ||
SourceLocation | SuperLoc, | ||
ArrayRef< ParsedType > | SuperTypeArgs, | ||
SourceRange | SuperTypeArgsRange, | ||
Decl *const * | ProtoRefs, | ||
unsigned | NumProtoRefs, | ||
const SourceLocation * | ProtoLocs, | ||
SourceLocation | EndProtoLoc, | ||
const ParsedAttributesView & | AttrList | ||
) |
Definition at line 975 of file SemaDeclObjC.cpp.
void Sema::ActOnStartCXXInClassMemberInitializer | ( | ) |
Enter a new C++ default initializer scope.
After calling this, the caller must call ActOnFinishCXXInClassMemberInitializer, even if parsing or instantiating the initializer failed.
Definition at line 3666 of file SemaDeclCXX.cpp.
Referenced by InstantiateInClassInitializer().
void Sema::ActOnStartCXXMemberDeclarations | ( | Scope * | S, |
Decl * | TagDecl, | ||
SourceLocation | FinalLoc, | ||
bool | IsFinalSpelledSealed, | ||
SourceLocation | LBraceLoc | ||
) |
ActOnStartCXXMemberDeclarations - Invoked when we have parsed a C++ record definition's base-specifiers clause and are starting its member declarations.
Definition at line 15479 of file SemaDecl.cpp.
ExprResult Sema::ActOnStartCXXMemberReference | ( | Scope * | S, |
Expr * | Base, | ||
SourceLocation | OpLoc, | ||
tok::TokenKind | OpKind, | ||
ParsedType & | ObjectType, | ||
bool & | MayBePseudoDestructor | ||
) |
Definition at line 6680 of file SemaExprCXX.cpp.
References CheckPlaceholderExpr(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Type::getPointeeType(), clang::Expr::getType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::OpaquePtr< QualType >::make(), MaybeConvertParenListExprToParenExpr(), and clang::Result.
ActOnStartDelayedCXXMethodDeclaration - We have completed parsing a top-level (non-nested) C++ class, and we are now parsing those parts of the given Method declaration that could not be parsed earlier (C++ [class.mem]p2), such as default arguments.
This action should enter the scope of the given Method declaration as if we had just parsed the qualified method name. However, it should not bring the parameters into scope; that will be performed by ActOnDelayedCXXMethodParameter.
Definition at line 8141 of file SemaDeclCXX.cpp.
Definition at line 8109 of file SemaDeclCXX.cpp.
Decl * Sema::ActOnStartExportDecl | ( | Scope * | S, |
SourceLocation | ExportLoc, | ||
SourceLocation | LBraceLoc | ||
) |
We have parsed the start of an export declaration, including the '{' (if present).
Definition at line 523 of file SemaModule.cpp.
Decl * Sema::ActOnStartLinkageSpecification | ( | Scope * | S, |
SourceLocation | ExternLoc, | ||
Expr * | LangStr, | ||
SourceLocation | LBraceLoc | ||
) |
ActOnStartLinkageSpecification - Parsed the beginning of a C++ linkage specification, including the language and (if present) the '{'.
ExternLoc is the location of the 'extern', Lang is the language string literal. LBraceLoc, if valid, provides the location of the '{' brace. Otherwise, this linkage specification does not have any braces.
Definition at line 13762 of file SemaDeclCXX.cpp.
References clang::LinkageSpecDecl::Create(), Diag(), clang::Expr::getExprLoc(), clang::Stmt::getSourceRange(), clang::StringLiteral::getString(), clang::StringLiteral::isAscii(), clang::LinkageSpecDecl::lang_c, and clang::LinkageSpecDecl::lang_cxx.
Decl * Sema::ActOnStartNamespaceDef | ( | Scope * | NamespcScope, |
SourceLocation | InlineLoc, | ||
SourceLocation | NamespaceLoc, | ||
SourceLocation | IdentLoc, | ||
IdentifierInfo * | II, | ||
SourceLocation | LBrace, | ||
const ParsedAttributesView & | AttrList, | ||
UsingDirectiveDecl *& | UD | ||
) |
ActOnStartNamespaceDef - This is called at the start of a namespace definition.
Definition at line 8896 of file SemaDeclCXX.cpp.
References clang::NamespaceDecl::Create(), Diag(), DiagnoseNamespaceInlineMismatch(), clang::NamespaceDecl::getAnonymousNamespace(), clang::Scope::getParent(), clang::LookupResult::getRepresentativeDecl(), clang::NamespaceDecl::isInline(), clang::LookupResult::isSingleResult(), clang::IdentifierInfo::isStr(), clang::SourceLocation::isValid(), and Parent.
void Sema::ActOnStartOfCompoundStmt | ( | bool | IsStmtExpr | ) |
Definition at line 338 of file SemaStmt.cpp.
Referenced by clang::Sema::CompoundScopeRAII::CompoundScopeRAII().
Decl * Sema::ActOnStartOfFunctionDef | ( | Scope * | S, |
Declarator & | D, | ||
MultiTemplateParamsArg | TemplateParamLists, | ||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
Definition at line 13078 of file SemaDecl.cpp.
References clang::FDK_Definition, clang::Scope::getParent(), clang::Declarator::isFunctionDeclarator(), and clang::Declarator::setFunctionDefinitionKind().
Referenced by clang::Parser::ParseTopLevelDecl().
Decl * Sema::ActOnStartOfFunctionDef | ( | Scope * | S, |
Decl * | D, | ||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
Definition at line 13297 of file SemaDecl.cpp.
References Diag(), clang::Decl::dropAttr(), clang::Decl::getAttr(), clang::FunctionDecl::getBuiltinID(), clang::Attr::getLocation(), clang::isGenericLambdaCallOperatorSpecialization(), clang::isLambdaCallOperator(), clang::FunctionDecl::isLateTemplateParsed(), RebuildLambdaScopeInfo(), clang::Decl::setInvalidDecl(), clang::FunctionDecl::setWillHaveBody(), clang::Sema::SkipBodyInfo::ShouldSkip, and clang::FunctionDecl::willHaveBody().
void Sema::ActOnStartOfLambdaDefinition | ( | LambdaIntroducer & | Intro, |
Declarator & | ParamInfo, | ||
Scope * | CurScope | ||
) |
ActOnStartOfLambdaDefinition - This is called just before we start parsing the body of a lambda; it analyzes the explicit captures and arguments, and sets up various data-structures for the body of the lambda.
Definition at line 852 of file SemaLambda.cpp.
References clang::Declarator::getNumTypeObjects(), clang::Scope::getTemplateParamParent(), and clang::sema::LambdaScopeInfo::NumExplicitTemplateParams.
Referenced by addConstevalToLambdaDeclSpecifier().
ActOnStartOfObjCMethodDef - This routine sets up parameters; invisible and user declared, in the method definition's AST.
Definition at line 361 of file SemaDeclObjC.cpp.
References CheckParmsForFunctionDef(), Context, clang::ObjCMethodDecl::createImplicitParams(), clang::declaresSameEntity(), Diag(), DiagnoseObjCImplementedDeprecations(), ExprEvalContexts, clang::LangOptions::GCOnly, clang::ObjCMethodDecl::getClassInterface(), clang::ObjCMethodDecl::getCmdDecl(), clang::TypoCorrection::getCorrectionDeclAs(), getCurFunction(), getCurMethodDecl(), clang::Decl::getDeclContext(), clang::ASTContext::getLangOpts(), getLangOpts(), clang::Decl::getLocation(), clang::ObjCMethodDecl::getMethodFamily(), clang::ObjCMethodDecl::getReturnType(), clang::ObjCMethodDecl::getSelector(), clang::ObjCMethodDecl::getSelfDecl(), clang::ObjCInterfaceDecl::getSuperClass(), clang::Decl::hasAttr(), HasExplicitOwnershipAttr(), ImplicitlyRetainedSelfLocs, clang::Type::isDependentType(), clang::ObjCMethodDecl::isDesignatedInitializerForTheInterface(), clang::ObjCMethodDecl::isInstanceMethod(), clang::Decl::isInvalidDecl(), clang::Type::isVoidType(), clang::LangOptions::NonGC, clang::sema::FunctionScopeInfo::ObjCIsDesignatedInit, clang::sema::FunctionScopeInfo::ObjCIsSecondaryInit, clang::sema::FunctionScopeInfo::ObjCShouldCallSuper, clang::sema::FunctionScopeInfo::ObjCWarnForNoDesignatedInitChain, clang::sema::FunctionScopeInfo::ObjCWarnForNoInitDelegation, clang::OMF_alloc, clang::OMF_autorelease, clang::OMF_copy, clang::OMF_dealloc, clang::OMF_finalize, clang::OMF_init, clang::OMF_initialize, clang::OMF_mutableCopy, clang::OMF_new, clang::OMF_None, clang::OMF_performSelector, clang::OMF_release, clang::OMF_retain, clang::OMF_retainCount, clang::OMF_self, clang::ObjCMethodDecl::parameters(), PushDeclContext(), PushExpressionEvaluationContext(), PushFunctionScope(), PushOnScopeChains(), RequireCompleteType(), and clang::Decl::setInvalidDecl().
StmtResult Sema::ActOnStartOfSwitchStmt | ( | SourceLocation | SwitchLoc, |
Stmt * | InitStmt, | ||
ConditionResult | Cond | ||
) |
Definition at line 689 of file SemaStmt.cpp.
References clang::SwitchStmt::Create(), Diag(), clang::Sema::ConditionResult::get(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Type::isIntegralOrEnumerationType(), clang::Sema::ConditionResult::isInvalid(), clang::Expr::isKnownToHaveBooleanValue(), and clang::Expr::isTypeDependent().
void Sema::ActOnStartOfTranslationUnit | ( | ) |
This is called before the very first declaration in the translation unit is parsed.
Note that the ASTContext may have already injected some declarations.
Definition at line 848 of file Sema.cpp.
References ActOnGlobalModuleFragmentDecl(), clang::LangOptions::CMK_ModuleInterface, clang::LangOptions::CMK_None, getLangOpts(), clang::SourceManager::getLocForStartOfFile(), clang::SourceManager::getMainFileID(), and SourceMgr.
Referenced by clang::Parser::ParseFirstTopLevelDecl().
bool Sema::ActOnStartOpenMPDeclareTargetDirective | ( | SourceLocation | Loc | ) |
Called on the start of target region i.e. '#pragma omp declare target'.
Definition at line 14903 of file SemaOpenMP.cpp.
References Diag(), clang::DeclContext::isExternCContext(), clang::DeclContext::isExternCXXContext(), and clang::DeclContext::isFileContext().
Decl * Sema::ActOnStartProtocolInterface | ( | SourceLocation | AtProtoInterfaceLoc, |
IdentifierInfo * | ProtocolName, | ||
SourceLocation | ProtocolLoc, | ||
Decl *const * | ProtoRefNames, | ||
unsigned | NumProtoRefs, | ||
const SourceLocation * | ProtoLocs, | ||
SourceLocation | EndProtoLoc, | ||
const ParsedAttributesView & | AttrList | ||
) |
Check then save referenced protocols.
Definition at line 1207 of file SemaDeclObjC.cpp.
References ActOnObjCContainerStartDefinition(), AddPragmaAttributes(), CheckForwardProtocolDeclarationForCircularDependency(), CheckObjCDeclScope(), Context, clang::ObjCProtocolDecl::Create(), CurContext, Diag(), diagnoseUseOfProtocols(), forRedeclarationInCurContext(), clang::ObjCProtocolDecl::getDefinition(), getLangOpts(), clang::Decl::getLocation(), LookupProtocol(), mergeDeclAttributes(), ProcessDeclAttributeList(), PushOnScopeChains(), clang::ObjCList< T >::set(), clang::ObjCProtocolDecl::setProtocolList(), and TUScope.
void Sema::ActOnStartSEHFinallyBlock | ( | ) |
Definition at line 4152 of file SemaStmt.cpp.
void Sema::ActOnStartStmtExpr | ( | ) |
Definition at line 13419 of file SemaExpr.cpp.
Decl * Sema::ActOnStaticAssertDeclaration | ( | SourceLocation | StaticAssertLoc, |
Expr * | AssertExpr, | ||
Expr * | AssertMessageExpr, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 14002 of file SemaDeclCXX.cpp.
ExprResult Sema::ActOnStmtExpr | ( | SourceLocation | LPLoc, |
Stmt * | SubStmt, | ||
SourceLocation | RPLoc | ||
) |
Definition at line 13432 of file SemaExpr.cpp.
void Sema::ActOnStmtExprError | ( | ) |
Definition at line 13423 of file SemaExpr.cpp.
ExprResult Sema::ActOnStmtExprResult | ( | ExprResult | E | ) |
Definition at line 13470 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), clang::CastExpr::getSubExpr(), clang::Expr::getType(), clang::QualType::getUnqualifiedType(), clang::InitializedEntity::InitializeStmtExprResult(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Expr::isTypeDependent().
ExprResult Sema::ActOnStringLiteral | ( | ArrayRef< Token > | StringToks, |
Scope * | UDLScope = nullptr |
||
) |
ActOnStringLiteral - The specified tokens were lexed as pasted string fragments (e.g.
"foo" "bar" L"baz").
"foo" "bar" L"baz"). The result string has to handle string concatenation ([C99 5.1.1.2, translation phase #6]), so it may come from multiple tokens. However, the common case is that StringToks points to one string.
Definition at line 1636 of file SemaExpr.cpp.
References clang::ExprError(), and clang::format::Tok.
void Sema::ActOnSuperClassOfClassInterface | ( | Scope * | S, |
SourceLocation | AtInterfaceLoc, | ||
ObjCInterfaceDecl * | IDecl, | ||
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassLoc, | ||
IdentifierInfo * | SuperName, | ||
SourceLocation | SuperLoc, | ||
ArrayRef< ParsedType > | SuperTypeArgs, | ||
SourceRange | SuperTypeArgsRange | ||
) |
Definition at line 541 of file SemaDeclObjC.cpp.
Referenced by diagnoseUseOfProtocols().
ExprResult Sema::ActOnSuperMessage | ( | Scope * | S, |
SourceLocation | SuperLoc, | ||
Selector | Sel, | ||
SourceLocation | LBracLoc, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
SourceLocation | RBracLoc, | ||
MultiExprArg | Args | ||
) |
Definition at line 2222 of file SemaExprObjC.cpp.
bool Sema::ActOnSuperScopeSpecifier | ( | SourceLocation | SuperLoc, |
SourceLocation | ColonColonLoc, | ||
CXXScopeSpec & | SS | ||
) |
The parser has parsed a '__super' nested-name-specifier.
SuperLoc | The location of the '__super' keyword. |
ColonColonLoc | The location of the '::'. |
SS | The nested-name-specifier, which will be updated in-place to reflect the parsed nested-name-specifier. |
Definition at line 278 of file SemaCXXScopeSpec.cpp.
Decl * Sema::ActOnTag | ( | Scope * | S, |
unsigned | TagSpec, | ||
TagUseKind | TUK, | ||
SourceLocation | KWLoc, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
const ParsedAttributesView & | Attrs, | ||
AccessSpecifier | AS, | ||
SourceLocation | ModulePrivateLoc, | ||
MultiTemplateParamsArg | TemplateParameterLists, | ||
bool & | OwnedDecl, | ||
bool & | IsDependent, | ||
SourceLocation | ScopedEnumKWLoc, | ||
bool | ScopedEnumUsesClassTag, | ||
TypeResult | UnderlyingType, | ||
bool | IsTypeSpecifier, | ||
bool | IsTemplateParamOrArg, | ||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
This is invoked when we see 'struct foo' or 'struct {'.
In the former case, Name will be non-null. In the later case, Name will be null. TagSpec indicates what kind of tag this is. TUK indicates whether this is a reference/declaration/definition of a tag.
IsTypeSpecifier | true if this is a type-specifier (or trailing-type-specifier) other than one in an alias-declaration. |
SkipBody | If non-null, will be set to indicate if the caller should skip the definition of this tag and treat it as if it were a declaration. |
Create a new tag decl in C/ObjC. Since the ODR-like semantics for ObjC/C implemented asks for structural equivalence checking, the returned decl here is passed back to the parser, allowing the tag body to be parsed.
Definition at line 14512 of file SemaDecl.cpp.
ActOnTagDefinitionError - Invoked when there was an unrecoverable error parsing the definition of a tag.
Definition at line 15560 of file SemaDecl.cpp.
void Sema::ActOnTagFinishDefinition | ( | Scope * | S, |
Decl * | TagDecl, | ||
SourceRange | BraceRange | ||
) |
ActOnTagFinishDefinition - Invoked once we have finished parsing the definition of a tag (enumeration, class, struct, or union).
Definition at line 15515 of file SemaDecl.cpp.
void Sema::ActOnTagFinishSkippedDefinition | ( | SkippedDefinitionContext | Context | ) |
Definition at line 1265 of file SemaDecl.cpp.
ActOnTagStartDefinition - Invoked when we have entered the scope of a tag's definition (e.g., for an enumeration, class, struct, or union).
Definition at line 15445 of file SemaDecl.cpp.
Sema::SkippedDefinitionContext Sema::ActOnTagStartSkippedDefinition | ( | Scope * | S, |
Decl * | TD | ||
) |
Invoked when we enter a tag definition that we're skipping.
Definition at line 1251 of file SemaDecl.cpp.
TypeResult Sema::ActOnTagTemplateIdType | ( | TagUseKind | TUK, |
TypeSpecifierType | TagSpec, | ||
SourceLocation | TagLoc, | ||
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
TemplateTy | TemplateD, | ||
SourceLocation | TemplateLoc, | ||
SourceLocation | LAngleLoc, | ||
ASTTemplateArgsPtr | TemplateArgsIn, | ||
SourceLocation | RAngleLoc | ||
) |
Parsed an elaborated-type-specifier that refers to a template-id, such as class
T::template apply<U>.
Definition at line 3580 of file SemaTemplate.cpp.
References clang::OpaquePtr< PtrTy >::get(), clang::TemplateName::getAsDependentTemplateName(), clang::TypeWithKeyword::getKeywordForTagTypeKind(), and clang::TypeWithKeyword::getTagTypeKindForTypeSpec().
Decl * Sema::ActOnTemplateDeclarator | ( | Scope * | S, |
MultiTemplateParamsArg | TemplateParameterLists, | ||
Declarator & | D | ||
) |
Definition at line 8005 of file SemaTemplate.cpp.
Decl * Sema::ActOnTemplatedFriendTag | ( | Scope * | S, |
SourceLocation | FriendLoc, | ||
unsigned | TagSpec, | ||
SourceLocation | TagLoc, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
const ParsedAttributesView & | Attr, | ||
MultiTemplateParamsArg | TempParamLists | ||
) |
Handle a friend tag declaration where the scope specifier was templated.
Definition at line 14150 of file SemaDeclCXX.cpp.
TypeResult Sema::ActOnTemplateIdType | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
TemplateTy | Template, | ||
IdentifierInfo * | TemplateII, | ||
SourceLocation | TemplateIILoc, | ||
SourceLocation | LAngleLoc, | ||
ASTTemplateArgsPtr | TemplateArgs, | ||
SourceLocation | RAngleLoc, | ||
bool | IsCtorOrDtorName = false , |
||
bool | IsClassName = false |
||
) |
Definition at line 3476 of file SemaTemplate.cpp.
Referenced by ActOnPseudoDestructorExpr().
TemplateParameterList * Sema::ActOnTemplateParameterList | ( | unsigned | Depth, |
SourceLocation | ExportLoc, | ||
SourceLocation | TemplateLoc, | ||
SourceLocation | LAngleLoc, | ||
ArrayRef< NamedDecl *> | Params, | ||
SourceLocation | RAngleLoc, | ||
Expr * | RequiresClause | ||
) |
ActOnTemplateParameterList - Builds a TemplateParameterList, optionally constrained by RequiresClause, that contains the template parameters in Params.
Definition at line 1331 of file SemaTemplate.cpp.
References clang::TemplateParameterList::Create(), Diag(), and clang::SourceLocation::isValid().
NamedDecl * Sema::ActOnTemplateTemplateParameter | ( | Scope * | S, |
SourceLocation | TmpLoc, | ||
TemplateParameterList * | Params, | ||
SourceLocation | EllipsisLoc, | ||
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
unsigned | Depth, | ||
unsigned | Position, | ||
SourceLocation | EqualLoc, | ||
ParsedTemplateArgument | Default | ||
) |
ActOnTemplateTemplateParameter - Called when a C++ template template parameter (e.g.
T in template <template <typename> class T> class array) has been parsed. S is the current scope.
Definition at line 1254 of file SemaTemplate.cpp.
ParsedTemplateArgument Sema::ActOnTemplateTypeArgument | ( | TypeResult | ParsedType | ) |
Convert a parsed type into a parsed template argument.
This is mostly trivial, except that we may have parsed a C++17 deduced class template specialization type, in which case we should form a template template argument instead of a type template argument.
Definition at line 938 of file SemaTemplate.cpp.
References clang::CXXScopeSpec::Adopt(), clang::frontend::CPlusPlus17, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::TypeLoc::getAs(), clang::TypeSourceInfo::getTypeLoc(), and clang::QualType::isNull().
void Sema::ActOnTranslationUnitScope | ( | Scope * | S | ) |
Definition at line 70 of file Sema.cpp.
Referenced by clang::Parser::Initialize().
NamedDecl * Sema::ActOnTypedefDeclarator | ( | Scope * | S, |
Declarator & | D, | ||
DeclContext * | DC, | ||
TypeSourceInfo * | TInfo, | ||
LookupResult & | Previous | ||
) |
Definition at line 5761 of file SemaDecl.cpp.
void Sema::ActOnTypedefedProtocols | ( | SmallVectorImpl< Decl *> & | ProtocolRefs, |
SmallVectorImpl< SourceLocation > & | ProtocolLocs, | ||
IdentifierInfo * | SuperName, | ||
SourceLocation | SuperLoc | ||
) |
ActOnTypedefedProtocols - this action finds protocol list as part of the typedef'ed use for a qualified super class and adds them to the list of the protocols.
Definition at line 1105 of file SemaDeclObjC.cpp.
References clang::Type::getAs(), clang::Type::isObjCObjectType(), LookupOrdinaryName, LookupSingleName(), and TUScope.
NamedDecl * Sema::ActOnTypedefNameDecl | ( | Scope * | S, |
DeclContext * | DC, | ||
TypedefNameDecl * | NewTD, | ||
LookupResult & | Previous, | ||
bool & | Redeclaration | ||
) |
ActOnTypedefNameDecl - Perform semantic checking for a declaration which declares a typedef-name, either using the 'typedef' type specifier or via a C++0x [dcl.typedef]p2 alias-declaration: 'using T = A;'.
Definition at line 5848 of file SemaDecl.cpp.
TypeResult Sema::ActOnTypeName | ( | Scope * | S, |
Declarator & | D | ||
) |
Definition at line 5815 of file SemaType.cpp.
References clang::AliasDeclContext, clang::AliasTemplateContext, clang::Declarator::getContext(), clang::Declarator::getIdentifier(), clang::Declarator::isInvalidType(), and clang::ObjCParameterContext.
Referenced by clang::Parser::ParseUnqualifiedId(), and TypeTraitArity().
TypeResult Sema::ActOnTypenameType | ( | Scope * | S, |
SourceLocation | TypenameLoc, | ||
const CXXScopeSpec & | SS, | ||
const IdentifierInfo & | II, | ||
SourceLocation | IdLoc | ||
) |
Called when the parser has parsed a C++ typename specifier, e.g., "typename T::type".
S | The scope in which this typename type occurs. |
TypenameLoc | the location of the 'typename' keyword |
SS | the nested-name-specifier following the typename (e.g., 'T::'). |
II | the identifier we're retrieving (e.g., 'type' in the example). |
IdLoc | the location of the identifier. |
Definition at line 9775 of file SemaTemplate.cpp.
References clang::FixItHint::CreateRemoval(), Diag(), clang::Scope::getTemplateParamParent(), clang::CXXScopeSpec::getWithLocInContext(), clang::CXXScopeSpec::isInvalid(), and clang::SourceLocation::isValid().
Referenced by clang::Parser::TryAnnotateTypeOrScopeToken().
TypeResult Sema::ActOnTypenameType | ( | Scope * | S, |
SourceLocation | TypenameLoc, | ||
const CXXScopeSpec & | SS, | ||
SourceLocation | TemplateLoc, | ||
TemplateTy | TemplateName, | ||
IdentifierInfo * | TemplateII, | ||
SourceLocation | TemplateIILoc, | ||
SourceLocation | LAngleLoc, | ||
ASTTemplateArgsPtr | TemplateArgs, | ||
SourceLocation | RAngleLoc | ||
) |
Called when the parser has parsed a C++ typename specifier that ends in a template-id, e.g., "typename MetaFun::template apply<T1, T2>".
S | The scope in which this typename type occurs. |
TypenameLoc | the location of the 'typename' keyword |
SS | the nested-name-specifier following the typename (e.g., 'T::'). |
TemplateLoc | the location of the 'template' keyword, if any. |
TemplateName | The template name. |
TemplateII | The identifier used to name the template. |
TemplateIILoc | The location of the template name. |
LAngleLoc | The location of the opening angle bracket ('<'). |
TemplateArgs | The template arguments. |
RAngleLoc | The location of the closing angle bracket ('>'). |
Definition at line 9811 of file SemaTemplate.cpp.
References clang::FixItHint::CreateRemoval(), Diag(), clang::OpaquePtr< PtrTy >::get(), clang::TemplateName::getAsDependentTemplateName(), clang::CXXScopeSpec::getScopeRep(), clang::Scope::getTemplateParamParent(), and clang::SourceLocation::isValid().
NamedDecl * Sema::ActOnTypeParameter | ( | Scope * | S, |
bool | Typename, | ||
SourceLocation | EllipsisLoc, | ||
SourceLocation | KeyLoc, | ||
IdentifierInfo * | ParamName, | ||
SourceLocation | ParamNameLoc, | ||
unsigned | Depth, | ||
unsigned | Position, | ||
SourceLocation | EqualLoc, | ||
ParsedType | DefaultArg | ||
) |
ActOnTypeParameter - Called when a C++ template type parameter (e.g., "typename T") has been parsed.
Typename specifies whether the keyword "typename" was used to declare the type parameter (otherwise, "class" was used), and KeyLoc is the location of the "class" or "typename" keyword. ParamName is the name of the parameter (NULL indicates an unnamed template parameter) and ParamNameLoc is the location of the parameter name (if any). If the type parameter has a default argument, it will be added later via ActOnTypeParameterDefault.
Definition at line 993 of file SemaTemplate.cpp.
ExprResult Sema::ActOnTypeTrait | ( | TypeTrait | Kind, |
SourceLocation | KWLoc, | ||
ArrayRef< ParsedType > | Args, | ||
SourceLocation | RParenLoc | ||
) |
Parsed one of the type trait support pseudo-functions.
Definition at line 5041 of file SemaExprCXX.cpp.
References BuildTypeTrait(), Context, clang::ASTContext::getTrivialTypeSourceInfo(), and GetTypeFromParser().
Referenced by TypeTraitArity().
ExprResult Sema::ActOnUnaryExprOrTypeTraitExpr | ( | SourceLocation | OpLoc, |
UnaryExprOrTypeTrait | ExprKind, | ||
bool | IsType, | ||
void * | TyOrEx, | ||
SourceRange | ArgRange | ||
) |
ActOnUnaryExprOrTypeTraitExpr - Handle sizeof(type)
and sizeof
expr
and the same for alignof
and __alignof
Note that the ArgRange is invalid if isType is false.
Definition at line 4210 of file SemaExpr.cpp.
References clang::ExprError(), and clang::OpaquePtr< QualType >::getFromOpaquePtr().
ExprResult Sema::ActOnUnaryOp | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
tok::TokenKind | Op, | ||
Expr * | Input | ||
) |
Definition at line 13405 of file SemaExpr.cpp.
References ConvertTokenKindToUnaryOpcode().
Referenced by clang::Parser::ParseExpression().
void Sema::ActOnUndeclaredTypeTemplateName | ( | Scope * | S, |
TemplateTy & | Name, | ||
TemplateNameKind & | TNK, | ||
SourceLocation | NameLoc, | ||
IdentifierInfo *& | II | ||
) |
Try to resolve an undeclared template name as a type template.
Sets II to the identifier corresponding to the template name, and updates Name to a corresponding (typo-corrected) type template name and TNK to the corresponding kind, if possible.
Definition at line 3423 of file SemaTemplate.cpp.
void Sema::ActOnUninitializedDecl | ( | Decl * | dcl | ) |
Definition at line 11846 of file SemaDecl.cpp.
References clang::VarDecl::DeclarationOnly, clang::VarDecl::Definition, Diag(), clang::Type::isDependentType(), clang::Type::isUndeducedType(), clang::opencl_constant, clang::SC_Extern, clang::SC_PrivateExtern, and clang::VarDecl::TentativeDefinition.
Decl * Sema::ActOnUsingDeclaration | ( | Scope * | CurScope, |
AccessSpecifier | AS, | ||
SourceLocation | UsingLoc, | ||
SourceLocation | TypenameLoc, | ||
CXXScopeSpec & | SS, | ||
UnqualifiedId & | Name, | ||
SourceLocation | EllipsisLoc, | ||
const ParsedAttributesView & | AttrList | ||
) |
Definition at line 9517 of file SemaDeclCXX.cpp.
Decl * Sema::ActOnUsingDirective | ( | Scope * | CurScope, |
SourceLocation | UsingLoc, | ||
SourceLocation | NamespcLoc, | ||
CXXScopeSpec & | SS, | ||
SourceLocation | IdentLoc, | ||
IdentifierInfo * | NamespcName, | ||
const ParsedAttributesView & | AttrList | ||
) |
Definition at line 9421 of file SemaDeclCXX.cpp.
References clang::LookupResult::addDecl(), clang::LookupResult::clear(), clang::UsingDirectiveDecl::Create(), clang::Scope::DeclScope, Diag(), clang::LookupResult::empty(), clang::DeclContext::Encloses(), clang::LookupResult::getAsSingle(), clang::Scope::getFlags(), clang::NestedNameSpecifier::getKind(), clang::Scope::getParent(), clang::DeclContext::getParent(), clang::LookupResult::getRepresentativeDecl(), clang::CXXScopeSpec::getScopeRep(), clang::NestedNameSpecifier::Global, clang::LookupResult::isAmbiguous(), clang::CXXScopeSpec::isInvalid(), clang::CXXScopeSpec::isSet(), clang::IdentifierInfo::isStr(), clang::Scope::isTemplateParamScope(), clang::SourceLocation::isValid(), clang::LookupResult::resolveKind(), and TryNamespaceTypoCorrection().
ExprResult Sema::ActOnVAArg | ( | SourceLocation | BuiltinLoc, |
Expr * | E, | ||
ParsedType | Ty, | ||
SourceLocation | RPLoc | ||
) |
Definition at line 14069 of file SemaExpr.cpp.
NamedDecl * Sema::ActOnVariableDeclarator | ( | Scope * | S, |
Declarator & | D, | ||
DeclContext * | DC, | ||
TypeSourceInfo * | TInfo, | ||
LookupResult & | Previous, | ||
MultiTemplateParamsArg | TemplateParamLists, | ||
bool & | AddToScope, | ||
ArrayRef< BindingDecl *> | Bindings = None |
||
) |
Definition at line 6351 of file SemaDecl.cpp.
DeclResult Sema::ActOnVarTemplateSpecialization | ( | Scope * | S, |
Declarator & | D, | ||
TypeSourceInfo * | DI, | ||
SourceLocation | TemplateKWLoc, | ||
TemplateParameterList * | TemplateParams, | ||
StorageClass | SC, | ||
bool | IsPartialSpecialization | ||
) |
Definition at line 3865 of file SemaTemplate.cpp.
References clang::Declarator::getIdentifierLoc(), clang::UnqualifiedId::getKind(), clang::Declarator::getName(), clang::IK_TemplateId, makeTemplateArgumentListInfo(), and clang::UnqualifiedId::TemplateId.
StmtResult Sema::ActOnWhileStmt | ( | SourceLocation | WhileLoc, |
ConditionResult | Cond, | ||
Stmt * | Body | ||
) |
Definition at line 1279 of file SemaStmt.cpp.
References clang::WhileStmt::Create(), clang::Sema::ConditionResult::get(), clang::Sema::ConditionResult::isInvalid(), and clang::StmtError().
void clang::Sema::AddAlignedAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | E, | ||
unsigned | SpellingListIndex, | ||
bool | IsPackExpansion | ||
) |
AddAlignedAttr - Adds an aligned attribute to a particular declaration.
void clang::Sema::AddAlignedAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
TypeSourceInfo * | T, | ||
unsigned | SpellingListIndex, | ||
bool | IsPackExpansion | ||
) |
void Sema::AddAlignmentAttributesForRecord | ( | RecordDecl * | RD | ) |
AddAlignmentAttributesForRecord - Adds any needed alignment attributes to a the record decl, to handle '#pragma pack' and '#pragma options align'.
Definition at line 50 of file SemaAttr.cpp.
References clang::Decl::addAttr(), Context, clang::Sema::PragmaStack< ValueType >::CurrentPragmaLocation, clang::Sema::PragmaStack< ValueType >::CurrentValue, kMac68kAlignmentSentinel, PackIncludeStack, and PackStack.
void clang::Sema::AddAlignValueAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | E, | ||
unsigned | SpellingListIndex | ||
) |
AddAlignValueAttr - Adds an align_value attribute to a particular declaration.
void clang::Sema::AddAllocAlignAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | ParamExpr, | ||
unsigned | SpellingListIndex | ||
) |
AddAllocAlignAttr - Adds an alloc_align attribute to a particular declaration.
void clang::Sema::addAMDGPUFlatWorkGroupSizeAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | Min, | ||
Expr * | Max, | ||
unsigned | SpellingListIndex | ||
) |
addAMDGPUFlatWorkGroupSizeAttr - Adds an amdgpu_flat_work_group_size attribute to a particular declaration.
void clang::Sema::addAMDGPUWavesPerEUAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | Min, | ||
Expr * | Max, | ||
unsigned | SpellingListIndex | ||
) |
addAMDGPUWavePersEUAttr - Adds an amdgpu_waves_per_eu attribute to a particular declaration.
void Sema::AddAnyMethodToGlobalPool | ( | Decl * | D | ) |
AddAnyMethodToGlobalPool - Add any method, instance or factory to global pool.
Definition at line 328 of file SemaDeclObjC.cpp.
References AddFactoryMethodToGlobalPool(), AddInstanceMethodToGlobalPool(), and clang::ObjCMethodDecl::isInstanceMethod().
void Sema::AddArgumentDependentLookupCandidates | ( | DeclarationName | Name, |
SourceLocation | Loc, | ||
ArrayRef< Expr *> | Args, | ||
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | PartialOverloading = false |
||
) |
Add function candidates found via argument-dependent lookup to the set of overloading candidates.
This routine performs argument-dependent name lookup based on the given function name (which may also be an operator name) and adds all of the overload candidates found by ADL to the overload candidate set (C++ [basic.lookup.argdep]).
Definition at line 8979 of file SemaOverload.cpp.
void clang::Sema::AddAssumeAlignedAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | E, | ||
Expr * | OE, | ||
unsigned | SpellingListIndex | ||
) |
AddAssumeAlignedAttr - Adds an assume_aligned attribute to a particular declaration.
void Sema::AddBuiltinCandidate | ( | QualType * | ParamTys, |
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | IsAssignmentOperator = false , |
||
unsigned | NumContextualBoolArguments = 0 |
||
) |
AddBuiltinCandidate - Add a candidate for a built-in operator.
ResultTy and ParamTys are the result and parameter types of the built-in candidate, respectively. Args and NumArgs are the arguments being passed to the candidate. IsAssignmentOperator should be true when this built-in candidate is an assignment operator. NumContextualBoolArguments is the number of arguments (at the beginning of the argument list) that will be contextually converted to bool.
Definition at line 7336 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::addCandidate(), clang::AS_none, clang::OverloadCandidate::BuiltinParamTypes, clang::OverloadCandidate::ExplicitCallArguments, clang::OverloadCandidate::FoundDecl, clang::OverloadCandidate::Function, clang::OverloadCandidate::IgnoreObjectArgument, clang::OverloadCandidate::IsSurrogate, clang::DeclAccessPair::make(), Unevaluated, and clang::OverloadCandidate::Viable.
void Sema::AddBuiltinOperatorCandidates | ( | OverloadedOperatorKind | Op, |
SourceLocation | OpLoc, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet | ||
) |
AddBuiltinOperatorCandidates - Add the appropriate built-in operator overloads to the candidate set (C++ [over.built]), based on the operator Op
and the arguments given.
For example, if the operator is a binary '+', this routine might add "int operator+(int, int)" to cover integer addition.
Definition at line 8783 of file SemaOverload.cpp.
References clang::Qualifiers::addConst(), and CollectVRQualifiers().
Referenced by FindConditionalOverload().
void Sema::AddCFAuditedAttribute | ( | Decl * | D | ) |
AddCFAuditedAttribute - Check whether we're currently within '#pragma clang arc_cf_code_audited' and, if so, consider adding the appropriate attribute.
Definition at line 461 of file SemaAttr.cpp.
References clang::Decl::addAttr(), Context, clang::Lexer::findLocationAfterToken(), clang::SourceRange::getBegin(), clang::CharSourceRange::getCharRange(), clang::SourceRange::getEnd(), getLangOpts(), clang::Preprocessor::getPragmaARCCFCodeAuditedLoc(), getSourceManager(), clang::attr::getSubjectMatchRuleSpelling(), clang::CharSourceRange::getTokenRange(), clang::Decl::hasAttr(), clang::SourceLocation::isValid(), PP, and clang::Result.
void Sema::AddConversionCandidate | ( | CXXConversionDecl * | Conversion, |
DeclAccessPair | FoundDecl, | ||
CXXRecordDecl * | ActingContext, | ||
Expr * | From, | ||
QualType | ToType, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | AllowObjCConversionOnExplicit, | ||
bool | AllowExplicit, | ||
bool | AllowResultConversion = true |
||
) |
AddConversionCandidate - Add a C++ conversion function as a candidate in the candidate set (C++ [over.match.conv], C++ [over.match.copy]).
From is the expression we're converting from, and ToType is the type that we're eventually trying to convert to (which may or may not be the same type as the type that the conversion function produces).
Definition at line 6941 of file SemaOverload.cpp.
Referenced by collectViableConversionCandidates(), FindConversionForRefInit(), IsUserDefinedConversion(), ResolveConstructorOverload(), TryRefInitWithConversionFunction(), and TryUserDefinedConversion().
void Sema::addExternalSource | ( | ExternalSemaSource * | E | ) |
|
inline |
AddFactoryMethodToGlobalPool - Same as above, but for factory methods.
Definition at line 3797 of file Sema.h.
Referenced by AddAnyMethodToGlobalPool(), and ProcessPropertyDecl().
void Sema::AddFunctionCandidates | ( | const UnresolvedSetImpl & | Fns, |
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
TemplateArgumentListInfo * | ExplicitTemplateArgs = nullptr , |
||
bool | SuppressUserConversions = false , |
||
bool | PartialOverloading = false , |
||
bool | FirstArgumentIsBase = false |
||
) |
Add all of the function declarations in the given function set to the overload candidate set.
Definition at line 6472 of file SemaOverload.cpp.
References clang::UnresolvedSetImpl::begin(), clang::UnresolvedSetImpl::end(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::NamedDecl::getUnderlyingDecl(), clang::QualType::isNull(), clang::Type::isPointerType(), and clang::Expr::Classification::makeSimpleLValue().
void Sema::AddImplicitlyDeclaredMembersToClass | ( | CXXRecordDecl * | ClassDecl | ) |
AddImplicitlyDeclaredMembersToClass - Adds any implicitly-declared special functions, such as the default constructor, copy constructor, or destructor, to the given C++ class (C++ [special]p1).
This routine can only be executed just before the definition of the class is complete.
Definition at line 7984 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::hasInheritedConstructor(), clang::CXXRecordDecl::needsImplicitCopyConstructor(), clang::CXXRecordDecl::needsImplicitDefaultConstructor(), and clang::CXXRecordDecl::needsOverloadResolutionForCopyConstructor().
void Sema::addImplicitTypedef | ( | StringRef | Name, |
QualType | T | ||
) |
Definition at line 190 of file Sema.cpp.
Referenced by Initialize().
void Sema::addInitCapture | ( | sema::LambdaScopeInfo * | LSI, |
VarDecl * | Var | ||
) |
Add an init-capture to a lambda scope.
Definition at line 845 of file SemaLambda.cpp.
References clang::sema::CapturingScopeInfo::addCapture(), clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::VarDecl::isInitCapture(), and clang::Type::isReferenceType().
AddInitializerToDecl - Adds the initializer Init to the declaration dcl.
If DirectInit is true, this is C++ direct initialization rather than copy initialization.
Definition at line 11365 of file SemaDecl.cpp.
References Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Decl::getLocation(), clang::Stmt::getSourceRange(), clang::ValueDecl::getType(), clang::Decl::hasAttr(), clang::VarDecl::hasExternalStorage(), clang::Type::isDependentType(), clang::Decl::isInvalidDecl(), clang::VarDecl::isLocalVarDecl(), clang::VarDecl::isStaticDataMember(), clang::Type::isUndeducedType(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), and clang::Decl::setInvalidDecl().
Referenced by buildCaptureDecl(), checkOpenMPLoop(), FinishForRangeVarDecl(), and noteMemberDeclaredHere().
|
inline |
AddInstanceMethodToGlobalPool - All instance methods in a translation unit are added to a global pool.
This allows us to efficiently associate a selector with a method declaraation for purposes of typechecking messages sent to "id" (where the class of the object is unknown).
Definition at line 3792 of file Sema.h.
Referenced by AddAnyMethodToGlobalPool(), and ProcessPropertyDecl().
void Sema::AddKnownFunctionAttributes | ( | FunctionDecl * | FD | ) |
Adds any function attributes that we know a priori based on the declaration of this function.
These attributes can apply both to implicitly-declared builtins (like __builtin___printf_chk) or to library-declared functions like NSLog or printf.
We need to check for duplicate attributes both here and where user-written attributes are applied to declarations.
Definition at line 14029 of file SemaDecl.cpp.
References clang::FunctionDecl::getBuiltinID(), and clang::Decl::isInvalidDecl().
void Sema::addLambdaParameters | ( | ArrayRef< LambdaIntroducer::LambdaCapture > | Captures, |
CXXMethodDecl * | CallOperator, | ||
Scope * | CurScope | ||
) |
Introduce the lambda parameters into scope.
Definition at line 507 of file SemaLambda.cpp.
References Diag(), clang::NamedDecl::getIdentifier(), clang::Decl::getLocation(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), and p.
void clang::Sema::AddLaunchBoundsAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
Expr * | MaxThreads, | ||
Expr * | MinBlocks, | ||
unsigned | SpellingListIndex | ||
) |
AddLaunchBoundsAttr - Adds a launch_bounds attribute to a particular declaration.
void Sema::AddMemberOperatorCandidates | ( | OverloadedOperatorKind | Op, |
SourceLocation | OpLoc, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
SourceRange | OpRange = SourceRange() |
||
) |
Add overload candidates for overloaded operators that are member functions.
Add the overloaded operator candidates that are member functions for the operator Op that was used in an operator expression such as "x Op y". , Args/NumArgs provides the operator arguments, and CandidateSet will store the added overload candidates. (C++ [over.match.oper]).
Definition at line 7285 of file SemaOverload.cpp.
void Sema::AddMethodCandidate | ( | DeclAccessPair | FoundDecl, |
QualType | ObjectType, | ||
Expr::Classification | ObjectClassification, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | SuppressUserConversions = false |
||
) |
AddMethodCandidate - Adds a named decl (which is some kind of method) as a method candidate to the given overload set.
Definition at line 6541 of file SemaOverload.cpp.
References clang::DeclAccessPair::getDecl(), and clang::Decl::getDeclContext().
void Sema::AddMethodCandidate | ( | CXXMethodDecl * | Method, |
DeclAccessPair | FoundDecl, | ||
CXXRecordDecl * | ActingContext, | ||
QualType | ObjectType, | ||
Expr::Classification | ObjectClassification, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | SuppressUserConversions = false , |
||
bool | PartialOverloading = false , |
||
ConversionSequenceList | EarlyConversions = None |
||
) |
AddMethodCandidate - Adds the given C++ member function to the set of candidate functions, using the given function call arguments and the object argument (Object
).
For example, in a call o.f(a1,a2)
, Object
will contain o
and Args
will contain both a1
and a2
. If SuppressUserConversions
, then don't allow user-defined conversions via constructors or conversion operators.
Definition at line 6575 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::addCandidate(), clang::OverloadCandidate::FoundDecl, clang::Type::getAs(), clang::ValueDecl::getType(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::CXXMethodDecl::isMoveAssignmentOperator(), clang::OverloadCandidateSet::isNewCandidate(), and Unevaluated.
void Sema::AddMethodTemplateCandidate | ( | FunctionTemplateDecl * | MethodTmpl, |
DeclAccessPair | FoundDecl, | ||
CXXRecordDecl * | ActingContext, | ||
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
QualType | ObjectType, | ||
Expr::Classification | ObjectClassification, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | SuppressUserConversions = false , |
||
bool | PartialOverloading = false |
||
) |
Add a C++ member function template as a candidate to the candidate set, using template argument deduction to produce an appropriate member function template specialization.
Definition at line 6713 of file SemaOverload.cpp.
void Sema::addMethodToGlobalList | ( | ObjCMethodList * | List, |
ObjCMethodDecl * | Method | ||
) |
Add the given method to the list of globally-known methods.
Definition at line 3283 of file SemaDeclObjC.cpp.
Referenced by updateOutOfDateSelector().
void clang::Sema::AddModeAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
IdentifierInfo * | Name, | ||
unsigned | SpellingListIndex, | ||
bool | InInstantiation = false |
||
) |
AddModeAttr - Adds a mode attribute to a particular declaration.
void Sema::AddMsStructLayoutForRecord | ( | RecordDecl * | RD | ) |
AddMsStructLayoutForRecord - Adds ms_struct layout attribute to record.
Definition at line 76 of file SemaAttr.cpp.
References clang::Decl::addAttr(), Context, clang::Sema::PragmaStack< ValueType >::CurrentValue, getLangOpts(), MSStructPragmaOn, and VtorDispStack.
void Sema::AddOptnoneAttributeIfNoConflicts | ( | FunctionDecl * | FD, |
SourceLocation | Loc | ||
) |
Adds the 'optnone' attribute to the function declaration if there are no conflicts; Loc represents the location causing the 'optnone' attribute to be added (usually because of a pragma).
Definition at line 738 of file SemaAttr.cpp.
References clang::Decl::addAttr(), Context, and clang::Decl::hasAttr().
Referenced by AddRangeBasedOptnone().
void Sema::AddOverloadCandidate | ( | FunctionDecl * | Function, |
DeclAccessPair | FoundDecl, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | SuppressUserConversions = false , |
||
bool | PartialOverloading = false , |
||
bool | AllowExplicit = true , |
||
bool | AllowExplicitConversions = false , |
||
ADLCallKind | IsADLCandidate = ADLCallKind::NotADL , |
||
ConversionSequenceList | EarlyConversions = None |
||
) |
AddOverloadCandidate - Adds the given function to the set of candidate functions, using the given function call arguments.
If SuppressUserConversions
, then don't allow user-defined conversions via constructors or conversion operators.
PartialOverloading | true if we are performing "partial" overloading based on an incomplete set of function arguments. This feature is used by code completion. |
Definition at line 5997 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::CSK_Operator, clang::Type::getAs(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::OverloadCandidateSet::getKind(), clang::ValueDecl::getType(), IsAcceptableNonMemberOperatorCandidate(), clang::OverloadCandidateSet::isNewCandidate(), and clang::Expr::Classification::makeSimpleLValue().
Referenced by IsInitializerListConstructorConversion(), IsUserDefinedConversion(), resolveAllocationOverload(), resolveBuiltinNewDeleteOverload(), ResolveConstructorOverload(), TryRefInitWithConversionFunction(), and TryUserDefinedConversion().
void Sema::AddOverloadedCallCandidates | ( | UnresolvedLookupExpr * | ULE, |
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | PartialOverloading = false |
||
) |
Add the overload candidates named by callee and/or found by argument dependent lookup to the given overload set.
Definition at line 11787 of file SemaOverload.cpp.
References AddOverloadedCallCandidate(), clang::OverloadExpr::copyTemplateArgumentsInto(), clang::OverloadExpr::decls_begin(), clang::OverloadExpr::decls_end(), clang::Expr::getExprLoc(), clang::OverloadExpr::getName(), clang::OverloadExpr::hasExplicitTemplateArgs(), and clang::UnresolvedLookupExpr::requiresADL().
bool Sema::AddOverriddenMethods | ( | CXXRecordDecl * | DC, |
CXXMethodDecl * | MD | ||
) |
AddOverriddenMethods - See if a method overrides any in the base classes, and if so, check that it's a valid override and remember it.
Definition at line 7709 of file SemaDecl.cpp.
void clang::Sema::AddParameterABIAttr | ( | SourceRange | AttrRange, |
Decl * | D, | ||
ParameterABI | ABI, | ||
unsigned | SpellingListIndex | ||
) |
Adds the attributes that have been specified using the '#pragma clang attribute push' directives to the given declaration.
Definition at line 682 of file SemaAttr.cpp.
References clang::ParsedAttributesView::addAtEnd(), clang::ParsedAttr::appliesToDecl(), clang::ParsedAttr::isPragmaClangAttribute(), PragmaAttributeCurrentTargetDecl, PragmaAttributeStack, and ProcessDeclAttributeList().
Referenced by ActOnForwardProtocolDeclaration(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), and ActOnStartProtocolInterface().
void Sema::AddPushedVisibilityAttribute | ( | Decl * | RD | ) |
AddPushedVisibilityAttribute - If '#pragma GCC visibility' was used, add an appropriate visibility attribute.
Definition at line 755 of file SemaAttr.cpp.
References clang::NamedDecl::getExplicitVisibility(), VisContext, and clang::NamedDecl::VisibilityForValue.
void Sema::AddRangeBasedOptnone | ( | FunctionDecl * | FD | ) |
Only called on function definitions; if there is a pragma in scope with the effect of a range-based optnone, consider marking the function with attribute optnone.
Definition at line 731 of file SemaAttr.cpp.
References AddOptnoneAttributeIfNoConflicts(), clang::SourceLocation::isValid(), and OptimizeOffPragmaLocation.
void Sema::AddSurrogateCandidate | ( | CXXConversionDecl * | Conversion, |
DeclAccessPair | FoundDecl, | ||
CXXRecordDecl * | ActingContext, | ||
const FunctionProtoType * | Proto, | ||
Expr * | Object, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet | ||
) |
AddSurrogateCandidate - Adds a "surrogate" candidate function that converts the given Object
to a function pointer via the conversion function Conversion
, and then attempts to call it with the given arguments (C++ [over.call.object]p2-4).
Proto is the type of function that we'll eventually be calling.
Definition at line 7172 of file SemaOverload.cpp.
void Sema::AddTemplateConversionCandidate | ( | FunctionTemplateDecl * | FunctionTemplate, |
DeclAccessPair | FoundDecl, | ||
CXXRecordDecl * | ActingDC, | ||
Expr * | From, | ||
QualType | ToType, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | AllowObjCConversionOnExplicit, | ||
bool | AllowExplicit, | ||
bool | AllowResultConversion = true |
||
) |
Adds a conversion function template specialization candidate to the overload set, using template argument deduction to deduce the template arguments of the conversion function template from the type that we are converting to (C++ [temp.deduct.conv]).
Definition at line 7130 of file SemaOverload.cpp.
Referenced by collectViableConversionCandidates(), FindConversionForRefInit(), IsUserDefinedConversion(), ResolveConstructorOverload(), TryRefInitWithConversionFunction(), and TryUserDefinedConversion().
void Sema::AddTemplateOverloadCandidate | ( | FunctionTemplateDecl * | FunctionTemplate, |
DeclAccessPair | FoundDecl, | ||
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
bool | SuppressUserConversions = false , |
||
bool | PartialOverloading = false , |
||
bool | AllowExplicit = true , |
||
ADLCallKind | IsADLCandidate = ADLCallKind::NotADL |
||
) |
Add a C++ function template specialization as a candidate in the candidate set, using template argument deduction to produce an appropriate function template specialization.
Definition at line 6780 of file SemaOverload.cpp.
Referenced by IsInitializerListConstructorConversion(), IsUserDefinedConversion(), resolveAllocationOverload(), resolveBuiltinNewDeleteOverload(), ResolveConstructorOverload(), TryRefInitWithConversionFunction(), and TryUserDefinedConversion().
void clang::Sema::AddXConsumedAttr | ( | Decl * | D, |
SourceRange | SR, | ||
unsigned | SpellingIndex, | ||
RetainOwnershipKind | K, | ||
bool | IsTemplateInstantiation | ||
) |
QualType Sema::adjustCCAndNoReturn | ( | QualType | ArgFunctionType, |
QualType | FunctionType, | ||
bool | AdjustExceptionSpec = false |
||
) |
Adjust the type ArgFunctionType
to match the calling convention, noreturn, and optionally the exception specification of FunctionType
.
Deduction often wants to ignore these properties when matching function types.
Definition at line 3949 of file SemaTemplateDeduction.cpp.
References clang::Type::castAs(), clang::FunctionProtoType::ExtProtoInfo::ExceptionSpec, clang::Type::getAs(), clang::FunctionType::getCallConv(), clang::FunctionProtoType::getExtProtoInfo(), clang::FunctionType::getNoReturnAttr(), clang::FunctionProtoType::hasExceptionSpec(), and clang::QualType::isNull().
|
static |
Adjust the DeclContext
for a function or variable that might be a function-local external declaration.
Definition at line 6319 of file SemaDecl.cpp.
References clang::DeclContext::getParent(), clang::DeclContext::isDependentContext(), clang::DeclContext::isFileContext(), and clang::DeclContext::isFunctionOrMethod().
Referenced by clang::TemplateDeclInstantiator::VisitFunctionDecl(), and clang::TemplateDeclInstantiator::VisitVarDecl().
TemplateDecl * Sema::AdjustDeclIfTemplate | ( | Decl *& | D | ) |
AdjustDeclIfTemplate - If the given decl happens to be a template, reset the parameter D to reference the templated declaration and return a pointer to the template declaration.
Otherwise, do nothing to D and return null.
Definition at line 862 of file SemaTemplate.cpp.
void Sema::AdjustDestructorExceptionSpec | ( | CXXDestructorDecl * | Destructor | ) |
Build an exception spec for destructors that don't have one.
C++11 says that user-defined destructors with no exception spec get one that looks as if the destructor was implicitly declared.
Definition at line 11448 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus11, clang::EST_Unevaluated, clang::FunctionProtoType::ExtProtoInfo::ExceptionSpec, clang::FunctionProtoType::getExtProtoInfo(), clang::ValueDecl::getType(), clang::FunctionProtoType::hasExceptionSpec(), clang::DeclContext::isDependentContext(), clang::ValueDecl::setType(), clang::FunctionProtoType::ExceptionSpecInfo::SourceDecl, and clang::FunctionProtoType::ExceptionSpecInfo::Type.
Referenced by clang::TemplateDeclInstantiator::InitMethodInstantiation().
void Sema::adjustMemberFunctionCC | ( | QualType & | T, |
bool | IsStatic, | ||
bool | IsCtorOrDtor, | ||
SourceLocation | Loc | ||
) |
Adjust the calling convention of a method to be the ABI default if it wasn't specified explicitly.
This handles method types formed from function type typedefs and typename template arguments.
Definition at line 7088 of file SemaType.cpp.
References clang::FunctionType::getCallConv().
Are the two types lax-compatible vector types? That is, given that one of them is a vector, do they have equal storage sizes, where the storage size is the number of elements times the element size?
This will also return false if either of the types is neither a vector nor a real type.
Definition at line 6395 of file SemaExpr.cpp.
References breakDownVectorType(), clang::Type::isExtVectorType(), clang::Type::isScalarType(), and clang::Type::isVectorType().
Referenced by TryReinterpretCast().
bool Sema::AreMultipleMethodsInGlobalPool | ( | Selector | Sel, |
ObjCMethodDecl * | BestMethod, | ||
SourceRange | R, | ||
bool | receiverIdOrClass, | ||
SmallVectorImpl< ObjCMethodDecl *> & | Methods | ||
) |
Definition at line 3512 of file SemaDeclObjC.cpp.
References DiagnoseMultipleMethodInGlobalPool(), clang::ObjCMethodList::getNext(), clang::Decl::hasAttr(), clang::ObjCMethodList::hasMoreThanOneDecl(), clang::ObjCMethodDecl::isInstanceMethod(), MethodPool, and ReadMethodPool().
void Sema::ArgumentDependentLookup | ( | DeclarationName | Name, |
SourceLocation | Loc, | ||
ArrayRef< Expr *> | Args, | ||
ADLResult & | Functions | ||
) |
Definition at line 3425 of file SemaLookup.cpp.
void Sema::AtomicPropertySetterGetterRules | ( | ObjCImplDecl * | IMPDecl, |
ObjCInterfaceDecl * | IDecl | ||
) |
AtomicPropertySetterGetterRules - This routine enforces the rule (via warning) when atomic property has one but not the other user-declared setter or getter.
Definition at line 2111 of file SemaObjCProperty.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::ObjCPropertyImplDecl::Dynamic, clang::ObjCImplDecl::FindPropertyImplDecl(), clang::TypeLoc::getBeginLoc(), clang::ObjCContainerDecl::getClassMethod(), clang::ObjCPropertyDecl::getGetterName(), clang::NamedDecl::getIdentifier(), clang::ObjCContainerDecl::getInstanceMethod(), getLangOpts(), clang::Decl::getLocation(), getLocForEndOfToken(), clang::ObjCPropertyDecl::getLParenLoc(), clang::ObjCPropertyDecl::getPropertyAttributes(), clang::ObjCPropertyDecl::getPropertyAttributesAsWritten(), clang::ObjCPropertyDecl::getQueryKind(), clang::ObjCPropertyDecl::getSetterName(), clang::TypeSourceInfo::getTypeLoc(), clang::ObjCPropertyDecl::getTypeSourceInfo(), clang::ObjCPropertyDecl::isClassProperty(), clang::SourceLocation::isInvalid(), clang::SourceLocation::isValid(), clang::ObjCInterfaceDecl::known_extensions(), clang::LangOptions::NonGC, clang::ObjCPropertyDecl::OBJC_PR_atomic, clang::ObjCPropertyDecl::OBJC_PR_nonatomic, clang::ObjCPropertyDecl::OBJC_PR_readwrite, clang::ObjCContainerDecl::properties(), and clang::Property.
bool Sema::AttachBaseSpecifiers | ( | CXXRecordDecl * | Class, |
MutableArrayRef< CXXBaseSpecifier *> | Bases | ||
) |
Performs the actual work of attaching the given base class specifiers to a C++ class.
Definition at line 2430 of file SemaDeclCXX.cpp.
Referenced by SubstBaseSpecifiers().
QualType Sema::BuildAddressSpaceAttr | ( | QualType & | T, |
LangAS | ASIdx, | ||
Expr * | AddrSpace, | ||
SourceLocation | AttrLoc | ||
) |
BuildAddressSpaceAttr - Builds a DependentAddressSpaceType if an expression is uninstantiated.
If instantiated it will apply the appropriate address space to the type. This function allows dependent template variables to be used in conjunction with the address_space attribute
Definition at line 5902 of file SemaType.cpp.
References DiagnoseMultipleAddrSpaceAttributes(), clang::QualType::getAddressSpace(), and clang::Expr::isValueDependent().
Referenced by HandleAddressSpaceTypeAttribute().
QualType Sema::BuildAddressSpaceAttr | ( | QualType & | T, |
Expr * | AddrSpace, | ||
SourceLocation | AttrLoc | ||
) |
Same as above, but constructs the AddressSpace index if not provided.
Definition at line 5925 of file SemaType.cpp.
References BuildAddressSpaceIndex().
Decl * Sema::BuildAnonymousStructOrUnion | ( | Scope * | S, |
DeclSpec & | DS, | ||
AccessSpecifier | AS, | ||
RecordDecl * | Record, | ||
const PrintingPolicy & | Policy | ||
) |
BuildAnonymousStructOrUnion - Handle the declaration of an anonymous structure or union.
Anonymous unions are a C++ feature (C++ [class.union]) and a C11 feature; anonymous structures are a C11 feature and GNU C++ extension.
Definition at line 4687 of file SemaDecl.cpp.
ExprResult Sema::BuildAnonymousStructUnionMemberReference | ( | const CXXScopeSpec & | SS, |
SourceLocation | nameLoc, | ||
IndirectFieldDecl * | indirectField, | ||
DeclAccessPair | FoundDecl = DeclAccessPair::make(nullptr, AS_none) , |
||
Expr * | baseObjectExpr = nullptr , |
||
SourceLocation | opLoc = SourceLocation() |
||
) |
Definition at line 803 of file SemaExprMember.cpp.
References clang::IndirectFieldDecl::chain_begin(), clang::IndirectFieldDecl::chain_end(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Decl::getAccess(), clang::NamedDecl::getDeclName(), clang::Expr::getType(), clang::ValueDecl::getType(), clang::IndirectFieldDecl::getVarDecl(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isPointerType(), clang::Type::isRecordType(), clang::DeclAccessPair::make(), and result.
QualType Sema::BuildArrayType | ( | QualType | T, |
ArrayType::ArraySizeModifier | ASM, | ||
Expr * | ArraySize, | ||
unsigned | Quals, | ||
SourceRange | Brackets, | ||
DeclarationName | Entity | ||
) |
Build an array type.
T | The type of each element in the array. |
ASM | C99 array size modifier (e.g., '*', 'static'). |
ArraySize | Expression describing the size of the array. |
Brackets | The range from the opening '[' to the closing ']'. |
Entity | The name of the entity that involves the array type, if known. |
Definition at line 2128 of file SemaType.cpp.
References clang::frontend::CPlusPlus, Diag(), clang::SourceRange::getBegin(), getPrintableNameForEntity(), clang::Type::isIncompleteArrayType(), clang::Type::isReferenceType(), and clang::Type::isVoidType().
ExprResult Sema::BuildArrayTypeTrait | ( | ArrayTypeTrait | ATT, |
SourceLocation | KWLoc, | ||
TypeSourceInfo * | TSInfo, | ||
Expr * | DimExpr, | ||
SourceLocation | RParen | ||
) |
Definition at line 5328 of file SemaExprCXX.cpp.
References Context, EvaluateArrayTypeTrait(), clang::ASTContext::getSizeType(), clang::TypeSourceInfo::getType(), and clang::Type::isDependentType().
Referenced by ActOnArrayTypeTrait().
QualType Sema::BuildAtomicType | ( | QualType | T, |
SourceLocation | Loc | ||
) |
Definition at line 8415 of file SemaType.cpp.
References clang::QualType::hasQualifiers(), clang::Type::isArrayType(), clang::Type::isAtomicType(), clang::Type::isDependentType(), clang::Type::isFunctionType(), clang::Type::isReferenceType(), and clang::QualType::isTriviallyCopyableType().
MemInitResult Sema::BuildBaseInitializer | ( | QualType | BaseType, |
TypeSourceInfo * | BaseTInfo, | ||
Expr * | Init, | ||
CXXRecordDecl * | ClassDecl, | ||
SourceLocation | EllipsisLoc | ||
) |
Definition at line 4159 of file SemaDeclCXX.cpp.
References clang::Type::containsUnexpandedParameterPack(), Diag(), clang::SourceRange::getBegin(), clang::SourceRange::getEnd(), clang::TypeLoc::getLocalSourceRange(), clang::Stmt::getSourceRange(), clang::TypeSourceInfo::getTypeLoc(), clang::Type::isDependentType(), clang::Type::isRecordType(), clang::Expr::isTypeDependent(), and clang::SourceLocation::isValid().
void Sema::BuildBasePathArray | ( | const CXXBasePaths & | Paths, |
CXXCastPath & | BasePath | ||
) |
Definition at line 2612 of file SemaDeclCXX.cpp.
ExprResult Sema::BuildBinOp | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
BinaryOperatorKind | Opc, | ||
Expr * | LHSExpr, | ||
Expr * | RHSExpr | ||
) |
Definition at line 12979 of file SemaExpr.cpp.
References BuildOverloadedBinOp(), CorrectDelayedTyposInBinOp(), clang::frontend::CPlusPlus, Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAsPlaceholderType(), clang::Expr::getType(), clang::BinaryOperator::isAssignmentOp(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isOverloadableType(), clang::Expr::isTypeDependent(), and clang::ActionResult< PtrTy, CompressInvalid >::isUsable().
Referenced by buildCounterInit(), buildCounterUpdate(), checkOpenMPLoop(), EvaluateBinaryTypeTrait(), and LookupMethodInReceiverType().
ExprResult Sema::BuildBlockForLambdaConversion | ( | SourceLocation | CurrentLocation, |
SourceLocation | ConvLocation, | ||
CXXConversionDecl * | Conv, | ||
Expr * | Src | ||
) |
Definition at line 1824 of file SemaLambda.cpp.
References clang::CXXMethodDecl::getParent(), and clang::DeclContext::lookup().
QualType Sema::BuildBlockPointerType | ( | QualType | T, |
SourceLocation | Loc, | ||
DeclarationName | Entity | ||
) |
Build a block pointer type.
T | The type to which we'll be building a block pointer. |
Loc | The source location, used for diagnostics. |
Entity | The name of the entity that involves the block pointer type, if known. |
Definition at line 2623 of file SemaType.cpp.
References checkQualifiedFunction(), Diag(), and clang::Type::isFunctionType().
ExprResult Sema::BuildBuiltinBitCastExpr | ( | SourceLocation | KWLoc, |
TypeSourceInfo * | TSI, | ||
Expr * | Operand, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 347 of file SemaCast.cpp.
References clang::ExprError(), clang::TypeLoc::getBeginLoc(), clang::TypeLoc::getEndLoc(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), clang::Type::isDependentType(), and clang::Expr::isTypeDependent().
ExprResult Sema::BuildBuiltinOffsetOf | ( | SourceLocation | BuiltinLoc, |
TypeSourceInfo * | TInfo, | ||
ArrayRef< OffsetOfComponent > | Components, | ||
SourceLocation | RParenLoc | ||
) |
__builtin_offsetof(type, a.b[123][456].c)
Definition at line 13501 of file SemaExpr.cpp.
ExprResult Sema::BuildCallExpr | ( | Scope * | Scope, |
Expr * | Fn, | ||
SourceLocation | LParenLoc, | ||
MultiExprArg | ArgExprs, | ||
SourceLocation | RParenLoc, | ||
Expr * | ExecConfig = nullptr , |
||
bool | IsExecConfig = false |
||
) |
BuildCallExpr - Handle a call to Fn with the specified array of arguments.
This provides the location of the left/right parens and a list of comma locations.
Definition at line 5568 of file SemaExpr.cpp.
References checkArgsForPlaceholders(), clang::frontend::CPlusPlus, clang::CallExpr::Create(), clang::FixItHint::CreateRemoval(), Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by buildMemcpyForAssignmentOp(), BuildRecoveryCallExpr(), checkTupleLikeDecomposition(), diagReturnOnAllocFailure(), and tryToRecoverWithCall().
ExprResult Sema::BuildCallToMemberFunction | ( | Scope * | S, |
Expr * | MemExprE, | ||
SourceLocation | LParenLoc, | ||
MultiExprArg | Args, | ||
SourceLocation | RParenLoc | ||
) |
BuildCallToMemberFunction - Build a call to a member function.
MemExpr is the expression that refers to the member function (and includes the object parameter), Args/NumArgs are the arguments to the function call (not including the object parameter). The caller needs to validate that the member expression refers to a non-static member function or an overloaded member function.
Definition at line 12946 of file SemaOverload.cpp.
References clang::Expr::getType().
Referenced by tryExprAsCall().
ExprResult Sema::BuildCallToObjectOfClassType | ( | Scope * | S, |
Expr * | Obj, | ||
SourceLocation | LParenLoc, | ||
MultiExprArg | Args, | ||
SourceLocation | RParenLoc | ||
) |
BuildCallToObjectOfClassType - Build a call to an object of class type (C++ [over.call.object]), which can end up invoking an overloaded function call operator (operator()
) or performing a user-defined conversion on the object argument.
Definition at line 13228 of file SemaOverload.cpp.
References checkArgPlaceholdersForOverload(), checkPlaceholderForOverload(), clang::OverloadCandidateSet::CSK_Operator, clang::ExprError(), and clang::ActionResult< PtrTy, CompressInvalid >::get().
FieldDecl * Sema::BuildCaptureField | ( | RecordDecl * | RD, |
const sema::Capture & | Capture | ||
) |
Build a FieldDecl suitable to hold the given capture.
Create a field within the lambda class or captured statement record for the given capture.
Definition at line 1564 of file SemaLambda.cpp.
References clang::sema::Capture::getCaptureType(), clang::sema::Capture::getLocation(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::sema::Capture::getVariable(), and clang::sema::Capture::isVariableCapture().
ExprResult Sema::BuildCaptureInit | ( | const sema::Capture & | Capture, |
SourceLocation | ImplicitCaptureLoc, | ||
bool | IsOpenMPMapping = false |
||
) |
Initialize the given capture with a suitable expression.
Definition at line 1432 of file SemaLambda.cpp.
References clang::VarDecl::getInit(), clang::sema::Capture::getLocation(), clang::sema::Capture::getVariable(), clang::sema::Capture::isInitCapture(), clang::SourceLocation::isValid(), and clang::sema::Capture::isVLATypeCapture().
ExprResult Sema::BuildClassMessage | ( | TypeSourceInfo * | ReceiverTypeInfo, |
QualType | ReceiverType, | ||
SourceLocation | SuperLoc, | ||
Selector | Sel, | ||
ObjCMethodDecl * | Method, | ||
SourceLocation | LBracLoc, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
SourceLocation | RBracLoc, | ||
MultiExprArg | ArgsIn, | ||
bool | isImplicit = false |
||
) |
Build an Objective-C class message expression.
This routine takes care of both normal class messages and class messages to the superclass.
ReceiverTypeInfo | Type source information that describes the receiver of this message. This may be NULL, in which case we are sending to the superclass and SuperLoc must be a valid source location. |
ReceiverType | The type of the object receiving the message. When ReceiverTypeInfo is non-NULL, this is the same type as that refers to. For a superclass send, this is the type of the superclass. |
SuperLoc | The location of the "super" keyword in a superclass message. |
Sel | The selector to which the message is being sent. |
Method | The method that this class message is invoking, if already known. |
LBracLoc | The location of the opening square bracket ']'. |
RBracLoc | The location of the closing square bracket ']'. |
ArgsIn | The message arguments. |
Definition at line 2447 of file SemaExprObjC.cpp.
References clang::ObjCMessageExpr::Create(), clang::FixItHint::CreateInsertion(), Diag(), clang::SourceRange::getBegin(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getTypeLoc(), clang::Type::isDependentType(), clang::SourceLocation::isInvalid(), and clang::SourceLocation::isValid().
Referenced by clang::TreeTransform< Derived >::RebuildObjCMessageExpr().
ExprResult Sema::BuildClassMessageImplicit | ( | QualType | ReceiverType, |
bool | isSuperReceiver, | ||
SourceLocation | Loc, | ||
Selector | Sel, | ||
ObjCMethodDecl * | Method, | ||
MultiExprArg | Args | ||
) |
Definition at line 2273 of file SemaExprObjC.cpp.
References clang::QualType::isNull().
Referenced by LookupMethodInReceiverType().
ExprResult Sema::BuildCompoundLiteralExpr | ( | SourceLocation | LParenLoc, |
TypeSourceInfo * | TInfo, | ||
SourceLocation | RParenLoc, | ||
Expr * | LiteralExpr | ||
) |
Definition at line 6005 of file SemaExpr.cpp.
References clang::TypeSourceInfo::getType(), and clang::Type::isArrayType().
StmtResult Sema::BuildCoreturnStmt | ( | SourceLocation | KwLoc, |
Expr * | E, | ||
bool | IsImplicit = false |
||
) |
Definition at line 854 of file SemaCoroutine.cpp.
References buildPromiseCall(), checkCoroutineContext(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::InitializedEntity::InitializeResult(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isPlaceholderType(), clang::Type::isSpecificPlaceholderType(), clang::Type::isVoidType(), and clang::StmtError().
Referenced by diagReturnOnAllocFailure().
StmtResult Sema::BuildCoroutineBodyStmt | ( | CoroutineBodyStmt::CtorArgs | Args | ) |
Definition at line 1562 of file SemaCoroutine.cpp.
References clang::CoroutineBodyStmt::Create().
bool Sema::buildCoroutineParameterMoves | ( | SourceLocation | Loc | ) |
Definition at line 1524 of file SemaCoroutine.cpp.
References buildVarDecl(), castForMoving(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::FunctionDecl::parameters(), and clang::VK_LValue.
VarDecl * Sema::buildCoroutinePromise | ( | SourceLocation | Loc | ) |
Definition at line 480 of file SemaCoroutine.cpp.
References clang::Type::isDependentType().
ExprResult Sema::BuildCoyieldExpr | ( | SourceLocation | KwLoc, |
Expr * | E | ||
) |
Definition at line 812 of file SemaCoroutine.cpp.
References checkCoroutineContext(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Type::isPlaceholderType().
ExprResult Sema::BuildCStyleCastExpr | ( | SourceLocation | LParenLoc, |
TypeSourceInfo * | Ty, | ||
SourceLocation | RParenLoc, | ||
Expr * | Op | ||
) |
Definition at line 2875 of file SemaCast.cpp.
References clang::CStyleCastExpr::Create(), DiagnoseCastQual(), clang::ExprError(), clang::Stmt::getEndLoc(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getType(), and clang::TypeSourceInfo::getTypeLoc().
Referenced by buildPostUpdate().
ExprResult Sema::BuildCXXConstructExpr | ( | SourceLocation | ConstructLoc, |
QualType | DeclInitType, | ||
NamedDecl * | FoundDecl, | ||
CXXConstructorDecl * | Constructor, | ||
MultiExprArg | Exprs, | ||
bool | HadMultipleCandidates, | ||
bool | IsListInitialization, | ||
bool | IsStdInitListInitialization, | ||
bool | RequiresZeroInit, | ||
unsigned | ConstructKind, | ||
SourceRange | ParenRange | ||
) |
BuildCXXConstructExpr - Creates a complete call to a constructor, including handling of its default argument expressions.
ConstructKind | - a CXXConstructExpr::ConstructionKind |
Definition at line 13000 of file SemaDeclCXX.cpp.
Referenced by CopyObject(), clang::InitializationSequence::Perform(), PerformConstructorInitialization(), and PerformImplicitConversion().
ExprResult Sema::BuildCXXConstructExpr | ( | SourceLocation | ConstructLoc, |
QualType | DeclInitType, | ||
CXXConstructorDecl * | Constructor, | ||
bool | Elidable, | ||
MultiExprArg | ExprArgs, | ||
bool | HadMultipleCandidates, | ||
bool | IsListInitialization, | ||
bool | IsStdInitListInitialization, | ||
bool | RequiresZeroInit, | ||
unsigned | ConstructKind, | ||
SourceRange | ParenRange | ||
) |
Build a CXXConstructExpr whose constructor has already been resolved if it denotes an inherited constructor.
BuildCXXConstructExpr - Creates a complete call to a constructor, including handling of its default argument expressions.
Definition at line 13064 of file SemaDeclCXX.cpp.
References clang::CXXConstructExpr::Create(), clang::declaresSameEntity(), clang::ExprError(), clang::Type::getAsCXXRecordDecl(), clang::Type::getBaseElementTypeUnsafe(), and clang::CXXMethodDecl::getParent().
ExprResult Sema::BuildCXXConstructExpr | ( | SourceLocation | ConstructLoc, |
QualType | DeclInitType, | ||
NamedDecl * | FoundDecl, | ||
CXXConstructorDecl * | Constructor, | ||
bool | Elidable, | ||
MultiExprArg | Exprs, | ||
bool | HadMultipleCandidates, | ||
bool | IsListInitialization, | ||
bool | IsStdInitListInitialization, | ||
bool | RequiresZeroInit, | ||
unsigned | ConstructKind, | ||
SourceRange | ParenRange | ||
) |
Definition at line 13038 of file SemaDeclCXX.cpp.
ExprResult Sema::BuildCXXDefaultArgExpr | ( | SourceLocation | CallLoc, |
FunctionDecl * | FD, | ||
ParmVarDecl * | Param | ||
) |
BuildCXXDefaultArgExpr - Creates a CXXDefaultArgExpr, instantiating the default expr if needed.
Definition at line 4894 of file SemaExpr.cpp.
References clang::CXXDefaultArgExpr::Create(), and clang::ExprError().
Referenced by CopyObject().
ExprResult Sema::BuildCXXDefaultInitExpr | ( | SourceLocation | Loc, |
FieldDecl * | Field | ||
) |
Definition at line 13090 of file SemaDeclCXX.cpp.
References clang::CXXDefaultInitExpr::Create(), clang::FieldDecl::getInClassInitializer(), and clang::FieldDecl::hasInClassInitializer().
Referenced by CollectFieldInitializer().
ExprResult Sema::BuildCXXFoldExpr | ( | SourceLocation | LParenLoc, |
Expr * | LHS, | ||
BinaryOperatorKind | Operator, | ||
SourceLocation | EllipsisLoc, | ||
Expr * | RHS, | ||
SourceLocation | RParenLoc, | ||
Optional< unsigned > | NumExpansions | ||
) |
Definition at line 1188 of file SemaTemplateVariadic.cpp.
StmtResult Sema::BuildCXXForRangeStmt | ( | SourceLocation | ForLoc, |
SourceLocation | CoawaitLoc, | ||
Stmt * | InitStmt, | ||
SourceLocation | ColonLoc, | ||
Stmt * | RangeDecl, | ||
Stmt * | Begin, | ||
Stmt * | End, | ||
Expr * | Cond, | ||
Expr * | Inc, | ||
Stmt * | LoopVarDecl, | ||
SourceLocation | RParenLoc, | ||
BuildForRangeKind | Kind | ||
) |
BuildCXXForRangeStmt - Build or instantiate a C++11 for-range statement.
Definition at line 2319 of file SemaStmt.cpp.
ExprResult Sema::BuildCXXFunctionalCastExpr | ( | TypeSourceInfo * | TInfo, |
QualType | Type, | ||
SourceLocation | LParenLoc, | ||
Expr * | CastExpr, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 2901 of file SemaCast.cpp.
References clang::CXXFunctionalCastExpr::Create(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getEndLoc(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getTypeLoc(), and clang::SourceLocation::isValid().
Referenced by BuildCXXTypeConstructExpr().
ExprResult Sema::BuildCXXMemberCallExpr | ( | Expr * | Exp, |
NamedDecl * | FoundDecl, | ||
CXXConversionDecl * | Method, | ||
bool | HadMultipleCandidates | ||
) |
Definition at line 7160 of file SemaExprCXX.cpp.
Referenced by diagnoseNoViableConversion(), clang::InitializationSequence::Perform(), and recordConversion().
ExprResult Sema::BuildCXXNamedCast | ( | SourceLocation | OpLoc, |
tok::TokenKind | Kind, | ||
TypeSourceInfo * | Ty, | ||
Expr * | E, | ||
SourceRange | AngleBrackets, | ||
SourceRange | Parens | ||
) |
Definition at line 258 of file SemaCast.cpp.
References clang::CXXConstCastExpr::Create(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceRange::getEnd(), clang::TypeSourceInfo::getType(), clang::QualType::getTypePtr(), and clang::Type::isDependentType().
Referenced by castForMoving(), and CastForMoving().
bool Sema::BuildCXXNestedNameSpecifier | ( | Scope * | S, |
NestedNameSpecInfo & | IdInfo, | ||
bool | EnteringContext, | ||
CXXScopeSpec & | SS, | ||
NamedDecl * | ScopeLookupResult, | ||
bool | ErrorRecoveryLookup, | ||
bool * | IsCorrectedToColon = nullptr , |
||
bool | OnlyNamespace = false |
||
) |
Build a new nested-name-specifier for "identifier::", as described by ActOnCXXNestedNameSpecifier.
S | Scope in which the nested-name-specifier occurs. |
IdInfo | Parser information about an identifier in the nested-name-spec. |
EnteringContext | If true, enter the context specified by the nested-name-specifier. |
SS | Optional nested name specifier preceding the identifier. |
ScopeLookupResult | Provides the result of name lookup within the scope of the nested-name-specifier that was computed at template definition time. |
ErrorRecoveryLookup | Specifies if the method is called to improve error recovery and what kind of recovery is performed. |
IsCorrectedToColon | If not null, suggestion of replace '::' -> ':' are allowed. The bool value pointed by this parameter is set to 'true' if the identifier is treated as if it was followed by ':', not '::'. |
OnlyNamespace | If true, only considers namespaces in lookup. |
This routine differs only slightly from ActOnCXXNestedNameSpecifier, in that it contains an extra parameter ScopeLookupResult
, which provides the result of name lookup within the scope of the nested-name-specifier that was computed at template definition time.
If ErrorRecoveryLookup is true, then this call is used to improve error recovery. This means that it should not emit diagnostics, it should just return true on failure. It also means it should only return a valid scope if it knows that the result is correct. It should not return in a dependent context, for example. Nor will it extend SS
with the scope specifier.
Definition at line 483 of file SemaCXXScopeSpec.cpp.
ExprResult Sema::BuildCXXNew | ( | SourceRange | Range, |
bool | UseGlobal, | ||
SourceLocation | PlacementLParen, | ||
MultiExprArg | PlacementArgs, | ||
SourceLocation | PlacementRParen, | ||
SourceRange | TypeIdParens, | ||
QualType | AllocType, | ||
TypeSourceInfo * | AllocTypeInfo, | ||
Optional< Expr *> | ArraySize, | ||
SourceRange | DirectInitRange, | ||
Expr * | Initializer | ||
) |
Definition at line 1762 of file SemaExprCXX.cpp.
References clang::CXXNewExpr::CallInit, clang::SourceRange::getBegin(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getTypeLoc(), clang::Initializer, Inits, clang::SourceRange::isValid(), clang::CXXNewExpr::ListInit, and clang::CXXNewExpr::NoInit.
ExprResult Sema::BuildCXXNoexceptExpr | ( | SourceLocation | KeyLoc, |
Expr * | Operand, | ||
SourceLocation | RParen | ||
) |
Definition at line 7221 of file SemaExprCXX.cpp.
References clang::ASTContext::BoolTy, canThrow(), CanThrow(), CheckPlaceholderExpr(), Context, Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getExprLoc(), clang::Expr::HasSideEffects(), inTemplateInstantiation(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by ActOnNoexceptExpr(), and clang::TreeTransform< Derived >::RebuildCXXNoexceptExpr().
Expr * Sema::BuildCXXThisExpr | ( | SourceLocation | Loc, |
QualType | Type, | ||
bool | IsImplicit | ||
) |
Build a CXXThisExpr and mark it referenced in the current context.
Definition at line 1260 of file SemaExprCXX.cpp.
References Context, and MarkThisReferenced().
Referenced by ActOnCXXThis().
ExprResult Sema::BuildCXXThrow | ( | SourceLocation | OpLoc, |
Expr * | Ex, | ||
bool | IsThrownVarInScope | ||
) |
Definition at line 749 of file SemaExprCXX.cpp.
References Diag(), and clang::Expr::isTypeDependent().
ExprResult Sema::BuildCXXTypeConstructExpr | ( | TypeSourceInfo * | Type, |
SourceLocation | LParenLoc, | ||
MultiExprArg | Exprs, | ||
SourceLocation | RParenLoc, | ||
bool | ListInitialization | ||
) |
Definition at line 1313 of file SemaExprCXX.cpp.
References BuildCXXFunctionalCastExpr(), Context, clang::CXXUnresolvedConstructExpr::Create(), clang::InitializationKind::CreateDirect(), clang::InitializationKind::CreateDirectList(), clang::InitializationKind::CreateValue(), DeduceTemplateSpecializationFromInitializer(), Diag(), clang::ExprError(), clang::ASTContext::getBaseElementType(), clang::SourceRange::getBegin(), clang::TypeLoc::getBeginLoc(), clang::Type::getContainedDeducedType(), clang::SourceRange::getEnd(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), clang::Expr::hasAnyTypeDependentArguments(), clang::InitializedEntity::InitializeTemporary(), clang::Type::isArrayType(), clang::Type::isDependentType(), clang::Type::isFunctionType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Type::isVoidType(), clang::InitializationSequence::Perform(), RequireCompleteType(), and clang::Result.
Referenced by ActOnCXXTypeConstructExpr().
ExprResult Sema::BuildCXXTypeId | ( | QualType | TypeInfoType, |
SourceLocation | TypeidLoc, | ||
TypeSourceInfo * | Operand, | ||
SourceLocation | RParenLoc | ||
) |
Build a C++ typeid expression with a type operand.
Definition at line 436 of file SemaExprCXX.cpp.
ExprResult Sema::BuildCXXTypeId | ( | QualType | TypeInfoType, |
SourceLocation | TypeidLoc, | ||
Expr * | Operand, | ||
SourceLocation | RParenLoc | ||
) |
Build a C++ typeid expression with an expression operand.
Definition at line 461 of file SemaExprCXX.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Expr::getType(), clang::Expr::isGLValue(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isPlaceholderType(), clang::CXXRecordDecl::isPolymorphic(), clang::Expr::isTypeDependent(), and result.
ExprResult Sema::BuildCXXUuidof | ( | QualType | TypeInfoType, |
SourceLocation | TypeidLoc, | ||
TypeSourceInfo * | Operand, | ||
SourceLocation | RParenLoc | ||
) |
Build a Microsoft __uuidof expression with a type operand.
Definition at line 619 of file SemaExprCXX.cpp.
References Diag(), clang::ExprError(), clang::TypeSourceInfo::getType(), getUuidAttrOfType(), and clang::Type::isDependentType().
ExprResult Sema::BuildCXXUuidof | ( | QualType | TypeInfoType, |
SourceLocation | TypeidLoc, | ||
Expr * | Operand, | ||
SourceLocation | RParenLoc | ||
) |
Build a Microsoft __uuidof expression with an expression operand.
Definition at line 639 of file SemaExprCXX.cpp.
References clang::Expr::getType(), clang::Type::isDependentType(), and clang::Expr::isNullPointerConstant().
ExprResult Sema::BuildDeclarationNameExpr | ( | const CXXScopeSpec & | SS, |
LookupResult & | R, | ||
bool | NeedsADL, | ||
bool | AcceptInvalidDecl = false |
||
) |
Definition at line 2892 of file SemaExpr.cpp.
References CheckDeclInExpr(), clang::UnresolvedLookupExpr::Create(), clang::ExprError(), clang::LookupResult::getAsSingle(), clang::LookupResult::getFoundDecl(), clang::LookupResult::getLookupNameInfo(), clang::LookupResult::getNameLoc(), clang::LookupResult::getRepresentativeDecl(), clang::LookupResult::isSingleResult(), ShouldLookupResultBeMultiVersionOverload(), and clang::LookupResult::suppressDiagnostics().
Referenced by attemptRecovery(), BuildRecoveryCallExpr(), checkTupleLikeDecomposition(), diagReturnOnAllocFailure(), and isTupleLike().
ExprResult Sema::BuildDeclarationNameExpr | ( | const CXXScopeSpec & | SS, |
const DeclarationNameInfo & | NameInfo, | ||
NamedDecl * | D, | ||
NamedDecl * | FoundD = nullptr , |
||
const TemplateArgumentListInfo * | TemplateArgs = nullptr , |
||
bool | AcceptInvalidDecl = false |
||
) |
Complete semantic analysis for a reference to the given declaration.
Definition at line 2931 of file SemaExpr.cpp.
References CheckDeclInExpr(), clang::frontend::CPlusPlus, Diag(), diagnoseUncapturableValueReference(), clang::ExprError(), clang::XRayInstrKind::Function, clang::Type::getAs(), clang::Decl::getKind(), clang::DeclarationNameInfo::getLoc(), clang::Decl::getLocation(), clang::QualType::getNonReferenceType(), clang::Type::getPointeeType(), clang::CXXScopeSpec::getRange(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::QualType::hasQualifiers(), clang::Decl::isInvalidDecl(), clang::QualType::isNull(), clang::Type::isVoidType(), clang::VK_LValue, and clang::VK_RValue.
Sema::DeclGroupPtrTy Sema::BuildDeclaratorGroup | ( | MutableArrayRef< Decl *> | Group | ) |
BuildDeclaratorGroup - convert a list of declarations into a declaration group, performing any necessary semantic checking.
Definition at line 12682 of file SemaDecl.cpp.
References clang::Type::getContainedDeducedType(), clang::DeducedType::getDeducedType(), clang::ValueDecl::getType(), i, clang::Decl::isInvalidDecl(), and clang::QualType::isNull().
Referenced by ActOnFinishObjCImplementation(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), and clang::Parser::ParseTopLevelDecl().
DeclRefExpr * Sema::BuildDeclRefExpr | ( | ValueDecl * | D, |
QualType | Ty, | ||
ExprValueKind | VK, | ||
SourceLocation | Loc, | ||
const CXXScopeSpec * | SS = nullptr |
||
) |
Definition at line 1771 of file SemaExpr.cpp.
References clang::NamedDecl::getDeclName().
Referenced by buildDeclareReductionRef(), buildMemcpyForAssignmentOp(), buildUserDefinedMapperRef(), CheckConditionVariable(), checkMemberDecomposition(), checkTupleLikeDecomposition(), diagReturnOnAllocFailure(), and noteMemberDeclaredHere().
DeclRefExpr * Sema::BuildDeclRefExpr | ( | ValueDecl * | D, |
QualType | Ty, | ||
ExprValueKind | VK, | ||
const DeclarationNameInfo & | NameInfo, | ||
const CXXScopeSpec * | SS = nullptr , |
||
NamedDecl * | FoundD = nullptr , |
||
SourceLocation | TemplateKWLoc = SourceLocation() , |
||
const TemplateArgumentListInfo * | TemplateArgs = nullptr |
||
) |
Definition at line 1779 of file SemaExpr.cpp.
References clang::CXXScopeSpec::getWithLocInContext().
DeclRefExpr * Sema::BuildDeclRefExpr | ( | ValueDecl * | D, |
QualType | Ty, | ||
ExprValueKind | VK, | ||
const DeclarationNameInfo & | NameInfo, | ||
NestedNameSpecifierLoc | NNS, | ||
NamedDecl * | FoundD = nullptr , |
||
SourceLocation | TemplateKWLoc = SourceLocation() , |
||
const TemplateArgumentListInfo * | TemplateArgs = nullptr |
||
) |
BuildDeclRefExpr - Build an expression that references a declaration that does not require a closure capture.
Definition at line 1814 of file SemaExpr.cpp.
References clang::DeclRefExpr::Create(), and clang::DeclarationNameInfo::getLoc().
QualType Sema::BuildDecltypeType | ( | Expr * | E, |
SourceLocation | Loc, | ||
bool | AsUnevaluated = true |
||
) |
If AsUnevaluated is false, E is treated as though it were an evaluated context, such as when building a type for decltype(auto).
Definition at line 8366 of file SemaType.cpp.
References clang::Expr::hasPlaceholderType(), and clang::Expr::HasSideEffects().
Referenced by ActOnCXXNestedNameSpecifierDecltype(), and ActOnPseudoDestructorExpr().
MemInitResult Sema::BuildDelegatingInitializer | ( | TypeSourceInfo * | TInfo, |
Expr * | Init, | ||
CXXRecordDecl * | ClassDecl | ||
) |
Definition at line 4102 of file SemaDeclCXX.cpp.
References clang::InitializationKind::CreateDirect(), clang::InitializationKind::CreateDirectList(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceRange::getBegin(), clang::Stmt::getBeginLoc(), clang::Stmt::getEndLoc(), clang::TypeLoc::getLocalSourceRange(), clang::Stmt::getSourceRange(), clang::TypeDecl::getTypeForDecl(), clang::TypeSourceInfo::getTypeLoc(), clang::InitializedEntity::InitializeDelegation(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
ExprResult Sema::BuildDependentDeclRefExpr | ( | const CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
const DeclarationNameInfo & | NameInfo, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
Definition at line 733 of file SemaTemplate.cpp.
References clang::DependentScopeDeclRefExpr::Create().
ExprResult Sema::BuildEmptyCXXFoldExpr | ( | SourceLocation | EllipsisLoc, |
BinaryOperatorKind | Operator | ||
) |
Definition at line 1198 of file SemaTemplateVariadic.cpp.
VarDecl * Sema::BuildExceptionDeclaration | ( | Scope * | S, |
TypeSourceInfo * | TInfo, | ||
SourceLocation | StartLoc, | ||
SourceLocation | Loc, | ||
IdentifierInfo * | Name | ||
) |
Perform semantic analysis for the variable declaration that occurs within a C++ catch clause, returning the newly-created variable.
Definition at line 13824 of file SemaDeclCXX.cpp.
ExprResult Sema::BuildExpressionFromDeclTemplateArgument | ( | const TemplateArgument & | Arg, |
QualType | ParamType, | ||
SourceLocation | Loc | ||
) |
Given a non-type template argument that refers to a declaration and the type of its corresponding non-type template parameter, produce an expression that properly refers to that declaration.
Definition at line 6938 of file SemaTemplate.cpp.
References clang::Type::isArrayType().
ExprResult Sema::BuildExpressionFromIntegralTemplateArgument | ( | const TemplateArgument & | Arg, |
SourceLocation | Loc | ||
) |
Construct a new expression that refers to the given integral template argument with the given source-location information.
This routine takes care of the mapping from an integral template argument (which may have any integral type) to the appropriate literal value.
Definition at line 7064 of file SemaTemplate.cpp.
References clang::CharacterLiteral::Ascii, clang::Type::getAs(), clang::TemplateArgument::getIntegralType(), clang::TemplateArgument::getKind(), clang::TemplateArgument::Integral, clang::Type::isAnyCharacterType(), clang::Type::isChar16Type(), clang::Type::isChar32Type(), clang::Type::isChar8Type(), clang::Type::isWideCharType(), clang::CharacterLiteral::UTF16, clang::CharacterLiteral::UTF32, clang::CharacterLiteral::UTF8, and clang::CharacterLiteral::Wide.
ExprResult Sema::BuildExpressionTrait | ( | ExpressionTrait | OET, |
SourceLocation | KWLoc, | ||
Expr * | Queried, | ||
SourceLocation | RParen | ||
) |
Definition at line 5371 of file SemaExprCXX.cpp.
References clang::ASTContext::BoolTy, CheckPlaceholderExpr(), Context, EvaluateExpressionTrait(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isPlaceholderType(), and clang::Expr::isTypeDependent().
Referenced by ActOnExpressionTrait().
QualType Sema::BuildExtVectorType | ( | QualType | T, |
Expr * | ArraySize, | ||
SourceLocation | AttrLoc | ||
) |
Build an ext-vector type.
Run the required checks for the extended vector type.
Definition at line 2390 of file SemaType.cpp.
References Diag(), clang::Type::isBooleanType(), clang::Type::isDependentType(), clang::Expr::isIntegerConstantExpr(), clang::Type::isIntegerType(), clang::Type::isRealFloatingType(), clang::Expr::isTypeDependent(), and clang::Expr::isValueDependent().
Referenced by HandleExtVectorTypeAttr().
ExprResult Sema::BuildFieldReferenceExpr | ( | Expr * | BaseExpr, |
bool | IsArrow, | ||
SourceLocation | OpLoc, | ||
const CXXScopeSpec & | SS, | ||
FieldDecl * | Field, | ||
DeclAccessPair | FoundDecl, | ||
const DeclarationNameInfo & | MemberNameInfo | ||
) |
Definition at line 1756 of file SemaExprMember.cpp.
Referenced by checkMemberDecomposition().
Sema::ForRangeStatus Sema::BuildForRangeBeginEndCall | ( | SourceLocation | Loc, |
SourceLocation | RangeLoc, | ||
const DeclarationNameInfo & | NameInfo, | ||
LookupResult & | MemberLookup, | ||
OverloadCandidateSet * | CandidateSet, | ||
Expr * | Range, | ||
ExprResult * | CallExpr | ||
) |
Build a call to 'begin' or 'end' for a C++11 for-range statement.
If the given LookupResult is non-empty, it is assumed to describe a member which will be invoked. Otherwise, the function will be found via argument dependent lookup. CallExpr is set to a valid expression and FRS_Success returned on success, otherwise CallExpr is set to ExprError() and some non-success value is returned.
Definition at line 13710 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::clear(), clang::OverloadCandidateSet::CSK_Normal, clang::LookupResult::empty(), and clang::Expr::getType().
Referenced by BuildNonArrayForRange().
QualType Sema::BuildFunctionType | ( | QualType | T, |
MutableArrayRef< QualType > | ParamTypes, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity, | ||
const FunctionProtoType::ExtProtoInfo & | EPI | ||
) |
Build a function type.
This routine checks the function type according to C++ rules and under the assumption that the result type and parameter types have just been instantiated from a template. It therefore duplicates some of the behavior of GetTypeForDeclarator, but in a much simpler form that is only suitable for this narrow use case.
T | The return type of the function. |
ParamTypes | The parameter types of the function. This array will be modified to account for adjustments to the types of the function parameters. |
Loc | The location of the entity whose type involves this function type or, if there is no such entity, the location of the type that will have function type. |
Entity | The name of the entity that involves the function type, if known. |
EPI | Extra information about the function type. Usually this will be taken from an existing function with the same prototype. |
Definition at line 2523 of file SemaType.cpp.
StmtResult Sema::BuildIfStmt | ( | SourceLocation | IfLoc, |
bool | IsConstexpr, | ||
Stmt * | InitStmt, | ||
ConditionResult | Cond, | ||
Stmt * | ThenVal, | ||
SourceLocation | ElseLoc, | ||
Stmt * | ElseVal | ||
) |
Definition at line 552 of file SemaStmt.cpp.
References clang::IfStmt::Create(), clang::Sema::ConditionResult::get(), clang::Sema::ConditionResult::isInvalid(), and clang::StmtError().
ExprResult Sema::BuildImplicitMemberExpr | ( | const CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
LookupResult & | R, | ||
const TemplateArgumentListInfo * | TemplateArgs, | ||
bool | IsKnownInstance, | ||
const Scope * | S | ||
) |
Builds an implicit member access expression.
The current context is known to be an instance method, and the given unqualified lookup set is known to contain only instance members, at least one of which is from an appropriate type.
Definition at line 1834 of file SemaExprMember.cpp.
References clang::LookupResult::empty(), clang::SourceRange::getBegin(), clang::LookupResult::getNameLoc(), clang::CXXScopeSpec::getRange(), clang::LookupResult::isAmbiguous(), clang::QualType::isNull(), and clang::SourceRange::isValid().
ExprResult Sema::BuildInstanceMessage | ( | Expr * | Receiver, |
QualType | ReceiverType, | ||
SourceLocation | SuperLoc, | ||
Selector | Sel, | ||
ObjCMethodDecl * | Method, | ||
SourceLocation | LBracLoc, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
SourceLocation | RBracLoc, | ||
MultiExprArg | ArgsIn, | ||
bool | isImplicit = false |
||
) |
Build an Objective-C instance message expression.
This routine takes care of both normal instance messages and instance messages to the superclass instance.
Receiver | The expression that computes the object that will receive this message. This may be empty, in which case we are sending to the superclass instance and SuperLoc must be a valid source location. |
ReceiverType | The (static) type of the object receiving the message. When a Receiver expression is provided, this is the same type as that expression. For a superclass instance send, this is a pointer to the type of the superclass. |
SuperLoc | The location of the "super" keyword in a superclass instance message. |
Sel | The selector to which the message is being sent. |
Method | The method that this instance message is invoking, if already known. |
LBracLoc | The location of the opening square bracket ']'. |
RBracLoc | The location of the closing square bracket ']'. |
ArgsIn | The message arguments. |
Definition at line 2670 of file SemaExprObjC.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::Stmt::getBeginLoc(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Expr::hasPlaceholderType(), clang::SourceLocation::isInvalid(), and clang::SourceLocation::isValid().
Referenced by clang::TreeTransform< Derived >::RebuildObjCMessageExpr().
ExprResult Sema::BuildInstanceMessageImplicit | ( | Expr * | Receiver, |
QualType | ReceiverType, | ||
SourceLocation | Loc, | ||
Selector | Sel, | ||
ObjCMethodDecl * | Method, | ||
MultiExprArg | Args | ||
) |
Definition at line 2612 of file SemaExprObjC.cpp.
Referenced by LookupMethodInReceiverType().
ExprResult Sema::BuildLambdaExpr | ( | SourceLocation | StartLoc, |
SourceLocation | EndLoc, | ||
sema::LambdaScopeInfo * | LSI | ||
) |
Complete a lambda-expression having processed and attached the lambda body.
Definition at line 1610 of file SemaLambda.cpp.
References addBlockPointerConversion(), clang::DeclContext::addDecl(), addFunctionPointerConversion(), clang::sema::LambdaScopeInfo::CallOperator, clang::sema::LambdaScopeInfo::CaptureDefaultLoc, clang::sema::CapturingScopeInfo::Captures, clang::sema::LambdaScopeInfo::Cleanup, clang::sema::LambdaScopeInfo::ContainsUnexpandedParameterPack, clang::LambdaExpr::Create(), clang::FixItHint::CreateInsertion(), Diag(), clang::sema::LambdaScopeInfo::ExplicitCaptureRanges, clang::sema::LambdaScopeInfo::ExplicitParams, clang::ExprError(), clang::RecordDecl::fields(), clang::SourceRange::getBegin(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::sema::Capture::getEllipsisLoc(), clang::SourceRange::getEnd(), clang::Decl::getLocation(), clang::sema::Capture::getLocation(), clang::sema::Capture::getVariable(), clang::sema::CapturingScopeInfo::HasImplicitReturnType, clang::if(), clang::sema::CapturingScopeInfo::ImpCaptureStyle, clang::sema::LambdaScopeInfo::IntroducerRange, clang::sema::Capture::isBlockCapture(), clang::sema::Capture::isCopyCapture(), clang::CXXRecordDecl::isGenericLambda(), clang::sema::Capture::isInitCapture(), clang::sema::Capture::isInvalid(), clang::sema::Capture::isNonODRUsed(), clang::sema::Capture::isODRUsed(), clang::sema::Capture::isThisCapture(), clang::SourceRange::isValid(), clang::sema::Capture::isVariableCapture(), clang::sema::Capture::isVLATypeCapture(), clang::sema::LambdaScopeInfo::Lambda, clang::LCD_ByCopy, clang::LCD_None, clang::LCK_ByCopy, clang::LCK_ByRef, clang::LCK_StarThis, clang::LCK_This, clang::LCK_VLAType, mapImplicitCaptureStyle(), clang::sema::LambdaScopeInfo::NumExplicitCaptures, and clang::Decl::setLexicalDeclContext().
QualType Sema::buildLambdaInitCaptureInitialization | ( | SourceLocation | Loc, |
bool | ByRef, | ||
SourceLocation | EllipsisLoc, | ||
Optional< unsigned > | NumExpansions, | ||
IdentifierInfo * | Id, | ||
bool | DirectInit, | ||
Expr *& | Init | ||
) |
Definition at line 755 of file SemaLambda.cpp.
void Sema::buildLambdaScope | ( | sema::LambdaScopeInfo * | LSI, |
CXXMethodDecl * | CallOperator, | ||
SourceRange | IntroducerRange, | ||
LambdaCaptureDefault | CaptureDefault, | ||
SourceLocation | CaptureDefaultLoc, | ||
bool | ExplicitParams, | ||
bool | ExplicitResultType, | ||
bool | Mutable | ||
) |
Endow the lambda scope info with the relevant properties.
Definition at line 451 of file SemaLambda.cpp.
References clang::sema::LambdaScopeInfo::CallOperator, clang::sema::LambdaScopeInfo::CaptureDefaultLoc, clang::sema::LambdaScopeInfo::ExplicitParams, clang::DeclaratorDecl::getBeginLoc(), clang::CXXMethodDecl::getParent(), clang::FunctionDecl::getReturnType(), clang::sema::CapturingScopeInfo::HasImplicitReturnType, clang::sema::CapturingScopeInfo::ImpCap_LambdaByref, clang::sema::CapturingScopeInfo::ImpCap_LambdaByval, clang::sema::CapturingScopeInfo::ImpCaptureStyle, clang::sema::LambdaScopeInfo::IntroducerRange, clang::Type::isDependentType(), clang::Type::isVoidType(), clang::sema::LambdaScopeInfo::Lambda, clang::LCD_ByCopy, clang::LCD_ByRef, clang::sema::LambdaScopeInfo::Mutable, and clang::sema::CapturingScopeInfo::ReturnType.
ExprResult Sema::BuildLiteralOperatorCall | ( | LookupResult & | R, |
DeclarationNameInfo & | SuffixInfo, | ||
ArrayRef< Expr *> | Args, | ||
SourceLocation | LitEndLoc, | ||
TemplateArgumentListInfo * | TemplateArgs = nullptr |
||
) |
BuildLiteralOperatorCall - Build a UserDefinedLiteral by creating a call to a literal operator described by the provided lookup results.
Definition at line 13627 of file SemaOverload.cpp.
References clang::LookupResult::asUnresolvedSet(), CreateFunctionRefExpr(), clang::OverloadCandidateSet::CSK_Normal, clang::ExprError(), clang::DeclarationNameInfo::getCXXLiteralOperatorNameLoc(), clang::DeclarationNameInfo::getInfo(), clang::DeclarationNameInfo::getLoc(), clang::LookupResult::getLookupName(), clang::LookupResult::getNameLoc(), clang::InitializedEntity::InitializeParameter(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::OCD_AllCandidates, clang::OCD_ViableCandidates, clang::OR_Ambiguous, clang::OR_Deleted, clang::OR_No_Viable_Function, and clang::OR_Success.
Referenced by BuildCookedLiteralOperatorCall().
MemberExpr * Sema::BuildMemberExpr | ( | Expr * | Base, |
bool | IsArrow, | ||
SourceLocation | OpLoc, | ||
const CXXScopeSpec * | SS, | ||
SourceLocation | TemplateKWLoc, | ||
ValueDecl * | Member, | ||
DeclAccessPair | FoundDecl, | ||
bool | HadMultipleCandidates, | ||
const DeclarationNameInfo & | MemberNameInfo, | ||
QualType | Ty, | ||
ExprValueKind | VK, | ||
ExprObjectKind | OK, | ||
const TemplateArgumentListInfo * | TemplateArgs = nullptr |
||
) |
Definition at line 896 of file SemaExprMember.cpp.
MemberExpr * Sema::BuildMemberExpr | ( | Expr * | Base, |
bool | IsArrow, | ||
SourceLocation | OpLoc, | ||
NestedNameSpecifierLoc | NNS, | ||
SourceLocation | TemplateKWLoc, | ||
ValueDecl * | Member, | ||
DeclAccessPair | FoundDecl, | ||
bool | HadMultipleCandidates, | ||
const DeclarationNameInfo & | MemberNameInfo, | ||
QualType | Ty, | ||
ExprValueKind | VK, | ||
ExprObjectKind | OK, | ||
const TemplateArgumentListInfo * | TemplateArgs = nullptr |
||
) |
Definition at line 909 of file SemaExprMember.cpp.
MemInitResult Sema::BuildMemberInitializer | ( | ValueDecl * | Member, |
Expr * | Init, | ||
SourceLocation | IdLoc | ||
) |
Definition at line 4026 of file SemaDeclCXX.cpp.
References clang::InitializationKind::CreateDirect(), clang::InitializationKind::CreateDirectList(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceRange::getBegin(), clang::Stmt::getBeginLoc(), clang::SourceRange::getEnd(), clang::Stmt::getEndLoc(), clang::Stmt::getSourceRange(), clang::ValueDecl::getType(), clang::InitializedEntity::InitializeMember(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Decl::isInvalidDecl(), and clang::Expr::isTypeDependent().
QualType Sema::BuildMemberPointerType | ( | QualType | T, |
QualType | Class, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity | ||
) |
Build a member pointer type T
Class::*.
T | the type to which the member pointer refers. |
Class | the class type into which the member pointer points. |
Loc | the location where this type begins |
Entity | the name of the entity that will have this member pointer type |
Definition at line 2572 of file SemaType.cpp.
References clang::DeclarationName::CXXConstructorName, clang::DeclarationName::CXXDestructorName, Diag(), clang::DeclarationName::getNameKind(), getPrintableNameForEntity(), clang::Type::isDependentType(), clang::Type::isFunctionType(), clang::Type::isRecordType(), clang::Type::isReferenceType(), and clang::Type::isVoidType().
ExprResult Sema::BuildMemberReferenceExpr | ( | Expr * | Base, |
QualType | BaseType, | ||
SourceLocation | OpLoc, | ||
bool | IsArrow, | ||
CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
NamedDecl * | FirstQualifierInScope, | ||
const DeclarationNameInfo & | NameInfo, | ||
const TemplateArgumentListInfo * | TemplateArgs, | ||
const Scope * | S, | ||
ActOnMemberAccessExtraArgs * | ExtraArgs = nullptr |
||
) |
Definition at line 744 of file SemaExprMember.cpp.
References clang::ExprError(), clang::Type::getAs(), clang::Type::isDependentType(), clang::CXXScopeSpec::isSet(), and LookupMemberExprInRecord().
Referenced by BuildImplicitMemberInitializer(), checkTupleLikeDecomposition(), clang::TreeTransform< Derived >::RebuildCXXDependentScopeMemberExpr(), and clang::TreeTransform< Derived >::RebuildUnresolvedMemberExpr().
ExprResult Sema::BuildMemberReferenceExpr | ( | Expr * | Base, |
QualType | BaseType, | ||
SourceLocation | OpLoc, | ||
bool | IsArrow, | ||
const CXXScopeSpec & | SS, | ||
SourceLocation | TemplateKWLoc, | ||
NamedDecl * | FirstQualifierInScope, | ||
LookupResult & | R, | ||
const TemplateArgumentListInfo * | TemplateArgs, | ||
const Scope * | S, | ||
bool | SuppressQualifierCheck = false , |
||
ActOnMemberAccessExtraArgs * | ExtraArgs = nullptr |
||
) |
Definition at line 960 of file SemaExprMember.cpp.
References clang::Type::castAs(), clang::UnresolvedMemberExpr::Create(), clang::FixItHint::CreateReplacement(), Diag(), clang::LookupResult::empty(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::DeclarationNameInfo::getLoc(), clang::LookupResult::getLookupNameInfo(), clang::DeclarationNameInfo::getName(), clang::LookupResult::getNameLoc(), clang::Stmt::getSourceRange(), clang::Sema::SFINAETrap::hasErrorOccurred(), clang::Sema::ActOnMemberAccessExtraArgs::Id, clang::Expr::IgnoreImpCasts(), clang::LookupResult::isAmbiguous(), IsInFnTryBlockHandler(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::LookupResult::isOverloadedResult(), clang::Type::isPointerType(), clang::Expr::isRValue(), clang::CXXScopeSpec::isSet(), clang::LookupResult::isUnresolvableResult(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Sema::ActOnMemberAccessExtraArgs::ObjCImpDecl, clang::Sema::ActOnMemberAccessExtraArgs::S, clang::LookupResult::setBaseObjectType(), and clang::LookupResult::suppressDiagnostics().
MemInitResult Sema::BuildMemInitializer | ( | Decl * | ConstructorD, |
Scope * | S, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | MemberOrBase, | ||
ParsedType | TemplateTypeTy, | ||
const DeclSpec & | DS, | ||
SourceLocation | IdLoc, | ||
Expr * | Init, | ||
SourceLocation | EllipsisLoc | ||
) |
Handle a C++ member initializer.
Definition at line 3854 of file SemaDeclCXX.cpp.
References Diag(), clang::ETK_None, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::LookupResult::getAsSingle(), clang::SourceRange::getEnd(), clang::CXXMethodDecl::getParent(), clang::DeclSpec::getRepAsExpr(), clang::Stmt::getSourceRange(), clang::DeclSpec::getTypeSpecType(), clang::DeclSpec::getTypeSpecTypeLoc(), clang::CXXScopeSpec::getWithLocInContext(), clang::LookupResult::isAmbiguous(), clang::QualType::isNull(), clang::CXXScopeSpec::isSet(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::SourceLocation::isValid(), clang::LookupResult::suppressDiagnostics(), clang::TST_decltype, and clang::TST_decltype_auto.
Decl * Sema::BuildMicrosoftCAnonymousStruct | ( | Scope * | S, |
DeclSpec & | DS, | ||
RecordDecl * | Record | ||
) |
BuildMicrosoftCAnonymousStruct - Handle the declaration of an Microsoft C anonymous structure.
Ref: http://msdn.microsoft.com/en-us/library/z2cx9y4f.aspx Example:
struct A { int a; }; struct B { struct A; int b; };
void foo() { B var; var.a = 3; }
Definition at line 4963 of file SemaDecl.cpp.
void Sema::BuildModuleInclude | ( | SourceLocation | DirectiveLoc, |
Module * | Mod | ||
) |
Definition at line 409 of file SemaModule.cpp.
References clang::ImportDecl::CreateImplicit(), clang::Decl::getTranslationUnitDecl(), and clang::TU_Module.
StmtResult Sema::BuildMSDependentExistsStmt | ( | SourceLocation | KeywordLoc, |
bool | IsIfExists, | ||
NestedNameSpecifierLoc | QualifierLoc, | ||
DeclarationNameInfo | NameInfo, | ||
Stmt * | Nested | ||
) |
Definition at line 4178 of file SemaStmt.cpp.
ExprResult Sema::BuildObjCArrayLiteral | ( | SourceRange | SR, |
MultiExprArg | Elements | ||
) |
Definition at line 795 of file SemaExprObjC.cpp.
References clang::ExprError(), clang::SourceRange::getBegin(), LK_Array, and LookupObjCInterfaceDeclForLiteral().
StmtResult Sema::BuildObjCAtThrowStmt | ( | SourceLocation | AtLoc, |
Expr * | Throw | ||
) |
Definition at line 3797 of file SemaStmt.cpp.
References Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::PointerType::getPointeeType(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isObjCObjectPointerType(), clang::Type::isVoidType(), and clang::StmtError().
ExprResult Sema::BuildObjCBoxedExpr | ( | SourceRange | SR, |
Expr * | ValueExpr | ||
) |
BuildObjCBoxedExpr - builds an ObjCBoxedExpr AST node for the '@' prefixed parenthesized expression.
The type of the expression will either be "NSNumber *", "NSString *" or "NSValue *" depending on the type of ValueType, which is allowed to be a built-in numeric type, "char *", "const char *" or C structure with attribute 'objc_boxable'.
Definition at line 498 of file SemaExprObjC.cpp.
References clang::Expr::isTypeDependent().
ExprResult Sema::BuildObjCBridgedCast | ( | SourceLocation | LParenLoc, |
ObjCBridgeCastKind | Kind, | ||
SourceLocation | BridgeKeywordLoc, | ||
TypeSourceInfo * | TSInfo, | ||
Expr * | SubExpr | ||
) |
Definition at line 4433 of file SemaExprObjC.cpp.
References clang::ImplicitCastExpr::Create(), clang::FixItHint::CreateReplacement(), Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getSourceRange(), clang::TypeSourceInfo::getType(), clang::Expr::getType(), clang::Type::isBlockPointerType(), clang::Type::isCARCBridgableType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isObjCARCBridgableType(), clang::Expr::isTypeDependent(), maybeUndoReclaimObject(), clang::OBC_Bridge, clang::OBC_BridgeRetained, and clang::OBC_BridgeTransfer.
ExprResult Sema::BuildObjCDictionaryLiteral | ( | SourceRange | SR, |
MutableArrayRef< ObjCDictionaryElement > | Elements | ||
) |
Definition at line 899 of file SemaExprObjC.cpp.
References clang::ExprError(), clang::SourceRange::getBegin(), LK_Dictionary, and LookupObjCInterfaceDeclForLiteral().
ExprResult Sema::BuildObjCEncodeExpression | ( | SourceLocation | AtLoc, |
TypeSourceInfo * | EncodedTypeInfo, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 1076 of file SemaExprObjC.cpp.
References clang::TypeSourceInfo::getType(), and clang::Type::isDependentType().
Referenced by clang::TreeTransform< Derived >::RebuildObjCEncodeExpr().
VarDecl * Sema::BuildObjCExceptionDecl | ( | TypeSourceInfo * | TInfo, |
QualType | ExceptionType, | ||
SourceLocation | StartLoc, | ||
SourceLocation | IdLoc, | ||
IdentifierInfo * | Id, | ||
bool | Invalid = false |
||
) |
Build a type-check a new Objective-C exception variable declaration.
Definition at line 4853 of file SemaDeclObjC.cpp.
References clang::VarDecl::Create(), CurContext, clang::Default, Diag(), clang::QualType::getAddressSpace(), clang::Type::getAs(), clang::ObjCObjectPointerType::getInterfaceType(), getLangOpts(), inferObjCARCLifetime(), clang::Type::isDependentType(), clang::Type::isObjCIdType(), clang::Type::isObjCObjectPointerType(), clang::Type::isObjCQualifiedIdType(), clang::SC_None, clang::VarDecl::setExceptionVariable(), and clang::Decl::setInvalidDecl().
ExprResult Sema::BuildObjCNumericLiteral | ( | SourceLocation | AtLoc, |
Expr * | Number | ||
) |
BuildObjCNumericLiteral - builds an ObjCBoxedExpr AST node for the numeric literal expression.
Type of the expression will be "NSNumber *" or "id" if NSNumber is unavailable.
Type of the expression will be "NSNumber *".
Definition at line 314 of file SemaExprObjC.cpp.
References clang::CharacterLiteral::Ascii, clang::Expr::getType(), and clang::CharacterLiteral::UTF8.
Referenced by CheckObjCCollectionLiteralElement().
QualType Sema::BuildObjCObjectType | ( | QualType | BaseType, |
SourceLocation | Loc, | ||
SourceLocation | TypeArgsLAngleLoc, | ||
ArrayRef< TypeSourceInfo *> | TypeArgs, | ||
SourceLocation | TypeArgsRAngleLoc, | ||
SourceLocation | ProtocolLAngleLoc, | ||
ArrayRef< ObjCProtocolDecl *> | Protocols, | ||
ArrayRef< SourceLocation > | ProtocolLocs, | ||
SourceLocation | ProtocolRAngleLoc, | ||
bool | FailOnError = false |
||
) |
Build an Objective-C object pointer type.
Definition at line 1061 of file SemaType.cpp.
References applyObjCTypeArgs(), clang::QualType::isNull(), and clang::Result.
ExprResult Sema::BuildObjCStringLiteral | ( | SourceLocation | AtLoc, |
StringLiteral * | S | ||
) |
Definition at line 80 of file SemaExprObjC.cpp.
Referenced by CheckObjCCollectionLiteralElement().
ExprResult Sema::BuildObjCSubscriptExpression | ( | SourceLocation | RB, |
Expr * | BaseExpr, | ||
Expr * | IndexExpr, | ||
ObjCMethodDecl * | getterMethod, | ||
ObjCMethodDecl * | setterMethod | ||
) |
Build an ObjC subscript pseudo-object expression, given that that's supported by the runtime.
Definition at line 765 of file SemaExprObjC.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Expr::isTypeDependent().
QualType Sema::BuildObjCTypeParamType | ( | const ObjCTypeParamDecl * | Decl, |
SourceLocation | ProtocolLAngleLoc, | ||
ArrayRef< ObjCProtocolDecl *> | Protocols, | ||
ArrayRef< SourceLocation > | ProtocolLocs, | ||
SourceLocation | ProtocolRAngleLoc, | ||
bool | FailOnError = false |
||
) |
Build an Objective-C type parameter type.
Definition at line 1038 of file SemaType.cpp.
References clang::TypeDecl::getTypeForDecl(), and clang::Result.
ExprResult Sema::BuildOverloadedArrowExpr | ( | Scope * | S, |
Expr * | Base, | ||
SourceLocation | OpLoc, | ||
bool * | NoArrowOperatorFound = nullptr |
||
) |
BuildOverloadedArrowExpr - Build a call to an overloaded operator->
(if one exists), where Base
is an expression of class type and Member
is the name of the member we're trying to find.
Definition at line 13510 of file SemaOverload.cpp.
References checkPlaceholderForOverload(), clang::ExprError(), clang::Expr::getExprLoc(), clang::Expr::getType(), and clang::Type::isRecordType().
ExprResult Sema::BuildOverloadedCallExpr | ( | Scope * | S, |
Expr * | Fn, | ||
UnresolvedLookupExpr * | ULE, | ||
SourceLocation | LParenLoc, | ||
MultiExprArg | Args, | ||
SourceLocation | RParenLoc, | ||
Expr * | ExecConfig, | ||
bool | AllowTypoCorrection = true , |
||
bool | CalleesAddressIsTaken = false |
||
) |
BuildOverloadedCallExpr - Given the call expression that calls Fn (which eventually refers to the declaration Func) and the call arguments Args/NumArgs, attempt to resolve the function call down to a specific function.
If overload resolution succeeds, returns the call expression produced by overload resolution. Otherwise, emits diagnostics and returns ExprError.
Definition at line 12251 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::CSK_Normal, FinishOverloadedCallExpr(), clang::Stmt::getBeginLoc(), clang::Expr::getExprLoc(), markUnaddressableCandidatesUnviable(), and result.
bool Sema::buildOverloadedCallSet | ( | Scope * | S, |
Expr * | Fn, | ||
UnresolvedLookupExpr * | ULE, | ||
MultiExprArg | Args, | ||
SourceLocation | RParenLoc, | ||
OverloadCandidateSet * | CandidateSet, | ||
ExprResult * | Result | ||
) |
Constructs and populates an OverloadedCandidateSet from the given function.
Definition at line 12077 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::BestViableFunction(), checkArgPlaceholdersForOverload(), clang::frontend::CPlusPlus, clang::CallExpr::Create(), clang::OverloadExpr::decls_begin(), clang::OverloadExpr::decls_end(), clang::OverloadCandidateSet::empty(), clang::ExprError(), clang::Stmt::getBeginLoc(), clang::OverloadExpr::getQualifier(), clang::Decl::isImplicit(), clang::OR_No_Viable_Function, and clang::UnresolvedLookupExpr::requiresADL().
Build a paren type including T
.
Definition at line 1857 of file SemaType.cpp.
Referenced by clang::TreeTransform< Derived >::RebuildParenType().
ParmVarDecl * Sema::BuildParmVarDeclForTypedef | ( | DeclContext * | DC, |
SourceLocation | Loc, | ||
QualType | T | ||
) |
Synthesizes a variable for a parameter arising from a typedef.
Definition at line 12910 of file SemaDecl.cpp.
References clang::ParmVarDecl::Create().
Referenced by clang::TemplateDeclInstantiator::SubstFunctionType().
QualType Sema::BuildPointerType | ( | QualType | T, |
SourceLocation | Loc, | ||
DeclarationName | Entity | ||
) |
Build a pointer type.
T | The type to which we'll be building a pointer. |
Loc | The location of the entity whose type involves this pointer type or, if there is no such entity, the location of the type that will have pointer type. |
Entity | The name of the entity that involves the pointer type, if known. |
Definition at line 1978 of file SemaType.cpp.
References checkQualifiedFunction(), Diag(), getPrintableNameForEntity(), inferARCLifetimeForPointee(), clang::Type::isFunctionType(), clang::Type::isObjCObjectType(), and clang::Type::isReferenceType().
ExprResult Sema::BuildPossibleImplicitMemberExpr | ( | const CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
LookupResult & | R, | ||
const TemplateArgumentListInfo * | TemplateArgs, | ||
const Scope * | S | ||
) |
Builds an expression which might be an implicit member expression.
Definition at line 235 of file SemaExprMember.cpp.
Referenced by attemptRecovery(), and BuildRecoveryCallExpr().
ExprResult Sema::BuildPredefinedExpr | ( | SourceLocation | Loc, |
PredefinedExpr::IdentKind | IK | ||
) |
Definition at line 3184 of file SemaExpr.cpp.
References Diag().
ExprResult Sema::BuildPseudoDestructorExpr | ( | Expr * | Base, |
SourceLocation | OpLoc, | ||
tok::TokenKind | OpKind, | ||
const CXXScopeSpec & | SS, | ||
TypeSourceInfo * | ScopeType, | ||
SourceLocation | CCLoc, | ||
SourceLocation | TildeLoc, | ||
PseudoDestructorTypeStorage | DestroyedType | ||
) |
Definition at line 6873 of file SemaExprCXX.cpp.
References canRecoverDotPseudoDestructorCallsOnPointerObjects(), CheckArrow(), Context, clang::FixItHint::CreateReplacement(), Diag(), clang::ExprError(), clang::SourceRange::getBegin(), getLangOpts(), clang::TypeLoc::getLocalSourceRange(), clang::QualType::getObjCLifetime(), clang::Type::getPointeeType(), clang::Stmt::getSourceRange(), clang::ASTContext::getTrivialTypeSourceInfo(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), clang::PseudoDestructorTypeStorage::getTypeSourceInfo(), clang::CXXScopeSpec::getWithLocInContext(), clang::ASTContext::hasSameUnqualifiedType(), clang::Type::isDependentType(), clang::Type::isPointerType(), clang::Type::isScalarType(), clang::Type::isVectorType(), clang::Type::isVoidType(), clang::Qualifiers::OCL_None, and clang::Result.
Referenced by ActOnPseudoDestructorExpr().
ExprResult Sema::BuildQualifiedDeclarationNameExpr | ( | CXXScopeSpec & | SS, |
const DeclarationNameInfo & | NameInfo, | ||
bool | IsAddressOfOperand, | ||
const Scope * | S, | ||
TypeSourceInfo ** | RecoveryTSI = nullptr |
||
) |
BuildQualifiedDeclarationNameExpr - Build a C++ qualified declaration name, generally during template instantiation.
There's a large number of things which don't need to be done along this path.
Definition at line 2420 of file SemaExpr.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::LookupResult::empty(), clang::ExprError(), clang::LookupResult::getAsSingle(), clang::DeclarationName::getAsString(), clang::CXXScopeSpec::getBeginLoc(), clang::DeclarationNameInfo::getEndLoc(), clang::DeclarationNameInfo::getLoc(), clang::DeclarationNameInfo::getName(), clang::CXXScopeSpec::getRange(), clang::LookupResult::getResultKind(), clang::CXXScopeSpec::getScopeRep(), clang::LookupResult::isAmbiguous(), and clang::LookupResult::NotFoundInCurrentInstantiation.
ExprResult Sema::BuildQualifiedTemplateIdExpr | ( | CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
const DeclarationNameInfo & | NameInfo, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
Definition at line 4328 of file SemaTemplate.cpp.
References Diag(), clang::LookupResult::empty(), clang::ExprError(), clang::LookupResult::getAsSingle(), clang::DeclarationName::getAsString(), clang::DeclarationNameInfo::getLoc(), clang::DeclarationNameInfo::getName(), clang::CXXScopeSpec::getRange(), clang::CXXScopeSpec::getScopeRep(), clang::LookupResult::isAmbiguous(), and clang::SourceLocation::isValid().
QualType Sema::BuildQualifiedType | ( | QualType | T, |
SourceLocation | Loc, | ||
Qualifiers | Qs, | ||
const DeclSpec * | DS = nullptr |
||
) |
Definition at line 1765 of file SemaType.cpp.
References Diag(), clang::Type::getAs(), clang::Type::getPointeeType(), clang::DeclSpec::getRestrictSpecLoc(), clang::Qualifiers::hasRestrict(), clang::Type::isAnyPointerType(), clang::Type::isDependentType(), clang::Type::isIncompleteOrObjectType(), clang::Type::isMemberPointerType(), clang::QualType::isNull(), clang::Type::isObjCObjectPointerType(), clang::Type::isReferenceType(), clang::Qualifiers::removeConst(), clang::Qualifiers::removeRestrict(), and clang::Qualifiers::removeVolatile().
Referenced by checkMemberDecomposition().
QualType Sema::BuildQualifiedType | ( | QualType | T, |
SourceLocation | Loc, | ||
unsigned | CVRA, | ||
const DeclSpec * | DS = nullptr |
||
) |
Definition at line 1812 of file SemaType.cpp.
References clang::Qualifiers::addCVRQualifiers(), clang::Qualifiers::fromCVRMask(), clang::DeclSpec::getAtomicSpecLoc(), clang::QualType::getSplitUnqualifiedType(), clang::Type::isAtomicType(), clang::QualType::isNull(), clang::Type::isReferenceType(), clang::SplitQualType::Quals, clang::Qualifiers::setUnaligned(), Split, clang::DeclSpec::TQ_atomic, clang::DeclSpec::TQ_const, clang::DeclSpec::TQ_unaligned, clang::DeclSpec::TQ_volatile, and clang::SplitQualType::Ty.
QualType Sema::BuildReadPipeType | ( | QualType | T, |
SourceLocation | Loc | ||
) |
Build a Read-only Pipe type.
T | The type to which we'll be building a Pipe. |
Loc | We do not use it for now. |
Definition at line 2075 of file SemaType.cpp.
QualType Sema::BuildReferenceType | ( | QualType | T, |
bool | SpelledAsLValue, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity | ||
) |
Build a reference type.
T | The type to which we'll be building a reference. |
Loc | The location of the entity whose type involves this reference type or, if there is no such entity, the location of the type that will have reference type. |
Entity | The name of the entity that involves the reference type, if known. |
Definition at line 2018 of file SemaType.cpp.
Referenced by castForMoving(), CastForMoving(), and checkTupleLikeDecomposition().
ExprResult Sema::BuildResolvedCallExpr | ( | Expr * | Fn, |
NamedDecl * | NDecl, | ||
SourceLocation | LParenLoc, | ||
ArrayRef< Expr *> | Args, | ||
SourceLocation | RParenLoc, | ||
Expr * | Config = nullptr , |
||
bool | IsExecConfig = false , |
||
ADLCallKind | UsesADL = ADLCallKind::NotADL |
||
) |
BuildResolvedCallExpr - Build a call to a resolved expression, i.e.
an expression not of OverloadTy
. The expression should unary-convert to an expression of function-pointer or block-pointer type.
NDecl | the declaration being called, if available |
Definition at line 5745 of file SemaExpr.cpp.
References Diag(), clang::ExprError(), clang::FunctionDecl::getBuiltinID(), clang::Expr::getExprLoc(), and clang::Decl::hasAttr().
Referenced by FinishOverloadedCallExpr().
ExprResult Sema::BuildResolvedCoawaitExpr | ( | SourceLocation | KwLoc, |
Expr * | E, | ||
bool | IsImplicit = false |
||
) |
Definition at line 750 of file SemaCoroutine.cpp.
References checkCoroutineContext(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Type::isPlaceholderType().
StmtResult Sema::BuildReturnStmt | ( | SourceLocation | ReturnLoc, |
Expr * | RetValExp | ||
) |
Definition at line 3528 of file SemaStmt.cpp.
References Diag(), clang::Stmt::getSourceRange(), and clang::StmtError().
Referenced by diagReturnOnAllocFailure(), and noteMemberDeclaredHere().
ExprResult Sema::BuildSourceLocExpr | ( | SourceLocExpr::IdentKind | Kind, |
SourceLocation | BuiltinLoc, | ||
SourceLocation | RPLoc, | ||
DeclContext * | ParentContext | ||
) |
Definition at line 14214 of file SemaExpr.cpp.
Decl * Sema::BuildStaticAssertDeclaration | ( | SourceLocation | StaticAssertLoc, |
Expr * | AssertExpr, | ||
StringLiteral * | AssertMessageExpr, | ||
SourceLocation | RParenLoc, | ||
bool | Failed | ||
) |
Definition at line 14016 of file SemaDeclCXX.cpp.
References clang::StaticAssertDecl::Create(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getSourceRange(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), isInvalid(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), and clang::Stmt::printPretty().
QualType Sema::BuildStdInitializerList | ( | QualType | Element, |
SourceLocation | Loc | ||
) |
Looks for the std::initializer_list template and instantiates it with Element, or emits an error if it's not found.
Definition at line 9330 of file SemaDeclCXX.cpp.
References clang::TemplateArgumentListInfo::addArgument(), and LookupStdInitializerList().
ExprResult Sema::BuildTemplateIdExpr | ( | const CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
LookupResult & | R, | ||
bool | RequiresADL, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
Definition at line 4266 of file SemaTemplate.cpp.
References clang::TemplateSpecializationType::anyDependentTemplateArguments(), clang::UnresolvedLookupExpr::Create(), clang::ExprError(), clang::LookupResult::getAsSingle(), clang::LookupResult::getLookupNameInfo(), clang::LookupResult::getNameLoc(), clang::LookupResult::isAmbiguous(), and clang::LookupResult::suppressDiagnostics().
Referenced by BuildRecoveryCallExpr().
QualType Sema::BuildTypeofExprType | ( | Expr * | E, |
SourceLocation | Loc | ||
) |
Definition at line 8282 of file SemaType.cpp.
References Diag(), clang::Type::getAs(), clang::Expr::getExprLoc(), clang::Expr::getType(), clang::Expr::hasPlaceholderType(), clang::Expr::isTypeDependent(), and clang::Expr::refersToBitField().
ExprResult Sema::BuildTypeTrait | ( | TypeTrait | Kind, |
SourceLocation | KWLoc, | ||
ArrayRef< TypeSourceInfo *> | Args, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 5016 of file SemaExprCXX.cpp.
References CheckUnaryTypeTraitTypeCompleteness(), Context, clang::TypeTraitExpr::Create(), evaluateTypeTrait(), clang::ExprError(), clang::ASTContext::getLogicalOperationType(), clang::Result, and clang::UTT_Last.
Referenced by ActOnTypeTrait().
ExprResult Sema::BuildUnaryOp | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
UnaryOperatorKind | Opc, | ||
Expr * | Input | ||
) |
Definition at line 13357 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAsPlaceholderType(), clang::UnaryOperator::getOverloadedOperator(), clang::Expr::getType(), clang::UnaryOperator::isIncrementDecrementOp(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isOverloadableType(), and clang::OO_None.
Referenced by LookupMethodInReceiverType().
QualType Sema::BuildUnaryTransformType | ( | QualType | BaseType, |
UnaryTransformType::UTTKind | UKind, | ||
SourceLocation | Loc | ||
) |
Definition at line 8380 of file SemaType.cpp.
References Diag(), clang::UnaryTransformType::EnumUnderlyingType, clang::Type::getAs(), clang::EnumDecl::getIntegerType(), clang::Decl::getLocation(), clang::Type::isDependentType(), clang::Type::isEnumeralType(), clang::Type::isIncompleteType(), and clang::QualType::isNull().
ExprResult Sema::BuildUnresolvedCoawaitExpr | ( | SourceLocation | KwLoc, |
Expr * | E, | ||
UnresolvedLookupExpr * | Lookup | ||
) |
NamedDecl * Sema::BuildUsingDeclaration | ( | Scope * | S, |
AccessSpecifier | AS, | ||
SourceLocation | UsingLoc, | ||
bool | HasTypenameKeyword, | ||
SourceLocation | TypenameLoc, | ||
CXXScopeSpec & | SS, | ||
DeclarationNameInfo | NameInfo, | ||
SourceLocation | EllipsisLoc, | ||
const ParsedAttributesView & | AttrList, | ||
bool | IsInstantiation | ||
) |
Builds a using declaration.
IsInstantiation | - Whether this call arises from an instantiation of an unresolved using declaration. We treat the lookup differently for these declarations. |
Definition at line 9982 of file SemaDeclCXX.cpp.
References clang::DeclarationName::CXXConstructorName, clang::DeclarationNameInfo::getLoc(), clang::CXXScopeSpec::isInvalid(), and clang::DeclarationNameInfo::setName().
NamedDecl * Sema::BuildUsingPackDecl | ( | NamedDecl * | InstantiatedFrom, |
ArrayRef< NamedDecl *> | Expansions | ||
) |
Definition at line 10240 of file SemaDeclCXX.cpp.
References clang::UsingPackDecl::Create().
UsingShadowDecl * Sema::BuildUsingShadowDecl | ( | Scope * | S, |
UsingDecl * | UD, | ||
NamedDecl * | Target, | ||
UsingShadowDecl * | PrevDecl | ||
) |
Builds a shadow declaration corresponding to a 'using' declaration.
Definition at line 9787 of file SemaDeclCXX.cpp.
References clang::ConstructorUsingShadowDecl::Create(), clang::NestedNameSpecifier::getAsRecordDecl(), clang::UsingDecl::getQualifier(), isVirtualDirectBase(), and clang::Target.
ExprResult Sema::BuildVAArgExpr | ( | SourceLocation | BuiltinLoc, |
Expr * | E, | ||
TypeSourceInfo * | TInfo, | ||
SourceLocation | RPLoc | ||
) |
Definition at line 14076 of file SemaExpr.cpp.
References Diag(), clang::ExprError(), and clang::Stmt::getBeginLoc().
void Sema::BuildVariableInstantiation | ( | VarDecl * | NewVar, |
VarDecl * | OldVar, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
LateInstantiatedAttrVec * | LateAttrs, | ||
DeclContext * | Owner, | ||
LocalInstantiationScope * | StartingScope, | ||
bool | InstantiatingVarTemplate = false , |
||
VarTemplateSpecializationDecl * | PrevDeclForVarTemplateSpecialization = nullptr |
||
) |
BuildVariableInstantiation - Used after a new variable has been created.
Sets basic variable data and decides whether to postpone the variable instantiation.
Definition at line 4402 of file SemaTemplateInstantiateDecl.cpp.
References clang::DeclContext::addHiddenDecl(), ForExternalRedeclaration, clang::Decl::getAccess(), clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::VarDecl::getDescribedVarTemplate(), clang::VarDecl::getInitStyle(), clang::Decl::getLexicalDeclContext(), clang::Decl::getLocation(), clang::Redeclarable< decl_type >::getPreviousDecl(), clang::VarDecl::getTSCSpec(), clang::NamedDecl::hasLinkage(), clang::VarDecl::isConstexpr(), clang::VarDecl::isCXXForRangeDecl(), clang::DeclContext::isDependentContext(), clang::DeclContext::isFunctionOrMethod(), clang::VarDecl::isInitCapture(), clang::Decl::isLocalExternDecl(), clang::VarDecl::isObjCForDecl(), clang::VarDecl::isOutOfLine(), clang::VarDecl::isPreviousDeclInSameBlockScope(), clang::Decl::isReferenced(), clang::VarDecl::isStaticDataMember(), clang::Decl::isUsed(), LookupOrdinaryName, LookupRedeclarationWithLinkage, clang::DeclContext::makeDeclVisibleInContext(), Previous, clang::Decl::setAccess(), clang::VarDecl::setConstexpr(), clang::VarDecl::setCXXForRangeDecl(), clang::VarDecl::setInitCapture(), clang::VarDecl::setInitStyle(), clang::VarDecl::setInstantiationOfStaticDataMember(), clang::Decl::setIsUsed(), clang::Decl::setLexicalDeclContext(), clang::Decl::setLocalExternDecl(), clang::VarDecl::setObjCForDecl(), clang::VarDecl::setPreviousDeclInSameBlockScope(), clang::Decl::setReferenced(), clang::VarDecl::setTSCSpec(), clang::TSK_ExplicitSpecialization, and clang::TSK_ImplicitInstantiation.
Referenced by clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization(), clang::TemplateDeclInstantiator::VisitVarDecl(), and clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl().
VarTemplateSpecializationDecl * Sema::BuildVarTemplateInstantiation | ( | VarTemplateDecl * | VarTemplate, |
VarDecl * | FromVar, | ||
const TemplateArgumentList & | TemplateArgList, | ||
const TemplateArgumentListInfo & | TemplateArgsInfo, | ||
SmallVectorImpl< TemplateArgument > & | Converted, | ||
SourceLocation | PointOfInstantiation, | ||
void * | InsertPos, | ||
LateInstantiatedAttrVec * | LateAttrs = nullptr , |
||
LocalInstantiationScope * | StartingScope = nullptr |
||
) |
Definition at line 4325 of file SemaTemplateInstantiateDecl.cpp.
References clang::MultiLevelTemplateArgumentList::addOuterTemplateArguments(), clang::Decl::getDeclContext(), clang::VarDecl::getDescribedVarTemplate(), clang::Redeclarable< decl_type >::getFirstDecl(), clang::Sema::InstantiatingTemplate::isInvalid(), and clang::Decl::isInvalidDecl().
ExprResult Sema::BuildVectorLiteral | ( | SourceLocation | LParenLoc, |
SourceLocation | RParenLoc, | ||
Expr * | E, | ||
TypeSourceInfo * | TInfo | ||
) |
Build an altivec or OpenCL literal.
Definition at line 6592 of file SemaExpr.cpp.
References clang::VectorType::AltiVecVector, Diag(), clang::ExprError(), clang::VectorType::GenericVector, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Expr::getExprLoc(), clang::TypeSourceInfo::getType(), clang::VectorType::getVectorKind(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Type::isVectorType().
QualType Sema::BuildVectorType | ( | QualType | T, |
Expr * | VecSize, | ||
SourceLocation | AttrLoc | ||
) |
Definition at line 2335 of file SemaType.cpp.
References Diag(), clang::Type::isBooleanType(), clang::Type::isBuiltinType(), clang::Type::isDependentType(), clang::Type::isIntegerType(), clang::Type::isRealFloatingType(), clang::Expr::isTypeDependent(), and clang::Expr::isValueDependent().
Referenced by HandleVectorSizeAttr().
QualType Sema::BuildWritePipeType | ( | QualType | T, |
SourceLocation | Loc | ||
) |
Build a Write-only Pipe type.
T | The type to which we'll be building a Pipe. |
Loc | We do not use it for now. |
Definition at line 2087 of file SemaType.cpp.
ExprResult Sema::CallExprUnaryConversions | ( | Expr * | E | ) |
CallExprUnaryConversions - a special case of an unary conversion performed on a function designator of a call expression.
Definition at line 667 of file SemaExpr.cpp.
References clang::Expr::getType(), and clang::Type::isFunctionType().
bool Sema::canDelayFunctionBody | ( | const Declarator & | D | ) |
Determine whether we can delay parsing the body of a function or function template until it is used, assuming we don't care about emitting code for that function.
This will be false
if we may need the body of the function in the middle of parsing an expression (where it's impractical to switch to parsing a different function), for instance, if it's constexpr in C++11 or has an 'auto' return type in C++14. These cases are essentially bugs.
Definition at line 13471 of file SemaDecl.cpp.
References clang::DeclaratorChunk::Function, clang::Declarator::getDeclSpec(), clang::Declarator::getNumTypeObjects(), clang::Declarator::getTypeObject(), clang::DeclSpec::hasAutoTypeSpec(), clang::DeclSpec::hasConstexprSpecifier(), clang::QualType::isNull(), and clang::Type::isUndeducedType().
Referenced by clang::Parser::ParseTopLevelDecl().
bool Sema::canFullyTypeCheckRedeclaration | ( | ValueDecl * | NewD, |
ValueDecl * | OldD, | ||
QualType | NewT, | ||
QualType | OldT | ||
) |
Determines if we can perform a correct type check for D
as a redeclaration of PrevDecl
.
If not, we can generally still perform a best-effort check.
NewD | The new declaration. |
OldD | The old declaration. |
NewT | The portion of the type of the new declaration to check. |
OldT | The portion of the type of the old declaration to check. |
Definition at line 9441 of file SemaDecl.cpp.
References clang::Decl::getFriendObjectKind(), clang::Decl::getLexicalDeclContext(), clang::DeclContext::isDependentContext(), clang::Type::isDependentType(), and clang::Decl::isLocalExternDecl().
bool Sema::CanPerformCopyInitialization | ( | const InitializedEntity & | Entity, |
ExprResult | Init | ||
) |
Definition at line 9216 of file SemaInit.cpp.
References clang::InitializationKind::CreateCopy(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by TryListConversion().
Determine whether we can skip parsing the body of a function definition, assuming we don't care about analyzing its body or emitting code for that function.
This will be false
only if we may need the body of the function in order to parse the rest of the program (for instance, if it is constexpr
in C++11 or has an 'auto' return type in C++14).
Definition at line 13495 of file SemaDecl.cpp.
References clang::Decl::getAsFunction().
Referenced by clang::Parser::ParseTopLevelDecl().
CanThrowResult clang::Sema::canThrow | ( | const Expr * | E | ) |
Definition at line 1071 of file SemaExceptionSpec.cpp.
References clang::canCalleeThrow(), clang::canDynamicCastThrow(), clang::canSubExprsThrow(), clang::canTypeidThrow(), clang::LambdaExpr::capture_init_begin(), clang::LambdaExpr::capture_init_end(), clang::CT_Can, clang::CT_Cannot, clang::CT_Dependent, clang::Type::getAs(), clang::CallExpr::getCallee(), clang::CallExpr::getCalleeDecl(), clang::CXXRecordDecl::getDestructor(), clang::Stmt::getStmtClass(), clang::Expr::IgnoreParens(), clang::Type::isDependentType(), clang::QualType::isNull(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), clang::mergeCanThrow(), and clang::Stmt::NoStmtClass.
Referenced by BuildCXXNoexceptExpr(), clang::canSubExprsThrow(), checkEscapingByref(), EvaluateBinaryTypeTrait(), and evaluateTypeTrait().
Determine whether the use of this declaration is valid, without emitting diagnostics.
Definition at line 53 of file SemaExpr.cpp.
References clang::AR_Unavailable, and clang::Decl::getAvailability().
Referenced by canRecoverDotPseudoDestructorCallsOnPointerObjects().
bool Sema::CaptureHasSideEffects | ( | const sema::Capture & | From | ) |
Does copying/destroying the captured variable have side effects?
Definition at line 1519 of file SemaLambda.cpp.
References clang::VarDecl::getInit(), clang::sema::Capture::getVariable(), clang::Expr::HasSideEffects(), and clang::sema::Capture::isInitCapture().
QualType Sema::CheckAdditionOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
BinaryOperatorKind | Opc, | ||
QualType * | CompLHSTy = nullptr |
||
) |
Definition at line 9418 of file SemaExpr.cpp.
References checkArithmeticNull(), diagnoseStringPlusChar(), diagnoseStringPlusInt(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Expr::IgnoreParenCasts(), clang::Type::isAnyPointerType(), clang::Type::isArithmeticType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Expr::isNullPointerConstant(), clang::Type::isObjCObjectPointerType(), and clang::Type::isPointerType().
bool Sema::checkAddressOfFunctionIsAvailable | ( | const FunctionDecl * | Function, |
bool | Complain = false , |
||
SourceLocation | Loc = SourceLocation() |
||
) |
Returns whether the given function's address can be taken or not, optionally emitting a diagnostic if the address can't be taken.
Returns false if taking the address of the function is illegal.
Definition at line 9635 of file SemaOverload.cpp.
References checkAddressOfFunctionIsAvailable().
Referenced by FinishOverloadedCallExpr(), isExprAnUnaddressableFunction(), IsStandardConversion(), markUnaddressableCandidatesUnviable(), and clang::InitializationSequence::Perform().
Sema::AccessResult Sema::CheckAddressOfMemberAccess | ( | Expr * | OvlExpr, |
DeclAccessPair | FoundDecl | ||
) |
Definition at line 1799 of file SemaAccess.cpp.
References AR_accessible, clang::AS_none, clang::AS_public, clang::OverloadExpr::FindResult::Expression, clang::OverloadExpr::find(), clang::DeclAccessPair::getAccess(), and clang::OverloadExpr::getNamingClass().
Referenced by clang::InitializationSequence::Perform().
QualType Sema::CheckAddressOfOperand | ( | ExprResult & | OrigOp, |
SourceLocation | OpLoc | ||
) |
CheckAddressOfOperand - The operand of & must be either a function designator or an lvalue designating an object.
If it is an lvalue, the object cannot be declared with storage class register or be a bit field. Note: The usual conversions are not applied to the operand of the & operator (C99 6.3.2.1p[2-4]), and its result is never an lvalue. In C++, the operand might be an overloaded function name, in which case we allow the '&' but retain the overloaded-function type.
Definition at line 11937 of file SemaExpr.cpp.
References Diag(), and clang::ActionResult< PtrTy, CompressInvalid >::get().
void clang::Sema::CheckAlignasUnderalignment | ( | Decl * | D | ) |
Referenced by clang::TemplateDeclInstantiator::VisitVarDecl().
bool Sema::CheckAllocatedType | ( | QualType | AllocType, |
SourceLocation | Loc, | ||
SourceRange | R | ||
) |
Checks that a type is suitable as the allocated type in a new-expression.
Definition at line 2176 of file SemaExprCXX.cpp.
References Context, clang::Default, Diag(), clang::QualType::getAddressSpace(), clang::Qualifiers::getAddressSpaceAttributePrintValue(), clang::ASTContext::getAsArrayType(), clang::ASTContext::getBaseElementType(), getLangOpts(), clang::QualType::getObjCLifetime(), clang::QualType::getQualifiers(), clang::QualType::getUnqualifiedType(), clang::Type::isDependentType(), clang::Type::isFunctionType(), clang::Type::isObjCLifetimeType(), clang::Type::isReferenceType(), clang::Type::isVariablyModifiedType(), clang::Qualifiers::OCL_None, RequireCompleteType(), and RequireNonAbstractType().
Sema::AccessResult Sema::CheckAllocationAccess | ( | SourceLocation | OperatorLoc, |
SourceRange | PlacementRange, | ||
CXXRecordDecl * | NamingClass, | ||
DeclAccessPair | FoundDecl, | ||
bool | Diagnose = true |
||
) |
Checks access to an overloaded operator new or delete.
Definition at line 1695 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, and clang::DeclAccessPair::getAccess().
Referenced by resolveAllocationOverload().
void Sema::checkAllowedCUDAInitializer | ( | VarDecl * | VD | ) |
Definition at line 475 of file SemaCUDA.cpp.
References CFT_Host, CFT_HostDevice, Context, Diag(), clang::Type::getAsCXXRecordDecl(), clang::VarDecl::getInit(), clang::Decl::getLocation(), clang::Stmt::getSourceRange(), clang::ValueDecl::getType(), clang::Decl::hasAttr(), clang::VarDecl::hasGlobalStorage(), clang::VarDecl::hasInit(), IdentifyCUDATarget(), clang::Expr::isConstantInitializer(), isEmptyCudaConstructor(), isEmptyCudaDestructor(), clang::Decl::isInvalidDecl(), clang::Type::isReferenceType(), clang::VarDecl::isStaticLocal(), and clang::Decl::setInvalidDecl().
bool Sema::CheckARCMethodDecl | ( | ObjCMethodDecl * | method | ) |
Check a method declaration for compatibility with the Objective-C ARC conventions.
Definition at line 224 of file SemaDeclObjC.cpp.
References clang::Decl::addAttr(), checkInitMethod(), Context, clang::FixItHint::CreateInsertion(), clang::FixItHint::CreateReplacement(), Diag(), clang::Decl::getLocation(), clang::ObjCMethodDecl::getMethodFamily(), clang::ObjCMethodDecl::getReturnType(), clang::ObjCMethodDecl::getReturnTypeSourceRange(), clang::ObjCMethodDecl::getSelectorLoc(), clang::Decl::hasAttr(), clang::ASTContext::hasSameType(), clang::SourceRange::isInvalid(), clang::OMF_alloc, clang::OMF_autorelease, clang::OMF_copy, clang::OMF_dealloc, clang::OMF_finalize, clang::OMF_init, clang::OMF_initialize, clang::OMF_mutableCopy, clang::OMF_new, clang::OMF_None, clang::OMF_performSelector, clang::OMF_release, clang::OMF_retain, clang::OMF_retainCount, clang::OMF_self, and clang::ASTContext::VoidTy.
Referenced by ProcessPropertyDecl().
Sema::AssignConvertType Sema::CheckAssignmentConstraints | ( | SourceLocation | Loc, |
QualType | LHSType, | ||
QualType | RHSType | ||
) |
CheckAssignmentConstraints - Perform type checking for assignment, argument passing, variable initialization, and function return values.
C99 6.5.16.
Definition at line 7979 of file SemaExpr.cpp.
References clang::VK_RValue.
Referenced by DiagnosePropertyAccessorMismatch().
Sema::AssignConvertType Sema::CheckAssignmentConstraints | ( | QualType | LHSType, |
ExprResult & | RHS, | ||
CastKind & | Kind, | ||
bool | ConvertRHS = true |
||
) |
Check assignment constraints and optionally prepare for a conversion of the RHS to the LHS type.
CheckAssignmentConstraints (C99 6.5.16) - This routine currently has code to accommodate several GCC extensions when type checking pointers.
The conversion is prepared for if ConvertRHS is true.
Here are some objectionable examples that GCC considers warnings:
int a, *pint; short *pshort; struct foo *pfoo;
pint = pshort; // warning: assignment from incompatible pointer type a = pint; // warning: assignment makes integer from pointer without a cast pint = a; // warning: assignment makes pointer from integer without a cast pint = pfoo; // warning: assignment from incompatible pointer type
As a result, the code for dealing with pointers is more complex than the C99 spec dictates.
Sets 'Kind' for any result kind except Incompatible.
Definition at line 8018 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get().
QualType Sema::CheckAssignmentOperands | ( | Expr * | LHSExpr, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
QualType | CompoundType | ||
) |
Definition at line 11548 of file SemaExpr.cpp.
References CheckForModifiableLvalue(), CheckIdentityFieldAssignment(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::QualType::getUnqualifiedType(), clang::Expr::hasPlaceholderType(), isEnabled(), clang::Type::isHalfType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::QualType::isNull().
bool clang::Sema::CheckAttrNoArgs | ( | const ParsedAttr & | CurrAttr | ) |
Referenced by handleFunctionTypeAttr().
bool clang::Sema::CheckAttrTarget | ( | const ParsedAttr & | CurrAttr | ) |
Referenced by handleFunctionTypeAttr().
Sema::AccessResult Sema::CheckBaseClassAccess | ( | SourceLocation | AccessLoc, |
QualType | Base, | ||
QualType | Derived, | ||
const CXXBasePath & | Path, | ||
unsigned | DiagID, | ||
bool | ForceCheck = false , |
||
bool | ForceUnprivileged = false |
||
) |
Checks access for a hierarchy conversion.
ForceCheck | true if this check should be performed even if access control is disabled; some things rely on this for semantics |
ForceUnprivileged | true if this check should proceed as if the context had no special privileges |
Definition at line 1823 of file SemaAccess.cpp.
References clang::CXXBasePath::Access, AR_accessible, clang::AS_public, and clang::Type::getAs().
CXXBaseSpecifier * Sema::CheckBaseSpecifier | ( | CXXRecordDecl * | Class, |
SourceRange | SpecifierRange, | ||
bool | Virtual, | ||
AccessSpecifier | Access, | ||
TypeSourceInfo * | TInfo, | ||
SourceLocation | EllipsisLoc | ||
) |
ActOnBaseSpecifier - Parsed a base specifier.
Check the validity of a C++ base class specifier.
Definition at line 2217 of file SemaDeclCXX.cpp.
References clang::Type::containsUnexpandedParameterPack(), Diag(), findCircularInheritance(), clang::Type::getAsCXXRecordDecl(), clang::TypeLoc::getBeginLoc(), clang::CXXRecordDecl::getCanonicalDecl(), clang::Decl::getLocation(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), clang::Type::isDependentType(), clang::TagDecl::isUnion(), and clang::SourceLocation::isValid().
Referenced by SubstBaseSpecifiers().
|
inline |
Definition at line 10988 of file SemaExpr.cpp.
References checkArithmeticNull(), diagnoseLogicalNotOnLHSofCheck(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::isIntegralOrUnscopedEnumerationType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::QualType::isNull().
ExprResult Sema::CheckBooleanCondition | ( | SourceLocation | Loc, |
Expr * | E, | ||
bool | IsConstexpr = false |
||
) |
CheckBooleanCondition - Diagnose problems involving the use of the given expression as a boolean condition (e.g.
in an if statement). Also performs the standard function and array decays, possibly changing the input variable.
Loc | - A location associated with the condition, e.g. the 'if' keyword. |
Definition at line 16862 of file SemaExpr.cpp.
References CheckBoolLikeConversion(), Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isScalarType(), clang::Expr::isTypeDependent(), and result.
Referenced by ActOnNoexceptSpec(), and CheckConditionVariable().
bool clang::Sema::CheckCallingConvAttr | ( | const ParsedAttr & | attr, |
CallingConv & | CC, | ||
const FunctionDecl * | FD = nullptr |
||
) |
Referenced by getCCForDeclaratorChunk(), and handleFunctionTypeAttr().
bool Sema::CheckCallReturnType | ( | QualType | ReturnType, |
SourceLocation | Loc, | ||
CallExpr * | CE, | ||
FunctionDecl * | FD | ||
) |
CheckCallReturnType - Checks that a call expression's return type is complete.
Returns true on failure. The location passed in is the location that best represents the call.
Definition at line 16734 of file SemaExpr.cpp.
References clang::Type::isIncompleteType(), and clang::Type::isVoidType().
Referenced by ActOnDecltypeExpression().
Definition at line 17558 of file SemaExpr.cpp.
References clang::Expr::isIntegerConstantExpr(), clang::Expr::isTypeDependent(), and clang::Expr::isValueDependent().
void Sema::CheckCastAlign | ( | Expr * | Op, |
QualType | T, | ||
SourceRange | TRange | ||
) |
CheckCastAlign - Implements -Wcast-align, which warns when a pointer cast increases the alignment requirements.
Definition at line 12679 of file SemaChecking.cpp.
References clang::Type::getAs(), clang::SourceRange::getBegin(), clang::PointerType::getPointeeType(), clang::Expr::getType(), clang::Type::isDependentType(), and clang::Type::isIncompleteType().
void Sema::CheckCategoryVsClassMethodMatches | ( | ObjCCategoryImplDecl * | CatIMPDecl | ) |
CheckCategoryVsClassMethodMatches - Checks that methods implemented in category matches with those implemented in its primary class and warns each time an exact match is found.
Definition at line 2913 of file SemaDeclObjC.cpp.
References clang::ObjCContainerDecl::class_methods(), clang::ObjCCategoryImplDecl::getCategoryDecl(), clang::ObjCCategoryDecl::getClassInterface(), clang::ObjCInterfaceDecl::getSuperClass(), clang::ObjCContainerDecl::instance_methods(), clang::ObjCInterfaceDecl::lookupMethod(), and MatchAllMethodDeclarations().
void Sema::checkClassLevelCodeSegAttribute | ( | CXXRecordDecl * | Class | ) |
Definition at line 5661 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::methods().
void Sema::checkClassLevelDLLAttribute | ( | CXXRecordDecl * | Class | ) |
Check class-level dllimport/dllexport attribute.
The caller must ensure that referenceDLLExportedClassMethods is called some point later when all outer classes of Class are complete.
Definition at line 5672 of file SemaDeclCXX.cpp.
References clang::getDLLAttr().
Referenced by dllExportImportClassTemplateSpecialization().
DeclResult Sema::CheckClassTemplate | ( | Scope * | S, |
unsigned | TagSpec, | ||
TagUseKind | TUK, | ||
SourceLocation | KWLoc, | ||
CXXScopeSpec & | SS, | ||
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
const ParsedAttributesView & | Attr, | ||
TemplateParameterList * | TemplateParams, | ||
AccessSpecifier | AS, | ||
SourceLocation | ModulePrivateLoc, | ||
SourceLocation | FriendLoc, | ||
unsigned | NumOuterTemplateParamLists, | ||
TemplateParameterList ** | OuterTemplateParamLists, | ||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
Definition at line 1353 of file SemaTemplate.cpp.
QualType Sema::CheckCompareOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
BinaryOperatorKind | Opc | ||
) |
Definition at line 10450 of file SemaExpr.cpp.
References checkArithmeticNull(), checkArithmeticOrEnumeralCompare(), diagnoseLogicalNotOnLHSofCheck(), diagnoseTautologicalComparison(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Type::isArithmeticType(), clang::Type::isEnumeralType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isMemberPointerType(), clang::Type::isPointerType(), and clang::BinaryOperator::isRelationalOp().
QualType Sema::CheckComparisonCategoryType | ( | ComparisonCategoryType | Kind, |
SourceLocation | Loc | ||
) |
Lookup the specified comparison category types in the standard library, an check the VarDecls possibly returned by the operator<=> builtins for that type.
Definition at line 9122 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus.
Referenced by checkArithmeticOrEnumeralThreeWayCompare().
void Sema::CheckCompatibleReinterpretCast | ( | QualType | SrcType, |
QualType | DestType, | ||
bool | IsDereference, | ||
SourceRange | Range | ||
) |
Definition at line 1805 of file SemaCast.cpp.
References clang::Type::getAs(), clang::SourceRange::getBegin(), and clang::Type::getPointeeType().
Referenced by CheckIndirectionOperand(), and TryReinterpretCast().
void Sema::CheckCompletedCoroutineBody | ( | FunctionDecl * | FD, |
Stmt *& | Body | ||
) |
Definition at line 957 of file SemaCoroutine.cpp.
References clang::sema::FunctionScopeInfo::CoroutinePromise, Diag(), clang::sema::FunctionScopeInfo::FirstCoroutineStmtLoc, clang::sema::FunctionScopeInfo::FirstReturnLoc, clang::sema::FunctionScopeInfo::getFirstCoroutineStmtKeyword(), clang::sema::FunctionScopeInfo::isCoroutine(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), and clang::Decl::setInvalidDecl().
void Sema::CheckCompletedCXXClass | ( | CXXRecordDecl * | Record | ) |
Perform semantic checks on a class definition that has been completing, introducing implicitly-declared members, checking for abstract types, etc.
Definition at line 6043 of file SemaDeclCXX.cpp.
References clang::AS_public, clang::DeclContextLookupResult::begin(), CheckAbstractClassUsage(), Diag(), clang::DeclContextLookupResult::end(), clang::RecordDecl::fields(), clang::Decl::getAccess(), clang::NamedDecl::getDeclName(), clang::CXXRecordDecl::getDestructor(), clang::NamedDecl::getIdentifier(), clang::Decl::getLocation(), clang::TagDecl::getTagKind(), clang::NamedDecl::getUnderlyingDecl(), clang::Decl::hasAttr(), clang::CXXRecordDecl::hasUserDeclaredConstructor(), clang::CXXRecordDecl::isAbstract(), clang::CXXRecordDecl::isAggregate(), clang::TagDecl::isDependentType(), clang::Decl::isInvalidDecl(), clang::CXXRecordDecl::isLambda(), clang::CXXRecordDecl::isPolymorphic(), clang::CXXMethodDecl::isVirtual(), and clang::DeclContext::lookup().
void Sema::CheckCompleteDecompositionDeclaration | ( | DecompositionDecl * | DD | ) |
Definition at line 1407 of file SemaDeclCXX.cpp.
References clang::DecompositionDecl::bindings(), clang::ValueDecl::getType(), and clang::Type::isDependentType().
void Sema::CheckCompleteVariableDeclaration | ( | VarDecl * | VD | ) |
Definition at line 12155 of file SemaDecl.cpp.
References Diag(), clang::QualType::DK_nontrivial_c_struct, clang::Decl::getDeclContext(), clang::VarDecl::getDescribedVarTemplate(), clang::VarDecl::getInit(), clang::Decl::getLocation(), clang::QualType::getObjCLifetime(), clang::Redeclarable< decl_type >::getPreviousDecl(), clang::DeclContext::getRedeclContext(), clang::VarDecl::getTemplateSpecializationKind(), clang::TypeSourceInfo::getType(), clang::ValueDecl::getType(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::DeclaratorDecl::getTypeSpecStartLoc(), clang::VarDecl::hasInit(), clang::NamedDecl::hasLinkage(), clang::VarDecl::hasLocalStorage(), clang::Type::isBlockPointerType(), clang::Expr::isConstantInitializer(), clang::QualType::isDestructedType(), clang::NamedDecl::isExternallyVisible(), clang::DeclContext::isFileContext(), clang::VarDecl::isInline(), clang::Decl::isInvalidDecl(), clang::isTemplateInstantiation(), clang::VarDecl::isThisDeclarationADefinition(), clang::Qualifiers::OCL_Autoreleasing, clang::Qualifiers::OCL_ExplicitNone, clang::Qualifiers::OCL_None, clang::Qualifiers::OCL_Strong, clang::Qualifiers::OCL_Weak, and clang::Decl::setInvalidDecl().
ExprResult Sema::CheckConceptTemplateId | ( | const CXXScopeSpec & | SS, |
const DeclarationNameInfo & | NameInfo, | ||
ConceptDecl * | Template, | ||
SourceLocation | TemplateLoc, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
Definition at line 4255 of file SemaTemplate.cpp.
References Diag(), clang::ExprError(), and clang::DeclarationNameInfo::getBeginLoc().
QualType Sema::CheckConditionalOperands | ( | ExprResult & | Cond, |
ExprResult & | LHS, | ||
ExprResult & | RHS, | ||
ExprValueKind & | VK, | ||
ExprObjectKind & | OK, | ||
SourceLocation | QuestionLoc | ||
) |
Note that LHS is not null here, even if this is the gnu "x ?: y" extension.
In that case, LHS = cond. C99 6.5.15
Definition at line 7196 of file SemaExpr.cpp.
References checkBlockType(), checkCondition(), checkConditionalBlockPointerCompatibility(), checkConditionalNullPointer(), checkConditionalObjectPointersCompatibility(), checkConditionalVoidType(), checkPointerIntegerMismatch(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::QualType::getUnqualifiedType(), clang::Type::isArithmeticType(), clang::Type::isBlockPointerType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Type::isPointerType(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Type::isVoidType(), clang::OK_Ordinary, OpenCLCheckVectorConditional(), unsupportedTypeConversion(), and clang::VK_RValue.
ExprResult Sema::CheckConditionVariable | ( | VarDecl * | ConditionVar, |
SourceLocation | StmtLoc, | ||
ConditionKind | CK | ||
) |
Check the use of the given variable as a C++ condition in an if, while, do-while, or switch statement.
Definition at line 3621 of file SemaExprCXX.cpp.
References Boolean, BuildDeclRefExpr(), CheckBooleanCondition(), CheckSwitchCondition(), ConstexprIf, Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Decl::getLocation(), clang::QualType::getNonReferenceType(), clang::VarDecl::getSourceRange(), clang::ValueDecl::getType(), clang::Type::isArrayType(), clang::Type::isFunctionType(), clang::Decl::isInvalidDecl(), Switch, and clang::VK_LValue.
Referenced by ActOnConditionVariable().
void Sema::CheckConflictingOverridingMethod | ( | ObjCMethodDecl * | Method, |
ObjCMethodDecl * | Overridden, | ||
bool | IsProtocolMethodDecl | ||
) |
Definition at line 2575 of file SemaDeclObjC.cpp.
References CheckMethodOverrideParam(), CheckMethodOverrideReturn(), Diag(), clang::Decl::getLocation(), clang::ObjCMethodDecl::isVariadic(), clang::ObjCMethodDecl::param_begin(), and clang::ObjCMethodDecl::param_end().
bool Sema::CheckConstexprFunctionBody | ( | const FunctionDecl * | Dcl, |
Stmt * | Body | ||
) |
Check the body for the given constexpr function declaration only contains the permitted types of statement.
C++11 [dcl.constexpr]p3,p4.
Definition at line 1971 of file SemaDeclCXX.cpp.
References CheckConstexprCtorInitializer(), CheckConstexprFunctionStmt(), clang::Stmt::children(), Diag(), clang::RecordDecl::field_begin(), clang::RecordDecl::field_end(), clang::RecordDecl::fields(), clang::Stmt::getBeginLoc(), clang::Decl::getLocation(), clang::CXXRecordDecl::getNumBases(), clang::CXXRecordDecl::getNumVBases(), clang::FunctionDecl::getReturnType(), clang::CXXRecordDecl::hasVariantMembers(), Inits, clang::FunctionDecl::isConsteval(), clang::Type::isDependentType(), clang::Expr::isPotentialConstantExpr(), clang::TagDecl::isUnion(), clang::SourceLocation::isValid(), and clang::Type::isVoidType().
bool Sema::CheckConstexprFunctionDecl | ( | const FunctionDecl * | FD | ) |
Definition at line 1612 of file SemaDeclCXX.cpp.
References clang::CXXMethodDecl::begin_overridden_methods(), CheckConstexprParameterTypes(), Diag(), clang::CXXMethodDecl::getCanonicalDecl(), clang::Decl::getLocation(), clang::CXXRecordDecl::getNumVBases(), clang::CXXMethodDecl::getParent(), getRecordDiagFromTagKind(), clang::FunctionDecl::getReturnType(), clang::TagDecl::getTagKind(), clang::FunctionDecl::isConsteval(), clang::Type::isDependentType(), clang::CXXMethodDecl::isInstance(), clang::CXXMethodDecl::isVirtual(), and clang::CXXRecordDecl::vbases().
void Sema::CheckConstructor | ( | CXXConstructorDecl * | Constructor | ) |
CheckConstructor - Checks a fully-formed constructor for well-formedness, issuing any diagnostics required.
Returns true if the constructor declarator is invalid.
Definition at line 8281 of file SemaDeclCXX.cpp.
References clang::Decl::getDeclContext(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::FunctionDecl::getTemplateSpecializationKind(), clang::ValueDecl::getType(), clang::ParmVarDecl::hasDefaultArg(), clang::Decl::isInvalidDecl(), clang::Decl::setInvalidDecl(), and clang::TSK_ImplicitInstantiation.
Sema::AccessResult Sema::CheckConstructorAccess | ( | SourceLocation | Loc, |
CXXConstructorDecl * | D, | ||
DeclAccessPair | FoundDecl, | ||
const InitializedEntity & | Entity, | ||
bool | IsCopyBindingRefToTemp = false |
||
) |
Checks access to a constructor.
Definition at line 1610 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::InitializedEntity::EK_Base, clang::InitializedEntity::EK_LambdaCapture, clang::InitializedEntity::EK_Member, clang::DeclAccessPair::getAccess(), clang::InitializedEntity::getBaseSpecifier(), clang::InitializedEntity::getCapturedVarName(), clang::InitializedEntity::getDecl(), clang::InitializedEntity::getKind(), clang::CXXBaseSpecifier::getType(), clang::InitializedEntity::getType(), clang::ValueDecl::getType(), and clang::InitializedEntity::isInheritedVirtualBase().
Referenced by CheckCXX98CompatAccessibleCopy(), CopyObject(), clang::InitializationSequence::Perform(), and PerformConstructorInitialization().
Sema::AccessResult Sema::CheckConstructorAccess | ( | SourceLocation | Loc, |
CXXConstructorDecl * | D, | ||
DeclAccessPair | FoundDecl, | ||
const InitializedEntity & | Entity, | ||
const PartialDiagnostic & | PDiag | ||
) |
Checks access to a constructor.
Definition at line 1653 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::InitializedEntity::EK_Base, clang::InitializedEntity::EK_Delegating, clang::DeclAccessPair::getAccess(), clang::DeclAccessPair::getDecl(), clang::InitializedEntity::getKind(), clang::InitializedEntity::getParent(), clang::DeclContext::getParent(), and clang::CXXMethodDecl::getParent().
QualType Sema::CheckConstructorDeclarator | ( | Declarator & | D, |
QualType | R, | ||
StorageClass & | SC | ||
) |
CheckConstructorDeclarator - Called by ActOnDeclarator to check the well-formedness of the constructor declarator D
with type R
.
If there are any errors in the declarator, this routine will emit diagnostics and set the invalid bit to true. In any case, the type will be updated to reflect a well-formed type for the constructor and returned.
Definition at line 8218 of file SemaDeclCXX.cpp.
References checkMethodTypeQualifiers(), clang::FixItHint::CreateRemoval(), Diag(), clang::Type::getAs(), clang::DeclSpec::getAtomicSpecLoc(), clang::DeclSpec::getConstSpecLoc(), clang::Declarator::getDeclSpec(), clang::Declarator::getFunctionTypeInfo(), clang::Declarator::getIdentifierLoc(), clang::DeclaratorChunk::FunctionTypeInfo::getRefQualifierLoc(), clang::DeclSpec::getRestrictSpecLoc(), clang::FunctionType::getReturnType(), clang::DeclSpec::getStorageClassSpecLoc(), clang::DeclSpec::getTypeQualifiers(), clang::DeclSpec::getVirtualSpecLoc(), clang::DeclSpec::getVolatileSpecLoc(), clang::DeclaratorChunk::FunctionTypeInfo::hasRefQualifier(), clang::Declarator::isInvalidType(), clang::DeclSpec::isVirtualSpecified(), clang::DeclaratorChunk::FunctionTypeInfo::RefQualifierIsLValueRef, clang::SC_None, clang::SC_Static, and clang::Declarator::setInvalidType().
void Sema::CheckConversionDeclarator | ( | Declarator & | D, |
QualType & | R, | ||
StorageClass & | SC | ||
) |
CheckConversionDeclarator - Called by ActOnDeclarator to check the well-formednes of the conversion function declarator D
with type R
.
If there are any errors in the declarator, this routine will emit diagnostics and return true. Otherwise, it will return false. Either way, the type R
will be updated to reflect a well-formed type for the conversion operator.
Definition at line 8495 of file SemaDeclCXX.cpp.
References clang::frontend::After, clang::DeclaratorChunk::Array, clang::DeclaratorChunk::BlockPointer, clang::UnqualifiedId::ConversionFunctionId, clang::frontend::CPlusPlus11, clang::FixItHint::CreateInsertion(), clang::FixItHint::CreateInsertionFromRange(), clang::FixItHint::CreateRemoval(), Diag(), extendLeft(), extendRight(), clang::DeclaratorChunk::FunctionTypeInfo::freeParams(), clang::DeclaratorChunk::Function, clang::Type::getAs(), clang::SourceRange::getBegin(), clang::Declarator::getDeclSpec(), clang::TypeLoc::getEndLoc(), clang::Declarator::getFunctionTypeInfo(), clang::Declarator::getIdentifierLoc(), clang::Declarator::getName(), clang::FunctionProtoType::getNumParams(), clang::FunctionType::getReturnType(), clang::TypeLoc::getSourceRange(), clang::UnqualifiedId::getSourceRange(), clang::DeclSpec::getStorageClassSpecLoc(), clang::CharSourceRange::getTokenRange(), clang::TypeSourceInfo::getTypeLoc(), clang::Type::isArrayType(), clang::Type::isDependentType(), clang::Declarator::isInvalidType(), clang::SourceRange::isValid(), clang::FunctionProtoType::isVariadic(), clang::DeclaratorChunk::MemberPointer, clang::DeclaratorChunk::Paren, clang::DeclaratorChunk::Pipe, clang::DeclaratorChunk::Pointer, clang::DeclaratorChunk::Reference, clang::SC_None, clang::SC_Static, clang::Declarator::setInvalidType(), and clang::Declarator::type_objects().
ExprResult Sema::CheckConvertedConstantExpression | ( | Expr * | From, |
QualType | T, | ||
llvm::APSInt & | Value, | ||
CCEKind | CCE | ||
) |
Definition at line 5541 of file SemaOverload.cpp.
References CheckConvertedConstantExpression(), clang::Type::isIntegralOrEnumerationType(), and V.
Referenced by ActOnCXXNew(), and CheckCXXBooleanCondition().
ExprResult Sema::CheckConvertedConstantExpression | ( | Expr * | From, |
QualType | T, | ||
APValue & | Value, | ||
CCEKind | CCE | ||
) |
Definition at line 5536 of file SemaOverload.cpp.
References CheckConvertedConstantExpression().
bool Sema::CheckCUDACall | ( | SourceLocation | Loc, |
FunctionDecl * | Callee | ||
) |
Check whether we're allowed to call Callee from the current context.
If the call is allowed in semantically-correct programs, but only if it's never codegen'ed (CFP_WrongSide), creates a deferred diagnostic to be emitted if and when the caller is codegen'ed, and returns true.
Will only create deferred diagnostics for a given SourceLocation once, so you can safely call this multiple times without generating duplicate deferred errors.
Definition at line 675 of file SemaCUDA.cpp.
References CFP_Never, CFP_WrongSide, CFT_Global, CurContext, DeviceCallGraph, ExprEvalContexts, getLangOpts(), IdentifyCUDAPreference(), IdentifyCUDATarget(), IsKnownEmitted(), clang::Sema::DeviceDiagBuilder::K_Deferred, clang::Sema::DeviceDiagBuilder::K_Immediate, clang::Sema::DeviceDiagBuilder::K_ImmediateWithCallStack, clang::Sema::DeviceDiagBuilder::K_Nop, LocsWithCUDACallDiags, and markKnownEmitted().
void Sema::checkCUDATargetOverload | ( | FunctionDecl * | NewFD, |
const LookupResult & | Previous | ||
) |
Check whether NewFD is a valid overload for CUDA.
Emits diagnostics and invalidates NewFD if not.
Definition at line 760 of file SemaCUDA.cpp.
References CFT_Global, CFT_HostDevice, Diag(), clang::Decl::getAsFunction(), clang::NamedDecl::getDeclName(), getLangOpts(), clang::Decl::getLocation(), IdentifyCUDATarget(), IsOverload(), and clang::Decl::setInvalidDecl().
ExprResult Sema::CheckCXXBooleanCondition | ( | Expr * | CondExpr, |
bool | IsConstexpr = false |
||
) |
CheckCXXBooleanCondition - Returns true if conversion to bool is invalid.
CheckCXXBooleanCondition - Returns true if a conversion to bool is invalid.
Definition at line 3659 of file SemaExprCXX.cpp.
References clang::ASTContext::BoolTy, CCEK_ConstexprIf, CheckConvertedConstantExpression(), Context, clang::Expr::isValueDependent(), and PerformContextuallyConvertToBool().
Referenced by CXXCheckConditionalOperands().
bool Sema::CheckCXXDefaultArgExpr | ( | SourceLocation | CallLoc, |
FunctionDecl * | FD, | ||
ParmVarDecl * | Param | ||
) |
Instantiate or parse a C++ default argument expression as necessary.
Return true on error.
Definition at line 4771 of file SemaExpr.cpp.
References Diag(), clang::DeclaratorDecl::getBeginLoc(), clang::Decl::getDeclContext(), clang::MultiLevelTemplateArgumentList::getInnermost(), clang::ParmVarDecl::getUninstantiatedDefaultArg(), clang::ParmVarDecl::hasUninstantiatedDefaultArg(), clang::ParmVarDecl::hasUnparsedDefaultArg(), clang::InitializedEntity::InitializeParameter(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Decl::setInvalidDecl().
Referenced by checkForMultipleExportedDefaultConstructors().
void Sema::CheckCXXDefaultArguments | ( | FunctionDecl * | FD | ) |
CheckCXXDefaultArguments - Verify that the default arguments for a function declaration are well-formed according to C++ [dcl.fct.default].
Definition at line 1521 of file SemaDeclCXX.cpp.
References Diag(), clang::NamedDecl::getIdentifier(), clang::Decl::getLocation(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::ParmVarDecl::hasDefaultArg(), clang::Decl::isInvalidDecl(), clang::VarDecl::isParameterPack(), p, and clang::ParmVarDecl::setDefaultArg().
bool Sema::CheckCXXThisCapture | ( | SourceLocation | Loc, |
bool | Explicit = false , |
||
bool | BuildAndDiagnose = true , |
||
const unsigned *const | FunctionScopeIndexToStopAt = nullptr , |
||
bool | ByCopy = false |
||
) |
Make sure the value of 'this' is actually available in the current context, if it is a potentially evaluated context.
Loc | The location at which the capture of 'this' occurs. |
Explicit | Whether 'this' is explicitly captured in a lambda capture list. |
FunctionScopeIndexToStopAt | If non-null, it points to the index of the FunctionScopeInfo stack beyond which we do not attempt to capture. This is useful when enclosing lambdas must speculatively capture 'this' that may or may not be used in certain specializations of a nested generic lambda (depending on whether the name resolves to a non-static member function or a static function). |
Definition at line 1137 of file SemaExprCXX.cpp.
References clang::sema::CapturingScopeInfo::addThisCapture(), clang::sema::LambdaScopeInfo::CallOperator, clang::Qualifiers::CVRMask, Diag(), FunctionScopes, getCurrentThisType(), clang::Type::getPointeeType(), clang::sema::CapturingScopeInfo::ImpCap_Block, clang::sema::CapturingScopeInfo::ImpCap_CapturedRegion, clang::sema::CapturingScopeInfo::ImpCap_LambdaByref, clang::sema::CapturingScopeInfo::ImpCap_LambdaByval, clang::isGenericLambdaCallOperatorSpecialization(), isUnevaluatedContext(), and clang::QualType::removeLocalCVRQualifiers().
Referenced by MarkThisReferenced(), and tryImplicitlyCaptureThisIfImplicitMemberFunctionAccessWithDependentArgs().
bool Sema::CheckCXXThrowOperand | ( | SourceLocation | ThrowLoc, |
QualType | ThrowTy, | ||
Expr * | E | ||
) |
CheckCXXThrowOperand - Validate the operand of a throw.
Definition at line 854 of file SemaExprCXX.cpp.
References clang::Type::getAs(), clang::Type::getAsCXXRecordDecl(), clang::Expr::getExprLoc(), clang::Type::getPointeeType(), clang::Stmt::getSourceRange(), clang::CXXRecordDecl::hasIrrelevantDestructor(), and clang::Type::isVoidType().
void Sema::checkDeclIsAllowedInOpenMPTarget | ( | Expr * | E, |
Decl * | D, | ||
SourceLocation | IdLoc = SourceLocation() |
||
) |
Check declaration inside target region.
Definition at line 14994 of file SemaOpenMP.cpp.
References checkValueDeclInTarget(), Diag(), DSAStack, clang::Stmt::getBeginLoc(), clang::Decl::getLocation(), clang::Decl::getSourceRange(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Type::isIncompleteType(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), and reportOriginalDsa().
Referenced by MarkExprReferenced().
void Sema::CheckDeductionGuideDeclarator | ( | Declarator & | D, |
QualType & | R, | ||
StorageClass & | SC | ||
) |
Check the validity of a declarator that we parsed for a deduction-guide.
These aren't actually declarators in the grammar, so we need to check that the user didn't specify any pieces that are not part of the deduction-guide grammar.
Definition at line 8738 of file SemaDeclCXX.cpp.
References clang::DeclSpec::ClearStorageClassSpecs(), Diag(), clang::DeclaratorChunk::Function, clang::OpaquePtr< PtrTy >::get(), clang::UnionOpaquePtr< T >::get(), clang::TypeLoc::getAs(), clang::TemplateName::getAsTemplateDecl(), clang::DeclSpec::getBeginLoc(), clang::UnqualifiedId::getBeginLoc(), clang::Decl::getDeclContext(), clang::Declarator::getDeclSpec(), clang::Declarator::getIdentifierLoc(), clang::Decl::getLocation(), clang::Declarator::getMutableDeclSpec(), clang::Declarator::getName(), clang::DeclContext::getRedeclContext(), clang::Declarator::getSourceRange(), clang::TypeSourceInfo::getTypeLoc(), clang::Declarator::isInvalidType(), clang::DeclaratorChunk::Paren, clang::SC_None, clang::UnqualifiedId::TemplateName, and clang::Declarator::type_objects().
void Sema::CheckDeductionGuideTemplate | ( | FunctionTemplateDecl * | TD | ) |
Definition at line 3842 of file SemaTemplate.cpp.
References Diag(), clang::Decl::getLocation(), clang::TemplateDecl::getTemplateParameters(), hasVisibleDefaultArgument(), and noteNonDeducibleParameters().
void Sema::CheckDelayedMemberExceptionSpecs | ( | ) |
Definition at line 6752 of file SemaDeclCXX.cpp.
References clang::Equivalent.
Referenced by ActOnEndOfTranslationUnit().
void Sema::CheckDelegatingCtorCycles | ( | ) |
Definition at line 15426 of file SemaDeclCXX.cpp.
Referenced by ActOnEndOfTranslationUnit().
bool Sema::CheckDependentFunctionTemplateSpecialization | ( | FunctionDecl * | FD, |
const TemplateArgumentListInfo & | ExplicitTemplateArgs, | ||
LookupResult & | Previous | ||
) |
Perform semantic analysis for the given dependent function template specialization.
The only possible way to get a dependent function template specialization is with a friend declaration, like so:
There really isn't any useful analysis we can do here, so we just store the information.
Definition at line 8309 of file SemaTemplate.cpp.
References Diag(), clang::LookupResult::Filter::done(), clang::LookupResult::empty(), clang::LookupResult::Filter::erase(), clang::Decl::getDeclContext(), clang::Decl::getLocation(), clang::DeclContext::getRedeclContext(), clang::NamedDecl::getUnderlyingDecl(), clang::LookupResult::Filter::hasNext(), clang::DeclContext::InEnclosingNamespaceSetOf(), clang::LookupResult::makeFilter(), clang::LookupResult::Filter::next(), P, and clang::FunctionDecl::setDependentTemplateSpecialization().
bool Sema::CheckDerivedToBaseConversion | ( | QualType | Derived, |
QualType | Base, | ||
SourceLocation | Loc, | ||
SourceRange | Range, | ||
CXXCastPath * | BasePath = nullptr , |
||
bool | IgnoreAccess = false |
||
) |
Definition at line 2713 of file SemaDeclCXX.cpp.
Referenced by CheckPointerToMemberOperands(), getCastAwayConstnessCastKind(), clang::InitializationSequence::Perform(), and PerformImplicitConversion().
bool Sema::CheckDerivedToBaseConversion | ( | QualType | Derived, |
QualType | Base, | ||
unsigned | InaccessibleBaseID, | ||
unsigned | AmbigiousBaseConvID, | ||
SourceLocation | Loc, | ||
SourceRange | Range, | ||
DeclarationName | Name, | ||
CXXCastPath * | BasePath, | ||
bool | IgnoreAccess = false |
||
) |
CheckDerivedToBaseConversion - Check whether the Derived-to-Base conversion (where Derived and Base are class types) is well-formed, meaning that the conversion is unambiguous (and that all of the base classes are accessible).
Returns true and emits a diagnostic if the code is ill-formed, returns false otherwise. Loc is the location where this routine should point to if there is an error, and Range is the source range to highlight if there is an error.
If either InaccessibleBaseID or AmbigiousBaseConvID are 0, then the diagnostic for the respective type of error will be suppressed, but the check for ill-formed code will still be performed.
Definition at line 2631 of file SemaDeclCXX.cpp.
bool Sema::CheckDestructor | ( | CXXDestructorDecl * | Destructor | ) |
CheckDestructor - Checks a fully-formed destructor definition for well-formedness, issuing any diagnostics required.
Returns true on error.
Definition at line 8318 of file SemaDeclCXX.cpp.
References clang::declaresSameEntity(), Diag(), clang::Type::getAsCXXRecordDecl(), clang::Decl::getLocation(), clang::CXXDestructorDecl::getOperatorDelete(), clang::CXXMethodDecl::getParent(), clang::Decl::isImplicit(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::CXXMethodDecl::isVirtual(), and clang::CXXDestructorDecl::setOperatorDelete().
Sema::AccessResult Sema::CheckDestructorAccess | ( | SourceLocation | Loc, |
CXXDestructorDecl * | Dtor, | ||
const PartialDiagnostic & | PDiag, | ||
QualType | objectType = QualType() |
||
) |
Definition at line 1586 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::Decl::getAccess(), clang::CXXMethodDecl::getParent(), and clang::QualType::isNull().
Referenced by ActOnCXXDelete(), checkDestructorReference(), MaybeBindToTemporary(), and clang::InitializationSequence::Perform().
QualType Sema::CheckDestructorDeclarator | ( | Declarator & | D, |
QualType | R, | ||
StorageClass & | SC | ||
) |
CheckDestructorDeclarator - Called by ActOnDeclarator to check the well-formednes of the destructor declarator D
with type R
.
If there are any errors in the declarator, this routine will emit diagnostics and set the declarator to invalid. Even if this happens, will be updated to reflect a well-formed type for the destructor and returned.
Definition at line 8373 of file SemaDeclCXX.cpp.
References checkMethodTypeQualifiers(), clang::FixItHint::CreateRemoval(), clang::UnqualifiedId::DestructorName, Diag(), clang::DeclaratorChunk::FunctionTypeInfo::freeParams(), clang::FTIHasNonVoidParameters(), clang::Type::getAs(), clang::DeclSpec::getAtomicSpecLoc(), clang::DeclSpec::getConstSpecLoc(), clang::Declarator::getDeclSpec(), clang::FunctionProtoType::getExtProtoInfo(), clang::Declarator::getFunctionTypeInfo(), clang::Declarator::getIdentifierLoc(), clang::Declarator::getName(), clang::DeclaratorChunk::FunctionTypeInfo::getRefQualifierLoc(), clang::DeclSpec::getRestrictSpecLoc(), clang::DeclSpec::getStorageClassSpecLoc(), clang::DeclSpec::getTypeQualifiers(), clang::DeclSpec::getTypeSpecTypeLoc(), clang::DeclSpec::getVolatileSpecLoc(), clang::DeclaratorChunk::FunctionTypeInfo::hasRefQualifier(), clang::DeclSpec::hasTypeSpecifier(), clang::Declarator::isInvalidType(), clang::DeclaratorChunk::FunctionTypeInfo::isVariadic, clang::DeclaratorChunk::FunctionTypeInfo::RefQualifierIsLValueRef, clang::RQ_None, clang::SC_None, clang::SC_Static, clang::Declarator::setInvalidType(), and clang::FunctionProtoType::ExtProtoInfo::Variadic.
CheckDistantExceptionSpec - Check if the given type is a pointer or pointer to member to a function with an exception specification.
This means that it is invalid to add another level of indirection.
Definition at line 167 of file SemaExceptionSpec.cpp.
References clang::frontend::CPlusPlus17, clang::Type::getAs(), getLangOpts(), clang::Type::getPointeeType(), and clang::FunctionProtoType::hasExceptionSpec().
EnableIfAttr * Sema::CheckEnableIf | ( | FunctionDecl * | Function, |
ArrayRef< Expr *> | Args, | ||
bool | MissingImplicitThis = false |
||
) |
Check the enable_if expressions on the given function.
Returns the first failing attribute, or NULL if they were all successful.
Definition at line 6371 of file SemaOverload.cpp.
References convertArgsForAvailabilityChecks(), and clang::Decl::specific_attrs().
Referenced by checkDirectCallValidity().
EnumConstantDecl * Sema::CheckEnumConstant | ( | EnumDecl * | Enum, |
EnumConstantDecl * | LastEnumConst, | ||
SourceLocation | IdLoc, | ||
IdentifierInfo * | Id, | ||
Expr * | val | ||
) |
Definition at line 16689 of file SemaDecl.cpp.
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition().
bool Sema::CheckEnumRedeclaration | ( | SourceLocation | EnumLoc, |
bool | IsScoped, | ||
QualType | EnumUnderlyingTy, | ||
bool | IsFixed, | ||
const EnumDecl * | Prev | ||
) |
Check whether this is a valid redeclaration of a previous enumeration.
Definition at line 14235 of file SemaDecl.cpp.
References Diag(), clang::EnumDecl::getIntegerType(), clang::Decl::getLocation(), clang::Type::isDependentType(), clang::EnumDecl::isFixed(), and clang::EnumDecl::isScoped().
bool Sema::CheckEnumUnderlyingType | ( | TypeSourceInfo * | TI | ) |
Check that this is a valid underlying type for an enum declaration.
Definition at line 14218 of file SemaDecl.cpp.
References Diag(), clang::Type::getAs(), clang::TypeLoc::getBeginLoc(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), and clang::Type::isDependentType().
bool clang::Sema::CheckEquivalentExceptionSpec | ( | FunctionDecl * | Old, |
FunctionDecl * | New | ||
) |
Definition at line 271 of file SemaExceptionSpec.cpp.
References clang::Type::castAs(), clang::CheckEquivalentExceptionSpecImpl(), Context, clang::frontend::CPlusPlus17, clang::FixItHint::CreateInsertion(), DelayedEquivalentExceptionSpecChecks, Diag(), clang::EST_BasicNoexcept, clang::EST_DependentNoexcept, clang::EST_Dynamic, clang::EST_DynamicNone, clang::EST_MSAny, clang::EST_NoexceptFalse, clang::EST_NoexceptTrue, clang::EST_None, clang::EST_NoThrow, clang::EST_Unevaluated, clang::EST_Uninstantiated, clang::EST_Unparsed, clang::FunctionProtoType::exceptions(), clang::exceptionSpecNotKnownYet(), clang::TypeLoc::getAs(), clang::Type::getAs(), clang::FunctionDecl::getBuiltinID(), clang::DeclarationName::getCXXOverloadedOperator(), clang::NamedDecl::getDeclName(), clang::FunctionProtoType::getExceptionSpecType(), clang::FunctionProtoType::getExtProtoInfo(), clang::ASTContext::getFunctionType(), getLangOpts(), clang::Decl::getLocation(), getLocForEndOfToken(), clang::FunctionProtoType::getNoexceptExpr(), clang::FunctionProtoType::getParamTypes(), getPrintingPolicy(), clang::FunctionType::getReturnType(), clang::ASTContext::getSourceManager(), clang::ValueDecl::getType(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::hasImplicitExceptionSpec(), clang::TypeLoc::IgnoreParens(), clang::FunctionDecl::isExternC(), clang::SourceManager::isInSystemHeader(), clang::SourceLocation::isInvalid(), clang::FunctionDecl::isReplaceableGlobalAllocationFunction(), clang::SourceLocation::isValid(), PDiag(), clang::Stmt::printPretty(), clang::Decl::setInvalidDecl(), clang::ValueDecl::setType(), and clang::FunctionProtoType::ExtProtoInfo::withExceptionSpec().
Referenced by clang::CheckSpecForTypesEquivalent().
bool clang::Sema::CheckEquivalentExceptionSpec | ( | const FunctionProtoType * | Old, |
SourceLocation | OldLoc, | ||
const FunctionProtoType * | New, | ||
SourceLocation | NewLoc | ||
) |
CheckEquivalentExceptionSpec - Check if the two types have equivalent exception specifications.
Exception specifications are equivalent if they allow exactly the same set of exception types. It does not matter how that is achieved. See C++ [except.spec]p2.
Definition at line 469 of file SemaExceptionSpec.cpp.
References clang::CheckEquivalentExceptionSpecImpl(), getLangOpts(), PDiag(), and clang::Result.
bool clang::Sema::CheckEquivalentExceptionSpec | ( | const PartialDiagnostic & | DiagID, |
const PartialDiagnostic & | NoteID, | ||
const FunctionProtoType * | Old, | ||
SourceLocation | OldLoc, | ||
const FunctionProtoType * | New, | ||
SourceLocation | NewLoc | ||
) |
Definition at line 645 of file SemaExceptionSpec.cpp.
References clang::CheckEquivalentExceptionSpecImpl(), and getLangOpts().
Definition at line 899 of file SemaExceptionSpec.cpp.
References CheckExceptionSpecSubset(), clang::SourceRange::getBegin(), getLangOpts(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::GetUnderlyingFunction(), clang::FunctionProtoType::hasDependentExceptionSpec(), and PDiag().
Referenced by clang::InitializationSequence::Perform(), and PerformImplicitConversion().
void Sema::checkExceptionSpecification | ( | bool | IsTopLevel, |
ExceptionSpecificationType | EST, | ||
ArrayRef< ParsedType > | DynamicExceptions, | ||
ArrayRef< SourceRange > | DynamicExceptionRanges, | ||
Expr * | NoexceptExpr, | ||
SmallVectorImpl< QualType > & | Exceptions, | ||
FunctionProtoType::ExceptionSpecInfo & | ESI | ||
) |
Check the given exception-specification and update the exception specification information with the results.
Definition at line 15576 of file SemaDeclCXX.cpp.
References collectUnexpandedParameterPacks(), DiagnoseUnexpandedParameterPacks(), clang::EST_Dynamic, clang::FunctionProtoType::ExceptionSpecInfo::Exceptions, clang::Type::getCanonicalTypeUnqualified(), clang::Expr::getType(), clang::isComputedNoexcept(), clang::Expr::isTypeDependent(), and clang::FunctionProtoType::ExceptionSpecInfo::Type.
bool clang::Sema::CheckExceptionSpecSubset | ( | const PartialDiagnostic & | DiagID, |
const PartialDiagnostic & | NestedDiagID, | ||
const PartialDiagnostic & | NoteID, | ||
const PartialDiagnostic & | NoThrowDiagID, | ||
const FunctionProtoType * | Superset, | ||
SourceLocation | SuperLoc, | ||
const FunctionProtoType * | Subset, | ||
SourceLocation | SubLoc | ||
) |
CheckExceptionSpecSubset - Check whether the second function type's exception specification is a subset (or equivalent) of the first function type.
This is used by override and pointer assignment checks.
Definition at line 744 of file SemaExceptionSpec.cpp.
References clang::FunctionProtoType::canThrow(), CheckParamExceptionSpec(), clang::CT_Can, clang::CT_Cannot, Diag(), clang::EST_DependentNoexcept, clang::EST_Dynamic, clang::EST_NoThrow, clang::FunctionProtoType::exceptions(), clang::Type::getAs(), clang::PartialDiagnostic::getDiagID(), clang::FunctionProtoType::getExceptionSpecType(), getLangOpts(), handlerCanCatch(), clang::isUnresolvedExceptionSpec(), clang::SourceLocation::isValid(), and ResolveExceptionSpec().
Referenced by CheckExceptionSpecCompatibility(), and CheckOverridingFunctionExceptionSpec().
void Sema::CheckExplicitlyDefaultedSpecialMember | ( | CXXMethodDecl * | MD | ) |
Definition at line 6555 of file SemaDeclCXX.cpp.
References Diag(), clang::First, clang::Type::getAs(), clang::CXXMethodDecl::getCanonicalDecl(), clang::Decl::getLocation(), clang::FunctionDecl::getNumParams(), clang::CXXMethodDecl::getParent(), clang::FunctionDecl::getSourceRange(), clang::ValueDecl::getType(), clang::CXXRecordDecl::implicitCopyAssignmentHasConstParam(), clang::CXXRecordDecl::implicitCopyConstructorHasConstParam(), clang::FunctionDecl::isExplicitlyDefaulted(), and clang::FunctionDecl::isVariadic().
void Sema::CheckExtraCXXDefaultArguments | ( | Declarator & | D | ) |
CheckExtraCXXDefaultArguments - Check for any extra default arguments in the declarator, which is not a function declaration or definition and therefore is not permitted to have default arguments.
This routine should be invoked for every declarator that is not a function declaration or definition.
Definition at line 375 of file SemaDeclCXX.cpp.
References clang::DeclaratorChunk::ParamInfo::DefaultArgTokens, Diag(), clang::DeclaratorChunk::Fun, clang::DeclaratorChunk::Function, clang::ParmVarDecl::getDefaultArg(), clang::Decl::getLocation(), clang::Declarator::getNumTypeObjects(), clang::Stmt::getSourceRange(), clang::Declarator::getTypeObject(), clang::ParmVarDecl::hasUnparsedDefaultArg(), i, clang::Declarator::isFunctionDeclarationContext(), clang::DeclaratorChunk::Kind, clang::DeclaratorChunk::FunctionTypeInfo::NumParams, clang::DeclaratorChunk::ParamInfo::Param, clang::DeclaratorChunk::FunctionTypeInfo::Params, clang::DeclaratorChunk::Paren, and clang::ParmVarDecl::setDefaultArg().
ExprResult Sema::CheckExtVectorCast | ( | SourceRange | R, |
QualType | DestTy, | ||
Expr * | CastExpr, | ||
CastKind & | Kind | ||
) |
Definition at line 6483 of file SemaExpr.cpp.
References clang::Expr::getType(), and clang::Type::isExtVectorType().
Referenced by DiagnoseBadFunctionCast().
FieldDecl * Sema::CheckFieldDecl | ( | DeclarationName | Name, |
QualType | T, | ||
TypeSourceInfo * | TInfo, | ||
RecordDecl * | Record, | ||
SourceLocation | Loc, | ||
bool | Mutable, | ||
Expr * | BitWidth, | ||
InClassInitStyle | InitStyle, | ||
SourceLocation | TSSL, | ||
AccessSpecifier | AS, | ||
NamedDecl * | PrevDecl, | ||
Declarator * | D = nullptr |
||
) |
Build a new FieldDecl and check its well-formedness.
This routine builds a new FieldDecl given the fields name, type, record, etc. PrevDecl
should refer to any previous declaration with the same name and in the same scope as the field to be created.
Definition at line 15787 of file SemaDecl.cpp.
Referenced by clang::TemplateDeclInstantiator::VisitVarDecl().
void Sema::CheckFloatComparison | ( | SourceLocation | Loc, |
Expr * | LHS, | ||
Expr * | RHS | ||
) |
Check for comparisons of floating point operands using != and ==.
Issue a warning if these are no self-comparisons, as they are not likely to do what the programmer intended.
Definition at line 9733 of file SemaChecking.cpp.
References Diag(), clang::ASTContext::getCanonicalType(), clang::Type::getCanonicalTypeInternal(), clang::ASTContext::getIntWidth(), clang::ASTContext::getLangOpts(), clang::EnumDecl::getNumNegativeBits(), clang::EnumDecl::getNumPositiveBits(), clang::Stmt::getSourceRange(), clang::QualType::getTypePtr(), clang::Expr::IgnoreParenImpCasts(), clang::Type::isCanonicalUnqualified(), clang::EnumDecl::isFixed(), clang::BuiltinType::isInteger(), clang::BuiltinType::isUnsignedInteger(), max(), and min().
Referenced by checkArithmeticOrEnumeralCompare().
type checking declaration initializers (C99 6.7.8)
Definition at line 10580 of file SemaDecl.cpp.
References clang::Expr::isConstantInitializer().
void Sema::CheckForFunctionRedefinition | ( | FunctionDecl * | FD, |
const FunctionDecl * | EffectiveDefinition = nullptr , |
||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
Definition at line 13148 of file SemaDecl.cpp.
References canRedefineFunction(), clang::declaresSameEntity(), Diag(), clang::Decl::FOK_None, clang::NamedDecl::getDeclName(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::NamedDecl::getFormalLinkage(), clang::Decl::getFriendObjectKind(), clang::FunctionDecl::getInstantiatedFromMemberFunction(), clang::Decl::getLexicalDeclContext(), clang::Decl::getLocation(), clang::DeclaratorDecl::getNumTemplateParameterLists(), clang::FunctionDecl::getStorageClass(), clang::frontend::GNUMode, clang::InternalLinkage, clang::NamedDecl::isCXXClassMember(), clang::FunctionDecl::isDefined(), clang::FunctionDecl::isInlined(), clang::FunctionDecl::isInlineSpecified(), clang::Decl::isInvalidDecl(), clang::Sema::SkipBodyInfo::Previous, clang::Redeclarable< decl_type >::redecls(), clang::SC_Extern, clang::Decl::setInvalidDecl(), and clang::Sema::SkipBodyInfo::ShouldSkip.
Referenced by clang::Parser::ParseTopLevelDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
bool Sema::CheckForwardProtocolDeclarationForCircularDependency | ( | IdentifierInfo * | PName, |
SourceLocation & | PLoc, | ||
SourceLocation | PrevLoc, | ||
const ObjCList< ObjCProtocolDecl > & | PList | ||
) |
Definition at line 1180 of file SemaDeclObjC.cpp.
References clang::ObjCList< T >::begin(), Diag(), clang::ObjCList< T >::end(), LookupProtocol(), and res.
Referenced by ActOnStartProtocolInterface().
Sema::AccessResult Sema::CheckFriendAccess | ( | NamedDecl * | D | ) |
Checks access to the target of a friend declaration.
Definition at line 1768 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::Decl::getAccess(), and clang::Decl::getAsFunction().
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
FriendDecl * Sema::CheckFriendTypeDecl | ( | SourceLocation | LocStart, |
SourceLocation | FriendLoc, | ||
TypeSourceInfo * | TSInfo | ||
) |
Perform semantic analysis of the given friend type declaration.
Definition at line 14078 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus11, clang::FriendDecl::Create(), clang::FixItHint::CreateInsertion(), Diag(), clang::Type::getAs(), clang::SourceRange::getBegin(), clang::TagDecl::getKindName(), clang::TypeLoc::getLocalSourceRange(), clang::TagDecl::getTagKind(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), and clang::Type::isElaboratedTypeSpecifier().
bool Sema::CheckFunctionDeclaration | ( | Scope * | S, |
FunctionDecl * | NewFD, | ||
LookupResult & | Previous, | ||
bool | IsMemberSpecialization | ||
) |
Perform semantic checking of a new function declaration.
Performs semantic analysis of the new function declaration NewFD. This routine performs all semantic checking that does not require the actual declarator involved in the declaration, and is used both for the declaration of functions as they are parsed (called via ActOnDeclarator) and for the declaration of functions that have been instantiated via C++ template instantiation (called via InstantiateDecl).
IsMemberSpecialization | whether this new function declaration is a member specialization (that replaces any definition provided by the previous declaration). |
This sets NewFD->isInvalidDecl() to true if there was an error.
Definition at line 10064 of file SemaDecl.cpp.
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
void Sema::CheckFunctionOrTemplateParamDeclarator | ( | Scope * | S, |
Declarator & | D | ||
) |
Common checks for a parameter-declaration that should apply to both function parameters and non-type template parameters.
Definition at line 12767 of file SemaDecl.cpp.
bool Sema::CheckFunctionReturnType | ( | QualType | T, |
SourceLocation | Loc | ||
) |
Definition at line 2437 of file SemaType.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::QualType::hasNonTrivialToPrimitiveCopyCUnion(), clang::QualType::hasNonTrivialToPrimitiveDestructCUnion(), clang::Type::isArrayType(), clang::Type::isFunctionType(), clang::Type::isHalfType(), and clang::Type::isObjCObjectType().
bool Sema::CheckFunctionTemplateSpecialization | ( | FunctionDecl * | FD, |
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
LookupResult & | Previous, | ||
bool | QualifiedFriend = false |
||
) |
Perform semantic analysis for the given function template specialization.
This routine performs all of the semantic analysis required for an explicit function template specialization. On successful completion, the function declaration FD
will become a function template specialization.
FD | the function declaration, which will be updated to become a function template specialization. |
ExplicitTemplateArgs | the explicitly-provided template arguments, if any. Note that this may be valid info even when 0 arguments are explicitly provided as in, e.g., void sort<>(char*, char*); as it anyway contains info on the angle brackets locations. |
Previous | the set of declarations that may be specialized by this function specialization. |
QualifiedFriend | whether this is a lookup for a qualified friend declaration with no explicit template argument list that might be befriending a function template specialization. |
Definition at line 8372 of file SemaTemplate.cpp.
References clang::Qualifiers::addConst(), clang::LookupResult::begin(), clang::Type::castAs(), clang::LookupResult::end(), clang::Decl::getDeclContext(), clang::FunctionProtoType::getExtProtoInfo(), clang::Decl::getLocation(), clang::DeclContext::getRedeclContext(), clang::ValueDecl::getType(), clang::NamedDecl::getUnderlyingDecl(), clang::DeclContext::InEnclosingNamespaceSetOf(), clang::CXXMethodDecl::isConst(), clang::FunctionDecl::isConstexpr(), and clang::FunctionProtoType::ExtProtoInfo::TypeQuals.
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
bool Sema::CheckIfOverriddenFunctionIsMarkedFinal | ( | const CXXMethodDecl * | New, |
const CXXMethodDecl * | Old | ||
) |
CheckForFunctionMarkedFinal - Checks whether a virtual member function overrides a virtual member function marked 'final', according to C++11 [class.virtual]p4.
CheckIfOverriddenFunctionIsMarkedFinal - Checks whether a virtual member function overrides a virtual member function marked 'final', according to C++11 [class.virtual]p4.
Definition at line 2867 of file SemaDeclCXX.cpp.
References Diag(), clang::Decl::getAttr(), clang::NamedDecl::getDeclName(), and clang::Decl::getLocation().
void Sema::checkIllFormedTrivialABIStruct | ( | CXXRecordDecl & | RD | ) |
Check that the C++ class annoated with "trivial_abi" satisfies all the conditions that are needed for the attribute to have an effect.
Definition at line 7911 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::bases(), canPassInRegisters(), Diag(), clang::Decl::dropAttr(), clang::RecordDecl::fields(), clang::Type::getAs(), clang::Decl::getAttr(), clang::Type::getBaseElementTypeUnsafe(), clang::QualType::getObjCLifetime(), clang::CXXRecordDecl::getTemplateSpecializationKind(), clang::ValueDecl::getType(), clang::CXXRecordDecl::isPolymorphic(), clang::isTemplateInstantiation(), and clang::Qualifiers::OCL_Weak.
void Sema::CheckImplementationIvars | ( | ObjCImplementationDecl * | ImpDecl, |
ObjCIvarDecl ** | Fields, | ||
unsigned | nIvars, | ||
SourceLocation | Loc | ||
) |
CheckImplementationIvars - This routine checks if the instance variables listed in the implelementation match those listed in the interface.
Check case of non-existing @interface decl. (legacy objective-c @implementation decl without an @interface decl). Add implementations's ivar to the synthesize class's ivar list.
Definition at line 2110 of file SemaDeclObjC.cpp.
References clang::DeclContext::addDecl(), Context, Diag(), clang::Stmt::getBeginLoc(), clang::FieldDecl::getBitWidth(), clang::FieldDecl::getBitWidthValue(), clang::ObjCImplDecl::getClassInterface(), clang::NamedDecl::getIdentifier(), clang::ObjCContainerDecl::getIvarDecl(), clang::Decl::getLocation(), clang::ObjCImplementationDecl::getSuperClass(), clang::ValueDecl::getType(), clang::ASTContext::hasSameType(), i, clang::FieldDecl::isBitField(), clang::ObjCInterfaceDecl::isImplicitInterfaceDecl(), clang::ObjCRuntime::isNonFragile(), clang::ObjCInterfaceDecl::ivar_begin(), clang::ObjCInterfaceDecl::ivar_end(), LangOpts, clang::DeclContext::makeDeclVisibleInContext(), clang::LangOptions::ObjCRuntime, clang::ObjCInterfaceDecl::setEndOfDefinitionLoc(), clang::Decl::setLexicalDeclContext(), and clang::ObjCInterfaceDecl::visible_extensions().
void Sema::CheckImplicitSpecialMemberDeclaration | ( | Scope * | S, |
FunctionDecl * | FD | ||
) |
Check a completed declaration of an implicit special member.
Definition at line 10989 of file SemaDeclCXX.cpp.
Additional checks for a using declaration referring to a constructor name.
Definition at line 10254 of file SemaDeclCXX.cpp.
References Diag(), findDirectBaseWithType(), clang::NestedNameSpecifier::getAsType(), clang::UsingDecl::getNameInfo(), clang::UsingDecl::getQualifier(), clang::DeclarationNameInfo::getSourceRange(), clang::UsingDecl::getUsingLoc(), clang::UsingDecl::hasTypename(), clang::CXXBaseSpecifier::setInheritConstructors(), and clang::Decl::setInvalidDecl().
void Sema::checkInitializerLifetime | ( | const InitializedEntity & | Entity, |
Expr * | Init | ||
) |
Check that the lifetime of the initializer (and its subobjects) is sufficient for initializing the entity, and perform lifetime extension (when permitted) if not.
Definition at line 7003 of file SemaInit.cpp.
References clang::InitializedEntity::allocateManglingNumber(), Diag(), DiagnoseNarrowingInInitList(), clang::SourceRange::getBegin(), clang::InitializedEntity::getDecl(), clang::NamedDecl::getDeclName(), getEntityLifetime(), clang::Decl::getLocation(), clang::InitializedEntity::getParent(), clang::InitializedEntity::getType(), clang::ValueDecl::getType(), clang::Type::isAnyPointerType(), clang::Expr::isGLValue(), clang::Decl::isImplicit(), clang::Type::isReferenceType(), nextPathEntryRange(), pathContainsInit(), clang::MaterializeTemporaryExpr::setExtendingDecl(), shouldLifetimeExtendThroughPath(), visitLocalsRetainedByInitializer(), and visitLocalsRetainedByReferenceBinding().
Referenced by CollectFieldInitializer().
bool Sema::checkInitMethod | ( | ObjCMethodDecl * | method, |
QualType | receiverTypeIfCall | ||
) |
Check whether the given method, which must be in the 'init' family, is a valid member of that family.
receiverTypeIfCall | - if null, check this as if declaring it; if non-null, check this as if making a call to it with the given receiver type |
Definition at line 41 of file SemaDeclObjC.cpp.
References clang::Decl::addAttr(), clang::Type::castAs(), Context, Diag(), clang::ObjCMethodDecl::getClassInterface(), clang::Decl::getDeclContext(), clang::ObjCObjectType::getInterface(), clang::Decl::getLocation(), getObjectType(), clang::ObjCMethodDecl::getReturnType(), getSourceManager(), clang::ObjCInterfaceDecl::hasDefinition(), clang::SourceManager::isInSystemHeader(), clang::Decl::isInvalidDecl(), clang::QualType::isNull(), clang::ObjCObjectType::isObjCClass(), clang::ObjCObjectType::isObjCId(), clang::ObjCInterfaceDecl::isSuperClassOf(), result, and clang::Decl::setInvalidDecl().
Referenced by CheckARCMethodDecl().
Sema::ObjCLiteralKind Sema::CheckLiteralKind | ( | Expr * | FromE | ) |
Definition at line 9999 of file SemaExpr.cpp.
References clang::Stmt::getStmtClass(), and clang::Expr::IgnoreParenImpCasts().
Referenced by checkUnsafeAssignLiteral(), and diagnoseObjCLiteralComparison().
bool Sema::CheckLiteralOperatorDeclaration | ( | FunctionDecl * | FnDecl | ) |
CheckLiteralOperatorDeclaration - Check whether the declaration of this literal operator function is well-formed.
If so, returns false; otherwise, emits appropriate diagnostics and returns true.
Definition at line 13591 of file SemaDeclCXX.cpp.
References checkLiteralOperatorTemplateParameterList(), Diag(), clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::DeclContext::getExternCContext(), clang::Decl::getLocation(), clang::FunctionDecl::getParamDecl(), clang::FunctionDecl::getPrimaryTemplate(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::FunctionDecl::isExternC(), clang::Type::isSpecificBuiltinType(), and clang::FunctionDecl::param_size().
bool Sema::checkLiteralOperatorId | ( | const CXXScopeSpec & | SS, |
const UnqualifiedId & | Id | ||
) |
Definition at line 406 of file SemaExprCXX.cpp.
|
inline |
Definition at line 11023 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::SourceLocation::isMacroID().
void Sema::CheckLookupAccess | ( | const LookupResult & | R | ) |
Checks access to all the declarations in the given result set.
Definition at line 1858 of file SemaAccess.cpp.
References clang::AS_public, clang::LookupResult::begin(), clang::LookupResult::end(), and clang::LookupResult::getNamingClass().
Referenced by clang::LookupResult::setFindLocalExtern().
bool Sema::CheckLoopHintExpr | ( | Expr * | E, |
SourceLocation | Loc | ||
) |
Definition at line 3347 of file SemaExpr.cpp.
References Diag(), clang::Expr::getExprLoc(), clang::Expr::getType(), clang::Type::isBooleanType(), clang::Type::isCharType(), clang::Type::isIntegerType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Expr::isValueDependent().
ExprResult Sema::CheckLValueToRValueConversionOperand | ( | Expr * | E | ) |
Definition at line 16220 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Expr::getExprLoc(), clang::Expr::getType(), clang::QualType::hasNonTrivialToPrimitiveCopyCUnion(), clang::QualType::hasNonTrivialToPrimitiveDestructCUnion(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isVolatileQualified(), clang::NOUR_Constant, NTCUC_LValueToRValueVolatile, and rebuildPotentialResultsAsNonOdrUsed().
void Sema::CheckMain | ( | FunctionDecl * | FD, |
const DeclSpec & | D | ||
) |
Definition at line 10405 of file SemaDecl.cpp.
References clang::Type::castAs(), clang::CC_C, clang::FixItHint::CreateRemoval(), clang::CSK_unspecified, Diag(), clang::DeclSpec::getConstexprSpecLoc(), clang::DeclSpec::getInlineSpecLoc(), clang::Decl::getLocation(), clang::DeclSpec::getNoreturnSpecLoc(), clang::FunctionDecl::getStorageClass(), clang::DeclSpec::getStorageClassSpecLoc(), clang::ValueDecl::getType(), clang::Decl::hasAttr(), clang::FunctionDecl::isConsteval(), clang::FunctionDecl::isConstexpr(), clang::Type::isFunctionType(), clang::FunctionDecl::isInlineSpecified(), clang::DeclSpec::isNoreturnSpecified(), clang::frontend::OpenCL, clang::SC_Static, clang::FunctionDecl::setConstexprKind(), and clang::Decl::setInvalidDecl().
Sema::AccessResult Sema::CheckMemberAccess | ( | SourceLocation | UseLoc, |
CXXRecordDecl * | NamingClass, | ||
DeclAccessPair | Found | ||
) |
Checks access to a member.
Definition at line 1715 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, and clang::DeclAccessPair::getAccess().
Sema::AccessResult Sema::CheckMemberOperatorAccess | ( | SourceLocation | OpLoc, |
Expr * | ObjectExpr, | ||
Expr * | ArgExpr, | ||
DeclAccessPair | Found | ||
) |
Checks access to an overloaded member operator, including conversion operators.
Definition at line 1747 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::Type::castAs(), clang::DeclAccessPair::getAccess(), clang::RecordType::getDecl(), and clang::Expr::getType().
Referenced by diagnoseNoViableConversion(), clang::InitializationSequence::Perform(), and recordConversion().
bool Sema::CheckMemberPointerConversion | ( | Expr * | From, |
QualType | ToType, | ||
CastKind & | Kind, | ||
CXXCastPath & | BasePath, | ||
bool | IgnoreBaseAccess | ||
) |
CheckMemberPointerConversion - Check the member pointer conversion from the expression From to the type ToType.
This routine checks for ambiguous or virtual or inaccessible base-to-derived member pointer conversions for which IsMemberPointerConversion has already returned true. It returns true and produces a diagnostic if there was an error, or returns false otherwise.
Definition at line 3016 of file SemaOverload.cpp.
References clang::Type::getAs(), clang::Expr::getType(), and clang::Expr::isNullPointerConstant().
Referenced by PerformImplicitConversion().
bool Sema::CheckMemberSpecialization | ( | NamedDecl * | Member, |
LookupResult & | Previous | ||
) |
Perform semantic analysis for the given non-template member specialization.
This routine performs all of the semantic analysis required for an explicit member function specialization. On successful completion, the function declaration FD
will become a member function specialization.
Member | the member declaration, which will be updated to become a specialization. |
Previous | the set of declarations, one of which may be specialized by this function specialization; the set will be modified to contain the redeclared member. |
Definition at line 8607 of file SemaTemplate.cpp.
References clang::LookupResult::begin(), clang::LookupResult::empty(), and clang::LookupResult::end().
bool Sema::CheckMessageArgumentTypes | ( | const Expr * | Receiver, |
QualType | ReceiverType, | ||
MultiExprArg | Args, | ||
Selector | Sel, | ||
ArrayRef< SourceLocation > | SelectorLocs, | ||
ObjCMethodDecl * | Method, | ||
bool | isClassMessage, | ||
bool | isSuperMessage, | ||
SourceLocation | lbrac, | ||
SourceLocation | rbrac, | ||
SourceRange | RecRange, | ||
QualType & | ReturnType, | ||
ExprValueKind & | VK | ||
) |
CheckMessageArgumentTypes - Check types in an Obj-C message send.
Method | - May be null. | |
[out] | ReturnType | - The return type of the send. |
Definition at line 1553 of file SemaExprObjC.cpp.
References clang::FixItHint::CreateReplacement(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Selector::getAsString(), clang::SourceRange::getBegin(), clang::ObjCObjectPointerType::getInterfaceDecl(), clang::ObjCMethodDecl::getSelector(), i, clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::SourceRange::isInvalid(), clang::Decl::isInvalidDecl(), clang::Type::isObjCObjectPointerType(), clang::Selector::isUnarySelector(), and result.
Sema::IfExistsResult Sema::CheckMicrosoftIfExistsSymbol | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
const DeclarationNameInfo & | TargetNameInfo | ||
) |
Definition at line 7892 of file SemaExprCXX.cpp.
References clang::LookupResult::Ambiguous, clang::LookupResult::Found, clang::LookupResult::FoundOverloaded, clang::LookupResult::FoundUnresolvedValue, clang::DeclarationNameInfo::getName(), clang::LookupResult::getResultKind(), IER_Dependent, IER_DoesNotExist, IER_Exists, clang::DeclarationName::isDependentName(), LookupAnyName, LookupParsedName(), NotForRedeclaration, clang::LookupResult::NotFound, clang::LookupResult::NotFoundInCurrentInstantiation, and clang::LookupResult::suppressDiagnostics().
Sema::IfExistsResult Sema::CheckMicrosoftIfExistsSymbol | ( | Scope * | S, |
SourceLocation | KeywordLoc, | ||
bool | IsIfExists, | ||
CXXScopeSpec & | SS, | ||
UnqualifiedId & | Name | ||
) |
Definition at line 7927 of file SemaExprCXX.cpp.
bool clang::Sema::checkMSInheritanceAttrOnDefinition | ( | CXXRecordDecl * | RD, |
SourceRange | Range, | ||
bool | BestCase, | ||
MSInheritanceAttr::Spelling | SemanticSpelling | ||
) |
void Sema::CheckMSVCRTEntryPoint | ( | FunctionDecl * | FD | ) |
Definition at line 10560 of file SemaDecl.cpp.
References clang::Type::castAs(), Diag(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::Decl::getLocation(), clang::NamedDecl::getName(), clang::ValueDecl::getType(), clang::Type::isFunctionType(), clang::Decl::isInvalidDecl(), clang::FunctionDecl::setHasImplicitReturnZero(), and clang::Decl::setInvalidDecl().
QualType Sema::CheckMultiplyDivideOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
bool | IsCompAssign, | ||
bool | IsDivide | ||
) |
Definition at line 9105 of file SemaExpr.cpp.
References checkArithmeticNull(), DiagnoseBadDivideOrRemainderValues(), DiagnoseDivisionSizeofPointer(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::isArithmeticType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::QualType::isNull().
bool Sema::CheckNonDependentConversions | ( | FunctionTemplateDecl * | FunctionTemplate, |
ArrayRef< QualType > | ParamTypes, | ||
ArrayRef< Expr *> | Args, | ||
OverloadCandidateSet & | CandidateSet, | ||
ConversionSequenceList & | Conversions, | ||
bool | SuppressUserConversions, | ||
CXXRecordDecl * | ActingContext = nullptr , |
||
QualType | ObjectType = QualType() , |
||
Expr::Classification | ObjectClassification = {} |
||
) |
Check that implicit conversion sequences can be formed for each argument whose corresponding parameter has a non-dependent type, per DR1391's [temp.deduct.call]p10.
Definition at line 6842 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::allocateConversionSequences(), clang::OverloadCandidateSet::getLocation(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::Type::isDependentType(), clang::QualType::isNull(), min(), TryCopyInitialization(), TryObjectArgumentInitialization(), and Unevaluated.
void Sema::checkNonTrivialCUnion | ( | QualType | QT, |
SourceLocation | Loc, | ||
NonTrivialCUnionContext | UseContext, | ||
unsigned | NonTrivialKind | ||
) |
Emit diagnostics if a non-trivial C union type or a struct that contains a non-trivial C union is used in an invalid context.
Definition at line 11341 of file SemaDecl.cpp.
References clang::QualType::hasNonTrivialToPrimitiveCopyCUnion(), clang::QualType::hasNonTrivialToPrimitiveDefaultInitializeCUnion(), and clang::QualType::hasNonTrivialToPrimitiveDestructCUnion().
Referenced by markEscapingByrefs().
void Sema::checkNonTrivialCUnionInInitializer | ( | const Expr * | Init, |
SourceLocation | Loc | ||
) |
Emit diagnostics if the initializer or any of its explicit or implicitly-generated subexpressions require copying or default-initializing a type that is or contains a C union type that is non-trivial to copy or default-initialize.
Definition at line 11104 of file SemaDecl.cpp.
References clang::Expr::getType(), clang::QualType::hasNonTrivialToPrimitiveCopyCUnion(), clang::QualType::hasNonTrivialToPrimitiveDefaultInitializeCUnion(), and clang::SourceLocation::isValid().
Definition at line 15988 of file SemaDecl.cpp.
References clang::frontend::CPlusPlus, clang::ValueDecl::getType(), clang::Type::isDependentType(), and clang::Decl::isInvalidDecl().
QualType Sema::CheckNonTypeTemplateParameterType | ( | TypeSourceInfo *& | TSI, |
SourceLocation | Loc | ||
) |
Check that the type of a non-type template parameter is well-formed.
Definition at line 1060 of file SemaTemplate.cpp.
References clang::TypeSourceInfo::getType(), and clang::Type::isUndeducedType().
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
QualType Sema::CheckNonTypeTemplateParameterType | ( | QualType | T, |
SourceLocation | Loc | ||
) |
Definition at line 1074 of file SemaTemplate.cpp.
References Diag(), clang::QualType::getUnqualifiedType(), clang::Type::isArrayType(), clang::Type::isDependentType(), clang::Type::isFunctionType(), clang::Type::isIntegralOrEnumerationType(), clang::Type::isMemberPointerType(), clang::Type::isNullPtrType(), clang::Type::isPointerType(), clang::Type::isReferenceType(), clang::Type::isUndeducedType(), and clang::Type::isVariablyModifiedType().
bool clang::Sema::checkNSReturnsRetainedReturnType | ( | SourceLocation | loc, |
QualType | type | ||
) |
Referenced by handleFunctionTypeAttr().
Definition at line 4379 of file SemaExprObjC.cpp.
Referenced by DiagnoseBadFunctionCast(), and PerformImplicitConversion().
Definition at line 3986 of file SemaExprObjC.cpp.
References ACTC_coreFoundation, ACTC_retainable, clang::ast_matchers::castExpr, classifyTypeForARCConversion(), clang::Stmt::getBeginLoc(), and clang::Expr::getType().
bool Sema::checkObjCBridgeRelatedComponents | ( | SourceLocation | Loc, |
QualType | DestType, | ||
QualType | SrcType, | ||
ObjCInterfaceDecl *& | RelatedClass, | ||
ObjCMethodDecl *& | ClassMethod, | ||
ObjCMethodDecl *& | InstanceMethod, | ||
TypedefNameDecl *& | TDNDecl, | ||
bool | CfToNs, | ||
bool | Diagnose = true |
||
) |
Definition at line 4024 of file SemaExprObjC.cpp.
References Diag(), clang::Decl::getBeginLoc(), clang::TypeDecl::getBeginLoc(), clang::LookupResult::getFoundDecl(), LookupOrdinaryName, ObjCBridgeRelatedAttrFromType(), and clang::Target.
bool Sema::CheckObjCBridgeRelatedConversions | ( | SourceLocation | Loc, |
QualType | DestType, | ||
QualType | SrcType, | ||
Expr *& | SrcExpr, | ||
bool | Diagnose = true |
||
) |
Definition at line 4098 of file SemaExprObjC.cpp.
References ACTC_coreFoundation, ACTC_retainable, classifyTypeForARCConversion(), clang::FixItHint::CreateInsertion(), Diag(), clang::Selector::getAsString(), clang::Decl::getBeginLoc(), clang::Stmt::getBeginLoc(), clang::TypeDecl::getBeginLoc(), clang::Stmt::getEndLoc(), clang::NamedDecl::getNameAsString(), and clang::ObjCMethodDecl::getSelector().
Referenced by clang::InitializationSequence::InitializeFrom().
Sema::ARCConversionResult Sema::CheckObjCConversion | ( | SourceRange | castRange, |
QualType | castType, | ||
Expr *& | op, | ||
CheckedConversionKind | CCK, | ||
bool | Diagnose = true , |
||
bool | DiagnoseCFAudited = false , |
||
BinaryOperatorKind | Opc = BO_PtrMemD |
||
) |
Checks for invalid conversions and casts between retainable pointers and other pointer kinds for ARC and Weak.
Definition at line 4193 of file SemaExprObjC.cpp.
References ACTC_none, ACTC_retainable, classifyTypeForARCConversion(), Diag(), clang::Type::getAs(), clang::SourceRange::getBegin(), clang::Expr::getExprLoc(), clang::QualType::getObjCLifetime(), clang::Type::getPointeeType(), clang::Expr::getType(), clang::QualType::getTypePtr(), isAnyCLike(), clang::Type::isIntegralType(), clang::SourceRange::isValid(), and clang::Qualifiers::OCL_None.
Referenced by CheckKeyForObjCARCConversion(), and PerformImplicitConversion().
Checks that the Objective-C declaration is declared in the global scope.
Emits an error and marks the declaration as invalid if it's not declared in the global scope.
Definition at line 4793 of file SemaDeclObjC.cpp.
References CurContext, Diag(), getCurLexicalContext(), clang::Decl::getLocation(), clang::DeclContext::getRedeclContext(), and clang::Decl::setInvalidDecl().
Referenced by ActOnCompatibilityAlias(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), and ActOnStartProtocolInterface().
ExprResult Sema::CheckObjCForCollectionOperand | ( | SourceLocation | forLoc, |
Expr * | collection | ||
) |
Definition at line 1790 of file SemaStmt.cpp.
References Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::ObjCObjectType::getInterface(), clang::ObjCObjectPointerType::getObjectType(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::ast_matchers::pointerType, clang::ObjCProtocolQualifiers< T >::qual_empty(), and result.
void Sema::CheckObjCMethodOverride | ( | ObjCMethodDecl * | NewMethod, |
const ObjCMethodDecl * | Overridden | ||
) |
Check whether the given new method is a valid override of the given overridden method, and set any properties that should be inherited.
Definition at line 135 of file SemaDeclObjC.cpp.
References Context, Diag(), diagnoseNoescape(), clang::Decl::getDeclContext(), getLangOpts(), clang::Decl::getLocation(), clang::ObjCMethodDecl::getMethodFamily(), clang::ASTContext::getObjCInterfaceType(), clang::ObjCMethodDecl::getReturnType(), clang::ObjCMethodDecl::getReturnTypeSourceRange(), clang::Decl::hasAttr(), clang::ObjCMethodDecl::hasRelatedResultType(), clang::ObjCMethodDecl::param_begin(), and clang::ObjCMethodDecl::param_end().
void Sema::CheckObjCMethodOverrides | ( | ObjCMethodDecl * | ObjCMethod, |
ObjCInterfaceDecl * | CurrentClass, | ||
ResultTypeCompatibilityKind | RTC | ||
) |
Definition at line 4319 of file SemaDeclObjC.cpp.
References clang::Decl::getDeclContext(), clang::ObjCMethodDecl::getSelector(), and MethodPool.
Referenced by ProcessPropertyDecl().
void Sema::CheckObjCPropertyAttributes | ( | Decl * | PropertyPtrTy, |
SourceLocation | Loc, | ||
unsigned & | Attributes, | ||
bool | propertyInPrimaryClass | ||
) |
Ensure attributes are consistent with type.
[in,out] | Attributes | The attributes to check; they will be modified to be consistent with PropertyTy . |
Definition at line 2538 of file SemaObjCProperty.cpp.
References Context, Diag(), clang::ObjCDeclSpec::DQ_PR_assign, clang::ObjCDeclSpec::DQ_PR_atomic, clang::ObjCDeclSpec::DQ_PR_copy, clang::ObjCDeclSpec::DQ_PR_nonatomic, clang::ObjCDeclSpec::DQ_PR_readonly, clang::ObjCDeclSpec::DQ_PR_readwrite, clang::ObjCDeclSpec::DQ_PR_retain, clang::ObjCDeclSpec::DQ_PR_setter, clang::ObjCDeclSpec::DQ_PR_strong, clang::ObjCDeclSpec::DQ_PR_unsafe_unretained, clang::ObjCDeclSpec::DQ_PR_weak, clang::LangOptions::GCOnly, getLangOpts(), getOwnershipRule(), clang::ObjCPropertyDecl::getType(), clang::Decl::hasAttr(), clang::Decl::isInvalidDecl(), clang::LangOptions::NonGC, clang::NonNull, clang::ObjCPropertyDecl::OBJC_PR_strong, clang::Decl::setInvalidDecl(), and clang::ObjCPropertyDecl::setPropertyAttributes().
OMPRequiresDecl * Sema::CheckOMPRequiresDecl | ( | SourceLocation | Loc, |
ArrayRef< OMPClause *> | Clauses | ||
) |
Check restrictions on Requires directive.
For target specific clauses, the requires directive cannot be specified after the handling of any of the target regions in the current compilation unit.
Definition at line 2505 of file SemaOpenMP.cpp.
References clang::OMPRequiresDecl::Create(), Diag(), DSAStack, and clang::getOpenMPClauseName().
OMPThreadPrivateDecl * Sema::CheckOMPThreadPrivateDecl | ( | SourceLocation | Loc, |
ArrayRef< Expr *> | VarList | ||
) |
Builds a new OpenMPThreadPrivateDecl and checks its correctness.
Definition at line 2248 of file SemaOpenMP.cpp.
Check if declaration D
used by expression E
is disabled due to required OpenCL extensions being disabled.
If so, emit diagnostics.
Definition at line 2249 of file Sema.cpp.
References clang::Stmt::getBeginLoc(), clang::NamedDecl::getIdentifier(), and clang::Decl::getSourceRange().
Check if type T
corresponding to declaration specifier DS
is disabled due to required OpenCL extensions being disabled.
If so, emit diagnostics.
Definition at line 2225 of file Sema.cpp.
References clang::Type::castAs(), clang::QualType::getCanonicalType(), clang::QualType::getTypePtr(), clang::DeclSpec::getTypeSpecTypeLoc(), and clang::Type::isExtVectorType().
bool Sema::CheckOpenMPLinearDecl | ( | const ValueDecl * | D, |
SourceLocation | ELoc, | ||
OpenMPLinearClauseKind | LinKind, | ||
QualType | Type | ||
) |
Checks that the specified declaration matches requirements for the linear decls.
Definition at line 12546 of file SemaOpenMP.cpp.
References Diag(), clang::QualType::getCanonicalType(), clang::QualType::getNonReferenceType(), clang::getOpenMPSimpleClauseTypeName(), clang::QualType::getTypePtrOrNull(), clang::QualType::getUnqualifiedType(), clang::Type::isReferenceType(), and rejectConstNotMutableType().
bool Sema::CheckOpenMPLinearModifier | ( | OpenMPLinearClauseKind | LinKind, |
SourceLocation | LinLoc | ||
) |
Checks correctness of linear modifiers.
Definition at line 12536 of file SemaOpenMP.cpp.
References Diag(), and clang::OMPC_LINEAR_unknown.
Referenced by parseDeclareSimdClauses().
Sema::OverloadKind Sema::CheckOverload | ( | Scope * | S, |
FunctionDecl * | New, | ||
const LookupResult & | Old, | ||
NamedDecl *& | Match, | ||
bool | NewIsUsingDecl | ||
) |
Determine whether the given New declaration is an overload of the declarations in Old.
This routine returns Ovl_Match or Ovl_NonFunction if New and Old cannot be overloaded, e.g., if New has the same signature as some function in Old (C++ 1.3.10) or if the Old declarations aren't functions (or function templates) at all. When it does return Ovl_Match or Ovl_NonFunction, MatchedDecl will point to the decl that New cannot be overloaded with. This decl may be a UsingShadowDecl on top of the underlying declaration.
Example: Given the following input:
void f(int, float); // #1 void f(int, int); // #2 int f(int, int); // #3
When we process #1, there is no previous declaration of "f", so IsOverload will not be used.
When we process #2, Old contains only the FunctionDecl for #1. By comparing the parameter types, we see that #1 and #2 are overloaded (since they have different signatures), so this routine returns Ovl_Overload; MatchedDecl is unchanged.
When we process #3, Old is an overload set containing #1 and #2. We compare the signatures of #3 to #1 (they're overloaded, so we do nothing) and then #3 to #2. Since the signatures of #3 and #2 are identical (return types of functions are not part of the signature), IsOverload returns Ovl_Match and MatchedDecl will be set to point to the FunctionDecl for #2.
'NewIsUsingShadowDecl' indicates that 'New' is being introduced into a class by a using declaration. The rules for whether to hide shadow declarations ignore some properties which otherwise figure into a function template's signature.
Definition at line 965 of file SemaOverload.cpp.
References clang::LookupResult::addAllDecls(), clang::LookupResult::begin(), clang::LookupResult::end(), clang::Decl::getAsFunction(), clang::LookupResult::getAsSingle(), clang::FunctionDecl::getDependentSpecializationInfo(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::Decl::getFriendObjectKind(), clang::LookupResult::getLookupKind(), clang::DeclaratorDecl::getQualifier(), clang::ValueDecl::getType(), clang::Type::isDependentType(), clang::Decl::setInvalidDecl(), and clang::LookupResult::Temporary.
bool Sema::CheckOverloadedOperatorDeclaration | ( | FunctionDecl * | FnDecl | ) |
CheckOverloadedOperatorDeclaration - Check whether the declaration of this overloaded operator is well-formed.
If so, returns false; otherwise, emits appropriate diagnostics and returns true.
Definition at line 13411 of file SemaDeclCXX.cpp.
References CheckOperatorDeleteDeclaration(), CheckOperatorNewDeclaration(), Diag(), clang::Type::getAs(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getOverloadedOperator(), clang::FunctionDecl::getParamDecl(), clang::ValueDecl::getType(), clang::Type::isDependentType(), clang::Type::isEnumeralType(), clang::FunctionDecl::isOverloadedOperator(), clang::Type::isRecordType(), clang::Type::isSpecificBuiltinType(), clang::NUM_OVERLOADED_OPERATORS, and clang::FunctionDecl::parameters().
void Sema::CheckOverrideControl | ( | NamedDecl * | D | ) |
CheckOverrideControl - Check C++11 override control semantics.
Definition at line 2771 of file SemaDeclCXX.cpp.
References clang::FixItHint::CreateRemoval(), Diag(), clang::Decl::dropAttr(), clang::Decl::getAttr(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ValueDecl::getType(), clang::CXXRecordDecl::hasAnyDependentBases(), clang::Decl::hasAttr(), clang::Type::isDependentType(), clang::CXXMethodDecl::isInstance(), clang::Decl::isInvalidDecl(), clang::CXXMethodDecl::isVirtual(), clang::Decl::setInvalidDecl(), and clang::CXXMethodDecl::size_overridden_methods().
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
bool Sema::CheckOverridingFunctionAttributes | ( | const CXXMethodDecl * | New, |
const CXXMethodDecl * | Old | ||
) |
Definition at line 14827 of file SemaDeclCXX.cpp.
References Diag(), clang::Type::getAs(), clang::Decl::getAttr(), clang::FunctionType::getCallConv(), clang::NamedDecl::getDeclName(), clang::FunctionProtoType::getExtParameterInfo(), clang::Decl::getLocation(), clang::FunctionProtoType::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::FunctionDecl::getStorageClass(), clang::ValueDecl::getType(), clang::FunctionProtoType::hasExtParameterInfos(), clang::FunctionType::ExtParameterInfo::isNoEscape(), and clang::SC_Static.
bool clang::Sema::CheckOverridingFunctionExceptionSpec | ( | const CXXMethodDecl * | New, |
const CXXMethodDecl * | Old | ||
) |
CheckOverridingFunctionExceptionSpec - Checks whether the exception spec is a subset of base spec.
Definition at line 939 of file SemaExceptionSpec.cpp.
References clang::Type::castAs(), CheckExceptionSpecSubset(), DelayedOverridingExceptionSpecChecks, clang::EST_Unparsed, clang::exceptionSpecNotKnownYet(), clang::Type::getAs(), getLangOpts(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ValueDecl::getType(), clang::TagDecl::isDependentType(), and PDiag().
bool Sema::CheckOverridingFunctionReturnType | ( | const CXXMethodDecl * | New, |
const CXXMethodDecl * | Old | ||
) |
CheckOverridingFunctionReturnType - Checks whether the return types are covariant, according to C++ [class.virtual]p5.
Both types must be pointers or references to classes.
Definition at line 14875 of file SemaDeclCXX.cpp.
References clang::Type::getAs(), and clang::ValueDecl::getType().
TypeSourceInfo * Sema::CheckPackExpansion | ( | TypeSourceInfo * | Pattern, |
SourceLocation | EllipsisLoc, | ||
Optional< unsigned > | NumExpansions | ||
) |
Construct a pack expansion type from the pattern of the pack expansion.
Definition at line 569 of file SemaTemplateVariadic.cpp.
References clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), clang::TypeLocBuilder::getTypeSourceInfo(), clang::QualType::isNull(), clang::TypeLocBuilder::push(), clang::TypeLocBuilder::pushFullCopy(), clang::Result, and clang::PackExpansionTypeLoc::setEllipsisLoc().
Referenced by SubstParmVarDecl(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
QualType Sema::CheckPackExpansion | ( | QualType | Pattern, |
SourceRange | PatternRange, | ||
SourceLocation | EllipsisLoc, | ||
Optional< unsigned > | NumExpansions | ||
) |
Construct a pack expansion type from the pattern of the pack expansion.
Definition at line 586 of file SemaTemplateVariadic.cpp.
References clang::Type::containsUnexpandedParameterPack(), Diag(), and clang::Type::getContainedDeducedType().
ExprResult Sema::CheckPackExpansion | ( | Expr * | Pattern, |
SourceLocation | EllipsisLoc, | ||
Optional< unsigned > | NumExpansions | ||
) |
Invoked when parsing an expression followed by an ellipsis, which creates a pack expansion.
Pattern | The expression preceding the ellipsis, which will become the pattern of the pack expansion. |
EllipsisLoc | The location of the ellipsis. |
Definition at line 610 of file SemaTemplateVariadic.cpp.
References clang::Expr::containsUnexpandedParameterPack(), Diag(), clang::ExprError(), and clang::Stmt::getSourceRange().
ParmVarDecl * Sema::CheckParameter | ( | DeclContext * | DC, |
SourceLocation | StartLoc, | ||
SourceLocation | NameLoc, | ||
IdentifierInfo * | Name, | ||
QualType | T, | ||
TypeSourceInfo * | TSInfo, | ||
StorageClass | SC | ||
) |
Definition at line 12965 of file SemaDecl.cpp.
Referenced by SubstParmVarDecl().
bool Sema::CheckParameterPacksForExpansion | ( | SourceLocation | EllipsisLoc, |
SourceRange | PatternRange, | ||
ArrayRef< UnexpandedParameterPack > | Unexpanded, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
bool & | ShouldExpand, | ||
bool & | RetainExpansion, | ||
Optional< unsigned > & | NumExpansions | ||
) |
Determine whether we could expand a pack expansion with the given set of parameter packs into separate arguments by repeatedly transforming the pattern.
EllipsisLoc | The location of the ellipsis that identifies the pack expansion. |
PatternRange | The source range that covers the entire pattern of the pack expansion. |
Unexpanded | The set of unexpanded parameter packs within the pattern. |
ShouldExpand | Will be set to true if the transformer should expand the corresponding pack expansions into separate arguments. When set, NumExpansions must also be set. |
RetainExpansion | Whether the caller should add an unexpanded pack expansion after all of the expanded arguments. This is used when extending explicitly-specified template argument packs per C++0x [temp.arg.explicit]p9. |
NumExpansions | The number of separate arguments that will be in the expanded form of the corresponding pack expansion. This is both an input and an output parameter, which can be set by the caller if the number of expansions is known a priori (e.g., due to a prior substitution) and will be set by the callee when the number of expansions is known. The callee must set this value when ShouldExpand is true ; it may set this value in other cases. |
ShouldExpand
(and possibly NumExpansions
) must be set. Definition at line 631 of file SemaTemplateVariadic.cpp.
Referenced by SubstBaseSpecifiers(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
bool clang::Sema::CheckParamExceptionSpec | ( | const PartialDiagnostic & | DiagID, |
const PartialDiagnostic & | NoteID, | ||
const FunctionProtoType * | Target, | ||
SourceLocation | TargetLoc, | ||
const FunctionProtoType * | Source, | ||
SourceLocation | SourceLoc | ||
) |
CheckParamExceptionSpec - Check if the parameter and return types of the two functions have equivalent exception specs.
This is part of the assignment and override compatibility check. We do not check the parameters of parameter function pointers recursively, as no sane programmer would even be able to write such a function type.
Definition at line 869 of file SemaExceptionSpec.cpp.
References clang::CheckSpecForTypesEquivalent(), clang::FunctionProtoType::getNumParams(), clang::FunctionProtoType::getParamType(), clang::FunctionType::getReturnType(), i, and PDiag().
Referenced by CheckExceptionSpecSubset().
bool Sema::CheckParmsForFunctionDef | ( | ArrayRef< ParmVarDecl *> | Parameters, |
bool | CheckParameterNames | ||
) |
Helpers for dealing with blocks and functions.
CheckParmsForFunctionDef - Check that the parameters of the given function are appropriate for the definition of a function.
This takes care of any checks that cannot be performed on the declaration itself, e.g., that the types of each of the function parameters are complete.
Definition at line 12589 of file SemaChecking.cpp.
References Diag(), diagnoseArrayStarInParamType(), clang::Decl::getLocation(), clang::DeclContext::getParent(), clang::Attr::getSpelling(), and clang::DeclContext::isFunctionOrMethod().
Referenced by ActOnStartOfObjCMethodDef().
void Sema::checkPartialSpecializationVisibility | ( | SourceLocation | Loc, |
NamedDecl * | Spec | ||
) |
We've found a use of a template specialization that would select a partial specialization.
Check whether a template partial specialization that we've discovered is hidden, and produce suitable diagnostics if so.
Check that the partial specialization is visible, and diagnose if not.
Definition at line 10470 of file SemaTemplate.cpp.
References clang::Decl::getLocation().
ExprResult Sema::CheckPlaceholderExpr | ( | Expr * | E | ) |
Check for operands with placeholder types and complain if found.
Returns ExprError() if there was an error and no recovery was possible.
Definition at line 17451 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, clang::DeclarationName::CXXDestructorName, diagnoseUnknownAnyExpr(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAsPlaceholderType(), clang::BuiltinType::getKind(), clang::Expr::getType(), clang::Expr::IgnoreParenImpCasts(), clang::Expr::IgnoreParens(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), and result.
Referenced by ActOnDecltypeExpression(), ActOnFinishFullExpr(), ActOnStartCXXMemberReference(), BuildCXXNoexceptExpr(), BuildExpressionTrait(), checkArgsForPlaceholders(), CheckArrow(), CheckCommaOperands(), CheckIncrementDecrementOperand(), CheckIndirectionOperand(), CheckObjCCollectionLiteralElement(), checkPlaceholderForOverload(), getCastAwayConstnessCastKind(), IgnoredValueConversions(), and clang::InitializationSequence::InitializeFrom().
bool Sema::CheckPointerConversion | ( | Expr * | From, |
QualType | ToType, | ||
CastKind & | Kind, | ||
CXXCastPath & | BasePath, | ||
bool | IgnoreBaseAccess, | ||
bool | Diagnose = true |
||
) |
CheckPointerConversion - Check the pointer conversion from the expression From to the type ToType.
This routine checks for ambiguous or inaccessible derived-to-base pointer conversions for which IsPointerConversion has already returned true. It returns true and produces a diagnostic if there was an error, or returns false otherwise.
Definition at line 2888 of file SemaOverload.cpp.
References clang::Expr::getType(), clang::Type::isAnyPointerType(), and clang::Expr::isNullPointerConstant().
Referenced by PerformImplicitConversion().
QualType Sema::CheckPointerToMemberOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
ExprValueKind & | VK, | ||
SourceLocation | OpLoc, | ||
bool | isIndirect | ||
) |
Definition at line 5389 of file SemaExprCXX.cpp.
References clang::ASTContext::BoundMemberTy, CheckDerivedToBaseConversion(), Context, clang::FixItHint::CreateReplacement(), DefaultLvalueConversion(), Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::MemberPointerType::getClass(), clang::ASTContext::getCVRQualifiedType(), clang::QualType::getCVRQualifiers(), getLangOpts(), clang::MemberPointerType::getPointeeType(), clang::ASTContext::getPointerType(), clang::ASTContext::getQualifiedType(), clang::ASTContext::hasSameUnqualifiedType(), ImpCastExprToType(), IsDerivedFrom(), clang::Type::isFunctionType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), RequireCompleteType(), clang::Result, clang::RQ_LValue, clang::RQ_None, clang::RQ_RValue, TemporaryMaterializationConversion(), clang::VK_LValue, and clang::VK_RValue.
ExprResult Sema::checkPseudoObjectAssignment | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
BinaryOperatorKind | Opcode, | ||
Expr * | LHS, | ||
Expr * | RHS | ||
) |
Definition at line 1589 of file SemaPseudoObject.cpp.
References clang::Expr::isTypeDependent().
ExprResult Sema::checkPseudoObjectIncDec | ( | Scope * | S, |
SourceLocation | OpLoc, | ||
UnaryOperatorKind | Opcode, | ||
Expr * | Op | ||
) |
Check an increment or decrement of a pseudo-object expression.
Definition at line 1560 of file SemaPseudoObject.cpp.
References clang::Expr::isTypeDependent().
ExprResult Sema::checkPseudoObjectRValue | ( | Expr * | E | ) |
Definition at line 1535 of file SemaPseudoObject.cpp.
References clang::Expr::IgnoreParens().
bool Sema::CheckPureMethod | ( | CXXMethodDecl * | Method, |
SourceRange | InitRange | ||
) |
Mark the given method pure.
Method | the method to be marked pure. |
InitRange | the source range that covers the "0" initializer. |
Definition at line 14986 of file SemaDeclCXX.cpp.
References Diag(), clang::NamedDecl::getDeclName(), clang::SourceRange::getEnd(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::DeclContext::isDependentContext(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), clang::CXXMethodDecl::isVirtual(), clang::FunctionDecl::setPure(), and clang::FunctionDecl::setRangeEnd().
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
bool Sema::CheckQualifiedMemberReference | ( | Expr * | BaseExpr, |
QualType | BaseType, | ||
const CXXScopeSpec & | SS, | ||
const LookupResult & | R | ||
) |
Definition at line 549 of file SemaExprMember.cpp.
References clang::LookupResult::begin(), DiagnoseQualifiedMemberReference(), clang::LookupResult::end(), getCanonicalDecl(), clang::CXXRecordDecl::getCanonicalDecl(), clang::TypoCorrection::getCorrectionDecl(), clang::RecordType::getDecl(), clang::LookupResult::getLookupNameInfo(), clang::DeclContext::getParent(), clang::LookupResult::getRepresentativeDecl(), clang::Type::isDependentType(), clang::CXXRecordDecl::isProvablyNotDerivedFrom(), clang::DeclContext::isRecord(), and clang::DeclContext::isTransparentContext().
We've determined that New
is a redeclaration of Old
.
Check that they have compatible owning modules.
Definition at line 1473 of file SemaDecl.cpp.
References Diag(), clang::Decl::getFriendObjectKind(), clang::Module::getFullModuleName(), clang::Decl::getLocation(), clang::Decl::getOwningModule(), clang::Decl::getOwningModuleForLinkage(), clang::Module::isModulePurview(), clang::Module::Kind, clang::Module::Parent, clang::Module::PrivateModuleFragment, clang::Decl::setInvalidDecl(), and clang::Decl::setLocalOwningModule().
bool clang::Sema::CheckRegparmAttr | ( | const ParsedAttr & | attr, |
unsigned & | value | ||
) |
Referenced by handleFunctionTypeAttr().
QualType Sema::CheckRemainderOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
bool | IsCompAssign = false |
||
) |
void Sema::checkRetainCycles | ( | ObjCMessageExpr * | msg | ) |
checkRetainCycles - Check whether an Objective-C message send might create an obvious retain cycle.
Check a message send to see if it's likely to cause a retain cycle.
Definition at line 13379 of file SemaChecking.cpp.
References diagnoseRetainCycle(), findCapturingExpr(), findRetainCycleOwner(), clang::ObjCMessageExpr::getArg(), clang::ObjCMessageExpr::getInstanceReceiver(), clang::ObjCMessageExpr::getMethodDecl(), clang::ObjCMessageExpr::getNumArgs(), clang::ObjCMessageExpr::getReceiverKind(), clang::ObjCMessageExpr::getSelector(), clang::ObjCMessageExpr::getSuperLoc(), i, clang::ObjCMessageExpr::Instance, clang::ObjCMessageExpr::isInstanceMessage(), isSetterLikeSelector(), clang::ObjCMethodDecl::parameters(), and clang::ObjCMessageExpr::SuperInstance.
Referenced by LookupMethodInReceiverType().
Check a property assign to see if it's likely to cause a retain cycle.
Definition at line 13409 of file SemaChecking.cpp.
References diagnoseRetainCycle(), findCapturingExpr(), and findRetainCycleOwner().
Definition at line 13418 of file SemaChecking.cpp.
References considerVariable(), diagnoseRetainCycle(), findCapturingExpr(), clang::Decl::getLocation(), and clang::VarDecl::getSourceRange().
bool clang::Sema::checkSectionName | ( | SourceLocation | LiteralLoc, |
StringRef | Str | ||
) |
void Sema::CheckShadow | ( | NamedDecl * | D, |
NamedDecl * | ShadowedDecl, | ||
const LookupResult & | R | ||
) |
Diagnose variable or built-in function shadowing.
Implements -Wshadow.
This method is called whenever a VarDecl is added to a "useful" scope.
ShadowedDecl | the declaration that is shadowed by the given variable |
R | the lookup of the name |
Definition at line 7111 of file SemaDecl.cpp.
References clang::DeclContext::Encloses(), clang::DeclContext::Equals(), getCaptureLocation(), clang::Decl::getDeclContext(), clang::getLambdaAwareParentOfDeclContext(), clang::DeclContext::getLexicalParent(), clang::DeclContext::getParent(), clang::DeclContext::getRedeclContext(), clang::isLambdaCallOperator(), clang::DeclContext::isRecord(), and clang::LCD_None.
Check -Wshadow without the advantage of a previous lookup.
Definition at line 7234 of file SemaDecl.cpp.
void Sema::CheckShadowingDeclModification | ( | Expr * | E, |
SourceLocation | Loc | ||
) |
Warn if 'E', which is an expression that is about to be modified, refers to a shadowing declaration.
Check if 'E', which is an expression that is about to be modified, refers to a constructor parameter that shadows a field.
Definition at line 7247 of file SemaDecl.cpp.
References clang::frontend::CPlusPlus, Diag(), clang::Decl::getDeclContext(), clang::Decl::getLocation(), and clang::Expr::IgnoreParenImpCasts().
Referenced by CheckForModifiableLvalue().
QualType Sema::CheckShiftOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
BinaryOperatorKind | Opc, | ||
bool | IsCompAssign = false |
||
) |
Definition at line 9800 of file SemaExpr.cpp.
References clang::VectorType::AltiVecBool, checkArithmeticNull(), checkVectorShift(), DiagnoseBadShiftValues(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::hasIntegerRepresentation(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and isScopedEnumerationType().
Sema::AssignConvertType Sema::CheckSingleAssignmentConstraints | ( | QualType | LHSType, |
ExprResult & | RHS, | ||
bool | Diagnose = true , |
||
bool | DiagnoseCFAudited = false , |
||
bool | ConvertRHS = true |
||
) |
Check assignment constraints for an assignment of RHS to LHSType.
LHSType | The destination type for the assignment. |
RHS | The source expression for the assignment. |
Diagnose | If true , diagnostics may be produced when checking for assignability. If a diagnostic is produced, RHS will be set to ExprError(). Note that this function may still return without producing a diagnostic, even for an invalid assignment. |
DiagnoseCFAudited | If true , the target is a function parameter in an audited Core Foundation API and does not need to be checked for ARC retain issues. |
ConvertRHS | If true , RHS will be updated to model the conversions necessary to perform the assignment. If false , Diagnose must also be false . |
Definition at line 8401 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::QualType::getUnqualifiedType(), clang::Type::isAtomicType(), clang::ImplicitConversionSequence::isFailure(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isRecordType(), result, and TryImplicitConversion().
Referenced by checkObjCCollectionLiteralElement(), IsStandardConversion(), LookupMethodInReceiverType(), and clang::InitializationSequence::Perform().
bool Sema::CheckSpecializationInstantiationRedecl | ( | SourceLocation | NewLoc, |
TemplateSpecializationKind | NewTSK, | ||
NamedDecl * | PrevDecl, | ||
TemplateSpecializationKind | PrevTSK, | ||
SourceLocation | PrevPointOfInstantiation, | ||
bool & | HasNoEffect | ||
) |
Diagnose cases where we have an explicit template specialization before/after an explicit template instantiation, producing diagnostics for those cases where they are required and determining whether the new specialization/instantiation will have any effect.
NewLoc | the location of the new explicit specialization or instantiation. |
NewTSK | the kind of the new explicit specialization or instantiation. |
PrevDecl | the previous declaration of the entity. |
PrevTSK | the kind of the old explicit specialization or instantiatin. |
PrevPointOfInstantiation | if valid, indicates where the previus declaration was instantiated (either implicitly or explicitly). |
HasNoEffect | will be set to true to indicate that the new specialization or instantiation has no effect and should be ignored. |
Definition at line 8130 of file SemaTemplate.cpp.
References Diag(), DiagLocForExplicitInstantiation(), clang::Decl::getLocation(), clang::Decl::getPreviousDecl(), getTemplateSpecializationKind(), clang::SourceLocation::isInvalid(), clang::SourceLocation::isValid(), StripImplicitInstantiation(), clang::TSK_ExplicitInstantiationDeclaration, clang::TSK_ExplicitInstantiationDefinition, clang::TSK_ExplicitSpecialization, clang::TSK_ImplicitInstantiation, and clang::TSK_Undeclared.
Referenced by InstantiateClassMembers(), and clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl().
void Sema::checkSpecializationVisibility | ( | SourceLocation | Loc, |
NamedDecl * | Spec | ||
) |
We've found a use of a templated declaration that would trigger an implicit instantiation.
Check that any relevant explicit specializations and partial specializations are visible, and diagnose if not.
Definition at line 10461 of file SemaTemplate.cpp.
Referenced by DoMarkVarDeclReferenced().
bool clang::Sema::CheckSpecifiedExceptionType | ( | QualType & | T, |
SourceRange | Range | ||
) |
CheckSpecifiedExceptionType - Check if the given type is valid in an exception specification.
Incomplete types, or pointers to incomplete types other than void are not allowed.
[in,out] | T | The exception type. This will be decayed to a pointer type when the input is an array or a function type. |
Definition at line 107 of file SemaExceptionSpec.cpp.
References Context, Diag(), clang::ASTContext::getArrayDecayedType(), clang::Type::getAs(), clang::SourceRange::getBegin(), getLangOpts(), clang::Type::getPointeeType(), clang::ASTContext::getPointerType(), clang::Type::isArrayType(), clang::Type::isFunctionType(), clang::Type::isRecordType(), clang::Type::isVoidType(), and RequireCompleteType().
void Sema::CheckStaticArrayArgument | ( | SourceLocation | CallLoc, |
ParmVarDecl * | Param, | ||
const Expr * | ArgExpr | ||
) |
CheckStaticArrayArgument - If the given argument corresponds to a static array parameter, check that it is non-null, and that if it is formed by array-to-pointer decay, the underlying array is sufficiently large.
C99 6.7.5.3p7: If the keyword static also appears within the [ and ] of the array type derivation, then for each call to the function, the value of the corresponding actual argument shall provide access to the first element of an array with at least as many elements as specified by the size expression.
Definition at line 5228 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, and clang::ParmVarDecl::getOriginalType().
void Sema::CheckStaticLocalForDllExport | ( | VarDecl * | VD | ) |
Check if VD needs to be dllexport/dllimport due to being in a dllexport/import function.
Definition at line 12388 of file SemaDecl.cpp.
References clang::Decl::addAttr(), clang::getDLLAttr(), clang::Decl::getParentFunctionOrMethod(), and clang::VarDecl::isStaticLocal().
Referenced by clang::TemplateDeclInstantiator::VisitVarDecl().
bool Sema::checkStringLiteralArgumentAttr | ( | const ParsedAttr & | AL, |
unsigned | ArgNum, | ||
StringRef & | Str, | ||
SourceLocation * | ArgLocation = nullptr |
||
) |
Check if the argument ArgNum
of Attr
is a ASCII string literal.
If not emit an error and return false. If the argument is an identifier it will emit an error with a fixit hint and treat it as if it was a string literal.
Definition at line 366 of file SemaDeclAttr.cpp.
References clang::AANT_ArgumentString, clang::FixItHint::CreateInsertion(), Diag(), clang::ParsedAttr::getArgAsExpr(), clang::ParsedAttr::getArgAsIdent(), clang::Stmt::getBeginLoc(), clang::IdentifierInfo::getName(), clang::IdentifierLoc::Ident, clang::Expr::IgnoreParenCasts(), clang::ParsedAttr::isArgIdent(), and clang::IdentifierLoc::Loc.
Sema::AccessResult Sema::CheckStructuredBindingMemberAccess | ( | SourceLocation | UseLoc, |
CXXRecordDecl * | DecomposedClass, | ||
DeclAccessPair | Field | ||
) |
Checks implicit access to a member in a structured binding.
Definition at line 1731 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, and clang::DeclAccessPair::getAccess().
Referenced by checkMemberDecomposition().
Sema::ObjCSubscriptKind Sema::CheckSubscriptingKind | ( | Expr * | FromE | ) |
CheckSubscriptingKind - This routine decide what type of indexing represented by "FromE" is being done.
Definition at line 1053 of file SemaPseudoObject.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::Type::getAs(), clang::RecordType::getDecl(), clang::Expr::getExprLoc(), clang::Expr::getType(), i, clang::Expr::IgnoreParenImpCasts(), clang::Type::isBlockPointerType(), clang::Type::isIncompleteType(), clang::Type::isIntegralOrEnumerationType(), clang::Type::isObjCIdType(), clang::Type::isObjCObjectPointerType(), and clang::Type::isVoidPointerType().
Referenced by CheckKeyForObjCARCConversion().
QualType Sema::CheckSubtractionOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
QualType * | CompLHSTy = nullptr |
||
) |
ExprResult Sema::CheckSwitchCondition | ( | SourceLocation | SwitchLoc, |
Expr * | Cond | ||
) |
Definition at line 625 of file SemaStmt.cpp.
Referenced by CheckConditionVariable().
bool clang::Sema::checkTargetAttr | ( | SourceLocation | LiteralLoc, |
StringRef | Str | ||
) |
bool Sema::CheckTemplateArgument | ( | NamedDecl * | Param, |
TemplateArgumentLoc & | Arg, | ||
NamedDecl * | Template, | ||
SourceLocation | TemplateLoc, | ||
SourceLocation | RAngleLoc, | ||
unsigned | ArgumentPackIndex, | ||
SmallVectorImpl< TemplateArgument > & | Converted, | ||
CheckTemplateArgumentKind | CTAK = CTAK_Specified |
||
) |
Check that the given template argument corresponds to the given template parameter.
Param | The template parameter against which the argument will be checked. |
Arg | The template argument, which may be updated due to conversions. |
Template | The template in which the template argument resides. |
TemplateLoc | The location of the template name for the template whose argument list we're matching. |
RAngleLoc | The location of the right angle bracket ('>') that closes the template argument list. |
ArgumentPackIndex | The index into the argument pack where this argument will be placed. Only valid if the parameter is a parameter pack. |
Converted | The checked, converted argument will be added to the end of this small vector. |
CTAK | Describes how we arrived at this particular template argument: explicitly written, deduced, etc. |
Definition at line 4892 of file SemaTemplate.cpp.
References clang::CXXScopeSpec::Adopt(), clang::DependentScopeDeclRefExpr::Create(), clang::TemplateArgument::Declaration, clang::TemplateArgument::Expression, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::TemplateArgumentLoc::getArgument(), clang::Type::getAs(), clang::TemplateName::getAsDependentTemplateName(), clang::TemplateArgument::getAsExpr(), clang::TemplateArgument::getAsTemplateOrTemplatePattern(), clang::Decl::getDeclContext(), clang::TemplateArgument::getKind(), clang::TemplateArgumentLoc::getTemplateNameLoc(), clang::TemplateArgumentLoc::getTemplateQualifierLoc(), clang::TemplateArgument::Integral, clang::DeclContext::isDependentContext(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Sema::InstantiatingTemplate::isInvalid(), clang::QualType::isNull(), clang::TemplateArgument::Null, clang::TemplateArgument::NullPtr, clang::TemplateArgumentList::OnStack, clang::TemplateArgument::Template, and clang::TemplateArgument::TemplateExpansion.
Referenced by ConvertDeducedTemplateArgument().
bool Sema::CheckTemplateArgument | ( | TemplateTypeParmDecl * | Param, |
TypeSourceInfo * | ArgInfo | ||
) |
Check a template argument against its corresponding template type parameter.
This routine implements the semantics of C++ [temp.arg.type]. It returns true if an error occurred, and false otherwise.
Definition at line 5729 of file SemaTemplate.cpp.
References Diag(), clang::SourceRange::getBegin(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), and clang::Type::isVariablyModifiedType().
ExprResult Sema::CheckTemplateArgument | ( | NonTypeTemplateParmDecl * | Param, |
QualType | ParamType, | ||
Expr * | Arg, | ||
TemplateArgument & | Converted, | ||
CheckTemplateArgumentKind | CTAK = CTAK_Specified |
||
) |
Check a template argument against its corresponding non-type template parameter.
This routine implements the semantics of C++ [temp.arg.nontype]. If an error occurred, it returns ExprError(); otherwise, it returns the converted template argument. ParamType
is the type of the non-type template parameter after it has been instantiated.
Definition at line 6337 of file SemaTemplate.cpp.
References clang::frontend::CPlusPlus17, Depth, clang::Stmt::getBeginLoc(), clang::TemplateParmPosition::getDepth(), clang::Expr::isTypeDependent(), and clang::Type::isUndeducedType().
bool Sema::CheckTemplateArgumentList | ( | TemplateDecl * | Template, |
SourceLocation | TemplateLoc, | ||
TemplateArgumentListInfo & | TemplateArgs, | ||
bool | PartialTemplateArgs, | ||
SmallVectorImpl< TemplateArgument > & | Converted, | ||
bool | UpdateArgsWithConversions = true |
||
) |
Check that the given template arguments can be be provided to the given template, converting the arguments along the way.
Check that the given template argument list is well-formed for specializing the given template.
Template | The template to which the template arguments are being provided. |
TemplateLoc | The location of the template name in the source. |
TemplateArgs | The list of template arguments. If the template is a template template parameter, this function may extend the set of template arguments to also include substituted, defaulted template arguments. |
PartialTemplateArgs | True if the list of template arguments is intentionally partial, e.g., because we're checking just the initial set of template arguments. |
Converted | Will receive the converted, canonicalized template arguments. |
UpdateArgsWithConversions | If true , update TemplateArgs to contain the converted forms of the template arguments as written. Otherwise, TemplateArgs will not be modified. |
Definition at line 5206 of file SemaTemplate.cpp.
References clang::TemplateParameterList::begin(), clang::TemplateArgument::CreatePackCopy(), clang::TemplateParameterList::end(), getExpandedPackSize(), clang::NamedDecl::getMostRecentDecl(), clang::TemplateArgumentListInfo::getRAngleLoc(), and clang::TemplateArgumentListInfo::size().
Referenced by clang::TemplateDeclInstantiator::InstantiateClassTemplatePartialSpecialization(), clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization(), and clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl().
bool Sema::CheckTemplateDeclScope | ( | Scope * | S, |
TemplateParameterList * | TemplateParams | ||
) |
Check whether a template can be declared within this scope.
If the template declaration is valid in this scope, returns false. Otherwise, issues a diagnostic and returns true.
Definition at line 7338 of file SemaTemplate.cpp.
References clang::Scope::DeclScope, Diag(), clang::Scope::getEntity(), clang::DeclContext::getExternCContext(), clang::Scope::getFlags(), clang::Scope::getParent(), clang::DeclContext::getRedeclContext(), clang::TemplateParameterList::getSourceRange(), clang::TemplateParameterList::getTemplateLoc(), clang::DeclContext::isExternCContext(), clang::DeclContext::isFileContext(), and clang::Scope::TemplateParamScope.
QualType Sema::CheckTemplateIdType | ( | TemplateName | Template, |
SourceLocation | TemplateLoc, | ||
TemplateArgumentListInfo & | TemplateArgs | ||
) |
Definition at line 3229 of file SemaTemplate.cpp.
Referenced by lookupStdTypeTraitMember().
bool Sema::CheckTemplateParameterList | ( | TemplateParameterList * | NewParams, |
TemplateParameterList * | OldParams, | ||
TemplateParamListContext | TPC, | ||
SkipBodyInfo * | SkipBody = nullptr |
||
) |
Checks the validity of a template parameter list, possibly considering the template parameter list from a previous declaration.
If an "old" template parameter list is provided, it must be equivalent (per TemplateParameterListsAreEqual) to the "new" template parameter list.
NewParams | Template parameter list for a new template declaration. This template parameter list will be updated with any default arguments that are carried through from the previous template parameter list. |
OldParams | If provided, template parameter list from a previous declaration of the same template. Default template arguments will be merged from the old template parameter list to the new template parameter list. |
TPC | Describes the context in which we are checking the given template parameter list. |
SkipBody | If we might have already made a prior merged definition of this template visible, the corresponding body-skipping information. Default argument redefinition is not an error when skipping such a body, because (under the ODR) we can assume the default arguments are the same as the prior merged definition. |
Definition at line 2260 of file SemaTemplate.cpp.
References clang::TemplateParameterList::begin(), DiagnoseDefaultTemplateArgument(), clang::TemplateParameterList::end(), clang::TemplateTypeParmDecl::getDefaultArgumentLoc(), clang::TemplateTypeParmDecl::hasDefaultArgument(), hasVisibleDefaultArgument(), and clang::Sema::SkipBodyInfo::ShouldSkip.
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
void Sema::CheckTemplatePartialSpecialization | ( | ClassTemplatePartialSpecializationDecl * | Partial | ) |
Definition at line 3832 of file SemaTemplate.cpp.
References checkTemplatePartialSpecialization().
Referenced by clang::TemplateDeclInstantiator::InstantiateClassTemplatePartialSpecialization(), and clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization().
void Sema::CheckTemplatePartialSpecialization | ( | VarTemplatePartialSpecializationDecl * | Partial | ) |
Definition at line 3837 of file SemaTemplate.cpp.
References checkTemplatePartialSpecialization().
bool Sema::CheckTemplatePartialSpecializationArgs | ( | SourceLocation | TemplateNameLoc, |
TemplateDecl * | PrimaryTemplate, | ||
unsigned | NumExplicit, | ||
ArrayRef< TemplateArgument > | TemplateArgs | ||
) |
Check the non-type template arguments of a class template partial specialization according to C++ [temp.class.spec]p9.
TemplateNameLoc | the location of the template name. |
PrimaryTemplate | the template parameters of the primary class template. |
NumExplicit | the number of explicitly-specified template arguments. |
TemplateArgs | the template arguments of the class template partial specialization. |
true
if there was an error, false
otherwise. Definition at line 7613 of file SemaTemplate.cpp.
References CheckNonTypeTemplatePartialSpecializationArgs(), clang::Decl::getDeclContext(), clang::TemplateParameterList::getParam(), clang::TemplateDecl::getTemplateParameters(), clang::DeclContext::isDependentContext(), and clang::TemplateParameterList::size().
Referenced by clang::TemplateDeclInstantiator::InstantiateClassTemplatePartialSpecialization(), and clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization().
bool Sema::CheckTemplateTemplateArgument | ( | TemplateParameterList * | Params, |
TemplateArgumentLoc & | Arg | ||
) |
Check a template argument against its corresponding template template parameter.
This routine implements the semantics of C++ [temp.arg.template]. It returns true if an error occurred, and false otherwise.
Definition at line 6871 of file SemaTemplate.cpp.
bool Sema::CheckTemplateTypeArgument | ( | TemplateTypeParmDecl * | Param, |
TemplateArgumentLoc & | Arg, | ||
SmallVectorImpl< TemplateArgument > & | Converted | ||
) |
Definition at line 4481 of file SemaTemplate.cpp.
References clang::TemplateArgumentLoc::getArgument(), clang::TemplateArgument::getAsType(), clang::TemplateArgument::getKind(), clang::TemplateArgumentLoc::getSourceRange(), clang::TemplateArgumentLoc::getTypeSourceInfo(), clang::TemplateArgument::Template, clang::TemplateArgument::TemplateExpansion, and clang::TemplateArgument::Type.
bool Sema::checkThisInStaticMemberFunctionAttributes | ( | CXXMethodDecl * | Method | ) |
Check whether 'this' shows up in the attributes of the given static member function.
Definition at line 15529 of file SemaDeclCXX.cpp.
bool Sema::checkThisInStaticMemberFunctionExceptionSpec | ( | CXXMethodDecl * | Method | ) |
Whether this' shows up in the exception specification of a static member function.
Definition at line 15487 of file SemaDeclCXX.cpp.
References clang::TypeLoc::getAs(), clang::TypeSourceInfo::getTypeLoc(), clang::InheritingConcreteTypeLoc< Base, Derived, TypeClass >::getTypePtr(), and clang::DeclaratorDecl::getTypeSourceInfo().
bool Sema::checkThisInStaticMemberFunctionType | ( | CXXMethodDecl * | Method | ) |
Check whether 'this' shows up in the type of a static member function after the (naturally empty) cv-qualifier-seq would be.
Definition at line 15455 of file SemaDeclCXX.cpp.
References clang::TypeLoc::getAs(), clang::TypeSourceInfo::getTypeLoc(), clang::InheritingConcreteTypeLoc< Base, Derived, TypeClass >::getTypePtr(), and clang::DeclaratorDecl::getTypeSourceInfo().
Definition at line 3936 of file SemaExprObjC.cpp.
References ACTC_coreFoundation, ACTC_retainable, clang::ast_matchers::castExpr, classifyTypeForARCConversion(), and clang::Expr::getType().
Definition at line 4007 of file SemaExprObjC.cpp.
References ACTC_coreFoundation, ACTC_retainable, classifyTypeForARCConversion(), and clang::Expr::getType().
Referenced by TryStaticCast().
Sema::AssignConvertType Sema::CheckTransparentUnionArgumentConstraints | ( | QualType | ArgType, |
ExprResult & | RHS | ||
) |
Definition at line 8349 of file SemaExpr.cpp.
References clang::Type::castAs(), clang::RecordDecl::fields(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAsUnionType(), clang::RecordType::getDecl(), clang::PointerType::getPointeeType(), clang::Decl::hasAttr(), clang::Type::isPointerType(), and clang::Type::isVoidType().
Referenced by clang::InitializationSequence::Perform(), and PerformImplicitConversion().
void Sema::CheckTypedefForVariablyModifiedType | ( | Scope * | S, |
TypedefNameDecl * | D | ||
) |
Definition at line 5808 of file SemaDecl.cpp.
QualType Sema::CheckTypenameType | ( | ElaboratedTypeKeyword | Keyword, |
SourceLocation | KeywordLoc, | ||
NestedNameSpecifierLoc | QualifierLoc, | ||
const IdentifierInfo & | II, | ||
SourceLocation | IILoc | ||
) |
Build the type that describes a C++ typename specifier, e.g., "typename T::type".
Definition at line 9946 of file SemaTemplate.cpp.
References clang::CXXScopeSpec::Adopt(), clang::NestedNameSpecifierLoc::getNestedNameSpecifier(), and clang::NestedNameSpecifier::isDependent().
Referenced by clang::TreeTransform< Derived >::RebuildDependentNameType().
bool Sema::CheckUnaryExprOrTypeTraitOperand | ( | Expr * | E, |
UnaryExprOrTypeTrait | ExprKind | ||
) |
Check the constraints on expression operands to unary type expression and type traits.
Completes any types necessary and validates the constraints on the operand expression. The logic mostly mirrors the type-based overload, but may modify the expression as it completes the type for that expression through template instantiation, etc.
Definition at line 3806 of file SemaExpr.cpp.
References CheckExtensionTraitOperandType(), CheckVecStepTraitOperandType(), clang::Expr::getExprLoc(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Type::isReferenceType(), clang::UETT_AlignOf, clang::UETT_PreferredAlignOf, and clang::UETT_VecStep.
bool Sema::CheckUnaryExprOrTypeTraitOperand | ( | QualType | ExprType, |
SourceLocation | OpLoc, | ||
SourceRange | ExprRange, | ||
UnaryExprOrTypeTrait | ExprKind | ||
) |
Check the constraints on operands to unary expression and type traits.
This will complete any types necessary, and validate the various constraints on those operands.
The UsualUnaryConversions() function is not called by this routine. C99 6.3.2.1p[2-4] all state: Except when it is the operand of the sizeof operator ...
C++ [expr.sizeof]p4 The lvalue-to-rvalue, array-to-pointer, and function-to-pointer standard conversions are not applied to the operand of sizeof.
This policy is followed for all of the unary trait expressions.
Definition at line 3899 of file SemaExpr.cpp.
References clang::Type::getAs(), clang::Type::getPointeeType(), clang::Type::isDependentType(), clang::UETT_AlignOf, clang::UETT_OpenMPRequiredSimdAlign, and clang::UETT_PreferredAlignOf.
ExprResult Sema::checkUnknownAnyArg | ( | SourceLocation | callLoc, |
Expr * | result, | ||
QualType & | paramType | ||
) |
Type-check an expression that's being passed to an __unknown_anytype parameter.
Definition at line 17383 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ExplicitCastExpr::getTypeAsWritten(), clang::Expr::hasPlaceholderType(), clang::Expr::IgnoreParens(), clang::InitializedEntity::InitializeParameter(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and result.
ExprResult Sema::checkUnknownAnyCast | ( | SourceRange | TypeRange, |
QualType | CastType, | ||
Expr * | CastExpr, | ||
CastKind & | CastKind, | ||
ExprValueKind & | VK, | ||
CXXCastPath & | Path | ||
) |
Check a cast of an unknown-any type.
We intentionally only trigger this for C-style casts.
Definition at line 17359 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceRange::getBegin(), clang::Expr::getValueKind(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Type::isVoidType(), and result.
Referenced by DiagnoseBadFunctionCast(), and TryAddressSpaceCast().
Sema::AccessResult Sema::CheckUnresolvedLookupAccess | ( | UnresolvedLookupExpr * | E, |
DeclAccessPair | FoundDecl | ||
) |
Definition at line 1530 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::DeclAccessPair::getAccess(), and clang::UnresolvedLookupExpr::getNamingClass().
Referenced by FinishOverloadedCallExpr().
Sema::AccessResult Sema::CheckUnresolvedMemberAccess | ( | UnresolvedMemberExpr * | E, |
DeclAccessPair | Found | ||
) |
Perform access-control checking on a previously-unresolved member access which has now been resolved to a member.
Definition at line 1546 of file SemaAccess.cpp.
References AR_accessible, clang::AS_public, clang::DeclAccessPair::getAccess(), clang::Type::getAs(), clang::UnresolvedMemberExpr::getBaseType(), clang::PointerType::getPointeeType(), and clang::UnresolvedMemberExpr::isArrow().
bool Sema::checkUnsafeAssigns | ( | SourceLocation | Loc, |
QualType | LHS, | ||
Expr * | RHS | ||
) |
checkUnsafeAssigns - Check whether +1 expr is being assigned to weak/__unsafe_unretained type.
Definition at line 13475 of file SemaChecking.cpp.
References checkUnsafeAssignObject(), clang::QualType::getObjCLifetime(), LT, clang::Qualifiers::OCL_ExplicitNone, and clang::Qualifiers::OCL_Weak.
void Sema::checkUnsafeExprAssigns | ( | SourceLocation | Loc, |
Expr * | LHS, | ||
Expr * | RHS | ||
) |
checkUnsafeExprAssigns - Check whether +1 expr is being assigned to weak/__unsafe_unretained expression.
Definition at line 13488 of file SemaChecking.cpp.
References clang::cast(), checkUnsafeAssignObject(), Diag(), clang::ObjCPropertyRefExpr::getExplicitProperty(), clang::QualType::getObjCLifetime(), clang::ObjCPropertyDecl::getPropertyAttributes(), clang::ObjCPropertyDecl::getPropertyAttributesAsWritten(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::ObjCPropertyDecl::getType(), clang::Expr::IgnoreParens(), clang::ObjCPropertyRefExpr::isImplicitProperty(), clang::QualType::isNull(), clang::Type::isObjCRetainableType(), LT, clang::ObjCPropertyDecl::OBJC_PR_assign, clang::ObjCPropertyDecl::OBJC_PR_weak, clang::Qualifiers::OCL_None, and clang::Qualifiers::OCL_Weak.
Referenced by LookupMethodInReceiverType().
void clang::Sema::checkUnusedDeclAttributes | ( | Declarator & | D | ) |
bool Sema::CheckUsingDeclQualifier | ( | SourceLocation | UsingLoc, |
bool | HasTypename, | ||
const CXXScopeSpec & | SS, | ||
const DeclarationNameInfo & | NameInfo, | ||
SourceLocation | NameLoc | ||
) |
Checks that the given nested-name qualifier used in a using decl in the current context is appropriately related to the current scope.
If an error is found, diagnoses it and returns true.
Definition at line 10362 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus11, clang::FixItHint::CreateInsertion(), clang::FixItHint::CreateReplacement(), Diag(), clang::frontend::FixIt, clang::LookupResult::getAsSingle(), clang::DeclarationName::getAsString(), clang::SourceRange::getBegin(), clang::CXXScopeSpec::getBeginLoc(), clang::DeclarationNameInfo::getEndLoc(), clang::DeclarationNameInfo::getName(), clang::CXXScopeSpec::getRange(), clang::DeclContext::getRedeclContext(), clang::CXXScopeSpec::getScopeRep(), clang::DeclContext::isDependentContext(), clang::DeclContext::isRecord(), clang::LookupResult::setHideTags(), and clang::LookupResult::suppressDiagnostics().
bool Sema::CheckUsingDeclRedeclaration | ( | SourceLocation | UsingLoc, |
bool | HasTypenameKeyword, | ||
const CXXScopeSpec & | SS, | ||
SourceLocation | NameLoc, | ||
const LookupResult & | Prev | ||
) |
Checks that the given using declaration is not an invalid redeclaration.
Note that this is checking only for the using decl itself, not for any ill-formedness among the UsingShadowDecls.
Definition at line 10284 of file SemaDeclCXX.cpp.
References clang::LookupResult::begin(), Diag(), clang::LookupResult::end(), clang::CXXScopeSpec::getScopeRep(), and clang::NestedNameSpecifier::isDependent().
bool Sema::CheckUsingShadowDecl | ( | UsingDecl * | Using, |
NamedDecl * | Orig, | ||
const LookupResult & | Previous, | ||
UsingShadowDecl *& | PrevShadow | ||
) |
Determines whether to create a using shadow decl for a particular decl, given the set of decls existing prior to this using lookup.
Definition at line 9619 of file SemaDeclCXX.cpp.
References clang::LookupResult::begin(), clang::frontend::CPlusPlus11, Diag(), clang::LookupResult::empty(), clang::LookupResult::end(), clang::NestedNameSpecifierLoc::getBeginLoc(), clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::DeclContext::getParent(), clang::UsingDecl::getQualifier(), clang::UsingDecl::getQualifierLoc(), clang::NestedNameSpecifierLoc::getSourceRange(), clang::NamedDecl::getUnderlyingDecl(), clang::RecordDecl::isAnonymousStructOrUnion(), IsEquivalentForUsingDecl(), clang::RecordDecl::isInjectedClassName(), clang::Decl::setInvalidDecl(), and clang::Target.
We've just determined that Old
and New
both appear to be definitions of the same variable.
Either diagnose or fix the problem.
Definition at line 4132 of file SemaDecl.cpp.
References clang::VarDecl::demoteThisDefinitionToDeclaration(), Diag(), clang::Decl::getDeclContext(), clang::VarDecl::getDescribedVarTemplate(), clang::NamedDecl::getFormalLinkage(), clang::Decl::getLocation(), clang::DeclaratorDecl::getNumTemplateParameterLists(), clang::InternalLinkage, clang::DeclContext::isDependentContext(), clang::VarDecl::isInline(), and clang::Decl::setInvalidDecl().
bool Sema::CheckVariableDeclaration | ( | VarDecl * | NewVD, |
LookupResult & | Previous | ||
) |
Perform semantic checking on a newly-created variable declaration.
This routine performs all of the type-checking required for a variable declaration once it has been built. It is used both to check variables after they have been parsed and their declarators have been translated into a declaration, and to check variables that have been instantiated from a template.
Sets NewVD->isInvalidDecl() if an error was encountered.
Returns true if the variable declaration is a redeclaration.
Definition at line 7628 of file SemaDecl.cpp.
References checkForConflictWithNonVisibleExternC(), clang::LookupResult::empty(), clang::Decl::isInvalidDecl(), and clang::LookupResult::setShadowed().
void Sema::CheckVariableDeclarationType | ( | VarDecl * | NewVD | ) |
Definition at line 7386 of file SemaDecl.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::Decl::hasAttrs(), clang::Decl::isInvalidDecl(), clang::Type::isObjCObjectType(), and clang::Type::isUndeducedType().
Referenced by noteMemberDeclaredHere().
void Sema::checkVariadicArgument | ( | const Expr * | E, |
VariadicCallType | CT | ||
) |
Check to see if the given expression is a valid argument to a variadic function, issuing a diagnostic if not.
Definition at line 840 of file SemaExpr.cpp.
References Diag(), clang::QualType::DK_nontrivial_c_struct, clang::Stmt::getBeginLoc(), clang::Expr::getType(), clang::QualType::isDestructedType(), clang::Type::isObjCObjectType(), and clang::Type::isRecordType().
DeclResult Sema::CheckVarTemplateId | ( | VarTemplateDecl * | Template, |
SourceLocation | TemplateLoc, | ||
SourceLocation | TemplateNameLoc, | ||
const TemplateArgumentListInfo & | TemplateArgs | ||
) |
Definition at line 4069 of file SemaTemplate.cpp.
References clang::TemplateSpecializationType::anyDependentTemplateArguments(), clang::VarTemplateDecl::findSpecialization(), clang::VarTemplateDecl::getTemplatedDecl(), and clang::TemplateArgumentList::OnStack.
Referenced by getVarTemplateSpecialization().
ExprResult Sema::CheckVarTemplateId | ( | const CXXScopeSpec & | SS, |
const DeclarationNameInfo & | NameInfo, | ||
VarTemplateDecl * | Template, | ||
SourceLocation | TemplateLoc, | ||
const TemplateArgumentListInfo * | TemplateArgs | ||
) |
Definition at line 4224 of file SemaTemplate.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::DeclarationNameInfo::getLoc(), clang::VarDecl::getTemplateSpecializationKind(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::VarDecl::setTemplateSpecializationKind(), and clang::TSK_ImplicitInstantiation.
Definition at line 4005 of file SemaExpr.cpp.
References clang::Expr::IgnoreParens(), clang::Expr::isTypeDependent(), and clang::UETT_VecStep.
bool Sema::CheckVectorCast | ( | SourceRange | R, |
QualType | VectorTy, | ||
QualType | Ty, | ||
CastKind & | Kind | ||
) |
Definition at line 6430 of file SemaExpr.cpp.
References clang::Type::isIntegralType(), and clang::Type::isVectorType().
Referenced by DiagnoseBadFunctionCast().
QualType Sema::CheckVectorCompareOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
BinaryOperatorKind | Opc | ||
) |
CheckVectorCompareOperands - vector comparisons are a clang extension that operates on extended vector types.
Instead of producing an IntTy result, like a scalar comparison, a vector comparison produces a vector of integer types.
Definition at line 10931 of file SemaExpr.cpp.
References clang::VectorType::AltiVecVector, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::VectorType::getVectorKind(), and clang::QualType::isNull().
QualType Sema::CheckVectorLogicalOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc | ||
) |
Definition at line 10966 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Type::hasFloatingRepresentation(), and clang::QualType::isNull().
QualType Sema::CheckVectorOperands | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | Loc, | ||
bool | IsCompAssign, | ||
bool | AllowBothBool, | ||
bool | AllowBoolConversion | ||
) |
type checking for vector binary operators.
Definition at line 8859 of file SemaExpr.cpp.
References clang::VectorType::AltiVecBool, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::VectorType::getVectorKind(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by CXXCheckConditionalOperands(), and OpenCLCheckVectorConditional().
void Sema::CheckVirtualDtorCall | ( | CXXDestructorDecl * | dtor, |
SourceLocation | Loc, | ||
bool | IsDelete, | ||
bool | CallCanBeVirtual, | ||
bool | WarnOnNonAbstractTypes, | ||
SourceLocation | DtorLoc | ||
) |
Definition at line 3563 of file SemaExprCXX.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::QualType::getAsStringInternal(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::Type::getPointeeType(), getPrintingPolicy(), getSourceManager(), clang::CXXMethodDecl::getThisType(), clang::Decl::hasAttr(), clang::CXXRecordDecl::isAbstract(), clang::SourceManager::isInSystemHeader(), clang::CXXRecordDecl::isPolymorphic(), isUnevaluatedContext(), and clang::CXXMethodDecl::isVirtual().
Referenced by ActOnCXXDelete().
Sema::NameClassification Sema::ClassifyName | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
IdentifierInfo *& | Name, | ||
SourceLocation | NameLoc, | ||
const Token & | NextToken, | ||
bool | IsAddressOfOperand, | ||
CorrectionCandidateCallback * | CCC = nullptr |
||
) |
Perform name lookup on the given name, classifying it based on the results of name lookup and the following token.
This routine is used by the parser to resolve identifiers and help direct parsing. When the identifier cannot be found, this routine will attempt to correct the typo and classify based on the resulting name.
S | The scope in which we're performing name lookup. |
SS | The nested-name-specifier that precedes the name. |
Name | The identifier. If typo correction finds an alternative name, this pointer parameter will be updated accordingly. |
NameLoc | The location of the identifier. |
NextToken | The token following the identifier. Used to help disambiguate the name. |
IsAddressOfOperand | True if this name is the operand of a unary address of ('&') expression, assuming it is classified as an expression. |
CCC | The correction callback, if typo correction is desired. |
Definition at line 849 of file SemaDecl.cpp.
void Sema::CleanupVarDeclMarking | ( | ) |
Definition at line 16256 of file SemaExpr.cpp.
References MarkVarDeclODRUsed().
Referenced by MaybeCreateExprWithCleanups(), and MaybeCreateStmtWithCleanups().
void Sema::clearDelayedTypo | ( | TypoExpr * | TE | ) |
Clears the state of the given TypoExpr.
Definition at line 5374 of file SemaLookup.cpp.
void Sema::CodeCompleteAfterIf | ( | Scope * | S | ) |
Definition at line 5270 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteAvailabilityPlatformName | ( | ) |
Definition at line 8772 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteBracketDeclarator | ( | Scope * | S | ) |
Definition at line 4955 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteCase | ( | Scope * | S | ) |
Definition at line 4959 of file SemaCodeComplete.cpp.
References clang::Type::castAs(), clang::SwitchStmt::getCond(), clang::EnumDecl::getDefinition(), clang::CaseStmt::getLHS(), clang::SwitchCase::getNextSwitchCase(), clang::SwitchStmt::getSwitchCaseList(), clang::Expr::getType(), clang::Expr::IgnoreImplicit(), clang::Expr::IgnoreParenCasts(), clang::Sema::CodeCompleteExpressionData::IntegralConstantExpression, and clang::Type::isEnumeralType().
void Sema::CodeCompleteConstructorInitializer | ( | Decl * | Constructor, |
ArrayRef< CXXCtorInitializer *> | Initializers | ||
) |
Definition at line 5557 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteDeclSpec | ( | Scope * | S, |
DeclSpec & | DS, | ||
bool | AllowNonIdentifiers, | ||
bool | AllowNestedNameSpecifiers | ||
) |
Definition at line 4146 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteExpression | ( | Scope * | S, |
const CodeCompleteExpressionData & | Data | ||
) |
Perform code-completion in an expression context when we know what type we're looking for.
Definition at line 4328 of file SemaCodeComplete.cpp.
Referenced by clang::Parser::ParseAssignmentExpression().
void Sema::CodeCompleteExpression | ( | Scope * | S, |
QualType | PreferredType, | ||
bool | IsParenthesized = false |
||
) |
Definition at line 4399 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteFunctionQualifiers | ( | DeclSpec & | DS, |
Declarator & | D, | ||
const VirtSpecifiers * | VS = nullptr |
||
) |
Definition at line 4933 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteIncludedFile | ( | llvm::StringRef | Dir, |
bool | IsAngled | ||
) |
Definition at line 8638 of file SemaCodeComplete.cpp.
Definition at line 5255 of file SemaCodeComplete.cpp.
References clang::ValueDecl::getType(), clang::Sema::CodeCompleteExpressionData::IgnoreDecls, and clang::Sema::CodeCompleteExpressionData::PreferredType.
void Sema::CodeCompleteInPreprocessorConditionalExclusion | ( | Scope * | S | ) |
Definition at line 8567 of file SemaCodeComplete.cpp.
References clang::Scope::getFnParent(), PCC_Namespace, and PCC_RecoveryInFunction.
void Sema::CodeCompleteLambdaIntroducer | ( | Scope * | S, |
LambdaIntroducer & | Intro, | ||
bool | AfterAmpersand | ||
) |
Definition at line 5717 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteMemberReferenceExpr | ( | Scope * | S, |
Expr * | Base, | ||
Expr * | OtherOpBase, | ||
SourceLocation | OpLoc, | ||
bool | IsArrow, | ||
bool | IsBaseExprStatement, | ||
QualType | PreferredType | ||
) |
Definition at line 4692 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_ArrowMemberAccess, clang::CodeCompletionContext::CCC_DotMemberAccess, clang::CodeCompletionContext::CCC_ObjCPropertyAccess, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Type::getPointeeType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isObjCObjectOrInterfaceType(), clang::Type::isObjCObjectPointerType(), and clang::CodeCompletionContext::setPreferredType().
void Sema::CodeCompleteModuleImport | ( | SourceLocation | ImportLoc, |
ModuleIdPath | Path | ||
) |
Definition at line 4005 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteNamespaceAliasDecl | ( | Scope * | S | ) |
Definition at line 5507 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteNamespaceDecl | ( | Scope * | S | ) |
Definition at line 5459 of file SemaCodeComplete.cpp.
References clang::Scope::getEntity(), and clang::Scope::getParent().
void Sema::CodeCompleteNaturalLanguage | ( | ) |
Definition at line 8766 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_NaturalLanguage, and HandleCodeCompleteResults().
void Sema::CodeCompleteObjCAtDirective | ( | Scope * | S | ) |
Definition at line 5856 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCAtExpression | ( | Scope * | S | ) |
Definition at line 6016 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCAtStatement | ( | Scope * | S | ) |
Definition at line 6004 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCAtVisibility | ( | Scope * | S | ) |
Definition at line 5993 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCClassMessage | ( | Scope * | S, |
ParsedType | Receiver, | ||
ArrayRef< IdentifierInfo *> | SelIdents, | ||
bool | AtArgumentExpression, | ||
bool | IsSuper = false |
||
) |
Definition at line 6801 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCClassPropertyRefExpr | ( | Scope * | S, |
IdentifierInfo & | ClassName, | ||
SourceLocation | ClassNameLoc, | ||
bool | IsBaseExprStatement | ||
) |
Definition at line 4833 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_ObjCPropertyAccess.
void Sema::CodeCompleteObjCForCollection | ( | Scope * | S, |
DeclGroupPtrTy | IterationVar | ||
) |
Definition at line 6993 of file SemaCodeComplete.cpp.
References clang::DeclGroupRef::begin(), clang::DeclGroupRef::end(), End, clang::OpaquePtr< PtrTy >::get(), clang::OpaquePtr< PtrTy >::getAsOpaquePtr(), clang::Sema::CodeCompleteExpressionData::IgnoreDecls, and clang::Sema::CodeCompleteExpressionData::ObjCCollection.
void Sema::CodeCompleteObjCImplementationCategory | ( | Scope * | S, |
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassNameLoc | ||
) |
Definition at line 7245 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCImplementationDecl | ( | Scope * | S | ) |
Definition at line 7192 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCInstanceMessage | ( | Scope * | S, |
Expr * | Receiver, | ||
ArrayRef< IdentifierInfo *> | SelIdents, | ||
bool | AtArgumentExpression, | ||
ObjCInterfaceDecl * | Super = nullptr |
||
) |
Definition at line 6836 of file SemaCodeComplete.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
void Sema::CodeCompleteObjCInterfaceCategory | ( | Scope * | S, |
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassNameLoc | ||
) |
Definition at line 7210 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCInterfaceDecl | ( | Scope * | S | ) |
Definition at line 7149 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCMessageReceiver | ( | Scope * | S | ) |
Definition at line 6594 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCMethodDecl | ( | Scope * | S, |
Optional< bool > | IsInstanceMethod, | ||
ParsedType | ReturnType | ||
) |
Definition at line 8151 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_Other, FindImplementableMethods(), clang::Scope::getEntity(), HandleCodeCompleteResults(), and clang::DeclContext::isObjCContainer().
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::CodeCompleteObjCMethodDeclSelector | ( | Scope * | S, |
bool | IsInstanceMethod, | ||
bool | AtParameterName, | ||
ParsedType | ReturnType, | ||
ArrayRef< IdentifierInfo *> | SelIdents | ||
) |
Definition at line 8324 of file SemaCodeComplete.cpp.
References clang::Selector::isNull().
void Sema::CodeCompleteObjCPassingType | ( | Scope * | S, |
ObjCDeclSpec & | DS, | ||
bool | IsParameter | ||
) |
Definition at line 6329 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCPropertyDefinition | ( | Scope * | S | ) |
Definition at line 7286 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_Other.
void Sema::CodeCompleteObjCPropertyFlags | ( | Scope * | S, |
ObjCDeclSpec & | ODS | ||
) |
Definition at line 6058 of file SemaCodeComplete.cpp.
References clang::ObjCDeclSpec::getPropertyAttributes().
void Sema::CodeCompleteObjCPropertyGetter | ( | Scope * | S | ) |
Definition at line 6276 of file SemaCodeComplete.cpp.
References Category.
void Sema::CodeCompleteObjCPropertySetter | ( | Scope * | S | ) |
Definition at line 6302 of file SemaCodeComplete.cpp.
References Category.
void Sema::CodeCompleteObjCPropertySynthesizeIvar | ( | Scope * | S, |
IdentifierInfo * | PropertyName | ||
) |
Definition at line 7323 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCProtocolDecl | ( | Scope * | S | ) |
Definition at line 7111 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCProtocolReferences | ( | ArrayRef< IdentifierLocPair > | Protocols | ) |
Definition at line 7084 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCSelector | ( | Scope * | S, |
ArrayRef< IdentifierInfo *> | SelIdents | ||
) |
Definition at line 7009 of file SemaCodeComplete.cpp.
References clang::Selector::isNull().
void Sema::CodeCompleteObjCSuperclass | ( | Scope * | S, |
IdentifierInfo * | ClassName, | ||
SourceLocation | ClassNameLoc | ||
) |
Definition at line 7167 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteObjCSuperMessage | ( | Scope * | S, |
SourceLocation | SuperLoc, | ||
ArrayRef< IdentifierInfo *> | SelIdents, | ||
bool | AtArgumentExpression | ||
) |
Definition at line 6631 of file SemaCodeComplete.cpp.
References clang::ObjCInterfaceDecl::getSuperClass().
void Sema::CodeCompleteOperatorName | ( | Scope * | S | ) |
Definition at line 5524 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteOrdinaryName | ( | Scope * | S, |
ParserCompletionContext | CompletionContext | ||
) |
Definition at line 4053 of file SemaCodeComplete.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::CodeCompletePostfixExpression | ( | Scope * | S, |
ExprResult | LHS, | ||
QualType | PreferredType | ||
) |
Definition at line 4405 of file SemaCodeComplete.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
void Sema::CodeCompletePreprocessorDirective | ( | bool | InConditional | ) |
Definition at line 8409 of file SemaCodeComplete.cpp.
void Sema::CodeCompletePreprocessorExpression | ( | ) |
Definition at line 8599 of file SemaCodeComplete.cpp.
void Sema::CodeCompletePreprocessorMacroArgument | ( | Scope * | S, |
IdentifierInfo * | Macro, | ||
MacroInfo * | MacroInfo, | ||
unsigned | Argument | ||
) |
Definition at line 8624 of file SemaCodeComplete.cpp.
void Sema::CodeCompletePreprocessorMacroName | ( | bool | IsDefinition | ) |
Definition at line 8572 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteQualifiedId | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
bool | EnteringContext, | ||
QualType | BaseType, | ||
QualType | PreferredType | ||
) |
Definition at line 5329 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_Symbol, clang::Scope::getEntity(), HandleCodeCompleteResults(), clang::CXXScopeSpec::isEmpty(), clang::CXXScopeSpec::isInvalid(), clang::QualType::isNull(), LookupVisibleDecls(), and clang::CodeCompletionContext::setCXXScopeSpecifier().
void Sema::CodeCompleteTag | ( | Scope * | S, |
unsigned | TagSpec | ||
) |
Definition at line 4857 of file SemaCodeComplete.cpp.
References clang::CodeCompletionContext::CCC_ClassOrStructTag, clang::CodeCompletionContext::CCC_EnumTag, clang::CodeCompletionContext::CCC_Other, clang::CodeCompletionContext::CCC_UnionTag, ContextKind, clang::DeclSpec::TST_class, clang::DeclSpec::TST_enum, clang::DeclSpec::TST_interface, clang::DeclSpec::TST_struct, and clang::DeclSpec::TST_union.
void Sema::CodeCompleteTypeQualifiers | ( | DeclSpec & | DS | ) |
Definition at line 4922 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteUsing | ( | Scope * | S | ) |
Definition at line 5410 of file SemaCodeComplete.cpp.
void Sema::CodeCompleteUsingDirective | ( | Scope * | S | ) |
Definition at line 5439 of file SemaCodeComplete.cpp.
void Sema::CollectIvarsToConstructOrDestruct | ( | ObjCInterfaceDecl * | OI, |
SmallVectorImpl< ObjCIvarDecl *> & | Ivars | ||
) |
CollectIvarsToConstructOrDestruct - Collect those ivars which require initialization.
Definition at line 4957 of file SemaDeclObjC.cpp.
References clang::ObjCInterfaceDecl::all_declared_ivar_begin(), clang::ASTContext::getBaseElementType(), clang::ObjCIvarDecl::getNextIvar(), and clang::Type::isRecordType().
bool Sema::CollectMultipleMethodsInGlobalPool | ( | Selector | Sel, |
SmallVectorImpl< ObjCMethodDecl *> & | Methods, | ||
bool | InstanceFirst, | ||
bool | CheckTheOther, | ||
const ObjCObjectType * | TypeBound = nullptr |
||
) |
We first select the type of the method: Instance or Factory, then collect all methods with that type.
Definition at line 3473 of file SemaDeclObjC.cpp.
References FilterMethodsByTypeBound(), clang::ObjCMethodList::getNext(), MethodPool, and ReadMethodPool().
void Sema::collectUnexpandedParameterPacks | ( | TemplateArgument | Arg, |
SmallVectorImpl< UnexpandedParameterPack > & | Unexpanded | ||
) |
Collect the set of unexpanded parameter packs within the given template argument.
Arg | The template argument that will be traversed to find unexpanded parameter packs. |
Definition at line 477 of file SemaTemplateVariadic.cpp.
Referenced by SubstBaseSpecifiers(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
void Sema::collectUnexpandedParameterPacks | ( | TemplateArgumentLoc | Arg, |
SmallVectorImpl< UnexpandedParameterPack > & | Unexpanded | ||
) |
Collect the set of unexpanded parameter packs within the given template argument.
Arg | The template argument that will be traversed to find unexpanded parameter packs. |
Definition at line 483 of file SemaTemplateVariadic.cpp.
void Sema::collectUnexpandedParameterPacks | ( | QualType | T, |
SmallVectorImpl< UnexpandedParameterPack > & | Unexpanded | ||
) |
Collect the set of unexpanded parameter packs within the given type.
T | The type that will be traversed to find unexpanded parameter packs. |
Definition at line 489 of file SemaTemplateVariadic.cpp.
void Sema::collectUnexpandedParameterPacks | ( | TypeLoc | TL, |
SmallVectorImpl< UnexpandedParameterPack > & | Unexpanded | ||
) |
Collect the set of unexpanded parameter packs within the given type.
TL | The type that will be traversed to find unexpanded parameter packs. |
Definition at line 494 of file SemaTemplateVariadic.cpp.
void Sema::collectUnexpandedParameterPacks | ( | NestedNameSpecifierLoc | NNS, |
SmallVectorImpl< UnexpandedParameterPack > & | Unexpanded | ||
) |
Collect the set of unexpanded parameter packs within the given nested-name-specifier.
NNS | The nested-name-specifier that will be traversed to find unexpanded parameter packs. |
Definition at line 499 of file SemaTemplateVariadic.cpp.
void Sema::collectUnexpandedParameterPacks | ( | const DeclarationNameInfo & | NameInfo, |
SmallVectorImpl< UnexpandedParameterPack > & | Unexpanded | ||
) |
Collect the set of unexpanded parameter packs within the given name.
NameInfo | The name that will be traversed to find unexpanded parameter packs. |
Definition at line 506 of file SemaTemplateVariadic.cpp.
Sema::ReferenceCompareResult Sema::CompareReferenceRelationship | ( | SourceLocation | Loc, |
QualType | OrigT1, | ||
QualType | OrigT2, | ||
bool & | DerivedToBase, | ||
bool & | ObjCConversion, | ||
bool & | ObjCLifetimeConversion | ||
) |
CompareReferenceRelationship - Compare the two types T1 and T2 to determine whether they are reference-related, reference-compatible, reference-compatible with added qualification, or incompatible, for use in C++ initialization by reference (C++ [dcl.ref.init]p4).
Neither type can be a reference type, and the first type (T1) is the pointee type of the reference type being initialized.
Definition at line 4300 of file SemaOverload.cpp.
References clang::Type::isReferenceType().
Referenced by CXXCheckConditionalOperands(), FindConversionForRefInit(), TryListConversion(), TryLValueToRValueCast(), TryReferenceInit(), TryReferenceInitializationCore(), TryReferenceListInitialization(), and TryRefInitWithConversionFunction().
bool Sema::CompleteConstructorCall | ( | CXXConstructorDecl * | Constructor, |
MultiExprArg | ArgsPtr, | ||
SourceLocation | Loc, | ||
SmallVectorImpl< Expr *> & | ConvertedArgs, | ||
bool | AllowExplicit = false , |
||
bool | IsListInitialization = false |
||
) |
Given a constructor and the set of arguments provided for the constructor, convert the arguments and add any required default arguments to form a proper call to this constructor.
Definition at line 13205 of file SemaDeclCXX.cpp.
References clang::Type::getAs(), clang::FunctionProtoType::getNumParams(), clang::ValueDecl::getType(), and clang::FunctionProtoType::isVariadic().
Referenced by CopyObject(), clang::InitializationSequence::Perform(), PerformConstructorInitialization(), and PerformImplicitConversion().
void Sema::completeExprArrayBound | ( | Expr * | E | ) |
Definition at line 7730 of file SemaType.cpp.
References clang::Expr::getExprLoc(), clang::Expr::IgnoreParens(), clang::isTemplateInstantiation(), clang::Expr::setType(), and clang::TSK_ImplicitInstantiation.
Referenced by AdjustFunctionParmAndArgTypesForDeduction().
void Sema::CompleteMemberSpecialization | ( | NamedDecl * | Member, |
LookupResult & | Previous | ||
) |
Definition at line 8786 of file SemaTemplate.cpp.
References completeMemberSpecializationImpl(), clang::Decl::getCanonicalDecl(), and clang::Decl::getLocation().
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
VarTemplateSpecializationDecl * Sema::CompleteVarTemplateSpecializationDecl | ( | VarTemplateSpecializationDecl * | VarSpec, |
VarDecl * | PatternDecl, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Instantiates a variable template specialization by completing it with appropriate type information and initializer.
Definition at line 4374 of file SemaTemplateInstantiateDecl.cpp.
References clang::NamedDecl::getDeclName(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::DeclaratorDecl::getTypeSpecStartLoc(), clang::VarDecl::isThisDeclarationADefinition(), clang::VarTemplateSpecializationDecl::setCompleteDefinition(), and clang::ValueDecl::setType().
DeclContext * Sema::computeDeclContext | ( | QualType | T | ) |
Compute the DeclContext that is associated with the given type.
T | the type for which we are attempting to find a DeclContext. |
Definition at line 53 of file SemaCXXScopeSpec.cpp.
References CurContext, clang::Type::getAs(), getCurrentInstantiationOf(), and clang::Type::isDependentType().
Referenced by ActOnPseudoDestructorExpr(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), LookupMemberExprInRecord(), clang::TreeTransform< Derived >::RebuildDependentNameType(), TryNamespaceTypoCorrection(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
DeclContext * Sema::computeDeclContext | ( | const CXXScopeSpec & | SS, |
bool | EnteringContext = false |
||
) |
Compute the DeclContext that is associated with the given scope specifier.
SS | the C++ scope specifier as it appears in the source |
EnteringContext | when true, we will be entering the context of this scope specifier, so we can retrieve the declaration context of a class template or class template partial specialization even if it is not the current instantiation. |
SS
, or NULL if the declaration context cannot be computed (e.g., because it is dependent and not the current instantiation). Definition at line 74 of file SemaCXXScopeSpec.cpp.
References Context, diagnoseMissingImport(), clang::Type::getAs(), clang::NestedNameSpecifier::getAsNamespace(), clang::NestedNameSpecifier::getAsNamespaceAlias(), clang::NestedNameSpecifier::getAsRecordDecl(), clang::NestedNameSpecifier::getAsType(), clang::ASTContext::getCanonicalType(), getCurrentInstantiationOf(), clang::TagType::getDecl(), clang::NestedNameSpecifier::getKind(), clang::CXXScopeSpec::getLastQualifierNameLoc(), clang::NamespaceAliasDecl::getNamespace(), clang::CXXScopeSpec::getScopeRep(), clang::ASTContext::getTranslationUnitDecl(), clang::NestedNameSpecifier::Global, clang::ASTContext::hasSameType(), hasVisibleDeclaration(), clang::NestedNameSpecifier::Identifier, clang::NestedNameSpecifier::isDependent(), clang::CXXScopeSpec::isInvalid(), clang::CXXScopeSpec::isSet(), isSFINAEContext(), clang::NestedNameSpecifier::Namespace, clang::NestedNameSpecifier::NamespaceAlias, PartialSpecialization, clang::NestedNameSpecifier::Super, clang::NestedNameSpecifier::TypeSpec, and clang::NestedNameSpecifier::TypeSpecWithTemplate.
ImplicitExceptionSpecification clang::Sema::ComputeDefaultedCopyAssignmentExceptionSpec | ( | CXXMethodDecl * | MD | ) |
Determine what sort of exception specification a defaulted copy assignment operator of a class will have, and whether the parameter will be const.
ImplicitExceptionSpecification clang::Sema::ComputeDefaultedCopyCtorExceptionSpec | ( | CXXMethodDecl * | MD | ) |
Determine what sort of exception specification a defaulted default constructor of a class will have, and whether the parameter will be const.
ImplicitExceptionSpecification clang::Sema::ComputeDefaultedDefaultCtorExceptionSpec | ( | SourceLocation | Loc, |
CXXMethodDecl * | MD | ||
) |
Determine what sort of exception specification a defaulted copy constructor of a class will have.
ImplicitExceptionSpecification clang::Sema::ComputeDefaultedDtorExceptionSpec | ( | CXXMethodDecl * | MD | ) |
Determine what sort of exception specification a defaulted destructor of a class will have.
ImplicitExceptionSpecification clang::Sema::ComputeDefaultedMoveAssignmentExceptionSpec | ( | CXXMethodDecl * | MD | ) |
Determine what sort of exception specification a defaulted move assignment operator of a class will have.
ImplicitExceptionSpecification clang::Sema::ComputeDefaultedMoveCtorExceptionSpec | ( | CXXMethodDecl * | MD | ) |
Determine what sort of exception specification a defaulted move constructor of a class will have.
ImplicitExceptionSpecification clang::Sema::ComputeInheritingCtorExceptionSpec | ( | SourceLocation | Loc, |
CXXConstructorDecl * | CD | ||
) |
Determine what sort of exception specification an inheriting constructor of a class will have.
void Sema::computeNRVO | ( | Stmt * | Body, |
sema::FunctionScopeInfo * | Scope | ||
) |
Given the set of return statements within a function body, compute the variables that are subject to the named return value optimization.
Each of the variables that is subject to the named return value optimization will be marked as NRVO variables in the AST, and any return statement that has a marked NRVO variable as its NRVO candidate can use the named return value optimization.
This function applies a very simplistic algorithm for NRVO: if every return statement in the scope of a variable has the same NRVO candidate, that candidate is an NRVO variable.
Definition at line 13460 of file SemaDecl.cpp.
References clang::sema::FunctionScopeInfo::Returns.
|
inlinestatic |
Definition at line 10275 of file Sema.h.
Referenced by ActOnConditionVariable(), and clang::TreeTransform< Derived >::TransformCondition().
bool Sema::containsUnexpandedParameterPacks | ( | Declarator & | D | ) |
Determine whether the given declarator contains any unexpanded parameter packs.
This routine is used by the parser to disambiguate function declarators with an ellipsis prior to the ')', e.g.,
To determine whether we have an (unnamed) function parameter pack or a variadic function.
Definition at line 821 of file SemaTemplateVariadic.cpp.
References clang::DeclaratorChunk::Arr, clang::DeclaratorChunk::Array, clang::DeclaratorChunk::BlockPointer, clang::NestedNameSpecifier::containsUnexpandedParameterPack(), clang::Expr::containsUnexpandedParameterPack(), clang::Type::containsUnexpandedParameterPack(), clang::EST_Dynamic, clang::DeclaratorChunk::FunctionTypeInfo::Exceptions, clang::DeclaratorChunk::Fun, clang::DeclaratorChunk::Function, clang::OpaquePtr< PtrTy >::get(), clang::TypoCorrection::getCorrectionDecl(), clang::Declarator::getDeclSpec(), clang::DeclaratorChunk::FunctionTypeInfo::getExceptionSpecType(), clang::DeclaratorChunk::FunctionTypeInfo::getNumExceptions(), clang::Declarator::getNumTypeObjects(), clang::DeclSpec::getRepAsExpr(), clang::DeclSpec::getRepAsType(), clang::CXXScopeSpec::getScopeRep(), clang::DeclaratorChunk::FunctionTypeInfo::getTrailingReturnType(), clang::ValueDecl::getType(), clang::Declarator::getTypeObject(), clang::DeclSpec::getTypeSpecType(), clang::DeclaratorChunk::FunctionTypeInfo::hasTrailingReturnType(), i, clang::isComputedNoexcept(), clang::QualType::isNull(), clang::Decl::isParameterPack(), clang::DeclaratorChunk::Kind, clang::DeclaratorChunk::Mem, clang::DeclaratorChunk::MemberPointer, clang::DeclaratorChunk::FunctionTypeInfo::NoexceptExpr, clang::DeclaratorChunk::ArrayTypeInfo::NumElts, clang::DeclaratorChunk::FunctionTypeInfo::NumParams, clang::DeclaratorChunk::ParamInfo::Param, clang::DeclaratorChunk::FunctionTypeInfo::Params, clang::DeclaratorChunk::Paren, clang::DeclaratorChunk::Pipe, clang::DeclaratorChunk::Pointer, clang::DeclaratorChunk::Reference, clang::DeclaratorChunk::MemberPointerTypeInfo::Scope(), clang::TST_Accum, clang::TST_atomic, clang::TST_auto, clang::TST_auto_type, clang::TST_bool, clang::TST_char, clang::TST_char16, clang::TST_char32, clang::TST_char8, clang::TST_class, clang::TST_decimal128, clang::TST_decimal32, clang::TST_decimal64, clang::TST_decltype, clang::TST_decltype_auto, clang::TST_double, clang::TST_enum, clang::TST_error, clang::TST_float, clang::TST_float128, clang::TST_Float16, clang::TST_Fract, clang::TST_half, clang::TST_int, clang::TST_int128, clang::TST_interface, clang::TST_struct, clang::TST_typename, clang::TST_typeofExpr, clang::TST_typeofType, clang::TST_underlyingType, clang::TST_union, clang::TST_unknown_anytype, clang::TST_unspecified, clang::TST_void, clang::TST_wchar, and clang::DeclaratorChunk::TypeAndRange::Ty.
bool Sema::ConversionToObjCStringLiteralCheck | ( | QualType | DstType, |
Expr *& | SrcExpr, | ||
bool | Diagnose = true |
||
) |
Definition at line 14222 of file SemaExpr.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::Type::getAs(), clang::StringLiteral::getBeginLoc(), clang::NamedDecl::getIdentifier(), clang::ObjCObjectPointerType::getInterfaceDecl(), clang::Expr::IgnoreParenImpCasts(), clang::StringLiteral::isAscii(), clang::ObjCObjectPointerType::isObjCIdType(), and clang::IdentifierInfo::isStr().
Referenced by clang::InitializationSequence::InitializeFrom().
bool Sema::ConvertArgumentsForCall | ( | CallExpr * | Call, |
Expr * | Fn, | ||
FunctionDecl * | FDecl, | ||
const FunctionProtoType * | Proto, | ||
ArrayRef< Expr *> | Args, | ||
SourceLocation | RParenLoc, | ||
bool | IsExecConfig = false |
||
) |
ConvertArgumentsForCall - Converts the arguments specified in Args/NumArgs to the parameter types of the function FDecl with function prototype Proto.
Call is the call expression itself, and Fn is the function expression. For a C++ member function, this routine does not attempt to convert the object argument. Returns true if the call is ill-formed.
Definition at line 4991 of file SemaExpr.cpp.
References clang::FunctionDecl::getBuiltinID().
Sema::DeclGroupPtrTy Sema::ConvertDeclToDeclGroup | ( | Decl * | Ptr, |
Decl * | OwnedType = nullptr |
||
) |
Definition at line 54 of file SemaDecl.cpp.
References clang::DeclGroupRef::Create().
Referenced by clang::CoroutineStmtBuilder::buildDependentStatements(), noteMemberDeclaredHere(), and clang::Parser::ParseTopLevelDecl().
void clang::Sema::ConvertIntegerToTypeWarnOnOverflow | ( | llvm::APSInt & | OldVal, |
unsigned | NewWidth, | ||
bool | NewSign, | ||
SourceLocation | Loc, | ||
unsigned | DiagID | ||
) |
ConvertIntegerToTypeWarnOnOverflow - Convert the specified APInt to have the specified width and sign.
If an overflow occurs, detect it and emit the specified diagnostic.
ExprResult Sema::CorrectDelayedTyposInExpr | ( | Expr * | E, |
VarDecl * | InitDecl = nullptr , |
||
llvm::function_ref< ExprResult(Expr *)> | Filter = [](Expr *E) -> ExprResult { return E; } |
||
) |
Process any TypoExprs in the given Expr and its children, generating diagnostics as appropriate and returning a new Expr if there were typos that were all successfully corrected and ExprError if one or more typos could not be corrected.
E | The Expr to check for TypoExprs. |
InitDecl | A VarDecl to avoid because the Expr being corrected is its initializer. |
Filter | A function applied to a newly rebuilt Expr to determine if it is an acceptable/usable result from a single combination of typo corrections. As long as the filter returns ExprError, different combinations of corrections will be tried until all are exhausted. |
Definition at line 7771 of file SemaExprCXX.cpp.
References ExprEvalContexts, clang::tooling::Filter, clang::Expr::isInstantiationDependent(), clang::Expr::isTypeDependent(), clang::Expr::isValueDependent(), and clang::Result.
Referenced by ActOnCXXTypeConstructExpr(), ActOnFinishFullExpr(), checkArgsForPlaceholders(), CheckArrayDesignatorSyntax(), CorrectDelayedTyposInBinOp(), FinishForRangeVarDecl(), and clang::Parser::ParseConstraintExpression().
|
inline |
Definition at line 3487 of file Sema.h.
References clang::tooling::Filter.
|
inline |
Definition at line 3493 of file Sema.h.
References clang::tooling::Filter, clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
|
inline |
Definition at line 3500 of file Sema.h.
References clang::tooling::Filter, Id, and IsStatic.
TypoCorrection Sema::CorrectTypo | ( | const DeclarationNameInfo & | TypoName, |
Sema::LookupNameKind | LookupKind, | ||
Scope * | S, | ||
CXXScopeSpec * | SS, | ||
CorrectionCandidateCallback & | CCC, | ||
CorrectTypoKind | Mode, | ||
DeclContext * | MemberContext = nullptr , |
||
bool | EnteringContext = false , |
||
const ObjCObjectPointerType * | OPT = nullptr , |
||
bool | RecordFailure = true |
||
) |
Try to "correct" a typo in the source code by finding visible declarations whose names are similar to the name that was present in the source code.
TypoName | the DeclarationNameInfo structure that contains the name that was present in the source code along with its location. |
LookupKind | the name-lookup criteria used to search for the name. |
S | the scope in which name lookup occurs. |
SS | the nested-name-specifier that precedes the name we're looking for, if present. |
CCC | A CorrectionCandidateCallback object that provides further validation of typo correction candidates. It also provides flags for determining the set of keywords permitted. |
MemberContext | if non-NULL, the context in which to look for a member access expression. |
EnteringContext | whether we're entering the context described by the nested-name-specifier SS. |
OPT | when non-NULL, the search for visible declarations will also walk the protocols in the qualified interfaces of OPT . |
TypoCorrection
containing the corrected name if the typo along with information such as the NamedDecl
where the corrected name was declared, and any additional NestedNameSpecifier
needed to access it (C++ only). The TypoCorrection
is empty if there is no correction. Definition at line 4854 of file SemaLookup.cpp.
References clang::CorrectionCandidateCallback::WantObjCSuper, and clang::CorrectionCandidateCallback::WantRemainingKeywords.
Referenced by ActOnStartClassImplementation(), FindProtocolDeclaration(), LookupMemberExpr(), and TryNamespaceTypoCorrection().
TypoExpr * Sema::CorrectTypoDelayed | ( | const DeclarationNameInfo & | TypoName, |
Sema::LookupNameKind | LookupKind, | ||
Scope * | S, | ||
CXXScopeSpec * | SS, | ||
CorrectionCandidateCallback & | CCC, | ||
TypoDiagnosticGenerator | TDG, | ||
TypoRecoveryCallback | TRC, | ||
CorrectTypoKind | Mode, | ||
DeclContext * | MemberContext = nullptr , |
||
bool | EnteringContext = false , |
||
const ObjCObjectPointerType * | OPT = nullptr |
||
) |
Try to "correct" a typo in the source code by finding visible declarations whose names are similar to the name that was present in the source code.
TypoName | the DeclarationNameInfo structure that contains the name that was present in the source code along with its location. |
LookupKind | the name-lookup criteria used to search for the name. |
S | the scope in which name lookup occurs. |
SS | the nested-name-specifier that precedes the name we're looking for, if present. |
CCC | A CorrectionCandidateCallback object that provides further validation of typo correction candidates. It also provides flags for determining the set of keywords permitted. |
TDG | A TypoDiagnosticGenerator functor that will be used to print diagnostics when the actual typo correction is attempted. |
TRC | A TypoRecoveryCallback functor that will be used to build an Expr from a typo correction candidate. |
MemberContext | if non-NULL, the context in which to look for a member access expression. |
EnteringContext | whether we're entering the context described by the nested-name-specifier SS. |
OPT | when non-NULL, the search for visible declarations will also walk the protocols in the qualified interfaces of OPT . |
TypoExpr
that will later be replaced in the AST with an Expr representing the result of performing typo correction, or nullptr if typo correction is not possible. If nullptr is returned, no diagnostics will be emitted and it is the responsibility of the caller to emit any that are needed. Definition at line 4989 of file SemaLookup.cpp.
ExprResult Sema::CreateBuiltinArraySubscriptExpr | ( | Expr * | Base, |
SourceLocation | LLoc, | ||
Expr * | Idx, | ||
SourceLocation | RLoc | ||
) |
Definition at line 4579 of file SemaExpr.cpp.
Referenced by checkArrayLikeDecomposition().
ExprResult Sema::CreateBuiltinBinOp | ( | SourceLocation | OpLoc, |
BinaryOperatorKind | Opc, | ||
Expr * | LHSExpr, | ||
Expr * | RHSExpr | ||
) |
CreateBuiltinBinOp - Creates a new built-in binary operation with operator Opc
at location TokLoc
.
This routine only supports built-in operations; ActOnBinOp handles overloaded operators.
Definition at line 12452 of file SemaExpr.cpp.
References CheckCommaOperands(), checkObjCPointerIntrospection(), CorrectDelayedTyposInBinOp(), clang::frontend::CPlusPlus, clang::frontend::CPlusPlus11, clang::InitializationKind::CreateDirectList(), Diag(), DiagnoseSelfAssignment(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAsCXXRecordDecl(), clang::Stmt::getBeginLoc(), clang::Stmt::getEndLoc(), clang::Expr::getType(), clang::InitializedEntity::InitializeTemporary(), clang::Type::isAtomicType(), clang::Type::isBlockPointerType(), clang::Type::isImageType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Type::isPipeType(), clang::Type::isSamplerT(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), isVector(), clang::OK_ObjCProperty, clang::OK_Ordinary, RecordModifiableNonNullParam(), and clang::VK_RValue.
Referenced by buildCounterUpdate(), and buildPostUpdate().
ExprResult Sema::CreateBuiltinUnaryOp | ( | SourceLocation | OpLoc, |
UnaryOperatorKind | Opc, | ||
Expr * | InputExpr | ||
) |
Definition at line 13095 of file SemaExpr.cpp.
References CheckIncrementDecrementOperand(), Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::UnaryOperator::isArithmeticOp(), clang::Type::isAtomicType(), clang::Type::isBlockPointerType(), clang::Type::isImageType(), clang::UnaryOperator::isIncrementDecrementOp(), isOverflowingIntegerType(), clang::Type::isPipeType(), clang::Type::isSamplerT(), clang::OK_Ordinary, and clang::VK_RValue.
Referenced by buildCapture(), buildCaptureDecl(), checkComplexDecomposition(), and diagReturnOnAllocFailure().
RecordDecl * Sema::CreateCapturedStmtRecordDecl | ( | CapturedDecl *& | CD, |
SourceLocation | Loc, | ||
unsigned | NumParams | ||
) |
Definition at line 4202 of file SemaStmt.cpp.
References clang::frontend::CPlusPlus, clang::CXXRecordDecl::Create(), clang::DeclContext::getParent(), clang::DeclContext::isFileContext(), clang::DeclContext::isFunctionOrMethod(), and clang::DeclContext::isRecord().
ExprResult Sema::CreateGenericSelectionExpr | ( | SourceLocation | KeyLoc, |
SourceLocation | DefaultLoc, | ||
SourceLocation | RParenLoc, | ||
Expr * | ControllingExpr, | ||
ArrayRef< TypeSourceInfo *> | Types, | ||
ArrayRef< Expr *> | Exprs | ||
) |
Definition at line 1446 of file SemaExpr.cpp.
void Sema::createImplicitModuleImportForErrorRecovery | ( | SourceLocation | Loc, |
Module * | Mod | ||
) |
Create an implicit import of the given module at the given source location, for error recovery, if possible.
This routine is typically used when an entity found by name lookup is actually hidden within a module that we know about but the user has forgotten to import.
Definition at line 502 of file SemaModule.cpp.
References clang::DeclContext::addDecl(), clang::Module::AllVisible, clang::ImportDecl::CreateImplicit(), and clang::Decl::getTranslationUnitDecl().
CXXRecordDecl * Sema::createLambdaClosureType | ( | SourceRange | IntroducerRange, |
TypeSourceInfo * | Info, | ||
bool | KnownDependent, | ||
LambdaCaptureDefault | CaptureDefault | ||
) |
Create a new lambda closure type.
Definition at line 241 of file SemaLambda.cpp.
References clang::CXXRecordDecl::CreateLambda(), getGenericLambdaTemplateParameterList(), clang::DeclContext::getParent(), clang::DeclContext::isFileContext(), clang::DeclContext::isFunctionOrMethod(), and clang::DeclContext::isRecord().
VarDecl * Sema::createLambdaInitCaptureVarDecl | ( | SourceLocation | Loc, |
QualType | InitCaptureType, | ||
SourceLocation | EllipsisLoc, | ||
IdentifierInfo * | Id, | ||
unsigned | InitStyle, | ||
Expr * | Init | ||
) |
Create a dummy variable within the declcontext of the lambda's call operator, for name lookup purposes for a lambda init capture.
CodeGen handles emission of lambda captures, ignoring these dummy variables appropriately.
Definition at line 819 of file SemaLambda.cpp.
MaterializeTemporaryExpr * Sema::CreateMaterializeTemporaryExpr | ( | QualType | T, |
Expr * | Temporary, | ||
bool | BoundToLvalueReference | ||
) |
Definition at line 7327 of file SemaInit.cpp.
Referenced by DiagnoseBadFunctionCast(), getCastAwayConstnessCastKind(), ImpCastExprToType(), clang::InitializationSequence::Perform(), and TryConstCast().
ExprResult Sema::CreateOverloadedArraySubscriptExpr | ( | SourceLocation | LLoc, |
SourceLocation | RLoc, | ||
Expr * | Base, | ||
Expr * | Idx | ||
) |
Definition at line 12770 of file SemaOverload.cpp.
ExprResult Sema::CreateOverloadedBinOp | ( | SourceLocation | OpLoc, |
BinaryOperatorKind | Opc, | ||
const UnresolvedSetImpl & | Fns, | ||
Expr * | LHS, | ||
Expr * | RHS, | ||
bool | PerformADL = true |
||
) |
Create a binary operation that may resolve to an overloaded operator.
OpLoc | The location of the operator itself (e.g., '+'). |
Opc | The BinaryOperatorKind that describes this operator. |
Fns | The set of non-member functions that will be considered by overload resolution. The caller needs to build this set based on the context using, e.g., LookupOverloadedOperatorName() and ArgumentDependentLookup(). This set should not contain any member functions; those will be added by CreateOverloadedBinOp(). |
LHS | Left-hand argument. |
RHS | Right-hand argument. |
Definition at line 12493 of file SemaOverload.cpp.
References clang::BinaryOperator::getOverloadedOperator().
Referenced by BuildOverloadedBinOp().
ExprResult Sema::CreateOverloadedUnaryOp | ( | SourceLocation | OpLoc, |
UnaryOperatorKind | Opc, | ||
const UnresolvedSetImpl & | Fns, | ||
Expr * | Input, | ||
bool | PerformADL = true |
||
) |
Create a unary operation that may resolve to an overloaded operator.
OpLoc | The location of the operator itself (e.g., '*'). |
Opc | The UnaryOperatorKind that describes this operator. |
Fns | The set of non-member functions that will be considered by overload resolution. The caller needs to build this set based on the context using, e.g., LookupOverloadedOperatorName() and ArgumentDependentLookup(). This set should not contain any member functions; those will be added by CreateOverloadedUnaryOp(). |
Input | The input argument. |
Definition at line 12302 of file SemaOverload.cpp.
References clang::UnaryOperator::getOverloadedOperator(), and clang::OO_None.
Referenced by buildOperatorCoawaitCall().
ParsedType Sema::CreateParsedType | ( | QualType | T, |
TypeSourceInfo * | TInfo | ||
) |
Package the given type and TSI into a ParsedType.
Create a LocInfoType to hold the given QualType and TypeSourceInfo.
Definition at line 5796 of file SemaType.cpp.
References clang::Type::getTypeClass(), clang::OpaquePtr< QualType >::make(), and clang::TypeAlignment.
ObjCPropertyDecl * Sema::CreatePropertyDecl | ( | Scope * | S, |
ObjCContainerDecl * | CDecl, | ||
SourceLocation | AtLoc, | ||
SourceLocation | LParenLoc, | ||
FieldDeclarator & | FD, | ||
Selector | GetterSel, | ||
SourceLocation | GetterNameLoc, | ||
Selector | SetterSel, | ||
SourceLocation | SetterNameLoc, | ||
const bool | isReadWrite, | ||
const unsigned | Attributes, | ||
const unsigned | AttributesAsWritten, | ||
QualType | T, | ||
TypeSourceInfo * | TSI, | ||
tok::ObjCKeywordKind | MethodImplKind, | ||
DeclContext * | lexicalDC = nullptr |
||
) |
Called by ActOnProperty and HandlePropertyInClassExtension to handle creating the ObjcPropertyDecl for a category or @interface.
Definition at line 564 of file SemaObjCProperty.cpp.
ExprResult Sema::CreateUnaryExprOrTypeTraitExpr | ( | TypeSourceInfo * | TInfo, |
SourceLocation | OpLoc, | ||
UnaryExprOrTypeTrait | ExprKind, | ||
SourceRange | R | ||
) |
Build a sizeof or alignof expression given a type operand.
Definition at line 4121 of file SemaExpr.cpp.
References captureVariablyModifiedType(), clang::DeclContext::containsDecl(), clang::ExprError(), clang::Type::getAs(), clang::TypeSourceInfo::getType(), clang::if(), clang::Type::isDependentType(), and clang::Type::isVariablyModifiedType().
ExprResult Sema::CreateUnaryExprOrTypeTraitExpr | ( | Expr * | E, |
SourceLocation | OpLoc, | ||
UnaryExprOrTypeTrait | ExprKind | ||
) |
Build a sizeof or alignof expression given an expression operand.
Definition at line 4166 of file SemaExpr.cpp.
References CheckAlignOfExpr(), Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getExprLoc(), clang::Expr::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), isInvalid(), clang::Expr::isTypeDependent(), clang::Type::isVariableArrayType(), clang::Expr::refersToBitField(), clang::UETT_AlignOf, clang::UETT_OpenMPRequiredSimdAlign, clang::UETT_PreferredAlignOf, clang::UETT_SizeOf, and clang::UETT_VecStep.
Sema::DeviceDiagBuilder Sema::CUDADiagIfDeviceCode | ( | SourceLocation | Loc, |
unsigned | DiagID | ||
) |
Creates a DeviceDiagBuilder that emits the diagnostic if the current context is "used as device code".
Example usage:
// Variable-length arrays are not allowed in CUDA device code. if (CUDADiagIfDeviceCode(Loc, diag::err_cuda_vla) << CurrentCUDATarget()) return ExprError(); // Otherwise, continue parsing as normal.
Definition at line 623 of file SemaCUDA.cpp.
References CFT_Device, CFT_Global, CFT_HostDevice, CurContext, CurrentCUDATarget(), getLangOpts(), IsKnownEmitted(), clang::Sema::DeviceDiagBuilder::K_Deferred, clang::Sema::DeviceDiagBuilder::K_Immediate, clang::Sema::DeviceDiagBuilder::K_ImmediateWithCallStack, and clang::Sema::DeviceDiagBuilder::K_Nop.
Referenced by targetDiag().
Sema::DeviceDiagBuilder Sema::CUDADiagIfHostCode | ( | SourceLocation | Loc, |
unsigned | DiagID | ||
) |
Creates a DeviceDiagBuilder that emits the diagnostic if the current context is "used as host code".
Same as CUDADiagIfDeviceCode, with "host" and "device" switched.
Definition at line 650 of file SemaCUDA.cpp.
References CFT_Host, CFT_HostDevice, CurContext, CurrentCUDATarget(), getLangOpts(), IsKnownEmitted(), clang::Sema::DeviceDiagBuilder::K_Deferred, clang::Sema::DeviceDiagBuilder::K_Immediate, clang::Sema::DeviceDiagBuilder::K_ImmediateWithCallStack, and clang::Sema::DeviceDiagBuilder::K_Nop.
Referenced by targetDiag().
void Sema::CUDASetLambdaAttrs | ( | CXXMethodDecl * | Method | ) |
Set device or host device attributes on the given lambda operator() method.
CUDA lambdas declared inside device or global functions inherit the device attribute. Similarly, lambdas inside host device functions become host device themselves.
Definition at line 744 of file SemaCUDA.cpp.
References clang::Decl::addAttr(), CFT_Device, CFT_Global, CFT_HostDevice, Context, CurContext, getLangOpts(), clang::Decl::hasAttr(), IdentifyCUDATarget(), and clang::Target.
|
inline |
Gets the CUDA target for the current context.
Definition at line 10569 of file Sema.h.
Referenced by CUDADiagIfDeviceCode(), and CUDADiagIfHostCode().
QualType Sema::CXXCheckConditionalOperands | ( | ExprResult & | Cond, |
ExprResult & | LHS, | ||
ExprResult & | RHS, | ||
ExprValueKind & | VK, | ||
ExprObjectKind & | OK, | ||
SourceLocation | QuestionLoc | ||
) |
Check the operands of ?: under C++ semantics.
See C++ [expr.cond]. Note that LHS is never null, even for the GNU x ?: y extension. In this case, LHS == Cond. (But they're not aliases.)
Definition at line 5720 of file SemaExprCXX.cpp.
References CheckCXXBooleanCondition(), CheckVectorOperands(), CompareReferenceRelationship(), Context, ConvertForConditional(), DefaultFunctionArrayLvalueConversion(), clang::ASTContext::DependentTy, Diag(), DiagnoseConditionalForNull(), FindCompositeObjCPointerType(), FindCompositePointerType(), FindConditionalOverload(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ASTContext::getCanonicalType(), clang::Expr::getObjectKind(), clang::ASTContext::getQualifiedType(), clang::Expr::getType(), clang::Expr::getValueKind(), clang::ASTContext::hasSameType(), ImpCastExprToType(), clang::InitializedEntity::InitializeTemporary(), clang::Type::isArithmeticType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Type::isRecordType(), clang::Type::isVectorType(), clang::Type::isVoidType(), clang::OK_BitField, clang::OK_Ordinary, PerformCopyInitialization(), PrepareScalarCast(), Ref_Compatible, TryClassUnification(), UsualArithmeticConversions(), clang::VK_RValue, and clang::ASTContext::VoidTy.
void Sema::DeclareGlobalAllocationFunction | ( | DeclarationName | Name, |
QualType | Return, | ||
ArrayRef< QualType > | Params | ||
) |
DeclareGlobalAllocationFunction - Declares a single implicit global allocation function if it doesn't already exist.
Definition at line 2758 of file SemaExprCXX.cpp.
Referenced by DeclareGlobalNewDelete().
void Sema::DeclareGlobalNewDelete | ( | ) |
DeclareGlobalNewDelete - Declare the global forms of operator new and delete.
These are:
Note that the placement and nothrow forms of new are not implicitly declared. Their use requires including <new>.
Definition at line 2655 of file SemaExprCXX.cpp.
References Context, clang::frontend::CPlusPlus11, clang::CXXRecordDecl::Create(), clang::EnumDecl::Create(), clang::ASTContext::DeclarationNames, DeclareGlobalAllocationFunction(), clang::IdentifierTable::get(), clang::DeclarationNameTable::getCXXOperatorName(), clang::Preprocessor::getIdentifierTable(), getLangOpts(), getOrCreateStdNamespace(), clang::ASTContext::getPointerType(), clang::ASTContext::getSizeType(), getStdAlignValT(), getStdBadAlloc(), clang::ASTContext::getTypeDeclType(), GlobalNewDeleteDeclared, PP, clang::Decl::setImplicit(), clang::EnumDecl::setIntegerType(), StdAlignValT, StdBadAlloc, clang::TTK_Class, and clang::ASTContext::VoidTy.
Referenced by FindAllocationFunctions(), and resolveBuiltinNewDeleteOverload().
CXXMethodDecl * Sema::DeclareImplicitCopyAssignment | ( | CXXRecordDecl * | ClassDecl | ) |
Declare the implicit copy assignment operator for the given class.
ClassDecl | The class declaration into which the implicit copy assignment operator will be added. |
Definition at line 11905 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::needsImplicitCopyAssignment().
CXXConstructorDecl * Sema::DeclareImplicitCopyConstructor | ( | CXXRecordDecl * | ClassDecl | ) |
Declare the implicit copy constructor for the given class.
ClassDecl | The class declaration into which the implicit copy constructor will be added. |
Definition at line 12603 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::needsImplicitCopyConstructor().
void Sema::DeclareImplicitDeductionGuides | ( | TemplateDecl * | Template, |
SourceLocation | Loc | ||
) |
Declare implicit deduction guides for a class template if we've not already done so.
Definition at line 2071 of file SemaTemplate.cpp.
References clang::Decl::getDeclContext(), getDefinition(), clang::TemplateDecl::getTemplatedDecl(), clang::DeclContext::isDependentContext(), clang::Sema::InstantiatingTemplate::isInvalid(), and clang::DeclContext::lookup().
CXXConstructorDecl * Sema::DeclareImplicitDefaultConstructor | ( | CXXRecordDecl * | ClassDecl | ) |
Declare the implicit default constructor for the given class.
ClassDecl | The class declaration into which the implicit default constructor will be added. |
Definition at line 11020 of file SemaDeclCXX.cpp.
References defaultedSpecialMemberIsConstexpr(), and clang::CXXRecordDecl::needsImplicitDefaultConstructor().
Referenced by findTrivialSpecialMember().
CXXDestructorDecl * Sema::DeclareImplicitDestructor | ( | CXXRecordDecl * | ClassDecl | ) |
Declare the implicit destructor for the given class.
ClassDecl | The class declaration into which the implicit destructor will be added. |
Definition at line 11301 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::needsImplicitDestructor().
Referenced by findTrivialSpecialMember().
CXXMethodDecl * Sema::DeclareImplicitMoveAssignment | ( | CXXRecordDecl * | ClassDecl | ) |
Declare the implicit move assignment operator for the given class.
ClassDecl | The Class declaration into which the implicit move assignment operator will be added. |
Definition at line 12231 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::needsImplicitMoveAssignment().
CXXConstructorDecl * Sema::DeclareImplicitMoveConstructor | ( | CXXRecordDecl * | ClassDecl | ) |
Declare the implicit move constructor for the given class.
ClassDecl | The Class declaration into which the implicit move constructor will be added. |
Definition at line 12741 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::needsImplicitMoveConstructor().
NamedDecl* clang::Sema::DeclClonePragmaWeak | ( | NamedDecl * | ND, |
IdentifierInfo * | II, | ||
SourceLocation | Loc | ||
) |
void Sema::DecomposeUnqualifiedId | ( | const UnqualifiedId & | Id, |
TemplateArgumentListInfo & | Buffer, | ||
DeclarationNameInfo & | NameInfo, | ||
const TemplateArgumentListInfo *& | TemplateArgs | ||
) |
Decomposes the given name into a DeclarationNameInfo, its location, and possibly a list of template arguments.
If this produces template arguments, it is permitted to call DecomposeTemplateName.
This actually loses a lot of source location information for non-standard name kinds; we should consider preserving that in some way.
Definition at line 1862 of file SemaExpr.cpp.
References clang::OpaquePtr< PtrTy >::get(), clang::UnqualifiedId::getKind(), clang::TemplateIdAnnotation::getTemplateArgs(), clang::IK_TemplateId, clang::TemplateIdAnnotation::LAngleLoc, clang::TemplateIdAnnotation::NumArgs, clang::TemplateIdAnnotation::RAngleLoc, clang::TemplateArgumentListInfo::setLAngleLoc(), clang::TemplateArgumentListInfo::setRAngleLoc(), clang::TemplateIdAnnotation::Template, clang::UnqualifiedId::TemplateId, and clang::TemplateIdAnnotation::TemplateNameLoc.
Sema::DeduceAutoResult Sema::DeduceAutoType | ( | TypeSourceInfo * | AutoType, |
Expr *& | Initializer, | ||
QualType & | Result, | ||
Optional< unsigned > | DependentDeductionDepth = None |
||
) |
Definition at line 4364 of file SemaTemplateDeduction.cpp.
References clang::TypeSourceInfo::getTypeLoc().
Referenced by FinishForRangeVarDecl().
Sema::DeduceAutoResult Sema::DeduceAutoType | ( | TypeLoc | Type, |
Expr *& | Init, | ||
QualType & | Result, | ||
Optional< unsigned > | DependentDeductionDepth = None |
||
) |
Deduce the type for an auto type-specifier (C++11 [dcl.spec.auto]p6)
Note that this is done even if the initializer is dependent. (This is necessary to support partial ordering of templates using 'auto'.) A dependent type will be produced when deducing from a dependent type.
Type | the type pattern using the auto type-specifier. |
Init | the initializer for the variable whose type is to be deduced. |
Result | if type deduction was successful, this will be set to the deduced type. |
DependentDeductionDepth | Set if we should permit deduction in dependent cases. This is necessary for template partial ordering with 'auto' template parameters. The value specified is the template parameter depth at which we should perform 'auto' deduction. |
Definition at line 4410 of file SemaTemplateDeduction.cpp.
References bool, Depth, Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::TypeLoc::getAs(), clang::Type::getAs(), clang::Stmt::getBeginLoc(), clang::TypeLoc::getType(), clang::Expr::getType(), clang::Type::isDependentType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isNonOverloadPlaceholderType(), clang::QualType::isNull(), and clang::Expr::isTypeDependent().
void Sema::deduceClosureReturnType | ( | sema::CapturingScopeInfo & | CSI | ) |
Deduce a block or lambda's return type based on the return statements present in the body.
Definition at line 662 of file SemaLambda.cpp.
References clang::frontend::CPlusPlus14, findCommonEnumForBlockReturns(), clang::sema::CapturingScopeInfo::HasImplicitReturnType, clang::Type::isDependentType(), clang::QualType::isNull(), clang::Type::isUndeducedType(), clang::sema::FunctionScopeInfo::Returns, clang::sema::CapturingScopeInfo::ReturnType, and clang::ASTContext::VoidTy.
bool Sema::DeduceFunctionTypeFromReturnExpr | ( | FunctionDecl * | FD, |
SourceLocation | ReturnLoc, | ||
Expr *& | RetExpr, | ||
AutoType * | AT | ||
) |
Deduce the return type for a function from a returned expression, per C++1y [dcl.spec.auto]p6.
Definition at line 3401 of file SemaStmt.cpp.
References Diag(), clang::Type::getAs(), clang::Expr::getExprLoc(), clang::Stmt::getSourceRange(), clang::TypeLoc::getType(), clang::Expr::getType(), clang::DeducedType::isDeduced(), clang::DeclContext::isDependentContext(), clang::Decl::isInvalidDecl(), and clang::isLambdaConversionOperator().
bool Sema::DeduceReturnType | ( | FunctionDecl * | FD, |
SourceLocation | Loc, | ||
bool | Diagnose = true |
||
) |
Definition at line 4616 of file SemaTemplateDeduction.cpp.
References clang::Type::castAs(), clang::Type::getAs(), clang::FunctionDecl::getDescribedFunctionTemplate(), clang::CXXRecordDecl::getLambdaCallOperator(), clang::FunctionDecl::getReturnType(), clang::FunctionDecl::getTemplateSpecializationArgs(), clang::ValueDecl::getType(), clang::Decl::isInvalidDecl(), clang::isLambdaConversionOperator(), and clang::Type::isUndeducedType().
Referenced by completeFunctionType(), and GetTypeOfFunction().
Sema::TemplateDeductionResult Sema::DeduceTemplateArguments | ( | ClassTemplatePartialSpecializationDecl * | Partial, |
const TemplateArgumentList & | TemplateArgs, | ||
sema::TemplateDeductionInfo & | Info | ||
) |
Perform template argument deduction to determine whether the given template arguments match the given class template partial specialization per C++ [temp.class.spec.match].
Definition at line 2839 of file SemaTemplateDeduction.cpp.
References DeduceTemplateArguments(), FinishTemplateArgumentDeduction(), clang::ClassTemplateSpecializationDecl::getTemplateArgs(), clang::ClassTemplatePartialSpecializationDecl::getTemplateParameters(), clang::Sema::SFINAETrap::hasErrorOccurred(), clang::Decl::isInvalidDecl(), clang::TemplateParameterList::size(), TDK_SubstitutionFailure, and Unevaluated.
Referenced by LookupDirect(), and ResolveOverloadForDeduction().
Sema::TemplateDeductionResult Sema::DeduceTemplateArguments | ( | VarTemplatePartialSpecializationDecl * | Partial, |
const TemplateArgumentList & | TemplateArgs, | ||
sema::TemplateDeductionInfo & | Info | ||
) |
Perform template argument deduction to determine whether the given template arguments match the given variable template partial specialization per C++ [temp.class.spec.match].
Definition at line 2882 of file SemaTemplateDeduction.cpp.
References DeduceTemplateArguments(), FinishTemplateArgumentDeduction(), clang::VarTemplateSpecializationDecl::getTemplateArgs(), clang::VarTemplatePartialSpecializationDecl::getTemplateParameters(), clang::Sema::SFINAETrap::hasErrorOccurred(), clang::Decl::isInvalidDecl(), clang::TemplateParameterList::size(), TDK_SubstitutionFailure, and Unevaluated.
Sema::TemplateDeductionResult Sema::DeduceTemplateArguments | ( | FunctionTemplateDecl * | FunctionTemplate, |
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
ArrayRef< Expr *> | Args, | ||
FunctionDecl *& | Specialization, | ||
sema::TemplateDeductionInfo & | Info, | ||
bool | PartialOverloading, | ||
llvm::function_ref< bool(ArrayRef< QualType >)> | CheckNonDependent | ||
) |
Perform template argument deduction from a function call (C++ [temp.deduct.call]).
FunctionTemplate | the function template for which we are performing template argument deduction. |
ExplicitTemplateArgs | the explicit template arguments provided for this call. |
Args | the function call arguments |
Specialization | if template argument deduction was successful, this will be set to the function template specialization produced by template argument deduction. |
Info | the argument will be updated to provide additional information about template argument deduction. |
CheckNonDependent | A callback to invoke to check conversions for non-dependent parameters, between deduction and substitution, per DR1391. If this returns true, substitution will be skipped and we return TDK_NonDependentConversionFailure. The callback is passed the parameter types (after substituting explicit template arguments). |
Definition at line 3795 of file SemaTemplateDeduction.cpp.
References DeduceTemplateArgumentsFromCallArgument(), FinishTemplateArgumentDeduction(), clang::Type::getAs(), getFirstInnerIndex(), clang::FunctionDecl::getMinRequiredArguments(), clang::PackExpansionType::getNumExpansions(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::PackExpansionType::getPattern(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::TemplateDecl::getTemplateParameters(), clang::ValueDecl::getType(), hasDeducibleTemplateParameters(), clang::Decl::isInvalidDecl(), clang::FunctionProtoType::isTemplateVariadic(), clang::FunctionProtoType::isVariadic(), clang::TemplateParameterList::size(), and TDK_Success.
Sema::TemplateDeductionResult Sema::DeduceTemplateArguments | ( | FunctionTemplateDecl * | FunctionTemplate, |
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
QualType | ArgFunctionType, | ||
FunctionDecl *& | Specialization, | ||
sema::TemplateDeductionInfo & | Info, | ||
bool | IsAddressOfFunction = false |
||
) |
Deduce template arguments when taking the address of a function template (C++ [temp.deduct.funcaddr]) or matching a specialization to a template.
FunctionTemplate | the function template for which we are performing template argument deduction. |
ExplicitTemplateArgs | the explicitly-specified template arguments. |
ArgFunctionType | the function type that will be used as the "argument" type (A) when performing template argument deduction from the function template's function type. This type may be NULL, if there is no argument type to compare against, in C++0x [temp.arg.explicit]p3. |
Specialization | if template argument deduction was successful, this will be set to the function template specialization produced by template argument deduction. |
Info | the argument will be updated to provide additional information about template argument deduction. |
IsAddressOfFunction | If true , we are deducing as part of taking the address of a function template per [temp.deduct.funcaddr] and [over.over]. If false , we are looking up a function template specialization based on its signature, per [temp.deduct.decl]. |
Definition at line 4016 of file SemaTemplateDeduction.cpp.
References clang::Type::getContainedAutoType(), clang::FunctionDecl::getReturnType(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::TemplateDecl::getTemplateParameters(), clang::ValueDecl::getType(), clang::Decl::isInvalidDecl(), clang::TemplateParameterList::size(), and Unevaluated.
Sema::TemplateDeductionResult Sema::DeduceTemplateArguments | ( | FunctionTemplateDecl * | ConversionTemplate, |
QualType | ToType, | ||
CXXConversionDecl *& | Specialization, | ||
sema::TemplateDeductionInfo & | Info | ||
) |
Deduce template arguments for a templated conversion function (C++ [temp.deduct.conv]) and, if successful, produce a conversion function template specialization.
Definition at line 4134 of file SemaTemplateDeduction.cpp.
References clang::CXXConversionDecl::getConversionType(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::Decl::isInvalidDecl(), and P.
Sema::TemplateDeductionResult Sema::DeduceTemplateArguments | ( | FunctionTemplateDecl * | FunctionTemplate, |
TemplateArgumentListInfo * | ExplicitTemplateArgs, | ||
FunctionDecl *& | Specialization, | ||
sema::TemplateDeductionInfo & | Info, | ||
bool | IsAddressOfFunction = false |
||
) |
Deduce template arguments for a function template when there is nothing to deduce against (C++0x [temp.arg.explicit]p3).
FunctionTemplate | the function template for which we are performing template argument deduction. |
ExplicitTemplateArgs | the explicitly-specified template arguments. |
Specialization | if template argument deduction was successful, this will be set to the function template specialization produced by template argument deduction. |
Info | the argument will be updated to provide additional information about template argument deduction. |
IsAddressOfFunction | If true , we are deducing as part of taking the address of a function template in a context where we do not have a target type, per [over.over]. If false , we are looking up a function template specialization based on its signature, which only happens when deducing a function parameter type from an argument that is a template-id naming a function template specialization. |
Definition at line 4272 of file SemaTemplateDeduction.cpp.
References Context, DeduceTemplateArguments(), clang::ASTContext::getAutoType(), clang::ASTContext::getDeducedTemplateSpecializationType(), clang::TypeLoc::getFullDataSize(), clang::AutoType::getKeyword(), clang::TypeSpecTypeLoc::getNameLoc(), clang::DeducedTemplateSpecializationType::getTemplateName(), clang::InheritingConcreteTypeLoc< Base, Derived, TypeClass >::getTypePtr(), clang::QualType::isNull(), clang::TypeLocBuilder::push(), clang::TypeLocBuilder::reserve(), and clang::TypeSpecTypeLoc::setNameLoc().
QualType Sema::DeduceTemplateSpecializationFromInitializer | ( | TypeSourceInfo * | TInfo, |
const InitializedEntity & | Entity, | ||
const InitializationKind & | Kind, | ||
MultiExprArg | Init | ||
) |
Definition at line 9302 of file SemaInit.cpp.
References clang::OverloadCandidateSet::CSK_Normal, clang::ASTContext::DeclarationNames, clang::ASTContext::DependentTy, Diag(), clang::Type::getAsCXXRecordDecl(), clang::TemplateName::getAsTemplateDecl(), clang::TypeLoc::getBeginLoc(), clang::Type::getContainedDeducedType(), clang::DeclarationNameTable::getCXXDeductionGuideName(), clang::TypeLoc::getEndLoc(), clang::InitListExpr::getInit(), clang::InitListExpr::getInits(), clang::InitializationKind::getKind(), clang::InitializationKind::getLocation(), clang::InitListExpr::getNumInits(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getType(), clang::Expr::getType(), clang::ASTContext::getTypeDeclType(), clang::TypeSourceInfo::getTypeLoc(), clang::NamedDecl::getUnderlyingDecl(), clang::Expr::hasAnyTypeDependentArguments(), clang::InitializationKind::IK_Direct, Inits, clang::InitializationKind::isCopyInit(), clang::TemplateName::isDependent(), clang::Decl::isInvalidDecl(), isOrIsDerivedFromSpecializationOf(), clang::ListInit, clang::OCD_AllCandidates, clang::OCD_ViableCandidates, clang::OR_Ambiguous, clang::OR_Deleted, clang::OR_No_Viable_Function, clang::OR_Success, and clang::Result.
Referenced by BuildCXXTypeConstructExpr().
Definition at line 11074 of file SemaDecl.cpp.
References clang::NamedDecl::getDeclName(), clang::Redeclarable< decl_type >::getPreviousDecl(), clang::VarDecl::getSourceRange(), clang::ValueDecl::getType(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::Decl::isInvalidDecl(), clang::NamedDecl::isLinkageValid(), clang::QualType::isNull(), clang::Decl::setInvalidDecl(), and clang::ValueDecl::setType().
QualType Sema::deduceVarTypeFromInitializer | ( | VarDecl * | VDecl, |
DeclarationName | Name, | ||
QualType | Type, | ||
TypeSourceInfo * | TSI, | ||
SourceRange | Range, | ||
bool | DirectInit, | ||
Expr * | Init | ||
) |
Definition at line 10938 of file SemaDecl.cpp.
ExprResult Sema::DefaultArgumentPromotion | ( | Expr * | E | ) |
DefaultArgumentPromotion (C99 6.5.2.2p6).
Used for function calls that do not have a prototype. Arguments that have type float or __fp16 are promoted to double. All other argument types are converted by UsualUnaryConversions().
Definition at line 738 of file SemaExpr.cpp.
References clang::ExprError(), clang::Type::getAs(), clang::BuiltinType::getKind(), clang::Expr::getType(), and clang::QualType::isNull().
ExprResult Sema::DefaultFunctionArrayConversion | ( | Expr * | E, |
bool | Diagnose = true |
||
) |
DefaultFunctionArrayConversion (C99 6.3.2.1p3, C99 6.3.2.1p4).
Definition at line 440 of file SemaExpr.cpp.
References checkAddressOfFunctionIsAvailable(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getExprLoc(), clang::Expr::getType(), clang::Expr::IgnoreParenCasts(), clang::Type::isFunctionType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Type::isPlaceholderType(), and result.
Referenced by IgnoredValueConversions(), isNullPointerValueTemplateArgument(), and LookupMemberExpr().
ExprResult Sema::DefaultFunctionArrayLvalueConversion | ( | Expr * | E, |
bool | Diagnose = true |
||
) |
Definition at line 655 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by CheckCommaOperands(), CXXCheckConditionalOperands(), DiagnoseBadFunctionCast(), DiagnoseReinterpretUpDownCast(), getCastAwayConstnessCastKind(), IgnoredValueConversions(), OpenCLArithmeticConversions(), OpenCLCheckVectorConditional(), and TryAddressSpaceCast().
ExprResult Sema::DefaultLvalueConversion | ( | Expr * | E | ) |
Definition at line 554 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Expr::isGLValue(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Type::isPlaceholderType(), and result.
Referenced by ActOnCXXDelete(), buildCapture(), CheckObjCCollectionLiteralElement(), CheckPointerToMemberOperands(), finishContextualImplicitConversion(), IgnoredValueConversions(), LookupMemberExpr(), and PerformImplicitConversion().
void Sema::DefaultSynthesizeProperties | ( | Scope * | S, |
ObjCImplDecl * | IMPDecl, | ||
ObjCInterfaceDecl * | IDecl, | ||
SourceLocation | AtEnd | ||
) |
DefaultSynthesizeProperties - This routine default synthesizes all properties which must be synthesized in the class's @implementation.
Default synthesizes all properties which must be synthesized in class's @implementation.
Definition at line 1833 of file SemaObjCProperty.cpp.
void Sema::DefaultSynthesizeProperties | ( | Scope * | S, |
Decl * | D, | ||
SourceLocation | AtEnd | ||
) |
Definition at line 1926 of file SemaObjCProperty.cpp.
ExprResult Sema::DefaultVariadicArgumentPromotion | ( | Expr * | E, |
VariadicCallType | CT, | ||
FunctionDecl * | FDecl | ||
) |
DefaultVariadicArgumentPromotion - Like DefaultArgumentPromotion, but will create a trap if the resulting type is not a POD type.
Definition at line 887 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAsPlaceholderType(), clang::Expr::getType(), clang::Decl::hasAttr(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
void Sema::DefineImplicitCopyAssignment | ( | SourceLocation | CurrentLocation, |
CXXMethodDecl * | MethodDecl | ||
) |
Defines an implicitly-declared copy assignment operator.
Definition at line 12027 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::CXXRecordDecl::bases(), clang::Type::castAs(), clang::frontend::CPlusPlus11, diagnoseDeprecatedCopyOperation(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Type::getAs(), clang::Decl::getEndLoc(), clang::Decl::getLocation(), clang::FunctionDecl::getOverloadedOperator(), clang::FunctionDecl::getParamDecl(), clang::CXXMethodDecl::getParent(), clang::Type::getPointeeType(), clang::QualType::getQualifiers(), clang::CXXBaseSpecifier::getType(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::Decl::isImplicit(), clang::Decl::isInvalidDecl(), clang::FunctionDecl::isOverloadedOperator(), clang::Type::isRecordType(), clang::SourceLocation::isValid(), clang::Decl::setInvalidDecl(), and clang::FunctionDecl::willHaveBody().
Referenced by DefineImplicitSpecialMember().
void Sema::DefineImplicitCopyConstructor | ( | SourceLocation | CurrentLocation, |
CXXConstructorDecl * | Constructor | ||
) |
DefineImplicitCopyConstructor - Checks for feasibility of defining this constructor as the copy constructor.
Definition at line 12693 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::Type::castAs(), clang::frontend::CPlusPlus11, diagnoseDeprecatedCopyOperation(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Decl::getEndLoc(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ValueDecl::getType(), clang::CXXConstructorDecl::isCopyConstructor(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::Decl::isImplicit(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), clang::Decl::markUsed(), clang::None, clang::FunctionDecl::setBody(), clang::Decl::setInvalidDecl(), and clang::FunctionDecl::willHaveBody().
Referenced by DefineImplicitSpecialMember().
void Sema::DefineImplicitDefaultConstructor | ( | SourceLocation | CurrentLocation, |
CXXConstructorDecl * | Constructor | ||
) |
DefineImplicitDefaultConstructor - Checks for feasibility of defining this constructor as the default constructor.
Definition at line 11083 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::Type::castAs(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Decl::getEndLoc(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ValueDecl::getType(), clang::CXXConstructorDecl::isDefaultConstructor(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), clang::FunctionDecl::setBody(), clang::Decl::setInvalidDecl(), and clang::FunctionDecl::willHaveBody().
Referenced by DefineImplicitSpecialMember(), and PerformConstructorInitialization().
void Sema::DefineImplicitDestructor | ( | SourceLocation | CurrentLocation, |
CXXDestructorDecl * | Destructor | ||
) |
DefineImplicitDestructor - Checks for feasibility of defining this destructor as the default destructor.
Definition at line 11362 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::Type::castAs(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Decl::getEndLoc(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ValueDecl::getType(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), clang::FunctionDecl::setBody(), clang::Decl::setInvalidDecl(), and clang::FunctionDecl::willHaveBody().
Referenced by DefineImplicitSpecialMember().
void Sema::DefineImplicitLambdaToBlockPointerConversion | ( | SourceLocation | CurrentLoc, |
CXXConversionDecl * | Conv | ||
) |
Define the "body" of the conversion from a lambda object to a block pointer.
This routine doesn't actually define a sensible body; rather, it fills in the initialization expression needed to copy the lambda object into the block, and IR generation actually generates the real body of the block pointer conversion.
Definition at line 12928 of file SemaDeclCXX.cpp.
References clang::ImplicitCastExpr::Create(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::CXXRecordDecl::isGenericLambda(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
void Sema::DefineImplicitLambdaToFunctionPointerConversion | ( | SourceLocation | CurrentLoc, |
CXXConversionDecl * | Conv | ||
) |
Define the "body" of the conversion from a lambda object to a function pointer.
This routine doesn't actually define a sensible body; rather, it fills in the initialization expression needed to copy the lambda object into the block, and IR generation actually generates the real body of the block pointer conversion.
Definition at line 12870 of file SemaDeclCXX.cpp.
References clang::FunctionDecl::getDescribedFunctionTemplate(), clang::CXXMethodDecl::getParent(), clang::FunctionDecl::getReturnType(), clang::FunctionDecl::getTemplateSpecializationArgs(), clang::Decl::isInvalidDecl(), clang::Type::isUndeducedType(), and clang::Decl::markUsed().
void Sema::DefineImplicitMoveAssignment | ( | SourceLocation | CurrentLocation, |
CXXMethodDecl * | MethodDecl | ||
) |
Defines an implicitly-declared move assignment operator.
Definition at line 12392 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::CXXRecordDecl::bases(), clang::Type::castAs(), checkMoveAssignmentForRepeatedMove(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Decl::getEndLoc(), clang::Decl::getLocation(), clang::FunctionDecl::getOverloadedOperator(), clang::FunctionDecl::getParamDecl(), clang::CXXMethodDecl::getParent(), clang::CXXBaseSpecifier::getType(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::Decl::isInvalidDecl(), clang::FunctionDecl::isOverloadedOperator(), clang::Type::isRecordType(), clang::SourceLocation::isValid(), clang::Decl::setInvalidDecl(), clang::VK_XValue, and clang::FunctionDecl::willHaveBody().
Referenced by DefineImplicitSpecialMember().
void Sema::DefineImplicitMoveConstructor | ( | SourceLocation | CurrentLocation, |
CXXConstructorDecl * | Constructor | ||
) |
DefineImplicitMoveConstructor - Checks for feasibility of defining this constructor as the move constructor.
Definition at line 12825 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::Type::castAs(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Decl::getEndLoc(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ValueDecl::getType(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::Decl::isInvalidDecl(), clang::CXXConstructorDecl::isMoveConstructor(), clang::SourceLocation::isValid(), clang::Decl::markUsed(), clang::None, clang::FunctionDecl::setBody(), clang::Decl::setInvalidDecl(), and clang::FunctionDecl::willHaveBody().
Referenced by DefineImplicitSpecialMember().
void Sema::DefineInheritingConstructor | ( | SourceLocation | UseLoc, |
CXXConstructorDecl * | Constructor | ||
) |
Define the specified inheriting constructor.
Definition at line 11220 of file SemaDeclCXX.cpp.
References clang::Sema::SynthesizedFunctionScope::addContextNote(), clang::CXXRecordDecl::bases(), clang::Type::castAs(), clang::FunctionDecl::doesThisDeclarationHaveABody(), clang::Sema::InheritedConstructorInfo::findConstructorForBase(), clang::InheritedConstructor::getConstructor(), clang::CXXConstructorDecl::getInheritedConstructor(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::ConstructorUsingShadowDecl::getParent(), clang::InheritedConstructor::getShadowDecl(), clang::ValueDecl::getType(), Inits, clang::FunctionDecl::isDeleted(), clang::Decl::isInvalidDecl(), clang::CXXRecordDecl::vbases(), and clang::FunctionDecl::willHaveBody().
bool Sema::DefineUsedVTables | ( | ) |
Define all of the vtables that have been used in this translation unit and reference any virtual members used by those vtables.
Definition at line 15170 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::getDefinition(), and clang::CXXRecordDecl::getTemplateSpecializationKind().
Referenced by ActOnEndOfTranslationUnitFragment().
|
inline |
Emit a diagnostic.
Definition at line 1362 of file Sema.h.
References Diag(), clang::tooling::name(), Offset, and clang::DiagnosticsEngine::Report().
Referenced by ActOnComment(), ActOnCompatibilityAlias(), ActOnCXXDelete(), ActOnCXXNestedNameSpecifierDecltype(), ActOnCXXNew(), ActOnCXXThis(), ActOnEndOfTranslationUnit(), ActOnForwardClassDeclaration(), ActOnOpenMPThreadprivateDirective(), ActOnPragmaAttributeAttribute(), ActOnPragmaAttributePop(), ActOnPragmaMSVtorDisp(), ActOnPragmaOptionsAlign(), ActOnPragmaPack(), ActOnPragmaVisibility(), ActOnPseudoDestructorExpr(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), ActOnStartOfObjCMethodDef(), ActOnStartProtocolInterface(), AnalyzeAssignment(), AnalyzeBitFieldAssignment(), AnalyzeCompoundAssignment(), AnalyzeImplicitConversions(), AtomicPropertySetterGetterRules(), BuildAddressSpaceIndex(), BuildCXXNoexceptExpr(), BuildCXXTypeConstructExpr(), BuildFloatingLiteral(), BuildImplicitMemberInitializer(), BuildNonArrayForRange(), BuildObjCExceptionDecl(), BuildPseudoDestructorExpr(), checkAllocateClauses(), CheckAllocatedType(), checkAllowedCUDAInitializer(), CheckARCMethodDecl(), checkArithmeticBinOpPointerOperands(), checkArithmeticNull(), CheckArrow(), checkBlockType(), CheckBuiltinTargetSupport(), checkCancelRegion(), checkCondition(), checkConditionalBlockPointerCompatibility(), checkConditionalPointerCompatibility(), checkConditionalVoidType(), CheckConditionVariable(), CheckConflictingOverridingMethod(), CheckConstexprCtorInitializer(), CheckConstexprDeclStmt(), CheckConvertedConstantExpression(), checkCUDATargetOverload(), CheckCXX98CompatAccessibleCopy(), CheckCXXThisCapture(), CheckDeclInExpr(), checkDeclInTargetContext(), checkDirectCallValidity(), checkEnumComparison(), CheckEquivalentExceptionSpec(), CheckExceptionSpecSubset(), CheckExplicitInstantiation(), CheckExplicitInstantiationScope(), checkExportedDecl(), CheckFallThroughForBody(), CheckFoldOperand(), CheckForModifiableLvalue(), checkForMultipleExportedDefaultConstructors(), CheckForReference(), CheckForwardProtocolDeclarationForCircularDependency(), checkFoundationAPI(), checkGrainsizeNumTasksClauses(), CheckIdentityFieldAssignment(), checkIfClauses(), CheckImplementationIvars(), CheckImplicitConversion(), CheckIncrementDecrementOperand(), checkIndirectCopyRestoreSource(), CheckIndirectionOperand(), checkInitMethod(), checkIntToPointerCast(), CheckKeyForObjCARCConversion(), checkLiteralOperatorTemplateParameterList(), checkMapClauseExpressionBase(), checkMapConflicts(), checkMappableExpressionList(), CheckMemaccessSize(), checkMemberDecomposition(), CheckMemorySizeofForComparison(), checkMethodTypeQualifiers(), checkMoreSpecializedThanPrimary(), checkMoveAssignmentForRepeatedMove(), CheckMoveOnConstruction(), checkNestingOfRegions(), CheckNonTypeTemplatePartialSpecializationArgs(), checkNullabilityTypeSpecifier(), CheckObjCBridgeCFCast(), CheckObjCBridgeNSCast(), CheckObjCCollectionLiteralElement(), checkObjCCollectionLiteralElement(), CheckObjCDeclScope(), checkObjCKindOfType(), CheckObjCMethodOverride(), checkObjCMethodX86VectorTypes(), checkObjCPointerIntrospection(), CheckObjCPropertyAttributes(), checkOpenCLConditionVector(), checkOpenCLEnqueueIntType(), checkOpenCLEnqueueVariadicArgs(), checkOpenCLPipeArg(), checkOpenCLPipePacketType(), checkOpenMPLoop(), CheckOperatorDeleteDeclaration(), CheckOperatorNewDeclaration(), CheckOperatorNewDeleteDeclarationScope(), CheckOperatorNewDeleteTypes(), checkPointerIntegerMismatch(), CheckPointerToMemberOperands(), checkRecursiveFunction(), checkReductionClauseWithNogroup(), checkScheduleModifiers(), checkSimdlenSafelenSpecified(), CheckSpecifiedExceptionType(), CheckTemplateArgumentAddressOfObjectOrFunction(), CheckTemplateArgumentIsCompatibleWithParameter(), CheckTemplateArgumentPointerToMember(), checkTemplatePartialSpecialization(), CheckTemplateSpecializationScope(), checkThreeWayNarrowingConversion(), checkTrivialClassMembers(), checkTrivialSubobjectCall(), checkTupleLikeDecomposition(), checkTypeMappable(), checkUnsafeAssignLiteral(), checkUnsafeAssignObject(), checkVAStartABI(), checkVAStartIsInVariadicFunction(), checkVectorResult(), checkVectorShift(), CheckVirtualDtorCall(), clang::Sema::InstantiatingTemplate::Clear(), ConvertDeducedTemplateArgument(), CopyObject(), CXXCheckConditionalOperands(), diagExportedUnnamedDecl(), clang::Sema::BoundTypeDiagnoser< Ts >::diagnose(), DiagnoseAdditionInShift(), diagnoseAddressOfInvalidType(), diagnoseArithmeticOnFunctionPointer(), diagnoseArithmeticOnNullPointer(), diagnoseArithmeticOnTwoFunctionPointers(), diagnoseArithmeticOnTwoVoidPointers(), diagnoseArithmeticOnVoidPointer(), diagnoseArrayStarInParamType(), diagnoseAutoDeductionFailure(), DiagnoseBadFunctionCast(), DiagnoseBadShiftValues(), DiagnoseBaseOrMemInitializerOrder(), DiagnoseBitwiseOpInBitwiseOp(), DiagnoseBitwisePrecedence(), DiagnoseCallingConvCast(), DiagnoseCastOfObjCSEL(), DiagnoseCastQual(), DiagnoseClassExtensionDupMethods(), DiagnoseConditionalPrecedence(), DiagnoseConstAssignment(), DiagnoseCStringFormatDirectiveInCFAPI(), DiagnoseCStringFormatDirectiveInObjCAPI(), diagnoseDeprecatedCopyOperation(), diagnoseDiagnoseIfAttrsWith(), diagnoseDistinctPointerComparison(), DiagnoseDivisionSizeofPointer(), DiagnoseDuplicateIvars(), DiagnoseFloatingImpCast(), DiagnoseForRangeConstVariableCopies(), DiagnoseForRangeReferenceVariableCopies(), diagnoseFunctionPointerToVoidComparison(), DiagnoseImpCast(), DiagnoseIndirectOrAsmJumpStmt(), diagnoseInstanceReference(), diagnoseListInit(), diagnoseLogicalNotOnLHSofCheck(), DiagnoseMismatchedNewDelete(), diagnoseMissingArgument(), DiagnoseMissingDesignatedInitOverrides(), DiagnoseMultipleAddrSpaceAttributes(), DiagnoseMultipleMethodInGlobalPool(), DiagnoseNamespaceInlineMismatch(), DiagnoseNarrowingInInitList(), DiagnoseNonDefaultPragmaPack(), diagnoseNullableToNonnullConversion(), DiagnoseNullConversion(), diagnoseNullResettableSynthesizedSetters(), diagnoseObjCARCConversion(), diagnoseObjCLiteralComparison(), DiagnoseOwningPropertyGetterSynthesis(), diagnosePointerIncompatibility(), DiagnosePropertyAccessorMismatch(), DiagnosePropertyMismatch(), DiagnoseQualifiedMemberReference(), DiagnoseRecursiveConstFields(), DiagnoseReinterpretUpDownCast(), diagnoseRetainCycle(), DiagnoseSelfAssignment(), DiagnoseShiftCompare(), diagnoseStringPlusChar(), diagnoseStringPlusInt(), DiagnoseSwitchLabelsFallthrough(), DiagnoseTemplateParameterListArityMismatch(), DiagnoseTwoPhaseLookup(), DiagnoseTypeArgsAndProtocols(), diagnoseUnavailableAlignedAllocation(), DiagnoseUninitializedReference(), DiagnoseUninitializedUse(), DiagnoseUnterminatedPragmaAttribute(), DiagnoseUnterminatedPragmaPack(), DiagnoseUseOfUnimplementedSelectors(), diagnoseZeroToNullptrConversion(), diagReturnOnAllocFailure(), DiagUninitUse(), emitAndClearUnusedLocalTypedefWarnings(), EmitCurrentDiagnostic(), EmitDiagForCXXThrowInNonThrowingFunc(), EmitDiagnosticForLogicalAndInLogicalOr(), emitNullabilityConsistencyWarning(), emitReplacement(), EvaluateArrayTypeTrait(), FindAllocationFunctions(), FindConditionalOverload(), FindProtocolDeclaration(), FinishForRangeVarDecl(), FinishOpenMPLinearClause(), flushDiagnostics(), getCastAwayConstnessCastKind(), GetDeclSpecTypeForDeclarator(), getFunctionStorageClass(), getTupleLikeElementType(), HandleAddressSpaceTypeAttribute(), HandleExtVectorTypeAttr(), handleFunctionTypeAttr(), handleMSPointerTypeQualifierAttr(), HandleNeonVectorTypeAttr(), handleObjCGCTypeAttr(), handleObjCOwnershipTypeAttr(), HandleOpenCLAccessAttr(), HandleVectorSizeAttr(), inferCUDATargetForImplicitSpecialMember(), clang::Sema::InheritedConstructorInfo::InheritedConstructorInfo(), clang::TemplateDeclInstantiator::InstantiateClassTemplatePartialSpecialization(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), InstantiateInClassInitializer(), clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization(), isNonNegativeIntegerValue(), isNullPointerValueTemplateArgument(), isOpenCLDisabledDecl(), isTupleLike(), LookupMemberExpr(), LookupMemberExprInRecord(), LookupMethodInReceiverType(), LookupStdInitializerList(), lookupStdTypeTraitMember(), MatchTemplateParameterKind(), maybeAddCUDAHostDeviceAttrs(), clang::TemplateSpecCandidateSet::NoteCandidates(), clang::OverloadCandidateSet::NoteCandidates(), noteMemberDeclaredHere(), noteNonDeducibleParameters(), noteOperatorArrows(), noteOverloads(), OpenCLArithmeticConversions(), OpenCLConvertScalarsToVectors(), clang::InitializationSequence::Perform(), PerformImplicitConversion(), PerformOpenMPImplicitIntegerConversion(), PopFunctionScopeInfo(), PopPragmaVisibility(), ProcessPropertyDecl(), clang::TreeTransform< Derived >::RebuildCXXForRangeStmt(), clang::TreeTransform< Derived >::RebuildDependentNameType(), ReferenceDllExportedMembers(), reportOriginalDsa(), RequireCompleteDeclContext(), resolveBuiltinNewDeleteOverload(), ResolveExceptionSpec(), SearchForReturnInStmt(), SemaBuiltinCommitRWPipe(), SemaBuiltinCpuIs(), SemaBuiltinCpuSupports(), SemaBuiltinLaunder(), SemaBuiltinPipePackets(), SemaBuiltinReserveRWPipe(), SemaBuiltinRWPipe(), SemaOpenCLBuiltinEnqueueKernel(), SemaOpenCLBuiltinToAddr(), SubstParmVarDecl(), SuggestInitializationFixit(), SuggestParentheses(), TryAddressSpaceCast(), TryReinterpretCast(), TryStaticCast(), tryToRecoverWithCall(), UnifySection(), clang::TemplateDeclInstantiator::VisitVarDecl(), clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl(), warnAboutAmbiguousFunction(), warnAboutRedundantParens(), warnBracedScalarInit(), WarnConflictingTypedMethods(), and WarnExactTypedMethods().
Sema::SemaDiagnosticBuilder Sema::Diag | ( | SourceLocation | Loc, |
const PartialDiagnostic & | PD | ||
) |
Sema::DeviceDiagBuilder Sema::diagIfOpenMPDeviceCode | ( | SourceLocation | Loc, |
unsigned | DiagID | ||
) |
Creates a DeviceDiagBuilder that emits the diagnostic if the current context is "used as device code".
declare target
function or it is known that the function is emitted for the device, emits the diagnostics immediately.declare target
function and we are compiling for the device, creates a diagnostic which is emitted if and when we realize that the function will be codegen'ed.Example usage:
// Variable-length arrays are not allowed in NVPTX device code. if (diagIfOpenMPDeviceCode(Loc, diag::err_vla_unsupported)) return ExprError(); // Otherwise, continue parsing as normal.
Definition at line 1568 of file SemaOpenMP.cpp.
References clang::Expr::getType(), clang::Type::isFloat16Type(), isKnownEmitted(), and isOpenMPDeviceDelayedContext().
Referenced by targetDiag().
void Sema::DiagnoseAbsenceOfOverrideControl | ( | NamedDecl * | D | ) |
DiagnoseAbsenceOfOverrideControl - Diagnose if 'override' keyword was not used in the declaration of an overriding method.
Definition at line 2839 of file SemaDeclCXX.cpp.
References clang::CXXMethodDecl::begin_overridden_methods(), Diag(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::Decl::hasAttr(), clang::Decl::isImplicit(), clang::Decl::isInvalidDecl(), clang::SourceLocation::isValid(), and clang::CXXMethodDecl::size_overridden_methods().
void Sema::DiagnoseAbstractType | ( | const CXXRecordDecl * | RD | ) |
Definition at line 5342 of file SemaDeclCXX.cpp.
References Diag(), clang::NamedDecl::getDeclName(), and clang::CXXRecordDecl::getFinalOverriders().
void Sema::DiagnoseAlwaysNonNullPointer | ( | Expr * | E, |
Expr::NullPointerConstantKind | NullKind, | ||
bool | IsEqual, | ||
SourceRange | Range | ||
) |
Diagnose pointers that are always non-null.
E | the expression containing the pointer |
NullKind | NPCK_NotNull if E is a cast to bool, otherwise, E is compared to a null pointer |
IsEqual | True when the comparison is equal to a null pointer |
Range | Extra SourceRange to highlight in the diagnostic |
Definition at line 11767 of file SemaChecking.cpp.
References CheckForReference(), Diag(), clang::SourceRange::getBegin(), clang::Expr::getExprLoc(), clang::Stmt::getSourceRange(), clang::Expr::IgnoreImpCasts(), IsInAnyMacroBody(), clang::SourceLocation::isMacroID(), clang::Expr::NPCK_NotNull, and SM.
Referenced by CheckImplicitConversion().
void Sema::DiagnoseAmbiguousLookup | ( | LookupResult & | Result | ) |
Produce a diagnostic describing the ambiguity that resulted from name lookup.
Result | The result of the ambiguous lookup to be diagnosed. |
Definition at line 2457 of file SemaLookup.cpp.
References clang::LookupResult::isAmbiguous().
Referenced by clang::LookupResult::setFindLocalExtern().
void Sema::diagnoseARCUnbridgedCast | ( | Expr * | e | ) |
Given that we saw an expression with the ARCUnbridgedCastTy placeholder type, complain bitterly.
Definition at line 4308 of file SemaExprObjC.cpp.
References ACTC_retainable, clang::cast(), clang::ast_matchers::castExpr, classifyTypeForARCConversion(), diagnoseObjCARCConversion(), clang::QualType::getNonReferenceType(), clang::Expr::hasPlaceholderType(), and clang::Expr::IgnoreParens().
bool Sema::diagnoseArgDependentDiagnoseIfAttrs | ( | const FunctionDecl * | Function, |
const Expr * | ThisArg, | ||
ArrayRef< const Expr *> | Args, | ||
SourceLocation | Loc | ||
) |
Emit diagnostics for the diagnose_if attributes on Function, ignoring any non-ArgDependent DiagnoseIfAttrs.
Argument-dependent diagnose_if attributes should be checked each time a function is used as a direct callee of a function call.
Returns true if any errors were emitted.
Definition at line 6441 of file SemaOverload.cpp.
References diagnoseDiagnoseIfAttrsWith().
bool Sema::diagnoseArgIndependentDiagnoseIfAttrs | ( | const NamedDecl * | ND, |
SourceLocation | Loc | ||
) |
Emit diagnostics for the diagnose_if attributes on Function, ignoring any ArgDependent DiagnoseIfAttrs.
Argument-independent diagnose_if attributes should be checked on every use of a function.
Returns true if any errors were emitted.
Definition at line 6459 of file SemaOverload.cpp.
References diagnoseDiagnoseIfAttrsWith().
void Sema::DiagnoseAssignmentAsCondition | ( | Expr * | E | ) |
DiagnoseAssignmentAsCondition - Given that an expression is being used as a boolean condition, warn if it's an assignment.
Definition at line 16777 of file SemaExpr.cpp.
References clang::FixItHint::CreateInsertion(), clang::FixItHint::CreateReplacement(), Diag(), clang::Stmt::getBeginLoc(), clang::SourceRange::getEnd(), clang::Selector::getNameForSlot(), clang::Stmt::getSourceRange(), clang::Selector::isUnarySelector(), clang::OMF_init, and Open.
DiagnoseAssignmentEnum - Warn if assignment to enum is a constant integer not in the range of enum values.
Definition at line 1223 of file SemaStmt.cpp.
References clang::Type::getAs(), and clang::Expr::getExprLoc().
bool Sema::DiagnoseAssignmentResult | ( | AssignConvertType | ConvTy, |
SourceLocation | Loc, | ||
QualType | DstType, | ||
QualType | SrcType, | ||
Expr * | SrcExpr, | ||
AssignmentAction | Action, | ||
bool * | Complained = nullptr |
||
) |
DiagnoseAssignmentResult - Emit a diagnostic, if required, for the assignment conversion type specified by ConvTy.
This returns true if the conversion was invalid or false if the conversion was accepted.
Definition at line 14276 of file SemaExpr.cpp.
References clang::QualType::getUnqualifiedType(), clang::Type::isArrayType(), clang::Type::isFunctionPointerType(), isInvalid(), clang::FixItHint::isNull(), clang::Type::isObjCObjectPointerType(), and clang::ConversionFixItGenerator::tryToFixConversion().
Referenced by LookupMethodInReceiverType(), clang::InitializationSequence::Perform(), and PerformImplicitConversion().
Definition at line 4601 of file SemaTemplateDeduction.cpp.
References Diag(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::ValueDecl::getType(), and clang::VarDecl::isInitCapture().
void clang::Sema::DiagnoseAvailabilityOfDecl | ( | NamedDecl * | D, |
ArrayRef< SourceLocation > | Locs, | ||
const ObjCInterfaceDecl * | UnknownObjCClass, | ||
bool | ObjCPropertyAccess, | ||
bool | AvoidPartialAvailabilityChecks = false , |
||
ObjCInterfaceDecl * | ClassReceiver = nullptr |
||
) |
void Sema::DiagnoseClassExtensionDupMethods | ( | ObjCCategoryDecl * | CAT, |
ObjCInterfaceDecl * | ID | ||
) |
DiagnoseClassExtensionDupMethods - Check for duplicate declaration of a class method in its extension.
Definition at line 1744 of file SemaDeclObjC.cpp.
References Diag(), clang::Decl::getLocation(), clang::ObjCMethodDecl::isInstanceMethod(), MatchTwoMethodDeclarations(), and clang::ObjCContainerDecl::methods().
bool Sema::DiagnoseClassNameShadow | ( | DeclContext * | DC, |
DeclarationNameInfo | NameInfo | ||
) |
DiagnoseClassNameShadow - Implement C++ [class.mem]p13: If T is the name of a class, then each of the following shall have a name different from T:
Definition at line 5274 of file SemaDecl.cpp.
void Sema::DiagnoseCommaOperator | ( | const Expr * | LHS, |
SourceLocation | Loc | ||
) |
Definition at line 11687 of file SemaExpr.cpp.
References clang::Scope::BreakScope, clang::Scope::ContinueScope, clang::Scope::ControlScope, clang::FixItHint::CreateInsertion(), clang::Scope::DeclScope, Diag(), clang::Stmt::getBeginLoc(), clang::Stmt::getEndLoc(), clang::Stmt::getSourceRange(), IgnoreCommaOperand(), and clang::SourceLocation::isMacroID().
Referenced by CheckCommaOperands().
bool Sema::DiagnoseConditionalForNull | ( | Expr * | LHSExpr, |
Expr * | RHSExpr, | ||
SourceLocation | QuestionLoc | ||
) |
Emit a specialized diagnostic when one expression is a null pointer constant and the other is not a pointer.
Returns true if a diagnostic is emitted.
Definition at line 6700 of file SemaExpr.cpp.
References clang::Expr::isNullPointerConstant().
Referenced by CXXCheckConditionalOperands(), and FindConditionalOverload().
void Sema::DiagnoseDuplicateIvars | ( | ObjCInterfaceDecl * | ID, |
ObjCInterfaceDecl * | SID | ||
) |
DiagnoseDuplicateIvars - Check for duplicate ivars in the entire class at the start of @implementation.
This becomes necesssary because class extension can add ivars to a class in random order which will not be known until class's @implementation is seen.
Definition at line 3729 of file SemaDeclObjC.cpp.
References Diag(), clang::Decl::getLocation(), clang::ObjCInterfaceDecl::ivars(), and clang::ObjCInterfaceDecl::lookupInstanceVariable().
bool Sema::DiagnoseEmptyLookup | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
LookupResult & | R, | ||
CorrectionCandidateCallback & | CCC, | ||
TemplateArgumentListInfo * | ExplicitTemplateArgs = nullptr , |
||
ArrayRef< Expr *> | Args = None , |
||
TypoExpr ** | Out = nullptr |
||
) |
Diagnose an empty lookup.
Definition at line 1920 of file SemaExpr.cpp.
Referenced by BuildRecoveryCallExpr().
Warn if a for/while loop statement S
, which is followed by PossibleBody
, has a suspicious null statement as a body.
Definition at line 13605 of file SemaChecking.cpp.
References Diag(), clang::Stmt::getBeginLoc(), clang::NullStmt::getSemiLoc(), and ShouldDiagnoseEmptyStmtBody().
void Sema::DiagnoseEmptyStmtBody | ( | SourceLocation | StmtLoc, |
const Stmt * | Body, | ||
unsigned | DiagID | ||
) |
Emit DiagID
if statement located on StmtLoc
has a suspicious null statement as a Body
, and it is located on the same line.
This helps prevent bugs due to typos, such as: if (condition); do_stuff();
Definition at line 13584 of file SemaChecking.cpp.
References Diag(), clang::NullStmt::getSemiLoc(), and ShouldDiagnoseEmptyStmtBody().
void Sema::DiagnoseEqualityWithExtraParens | ( | ParenExpr * | ParenE | ) |
Redundant parentheses over an equality comparison can indicate that the user intended an assignment used as condition.
Definition at line 16835 of file SemaExpr.cpp.
References clang::ParenExpr::getBeginLoc(), clang::Expr::IgnoreParens(), clang::SourceLocation::isInvalid(), clang::SourceLocation::isMacroID(), and clang::Expr::isTypeDependent().
void Sema::diagnoseEquivalentInternalLinkageDeclarations | ( | SourceLocation | Loc, |
const NamedDecl * | D, | ||
ArrayRef< const NamedDecl *> | Equiv | ||
) |
Definition at line 9385 of file SemaOverload.cpp.
References Diag(), clang::Module::getFullModuleName(), and clang::Decl::getLocation().
void Sema::diagnoseExprIntendedAsTemplateName | ( | Scope * | S, |
ExprResult | TemplateName, | ||
SourceLocation | Less, | ||
SourceLocation | Greater | ||
) |
Definition at line 583 of file SemaTemplate.cpp.
void Sema::DiagnoseFunctionSpecifiers | ( | const DeclSpec & | DS | ) |
Diagnose function specifiers on a declaration of an identifier that does not identify a function.
Definition at line 5744 of file SemaDecl.cpp.
References Diag(), clang::DeclSpec::getExplicitSpecLoc(), clang::DeclSpec::getNoreturnSpecLoc(), clang::DeclSpec::getVirtualSpecLoc(), clang::DeclSpec::hasExplicitSpecifier(), clang::DeclSpec::isNoreturnSpecified(), and clang::DeclSpec::isVirtualSpecified().
void Sema::DiagnoseHiddenVirtualMethods | ( | CXXMethodDecl * | MD | ) |
Diagnose methods which overload virtual methods in a base class without overriding any.
Definition at line 7894 of file SemaDeclCXX.cpp.
References Diag(), clang::Decl::getLocation(), and clang::Decl::isInvalidDecl().
void Sema::diagnoseIgnoredQualifiers | ( | unsigned | DiagID, |
unsigned | Quals, | ||
SourceLocation | FallbackLoc, | ||
SourceLocation | ConstQualLoc = SourceLocation() , |
||
SourceLocation | VolatileQualLoc = SourceLocation() , |
||
SourceLocation | RestrictQualLoc = SourceLocation() , |
||
SourceLocation | AtomicQualLoc = SourceLocation() , |
||
SourceLocation | UnalignedQualLoc = SourceLocation() |
||
) |
Definition at line 2757 of file SemaType.cpp.
Referenced by diagnoseRedundantReturnTypeQualifiers().
void Sema::DiagnoseInvalidJumps | ( | Stmt * | Body | ) |
Definition at line 942 of file JumpDiagnostics.cpp.
void Sema::DiagnoseMisalignedMembers | ( | ) |
Diagnoses the current set of gathered accesses.
This typically happens at full expression level. The set is cleared after emitting the diagnostics.
Definition at line 14179 of file SemaChecking.cpp.
References Diag(), clang::NamedDecl::getName(), and clang::Decl::getSourceRange().
void Sema::DiagnoseMissingDesignatedInitOverrides | ( | const ObjCImplementationDecl * | ImplD, |
const ObjCInterfaceDecl * | IFD | ||
) |
Definition at line 2263 of file SemaObjCProperty.cpp.
References Diag(), clang::ObjCContainerDecl::getInstanceMethod(), clang::Decl::getLocation(), clang::ObjCMethodDecl::getSelector(), clang::ObjCInterfaceDecl::getSuperClass(), clang::ObjCInterfaceDecl::hasDesignatedInitializers(), clang::ObjCContainerDecl::instance_methods(), clang::Decl::isUnavailable(), clang::OMF_init, and clang::ObjCInterfaceDecl::visible_extensions().
void Sema::diagnoseMissingImport | ( | SourceLocation | Loc, |
NamedDecl * | Decl, | ||
MissingImportKind | MIK, | ||
bool | Recover = true |
||
) |
Diagnose that the specified declaration needs to be visible but isn't, and suggest a module import that would resolve the problem.
Definition at line 5177 of file SemaLookup.cpp.
References getDefinitionToImport(), clang::Decl::getLocation(), and clang::ASTContext::getModulesWithMergedDefinition().
Referenced by computeDeclContext(), diagnoseMissingArgument(), and RequireCompleteDeclContext().
void Sema::diagnoseMissingImport | ( | SourceLocation | Loc, |
NamedDecl * | Decl, | ||
SourceLocation | DeclLoc, | ||
ArrayRef< Module *> | Modules, | ||
MissingImportKind | MIK, | ||
bool | Recover | ||
) |
Definition at line 5208 of file SemaLookup.cpp.
References Diag(), getIncludeStringForHeader(), and clang::Module::GlobalModuleFragment.
void Sema::diagnoseMissingTemplateArguments | ( | TemplateName | Name, |
SourceLocation | Loc | ||
) |
Definition at line 4244 of file SemaTemplate.cpp.
Referenced by getVarTemplateSpecialization().
void Sema::DiagnoseMultipleMethodInGlobalPool | ( | SmallVectorImpl< ObjCMethodDecl *> & | Methods, |
Selector | Sel, | ||
SourceRange | R, | ||
bool | receiverIdOrClass | ||
) |
Definition at line 3557 of file SemaDeclObjC.cpp.
References Diag(), Diags, clang::SourceRange::getBegin(), getLangOpts(), isAcceptableMethodMismatch(), clang::DiagnosticsEngine::isIgnored(), MatchTwoMethodDeclarations(), MMS_loose, and MMS_strict.
Referenced by AreMultipleMethodsInGlobalPool().
Definition at line 3509 of file SemaOverload.cpp.
References clang::OverloadCandidateSet::CSK_Normal, Diag(), clang::Stmt::getBeginLoc(), clang::Expr::getExprLoc(), clang::Stmt::getSourceRange(), clang::Expr::getType(), IsUserDefinedConversion(), clang::OCD_AllCandidates, clang::OR_Ambiguous, clang::OR_No_Viable_Function, and clang::ImplicitConversionSequence::UserDefined.
Referenced by CheckConvertedConstantExpression().
void Sema::DiagnoseNonDefaultPragmaPack | ( | PragmaPackDiagnoseKind | Kind, |
SourceLocation | IncludeLoc | ||
) |
Definition at line 215 of file SemaAttr.cpp.
References ChangedStateAtExit, clang::Sema::PragmaStack< ValueType >::CurrentPragmaLocation, clang::Sema::PackIncludeState::CurrentPragmaLocation, clang::Sema::PragmaStack< ValueType >::CurrentValue, clang::Sema::PackIncludeState::CurrentValue, Diag(), clang::Sema::PragmaStack< ValueType >::hasValue(), NonDefaultStateAtInclude, PackIncludeStack, PackStack, and clang::Sema::PackIncludeState::ShouldWarnOnInclude.
Referenced by clang::sema::SemaPPCallbacks::FileChanged().
void Sema::DiagnoseNontrivial | ( | const CXXRecordDecl * | RD, |
CXXSpecialMember | CSM | ||
) |
Diagnose why the specified class does not have a trivial special member of the given kind.
Definition at line 7624 of file SemaDeclCXX.cpp.
void Sema::diagnoseNullableToNonnullConversion | ( | QualType | DstType, |
QualType | SrcType, | ||
SourceLocation | Loc | ||
) |
Warn if we're implicitly casting from a _Nullable pointer type to a _Nonnull one.
Definition at line 442 of file Sema.cpp.
References Context, Diag(), clang::Type::getNullability(), clang::NonNull, and clang::Nullable.
Referenced by ImpCastExprToType(), and PerformImplicitConversion().
void Sema::diagnoseNullResettableSynthesizedSetters | ( | const ObjCImplDecl * | impDecl | ) |
Diagnose any null-resettable synthesized setters.
Definition at line 2083 of file SemaObjCProperty.cpp.
References Diag(), clang::Decl::getBeginLoc(), clang::ObjCContainerDecl::getInstanceMethod(), clang::SourceLocation::isInvalid(), clang::ObjCPropertyDecl::OBJC_PR_null_resettable, clang::ObjCImplDecl::property_impls(), and clang::ObjCPropertyImplDecl::Synthesize.
void Sema::DiagnoseOwningPropertyGetterSynthesis | ( | const ObjCImplementationDecl * | D | ) |
Definition at line 2206 of file SemaObjCProperty.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::LangOptions::GCOnly, clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::ObjCPropertyDecl::getGetterMethodDecl(), clang::ObjCPropertyDecl::getGetterName(), clang::Preprocessor::getIdentifierInfo(), clang::ObjCContainerDecl::getInstanceMethod(), getLangOpts(), clang::Preprocessor::getLastMacroWithSpelling(), clang::Decl::getLocation(), clang::ObjCMethodDecl::getMethodFamily(), getPreprocessor(), clang::Decl::hasAttr(), clang::ObjCPropertyDecl::isClassProperty(), clang::SourceLocation::isValid(), clang::OMF_alloc, clang::OMF_copy, clang::OMF_mutableCopy, clang::OMF_new, PP, clang::ObjCImplDecl::property_impls(), and clang::Decl::redecls().
bool Sema::DiagnosePropertyAccessorMismatch | ( | ObjCPropertyDecl * | PD, |
ObjCMethodDecl * | Getter, | ||
SourceLocation | Loc | ||
) |
Definition at line 1654 of file SemaObjCProperty.cpp.
References clang::ASTContext::canAssignObjCInterfaces(), CheckAssignmentConstraints(), Compatible, Context, Diag(), clang::Type::getAs(), clang::ASTContext::getCanonicalType(), clang::Decl::getLocation(), clang::QualType::getNonReferenceType(), clang::ObjCMethodDecl::getReturnType(), clang::ObjCMethodDecl::getSelector(), clang::CanQual< T >::getUnqualifiedType(), clang::ASTContext::hasSameType(), and clang::Type::isArithmeticType().
Referenced by LookupMethodInReceiverType(), and ProcessPropertyDecl().
void Sema::DiagnosePropertyMismatch | ( | ObjCPropertyDecl * | Property, |
ObjCPropertyDecl * | SuperProperty, | ||
const IdentifierInfo * | Name, | ||
bool | OverridingProtocolProperty | ||
) |
DiagnosePropertyMismatch - Compares two properties for their attributes and types and warns on a variety of inconsistencies.
Definition at line 1576 of file SemaObjCProperty.cpp.
References checkAtomicPropertyMismatch(), Context, Diag(), clang::ASTContext::getCanonicalType(), clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::ObjCPropertyDecl::getGetterName(), clang::Decl::getLocation(), getOwnershipRule(), clang::ObjCPropertyDecl::getPropertyAttributes(), clang::ObjCPropertyDecl::getSetterName(), clang::ObjCPropertyDecl::getType(), isObjCPointerConversion(), clang::ObjCPropertyDecl::isReadOnly(), clang::ObjCPropertyDecl::OBJC_PR_copy, clang::ObjCPropertyDecl::OBJC_PR_readonly, clang::ObjCPropertyDecl::OBJC_PR_readwrite, clang::ObjCPropertyDecl::OBJC_PR_retain, clang::ObjCPropertyDecl::OBJC_PR_strong, and clang::ASTContext::propertyTypesAreCompatible().
bool Sema::diagnoseQualifiedDeclaration | ( | CXXScopeSpec & | SS, |
DeclContext * | DC, | ||
DeclarationName | Name, | ||
SourceLocation | Loc, | ||
bool | IsTemplateId | ||
) |
Diagnose a declaration whose declarator-id has the given nested-name-specifier.
SS | The nested-name-specifier of the declarator-id. |
DC | The declaration context to which the nested-name-specifier resolves. |
Name | The name of the entity being declared. |
Loc | The location of the name of the entity being declared. |
IsTemplateId | Whether the name is a (simple-)template-id, and thus we're declaring an explicit / partial specialization / instantiation. |
Definition at line 5305 of file SemaDecl.cpp.
void Sema::DiagnoseReturnInConstructorExceptionHandler | ( | CXXTryStmt * | TryBlock | ) |
Definition at line 14820 of file SemaDeclCXX.cpp.
References clang::CXXTryStmt::getHandler(), clang::CXXTryStmt::getNumHandlers(), and SearchForReturnInStmt().
void Sema::DiagnoseSelfMove | ( | const Expr * | LHSExpr, |
const Expr * | RHSExpr, | ||
SourceLocation | OpLoc | ||
) |
Warn if a value is moved to itself.
DiagnoseSelfMove - Emits a warning if a value is moved to itself.
Definition at line 13674 of file SemaChecking.cpp.
References Diag(), clang::CallExpr::getArg(), clang::MemberExpr::getBase(), clang::Decl::getCanonicalDecl(), clang::DeclRefExpr::getDecl(), clang::MemberExpr::getMemberDecl(), clang::CallExpr::getNumArgs(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Expr::IgnoreParenImpCasts(), clang::CallExpr::isCallToStdMove(), and isLayoutCompatible().
void Sema::DiagnoseSentinelCalls | ( | NamedDecl * | D, |
SourceLocation | Loc, | ||
ArrayRef< Expr *> | Args | ||
) |
DiagnoseSentinelCalls - This routine checks whether a call or message-send is to a declaration with the sentinel attribute, and if so, it checks that the requirements of the sentinel are satisfied.
Definition at line 340 of file SemaExpr.cpp.
References clang::Type::castAs(), Diag(), clang::Type::getAs(), clang::Decl::getAttr(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::Type::getPointeeType(), and clang::Expr::isValueDependent().
void Sema::DiagnoseShadowingLambdaDecls | ( | const sema::LambdaScopeInfo * | LSI | ) |
Diagnose shadowing for variables shadowed in the lambda record LambdaRD
when these variables are captured by the lambda.
Definition at line 7215 of file SemaDecl.cpp.
References computeShadowedDeclKind(), Diag(), getCaptureLocation(), clang::Decl::getDeclContext(), clang::Decl::getLocation(), clang::SourceLocation::isInvalid(), and clang::sema::LambdaScopeInfo::ShadowingDecls.
void Sema::DiagnoseSizeOfParametersAndReturnValue | ( | ArrayRef< ParmVarDecl *> | Parameters, |
QualType | ReturnTy, | ||
NamedDecl * | D | ||
) |
Diagnose whether the size of parameters or return value of a function or obj-c method definition is pass-by-value and larger than a specified threshold.
Definition at line 12938 of file SemaDecl.cpp.
References clang::Type::isDependentType(), and clang::QualType::isPODType().
void Sema::DiagnoseTemplateParameterShadow | ( | SourceLocation | Loc, |
Decl * | PrevDecl | ||
) |
DiagnoseTemplateParameterShadow - Produce a diagnostic complaining that the template parameter 'PrevDecl' is being shadowed by a new declaration at location Loc.
Returns true to indicate that this is an error, and false otherwise.
Definition at line 844 of file SemaTemplate.cpp.
References Diag(), clang::Decl::getLocation(), and clang::Decl::isTemplateParameter().
void Sema::DiagnoseTypeArgsAndProtocols | ( | IdentifierInfo * | ProtocolId, |
SourceLocation | ProtocolLoc, | ||
IdentifierInfo * | TypeArgId, | ||
SourceLocation | TypeArgLoc, | ||
bool | SelectProtocolFirst = false |
||
) |
Definition at line 1395 of file SemaDeclObjC.cpp.
References Diag().
void Sema::diagnoseTypo | ( | const TypoCorrection & | Correction, |
const PartialDiagnostic & | TypoDiag, | ||
bool | ErrorRecovery = true |
||
) |
Definition at line 5151 of file SemaLookup.cpp.
Referenced by ActOnStartClassImplementation(), FindProtocolDeclaration(), LookupMemberExpr(), and TryNamespaceTypoCorrection().
void Sema::diagnoseTypo | ( | const TypoCorrection & | Correction, |
const PartialDiagnostic & | TypoDiag, | ||
const PartialDiagnostic & | PrevNote, | ||
bool | ErrorRecovery = true |
||
) |
Diagnose a successfully-corrected typo.
Separated from the correction itself to allow external validation of the result, etc.
Correction | The result of performing typo correction. |
TypoDiag | The diagnostic to produce. This will have the corrected string added to it (and usually also a fixit). |
PrevNote | A note to use when indicating the location of the entity to which we are correcting. Will have the correction string added to it. |
ErrorRecovery | If true (the default), the caller is going to recover from the typo as if the corrected string had been typed. In this case, PDiag must be an error, and we will attach a fixit to it. |
Definition at line 5322 of file SemaLookup.cpp.
References clang::FixItHint::CreateReplacement(), Diag(), clang::TypoCorrection::getAsString(), clang::SourceRange::getBegin(), clang::TypoCorrection::getCorrectionRange(), clang::PartialDiagnostic::getDiagID(), clang::TypoCorrection::getExtraDiagnostics(), clang::TypoCorrection::getFoundDecl(), clang::TypoCorrection::getQuoted(), clang::TypoCorrection::isKeyword(), and clang::TypoCorrection::requiresImport().
void Sema::diagnoseUnavailableAlignedAllocation | ( | const FunctionDecl & | FD, |
SourceLocation | Loc | ||
) |
Produce diagnostics if FD
is an aligned allocation or deallocation function that is unavailable.
Definition at line 1745 of file SemaExprCXX.cpp.
References clang::alignedAllocMinVersion(), Diag(), clang::getAsString(), clang::QualType::getAsString(), getASTContext(), clang::DeclarationName::getCXXOverloadedOperator(), clang::NamedDecl::getDeclName(), clang::ASTContext::getTargetInfo(), clang::TargetInfo::getTriple(), clang::ValueDecl::getType(), and isUnavailableAlignedAllocationFunction().
bool Sema::DiagnoseUnexpandedParameterPack | ( | SourceLocation | Loc, |
TypeSourceInfo * | T, | ||
UnexpandedParameterPackContext | UPPC | ||
) |
If the given type contains an unexpanded parameter pack, diagnose the error.
Loc | The source location where a diagnostc should be emitted. |
T | The type that is being checked for unexpanded parameter packs. |
Definition at line 367 of file SemaTemplateVariadic.cpp.
References clang::Type::containsUnexpandedParameterPack(), DiagnoseUnexpandedParameterPacks(), clang::TypeSourceInfo::getType(), and clang::TypeSourceInfo::getTypeLoc().
Referenced by ActOnFinishFullExpr().
bool Sema::DiagnoseUnexpandedParameterPack | ( | Expr * | E, |
UnexpandedParameterPackContext | UPPC = UPPC_Expression |
||
) |
If the given expression contains an unexpanded parameter pack, diagnose the error.
E | The expression that is being checked for unexpanded parameter packs. |
Definition at line 383 of file SemaTemplateVariadic.cpp.
References clang::Expr::containsUnexpandedParameterPack(), DiagnoseUnexpandedParameterPacks(), and clang::Stmt::getBeginLoc().
bool Sema::DiagnoseUnexpandedParameterPack | ( | const CXXScopeSpec & | SS, |
UnexpandedParameterPackContext | UPPC | ||
) |
If the given nested-name-specifier contains an unexpanded parameter pack, diagnose the error.
SS | The nested-name-specifier that is being checked for unexpanded parameter packs. |
Definition at line 397 of file SemaTemplateVariadic.cpp.
References clang::NestedNameSpecifier::containsUnexpandedParameterPack(), DiagnoseUnexpandedParameterPacks(), clang::SourceRange::getBegin(), clang::CXXScopeSpec::getRange(), and clang::CXXScopeSpec::getScopeRep().
bool Sema::DiagnoseUnexpandedParameterPack | ( | const DeclarationNameInfo & | NameInfo, |
UnexpandedParameterPackContext | UPPC | ||
) |
If the given name contains an unexpanded parameter pack, diagnose the error.
NameInfo | The name (with source location information) that is being checked for unexpanded parameter packs. |
Definition at line 414 of file SemaTemplateVariadic.cpp.
References clang::Type::containsUnexpandedParameterPack(), clang::DeclarationName::CXXConstructorName, clang::DeclarationName::CXXConversionFunctionName, clang::DeclarationName::CXXDeductionGuideName, clang::DeclarationName::CXXDestructorName, clang::DeclarationName::CXXLiteralOperatorName, clang::DeclarationName::CXXOperatorName, clang::DeclarationName::CXXUsingDirective, DiagnoseUnexpandedParameterPacks(), clang::DeclarationName::getCXXNameType(), clang::DeclarationNameInfo::getLoc(), clang::DeclarationNameInfo::getName(), clang::DeclarationNameInfo::getNamedTypeInfo(), clang::DeclarationName::getNameKind(), clang::DeclarationName::Identifier, clang::DeclarationName::ObjCMultiArgSelector, clang::DeclarationName::ObjCOneArgSelector, and clang::DeclarationName::ObjCZeroArgSelector.
bool Sema::DiagnoseUnexpandedParameterPack | ( | SourceLocation | Loc, |
TemplateName | Template, | ||
UnexpandedParameterPackContext | UPPC | ||
) |
If the given template name contains an unexpanded parameter pack, diagnose the error.
Loc | The location of the template name. |
Template | The template name that is being checked for unexpanded parameter packs. |
Definition at line 450 of file SemaTemplateVariadic.cpp.
References clang::TemplateName::containsUnexpandedParameterPack(), DiagnoseUnexpandedParameterPacks(), and clang::TemplateName::isNull().
bool Sema::DiagnoseUnexpandedParameterPack | ( | TemplateArgumentLoc | Arg, |
UnexpandedParameterPackContext | UPPC | ||
) |
If the given template argument contains an unexpanded parameter pack, diagnose the error.
Arg | The template argument that is being checked for unexpanded parameter packs. |
Definition at line 464 of file SemaTemplateVariadic.cpp.
References clang::TemplateArgument::containsUnexpandedParameterPack(), DiagnoseUnexpandedParameterPacks(), clang::TemplateArgumentLoc::getArgument(), clang::TemplateArgumentLoc::getLocation(), and clang::TemplateArgument::isNull().
bool Sema::DiagnoseUnexpandedParameterPacks | ( | SourceLocation | Loc, |
UnexpandedParameterPackContext | UPPC, | ||
ArrayRef< UnexpandedParameterPack > | Unexpanded | ||
) |
Diagnose unexpanded parameter packs.
Diagnose all of the unexpanded parameter packs in the given vector.
Loc | The location at which we should emit the diagnostic. |
UPPC | The context in which we are diagnosing unexpanded parameter packs. |
Unexpanded | the set of unexpanded parameter packs. |
Definition at line 290 of file SemaTemplateVariadic.cpp.
References clang::sema::FunctionScopeInfo::CompoundScopes.
void clang::Sema::DiagnoseUnguardedAvailabilityViolations | ( | Decl * | FD | ) |
Issue any -Wunguarded-availability warnings in FD
.
void Sema::DiagnoseUnimplementedProperties | ( | Scope * | S, |
ObjCImplDecl * | IMPDecl, | ||
ObjCContainerDecl * | CDecl, | ||
bool | SynthesizeProperties | ||
) |
DiagnoseUnimplementedProperties - This routine warns on those properties which must be implemented by this implementation.
Definition at line 1975 of file SemaObjCProperty.cpp.
bool Sema::DiagnoseUninstantiableTemplate | ( | SourceLocation | PointOfInstantiation, |
NamedDecl * | Instantiation, | ||
bool | InstantiatedFromMember, | ||
const NamedDecl * | Pattern, | ||
const NamedDecl * | PatternDef, | ||
TemplateSpecializationKind | TSK, | ||
bool | Complain = true |
||
) |
Determine whether we would be unable to instantiate this template (because it either has no definition, or is in the process of being instantiated).
Definition at line 745 of file SemaTemplate.cpp.
References Definition, and clang::Decl::isInvalidDecl().
Referenced by InstantiateClass(), and InstantiateEnum().
bool Sema::DiagnoseUnknownTemplateName | ( | const IdentifierInfo & | II, |
SourceLocation | IILoc, | ||
Scope * | S, | ||
const CXXScopeSpec * | SS, | ||
TemplateTy & | SuggestedTemplate, | ||
TemplateNameKind & | SuggestedKind | ||
) |
Definition at line 319 of file SemaTemplate.cpp.
void Sema::DiagnoseUnknownTypeName | ( | IdentifierInfo *& | II, |
SourceLocation | IILoc, | ||
Scope * | S, | ||
CXXScopeSpec * | SS, | ||
ParsedType & | SuggestedType, | ||
bool | IsTemplateName = false |
||
) |
Definition at line 657 of file SemaDecl.cpp.
void Sema::DiagnoseUnterminatedPragmaAttribute | ( | ) |
Definition at line 718 of file SemaAttr.cpp.
References Diag(), and PragmaAttributeStack.
Referenced by ActOnEndOfTranslationUnit().
void Sema::DiagnoseUnterminatedPragmaPack | ( | ) |
Definition at line 249 of file SemaAttr.cpp.
References clang::FixItHint::CreateInsertion(), clang::Sema::PragmaStack< ValueType >::CurrentPragmaLocation, clang::Sema::PragmaStack< ValueType >::CurrentValue, clang::Sema::PragmaStack< ValueType >::DefaultValue, Diag(), clang::Lexer::findLocationAfterToken(), clang::SourceLocation::isValid(), LangOpts, PackStack, SourceMgr, and clang::Sema::PragmaStack< ValueType >::Stack.
Referenced by ActOnEndOfTranslationUnit().
void Sema::DiagnoseUnusedBackingIvarInAccessor | ( | Scope * | S, |
const ObjCImplementationDecl * | ImplD | ||
) |
DiagnoseUnusedBackingIvarInAccessor - Issue an 'unused' warning if ivar which backs the property is not used in the property's accessor.
Definition at line 5052 of file SemaDeclObjC.cpp.
void Sema::DiagnoseUnusedDecl | ( | const NamedDecl * | D | ) |
DiagnoseUnusedDecl - Emit warnings about declarations that are not used unless they are marked attr(unused).
Definition at line 1790 of file SemaDecl.cpp.
References GenerateFixForUnusedDecl(), and ShouldDiagnoseUnusedDecl().
void Sema::DiagnoseUnusedExprResult | ( | const Stmt * | S | ) |
DiagnoseUnusedExprResult - If the statement passed in is an expression whose result is unused, warn.
Definition at line 199 of file SemaStmt.cpp.
Referenced by ActOnFinishFullExpr(), and CheckCommaOperands().
bool Sema::DiagnoseUnusedLambdaCapture | ( | SourceRange | CaptureRange, |
const sema::Capture & | From | ||
) |
Diagnose if an explicit lambda capture is unused.
Returns true if a diagnostic is emitted.
Definition at line 1544 of file SemaLambda.cpp.
References clang::FixItHint::CreateRemoval(), Diag(), clang::sema::Capture::getLocation(), clang::sema::Capture::getVariable(), clang::sema::Capture::isNonODRUsed(), clang::sema::Capture::isThisCapture(), and clang::sema::Capture::isVLATypeCapture().
void Sema::DiagnoseUnusedNestedTypedefs | ( | const RecordDecl * | D | ) |
Definition at line 1776 of file SemaDecl.cpp.
References clang::DeclContext::decls(), clang::TypeDecl::getTypeForDecl(), and clang::Type::isDependentType().
void Sema::DiagnoseUnusedParameters | ( | ArrayRef< ParmVarDecl *> | Parameters | ) |
Diagnose any unused parameters in the given sequence of ParmVarDecl pointers.
Definition at line 12923 of file SemaDecl.cpp.
References Diag(), and clang::Parameter.
bool Sema::DiagnoseUseOfDecl | ( | NamedDecl * | D, |
ArrayRef< SourceLocation > | Locs, | ||
const ObjCInterfaceDecl * | UnknownObjCClass = nullptr , |
||
bool | ObjCPropertyAccess = false , |
||
bool | AvoidPartialAvailabilityChecks = false , |
||
ObjCInterfaceDecl * | ClassReceiver = nullptr |
||
) |
Determine whether the use of this declaration is valid, and emit any corresponding diagnostics.
This routine diagnoses various problems with referencing declarations that can occur when using a declaration. For example, it might warn if a deprecated or unavailable declaration is being used, or produce an error (and return true) if a C++0x deleted function is being used.
Definition at line 211 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus, clang::frontend::CPlusPlus14, Diag(), DiagnoseUnusedOfDecl(), diagnoseUseOfInternalDeclInInlineFunction(), clang::ObjCPropertyDecl::findPropertyDecl(), clang::Decl::getCanonicalDecl(), clang::NamedDecl::getDeclName(), and clang::Decl::getLocation().
Referenced by ActOnCXXDelete(), checkDestructorReference(), diagnoseUseOfProtocols(), FindProtocolDeclaration(), FinishOverloadedCallExpr(), LookupMemberExpr(), LookupMethodInReceiverType(), MaybeBindToTemporary(), clang::InitializationSequence::Perform(), PerformConstructorInitialization(), PerformImplicitConversion(), and resolveBuiltinNewDeleteOverload().
void Sema::DiagnoseUseOfUnimplementedSelectors | ( | ) |
Definition at line 4967 of file SemaDeclObjC.cpp.
References clang::ASTContext::AnyObjCImplementation(), Diag(), LookupImplementedMethodInGlobalPool(), and ReferencedSelectors.
Referenced by ActOnEndOfTranslationUnit().
Warn when implicitly casting 0 to nullptr.
Definition at line 456 of file Sema.cpp.
References clang::FixItHint::CreateReplacement(), Diag(), Diags, findMacroSpelling(), clang::Stmt::getBeginLoc(), getLangOpts(), clang::Stmt::getSourceRange(), clang::DiagnosticsEngine::getSuppressSystemWarnings(), clang::Expr::getType(), clang::Expr::IgnoreParenImpCasts(), clang::DiagnosticsEngine::isIgnored(), clang::SourceManager::isInSystemMacro(), clang::Type::isNullPtrType(), and SourceMgr.
Referenced by ImpCastExprToType().
bool Sema::DiagRuntimeBehavior | ( | SourceLocation | Loc, |
const Stmt * | Statement, | ||
const PartialDiagnostic & | PD | ||
) |
Conditionally issue a diagnostic based on the current evaluation context.
Statement | If Statement is non-null, delay reporting the diagnostic until the function body is parsed, and then do a basic reachability analysis to determine if the statement is reachable. If it is unreachable, the diagnostic will not be emitted. |
Definition at line 16728 of file SemaExpr.cpp.
References clang::None.
Referenced by AnalyzeComparison(), CheckForNullPointerDereference(), CheckNonNullArgument(), DiagnoseBadDivideOrRemainderValues(), DiagnoseBadShiftValues(), DiagnoseFloatingImpCast(), DiagnoseImpCast(), and diagnoseTautologicalComparison().
bool Sema::DiagRuntimeBehavior | ( | SourceLocation | Loc, |
ArrayRef< const Stmt *> | Stmts, | ||
const PartialDiagnostic & | PD | ||
) |
Similar, but diagnostic is only produced if all the specified statements are reachable.
Emit a diagnostic that describes an effect on the run-time behavior of the program being compiled.
This routine emits the given diagnostic when the code currently being type-checked is "potentially evaluated", meaning that there is a possibility that the code will actually be executable. Code in sizeof() expressions, code used only during overload resolution, etc., are not potentially evaluated. This routine will suppress such diagnostics or, in the absolutely nutty case of potentially potentially evaluated expressions (C++ typeid), queue the diagnostic to potentially emit it later.
This routine should be used for all diagnostics that describe the run-time behavior of a program, such as passing a non-POD value through an ellipsis. Failure to do so will likely result in spurious diagnostics or failures during overload resolution or within sizeof/alignof/typeof/typeid.
Definition at line 16685 of file SemaExpr.cpp.
References Diag().
void Sema::DiscardCleanupsInEvaluationContext | ( | ) |
Definition at line 14836 of file SemaExpr.cpp.
Referenced by checkForMultipleExportedDefaultConstructors(), and MaybeCreateExprWithCleanups().
This function checks if the expression is in the sef of potentially misaligned members and it is converted to some pointer type T with lower or equal alignment requirements.
If so it removes it. This is used when we do not want to diagnose such misaligned access (e.g. in conversions to void*).
Definition at line 14192 of file SemaChecking.cpp.
References clang::Type::getPointeeType(), clang::Expr::IgnoreParens(), clang::Type::isIncompleteType(), clang::Type::isIntegerType(), and clang::Type::isPointerType().
Referenced by clang::InitializationSequence::Perform().
void Sema::emitAndClearUnusedLocalTypedefWarnings | ( | ) |
Definition at line 832 of file Sema.cpp.
References Diag(), clang::ExternalSemaSource::ReadUnusedLocalTypedefNameCandidates(), and UnusedLocalTypedefNameCandidates.
void Sema::EmitCurrentDiagnostic | ( | unsigned | DiagID | ) |
Cause the active diagnostic on the DiagosticsEngine to be emitted.
This is closely coupled to the SemaDiagnosticBuilder class and should not be used elsewhere.
Definition at line 1258 of file Sema.cpp.
References AccessCheckingSFINAE, clang::DiagnosticsEngine::Clear(), Context, clang::frontend::CPlusPlus11, Diag(), Diags, clang::DiagnosticsEngine::EmitCurrentDiagnostic(), clang::DiagnosticsEngine::getCurrentDiagID(), clang::DiagnosticsEngine::getCurrentDiagLoc(), clang::ASTContext::getDiagAllocator(), clang::DiagnosticIDs::getDiagnosticSFINAEResponse(), getLangOpts(), clang::Diagnostic::getLocation(), getPrintingPolicy(), clang::DiagnosticIDs::isBuiltinNote(), isSFINAEContext(), NumSFINAEErrors, PrintContextStack(), clang::DiagnosticsEngine::setLastDiagnosticIgnored(), clang::ASTContext::setPrintingPolicy(), clang::DiagnosticIDs::SFINAE_AccessControl, clang::DiagnosticIDs::SFINAE_Report, clang::DiagnosticIDs::SFINAE_SubstitutionFailure, and clang::DiagnosticIDs::SFINAE_Suppress.
Referenced by clang::Sema::SemaDiagnosticBuilder::~SemaDiagnosticBuilder().
void Sema::EmitRelatedResultTypeNote | ( | const Expr * | E | ) |
If the given expression involves a message send to a method with a related result type, emit a note describing what happened.
Definition at line 1527 of file SemaExprObjC.cpp.
References clang::ObjCMessageExpr::getMethodDecl(), clang::ObjCMethodDecl::hasRelatedResultType(), and clang::Expr::IgnoreParenImpCasts().
Referenced by emitBadConversionNotes(), and PerformImplicitConversion().
void Sema::EmitRelatedResultTypeNoteForReturn | ( | QualType | destType | ) |
Given that we had incompatible pointer types in a return statement, check whether we're in a method with a related result type, and if so, emit a note describing what happened.
Definition at line 1498 of file SemaExprObjC.cpp.
References clang::ObjCMethodDecl::hasRelatedResultType().
Referenced by emitBadConversionNotes().
void Sema::EndOpenMPClause | ( | ) |
End analysis of clauses.
Definition at line 1967 of file SemaOpenMP.cpp.
References checkAllocateClauses(), DSAStack, and clang::OMPC_unknown.
void Sema::EndOpenMPDSABlock | ( | Stmt * | CurDirective | ) |
Called on end of data sharing attribute block.
Definition at line 1974 of file SemaOpenMP.cpp.
References buildDeclRefExpr(), buildVarDecl(), clang::C, checkAllocateClauses(), DSAStack, FinishOpenMPLinearClause(), clang::TypoCorrection::getCorrectionDecl(), getCurLexicalContext(), getCurScope(), clang::Decl::getKind(), clang::ValueDecl::getType(), isDeclInScope(), and clang::Decl::isInvalidDecl().
void Sema::EnterDeclaratorContext | ( | Scope * | S, |
DeclContext * | DC | ||
) |
EnterDeclaratorContext - Used when we must lookup names in the context of a declarator's nested name specifier.
Definition at line 1272 of file SemaDecl.cpp.
void Sema::EraseUnwantedCUDAMatches | ( | const FunctionDecl * | Caller, |
SmallVectorImpl< std::pair< DeclAccessPair, FunctionDecl *>> & | Matches | ||
) |
Finds a function in Matches
with highest calling priority from Caller
context and erases all functions with lower calling priority.
Definition at line 213 of file SemaCUDA.cpp.
void Sema::EvaluateImplicitExceptionSpec | ( | SourceLocation | Loc, |
CXXMethodDecl * | MD | ||
) |
Evaluate the implicit exception specification for a defaulted special member function.
Definition at line 6534 of file SemaDeclCXX.cpp.
References clang::Type::castAs(), computeImplicitExceptionSpec(), clang::EST_Unevaluated, clang::CXXMethodDecl::getCanonicalDecl(), clang::FunctionProtoType::getExceptionSpecType(), and clang::ValueDecl::getType().
Referenced by ResolveExceptionSpec().
void Sema::ExitDeclaratorContext | ( | Scope * | S | ) |
Definition at line 1301 of file SemaDecl.cpp.
Definition at line 11025 of file SemaOverload.cpp.
References clang::Type::getAs(), and clang::Type::getPointeeType().
Referenced by IsStandardConversion().
void Sema::FillInlineAsmIdentifierInfo | ( | Expr * | Res, |
llvm::InlineAsmIdentifierInfo & | Info | ||
) |
Definition at line 698 of file SemaStmtAsm.cpp.
References clang::Expr::EvaluateAsRValue(), clang::Expr::getType(), clang::Type::isDependentType(), clang::Type::isFunctionType(), and clang::Expr::isRValue().
void Sema::FilterAcceptableTemplateNames | ( | LookupResult & | R, |
bool | AllowFunctionTemplates = true , |
||
bool | AllowDependent = true |
||
) |
Definition at line 119 of file SemaTemplate.cpp.
References clang::LookupResult::Filter::done(), clang::LookupResult::Filter::erase(), clang::LookupResult::Filter::hasNext(), clang::LookupResult::makeFilter(), and clang::LookupResult::Filter::next().
void Sema::FilterLookupForScope | ( | LookupResult & | R, |
DeclContext * | Ctx, | ||
Scope * | S, | ||
bool | ConsiderLinkage, | ||
bool | AllowInlineNamespace | ||
) |
Filters out lookup results that don't fall within the given scope as determined by isDeclInScope.
Definition at line 1452 of file SemaDecl.cpp.
void Sema::FinalizeDeclaration | ( | Decl * | ThisDecl | ) |
FinalizeDeclaration - called by ParseDeclarationAfterDeclarator to perform any semantic actions necessary after any initializer has been attached.
Definition at line 12431 of file SemaDecl.cpp.
References clang::Decl::addAttr(), clang::Decl::hasAttr(), clang::VarDecl::hasGlobalStorage(), and clang::VarDecl::isThisDeclarationADefinition().
Referenced by FinishForRangeVarDecl(), and noteMemberDeclaredHere().
Sema::DeclGroupPtrTy Sema::FinalizeDeclaratorGroup | ( | Scope * | S, |
const DeclSpec & | DS, | ||
ArrayRef< Decl *> | Group | ||
) |
Definition at line 12611 of file SemaDecl.cpp.
void Sema::FinalizeVarWithDestructor | ( | VarDecl * | VD, |
const RecordType * | DeclInitType | ||
) |
FinalizeVarWithDestructor - Prepare for calling destructor on the constructed variable.
Definition at line 13163 of file SemaDeclCXX.cpp.
References Diag(), clang::RecordType::getDecl(), clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::VarDecl::hasGlobalStorage(), clang::CXXRecordDecl::hasIrrelevantDestructor(), clang::Type::isArrayType(), clang::DeclContext::isDependentContext(), clang::Decl::isInvalidDecl(), clang::VarDecl::isNoDestroy(), clang::VarDecl::isStaticLocal(), and clang::FunctionDecl::isTrivial().
bool Sema::FindAllocationFunctions | ( | SourceLocation | StartLoc, |
SourceRange | Range, | ||
AllocationFunctionScope | NewScope, | ||
AllocationFunctionScope | DeleteScope, | ||
QualType | AllocType, | ||
bool | IsArray, | ||
bool & | PassAlignment, | ||
MultiExprArg | PlaceArgs, | ||
FunctionDecl *& | OperatorNew, | ||
FunctionDecl *& | OperatorDelete, | ||
bool | Diagnose = true |
||
) |
Finds the overloads of operator new and delete that are appropriate for the allocation.
Definition at line 2335 of file SemaExprCXX.cpp.
References AFS_Class, AFS_Global, Context, clang::ASTContext::DeclarationNames, DeclareGlobalNewDelete(), Diag(), clang::LookupResult::empty(), clang::Type::getAs(), clang::Type::getAsCXXRecordDecl(), clang::ASTContext::getBaseElementType(), clang::DeclarationNameTable::getCXXOperatorName(), clang::DeclarationName::getCXXOverloadedOperator(), clang::NamedDecl::getDeclName(), getLangOpts(), clang::TargetInfo::getPointerWidth(), clang::ASTContext::getSizeType(), getStdAlignValT(), clang::ASTContext::getTargetInfo(), clang::ASTContext::getTranslationUnitDecl(), clang::ASTContext::getTypeDeclType(), clang::LookupResult::isAmbiguous(), clang::Type::isRecordType(), LookupOrdinaryName, LookupQualifiedName(), resolveAllocationOverload(), clang::LookupResult::suppressDiagnostics(), and clang::ASTContext::VoidTy.
Referenced by diagReturnOnAllocFailure().
void Sema::FindAssociatedClassesAndNamespaces | ( | SourceLocation | InstantiationLoc, |
ArrayRef< Expr *> | Args, | ||
AssociatedNamespaceSet & | AssociatedNamespaces, | ||
AssociatedClassSet & | AssociatedClasses | ||
) |
Find the associated classes and namespaces for argument-dependent lookup for a call with the given set of arguments.
This routine computes the sets of associated classes and associated namespaces searched by argument-dependent lookup (C++ [basic.lookup.argdep]) for a given set of arguments.
Definition at line 2897 of file SemaLookup.cpp.
References clang::Expr::getType().
Referenced by argumentDependentLookup(), and DiagnoseTwoPhaseLookup().
QualType Sema::FindCompositeObjCPointerType | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
SourceLocation | QuestionLoc | ||
) |
FindCompositeObjCPointerType - Helper method to find composite type of two objective-c pointer types of the two input expressions.
Definition at line 7332 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::Type::isObjCClassType().
Referenced by CXXCheckConditionalOperands().
QualType Sema::FindCompositePointerType | ( | SourceLocation | Loc, |
Expr *& | E1, | ||
Expr *& | E2, | ||
bool | ConvertArgs = true |
||
) |
Find a merged pointer type and convert the two expressions to it.
This finds the composite pointer type (or member pointer type) for E1
and E2
according to C++1z 5p14. It converts both expressions to this type and returns it. It does not emit diagnostics.
Loc | The location of the operator requiring these two expressions to be converted to the composite pointer type. |
ConvertArgs | If false , do not convert E1 and E2 to the target type. |
Definition at line 6092 of file SemaExprCXX.cpp.
References clang::Qualifiers::Const, Context, clang::frontend::CPlusPlus, clang::InitializationKind::CreateCopy(), clang::FunctionProtoType::ExtProtoInfo::ExceptionSpec, clang::FunctionProtoType::ExtProtoInfo::ExtInfo, clang::Qualifiers::fromCVRMask(), clang::ActionResult< PtrTy, CompressInvalid >::getAs(), clang::Type::getAs(), clang::MemberPointerType::getClass(), clang::QualType::getCVRQualifiers(), clang::ASTContext::getFunctionType(), getLangOpts(), clang::ASTContext::getMemberPointerType(), clang::FunctionType::ExtInfo::getNoReturn(), clang::PointerType::getPointeeType(), clang::MemberPointerType::getPointeeType(), clang::ASTContext::getPointerType(), clang::ASTContext::getQualifiedType(), clang::Expr::getType(), clang::ASTContext::hasSameType(), ImpCastExprToType(), clang::InitializedEntity::InitializeTemporary(), clang::Type::isAnyPointerType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isMemberPointerType(), clang::Expr::isNullPointerConstant(), clang::Type::isNullPtrType(), mergeExceptionSpecs(), clang::Expr::NPC_ValueDependentIsNull, clang::InitializationSequence::Perform(), and clang::FunctionType::ExtInfo::withNoReturn().
Referenced by convertPointersToCompositeType(), and CXXCheckConditionalOperands().
|
inline |
Definition at line 10085 of file Sema.h.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and t.
bool Sema::FindDeallocationFunction | ( | SourceLocation | StartLoc, |
CXXRecordDecl * | RD, | ||
DeclarationName | Name, | ||
FunctionDecl *& | Operator, | ||
bool | Diagnose = true |
||
) |
Definition at line 2879 of file SemaExprCXX.cpp.
Referenced by ActOnCXXDelete().
FunctionDecl * Sema::FindDeallocationFunctionForDestructor | ( | SourceLocation | StartLoc, |
CXXRecordDecl * | RD | ||
) |
Definition at line 2862 of file SemaExprCXX.cpp.
Find the failed Boolean condition within a given Boolean constant expression, and describe it with a string.
Definition at line 3186 of file SemaTemplate.cpp.
References collectConjunctionTerms(), ConstantEvaluated, clang::Expr::IgnoreParenImpCasts(), and lookThroughRangesV3Condition().
NamedDecl * Sema::FindFirstQualifierInScope | ( | Scope * | S, |
NestedNameSpecifier * | NNS | ||
) |
If the given nested-name-specifier begins with a bare identifier (e.g., Base::), perform name lookup for that identifier as a nested-name-specifier within the given scope, and return the result of that name lookup.
Definition at line 358 of file SemaCXXScopeSpec.cpp.
void Sema::FindHiddenVirtualMethods | ( | CXXMethodDecl * | MD, |
SmallVectorImpl< CXXMethodDecl *> & | OverloadedMethods | ||
) |
Check if a method overloads virtual methods in a base class without overriding any.
Definition at line 7853 of file SemaDeclCXX.cpp.
References clang::NamedDecl::getDeclName(), and clang::DeclarationName::isIdentifier().
CXXConstructorDecl * Sema::findInheritingConstructor | ( | SourceLocation | Loc, |
CXXConstructorDecl * | BaseCtor, | ||
ConstructorUsingShadowDecl * | Shadow | ||
) |
Given a derived-class using shadow declaration for a constructor and the correspnding base class constructor, find or create the implicit synthesized derived class constructor to use for this initialization.
Find or create the fake constructor we synthesize to model constructing an object of a derived class via a constructor of a base class.
Definition at line 11132 of file SemaDeclCXX.cpp.
References clang::Decl::getLocation(), and clang::ConstructorUsingShadowDecl::getParent().
Referenced by clang::Sema::InheritedConstructorInfo::findConstructorForBase(), and PerformConstructorInitialization().
DeclContext * Sema::FindInstantiatedContext | ( | SourceLocation | Loc, |
DeclContext * | DC, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Finds the instantiation of the given declaration context within the current instantiation.
Definition at line 5191 of file SemaTemplateInstantiateDecl.cpp.
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
NamedDecl * Sema::FindInstantiatedDecl | ( | SourceLocation | Loc, |
NamedDecl * | D, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
bool | FindingInstantiatedContext = false |
||
) |
Find the instantiation of the given declaration within the current instantiation.
This routine is intended to be used when D
is a declaration referenced from within a template, that needs to mapped into the corresponding declaration within an instantiation. For example, given:
In the instantiation of X<int>::getKind()
, we need to map the EnumConstantDecl
for KnownValue
(which refers to X<T>::<Kind>::KnownValue
) to its instantiation (X<int>::<Kind>::KnownValue
). FindInstantiatedDecl
performs this mapping from within the instantiation of X<int>
.
Definition at line 5225 of file SemaTemplateInstantiateDecl.cpp.
References clang::TemplateArgumentListInfo::addArgument(), clang::TemplateSpecializationType::anyDependentTemplateArguments(), Diag(), clang::DeclContext::Equals(), clang::Type::getAsCXXRecordDecl(), clang::ClassTemplateDecl::getCanonicalDecl(), clang::Decl::getDeclContext(), clang::MultiLevelTemplateArgumentList::getInnermost(), clang::DeclContext::getParent(), clang::TemplateDecl::getTemplateParameters(), clang::DeclContext::isDependentContext(), clang::DeclContext::isFileContext(), clang::DeclContext::isFunctionOrMethod(), isInstantiationOf(), clang::Decl::isInvalidDecl(), clang::QualType::isNull(), clang::TemplateArgument::Pack, clang::TemplateParameterList::size(), and clang::TSK_ExplicitSpecialization.
Referenced by clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), clang::TemplateDeclInstantiator::VisitFunctionDecl(), and clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl().
NamedDecl * Sema::findLocallyScopedExternCDecl | ( | DeclarationName | Name | ) |
Look for a locally scoped extern "C" declaration by the given name.
Definition at line 5736 of file SemaDecl.cpp.
bool Sema::findMacroSpelling | ( | SourceLocation & | locref, |
StringRef | name | ||
) |
Looks through the macro-expansion chain for the given location, looking for a macro expansion with the given name.
If one is found, returns true and sets the location to that expansion loc.
Definition at line 1552 of file Sema.cpp.
References clang::SourceManager::getExpansionLoc(), getPreprocessor(), getSourceManager(), and clang::SourceLocation::isMacroID().
Referenced by diagnoseZeroToNullptrConversion().
void Sema::FindProtocolDeclaration | ( | bool | WarnOnDeclarations, |
bool | ForObjCContainer, | ||
ArrayRef< IdentifierLocPair > | ProtocolId, | ||
SmallVectorImpl< Decl *> & | Protocols | ||
) |
FindProtocolDeclaration - This routine looks up protocols and issues an error if they are not declared.
It returns list of protocol declarations in its 'Protocols' argument.
Definition at line 1293 of file SemaDeclObjC.cpp.
References Context, CorrectTypo(), CTK_ErrorRecovery, Diag(), diagnoseTypo(), DiagnoseUseOfDecl(), clang::TypoCorrection::getCorrectionDeclAs(), clang::ObjCProtocolDecl::getDefinition(), clang::Decl::getLocation(), clang::ObjCProtocolDecl::isThisDeclarationADefinition(), LookupObjCProtocolName, LookupOrdinaryName, LookupProtocol(), NestedProtocolHasNoDefinition(), PDiag(), and TUScope.
FunctionDecl * Sema::FindUsualDeallocationFunction | ( | SourceLocation | StartLoc, |
bool | CanProvideSize, | ||
bool | Overaligned, | ||
DeclarationName | Name | ||
) |
Definition at line 2843 of file SemaExprCXX.cpp.
Referenced by ActOnCXXDelete().
StmtResult Sema::FinishCXXForRangeStmt | ( | Stmt * | S, |
Stmt * | B | ||
) |
FinishCXXForRangeStmt - Attach the body to a C++0x for-range statement.
This is a separate step from ActOnCXXForRangeStmt because analysis of the body cannot be performed until after the type of the range variable is determined.
Definition at line 2816 of file SemaStmt.cpp.
void Sema::finishLambdaExplicitCaptures | ( | sema::LambdaScopeInfo * | LSI | ) |
Note that we have finished the explicit captures for the given lambda.
Definition at line 486 of file SemaLambda.cpp.
References clang::sema::LambdaScopeInfo::finishedExplicitCaptures().
StmtResult Sema::FinishObjCForCollectionStmt | ( | Stmt * | S, |
Stmt * | B | ||
) |
FinishObjCForCollectionStmt - Attach the body to a objective-C foreach statement.
Definition at line 2649 of file SemaStmt.cpp.
Sema::TemplateDeductionResult Sema::FinishTemplateArgumentDeduction | ( | FunctionTemplateDecl * | FunctionTemplate, |
SmallVectorImpl< DeducedTemplateArgument > & | Deduced, | ||
unsigned | NumExplicitlySpecified, | ||
FunctionDecl *& | Specialization, | ||
sema::TemplateDeductionInfo & | Info, | ||
SmallVectorImpl< OriginalCallArg > const * | OriginalCallArgs = nullptr , |
||
bool | PartialOverloading = false , |
||
llvm::function_ref< bool()> | CheckNonDependent = []{ return false; } |
||
) |
Finish template argument deduction for a function template, checking the deduced template arguments for completeness and forming the function template specialization.
OriginalCallArgs | If non-NULL, the original call arguments against which the deduced argument types should be compared. |
Definition at line 3303 of file SemaTemplateDeduction.cpp.
References clang::sema::TemplateDeductionInfo::getLocation(), clang::FunctionTemplateDecl::getTemplatedDecl(), and Unevaluated.
Expr * Sema::FixOverloadedFunctionReference | ( | Expr * | E, |
DeclAccessPair | Found, | ||
FunctionDecl * | Fn | ||
) |
FixOverloadedFunctionReference - E is an expression that refers to a C++ overloaded function (possibly with some parentheses and perhaps a '&' around it).
We have resolved the overloaded function to the function declaration Fn, so patch up the expression E to refer (possibly indirectly) to Fn. Returns the new expr.
Definition at line 13776 of file SemaOverload.cpp.
Referenced by DiagnoseBadFunctionCast(), FinishOverloadedCallExpr(), IsStandardConversion(), clang::InitializationSequence::Perform(), and PerformImplicitConversion().
ExprResult Sema::FixOverloadedFunctionReference | ( | ExprResult | E, |
DeclAccessPair | FoundDecl, | ||
FunctionDecl * | Fn | ||
) |
Definition at line 13949 of file SemaOverload.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get().
void Sema::ForceDeclarationOfImplicitMembers | ( | CXXRecordDecl * | Class | ) |
Force the declaration of any implicitly-declared members of this class.
Definition at line 813 of file SemaLookup.cpp.
References CanDeclareSpecialMemberFunction(), clang::CXXRecordDecl::needsImplicitCopyAssignment(), clang::CXXRecordDecl::needsImplicitCopyConstructor(), clang::CXXRecordDecl::needsImplicitDefaultConstructor(), clang::CXXRecordDecl::needsImplicitDestructor(), clang::CXXRecordDecl::needsImplicitMoveAssignment(), and clang::CXXRecordDecl::needsImplicitMoveConstructor().
ExprResult Sema::forceUnknownAnyToType | ( | Expr * | E, |
QualType | ToType | ||
) |
Force an expression with unknown-type to an expression of the given type.
Definition at line 17379 of file SemaExpr.cpp.
Referenced by ActOnFinishFullExpr().
bool Sema::FormatStringHasSArg | ( | const StringLiteral * | FExpr | ) |
Definition at line 8566 of file SemaChecking.cpp.
References clang::StringLiteral::getString().
Referenced by DiagnoseCStringFormatDirectiveInCFAPI(), and DiagnoseCStringFormatDirectiveInObjCAPI().
|
inline |
Definition at line 3284 of file Sema.h.
Referenced by ActOnCompatibilityAlias(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), ActOnStartClassImplementation(), ActOnStartProtocolInterface(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
void clang::Sema::FreePackedContext | ( | ) |
FreePackedContext - Deallocate and null out PackContext.
void Sema::FreeVisContext | ( | ) |
FreeVisContext - Deallocate and null out VisContext.
Definition at line 775 of file SemaAttr.cpp.
References VisContext.
Referenced by ~Sema().
bool Sema::FunctionParamTypesAreEqual | ( | const FunctionProtoType * | OldType, |
const FunctionProtoType * | NewType, | ||
unsigned * | ArgPos = nullptr |
||
) |
FunctionParamTypesAreEqual - This routine checks two function proto types for equality of their argument types.
Caller has already checked that they have same number of arguments. If the parameters are different, ArgPos will have the parameter index of the first different parameter.
Definition at line 2865 of file SemaOverload.cpp.
References clang::FunctionProtoType::param_type_begin(), and clang::FunctionProtoType::param_type_end().
bool Sema::GatherArgumentsForCall | ( | SourceLocation | CallLoc, |
FunctionDecl * | FDecl, | ||
const FunctionProtoType * | Proto, | ||
unsigned | FirstParam, | ||
ArrayRef< Expr *> | Args, | ||
SmallVectorImpl< Expr *> & | AllArgs, | ||
VariadicCallType | CallType = VariadicDoesNotApply , |
||
bool | AllowExplicit = false , |
||
bool | IsListInitialization = false |
||
) |
GatherArgumentsForCall - Collector argument expressions for various form of call prototypes.
Definition at line 5107 of file SemaExpr.cpp.
References clang::Stmt::getBeginLoc(), clang::FunctionProtoType::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::FunctionProtoType::getParamType(), clang::Expr::getType(), and i.
void Sema::GatherGlobalCodeCompletions | ( | CodeCompletionAllocator & | Allocator, |
CodeCompletionTUInfo & | CCTUInfo, | ||
SmallVectorImpl< CodeCompletionResult > & | Results | ||
) |
Definition at line 8788 of file SemaCodeComplete.cpp.
std::string Sema::getAmbiguousPathsDisplayString | ( | CXXBasePaths & | Paths | ) |
Builds a string representing ambiguous paths from a specific derived class to different subobjects of the same base class.
This function builds a string that can be used in error messages to show the different paths that one can take through the inheritance hierarchy to go from the derived class to different subobjects of a base class. The result looks something like this:
Definition at line 2736 of file SemaDeclCXX.cpp.
|
inline |
Definition at line 1293 of file Sema.h.
Referenced by getASTMutationListener().
|
inline |
Definition at line 1292 of file Sema.h.
Referenced by AnalyzeCompoundAssignment(), assignInheritanceModel(), buildCapture(), buildCaptureDecl(), canPassInRegisters(), checkArrayExpressionDoesNotReferToUnitySize(), checkArrayExpressionDoesNotReferToWholeSize(), CheckBuiltinTargetSupport(), checkFormatStringExpr(), CheckImplicitConversion(), checkMapClauseExpressionBase(), checkMappableExpressionList(), checkObjCMethodX86VectorTypes(), checkOpenMPLoop(), CollectStmtSequenceData(), DiagnoseBinOpPrecedence(), DiagnoseCallingConvCast(), DiagnoseNarrowingInInitList(), diagnoseObjCLiteralComparison(), diagnoseRepeatedUseOfWeak(), diagnoseStringPlusChar(), diagnoseUnavailableAlignedAllocation(), EvaluateBinaryTypeTrait(), EvaluatesAsFalse(), EvaluatesAsTrue(), hasNewExtendedAlignment(), IsCommonTypo(), IsStandardConversion(), IsZeroInitializer(), LookupBuiltin(), clang::Parser::ParseFirstTopLevelDecl(), parseOpenMPReductionId(), clang::Parser::ParseTopLevelDecl(), reportOriginalDsa(), and TryAddressSpaceCast().
NamedDecl * Sema::getAsTemplateNameDecl | ( | NamedDecl * | D, |
bool | AllowFunctionTemplates = true , |
||
bool | AllowDependent = true |
||
) |
Try to interpret the lookup result D as a template-name.
Determine whether the declaration found is acceptable as the name of a template and, if so, return that template declaration.
D | A declaration found by name lookup. |
AllowFunctionTemplates | Whether function templates should be considered valid results. |
AllowDependent | Whether unresolved using declarations (that might name templates) should be considered valid results. |
Otherwise, returns null.
Note that this may return an UnresolvedUsingValueDecl if AllowDependent is true. In all other cases it will return a TemplateDecl (or null).
Definition at line 73 of file SemaTemplate.cpp.
References clang::NamedDecl::getUnderlyingDecl().
ASTMutationListener * Sema::getASTMutationListener | ( | ) | const |
Definition at line 408 of file Sema.cpp.
References getASTConsumer(), and clang::ASTConsumer::GetASTMutationListener().
Referenced by InstantiateInClassInitializer(), and UpdateExceptionSpec().
const AttributedType * Sema::getCallingConvAttributedType | ( | QualType | T | ) | const |
Get the outermost AttributedType node that sets a calling convention.
Valid types should not have multiple attributes with different CCs.
Definition at line 2908 of file SemaDecl.cpp.
References clang::Type::getAs(), clang::AttributedType::getModifiedType(), and clang::AttributedType::isCallingConv().
Referenced by handleFunctionTypeAttr().
QualType Sema::getCapturedDeclRefType | ( | VarDecl * | Var, |
SourceLocation | Loc | ||
) |
Given a variable, determine the type that a reference to that variable will have in the given scope.
Definition at line 15858 of file SemaExpr.cpp.
Referenced by getDecltypeForExpr().
ParsedType Sema::getConstructorName | ( | IdentifierInfo & | II, |
SourceLocation | NameLoc, | ||
Scope * | S, | ||
CXXScopeSpec & | SS, | ||
bool | EnteringContext | ||
) |
Definition at line 82 of file SemaExprCXX.cpp.
Referenced by clang::Parser::ParseUnqualifiedId().
DeclContext * Sema::getContainingDC | ( | DeclContext * | DC | ) |
Definition at line 1201 of file SemaDecl.cpp.
References clang::DeclContext::getLexicalParent(), and clang::isLambdaCallOperator().
VarDecl * Sema::getCopyElisionCandidate | ( | QualType | ReturnType, |
Expr * | E, | ||
CopyElisionSemanticsKind | CESK | ||
) |
Determine whether the given expression is a candidate for copy elision in either a return statement or a throw expression.
ReturnType | If we're determining the copy elision candidate for a return statement, this is the return type of the function. If we're determining the copy elision candidate for a throw expression, this will be a NULL type. |
E | The expression being returned from the function or block, or being thrown. |
CESK | Whether we allow function parameters or id-expressions that could be moved out of the function to be considered NRVO candidates. C++ prohibits these for NRVO itself, but we re-use this logic to determine whether we should try to move as part of a return or throw (which does allow function parameters). |
Definition at line 2923 of file SemaStmt.cpp.
References clang::DeclRefExpr::getDecl(), clang::Expr::IgnoreParens(), and clang::DeclRefExpr::refersToEnclosingVariableOrCapture().
std::string Sema::getCudaConfigureFuncName | ( | ) | const |
Returns the name of the launch configuration function.
This is the name of the function that will be called to configure kernel call, with the parameters specified via <<<>>>.
Definition at line 807 of file SemaCUDA.cpp.
References Context, clang::CUDA_USES_NEW_LAUNCH, clang::CudaFeatureEnabled(), getLangOpts(), clang::TargetInfo::getSDKVersion(), and clang::ASTContext::getTargetInfo().
BlockScopeInfo * Sema::getCurBlock | ( | ) |
Retrieve the current block, if any.
Definition at line 1767 of file Sema.cpp.
References CodeSynthesisContexts, CurContext, and FunctionScopes.
Referenced by AddKeywordsToConsumer().
CapturedRegionScopeInfo * Sema::getCurCapturedRegion | ( | ) |
Retrieve the current captured region, if any.
Definition at line 2124 of file Sema.cpp.
References FunctionScopes.
sema::CompoundScopeInfo & Sema::getCurCompoundScope | ( | ) | const |
Definition at line 346 of file SemaStmt.cpp.
|
inline |
Definition at line 1439 of file Sema.h.
Referenced by ActOnStartOfObjCMethodDef(), AddKeywordsToConsumer(), hasAnyUnrecoverableErrorsInThisFunction(), LookupMemberExpr(), LookupMethodInReceiverType(), PopCompoundScope(), PushCompoundScope(), and RecordModifiableNonNullParam().
FunctionDecl * Sema::getCurFunctionDecl | ( | ) |
getCurFunctionDecl - If inside of a function body, this returns a pointer to the function decl for the function being parsed.
If we're currently in a 'block', this returns the containing context.
Definition at line 1239 of file Sema.cpp.
References getFunctionLevelDeclContext().
Referenced by checkVAStartABI(), LookupMemberExpr(), and targetDiag().
NamedDecl * Sema::getCurFunctionOrMethodDecl | ( | ) |
getCurFunctionOrMethodDecl - Return the Decl for the current ObjC method or C function we're in, otherwise return null.
If we're currently in a 'block', this returns the containing context.
Definition at line 1251 of file Sema.cpp.
References getFunctionLevelDeclContext().
Referenced by AddKeywordsToConsumer().
LambdaScopeInfo * Sema::getCurGenericLambda | ( | ) |
Retrieve the current generic lambda info, if any.
Definition at line 1818 of file Sema.cpp.
References getCurLambda().
Referenced by addConstevalToLambdaDeclSpecifier().
LambdaScopeInfo * Sema::getCurLambda | ( | bool | IgnoreNonLambdaCapturingScope = false | ) |
Retrieve the current lambda scope info, if any.
IgnoreNonLambdaCapturingScope | true if should find the top-most lambda scope info ignoring all inner capturing scopes that are not lambda scopes. |
Definition at line 1794 of file Sema.cpp.
References CodeSynthesisContexts, CurContext, and FunctionScopes.
Referenced by ActOnFinishFullExpr(), DoMarkVarDeclReferenced(), getCurGenericLambda(), GetDeclSpecTypeForDeclarator(), getDecltypeForExpr(), RecordParsingTemplateParameterDepth(), and tryImplicitlyCaptureThisIfImplicitMemberFunctionAccessWithDependentArgs().
|
inline |
Definition at line 11143 of file Sema.h.
Referenced by CheckObjCDeclScope(), EndOpenMPDSABlock(), and LookupMethodInReceiverType().
ObjCMethodDecl * Sema::getCurMethodDecl | ( | ) |
getCurMethodDecl - If inside of a method body, this returns a pointer to the method decl for the method being parsed.
If we're currently in a 'block', this returns the containing context.
Definition at line 1244 of file Sema.cpp.
References getFunctionLevelDeclContext(), and clang::DeclContext::getParent().
Referenced by ActOnStartOfObjCMethodDef(), AddClassMessageCompletions(), AddSuperSendCompletion(), CheckForModifiableLvalue(), findRetainCycleOwner(), LookupMemberExpr(), and LookupPotentialTypoResult().
|
inline |
CXXRecordDecl * Sema::getCurrentClass | ( | Scope * | S, |
const CXXScopeSpec * | SS | ||
) |
Get the class that is directly named by the current context.
This is the class for which an unqualified-id in this scope could name a constructor or destructor.
If the scope specifier denotes a class, this will be that class. If the scope specifier is empty, this will be the class whose member-specification we are currently within. Otherwise, there is no such class.
Definition at line 2130 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, clang::CXXScopeSpec::isInvalid(), and clang::CXXScopeSpec::isNotEmpty().
CXXRecordDecl * Sema::getCurrentInstantiationOf | ( | NestedNameSpecifier * | NNS | ) |
If the given nested name specifier refers to the current instantiation, return the declaration that corresponds to that current instantiation (C++0x [temp.dep.type]p1).
NNS | a dependent nested name specifier. |
Definition at line 179 of file SemaCXXScopeSpec.cpp.
References clang::frontend::CPlusPlus, CurContext, clang::NestedNameSpecifier::getAsType(), getCurrentInstantiationOf(), getLangOpts(), and clang::NestedNameSpecifier::isDependent().
Referenced by computeDeclContext().
MangleNumberingContext * Sema::getCurrentMangleNumberContext | ( | const DeclContext * | DC, |
Decl *& | ManglingContextDecl | ||
) |
Compute the mangling number context for a lambda expression or block literal.
DC | - The DeclContext containing the lambda expression or block literal. | |
[out] | ManglingContextDecl | - Returns the ManglingContextDecl associated with the context, if relevant. |
Definition at line 276 of file SemaLambda.cpp.
References ContextKind, clang::DeclContext::getLexicalParent(), clang::DeclContext::getParent(), and isInInlineFunction().
|
inline |
QualType Sema::getCurrentThisType | ( | ) |
Try to retrieve the type of the 'this' pointer.
Definition at line 1073 of file SemaExprCXX.cpp.
References clang::isLambdaCallOperator(), and clang::QualType::isNull().
Referenced by ActOnCXXThis(), and CheckCXXThisCapture().
|
inline |
Retrieve the parser's current scope.
This routine must only be used when it is certain that semantic analysis and the parser are in precisely the same context, which is not the case when, e.g., we are performing any kind of template instantiation. Therefore, the only safe places to use this scope are in the parser itself and in routines directly invoked from the parser and never from template substitution or instantiation.
Definition at line 11132 of file Sema.h.
Referenced by BuildNonArrayForRange(), checkMappableExpressionList(), diagReturnOnAllocFailure(), emitReplacement(), EndOpenMPDSABlock(), clang::Parser::getCurScope(), getScopeForContext(), HandleAddressSpaceTypeAttribute(), HandleExtVectorTypeAttr(), HandleVectorSizeAttr(), isArithmeticArgumentPromotion(), and warnAboutRedundantParens().
ParsedType Sema::getDestructorName | ( | SourceLocation | TildeLoc, |
IdentifierInfo & | II, | ||
SourceLocation | NameLoc, | ||
Scope * | S, | ||
CXXScopeSpec & | SS, | ||
ParsedType | ObjectType, | ||
bool | EnteringContext | ||
) |
Definition at line 132 of file SemaExprCXX.cpp.
Referenced by clang::Parser::ParseUnqualifiedId().
ParsedType Sema::getDestructorTypeForDecltype | ( | const DeclSpec & | DS, |
ParsedType | ObjectType | ||
) |
Definition at line 379 of file SemaExprCXX.cpp.
References Diag(), clang::DeclSpec::getRepAsExpr(), clang::DeclSpec::getTypeSpecType(), clang::DeclSpec::getTypeSpecTypeLoc(), clang::DeclSpec::TST_decltype, clang::DeclSpec::TST_decltype_auto, and clang::DeclSpec::TST_error.
Referenced by clang::Parser::ParseUnqualifiedId().
|
inline |
Definition at line 1289 of file Sema.h.
Referenced by clang::sema::AnalysisBasedWarnings::AnalysisBasedWarnings(), buildCounterUpdate(), CheckCommaOperands(), CheckFallThroughForBody(), checkMoreSpecializedThanPrimary(), clang::sema::AnalysisBasedWarnings::IssueWarnings(), PushBlockScope(), PushCapturedRegionScope(), PushFunctionScope(), PushLambdaScope(), tryExprAsCall(), clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl(), clang::Sema::DeviceDiagBuilder::~DeviceDiagBuilder(), and clang::Sema::SFINAETrap::~SFINAETrap().
QualType Sema::getElaboratedType | ( | ElaboratedTypeKeyword | Keyword, |
const CXXScopeSpec & | SS, | ||
QualType | T, | ||
TagDecl * | OwnedTagDecl = nullptr |
||
) |
Retrieve a version of the type 'T' that is elaborated by Keyword, qualified by the nested-name-specifier contained in SS, and that is (re)declared by OwnedTagDecl, which is nullptr if this is not a (re)declaration.
Definition at line 8266 of file SemaType.cpp.
References clang::ETK_None, clang::CXXScopeSpec::getScopeRep(), clang::QualType::isNull(), and clang::CXXScopeSpec::isValid().
FunctionScopeInfo * Sema::getEnclosingFunction | ( | ) | const |
Definition at line 1782 of file Sema.cpp.
References FunctionScopes.
SourceRange Sema::getExprRange | ( | Expr * | E | ) | const |
Definition at line 431 of file SemaExpr.cpp.
References clang::Stmt::getSourceRange().
Referenced by clang::Parser::ParseConstraintExpression().
|
inline |
Definition at line 1295 of file Sema.h.
Referenced by AddClassMessageCompletions().
std::string Sema::getFixItZeroInitializerForType | ( | QualType | T, |
SourceLocation | Loc | ||
) | const |
Get a string to suggest for zero-initialization of a type.
Definition at line 200 of file SemaFixItUtils.cpp.
References clang::Type::getAsCXXRecordDecl(), getScalarZeroExpressionForType(), clang::CXXRecordDecl::hasDefinition(), clang::CXXRecordDecl::hasUserProvidedDefaultConstructor(), clang::CXXRecordDecl::isAggregate(), and clang::Type::isScalarType().
Referenced by maybeRecoverWithZeroInitialization(), and SuggestInitializationFixit().
std::string Sema::getFixItZeroLiteralForType | ( | QualType | T, |
SourceLocation | Loc | ||
) | const |
Definition at line 219 of file SemaFixItUtils.cpp.
References getScalarZeroExpressionForType().
Referenced by DiagnoseNullConversion().
IdentifierInfo * Sema::getFloat128Identifier | ( | ) | const |
Definition at line 2109 of file Sema.cpp.
References Context, clang::IdentifierTable::get(), and clang::ASTContext::Idents.
|
static |
Definition at line 4079 of file SemaChecking.cpp.
Referenced by DiagnoseCStringFormatDirectiveInCFAPI(), and DiagnoseCStringFormatDirectiveInObjCAPI().
|
static |
Definition at line 6867 of file SemaChecking.cpp.
References checkFormatStringExpr(), clang::FixItHint::CreateInsertion(), Diag(), and clang::Stmt::getSourceRange().
Referenced by checkFormatStringExpr().
Optional< unsigned > Sema::getFullyPackExpandedSize | ( | TemplateArgument | Arg | ) |
Given a template argument that contains an unexpanded parameter pack, but which has already been substituted, attempt to determine the number of elements that will be produced once this argument is fully-expanded.
This is intended for use when transforming 'sizeof...(Arg)' in order to avoid actually expanding the pack where possible.
Definition at line 1070 of file SemaTemplateVariadic.cpp.
References clang::TemplateArgument::containsUnexpandedParameterPack(), clang::TemplateArgument::Declaration, clang::TemplateArgument::Expression, clang::Type::getAs(), clang::TemplateArgument::getAsExpr(), clang::TemplateName::getAsSubstTemplateTemplateParmPack(), clang::TemplateArgument::getAsTemplate(), clang::TemplateArgument::getAsType(), clang::TemplateArgument::getKind(), clang::TemplateArgument::Integral, clang::None, clang::TemplateArgument::Null, clang::TemplateArgument::NullPtr, clang::TemplateArgument::Pack, clang::TemplateArgument::pack_elements(), clang::TemplateArgument::Template, clang::TemplateArgument::TemplateExpansion, and clang::TemplateArgument::Type.
DeclContext * Sema::getFunctionLevelDeclContext | ( | ) |
Definition at line 1219 of file Sema.cpp.
References CurContext, and clang::DeclContext::getParent().
Referenced by ClassifyImplicitMemberAccess(), DiagnoseConstAssignment(), diagnoseInstanceReference(), getCurFunctionDecl(), getCurFunctionOrMethodDecl(), and getCurMethodDecl().
Attr * Sema::getImplicitCodeSegOrSectionAttrForFunction | ( | const FunctionDecl * | FD, |
bool | IsDefinition | ||
) |
Returns an implicit CodeSegAttr if a __declspec(code_seg) is found on a containing class.
Otherwise it will return implicit SectionAttr if the function is a definition and there is an active value on CodeSegStack (from the current #pragma code-seg value).
FD | Function being declared. |
IsDefinition | Whether it is a definition or just a declarartion. |
Definition at line 9419 of file SemaDecl.cpp.
References getImplicitCodeSegAttrFromClass(), and clang::Decl::hasAttr().
ParsedType Sema::getInheritingConstructorName | ( | CXXScopeSpec & | SS, |
SourceLocation | NameLoc, | ||
IdentifierInfo & | Name | ||
) |
Handle the result of the special case name lookup for inheriting constructor declarations.
'NS::X::X' and 'NS::X<...>::X' are treated as constructor names in member using declarations, even if 'X' is not the name of the corresponding type.
Definition at line 48 of file SemaExprCXX.cpp.
ObjCIvarDecl * Sema::GetIvarBackingPropertyAccessor | ( | const ObjCMethodDecl * | Method, |
const ObjCPropertyDecl *& | PDecl | ||
) | const |
GetIvarBackingPropertyAccessor - If method is a property setter/getter and it property has a backing ivar, returns this ivar; otherwise, returns NULL.
It also returns ivar's property on success.
Definition at line 4991 of file SemaDeclObjC.cpp.
References clang::ObjCMethodDecl::findPropertyDecl(), clang::ObjCMethodDecl::getClassInterface(), clang::ObjCPropertyDecl::getPropertyIvarDecl(), clang::ObjCMethodDecl::getSelector(), clang::ObjCMethodDecl::isClassMethod(), clang::ObjCMethodDecl::isPropertyAccessor(), and clang::ObjCInterfaceDecl::lookupMethod().
QualType Sema::getLambdaConversionFunctionResultType | ( | const FunctionProtoType * | CallOpType | ) |
Get the return type to use for a lambda's conversion function(s) to function pointer type, given the type of the call operator.
Definition at line 1221 of file SemaLambda.cpp.
References clang::FunctionProtoType::getExtProtoInfo().
|
inline |
Definition at line 1285 of file Sema.h.
Referenced by ActOnCXXDelete(), ActOnCXXNestedNameSpecifierDecltype(), ActOnCXXNew(), ActOnDecltypeExpression(), ActOnEndOfTranslationUnit(), ActOnFinishFullExpr(), ActOnStartOfObjCMethodDef(), ActOnStartOfTranslationUnit(), ActOnStartProtocolInterface(), AddCFAuditedAttribute(), addFixitForObjCARCConversion(), AddKeywordsToConsumer(), AddMsStructLayoutForRecord(), AddRecordMembersCompletionResults(), AnalyzeBitFieldAssignment(), AnalyzeComparison(), AtomicPropertySetterGetterRules(), buildCapture(), buildCaptureDecl(), buildDeclareReductionRef(), BuildObjCExceptionDecl(), BuildPseudoDestructorExpr(), buildUserDefinedMapperRef(), clang::canCalleeThrow(), canPassInRegisters(), CheckAllocatedType(), checkArithmeticBinOpPointerOperands(), checkArithmeticOpPointerOperand(), checkBlockPointerTypesForAssignment(), CheckBoolLikeConversion(), CheckCommaOperands(), checkCondition(), checkConditionalPointerCompatibility(), CheckConstexprDeclStmt(), CheckConvertedConstantExpression(), CheckCUDACall(), checkCUDATargetOverload(), CheckCXX98CompatAccessibleCopy(), CheckDistantExceptionSpec(), CheckEquivalentExceptionSpec(), clang::CheckEquivalentExceptionSpecImpl(), CheckExceptionSpecCompatibility(), CheckExceptionSpecSubset(), CheckExplicitInstantiationScope(), CheckFormatString(), CheckForModifiableLvalue(), CheckIncrementDecrementOperand(), checkIndirectCopyRestoreSource(), CheckIndirectionOperand(), CheckKeyForObjCARCConversion(), CheckMemaccessSize(), CheckObjCCollectionLiteralElement(), CheckObjCMethodOverride(), checkObjCPointerIntrospection(), CheckObjCPropertyAttributes(), checkOpenMPLoop(), CheckOperatorNewDeleteTypes(), CheckOverridingFunctionExceptionSpec(), CheckPointerToMemberOperands(), checkPointerTypesForAssignment(), CheckSpecifiedExceptionType(), CheckTautologicalComparison(), CheckTemplateArgumentAddressOfObjectOrFunction(), CheckTemplateArgumentPointerToMember(), CheckTemplateSpecializationScope(), ClassifyImplicitMemberAccess(), clang::Sema::InstantiatingTemplate::Clear(), compareConversionFunctions(), CompareImplicitConversionSequences(), compareOverloads(), CompareStandardConversionSequences(), completeFunctionType(), CorrectDelayedTyposInBinOp(), CUDADiagIfDeviceCode(), CUDADiagIfHostCode(), CUDASetLambdaAttrs(), DeclareGlobalNewDelete(), DeduceNonTypeTemplateArgument(), defaultedSpecialMemberIsConstexpr(), diagnoseArithmeticOnFunctionPointer(), diagnoseArithmeticOnNullPointer(), diagnoseArithmeticOnTwoFunctionPointers(), diagnoseArithmeticOnTwoVoidPointers(), diagnoseArithmeticOnVoidPointer(), DiagnoseBadFunctionCast(), DiagnoseBadShiftValues(), DiagnoseCallingConvCast(), diagnoseDeprecatedCopyOperation(), diagnoseListInit(), DiagnoseMismatchedNewDelete(), DiagnoseMultipleMethodInGlobalPool(), DiagnoseNarrowingInInitList(), DiagnoseNullConversion(), DiagnoseOwningPropertyGetterSynthesis(), DiagnoseReinterpretUpDownCast(), DiagnoseSwitchLabelsFallthrough(), diagnoseZeroToNullptrConversion(), diagReturnOnAllocFailure(), DiagUninitUse(), EmitCurrentDiagnostic(), EmitDiagForCXXThrowInNonThrowingFunc(), emitReplacement(), clang::EnterExpressionEvaluationContext::EnterExpressionEvaluationContext(), FindAllocationFunctions(), FindCompositePointerType(), FinishForRangeVarDecl(), clang::FunctionCallFilterCCC::FunctionCallFilterCCC(), getCastAwayConstnessCastKind(), getCCForDeclaratorChunk(), getCudaConfigureFuncName(), getCurrentInstantiationOf(), GetDeclSpecTypeForDeclarator(), GetTypeOfFunction(), getUDSuffixLoc(), handleFunctionTypeAttr(), handleObjCOwnershipTypeAttr(), hasNewExtendedAlignment(), IdentifyCUDAPreference(), IgnoredValueConversions(), ImpCastExprToType(), clang::Sema::ImplicitExceptionSpecification::ImplicitExceptionSpecification(), clang::TemplateDeclInstantiator::InitFunctionInstantiation(), Initialize(), clang::InitializationSequence::InitializeFrom(), clang::TemplateDeclInstantiator::InitMethodInstantiation(), isArithmeticArgumentPromotion(), IsCXX98CompatWarning(), IsEnumConstOrFromMacro(), isExternalWithNoLinkageType(), isLibstdcxxPointerReturnFalseHack(), isNonPlacementDeallocationFunction(), isNullPointerValueTemplateArgument(), isObjCReceiverType(), isObjCSignedCharBool(), isResultTypeOrTemplate(), IsStandardConversion(), clang::sema::AnalysisBasedWarnings::IssueWarnings(), isUnavailableAlignedAllocationFunction(), isUsualDeallocationFunction(), LookupBuiltin(), LookupDirect(), LookupMemberExpr(), LookupMethodInReceiverType(), LookupVisibleDecls(), MarkExprReferenced(), MatchTwoMethodDeclarations(), maybeAddCUDAHostDeviceAttrs(), MaybeBindToTemporary(), MaybeProduceObjCObject(), mergeExceptionSpecs(), clang::InitializationSequence::Perform(), PerformImplicitConversion(), PopForceCUDAHostDevice(), ProcessPropertyDecl(), PushCapturedRegionScope(), PushForceCUDAHostDevice(), ReferenceDllExportedMembers(), resolveBuiltinNewDeleteOverload(), ResolveConstructorOverload(), shouldIgnoreDueToReservedName(), targetDiag(), TryAddressSpaceCast(), TryConstructorInitialization(), TryDefaultInitialization(), TryImplicitConversion(), TryListInitialization(), TryNamespaceTypoCorrection(), TryOCLSamplerInitialization(), TryOCLZeroOpaqueTypeInitialization(), TryReferenceInit(), TryReferenceInitializationCore(), TryReferenceListInitialization(), TryReinterpretCast(), TryStaticCast(), TryUserDefinedConversion(), TryValueInitialization(), tryVectorConvertAndSplat(), clang::TemplateDeclInstantiator::VisitVarDecl(), warnAboutRedundantParens(), and WarnConflictingTypedMethods().
SourceLocation Sema::getLocationOfStringLiteralByte | ( | const StringLiteral * | SL, |
unsigned | ByteNo | ||
) | const |
Definition at line 102 of file SemaChecking.cpp.
References clang::StringLiteral::getLocationOfByte().
SourceLocation Sema::getLocForEndOfToken | ( | SourceLocation | Loc, |
unsigned | Offset = 0 |
||
) |
Calls Lexer::getLocForEndOfToken()
Definition at line 47 of file Sema.cpp.
References clang::Lexer::getLocForEndOfToken().
Referenced by ActOnCXXDelete(), addFixitForObjCARCConversion(), AtomicPropertySetterGetterRules(), CheckEquivalentExceptionSpec(), CheckMemorySizeofForComparison(), CreateIfFixit(), diagnoseLogicalNotOnLHSofCheck(), DiagnoseMismatchedNewDelete(), DiagnoseNarrowingInInitList(), diagnoseNoViableConversion(), diagnoseObjCARCConversion(), diagnoseObjCLiteralComparison(), diagnoseStringPlusChar(), diagnoseStringPlusInt(), fixItNullability(), isArithmeticArgumentPromotion(), isNullPointerValueTemplateArgument(), maybeRecoverWithZeroInitialization(), SuggestInitializationFixit(), SuggestParentheses(), tryToRecoverWithCall(), and warnAboutRedundantParens().
llvm::DenseSet< Module * > & Sema::getLookupModules | ( | ) |
Get the set of additional modules that should be checked during name lookup.
A module and its imports become visible when instanting a template defined within it.
Definition at line 1469 of file SemaLookup.cpp.
References getDefiningModule().
QualType Sema::getMessageSendResultType | ( | const Expr * | Receiver, |
QualType | ReceiverType, | ||
ObjCMethodDecl * | Method, | ||
bool | isClassMessage, | ||
bool | isSuperMessage | ||
) |
Determine the result of a message send expression based on the type of the receiver, the method expected to receive the message, and the form of the message send.
Definition at line 1368 of file SemaExprObjC.cpp.
References getBaseMessageSendResultType(), clang::ObjCMethodDecl::getSendResultType(), clang::Type::isObjCClassType(), clang::Expr::isObjCSelfExpr(), and clang::AttributedType::stripOuterNullability().
const llvm::MapVector< FieldDecl *, Sema::DeleteLocs > & Sema::getMismatchingDeleteExpressions | ( | ) | const |
Retrieves list of suspicious delete-expressions that will be checked at the end of translation unit.
Definition at line 2132 of file Sema.cpp.
References DeleteExprs.
Referenced by AddLazyVectorDecls().
ModuleLoader & Sema::getModuleLoader | ( | ) | const |
ClassTemplatePartialSpecializationDecl * Sema::getMoreSpecializedPartialSpecialization | ( | ClassTemplatePartialSpecializationDecl * | PS1, |
ClassTemplatePartialSpecializationDecl * | PS2, | ||
SourceLocation | Loc | ||
) |
Returns the more specialized class template partial specialization according to the rules of partial ordering of class template partial specializations (C++ [temp.class.order]).
PS1 | the first class template partial specialization |
PS2 | the second class template partial specialization |
Definition at line 5090 of file SemaTemplateDeduction.cpp.
References clang::ClassTemplatePartialSpecializationDecl::getInjectedSpecializationType(), and isAtLeastAsSpecializedAs().
VarTemplatePartialSpecializationDecl * Sema::getMoreSpecializedPartialSpecialization | ( | VarTemplatePartialSpecializationDecl * | PS1, |
VarTemplatePartialSpecializationDecl * | PS2, | ||
SourceLocation | Loc | ||
) |
Definition at line 5122 of file SemaTemplateDeduction.cpp.
References clang::VarTemplateSpecializationDecl::getSpecializedTemplate().
FunctionTemplateDecl * Sema::getMoreSpecializedTemplate | ( | FunctionTemplateDecl * | FT1, |
FunctionTemplateDecl * | FT2, | ||
SourceLocation | Loc, | ||
TemplatePartialOrderingContext | TPOC, | ||
unsigned | NumCallArguments1, | ||
unsigned | NumCallArguments2 | ||
) |
Returns the more specialized function template according to the rules of function template partial ordering (C++ [temp.func.order]).
FT1 | the first function template |
FT2 | the second function template |
TPOC | the context in which we are performing partial ordering of function templates. |
NumCallArguments1 | The number of arguments in the call to FT1, used only when TPOC is TPOC_Call . |
NumCallArguments2 | The number of arguments in the call to FT2, used only when TPOC is TPOC_Call . |
Definition at line 4881 of file SemaTemplateDeduction.cpp.
References isAtLeastAsSpecializedAs(), and isVariadicFunctionTemplate().
UnresolvedSetIterator Sema::getMostSpecialized | ( | UnresolvedSetIterator | SpecBegin, |
UnresolvedSetIterator | SpecEnd, | ||
TemplateSpecCandidateSet & | FailedCandidates, | ||
SourceLocation | Loc, | ||
const PartialDiagnostic & | NoneDiag, | ||
const PartialDiagnostic & | AmbigDiag, | ||
const PartialDiagnostic & | CandidateDiag, | ||
bool | Complain = true , |
||
QualType | TargetType = QualType() |
||
) |
Retrieve the most specialized of the given function template specializations.
SpecBegin | the start iterator of the function template specializations that we will be comparing. |
SpecEnd | the end iterator of the function template specializations, paired with SpecBegin . |
Loc | the location where the ambiguity or no-specializations diagnostic should occur. |
NoneDiag | partial diagnostic used to diagnose cases where there are no matching candidates. |
AmbigDiag | partial diagnostic used to diagnose an ambiguity, if one occurs. |
CandidateDiag | partial diagnostic used for each function template specialization that is a candidate in the ambiguous ordering. One parameter in this diagnostic should be unbound, which will correspond to the string describing the template arguments for the function template specialization. |
Definition at line 4945 of file SemaTemplateDeduction.cpp.
References Diag(), clang::QualType::isNull(), isSameTemplate(), clang::TemplateSpecCandidateSet::NoteCandidates(), and clang::TPOC_Other.
DeclarationNameInfo Sema::GetNameForDeclarator | ( | Declarator & | D | ) |
GetNameForDeclarator - Determine the full declaration name for the given Declarator.
Definition at line 5006 of file SemaDecl.cpp.
References clang::Declarator::getName().
Referenced by CreateNewFunctionDecl().
DeclarationNameInfo Sema::GetNameFromUnqualifiedId | ( | const UnqualifiedId & | Name | ) |
Retrieves the declaration name from a parsed unqualified-id.
Definition at line 5012 of file SemaDecl.cpp.
getNonFieldDeclScope - Retrieves the innermost scope, starting from S, where a non-field would be declared.
This routine copes with the difference between C and C++ scoping rules in structs and unions. For example, the following code is well-formed in C but ill-formed in C++:
For the declaration of BAR, this routine will return a different scope. The scope S will be the scope of the unnamed enumeration within S6. In C++, this routine will return the scope associated with S6, because the enumeration's scope is a transparent context but structures can contain non-field names. In C, this routine will return the translation unit scope, since the enumeration's scope is a transparent context and structures cannot contain non-field names.
Definition at line 1932 of file SemaDecl.cpp.
NonOdrUseReason Sema::getNonOdrUseReasonInCurrentContext | ( | ValueDecl * | D | ) |
If D
cannot be odr-used in the current expression evaluation context, return a reason explaining why.
Otherwise, return NOUR_None.
Definition at line 1790 of file SemaExpr.cpp.
References clang::NOUR_Unevaluated.
Sema::NonTagKind Sema::getNonTagTypeDeclKind | ( | const Decl * | D, |
TagTypeKind | TTK | ||
) |
Given a non-tag type declaration, returns an enum useful for indicating what kind of non-tag type this is.
Definition at line 14290 of file SemaDecl.cpp.
References clang::TTK_Class, clang::TTK_Enum, clang::TTK_Interface, clang::TTK_Struct, and clang::TTK_Union.
Referenced by clang::TreeTransform< Derived >::RebuildDependentNameType().
IdentifierInfo * Sema::getNSErrorIdent | ( | ) |
Retrieve the identifier "NSError".
Definition at line 3531 of file SemaType.cpp.
Referenced by classifyPointerDeclarator().
IdentifierInfo * Sema::getNullabilityKeyword | ( | NullabilityKind | nullability | ) |
Retrieve the keyword associated.
Definition at line 3510 of file SemaType.cpp.
References clang::NonNull, clang::Nullable, and clang::Unspecified.
Referenced by clang::Parser::getNullabilityKeyword().
Optional< unsigned > Sema::getNumArgumentsInExpansion | ( | QualType | T, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Determine the number of arguments in the given pack expansion type.
This routine assumes that the number of arguments in the expansion is consistent across all of the unexpanded parameter packs in its pattern.
Returns an empty Optional if the type can't be expanded.
Definition at line 768 of file SemaTemplateVariadic.cpp.
References Depth, and clang::Result.
Referenced by getPackIndexForParam(), and clang::TemplateDeclInstantiator::SubstFunctionType().
Sema::ObjCContainerKind Sema::getObjCContainerKind | ( | ) | const |
Definition at line 3782 of file SemaDeclObjC.cpp.
References CurContext, clang::DeclContext::getDeclKind(), OCK_Category, OCK_CategoryImplementation, OCK_ClassExtension, OCK_Implementation, OCK_Interface, OCK_None, and OCK_Protocol.
Decl * Sema::getObjCDeclContext | ( | ) | const |
Definition at line 17445 of file SemaDecl.cpp.
Referenced by clang::Parser::getObjCDeclContext().
ObjCInterfaceDecl * Sema::getObjCInterfaceDecl | ( | IdentifierInfo *& | Id, |
SourceLocation | IdLoc, | ||
bool | DoTypoCorrection = false |
||
) |
Look for an Objective-C class in the translation unit.
Id | The name of the Objective-C class we're looking for. If typo-correction fixes this name, the Id will be updated to the fixed name. |
IdLoc | The location of the name in the translation unit. |
DoTypoCorrection | If true, this routine will attempt typo correction if there is no class with the given name. |
Definition at line 1883 of file SemaDecl.cpp.
References clang::ObjCInterfaceDecl::getDefinition(), and clang::NamedDecl::getIdentifier().
Referenced by ActOnStartCategoryImplementation(), and ActOnStartCategoryInterface().
Sema::ObjCMessageKind Sema::getObjCMessageKind | ( | Scope * | S, |
IdentifierInfo * | Name, | ||
SourceLocation | NameLoc, | ||
bool | IsSuper, | ||
bool | HasTrailingDot, | ||
ParsedType & | ReceiverType | ||
) |
Definition at line 2124 of file SemaExprObjC.cpp.
Referenced by CheckArrayDesignatorSyntax().
std::string Sema::getOpenCLExtensionsFromDeclExtMap | ( | FunctionDecl * | FD | ) |
Check if a function declaration FD
associates with any extensions present in OpenCLDeclExtMap and if so return the extension(s) name(s).
Definition at line 2167 of file Sema.cpp.
References getOpenCLExtensionsFromExtMap().
std::string Sema::getOpenCLExtensionsFromExtMap | ( | T * | FT, |
MapT & | Map | ||
) |
Find an extension in an appropriate extension map and return its name.
Definition at line 2182 of file Sema.cpp.
Referenced by getOpenCLExtensionsFromDeclExtMap(), and getOpenCLExtensionsFromTypeExtMap().
std::string Sema::getOpenCLExtensionsFromTypeExtMap | ( | FunctionType * | FT | ) |
Check if a function type FT
associates with any extensions present in OpenCLTypeExtMap and if so return the extension(s) name(s).
Definition at line 2174 of file Sema.cpp.
References getOpenCLExtensionsFromExtMap().
|
inline |
Definition at line 1286 of file Sema.h.
Referenced by DiagnoseBadFunctionCast(), Initialize(), isOpenCLDisabledDecl(), and TryOCLZeroOpaqueTypeInitialization().
ExprResult Sema::getOpenMPCapturedExpr | ( | VarDecl * | Capture, |
ExprValueKind | VK, | ||
ExprObjectKind | OK, | ||
SourceLocation | Loc | ||
) |
Definition at line 10799 of file SemaOpenMP.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::QualType::getNonReferenceType(), clang::ValueDecl::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::OK_Ordinary, and clang::VK_LValue.
|
static |
Return the number of captured regions created for an OpenMP directive.
Definition at line 3259 of file SemaOpenMP.cpp.
References clang::getOpenMPCaptureRegions().
|
inline |
LabelDecl * Sema::GetOrCreateMSAsmLabel | ( | StringRef | ExternalLabelName, |
SourceLocation | Location, | ||
bool | AlwaysCreate | ||
) |
Definition at line 893 of file SemaStmtAsm.cpp.
References clang::LabelDecl::isMSAsmLabel(), Label, and clang::Decl::markUsed().
NamespaceDecl * Sema::getOrCreateStdNamespace | ( | ) |
Retrieve the special "std" namespace, which may require us to implicitly define the namespace.
Definition at line 9221 of file SemaDeclCXX.cpp.
References clang::NamespaceDecl::Create().
Referenced by DeclareGlobalNewDelete().
Get the module owning an entity.
Definition at line 1680 of file Sema.h.
References clang::Decl::getOwningModule().
Referenced by hasVisibleDefaultArgument(), and hasVisibleMemberSpecialization().
|
inline |
Definition at line 1291 of file Sema.h.
Referenced by CheckUnreachable(), DiagnoseCallingConvCast(), DiagnoseOwningPropertyGetterSynthesis(), DiagnoseSwitchLabelsFallthrough(), and findMacroSpelling().
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
|
inlinestatic |
Definition at line 1615 of file Sema.h.
References clang::Stmt::getSourceRange().
|
inlinestatic |
Definition at line 1616 of file Sema.h.
References clang::TypeLoc::getSourceRange().
|
inline |
Retrieve a suitable printing policy for diagnostics.
Definition at line 2338 of file Sema.h.
Referenced by CheckEquivalentExceptionSpec(), CheckVirtualDtorCall(), diagnoseNoViableConversion(), EmitCurrentDiagnostic(), and PrintInstantiationStack().
|
static |
TypeLoc Sema::getReturnTypeLoc | ( | FunctionDecl * | FD | ) | const |
Definition at line 3392 of file SemaStmt.cpp.
References clang::TypeLoc::getAsAdjusted(), clang::TypeSourceInfo::getTypeLoc(), and clang::DeclaratorDecl::getTypeSourceInfo().
Scope * Sema::getScopeForContext | ( | DeclContext * | Ctx | ) |
Determines the active Scope associated with the given declaration context.
This routine maps a declaration context to the active Scope object that represents that declaration context in the parser. It is typically used from "scope-less" code (e.g., template instantiation, lazy creation of declarations) that injects a name for name-lookup purposes and, therefore, must update the Scope.
Definition at line 1580 of file Sema.cpp.
References clang::Scope::DeclScope, getCurScope(), clang::DeclContext::getPrimaryContext(), and clang::Scope::TemplateParamScope.
|
static |
Finds the scope corresponding to the given decl context, if it happens to be an enclosing scope.
Otherwise return NULL.
Definition at line 1435 of file SemaDecl.cpp.
NamedDecl * Sema::getShadowedDeclaration | ( | const TypedefNameDecl * | D, |
const LookupResult & | R | ||
) |
Return the declaration shadowed by the given typedef D
, or null if it doesn't shadow any declaration or shadowing warnings are disabled.
Definition at line 7089 of file SemaDecl.cpp.
References clang::Decl::getDeclContext(), clang::LookupResult::getFoundDecl(), clang::DeclContext::isRecord(), and shouldWarnIfShadowedDecl().
NamedDecl * Sema::getShadowedDeclaration | ( | const VarDecl * | D, |
const LookupResult & | R | ||
) |
Return the declaration shadowed by the given variable D
, or null if it doesn't shadow any declaration or shadowing warnings are disabled.
Definition at line 7072 of file SemaDecl.cpp.
References clang::LookupResult::getFoundDecl(), clang::VarDecl::hasGlobalStorage(), and shouldWarnIfShadowedDecl().
Definition at line 10891 of file SemaExpr.cpp.
References clang::Type::getAs().
|
inline |
Definition at line 1290 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), AddCFAuditedAttribute(), addFixitForObjCARCConversion(), checkInitMethod(), CheckMemaccessSize(), CheckMoveOnConstruction(), CheckUnreachable(), CheckVirtualDtorCall(), DiagnoseMismatchedNewDelete(), DiagnoseNamespaceInlineMismatch(), EmitDiagForCXXThrowInNonThrowingFunc(), clang::sema::SemaPPCallbacks::FileChanged(), findMacroSpelling(), getUDSuffixLoc(), handleObjCOwnershipTypeAttr(), clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), IsEnumConstOrFromMacro(), isLibstdcxxPointerReturnFalseHack(), isSameWidthConstantConversion(), maybeAddCUDAHostDeviceAttrs(), clang::Parser::ParseUnqualifiedId(), and clang::PrintingCodeCompleteConsumer::ProcessOverloadCandidates().
Sema::CXXSpecialMember Sema::getSpecialMember | ( | const CXXMethodDecl * | MD | ) |
getSpecialMember - get the special member enum for a method.
Definition at line 2858 of file SemaDecl.cpp.
References CXXCopyAssignment, CXXCopyConstructor, CXXDefaultConstructor, CXXDestructor, CXXInvalid, CXXMoveAssignment, CXXMoveConstructor, clang::CXXMethodDecl::isCopyAssignmentOperator(), and clang::CXXMethodDecl::isMoveAssignmentOperator().
Referenced by computeImplicitExceptionSpec(), and DefineImplicitSpecialMember().
EnumDecl * Sema::getStdAlignValT | ( | ) | const |
Definition at line 9066 of file SemaDeclCXX.cpp.
Referenced by AddLazyVectorDecls(), DeclareGlobalNewDelete(), FindAllocationFunctions(), and isNonPlacementDeallocationFunction().
CXXRecordDecl * Sema::getStdBadAlloc | ( | ) | const |
Definition at line 9061 of file SemaDeclCXX.cpp.
Referenced by AddLazyVectorDecls(), and DeclareGlobalNewDelete().
NamespaceDecl * Sema::getStdNamespace | ( | ) | const |
Definition at line 9070 of file SemaDeclCXX.cpp.
Referenced by AddLazyVectorDecls(), DiagnoseTwoPhaseLookup(), emitReplacement(), clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), LookupStdInitializerList(), and lookupStdTypeTraitMember().
IdentifierInfo * Sema::getSuperIdentifier | ( | ) | const |
Definition at line 2103 of file Sema.cpp.
References Context, clang::IdentifierTable::get(), and clang::ASTContext::Idents.
std::string Sema::getTemplateArgumentBindingsText | ( | const TemplateParameterList * | Params, |
const TemplateArgumentList & | Args | ||
) |
Produces a formatted string that describes the binding of template parameters to template arguments.
Definition at line 10257 of file SemaTemplate.cpp.
References clang::TemplateArgumentList::data(), and clang::TemplateArgumentList::size().
Referenced by PrintInstantiationStack().
std::string Sema::getTemplateArgumentBindingsText | ( | const TemplateParameterList * | Params, |
const TemplateArgument * | Args, | ||
unsigned | NumArgs | ||
) |
Definition at line 10263 of file SemaTemplate.cpp.
References clang::NamedDecl::getIdentifier(), clang::TemplateParameterList::getParam(), Id, clang::TemplateArgument::print(), and clang::TemplateParameterList::size().
TemplateArgumentLoc Sema::getTemplateArgumentPackExpansionPattern | ( | TemplateArgumentLoc | OrigLoc, |
SourceLocation & | Ellipsis, | ||
Optional< unsigned > & | NumExpansions | ||
) | const |
Returns the pattern of the pack expansion for a template argument.
OrigLoc | The template argument to expand. |
Ellipsis | Will be set to the location of the ellipsis. |
NumExpansions | Will be set to the number of expansions that will be generated from this pack expansion, if known a priori. |
Definition at line 1011 of file SemaTemplateVariadic.cpp.
References clang::TemplateArgumentLoc::getArgument(), clang::TemplateArgument::getKind(), clang::TemplateArgumentLoc::getTypeSourceInfo(), clang::TemplateArgument::isPackExpansion(), and clang::TemplateArgument::Type.
MultiLevelTemplateArgumentList Sema::getTemplateInstantiationArgs | ( | NamedDecl * | D, |
const TemplateArgumentList * | Innermost = nullptr , |
||
bool | RelativeToPrimary = false , |
||
const FunctionDecl * | Pattern = nullptr |
||
) |
Retrieve the template argument list(s) that should be used to instantiate the definition of the given declaration.
D | the declaration for which we are computing template instantiation arguments. |
Innermost | if non-NULL, the innermost template argument list. |
RelativeToPrimary | true if we should get the template arguments relative to the primary template, even when we're dealing with a specialization. This is only relevant for function template specializations. |
Pattern | If non-NULL, indicates the pattern from which we will be instantiating the definition of the given declaration, D . This is used to determine the proper set of template instantiation arguments for friend function template specializations. |
Definition at line 55 of file SemaTemplateInstantiate.cpp.
References clang::MultiLevelTemplateArgumentList::addOuterTemplateArguments(), clang::Decl::getDeclContext(), clang::Decl::getLexicalDeclContext(), clang::ClassTemplateSpecializationDecl::getSpecializationKind(), clang::VarTemplateSpecializationDecl::getSpecializationKind(), clang::ClassTemplateSpecializationDecl::getSpecializedTemplate(), clang::VarTemplateSpecializationDecl::getSpecializedTemplate(), clang::VarTemplateSpecializationDecl::getSpecializedTemplateOrPartial(), clang::ClassTemplateSpecializationDecl::getTemplateInstantiationArgs(), clang::VarTemplateSpecializationDecl::getTemplateInstantiationArgs(), clang::ClassTemplateSpecializationDecl::isClassScopeExplicitSpecialization(), clang::VarTemplateSpecializationDecl::isClassScopeExplicitSpecialization(), clang::DeclContext::isFileContext(), clang::isGenericLambdaCallOperatorSpecialization(), clang::RedeclarableTemplateDecl::isMemberSpecialization(), clang::DeclContext::isTranslationUnit(), and clang::TSK_ExplicitSpecialization.
Referenced by InstantiateClassTemplateSpecialization(), InstantiateClassTemplateSpecializationMembers(), and RequireCompleteDeclContext().
Sema::TemplateNameKindForDiagnostics Sema::getTemplateNameKindForDiagnostics | ( | TemplateName | Name | ) |
Definition at line 1179 of file SemaDecl.cpp.
Referenced by diagnoseMissingArgument(), GetDeclSpecTypeForDeclarator(), and clang::TreeTransform< Derived >::RebuildDependentNameType().
TemplateArgumentLoc Sema::getTrivialTemplateArgumentLoc | ( | const TemplateArgument & | Arg, |
QualType | NTTPType, | ||
SourceLocation | Loc | ||
) |
Allocate a TemplateArgumentLoc where all locations have been initialized to the given location.
Arg | The template argument we are producing template argument location information for. |
NTTPType | For a declaration template argument, the type of the non-type template parameter that corresponds to this template argument. Can be null if no type sugar is available to add to the type from the template argument. |
Loc | The source location to use for the resulting template argument. |
Definition at line 2443 of file SemaTemplateDeduction.cpp.
References clang::TemplateArgument::getKind(), clang::TemplateArgument::Null, and clang::TemplateArgument::Type.
Referenced by ConvertDeducedTemplateArgument(), getTrivialIntegralTemplateArgument(), and getTrivialTypeTemplateArgument().
TypeSourceInfo * Sema::GetTypeForDeclarator | ( | Declarator & | D, |
Scope * | S | ||
) |
GetTypeForDeclarator - Convert the type for the specified declarator to Type instances.
The result of this call will never be null, but the associated type may be a null type if there's an unrecoverable error.
Definition at line 5250 of file SemaType.cpp.
References GetDeclSpecTypeForDeclarator(), GetFullTypeForDeclarator(), inferARCWriteback(), clang::Declarator::isPrototypeContext(), and clang::CodeGen::state.
Referenced by ActOnCXXNew().
TypeSourceInfo * Sema::GetTypeForDeclaratorCast | ( | Declarator & | D, |
QualType | FromTy | ||
) |
Definition at line 5363 of file SemaType.cpp.
References GetDeclSpecTypeForDeclarator(), and clang::CodeGen::state.
|
static |
Definition at line 2637 of file SemaType.cpp.
References clang::OpaquePtr< PtrTy >::get(), clang::QualType::isNull(), clang::CodeGen::state, and transferARCOwnershipToDeclaratorChunk().
Referenced by ActOnArrayTypeTrait(), ActOnCXXTypeConstructExpr(), ActOnPseudoDestructorExpr(), ActOnTypeTrait(), AddClassMessageCompletions(), GetDeclSpecTypeForDeclarator(), and translateTemplateArgument().
ParsedType Sema::getTypeName | ( | const IdentifierInfo & | II, |
SourceLocation | NameLoc, | ||
Scope * | S, | ||
CXXScopeSpec * | SS = nullptr , |
||
bool | isClassName = false , |
||
bool | HasTrailingDot = false , |
||
ParsedType | ObjectTypePtr = nullptr , |
||
bool | IsCtorOrDtorName = false , |
||
bool | WantNontrivialTypeSourceInfo = false , |
||
bool | IsClassTemplateDeductionContext = true , |
||
IdentifierInfo ** | CorrectedII = nullptr |
||
) |
If the identifier refers to a type name within this scope, return the declaration of that type.
This routine performs ordinary name lookup of the identifier II within the given scope, with optional C++ scope specifier SS, to determine whether the name refers to a type. If so, returns an opaque pointer (actually a QualType) corresponding to that type. Otherwise, returns NULL.
Definition at line 281 of file SemaDecl.cpp.
Referenced by ActOnPseudoDestructorExpr(), and clang::Parser::TryAnnotateTypeOrScopeTokenAfterScopeSpec().
const Sema::TypoExprState & Sema::getTypoExprState | ( | TypoExpr * | TE | ) | const |
Definition at line 5367 of file SemaLookup.cpp.
Referenced by attemptRecovery().
void Sema::getUndefinedButUsed | ( | SmallVectorImpl< std::pair< NamedDecl *, SourceLocation > > & | Undefined | ) |
Obtain a sorted list of functions that are undefined but ODR-used.
Obtains a sorted list of functions and variables that are undefined but ODR-used.
Definition at line 638 of file Sema.cpp.
References clang::VarDecl::DeclarationOnly, clang::Decl::hasAttr(), isExternalWithNoLinkageType(), clang::Decl::isInvalidDecl(), and UndefinedButUsed.
Referenced by AddLazyVectorDecls().
Sema::VariadicCallType Sema::getVariadicCallType | ( | FunctionDecl * | FDecl, |
const FunctionProtoType * | Proto, | ||
Expr * | Fn | ||
) |
Definition at line 4902 of file SemaExpr.cpp.
References clang::Expr::getType(), clang::Type::isBlockPointerType(), and clang::FunctionProtoType::isVariadic().
NamedDecl * Sema::HandleDeclarator | ( | Scope * | S, |
Declarator & | D, | ||
MultiTemplateParamsArg | TemplateParameterLists | ||
) |
Definition at line 5388 of file SemaDecl.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::HandleDelayedAccessCheck | ( | sema::DelayedDiagnostic & | DD, |
Decl * | Ctx | ||
) |
Definition at line 1467 of file SemaAccess.cpp.
References AR_inaccessible, CheckEffectiveAccess(), clang::sema::DelayedDiagnostic::getAccessData(), clang::Decl::getDeclContext(), clang::Decl::getLexicalDeclContext(), clang::Decl::isLocalExternDecl(), clang::sema::DelayedDiagnostic::Loc, clang::Target, and clang::sema::DelayedDiagnostic::Triggered.
void Sema::HandleDependentAccessCheck | ( | const DependentDiagnostic & | DD, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 1490 of file SemaAccess.cpp.
References clang::DependentDiagnostic::getAccess(), clang::DependentDiagnostic::getAccessBaseObjectType(), clang::DependentDiagnostic::getAccessLoc(), clang::DependentDiagnostic::getAccessNamingClass(), clang::DependentDiagnostic::getAccessTarget(), and clang::DependentDiagnostic::isAccessToMember().
ExprResult Sema::HandleExprEvaluationContextForTypeof | ( | Expr * | E | ) |
Definition at line 14844 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::Type::isVariablyModifiedType().
ExprResult Sema::HandleExprPropertyRefExpr | ( | const ObjCObjectPointerType * | OPT, |
Expr * | BaseExpr, | ||
SourceLocation | OpLoc, | ||
DeclarationName | MemberName, | ||
SourceLocation | MemberLoc, | ||
SourceLocation | SuperLoc, | ||
QualType | SuperType, | ||
bool | Super | ||
) |
HandleExprPropertyRefExpr - Handle foo.bar where foo is a pointer to an objective C interface.
This is a property reference expression.
Definition at line 1817 of file SemaExprObjC.cpp.
References Diag(), clang::ExprError(), clang::ObjCContainerDecl::FindPropertyDeclaration(), clang::DeclarationName::getAsIdentifierInfo(), clang::ObjCInterfaceType::getDecl(), clang::ObjCObjectPointerType::getInterfaceType(), clang::ObjCObjectPointerType::getPointeeType(), clang::Stmt::getSourceRange(), clang::DeclarationName::isIdentifier(), and clang::OBJC_PR_query_instance.
Referenced by LookupMemberExpr(), and LookupMethodInQualifiedType().
FieldDecl * Sema::HandleField | ( | Scope * | S, |
RecordDecl * | TagD, | ||
SourceLocation | DeclStart, | ||
Declarator & | D, | ||
Expr * | BitfieldWidth, | ||
InClassInitStyle | InitStyle, | ||
AccessSpecifier | AS | ||
) |
HandleField - Analyze a field of a C struct or a C++ data member.
Definition at line 15682 of file SemaDecl.cpp.
void Sema::HandleFunctionTypeMismatch | ( | PartialDiagnostic & | PDiag, |
QualType | FromType, | ||
QualType | ToType | ||
) |
HandleFunctionTypeMismatch - Gives diagnostic information for differeing function types.
Catches different number of parameter, mismatch in parameter types, and different return types.
Definition at line 2766 of file SemaOverload.cpp.
References ft_default, clang::Type::getAs(), clang::Type::isMemberPointerType(), and clang::QualType::isNull().
MSPropertyDecl * Sema::HandleMSProperty | ( | Scope * | S, |
RecordDecl * | TagD, | ||
SourceLocation | DeclStart, | ||
Declarator & | D, | ||
Expr * | BitfieldWidth, | ||
InClassInitStyle | InitStyle, | ||
AccessSpecifier | AS, | ||
const ParsedAttr & | MSPropertyAttr | ||
) |
HandleMSProperty - Analyze a __delcspec(property) field of a C++ class.
Definition at line 15664 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, Diag(), clang::Declarator::getIdentifier(), clang::Declarator::getIdentifierLoc(), clang::TypeSourceInfo::getType(), and clang::Declarator::setInvalidType().
ObjCPropertyDecl * Sema::HandlePropertyInClassExtension | ( | Scope * | S, |
SourceLocation | AtLoc, | ||
SourceLocation | LParenLoc, | ||
FieldDeclarator & | FD, | ||
Selector | GetterSel, | ||
SourceLocation | GetterNameLoc, | ||
Selector | SetterSel, | ||
SourceLocation | SetterNameLoc, | ||
const bool | isReadWrite, | ||
unsigned & | Attributes, | ||
const unsigned | AttributesAsWritten, | ||
QualType | T, | ||
TypeSourceInfo * | TSI, | ||
tok::ObjCKeywordKind | MethodImplKind | ||
) |
Called by ActOnProperty to handle @property declarations in class extensions.
Definition at line 412 of file SemaObjCProperty.cpp.
Definition at line 657 of file SemaExceptionSpec.cpp.
References clang::Qualifiers::compatiblyIncludes(), Context, clang::Type::getAs(), clang::Type::getPointeeType(), clang::ReferenceType::getPointeeType(), clang::ASTContext::getUnqualifiedArrayType(), clang::ASTContext::hasSameUnqualifiedType(), clang::QualType::isConstQualified(), IsFunctionConversion(), clang::Type::isMemberPointerType(), clang::Type::isNullPtrType(), clang::Type::isObjectType(), clang::Type::isPointerType(), IsQualificationConversion(), clang::Type::isRecordType(), clang::Type::isVoidType(), clang::QualType::isVolatileQualified(), and clang::Result.
Referenced by CheckExceptionSpecSubset().
Definition at line 4177 of file SemaDecl.cpp.
bool Sema::hasAnyAcceptableTemplateNames | ( | LookupResult & | R, |
bool | AllowFunctionTemplates = true , |
||
bool | AllowDependent = true , |
||
bool | AllowNonTemplateFunctions = false |
||
) |
Definition at line 131 of file SemaTemplate.cpp.
References clang::LookupResult::begin(), and clang::LookupResult::end().
bool Sema::hasAnyUnrecoverableErrorsInThisFunction | ( | ) | const |
Determine whether any errors occurred within this function/method/ block.
Definition at line 1748 of file Sema.cpp.
References clang::sema::FunctionScopeInfo::ErrorTrap, getCurFunction(), and clang::DiagnosticErrorTrap::hasUnrecoverableErrorOccurred().
Check to see if a given expression could have '.c_str()' called on it.
Check if we could call '.c_str()' on an object.
FIXME: This returns the wrong results in some cases (if cv-qualifiers don't allow the call, or if it would be ambiguous).
Definition at line 7695 of file SemaChecking.cpp.
Definition at line 7074 of file SemaType.cpp.
References clang::Type::getAs(), clang::AttributedType::getModifiedType(), and clang::AttributedType::isCallingConv().
Definition at line 1497 of file SemaLookup.cpp.
Determine if D
and Suggested
have a structurally compatible layout as described in C11 6.2.7/1.
Definition at line 7839 of file SemaType.cpp.
References clang::Default, clang::Decl::getASTContext(), and clang::StructuralEquivalenceContext::IsEquivalent().
|
inline |
Determine whether any declaration of an entity is visible.
Definition at line 1695 of file Sema.h.
Referenced by computeDeclContext().
bool Sema::hasVisibleDeclarationSlow | ( | const NamedDecl * | D, |
llvm::SmallVectorImpl< Module *> * | Modules | ||
) |
Definition at line 1778 of file SemaLookup.cpp.
References findAcceptableDecl(), clang::Decl::getCanonicalDecl(), and hasVisibleDeclarationImpl().
bool Sema::hasVisibleDefaultArgument | ( | const NamedDecl * | D, |
llvm::SmallVectorImpl< Module *> * | Modules = nullptr |
||
) |
Determine if the template parameter D
has a visible default argument.
Definition at line 1527 of file SemaLookup.cpp.
References hasVisibleDefaultArgument().
Referenced by diagnoseMissingArgument(), and isPreferredLookupResult().
bool Sema::hasVisibleDefinition | ( | NamedDecl * | D, |
NamedDecl ** | Suggested, | ||
bool | OnlyNeedComplete = false |
||
) |
Determine if D
has a visible definition.
Determine whether there is any declaration of D
that was ever a definition (perhaps before module merging) and is currently visible.
If not, suggest a declaration that should be made visible to expose the definition.
D | The definition of the entity. |
Suggested | Filled in with the declaration that should be made visible in order to provide a definition of this entity. |
OnlyNeedComplete | If true , we only need the type to be complete, not defined. This only matters for enums with a fixed underlying type, since in all other cases, a type is complete if and only if it is defined. |
Definition at line 7863 of file SemaType.cpp.
References clang::Decl::isModulePrivate(), and clang::Decl::setVisibleDespiteOwningModule().
Referenced by RequireCompleteDeclContext().
Definition at line 1713 of file Sema.h.
References hasVisibleDefaultArgument().
bool Sema::hasVisibleExplicitSpecialization | ( | const NamedDecl * | D, |
llvm::SmallVectorImpl< Module *> * | Modules = nullptr |
||
) |
Determine if there is a visible declaration of D
that is an explicit specialization declaration for a specialization of a template.
(For a member specialization, use hasVisibleMemberSpecialization.)
Definition at line 1564 of file SemaLookup.cpp.
References hasVisibleDeclarationImpl(), and clang::TSK_ExplicitSpecialization.
bool Sema::hasVisibleMemberSpecialization | ( | const NamedDecl * | D, |
llvm::SmallVectorImpl< Module *> * | Modules = nullptr |
||
) |
Determine if there is a visible declaration of D
that is a member specialization declaration (as opposed to an instantiated declaration).
Definition at line 1577 of file SemaLookup.cpp.
References clang::Decl::getDeclContext(), clang::Decl::getLexicalDeclContext(), getOwningModule(), hasVisibleDeclarationImpl(), clang::DeclContext::isFileContext(), clang::Decl::isHidden(), clang::Decl::isModulePrivate(), isModuleVisible(), and clang::Decl::isTemplateParameter().
Definition at line 1490 of file SemaLookup.cpp.
void Sema::HideUsingShadowDecl | ( | Scope * | S, |
UsingShadowDecl * | Shadow | ||
) |
Hides a using shadow declaration.
This is required by the current using-decl implementation when a resolvable using declaration in a class is followed by a declaration which would hide or override one or more of the using decl's targets; for example:
struct Base { void foo(int); }; struct Derived : Base { using Base::foo; void foo(int); };
The governing language is C++03 [namespace.udecl]p12:
When a using-declaration brings names from a base class into a derived class scope, member functions in the derived class override and/or hide member functions with the same name and parameter types in a base class (rather than conflicting).
There are two ways to implement this: (1) optimistically create shadow decls when they're not hidden by existing declarations, or (2) don't create any shadow decls (or at least don't make them visible) until we've fully parsed/instantiated the class. The problem with (1) is that we might have to retroactively remove a shadow decl, which requires several O(n) operations because the decl structures are (very reasonably) not designed for removal. (2) avoids this but is very fiddly and phase-dependent.
Definition at line 9857 of file SemaDeclCXX.cpp.
References clang::DeclarationName::CXXConversionFunctionName, clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::DeclarationName::getNameKind(), clang::UsingShadowDecl::getUsingDecl(), clang::Scope::RemoveDecl(), clang::DeclContext::removeDecl(), and clang::UsingDecl::removeShadowDecl().
Sema::CUDAFunctionPreference Sema::IdentifyCUDAPreference | ( | const FunctionDecl * | Caller, |
const FunctionDecl * | Callee | ||
) |
Identifies relative preference of a given Caller/Callee combination, based on their host/device attributes.
Caller | function which needs address of Callee . nullptr in case of global context. |
Callee | target function |
Definition at line 162 of file SemaCUDA.cpp.
References CFP_HostDevice, CFP_Native, CFP_Never, CFP_SameSide, CFP_WrongSide, CFT_Device, CFT_Global, CFT_Host, CFT_HostDevice, CFT_InvalidTarget, getLangOpts(), and IdentifyCUDATarget().
Referenced by CheckCUDACall(), isNonPlacementDeallocationFunction(), and isUsualDeallocationFunction().
Sema::CUDAFunctionTarget Sema::IdentifyCUDATarget | ( | const FunctionDecl * | D, |
bool | IgnoreImplicitHDAttr = false |
||
) |
Determines whether the given function is a CUDA device/host/kernel/etc.
IdentifyCUDATarget - Determine the CUDA compilation target for this function.
function.
Use this rather than examining the function's attributes yourself – you will get it wrong. Returns CFT_Host if D is null.
Definition at line 106 of file SemaCUDA.cpp.
References CFT_Device, CFT_Global, CFT_Host, CFT_HostDevice, CFT_InvalidTarget, clang::Decl::hasAttr(), and clang::Decl::isImplicit().
Referenced by checkAllowedCUDAInitializer(), CheckCUDACall(), checkCUDATargetOverload(), CUDASetLambdaAttrs(), IdentifyCUDAPreference(), and inferCUDATargetForImplicitSpecialMember().
Sema::CUDAFunctionTarget Sema::IdentifyCUDATarget | ( | const ParsedAttributesView & | Attrs | ) |
Definition at line 58 of file SemaCUDA.cpp.
References CFT_Device, CFT_Global, CFT_Host, CFT_HostDevice, and CFT_InvalidTarget.
ExprResult Sema::IgnoredValueConversions | ( | Expr * | E | ) |
IgnoredValueConversions - Given that an expression's result is syntactically ignored, perform any conversions that are required.
Perform the conversions required for an expression used in a context that ignores the result.
Definition at line 7306 of file SemaExprCXX.cpp.
References CheckPlaceholderExpr(), Context, DefaultFunctionArrayConversion(), DefaultFunctionArrayLvalueConversion(), DefaultLvalueConversion(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::Expr::getExprLoc(), getLangOpts(), clang::Expr::getType(), clang::Expr::hasPlaceholderType(), ImpCastExprToType(), clang::Type::isFunctionType(), clang::Expr::isGLValue(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isRValue(), IsSpecialDiscardedValue(), clang::Type::isVoidType(), clang::QualType::isVolatileQualified(), RequireCompleteType(), result, and clang::ASTContext::VoidTy.
Referenced by ActOnFinishFullExpr(), CheckCommaOperands(), DiagnoseBadFunctionCast(), DiagnoseReinterpretUpDownCast(), and TryAddressSpaceCast().
ExprResult Sema::ImpCastExprToType | ( | Expr * | E, |
QualType | Ty, | ||
CastKind | Kind, | ||
ExprValueKind | VK = VK_RValue , |
||
const CXXCastPath * | BasePath = nullptr , |
||
CheckedConversionKind | CCK = CCK_ImplicitConversion |
||
) |
ImpCastExprToType - If Expr is not of type 'Type', insert an implicit cast.
If there is already an implicit cast, merge into the existing one. If isLvalue, the result of the cast is an lvalue.
If there is already an implicit cast, merge into the existing one. The result is of the given category.
Definition at line 484 of file Sema.cpp.
References Context, clang::frontend::CPlusPlus, clang::ImplicitCastExpr::Create(), CreateMaterializeTemporaryExpr(), diagnoseNullableToNonnullConversion(), diagnoseZeroToNullptrConversion(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), clang::ASTContext::getCanonicalType(), getLangOpts(), clang::Expr::getType(), clang::Expr::getValueKind(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isRValue(), and clang::VK_RValue.
Referenced by ActOnCXXDelete(), BuildImplicitBaseInitializer(), checkArithmeticOrEnumeralThreeWayCompare(), checkConditionalBlockPointerCompatibility(), checkConditionalNullPointer(), checkConditionalObjectPointersCompatibility(), checkConditionalPointerCompatibility(), checkConditionalVoidType(), checkMemberDecomposition(), checkPointerIntegerMismatch(), CheckPointerToMemberOperands(), CheckTemplateArgumentPointerToMember(), checkVectorShift(), convertPointersToCompositeType(), convertVector(), CXXCheckConditionalOperands(), DeduceNullPtrTemplateArgument(), FindCompositePointerType(), IgnoredValueConversions(), LookupMemberExpr(), LookupMethodInReceiverType(), OpenCLConvertScalarsToVectors(), clang::InitializationSequence::Perform(), PerformImplicitConversion(), clang::TreeTransform< Derived >::RebuildShuffleVectorExpr(), ShouldTryAgainWithRedefinitionType(), tryGCCVectorConvertAndSplat(), and tryVectorConvertAndSplat().
NamedDecl * Sema::ImplicitlyDefineFunction | ( | SourceLocation | Loc, |
IdentifierInfo & | II, | ||
Scope * | S | ||
) |
ImplicitlyDefineFunction - An undeclared identifier was used in a function call, forming a call to an implicitly defined function (per C99 6.5.1p2).
Definition at line 13908 of file SemaDecl.cpp.
void Sema::ImplMethodsVsClassMethods | ( | Scope * | S, |
ObjCImplDecl * | IMPDecl, | ||
ObjCContainerDecl * | IDecl, | ||
bool | IncompleteImpl = false |
||
) |
ImplMethodsVsClassMethods - This is main routine to warn if any method remains unimplemented in the class or category @implementation.
Definition at line 2952 of file SemaDeclObjC.cpp.
|
inline |
Definition at line 11134 of file Sema.h.
References clang::Scope::incrementMSManglingNumber().
Referenced by clang::Parser::incrementMSManglingNumber().
bool Sema::inferCUDATargetForImplicitSpecialMember | ( | CXXRecordDecl * | ClassDecl, |
CXXSpecialMember | CSM, | ||
CXXMethodDecl * | MemberDecl, | ||
bool | ConstRHS, | ||
bool | Diagnose | ||
) |
Given a implicit special member, infer its CUDA target from the calls it needs to make to underlying base/field special members.
ClassDecl | the class for which the member is being created. |
CSM | the kind of special member. |
MemberDecl | the special member itself. |
ConstRHS | true if this is a copy operation with a const object on its RHS. |
Diagnose | true if this call should emit diagnostics. |
Definition at line 265 of file SemaCUDA.cpp.
References clang::Decl::addAttr(), clang::CXXRecordDecl::bases(), CFT_Device, CFT_Host, Context, Diag(), clang::RecordDecl::fields(), clang::Type::getAs(), clang::ASTContext::getBaseElementType(), clang::RecordType::getDecl(), clang::Decl::getLocation(), IdentifyCUDATarget(), clang::CXXRecordDecl::isAbstract(), LookupSpecialMember(), resolveCalleeCUDATargetConflict(), and clang::CXXRecordDecl::vbases().
Definition at line 5948 of file SemaDecl.cpp.
References Diag(), clang::Decl::getLocation(), clang::Type::getObjCARCImplicitLifetime(), clang::QualType::getObjCLifetime(), clang::ValueDecl::getType(), clang::Type::isObjCLifetimeType(), clang::Qualifiers::OCL_Autoreleasing, and clang::Qualifiers::OCL_None.
Referenced by BuildObjCExceptionDecl(), FinishForRangeVarDecl(), and clang::TemplateDeclInstantiator::VisitVarDecl().
void Sema::inheritCUDATargetAttrs | ( | FunctionDecl * | FD, |
const FunctionTemplateDecl & | TD | ||
) |
Copies target attributes from the template TD to the function FD.
Definition at line 799 of file SemaCUDA.cpp.
References clang::FunctionTemplateDecl::getTemplatedDecl().
void Sema::Initialize | ( | ) |
Perform initialization that occurs after the parser has been initialized but before it parses anything.
Definition at line 196 of file Sema.cpp.
References addImplicitTypedef(), clang::OpenCLOptions::addSupport(), clang::IdentifierResolver::begin(), clang::ASTContext::buildImplicitRecord(), Consumer, Context, clang::ASTContext::DoubleTy, clang::OpenCLOptions::enableSupportedCore(), clang::IdentifierResolver::end(), clang::ASTContext::FloatTy, clang::IdentifierTable::get(), clang::ASTContext::getAtomicType(), clang::ASTContext::getBuiltinMSVaListDecl(), clang::ASTContext::getBuiltinVaListDecl(), clang::ASTContext::getCFConstantStringDecl(), clang::ASTContext::getExternalSource(), clang::Preprocessor::getIdentifierInfo(), clang::ASTContext::getInt128Decl(), clang::ASTContext::getIntPtrType(), getLangOpts(), clang::ASTContext::getObjCClassDecl(), clang::ASTContext::getObjCIdDecl(), clang::ASTContext::getObjCProtocolDecl(), clang::ASTContext::getObjCSelDecl(), getOpenCLOptions(), clang::ASTContext::getPointerDiffType(), clang::ASTContext::getSizeType(), clang::TargetInfo::getSupportedOpenCLOpts(), clang::ASTContext::getTargetInfo(), clang::ASTContext::getTypeSize(), clang::ASTContext::getUInt128Decl(), clang::ASTContext::getUIntPtrType(), clang::TargetInfo::hasBuiltinMSVaList(), clang::TargetInfo::hasInt128Type(), Id, clang::ASTContext::Idents, IdResolver, clang::ASTContext::IntTy, clang::ASTContext::LongTy, clang::ASTContext::OCLClkEventTy, clang::ASTContext::OCLEventTy, clang::ASTContext::OCLQueueTy, clang::ASTContext::OCLReserveIDTy, clang::ASTContext::OCLSamplerTy, PP, PushOnScopeChains(), setOpenCLExtensionForType(), clang::TTK_Class, TUScope, clang::ASTContext::UnsignedIntTy, clang::ASTContext::UnsignedLongTy, and VAListTagName.
Referenced by clang::Parser::Initialize().
void Sema::InstantiateAttrs | ( | const MultiLevelTemplateArgumentList & | TemplateArgs, |
const Decl * | Pattern, | ||
Decl * | Inst, | ||
LateInstantiatedAttrVec * | LateAttrs = nullptr , |
||
LocalInstantiationScope * | OuterMostScope = nullptr |
||
) |
Definition at line 461 of file SemaTemplateInstantiateDecl.cpp.
References clang::Decl::attrs(), attrToRetainOwnershipKind(), clang::LocalInstantiationScope::cloneScopes(), clang::Decl::getDeclContext(), clang::Decl::hasAttr(), instantiateDependentAlignedAttr(), instantiateDependentAlignValueAttr(), instantiateDependentAllocAlignAttr(), instantiateDependentAMDGPUFlatWorkGroupSizeAttr(), instantiateDependentAMDGPUWavesPerEUAttr(), instantiateDependentAssumeAlignedAttr(), instantiateDependentCUDALaunchBoundsAttr(), instantiateDependentDiagnoseIfAttr(), instantiateDependentEnableIfAttr(), instantiateDependentModeAttr(), instantiateOMPDeclareSimdDeclAttr(), clang::sema::instantiateTemplateAttribute(), and clang::NamedDecl::isCXXInstanceMember().
Referenced by clang::TemplateDeclInstantiator::InitFunctionInstantiation(), InstantiateEnum(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), SubstParmVarDecl(), and clang::TemplateDeclInstantiator::VisitVarDecl().
void Sema::InstantiateAttrsForDecl | ( | const MultiLevelTemplateArgumentList & | TemplateArgs, |
const Decl * | Pattern, | ||
Decl * | Inst, | ||
LateInstantiatedAttrVec * | LateAttrs = nullptr , |
||
LocalInstantiationScope * | OuterMostScope = nullptr |
||
) |
Definition at line 427 of file SemaTemplateInstantiateDecl.cpp.
References clang::Decl::attrs(), and clang::sema::instantiateTemplateAttributeForDecl().
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition().
bool Sema::InstantiateClass | ( | SourceLocation | PointOfInstantiation, |
CXXRecordDecl * | Instantiation, | ||
CXXRecordDecl * | Pattern, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
TemplateSpecializationKind | TSK, | ||
bool | Complain = true |
||
) |
Instantiate the definition of a class from a given pattern.
PointOfInstantiation | The point of instantiation within the source code. |
Instantiation | is the declaration whose definition is being instantiated. This will be either a class template specialization or a member class of a class template specialization. |
Pattern | is the pattern from which the instantiation occurs. This will be either the declaration of a class template or the declaration of a member class of a class template. |
TemplateArgs | The template arguments to be substituted into the pattern. |
TSK | the kind of implicit or explicit instantiation to perform. |
Complain | whether to complain if the class cannot be instantiated due to the lack of a definition. |
Definition at line 2016 of file SemaTemplateInstantiate.cpp.
References DiagnoseUninstantiableTemplate(), clang::CXXRecordDecl::getDefinition(), and clang::CXXRecordDecl::getInstantiatedFromMemberClass().
Referenced by InstantiateClassMembers(), and InstantiateClassTemplateSpecialization().
void Sema::InstantiateClassMembers | ( | SourceLocation | PointOfInstantiation, |
CXXRecordDecl * | Instantiation, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
TemplateSpecializationKind | TSK | ||
) |
Instantiates the definitions of all of the member of the given class, which is an instantiation of a class template or a member class of a template.
Definition at line 2596 of file SemaTemplateInstantiate.cpp.
References CheckSpecializationInstantiationRedecl(), Consumer, Context, clang::DeclContext::decls(), clang::DeclContextLookupResult::front(), clang::CXXRecordDecl::getDefinition(), clang::EnumDecl::getDefinition(), clang::CXXRecordDecl::getInstantiatedFromMemberClass(), clang::MemberSpecializationInfo::getPointOfInstantiation(), clang::ASTContext::getTargetInfo(), clang::CXXRecordDecl::getTemplateInstantiationPattern(), clang::MemberSpecializationInfo::getTemplateSpecializationKind(), clang::TargetInfo::getTriple(), clang::ASTConsumer::HandleTopLevelDecl(), InstantiateClass(), InstantiateEnum(), InstantiateFunctionDefinition(), InstantiateInClassInitializer(), InstantiateVariableDefinition(), clang::CXXRecordDecl::isLocalClass(), clang::DeclContext::lookup(), MarkVTableUsed(), PendingLocalImplicitInstantiations, clang::MemberSpecializationInfo::setPointOfInstantiation(), clang::MemberSpecializationInfo::setTemplateSpecializationKind(), clang::TSK_ExplicitInstantiationDeclaration, clang::TSK_ExplicitInstantiationDefinition, clang::TSK_ExplicitSpecialization, and clang::TSK_ImplicitInstantiation.
Referenced by InstantiateClassTemplateSpecializationMembers().
bool Sema::InstantiateClassTemplateSpecialization | ( | SourceLocation | PointOfInstantiation, |
ClassTemplateSpecializationDecl * | ClassTemplateSpec, | ||
TemplateSpecializationKind | TSK, | ||
bool | Complain = true |
||
) |
Definition at line 2572 of file SemaTemplateInstantiate.cpp.
References clang::CXXRecordDecl::getCanonicalDecl(), getPatternForClassTemplateSpecialization(), getTemplateInstantiationArgs(), InstantiateClass(), and clang::Decl::isInvalidDecl().
void Sema::InstantiateClassTemplateSpecializationMembers | ( | SourceLocation | PointOfInstantiation, |
ClassTemplateSpecializationDecl * | ClassTemplateSpec, | ||
TemplateSpecializationKind | TSK | ||
) |
Instantiate the definitions of all of the members of the given class template specialization, which was named as part of an explicit instantiation.
Definition at line 2816 of file SemaTemplateInstantiate.cpp.
References getTemplateInstantiationArgs(), and InstantiateClassMembers().
bool Sema::InstantiateEnum | ( | SourceLocation | PointOfInstantiation, |
EnumDecl * | Instantiation, | ||
EnumDecl * | Pattern, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
TemplateSpecializationKind | TSK | ||
) |
Instantiate the definition of an enum from a given pattern.
PointOfInstantiation | The point of instantiation within the source code. |
Instantiation | is the declaration whose definition is being instantiated. This will be a member enumeration of a class temploid specialization, or a local enumeration within a function temploid specialization. |
Pattern | The templated declaration from which the instantiation occurs. |
TemplateArgs | The template arguments to be substituted into the pattern. |
TSK | The kind of implicit or explicit instantiation to perform. |
true
if an error occurred, false
otherwise. Definition at line 2268 of file SemaTemplateInstantiate.cpp.
References Context, DiagnoseUninstantiableTemplate(), clang::EnumDecl::getDefinition(), clang::EnumDecl::getInstantiatedFromMemberEnum(), clang::EnumDecl::getMemberSpecializationInfo(), InstantiateAttrs(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), clang::Sema::InstantiatingTemplate::isAlreadyInstantiating(), clang::Sema::InstantiatingTemplate::isInvalid(), clang::Decl::isInvalidDecl(), clang::Sema::ContextRAII::pop(), PotentiallyEvaluated, clang::EnumDecl::setTemplateSpecializationKind(), and clang::Decl::setVisibleDespiteOwningModule().
Referenced by InstantiateClassMembers(), and RequireCompleteDeclContext().
void Sema::InstantiateExceptionSpec | ( | SourceLocation | PointOfInstantiation, |
FunctionDecl * | Function | ||
) |
Definition at line 3892 of file SemaTemplateInstantiateDecl.cpp.
References addInstantiatedParametersToScope(), clang::Type::castAs(), Diag(), clang::EST_None, clang::EST_Uninstantiated, clang::FunctionProtoType::getExceptionSpecTemplate(), clang::FunctionProtoType::getExceptionSpecType(), clang::ValueDecl::getType(), clang::Sema::InstantiatingTemplate::isAlreadyInstantiating(), and clang::Sema::InstantiatingTemplate::isInvalid().
Referenced by ResolveExceptionSpec().
FunctionDecl * Sema::InstantiateFunctionDeclaration | ( | FunctionTemplateDecl * | FTD, |
const TemplateArgumentList * | Args, | ||
SourceLocation | Loc | ||
) |
Instantiate (or find existing instantiation of) a function template with a given set of template arguments.
Usually this should not be used, and template argument deduction should be used in its place.
Definition at line 4049 of file SemaTemplateInstantiateDecl.cpp.
References clang::TemplateArgumentList::asArray(), clang::DeclContext::getParent(), and clang::FunctionTemplateDecl::getTemplatedDecl().
void Sema::InstantiateFunctionDefinition | ( | SourceLocation | PointOfInstantiation, |
FunctionDecl * | Function, | ||
bool | Recursive = false , |
||
bool | DefinitionRequired = false , |
||
bool | AtEndOfTU = false |
||
) |
Instantiate the definition of the given function from its template.
PointOfInstantiation | the point at which the instantiation was required. Note that this is not precisely a "point of instantiation" for the function, but it's close. |
Function | the already-instantiated declaration of a function template specialization or member function of a class template specialization. |
Recursive | if true, recursively instantiates any functions that are required by this instantiation. |
DefinitionRequired | if true, then we are performing an explicit instantiation where the body of the function is required. Complain if there is no such body. |
Definition at line 4105 of file SemaTemplateInstantiateDecl.cpp.
References Diag(), clang::DeclaratorDecl::getBeginLoc(), clang::FunctionDecl::getBody(), clang::FunctionDecl::getDefinition(), clang::FunctionDecl::getInstantiatedFromMemberFunction(), clang::Decl::getLocation(), clang::FunctionDecl::getTemplateInstantiationPattern(), clang::FunctionDecl::getTemplateSpecializationKindForInstantiation(), clang::FunctionDecl::isDefined(), clang::Decl::isInvalidDecl(), clang::FunctionDecl::isLateTemplateParsed(), clang::FunctionDecl::setInstantiationIsPending(), clang::Decl::setInvalidDecl(), clang::TSK_ExplicitInstantiationDefinition, clang::TSK_ExplicitSpecialization, clang::TSK_ImplicitInstantiation, and clang::FunctionDecl::willHaveBody().
Referenced by InstantiateClassMembers(), isEmptyCudaConstructor(), and isEmptyCudaDestructor().
bool Sema::InstantiateInClassInitializer | ( | SourceLocation | PointOfInstantiation, |
FieldDecl * | Instantiation, | ||
FieldDecl * | Pattern, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Instantiate the definition of a field from the given pattern.
PointOfInstantiation | The point of instantiation within the source code. |
Instantiation | is the declaration whose definition is being instantiated. This will be a class of a class temploid specialization, or a local enumeration within a function temploid specialization. |
Pattern | The templated declaration from which the instantiation occurs. |
TemplateArgs | The template arguments to be substituted into the pattern. |
true
if an error occurred, false
otherwise. Definition at line 2333 of file SemaTemplateInstantiate.cpp.
References ActOnFinishCXXInClassMemberInitializer(), ActOnStartCXXInClassMemberInitializer(), Context, Diag(), getASTMutationListener(), clang::Stmt::getBeginLoc(), clang::FieldDecl::getInClassInitializer(), clang::FieldDecl::getInClassInitStyle(), clang::DeclContext::getOuterLexicalRecordContext(), clang::FieldDecl::getParent(), clang::FieldDecl::hasInClassInitializer(), clang::Sema::InstantiatingTemplate::isAlreadyInstantiating(), clang::Sema::InstantiatingTemplate::isInvalid(), PotentiallyEvaluated, clang::Decl::setInvalidDecl(), and SubstInitializer().
Referenced by InstantiateClassMembers().
void Sema::InstantiateMemInitializers | ( | CXXConstructorDecl * | New, |
const CXXConstructorDecl * | Tmpl, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 4838 of file SemaTemplateInstantiateDecl.cpp.
References collectUnexpandedParameterPacks(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::NamedDecl::getDeclName(), clang::CXXMethodDecl::getParent(), clang::TypeLoc::getSourceRange(), clang::TypeSourceInfo::getType(), clang::CXXConstructorDecl::inits(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Decl::isInvalidDecl(), and clang::Decl::setInvalidDecl().
void Sema::InstantiateVariableDefinition | ( | SourceLocation | PointOfInstantiation, |
VarDecl * | Var, | ||
bool | Recursive = false , |
||
bool | DefinitionRequired = false , |
||
bool | AtEndOfTU = false |
||
) |
Instantiate the definition of the given variable from its template.
PointOfInstantiation | the point at which the instantiation was required. Note that this is not precisely a "point of instantiation" for the variable, but it's close. |
Var | the already-instantiated declaration of a templated variable. |
Recursive | if true, recursively instantiates any functions that are required by this instantiation. |
DefinitionRequired | if true, then we are performing an explicit instantiation where a definition of the variable is required. Complain if there is no such definition. |
Definition at line 4616 of file SemaTemplateInstantiateDecl.cpp.
References clang::TemplateSpecializationType::anyDependentTemplateArguments(), clang::Redeclarable< decl_type >::getFirstDecl(), clang::VarTemplateSpecializationDecl::getTemplateArgsInfo(), clang::VarDecl::getTemplateInstantiationPattern(), clang::VarDecl::getTemplateSpecializationKindForInstantiation(), clang::VarDecl::hasInit(), clang::Sema::InstantiatingTemplate::isAlreadyInstantiating(), clang::Sema::InstantiatingTemplate::isInvalid(), clang::Decl::isInvalidDecl(), clang::VarDecl::isStaticDataMember(), and clang::TSK_ExplicitSpecialization.
Referenced by DoMarkVarDeclReferenced(), and InstantiateClassMembers().
void Sema::InstantiateVariableInitializer | ( | VarDecl * | Var, |
VarDecl * | OldVar, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Instantiate the initializer of a variable.
Definition at line 4533 of file SemaTemplateInstantiateDecl.cpp.
References clang::VarDecl::CallInit, clang::DirectInit, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Decl::getDeclContext(), clang::Redeclarable< decl_type >::getFirstDecl(), clang::VarDecl::getInit(), clang::VarDecl::getInitStyle(), clang::Decl::hasAttr(), clang::VarDecl::hasInit(), clang::Expr::isConstantInitializer(), clang::VarDecl::isCXXForRangeDecl(), clang::VarDecl::isDirectInit(), clang::VarDecl::isInline(), clang::VarDecl::isInlineSpecified(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::VarDecl::isObjCForDecl(), clang::VarDecl::isOutOfLine(), clang::VarDecl::isStaticDataMember(), PotentiallyEvaluated, clang::VarDecl::setImplicitlyInline(), clang::VarDecl::setInlineSpecified(), and clang::Decl::setInvalidDecl().
|
inline |
Determine whether we are currently performing template instantiation.
Definition at line 7818 of file Sema.h.
Referenced by BuildCXXNoexceptExpr(), CheckIdentityFieldAssignment(), checkLiteralOperatorTemplateParameterList(), CheckMoveOnConstruction(), CheckTautologicalComparison(), DiagnoseFloatingImpCast(), DiagnoseSelfAssignment(), diagnoseTautologicalComparison(), DiagnoseTwoPhaseLookup(), makeUnavailableInSystemHeader(), SemaBuiltinSEHScopeCheck(), warnAboutRedundantParens(), and warnBracedScalarInit().
QualType Sema::InvalidLogicalVectorOperands | ( | SourceLocation | Loc, |
ExprResult & | LHS, | ||
ExprResult & | RHS | ||
) |
Definition at line 8600 of file SemaExpr.cpp.
References Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Expr::IgnoreImpCasts(), and clang::Type::isVectorType().
QualType Sema::InvalidOperands | ( | SourceLocation | Loc, |
ExprResult & | LHS, | ||
ExprResult & | RHS | ||
) |
the following "Check" methods will return a valid/converted QualType or a null QualType (indicating an error diagnostic was issued).
type checking binary operators (subroutines of CreateBuiltinBinOp).
Definition at line 8573 of file SemaExpr.cpp.
References Diag(), and clang::ActionResult< PtrTy, CompressInvalid >::get().
Referenced by checkArithmeticOrEnumeralCompare(), checkArithmeticOrEnumeralThreeWayCompare(), and convertPointersToCompositeType().
bool Sema::isAbstractType | ( | SourceLocation | Loc, |
QualType | T | ||
) |
Definition at line 5310 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus.
Referenced by EvaluateBinaryTypeTrait().
Determines whether the given declaration is an valid acceptable result for name lookup of a nested-name-specifier.
SD | Declaration checked for nested-name-specifier. |
IsExtension | If not null and the declaration is accepted as an extension, the pointed variable is assigned true. |
Definition at line 314 of file SemaCXXScopeSpec.cpp.
References Context, clang::ASTContext::getLangOpts(), clang::ASTContext::getTypeDeclType(), clang::NamedDecl::getUnderlyingDecl(), and clang::Type::isDependentType().
Referenced by compareOverloads().
bool Sema::isAcceptableTagRedeclaration | ( | const TagDecl * | Previous, |
TagTypeKind | NewTag, | ||
bool | isDefinition, | ||
SourceLocation | NewTagLoc, | ||
const IdentifierInfo * | Name | ||
) |
Determine whether a tag with a given kind is acceptable as a redeclaration of the given tag declaration.
Definition at line 14319 of file SemaDecl.cpp.
Referenced by clang::TreeTransform< Derived >::RebuildDependentNameType().
|
inline |
Determines whether Caller may invoke Callee, based on their CUDA host/device attributes.
Returns false if the call is not allowed.
Note: Will return true for CFP_WrongSide calls. These may appear in semantically correct CUDA programs, but only if they're never codegen'ed.
bool Sema::IsBlockPointerConversion | ( | QualType | FromType, |
QualType | ToType, | ||
QualType & | ConvertedType | ||
) |
Definition at line 2648 of file SemaOverload.cpp.
References clang::Type::getAs(), and clang::Type::getPointeeType().
Referenced by IsStandardConversion().
|
inlinestatic |
Definition at line 9754 of file Sema.h.
References clang::VK_RValue.
Referenced by diagnoseObjCARCConversion(), and PerformImplicitConversion().
|
inline |
Definition at line 1745 of file Sema.h.
Referenced by ActOnCXXDelete(), buildDeclareReductionRef(), checkTupleLikeDecomposition(), EvaluateBinaryTypeTrait(), isNullPointerValueTemplateArgument(), IsUserDefinedConversion(), lookupStdTypeTraitMember(), PerformImplicitConversion(), ResolveConstructorOverload(), TryConstructorInitialization(), TryListConversion(), TryListInitialization(), TryReferenceInit(), TryRefInitWithConversionFunction(), TryReinterpretCast(), TryStaticDowncast(), TryStaticMemberPointerUpcast(), and TryUserDefinedConversion().
Determine if a conversion is a complex promotion.
A complex promotion is defined as a complex -> complex conversion where the conversion between the underlying real types is a floating-point or integral promotion.
Definition at line 2164 of file SemaOverload.cpp.
References clang::Type::getAs(), and clang::ComplexType::getElementType().
Referenced by IsStandardConversion().
|
inline |
Definition at line 804 of file Sema.h.
Referenced by AnalyzeComparison(), checkFormatStringExpr(), and CheckNonNullArguments().
bool Sema::isCopyElisionCandidate | ( | QualType | ReturnType, |
const VarDecl * | VD, | ||
CopyElisionSemanticsKind | CESK | ||
) |
Definition at line 2939 of file SemaStmt.cpp.
References clang::ValueDecl::getType(), clang::Type::isDependentType(), clang::QualType::isNull(), and clang::Type::isRecordType().
Referenced by clang::TemplateDeclInstantiator::VisitVarDecl().
bool Sema::isCurrentClassName | ( | const IdentifierInfo & | II, |
Scope * | S, | ||
const CXXScopeSpec * | SS = nullptr |
||
) |
isCurrentClassName - Determine whether the identifier II is the name of the class type currently being defined.
In the case of nested classes, this will only return true if II is the name of the innermost class.
Definition at line 2148 of file SemaDeclCXX.cpp.
References clang::NamedDecl::getIdentifier().
Referenced by clang::Parser::ParseUnqualifiedId().
bool Sema::isCurrentClassNameTypo | ( | IdentifierInfo *& | II, |
const CXXScopeSpec * | SS | ||
) |
Determine whether the identifier II is a typo for the name of the class type currently being defined.
If so, update it to the identifier that should have been used.
Definition at line 2157 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, clang::IdentifierInfo::getLength(), clang::IdentifierInfo::getName(), clang::CXXScopeSpec::isInvalid(), and clang::CXXScopeSpec::isSet().
bool Sema::isDeclInScope | ( | NamedDecl * | D, |
DeclContext * | Ctx, | ||
Scope * | S = nullptr , |
||
bool | AllowInlineNamespace = false |
||
) |
isDeclInScope - If 'Ctx' is a function/method, isDeclInScope returns true if 'D' is in Scope 'S', otherwise 'S' is ignored and isDeclInScope returns true if 'D' belongs to the given declaration context.
AllowInlineNamespace | If true , allow the declaration to be in the enclosing namespace set of the context, rather than contained directly within it. |
Definition at line 1430 of file SemaDecl.cpp.
Referenced by EndOpenMPDSABlock().
bool Sema::isDeductionGuideName | ( | Scope * | S, |
const IdentifierInfo & | Name, | ||
SourceLocation | NameLoc, | ||
ParsedTemplateTy * | Template = nullptr |
||
) |
Determine whether a particular identifier might be the name in a C++1z deduction-guide declaration.
Definition at line 286 of file SemaTemplate.cpp.
Referenced by clang::Parser::ParseUnqualifiedId().
bool Sema::isDependentScopeSpecifier | ( | const CXXScopeSpec & | SS | ) |
Definition at line 167 of file SemaCXXScopeSpec.cpp.
References clang::CXXScopeSpec::getScopeRep(), clang::NestedNameSpecifier::isDependent(), clang::CXXScopeSpec::isInvalid(), and clang::CXXScopeSpec::isSet().
bool Sema::IsDerivedFrom | ( | SourceLocation | Loc, |
QualType | Derived, | ||
QualType | Base | ||
) |
Determine whether the type Derived
is a C++ class that is derived from the type Base
.
Definition at line 2547 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, clang::Type::getAsCXXRecordDecl(), clang::TagDecl::isBeingDefined(), clang::CXXRecordDecl::isDerivedFrom(), and clang::Decl::isInvalidDecl().
Referenced by buildDeclareReductionRef(), buildUserDefinedMapperRef(), CheckPointerToMemberOperands(), CompareDerivedToBaseConversions(), CompareStandardConversionSequences(), getCastAwayConstnessCastKind(), IsUserDefinedConversion(), TryClassUnification(), TryImplicitConversion(), TryListConversion(), TryListInitialization(), TryObjectArgumentInitialization(), and TryUserDefinedConversion().
bool Sema::IsDerivedFrom | ( | SourceLocation | Loc, |
QualType | Derived, | ||
QualType | Base, | ||
CXXBasePaths & | Paths | ||
) |
Determine whether the type Derived
is a C++ class that is derived from the type Base
.
Definition at line 2574 of file SemaDeclCXX.cpp.
bool Sema::isEmptyCudaConstructor | ( | SourceLocation | Loc, |
CXXConstructorDecl * | CD | ||
) |
CD
can be considered empty according to CUDA (E.2.3.1 in CUDA 7.5 Programming guide). Definition at line 393 of file SemaCUDA.cpp.
References clang::Redeclarable< decl_type >::getFirstDecl(), clang::FunctionDecl::getNumParams(), clang::CXXMethodDecl::getParent(), clang::FunctionDecl::hasTrivialBody(), clang::CXXConstructorDecl::inits(), InstantiateFunctionDefinition(), clang::FunctionDecl::isDefined(), clang::CXXRecordDecl::isDynamicClass(), clang::FunctionDecl::isTemplateInstantiation(), and clang::FunctionDecl::isTrivial().
Referenced by checkAllowedCUDAInitializer().
bool Sema::isEmptyCudaDestructor | ( | SourceLocation | Loc, |
CXXDestructorDecl * | CD | ||
) |
Definition at line 427 of file SemaCUDA.cpp.
References clang::CXXRecordDecl::bases(), clang::RecordDecl::fields(), clang::Redeclarable< decl_type >::getFirstDecl(), clang::CXXMethodDecl::getParent(), clang::FunctionDecl::hasTrivialBody(), InstantiateFunctionDefinition(), clang::FunctionDecl::isDefined(), clang::CXXRecordDecl::isDynamicClass(), clang::FunctionDecl::isTemplateInstantiation(), and clang::FunctionDecl::isTrivial().
Referenced by checkAllowedCUDAInitializer().
Determine if A
and B
are equivalent internal linkage declarations from different modules, and thus an ambiguity error can be downgraded to an extension warning.
Determine whether two declarations are "equivalent" for the purposes of name lookup and overload resolution.
This applies when the same internal/no linkage entity is defined by two modules (probably by textually including the same header). In such a case, we don't consider the declarations to declare the same entity, but we also don't want lookups with both declarations visible to be ambiguous in some cases (this happens when using a modularized libstdc++).
Definition at line 9340 of file SemaOverload.cpp.
Determine if VD, which must be a variable or function, is an external symbol that nonetheless can't be referenced from outside this translation unit because its type has no linkage and it's not extern "C".
Determine whether ND is an external-linkage function or variable whose type has no linkage.
Definition at line 627 of file Sema.cpp.
References getLangOpts(), clang::Type::getLinkage(), clang::ValueDecl::getType(), clang::NamedDecl::hasExternalFormalLinkage(), clang::isExternalFormalLinkage(), and isFunctionOrVarDeclExternC().
Referenced by getUndefinedButUsed(), and MarkVarDeclODRUsed().
IsFloatingPointPromotion - Determines whether the conversion from FromType to ToType is a floating point promotion (C++ 4.6).
If so, returns true and sets PromotedType to the promoted type.
An rvalue of type float can be converted to an rvalue of type double. (C++ 4.6p1).
Definition at line 2130 of file SemaOverload.cpp.
References clang::Type::getAs().
Referenced by IsStandardConversion().
Determine whether the conversion from FromType to ToType is a valid conversion that strips "noexcept" or "noreturn" off the nested function type.
Definition at line 1448 of file SemaOverload.cpp.
Referenced by checkPointerTypesForAssignment(), handlerCanCatch(), and IsStandardConversion().
bool Sema::isImplicitlyDeleted | ( | FunctionDecl * | FD | ) |
Determine whether the given function is an implicitly-deleted special member function.
Definition at line 12866 of file SemaDeclCXX.cpp.
References clang::FunctionDecl::isDefaulted(), and clang::FunctionDecl::isDeleted().
bool Sema::isIncompatibleTypedef | ( | TypeDecl * | Old, |
TypedefNameDecl * | New | ||
) |
Definition at line 2116 of file SemaDecl.cpp.
Referenced by clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl().
bool Sema::isInitListConstructor | ( | const FunctionDecl * | Ctor | ) |
Determine whether Ctor is an initializer-list constructor, as defined in [dcl.init.list]p2.
Definition at line 9345 of file SemaDeclCXX.cpp.
References clang::Type::getAs(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::Type::getPointeeType(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), and clang::ParmVarDecl::hasDefaultArg().
Referenced by IsInitializerListConstructorConversion(), and ResolveConstructorOverload().
|
inline |
Return true inside OpenMP declare target region.
Definition at line 9172 of file Sema.h.
Referenced by MarkExprReferenced().
bool Sema::isInOpenMPTargetExecutionDirective | ( | ) | const |
Return true inside OpenMP target region.
Definition at line 1767 of file SemaOpenMP.cpp.
References DSAStack, and clang::isOpenMPTargetExecutionDirective().
bool Sema::IsInsideALocalClassWithinATemplateFunction | ( | ) |
Definition at line 10316 of file SemaTemplate.cpp.
References clang::DeclContext::getParent(), clang::FunctionDecl::getTemplatedKind(), clang::DeclContext::isNamespace(), clang::DeclContext::isTranslationUnit(), and clang::FunctionDecl::TK_NonTemplate.
IsIntegralPromotion - Determines whether the conversion from the expression From (whose potentially-adjusted type is FromType) to ToType is an integral promotion (C++ 4.5).
If so, returns true and sets PromotedType to the promoted type.
Definition at line 1969 of file SemaOverload.cpp.
References clang::Type::getAs(), clang::Type::isBooleanType(), clang::Type::isEnumeralType(), clang::Type::isPromotableIntegerType(), and clang::Type::isSignedIntegerType().
Referenced by IsStandardConversion().
bool Sema::IsInvalidUnlessNestedName | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
NestedNameSpecInfo & | IdInfo, | ||
bool | EnteringContext | ||
) |
IsInvalidUnlessNestedName - This method is used for error recovery purposes to determine whether the specified identifier is only valid as a nested name specifier, for example a namespace name.
It is conservatively correct to always return false from this method.
The arguments are the same as those passed to ActOnCXXNestedNameSpecifier.
Definition at line 878 of file SemaCXXScopeSpec.cpp.
bool Sema::isKnownName | ( | StringRef | name | ) |
Definition at line 3537 of file SemaExprObjC.cpp.
Referenced by diagnoseObjCARCConversion().
Is this a legal conversion between two types, one of which is known to be a vector type?
Definition at line 6422 of file SemaExpr.cpp.
References clang::Type::isVectorType().
Referenced by IsVectorConversion().
bool clang::Sema::isLibstdcxxEagerExceptionSpecHack | ( | const Declarator & | D | ) |
Determine if we're in a case where we need to (incorrectly) eagerly parse an exception specification to work around a libstdc++ bug.
HACK: libstdc++ has a bug where it shadows std::swap with a member swap function then tries to call std::swap unqualified from the exception specification of that function.
This function detects whether we're in such a case and turns off delay-parsing of exception specifications.
Definition at line 41 of file SemaExceptionSpec.cpp.
References Context, CurContext, clang::Declarator::getBeginLoc(), clang::Declarator::getIdentifier(), clang::ASTContext::getSourceManager(), clang::SourceManager::isInSystemHeader(), clang::DeclContext::isStdNamespace(), and clang::IdentifierInfo::isStr().
bool Sema::IsMemberPointerConversion | ( | Expr * | From, |
QualType | FromType, | ||
QualType | ToType, | ||
bool | InOverloadResolution, | ||
QualType & | ConvertedType | ||
) |
IsMemberPointerConversion - Determines whether the conversion of the expression From, which has the (possibly adjusted) type FromType, can be converted to the type ToType via a member pointer conversion (C++ 4.11).
If so, returns true and places the converted type (that might differ from ToType in its cv-qualifiers at some level) into ConvertedType.
Definition at line 2974 of file SemaOverload.cpp.
References clang::Type::getAs(), and clang::Expr::isNullPointerConstant().
Referenced by IsStandardConversion().
bool Sema::isMicrosoftMissingTypename | ( | const CXXScopeSpec * | SS, |
Scope * | S | ||
) |
isMicrosoftMissingTypename - In Microsoft mode, within class scope, if a CXXScopeSpec's type is equal to the type of one of the base classes then downgrade the missing typename error to a warning.
This is needed for MSVC compatibility; Example:
Definition at line 641 of file SemaDecl.cpp.
Definition at line 1675 of file SemaLookup.cpp.
References clang::NamedDecl::isExternallyDeclarable(), isInCurrentModule(), clang::Module::isModuleVisible(), and clang::LookupResult::isVisible().
Referenced by hasVisibleMemberSpecialization().
bool Sema::isMoreSpecializedThanPrimary | ( | ClassTemplatePartialSpecializationDecl * | T, |
sema::TemplateDeductionInfo & | Info | ||
) |
Definition at line 5107 of file SemaTemplateDeduction.cpp.
References clang::sema::TemplateDeductionInfo::clearSFINAEDiagnostic(), clang::ClassTemplateDecl::getInjectedClassNameSpecialization(), clang::ClassTemplatePartialSpecializationDecl::getInjectedSpecializationType(), clang::ClassTemplateSpecializationDecl::getSpecializedTemplate(), and isAtLeastAsSpecializedAs().
Referenced by checkMoreSpecializedThanPrimary().
bool Sema::isMoreSpecializedThanPrimary | ( | VarTemplatePartialSpecializationDecl * | T, |
sema::TemplateDeductionInfo & | Info | ||
) |
Definition at line 5147 of file SemaTemplateDeduction.cpp.
References clang::VarTemplateSpecializationDecl::getSpecializedTemplate().
bool Sema::isNonTypeNestedNameSpecifier | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
NestedNameSpecInfo & | IdInfo | ||
) |
Definition at line 383 of file SemaCXXScopeSpec.cpp.
Definition at line 2193 of file Sema.h.
References clang::ast_matchers::expr.
bool Sema::isObjCPointerConversion | ( | QualType | FromType, |
QualType | ToType, | ||
QualType & | ConvertedType, | ||
bool & | IncompatibleObjC | ||
) |
isObjCPointerConversion - Determines whether this is an Objective-C pointer conversion.
Subroutine of IsPointerConversion, with the same arguments and return values.
Definition at line 2410 of file SemaOverload.cpp.
References clang::Type::getAs(), and clang::QualType::getQualifiers().
Referenced by DiagnosePropertyMismatch().
bool Sema::isObjCWritebackConversion | ( | QualType | FromType, |
QualType | ToType, | ||
QualType & | ConvertedType | ||
) |
Determine whether this is an Objective-C writeback conversion, used for parameter passing when performing automatic reference counting.
FromType | The type we're converting form. |
ToType | The type we're converting to. |
ConvertedType | The type that will be produced after applying this conversion. |
Construct the type we're converting to, which is a pointer to __autoreleasing pointee.
Definition at line 2590 of file SemaOverload.cpp.
Referenced by IsStandardConversion(), and tryObjCWritebackConversion().
Definition at line 2195 of file Sema.cpp.
References Diag(), getOpenCLOptions(), and clang::OpenCLOptions::isEnabled().
Return true if the provided declaration VD should be captured by reference.
Level | Relative level of nested OpenMP construct for that the check is performed. |
Definition at line 1609 of file SemaOpenMP.cpp.
References clang::Type::castAs(), DSAStack, clang::Decl::getCanonicalDecl(), clang::ASTContext::getDeclAlign(), clang::ReferenceType::getPointeeType(), clang::ValueDecl::getType(), clang::ASTContext::getTypeAlignInChars(), clang::ASTContext::getTypeSizeInChars(), clang::ASTContext::getUIntPtrType(), clang::Decl::hasAttr(), and clang::isOpenMPTargetExecutionDirective().
VarDecl * Sema::isOpenMPCapturedDecl | ( | ValueDecl * | D, |
bool | CheckScopeInfo = false , |
||
unsigned | StopAt = 0 |
||
) |
Check if the specified variable is used in one of the private clauses (private, firstprivate, lastprivate, reduction etc.) in OpenMP constructs.
Definition at line 1778 of file SemaOpenMP.cpp.
References clang::CR_OpenMP, DSAStack, getCanonicalDecl(), clang::getOpenMPCaptureRegions(), clang::isOpenMPPrivate(), clang::isOpenMPThreadPrivate(), clang::OMPC_unknown, and clang::OMPD_unknown.
Referenced by buildCapture().
Check if the specified variable is used in 'private' clause.
Level | Relative level of nested OpenMP construct for that the check is performed. |
Definition at line 1869 of file SemaOpenMP.cpp.
References DSAStack, clang::Decl::getCanonicalDecl(), clang::isOpenMPLoopDirective(), and clang::isOpenMPSimdDirective().
Check if the specified variable is captured by 'target' directive.
Level | Relative level of nested OpenMP construct for that the check is performed. |
Definition at line 1942 of file SemaOpenMP.cpp.
References DSAStack, clang::VarDecl::hasLocalStorage(), and clang::isOpenMPTargetExecutionDirective().
bool Sema::IsOverload | ( | FunctionDecl * | New, |
FunctionDecl * | Old, | ||
bool | IsForUsingDecl, | ||
bool | ConsiderCudaAttrs = true |
||
) |
Definition at line 1077 of file SemaOverload.cpp.
References clang::FunctionDecl::getDescribedFunctionTemplate(), clang::FunctionDecl::isMain(), and clang::FunctionDecl::isMSVCRTEntryPoint().
Referenced by checkCUDATargetOverload(), and maybeAddCUDAHostDeviceAttrs().
bool Sema::IsPointerConversion | ( | Expr * | From, |
QualType | FromType, | ||
QualType | ToType, | ||
bool | InOverloadResolution, | ||
QualType & | ConvertedType, | ||
bool & | IncompatibleObjC | ||
) |
IsPointerConversion - Determines whether the conversion of the expression From, which has the (possibly adjusted) type FromType, can be converted to the type ToType via a pointer conversion (C++ 4.10).
If so, returns true and places the converted type (that might differ from ToType in its cv-qualifiers at some level) into ConvertedType.
This routine also supports conversions to and from block pointers and conversions with Objective-C's 'id', 'id<protocols...>', and pointers to interfaces. FIXME: Once we've determined the appropriate overloading rules for Objective-C, we may want to split the Objective-C checks into a different routine; however, GCC seems to consider all of these conversions to be pointer conversions, so for now they live here. IncompatibleObjC will be set if the conversion is an allowed Objective-C conversion that should result in a warning.
Definition at line 2258 of file SemaOverload.cpp.
References isNullPointerConstantForConversion(), and clang::Type::isObjCObjectPointerType().
Referenced by IsStandardConversion().
bool Sema::IsQualificationConversion | ( | QualType | FromType, |
QualType | ToType, | ||
bool | CStyle, | ||
bool & | ObjCLifetimeConversion | ||
) |
IsQualificationConversion - Determines whether the conversion from an rvalue of type FromType to ToType is a qualification conversion (C++ 4.4).
ObjCLifetimeConversion | Output parameter that will be set to indicate when the qualification conversion involves a change in the Objective-C object lifetime. |
Definition at line 3096 of file SemaOverload.cpp.
Referenced by CheckTemplateArgumentIsCompatibleWithParameter(), CheckTemplateArgumentPointerToMember(), handlerCanCatch(), isNullPointerValueTemplateArgument(), and IsStandardConversion().
Determine whether the given expression is a qualified member access expression, of a form that could be turned into a pointer to member with the address-of operator.
Definition at line 13320 of file SemaExpr.cpp.
References clang::NamedDecl::isCXXClassMember().
bool Sema::isSameOrCompatibleFunctionType | ( | CanQualType | Param, |
CanQualType | Arg | ||
) |
Compare types for equality with respect to possibly compatible function types (noreturn adjustment, implicit calling conventions).
If any of parameter and argument is not a function, just perform type comparison.
Param | the template parameter type. |
Arg | the argument type. |
Definition at line 1146 of file SemaTemplateDeduction.cpp.
References clang::CanQual< T >::getAs().
Private Helper predicate to check for 'self'.
Definition at line 1759 of file SemaExprObjC.cpp.
Referenced by LookupMethodInReceiverType().
bool Sema::isSelfExpr | ( | Expr * | RExpr, |
const ObjCMethodDecl * | Method | ||
) |
Definition at line 1766 of file SemaExprObjC.cpp.
References clang::ObjCMethodDecl::getSelfDecl(), and clang::Expr::IgnoreParenLValueCasts().
Optional< TemplateDeductionInfo * > Sema::isSFINAEContext | ( | ) | const |
Determines whether we are currently in a context where template argument substitution failures are not considered errors.
Optional
if we're not in a SFINAE context. Otherwise, contains a pointer that, if non-NULL, contains the nearest template-deduction context object, which can be used to capture diagnostics that will be suppressed. Definition at line 665 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, CurrentInstantiationScope, clang::Sema::CodeSynthesisContext::DeclaringSpecialMember, clang::Sema::CodeSynthesisContext::DeducedTemplateArgumentSubstitution, clang::Sema::CodeSynthesisContext::DefaultFunctionArgumentInstantiation, clang::Sema::CodeSynthesisContext::DefaultTemplateArgumentChecking, clang::Sema::CodeSynthesisContext::DefaultTemplateArgumentInstantiation, clang::Sema::CodeSynthesisContext::DefiningSynthesizedFunction, Depth, clang::Sema::CodeSynthesisContext::ExceptionSpecEvaluation, clang::Sema::CodeSynthesisContext::ExceptionSpecInstantiation, clang::Sema::CodeSynthesisContext::ExplicitTemplateArgumentSubstitution, clang::LocalInstantiationScope::getPartiallySubstitutedPack(), InNonInstantiationSFINAEContext, clang::LocalInstantiationScope::MakeInstantiatedLocalArgPack(), clang::Sema::CodeSynthesisContext::Memoization, clang::Sema::CodeSynthesisContext::PriorTemplateArgumentSubstitution, clang::Result, and clang::Sema::CodeSynthesisContext::TemplateInstantiation.
Referenced by ActOnCXXDelete(), ActOnPseudoDestructorExpr(), CheckArrow(), computeDeclContext(), CopyObject(), diagnoseNoViableConversion(), EmitCurrentDiagnostic(), recordConversion(), RequireCompleteDeclContext(), and clang::Sema::SFINAETrap::SFINAETrap().
bool Sema::isSimpleTypeSpecifier | ( | tok::TokenKind | Kind | ) | const |
Determine whether the token kind starts a simple-type-specifier.
Definition at line 123 of file SemaDecl.cpp.
bool Sema::IsSimplyAccessible | ( | NamedDecl * | Target, |
CXXRecordDecl * | NamingClass, | ||
QualType | BaseType | ||
) |
Checks access to Target from the given class.
The check will take access specifiers into account, but no member access expressions and such.
Target | the declaration to check if it can be accessed |
NamingClass | the class in which the lookup was started. |
BaseType | type of the left side of member access expression. BaseType and NamingClass are used for C++ access control. Depending on the lookup case, they should be set to the following:
|
Definition at line 1891 of file SemaAccess.cpp.
References clang::NamedDecl::isCXXClassMember().
bool Sema::isSpecialMemberAccessibleForDeletion | ( | CXXMethodDecl * | decl, |
AccessSpecifier | access, | ||
QualType | objectType | ||
) |
Is the given special member function accessible for the purposes of deciding whether to define a special member function as deleted?
Definition at line 1565 of file SemaAccess.cpp.
References clang::AS_public.
Tests whether Ty is an instance of std::initializer_list and, if it is and Element is not NULL, assigns the element type to Element.
Definition at line 9236 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, clang::TemplateArgumentList::data(), clang::Type::getAs(), clang::TemplateArgument::getAsType(), clang::ClassTemplateDecl::getCanonicalDecl(), clang::Decl::getDeclContext(), clang::NamedDecl::getIdentifier(), clang::TemplateParameterList::getMinRequiredArguments(), clang::TemplateParameterList::getParam(), clang::ClassTemplateSpecializationDecl::getSpecializedTemplate(), clang::ClassTemplateSpecializationDecl::getTemplateArgs(), clang::ClassTemplateDecl::getTemplatedDecl(), and clang::TemplateDecl::getTemplateParameters().
Referenced by DeduceFromInitializerList(), diagnoseListInit(), TryListConversion(), and TryListInitialization().
Helper function to determine whether this is the (deprecated) C++ conversion from a string literal to a pointer to non-const char or non-const wchar_t (for narrow and wide string literals, respectively).
Definition at line 3681 of file SemaExprCXX.cpp.
References clang::StringLiteral::Ascii, Context, clang::Type::getAs(), clang::Type::getPointeeType(), clang::ASTContext::getWideCharType(), clang::Expr::IgnoreParens(), clang::ASTContext::typesAreCompatible(), clang::StringLiteral::UTF16, clang::StringLiteral::UTF32, clang::StringLiteral::UTF8, and clang::StringLiteral::Wide.
Referenced by IsStandardConversion().
DeclSpec::TST Sema::isTagName | ( | IdentifierInfo & | II, |
Scope * | S | ||
) |
isTagName() - This method is called for error recovery purposes only to determine if the specified name is a valid tag name ("struct foo").
If so, this returns the TST for the tag corresponding to it (TST_enum, TST_union, TST_struct, TST_interface, TST_class). This is used to diagnose cases in C where the user forgot to specify the tag.
Definition at line 608 of file SemaDecl.cpp.
TemplateNameKind Sema::isTemplateName | ( | Scope * | S, |
CXXScopeSpec & | SS, | ||
bool | hasTemplateKeyword, | ||
const UnqualifiedId & | Name, | ||
ParsedType | ObjectType, | ||
bool | EnteringContext, | ||
TemplateTy & | Template, | ||
bool & | MemberOfUnknownSpecialization | ||
) |
Definition at line 146 of file SemaTemplate.cpp.
Referenced by clang::Parser::TryAnnotateTypeOrScopeTokenAfterScopeSpec().
bool Sema::isTemplateTemplateParameterAtLeastAsSpecializedAs | ( | TemplateParameterList * | P, |
TemplateDecl * | AArg, | ||
SourceLocation | Loc | ||
) |
Definition at line 5171 of file SemaTemplateDeduction.cpp.
References X.
Determine whether the given type is the type of *this that is used outside of the body of a member function for a type that is currently being defined.
Definition at line 1271 of file SemaExprCXX.cpp.
References CXXThisTypeOverride, clang::Type::getAsCXXRecordDecl(), clang::TagDecl::isBeingDefined(), and clang::QualType::isNull().
Referenced by LookupMemberExprInRecord().
bool Sema::isUnavailableAlignedAllocationFunction | ( | const FunctionDecl & | FD | ) | const |
Determine whether FD
is an aligned allocation or deallocation function that is unavailable.
Definition at line 1732 of file SemaExprCXX.cpp.
References getLangOpts(), clang::FunctionDecl::isDefined(), and clang::FunctionDecl::isReplaceableGlobalAllocationFunction().
Referenced by diagnoseUnavailableAlignedAllocation().
|
inline |
Determines whether we are currently in a context that is not evaluated as per C++ [expr] p5.
Definition at line 7847 of file Sema.h.
Referenced by CheckCXXThisCapture(), CheckIdentityFieldAssignment(), CheckIfAnyEnclosingLambdasMustCaptureAnyPotentialCaptures(), CheckVirtualDtorCall(), DiagnoseSelfAssignment(), clang::EnterExpressionEvaluationContext::EnterExpressionEvaluationContext(), LookupMemberExpr(), and LookupMethodInReceiverType().
bool Sema::isUnexpandedParameterPackPermitted | ( | ) |
Determine whether an unexpanded parameter pack might be permitted in this location.
Determine whether it's possible for an unexpanded parameter pack to be valid in this location.
Useful for error recovery.
This only happens when we're in a declaration that is nested within an expression that could be expanded, such as a lambda-expression within a function call.
This is conservatively correct, but may claim that some unexpanded packs are permitted when they are not.
Definition at line 280 of file SemaTemplateVariadic.cpp.
bool Sema::isUsualDeallocationFunction | ( | const CXXMethodDecl * | FD | ) |
Definition at line 1426 of file SemaExprCXX.cpp.
References CFP_HostDevice, CFP_WrongSide, CurContext, getLangOpts(), clang::FunctionDecl::getNumParams(), IdentifyCUDAPreference(), clang::CXXMethodDecl::isUsualDeallocationFunction(), and clang::Result.
Referenced by CheckOperatorDeleteDeclaration(), and isNonPlacementDeallocationFunction().
Determine if type T is a valid subject for a nonnull and similar attributes.
By default, we look through references (the behavior used by nonnull), but if the second parameter is true, then we treat a reference type as valid.
Referenced by CheckNonNullArguments().
Sema::VarArgKind Sema::isValidVarArgType | ( | const QualType & | Ty | ) |
Determine the degree of POD-ness for an expression.
Incomplete types are considered POD, since this check can be performed when we're in an unevaluated context.
Definition at line 790 of file SemaExpr.cpp.
References clang::QualType::DK_nontrivial_c_struct, clang::QualType::isCXX98PODType(), clang::QualType::isDestructedType(), clang::Type::isIncompleteType(), clang::Type::isObjCObjectType(), and clang::Type::isVoidType().
IsValueInFlagEnum - Determine if a value is allowed as part of a flag enum.
If AllowMask is true, then we also allow the complement of a valid value, to be used as a mask.
Definition at line 17110 of file SemaDecl.cpp.
References clang::EnumDecl::enumerators(), clang::EnumDecl::isClosedFlag(), and clang::TagDecl::isCompleteDefinition().
Determine whether a declaration is visible to name lookup.
Definition at line 1689 of file Sema.h.
References clang::Decl::isHidden().
Referenced by argumentDependentLookup(), hasVisibleDeclarationImpl(), hasVisibleDefaultArgument(), isPreferredLookupResult(), and LookupQualifiedNameInUsingDirectives().
bool Sema::IvarBacksCurrentMethodAccessor | ( | ObjCInterfaceDecl * | IFace, |
ObjCMethodDecl * | Method, | ||
ObjCIvarDecl * | IV | ||
) |
IvarBacksCurrentMethodAccessor - This routine returns 'true' if 'IV' is an ivar synthesized for 'Method' and 'Method' is a property accessor declared in class 'IFace'.
Definition at line 1782 of file SemaObjCProperty.cpp.
References clang::ObjCMethodDecl::getSelector(), clang::ObjCIvarDecl::getSynthesize(), clang::ObjCContainerDecl::instance_properties(), clang::ObjCMethodDecl::isInstanceMethod(), clang::ObjCMethodDecl::isPropertyAccessor(), clang::ObjCInterfaceDecl::known_extensions(), clang::ObjCInterfaceDecl::lookupMethod(), and clang::Property.
Referenced by LookupMemberExpr().
NamedDecl * Sema::LazilyCreateBuiltin | ( | IdentifierInfo * | II, |
unsigned | ID, | ||
Scope * | S, | ||
bool | ForRedeclaration, | ||
SourceLocation | Loc | ||
) |
LazilyCreateBuiltin - The specified Builtin-ID was first used at file scope.
lazily create a decl for it. ForRedeclaration is true if we're creating this built-in in anticipation of redeclaring the built-in.
Definition at line 1979 of file SemaDecl.cpp.
void Sema::LoadExternalVTableUses | ( | ) |
Load any externally-stored vtable uses.
Definition at line 15084 of file SemaDeclCXX.cpp.
void Sema::LoadExternalWeakUndeclaredIdentifiers | ( | ) |
Load weak undeclared identifiers from the external source.
Definition at line 741 of file Sema.cpp.
References clang::ExternalSemaSource::ReadWeakUndeclaredIdentifiers(), and WeakUndeclaredIdentifiers.
Referenced by ActOnEndOfTranslationUnit().
DeclContext::lookup_result Sema::LookupConstructors | ( | CXXRecordDecl * | Class | ) |
Look up the constructors for the given class.
Definition at line 3211 of file SemaLookup.cpp.
References CanDeclareSpecialMemberFunction(), clang::CXXRecordDecl::needsImplicitCopyConstructor(), clang::CXXRecordDecl::needsImplicitDefaultConstructor(), and clang::CXXRecordDecl::needsImplicitMoveConstructor().
Referenced by CheckCXX98CompatAccessibleCopy(), CopyObject(), EvaluateUnaryTypeTrait(), IsInitializerListConstructorConversion(), IsUserDefinedConversion(), TryConstructorInitialization(), TryRefInitWithConversionFunction(), and TryUserDefinedConversion().
CXXMethodDecl * Sema::LookupCopyingAssignment | ( | CXXRecordDecl * | Class, |
unsigned | Quals, | ||
bool | RValueThis, | ||
unsigned | ThisQuals | ||
) |
Look up the copying assignment operator for the given class.
Definition at line 3228 of file SemaLookup.cpp.
References clang::Qualifiers::Const, clang::Sema::SpecialMemberOverloadResult::getMethod(), and clang::Qualifiers::Volatile.
CXXConstructorDecl * Sema::LookupCopyingConstructor | ( | CXXRecordDecl * | Class, |
unsigned | Quals | ||
) |
Look up the copying constructor for the given class.
Definition at line 3189 of file SemaLookup.cpp.
References clang::Qualifiers::Const, clang::Sema::SpecialMemberOverloadResult::getMethod(), and clang::Qualifiers::Volatile.
ClassTemplateDecl * Sema::lookupCoroutineTraits | ( | SourceLocation | KwLoc, |
SourceLocation | FuncLoc | ||
) |
Definition at line 1569 of file SemaCoroutine.cpp.
References Diag(), clang::Decl::getLocation(), and clang::Result.
CXXConstructorDecl * Sema::LookupDefaultConstructor | ( | CXXRecordDecl * | Class | ) |
Look up the default constructor for the given class.
Definition at line 3180 of file SemaLookup.cpp.
References clang::Sema::SpecialMemberOverloadResult::getMethod().
Referenced by TryValueInitialization().
CXXDestructorDecl * Sema::LookupDestructor | ( | CXXRecordDecl * | Class | ) |
Look for the destructor of the given class.
During semantic analysis, this routine should be used in lieu of CXXRecordDecl::getDestructor().
Definition at line 3266 of file SemaLookup.cpp.
Referenced by ActOnCXXDelete(), canRecoverDotPseudoDestructorCallsOnPointerObjects(), checkDestructorReference(), EvaluateUnaryTypeTrait(), MaybeBindToTemporary(), and clang::InitializationSequence::Perform().
|
inline |
ObjCMethodDecl * Sema::LookupImplementedMethodInGlobalPool | ( | Selector | Sel | ) |
LookupImplementedMethodInGlobalPool - Returns the method which has an implementation.
Definition at line 3611 of file SemaDeclObjC.cpp.
References clang::ObjCMethodDecl::isDefined(), clang::ObjCMethodDecl::isPropertyAccessor(), and MethodPool.
Referenced by DiagnoseUseOfUnimplementedSelectors().
bool Sema::LookupInlineAsmField | ( | StringRef | Base, |
StringRef | Member, | ||
unsigned & | Offset, | ||
SourceLocation | AsmLoc | ||
) |
Definition at line 766 of file SemaStmtAsm.cpp.
ExprResult Sema::LookupInlineAsmIdentifier | ( | CXXScopeSpec & | SS, |
SourceLocation | TemplateKWLoc, | ||
UnqualifiedId & | Id, | ||
bool | IsUnevaluatedContext | ||
) |
ExprResult Sema::LookupInlineAsmVarDeclField | ( | Expr * | RefExpr, |
StringRef | Member, | ||
SourceLocation | AsmLoc | ||
) |
Definition at line 835 of file SemaStmtAsm.cpp.
References clang::Expr::getType(), clang::Type::isDependentType(), clang::DeclarationNameInfo::setLoc(), and clang::DeclarationNameInfo::setName().
ExprResult Sema::LookupInObjCMethod | ( | LookupResult & | Lookup, |
Scope * | S, | ||
IdentifierInfo * | II, | ||
bool | AllowBuiltinCreation = false |
||
) |
LookupInObjCMethod - The parser has read a name in, and Sema has detected that we're currently inside an ObjC method.
Perform some additional lookup.
Ideally, most of this would be done by lookup, but there's actually quite a lot of extra work involved.
Returns a null sentinel to indicate trivial success.
Definition at line 2503 of file SemaExpr.cpp.
References clang::declaresSameEntity(), Diag(), clang::LookupResult::empty(), clang::ExprError(), clang::ObjCIvarDecl::getAccessControl(), clang::ObjCMethodDecl::getClassInterface(), clang::NamedDecl::getDeclName(), clang::LookupResult::getFoundDecl(), clang::LookupResult::getNameLoc(), clang::ObjCMethodDecl::isClassMethod(), clang::Decl::isDefinedOutsideFunctionOrMethod(), clang::Decl::isInvalidDecl(), clang::LookupResult::isSingleResult(), clang::ObjCInterfaceDecl::lookupInstanceVariable(), and clang::ObjCIvarDecl::Private.
Referenced by attemptRecovery().
|
inline |
LookupInstanceMethodInGlobalPool - Returns the method and warns if there are multiple signatures.
Definition at line 3807 of file Sema.h.
Referenced by CheckKeyForObjCARCConversion(), and hasIsEqualMethod().
bool Sema::LookupInSuper | ( | LookupResult & | R, |
CXXRecordDecl * | Class | ||
) |
Perform qualified name lookup into all base classes of the given class.
R | captures both the lookup criteria and any lookup results found. |
Class | The context in which qualified name lookup will search. Name lookup will search in all base classes merging the results. |
Definition at line 2424 of file SemaLookup.cpp.
References clang::CXXRecordDecl::bases(), clang::LookupResult::getLookupKind(), and clang::LookupResult::getLookupNameInfo().
Sema::LiteralOperatorLookupResult Sema::LookupLiteralOperator | ( | Scope * | S, |
LookupResult & | R, | ||
ArrayRef< QualType > | ArgTys, | ||
bool | AllowRaw, | ||
bool | AllowTemplate, | ||
bool | AllowStringTemplate, | ||
bool | DiagnoseMissing | ||
) |
LookupLiteralOperator - Determine which literal operator should be used for a user-defined literal, per C++11 [lex.ext].
Normal overload resolution is not used to select which literal operator to call for a user-defined literal. Look up the provided literal operator name, and filter the results to the appropriate set for the given argument types.
Definition at line 3279 of file SemaLookup.cpp.
References clang::LookupResult::Ambiguous, clang::LookupResult::getResultKind(), clang::Decl::isInvalidDecl(), and clang::LookupResult::makeFilter().
Referenced by BuildCookedLiteralOperatorCall().
ObjCMethodDecl * Sema::LookupMethodInObjectType | ( | Selector | Sel, |
QualType | Ty, | ||
bool | IsInstance | ||
) |
LookupMethodInType - Look up a method in an ObjCObjectType.
Definition at line 1777 of file SemaExprObjC.cpp.
References clang::Type::castAs(), clang::ObjCObjectType::getInterface(), and clang::ObjCProtocolQualifiers< T >::quals().
Referenced by CheckKeyForObjCARCConversion(), hasIsEqualMethod(), and LookupMethodInReceiverType().
ObjCMethodDecl * Sema::LookupMethodInQualifiedType | ( | Selector | Sel, |
const ObjCObjectPointerType * | OPT, | ||
bool | Instance | ||
) |
LookupMethodInQualifiedType - Lookups up a method in protocol qualifier list of a qualified objective pointer type.
Definition at line 1801 of file SemaExprObjC.cpp.
References HandleExprPropertyRefExpr(), and clang::ObjCObjectPointerType::quals().
Referenced by hasIsEqualMethod().
CXXMethodDecl * Sema::LookupMovingAssignment | ( | CXXRecordDecl * | Class, |
unsigned | Quals, | ||
bool | RValueThis, | ||
unsigned | ThisQuals | ||
) |
Look up the moving assignment operator for the given class.
Definition at line 3245 of file SemaLookup.cpp.
References clang::Qualifiers::Const, clang::Sema::SpecialMemberOverloadResult::getMethod(), and clang::Qualifiers::Volatile.
CXXConstructorDecl * Sema::LookupMovingConstructor | ( | CXXRecordDecl * | Class, |
unsigned | Quals | ||
) |
Look up the moving constructor for the given class.
Definition at line 3201 of file SemaLookup.cpp.
References clang::Qualifiers::Const, clang::Sema::SpecialMemberOverloadResult::getMethod(), and clang::Qualifiers::Volatile.
bool Sema::LookupName | ( | LookupResult & | R, |
Scope * | S, | ||
bool | AllowBuiltinCreation = false |
||
) |
Perform unqualified name lookup starting from a given scope.
Unqualified name lookup (C++ [basic.lookup.unqual], C99 6.2.1) is used to find names within the current scope. For example, 'x' in
Different lookup criteria can find different names. For example, a particular scope can have both a struct and a function of the same name, and each can be found by certain lookup criteria. For more information about lookup criteria, see the documentation for the class LookupCriteria.
S | The scope from which unqualified name lookup will begin. If the lookup criteria permits, name lookup may also search in the parent scopes. | |
[in,out] | R | Specifies the lookup to perform (e.g., the name to look up and the lookup kind), and is updated with the results of lookup including zero or more declarations and possibly additional information used to diagnose ambiguities. |
true
if lookup succeeded and false otherwise. Definition at line 1835 of file SemaLookup.cpp.
Referenced by buildMemcpyForAssignmentOp(), CheckObjCBridgeCFCast(), CheckObjCBridgeNSCast(), emitReplacement(), isArithmeticArgumentPromotion(), and warnAboutRedundantParens().
LabelDecl * Sema::LookupOrCreateLabel | ( | IdentifierInfo * | II, |
SourceLocation | Loc, | ||
SourceLocation | GnuLabelLoc = SourceLocation() |
||
) |
LookupOrCreateLabel - Do a name lookup of a label with the specified name.
If GnuLabelLoc is a valid source location, then this is a definition of an label label name, otherwise it is a normal label definition or use.
Definition at line 3940 of file SemaLookup.cpp.
References clang::LabelDecl::Create(), and clang::SourceLocation::isValid().
void Sema::LookupOverloadedOperatorName | ( | OverloadedOperatorKind | Op, |
Scope * | S, | ||
QualType | T1, | ||
QualType | T2, | ||
UnresolvedSetImpl & | Functions | ||
) |
Definition at line 2960 of file SemaLookup.cpp.
Referenced by BuildOverloadedBinOp().
bool Sema::LookupParsedName | ( | LookupResult & | R, |
Scope * | S, | ||
CXXScopeSpec * | SS, | ||
bool | AllowBuiltinCreation = false , |
||
bool | EnteringContext = false |
||
) |
Performs name lookup for a name that was parsed in the source code, and may contain a C++ scope specifier.
This routine is a convenience routine meant to be called from contexts that receive a name and an optional C++ scope specifier (e.g., "N::M::x"). It will then perform either qualified or unqualified name lookup (with LookupQualifiedName or LookupName, respectively) on the given name and return those results. It will perform a special type of lookup for "__super::" scope specifier.
S | The scope from which unqualified name lookup will begin. |
SS | An optional C++ scope-specifier, e.g., "::N::M". |
EnteringContext | Indicates whether we are going to enter the context of the scope-specifier SS (if present). |
Definition at line 2380 of file SemaLookup.cpp.
References clang::NestedNameSpecifier::getAsRecordDecl(), clang::NestedNameSpecifier::getKind(), clang::CXXScopeSpec::getRange(), clang::CXXScopeSpec::getScopeRep(), clang::DeclContext::isDependentContext(), clang::CXXScopeSpec::isInvalid(), clang::CXXScopeSpec::isSet(), clang::LookupResult::setContextRange(), clang::LookupResult::setNotFoundInCurrentInstantiation(), and clang::NestedNameSpecifier::Super.
Referenced by buildDeclareReductionRef(), buildUserDefinedMapperRef(), CheckMicrosoftIfExistsSymbol(), and LookupPotentialTypoResult().
ObjCProtocolDecl * Sema::LookupProtocol | ( | IdentifierInfo * | II, |
SourceLocation | IdLoc, | ||
RedeclarationKind | Redecl = NotForRedeclaration |
||
) |
Find the protocol with the given name, if any.
Definition at line 2952 of file SemaLookup.cpp.
Referenced by ActOnForwardProtocolDeclaration(), ActOnStartProtocolInterface(), CheckForwardProtocolDeclarationForCircularDependency(), and FindProtocolDeclaration().
bool Sema::LookupQualifiedName | ( | LookupResult & | R, |
DeclContext * | LookupCtx, | ||
bool | InUnqualifiedLookup = false |
||
) |
Perform qualified name lookup into a given context.
Qualified name lookup (C++ [basic.lookup.qual]) is used to find names when the context of those names is explicit specified, e.g., "std::vector" or "x->member", or as part of unqualified name lookup.
Different lookup criteria can find different names. For example, a particular scope can have both a struct and a function of the same name, and each can be found by certain lookup criteria. For more information about lookup criteria, see the documentation for the class LookupCriteria.
R | captures both the lookup criteria and any lookup results found. |
LookupCtx | The context in which qualified name lookup will search. If the lookup criteria permits, name lookup may also search in the parent contexts or (for C++ classes) base classes. |
InUnqualifiedLookup | true if this is qualified name lookup that occurs as part of unqualified name lookup. |
Definition at line 2114 of file SemaLookup.cpp.
References clang::LookupResult::getLookupName(), and clang::DeclContext::isDependentContext().
Referenced by buildDeclareReductionRef(), BuildNonArrayForRange(), checkTupleLikeDecomposition(), DiagnoseTwoPhaseLookup(), diagReturnOnAllocFailure(), doesUsualArrayDeleteWantSize(), emitReplacement(), FindAllocationFunctions(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), LookupMemberExprInRecord(), LookupPotentialTypoResult(), LookupStdInitializerList(), lookupStdTypeTraitMember(), clang::TreeTransform< Derived >::RebuildDependentNameType(), resolveAllocationOverload(), resolveBuiltinNewDeleteOverload(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
bool Sema::LookupQualifiedName | ( | LookupResult & | R, |
DeclContext * | LookupCtx, | ||
CXXScopeSpec & | SS | ||
) |
Performs qualified name lookup or special type of lookup for "__super::" scope specifier.
This routine is a convenience overload meant to be called from contexts that need to perform a qualified name lookup with an optional C++ scope specifier that might require special kind of lookup.
R | captures both the lookup criteria and any lookup results found. |
LookupCtx | The context in which qualified name lookup will search. |
SS | An optional C++ scope-specifier. |
Definition at line 2351 of file SemaLookup.cpp.
References clang::CXXScopeSpec::getScopeRep(), and clang::NestedNameSpecifier::Super.
NamedDecl * Sema::LookupSingleName | ( | Scope * | S, |
DeclarationName | Name, | ||
SourceLocation | Loc, | ||
LookupNameKind | NameKind, | ||
RedeclarationKind | Redecl = NotForRedeclaration |
||
) |
Look up a name, looking for a single declaration.
Return null if the results were absent, ambiguous, or overloaded.
It is preferable to use the elaborated form and explicitly handle ambiguity and overloaded.
Definition at line 2942 of file SemaLookup.cpp.
Referenced by ActOnCompatibilityAlias(), ActOnEndOfTranslationUnit(), ActOnForwardClassDeclaration(), ActOnStartClassImplementation(), ActOnTypedefedProtocols(), and isMethodDeclaredInRootProtocol().
Sema::SpecialMemberOverloadResult Sema::LookupSpecialMember | ( | CXXRecordDecl * | D, |
CXXSpecialMember | SM, | ||
bool | ConstArg, | ||
bool | VolatileArg, | ||
bool | RValueThis, | ||
bool | ConstThis, | ||
bool | VolatileThis | ||
) |
Definition at line 2977 of file SemaLookup.cpp.
References CanDeclareSpecialMemberFunction(), clang::CXXRecordDecl::getDefinition(), clang::CXXRecordDecl::getDestructor(), clang::Decl::getLocation(), clang::FunctionDecl::isDeleted(), clang::CXXRecordDecl::needsImplicitDestructor(), clang::Sema::SpecialMemberOverloadResult::setKind(), and clang::Sema::SpecialMemberOverloadResult::setMethod().
Referenced by checkMoveAssignmentForRepeatedMove(), inferCUDATargetForImplicitSpecialMember(), and lookupCallFromSpecialMember().
NamespaceDecl * Sema::lookupStdExperimentalNamespace | ( | ) |
Definition at line 9075 of file SemaDeclCXX.cpp.
References clang::Result, and Std.
bool Sema::LookupTemplateName | ( | LookupResult & | R, |
Scope * | S, | ||
CXXScopeSpec & | SS, | ||
QualType | ObjectType, | ||
bool | EnteringContext, | ||
bool & | MemberOfUnknownSpecialization, | ||
SourceLocation | TemplateKWLoc = SourceLocation() , |
||
AssumedTemplateKind * | ATK = nullptr |
||
) |
Definition at line 344 of file SemaTemplate.cpp.
Referenced by LookupMemberExprInRecord().
void Sema::LookupVisibleDecls | ( | Scope * | S, |
LookupNameKind | Kind, | ||
VisibleDeclConsumer & | Consumer, | ||
bool | IncludeGlobalScope = true , |
||
bool | LoadExternal = true |
||
) |
Definition at line 3895 of file SemaLookup.cpp.
Referenced by AddRecordMembersCompletionResults().
void Sema::LookupVisibleDecls | ( | DeclContext * | Ctx, |
LookupNameKind | Kind, | ||
VisibleDeclConsumer & | Consumer, | ||
bool | IncludeGlobalScope = true , |
||
bool | IncludeDependentBases = false , |
||
bool | LoadExternal = true |
||
) |
Definition at line 3921 of file SemaLookup.cpp.
References clang::VisibleDeclConsumer::includeHiddenDecls(), and clang::LookupResult::setAllowHidden().
|
inline |
Definition at line 3867 of file Sema.h.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::Expr::getExprLoc().
|
inline |
Definition at line 3860 of file Sema.h.
References clang::Expr::getExprLoc().
Referenced by ActOnConditionVariable().
|
inline |
void Sema::makeMergedDefinitionVisible | ( | NamedDecl * | ND | ) |
Make a merged definition of an existing hidden definition ND
visible at the specified location.
Definition at line 1429 of file SemaLookup.cpp.
bool Sema::makeUnavailableInSystemHeader | ( | SourceLocation | loc, |
UnavailableAttr::ImplicitReason | reason | ||
) |
makeUnavailableInSystemHeader - There is an error in the current context.
If we're still in a system header, and we can plausibly make the relevant declaration unavailable instead of erroring, do so and return true.
Definition at line 387 of file Sema.cpp.
References clang::Decl::addAttr(), Context, CurContext, clang::ASTContext::getSourceManager(), clang::Decl::hasAttr(), inTemplateInstantiation(), and clang::SourceManager::isInSystemHeader().
Referenced by diagnoseObjCARCConversion().
void Sema::MarkAnyDeclReferenced | ( | SourceLocation | Loc, |
Decl * | D, | ||
bool | MightBeOdrUse | ||
) |
Perform marking for a reference to an arbitrary declaration.
It marks the declaration referenced, and performs odr-use checking for functions and variables. This method should not be used when building a normal expression which refers to a variable.
Definition at line 16534 of file SemaExpr.cpp.
References clang::Decl::setReferenced().
Referenced by CheckTemplateArgumentAddressOfObjectOrFunction(), and MarkExprReferenced().
void Sema::MarkAsLateParsedTemplate | ( | FunctionDecl * | FD, |
Decl * | FnD, | ||
CachedTokens & | Toks | ||
) |
Definition at line 10295 of file SemaTemplate.cpp.
References clang::FunctionDecl::setLateTemplateParsed().
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::MarkBaseAndMemberDestructorsReferenced | ( | SourceLocation | Loc, |
CXXRecordDecl * | Record | ||
) |
MarkBaseAndMemberDestructorsReferenced - Given a record decl, mark all the non-trivial destructors of its members and bases as referenced.
Definition at line 5176 of file SemaDeclCXX.cpp.
References clang::RecordDecl::fields(), clang::DeclContext::isDependentContext(), isIncompleteOrZeroLengthArrayType(), and clang::TagDecl::isUnion().
void Sema::MarkCaptureUsedInEnclosingContext | ( | VarDecl * | Capture, |
SourceLocation | Loc, | ||
unsigned | CapturingScopeIndex | ||
) |
Definition at line 15248 of file SemaExpr.cpp.
References MarkVarDeclODRUsed().
Mark any declarations that appear within this expression or any potentially-evaluated subexpressions as "referenced".
SkipLocalVariables | If true, don't mark local variables as 'referenced'. |
Definition at line 16664 of file SemaExpr.cpp.
void Sema::MarkDeclarationsReferencedInType | ( | SourceLocation | Loc, |
QualType | T | ||
) |
Mark all of the declarations referenced within a particular AST node as referenced.
Used when template instantiation instantiates a non-dependent type – entities referenced by the type are now referenced.
Definition at line 16587 of file SemaExpr.cpp.
Referenced by clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), and clang::TemplateDeclInstantiator::VisitVarDecl().
void Sema::MarkDeclRefReferenced | ( | DeclRefExpr * | E, |
const Expr * | Base = nullptr |
||
) |
Perform reference-marking and odr-use handling for a DeclRefExpr.
Definition at line 16493 of file SemaExpr.cpp.
References clang::DeclRefExpr::getDecl(), clang::DeclRefExpr::getLocation(), and MarkExprReferenced().
Referenced by BuildImplicitBaseInitializer(), and BuildImplicitMemberInitializer().
|
inline |
Definition at line 7444 of file Sema.h.
Referenced by clang::CodeCompletionResult::createCodeCompletionStringForDecl().
|
static |
Marks all of the template parameters that will be deduced by a call to the given function template.
Definition at line 5669 of file SemaTemplateDeduction.cpp.
References clang::TemplateParameterList::getDepth(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::TemplateDecl::getTemplateParameters(), clang::ValueDecl::getType(), MarkUsedTemplateParameters(), and clang::TemplateParameterList::size().
void Sema::MarkFunctionParmPackReferenced | ( | FunctionParmPackExpr * | E | ) |
Perform reference-marking and odr-use handling for a FunctionParmPackExpr.
Definition at line 16525 of file SemaExpr.cpp.
References MarkExprReferenced().
void Sema::MarkFunctionReferenced | ( | SourceLocation | Loc, |
FunctionDecl * | Func, | ||
bool | MightBeOdrUse = true |
||
) |
Mark a function referenced, and check whether it is odr-used (C++ [basic.def.odr]p2, C99 6.9p3)
Definition at line 15013 of file SemaExpr.cpp.
References CheckCompleteParameterTypesForMangler(), funcHasParameterSizeMangling(), clang::Type::getAs(), clang::FunctionDecl::getBody(), clang::FunctionDecl::getCanonicalDecl(), clang::Decl::getDeclContext(), clang::FunctionProtoType::getExceptionSpecType(), clang::FunctionDecl::getMemberSpecializationInfo(), clang::Redeclarable< decl_type >::getMostRecentDecl(), clang::FunctionDecl::getPointOfInstantiation(), clang::FunctionDecl::getTemplateSpecializationKind(), clang::FunctionDecl::getTemplateSpecializationKindForInstantiation(), clang::ValueDecl::getType(), clang::Decl::hasAttr(), i, clang::FunctionDecl::isConstexpr(), clang::FunctionDecl::isDefined(), isImplicitlyDefinableConstexprFunction(), clang::FunctionDecl::isImplicitlyInstantiable(), clang::FunctionDecl::isInlined(), clang::SourceLocation::isInvalid(), clang::CXXConversionDecl::isLambdaToBlockPointerConversion(), isOdrUseContext(), isPotentiallyConstantEvaluatedContext(), clang::isUnresolvedExceptionSpec(), clang::Decl::isUsed(), clang::Decl::markUsed(), clang::None, clang::Redeclarable< decl_type >::redecls(), clang::FunctionDecl::setInstantiationIsPending(), clang::Decl::setReferenced(), clang::FunctionDecl::setTemplateSpecializationKind(), clang::TSK_ImplicitInstantiation, clang::TSK_Undeclared, and Used.
Referenced by ActOnCXXDelete(), checkDestructorReference(), FindConditionalOverload(), MaybeBindToTemporary(), clang::InitializationSequence::Perform(), PerformConstructorInitialization(), ReferenceDllExportedMembers(), resolveBuiltinNewDeleteOverload(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
void Sema::markKnownEmitted | ( | Sema & | S, |
FunctionDecl * | OrigCaller, | ||
FunctionDecl * | OrigCallee, | ||
SourceLocation | OrigLoc, | ||
const llvm::function_ref< bool(Sema &, FunctionDecl *)> | IsKnownEmitted | ||
) |
Indicate that this function (and thus everything it transtively calls) will be codegen'ed, and emit any deferred diagnostics on this function and its (transitive) callees.
Definition at line 1476 of file Sema.cpp.
References clang::C, DeviceCallGraph, DeviceKnownEmittedFns, emitDeferredDiags(), clang::Decl::getAsFunction(), and IsKnownEmitted().
Referenced by CheckCUDACall().
void Sema::MarkMemberReferenced | ( | MemberExpr * | E | ) |
Perform reference-marking and odr-use handling for a MemberExpr.
Definition at line 16506 of file SemaExpr.cpp.
References clang::MemberExpr::getBeginLoc(), clang::MemberExpr::getMemberDecl(), clang::MemberExpr::getMemberLoc(), clang::SourceLocation::isValid(), MarkExprReferenced(), and clang::MemberExpr::performsVirtualDispatch().
void Sema::MarkThisReferenced | ( | CXXThisExpr * | This | ) |
Definition at line 1267 of file SemaExprCXX.cpp.
References CheckCXXThisCapture(), and clang::Expr::getExprLoc().
Referenced by BuildCXXThisExpr().
void Sema::MarkTypoCorrectedFunctionDefinition | ( | const NamedDecl * | F | ) |
Definition at line 7803 of file SemaDecl.cpp.
void Sema::MarkUnusedFileScopedDecl | ( | const DeclaratorDecl * | D | ) |
If it's a file scoped decl that must warn if not used, keep track of it.
Definition at line 1646 of file SemaDecl.cpp.
References clang::First.
void Sema::MarkUsedTemplateParameters | ( | const TemplateArgumentList & | TemplateArgs, |
bool | OnlyDeduced, | ||
unsigned | Depth, | ||
llvm::SmallBitVector & | Used | ||
) |
Mark which template parameters can be deduced from a given template argument list.
TemplateArgs | the template argument list from which template parameters will be deduced. |
Used | a bit vector whose elements will be set to true to indicate when the corresponding template parameter will be deduced. |
Definition at line 5651 of file SemaTemplateDeduction.cpp.
References clang::TemplateArgumentList::asArray(), hasPackExpansionBeforeEnd(), MarkUsedTemplateParameters(), and clang::TemplateArgumentList::size().
Referenced by checkTemplatePartialSpecialization().
void Sema::MarkVariableReferenced | ( | SourceLocation | Loc, |
VarDecl * | Var | ||
) |
Mark a variable referenced, and check whether it is odr-used (C++ [basic.def.odr]p2, C99 6.9p3).
Note that this should not be used directly for normal expressions referring to VarDecl.
Definition at line 16454 of file SemaExpr.cpp.
References DoMarkVarDeclReferenced().
Referenced by ReferenceDllExportedMembers().
void Sema::MarkVirtualMemberExceptionSpecsNeeded | ( | SourceLocation | Loc, |
const CXXRecordDecl * | RD | ||
) |
Mark the exception specifications of all virtual member functions in the given class as needed.
Definition at line 15264 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::methods().
void Sema::MarkVirtualMembersReferenced | ( | SourceLocation | Loc, |
const CXXRecordDecl * | RD, | ||
bool | ConstexprOnly = false |
||
) |
MarkVirtualMembersReferenced - Will mark all members of the given CXXRecordDecl referenced.
Definition at line 15271 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::bases(), clang::CXXRecordDecl::getFinalOverriders(), and clang::CXXRecordDecl::getNumVBases().
void Sema::MarkVTableUsed | ( | SourceLocation | Loc, |
CXXRecordDecl * | Class, | ||
bool | DefinitionRequired = false |
||
) |
Note that the vtable for the given class was used at the given location.
Definition at line 15108 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::getCanonicalDecl(), clang::DeclContext::isDependentContext(), and clang::CXXRecordDecl::isDynamicClass().
Referenced by InstantiateClassMembers(), and ReferenceDllExportedMembers().
void Sema::MatchAllMethodDeclarations | ( | const SelectorSet & | InsMap, |
const SelectorSet & | ClsMap, | ||
SelectorSet & | InsMapSeen, | ||
SelectorSet & | ClsMapSeen, | ||
ObjCImplDecl * | IMPDecl, | ||
ObjCContainerDecl * | IDecl, | ||
bool & | IncompleteImpl, | ||
bool | ImmediateClass, | ||
bool | WarnCategoryMethodImpl = false |
||
) |
MatchAllMethodDeclarations - Check methods declaraed in interface or or protocol against those declared in their implementations.
MatchAllMethodDeclarations - Check methods declared in interface or protocol against those declared in their implementations.
Definition at line 2806 of file SemaDeclObjC.cpp.
References clang::ObjCContainerDecl::class_methods(), clang::ObjCContainerDecl::getClassMethod(), clang::ObjCContainerDecl::getInstanceMethod(), clang::Decl::getLocation(), clang::ObjCContainerDecl::instance_methods(), WarnConflictingTypedMethods(), WarnExactTypedMethods(), and WarnUndefinedMethod().
Referenced by CheckCategoryVsClassMethodMatches().
TemplateParameterList * Sema::MatchTemplateParametersToScopeSpecifier | ( | SourceLocation | DeclStartLoc, |
SourceLocation | DeclLoc, | ||
const CXXScopeSpec & | SS, | ||
TemplateIdAnnotation * | TemplateId, | ||
ArrayRef< TemplateParameterList *> | ParamLists, | ||
bool | IsFriend, | ||
bool & | IsMemberSpecialization, | ||
bool & | Invalid | ||
) |
Match the given template parameter lists to the given scope specifier, returning the template parameter list that applies to the name.
DeclStartLoc | the start of the declaration that has a scope specifier or a template parameter list. |
DeclLoc | The location of the declaration itself. |
SS | the scope specifier that will be matched to the given template parameter lists. This scope specifier precedes a qualified name that is being declared. |
TemplateId | The template-id following the scope specifier, if there is one. Used to check for a missing 'template<>'. |
ParamLists | the template parameter lists, from the outermost to the innermost template parameter lists. |
IsFriend | Whether to apply the slightly different rules for matching template parameters to scope specifiers in friend declarations. |
IsMemberSpecialization | will be set true if the scope specifier denotes a fully-specialized type, and therefore this is a declaration of a member specialization. |
SS
. This template parameter list may have template parameters (if we're declaring a template) or may have no template parameters (if we're declaring a template specialization), or may be NULL (if what we're declaring isn't itself a template). Definition at line 2642 of file SemaTemplate.cpp.
References clang::CXXScopeSpec::getScopeRep().
bool Sema::MatchTwoMethodDeclarations | ( | const ObjCMethodDecl * | left, |
const ObjCMethodDecl * | right, | ||
MethodMatchStrategy | strategy = MMS_strict |
||
) |
MatchTwoMethodDeclarations - Checks if two methods' type match and returns true, or false, accordingly.
MatchTwoMethodDeclarations - Checks that two methods have matching type and returns true, or false, accordingly.
TODO: Handle protocol list; such as id<p1,p2> in type comparisons
Definition at line 3227 of file SemaDeclObjC.cpp.
References getLangOpts(), clang::ObjCMethodDecl::getReturnType(), clang::Decl::hasAttr(), clang::Decl::isHidden(), matchTypes(), clang::ObjCMethodDecl::param_begin(), and clang::ObjCMethodDecl::param_end().
Referenced by DiagnoseClassExtensionDupMethods(), and DiagnoseMultipleMethodInGlobalPool().
void Sema::maybeAddCUDAHostDeviceAttrs | ( | FunctionDecl * | FD, |
const LookupResult & | Previous | ||
) |
May add implicit CUDAHostAttr and CUDADeviceAttr attributes to FD, depending on FD and the current compilation settings.
Definition at line 540 of file SemaCUDA.cpp.
References clang::Decl::addAttr(), Context, Diag(), clang::LookupResult::end(), clang::Decl::getAsFunction(), getLangOpts(), clang::Decl::getLocation(), getSourceManager(), clang::Decl::hasAttr(), clang::FunctionDecl::isConstexpr(), clang::SourceManager::isInSystemHeader(), IsOverload(), and clang::FunctionDecl::isVariadic().
ExprResult Sema::MaybeBindToTemporary | ( | Expr * | E | ) |
MaybeBindToTemporary - If the passed in expression has a record type with a non-trivial destructor, this will return CXXBindTemporaryExpr.
Otherwise it simply returns the passed in expression.
Definition at line 6339 of file SemaExprCXX.cpp.
References clang::ASTContext::BoundMemberTy, CheckDestructorAccess(), Cleanup, Context, clang::CXXTemporary::Create(), clang::ImplicitCastExpr::Create(), DiagnoseUseOfDecl(), clang::Sema::ExpressionEvaluationContextRecord::EK_Decltype, clang::ExprError(), ExprEvalContexts, clang::Type::getAs(), clang::ASTContext::getCanonicalType(), clang::RecordType::getDecl(), clang::Expr::getExprLoc(), clang::FunctionType::getExtInfo(), clang::ASTContext::getLangOpts(), getLangOpts(), clang::ObjCMethodDecl::getMethodFamily(), clang::Type::getPointeeType(), clang::FunctionType::ExtInfo::getProducesResult(), clang::Expr::getType(), clang::Type::getTypeClass(), clang::QualType::getTypePtr(), clang::Decl::hasAttr(), clang::ObjCRuntime::hasEmptyCollections(), clang::DeclContext::isDependentContext(), clang::Decl::isInvalidDecl(), clang::Type::isObjCARCImplicitlyUnretainedType(), clang::Type::isObjCRetainableType(), clang::Expr::isRValue(), clang::FunctionDecl::isTrivial(), LookupDestructor(), MarkFunctionReferenced(), clang::LangOptions::ObjCRuntime, clang::OMF_performSelector, PDiag(), clang::CleanupInfo::setExprNeedsCleanups(), and clang::VK_RValue.
Referenced by CopyObject(), and clang::InitializationSequence::Perform().
ExprResult Sema::MaybeConvertParenListExprToParenExpr | ( | Scope * | S, |
Expr * | OrigExpr | ||
) |
This is not an AltiVec-style cast or or C++ direct-initialization, so turn the ParenListExpr into a sequence of comma binary operators.
Definition at line 6675 of file SemaExpr.cpp.
References clang::ExprError(), clang::ParenListExpr::getExpr(), clang::Expr::getExprLoc(), clang::ParenListExpr::getLParenLoc(), clang::ParenListExpr::getNumExprs(), clang::ParenListExpr::getRParenLoc(), and i.
Referenced by ActOnStartCXXMemberReference().
MaybeCreateExprWithCleanups - If the current full-expression requires any cleanups, surround it with a ExprWithCleanups node.
Otherwise, just returns the passed-in expression.
Definition at line 6508 of file SemaExprCXX.cpp.
References Cleanup, clang::CleanupInfo::cleanupsHaveSideEffects(), CleanupVarDeclMarking(), Context, clang::ExprWithCleanups::Create(), DiscardCleanupsInEvaluationContext(), ExprCleanupObjects, ExprEvalContexts, and clang::CleanupInfo::exprNeedsCleanups().
Referenced by ActOnFinishFullExpr(), BuildImplicitBaseInitializer(), BuildImplicitMemberInitializer(), checkEscapingByref(), MaybeCreateExprWithCleanups(), and MaybeCreateStmtWithCleanups().
ExprResult Sema::MaybeCreateExprWithCleanups | ( | ExprResult | SubExpr | ) |
Definition at line 6501 of file SemaExprCXX.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and MaybeCreateExprWithCleanups().
Definition at line 6530 of file SemaExprCXX.cpp.
References Cleanup, CleanupVarDeclMarking(), Context, clang::CompoundStmt::Create(), clang::CleanupInfo::exprNeedsCleanups(), MaybeCreateExprWithCleanups(), and clang::ASTContext::VoidTy.
Referenced by ActOnFinishFullStmt().
void Sema::maybeExtendBlockObject | ( | ExprResult & | E | ) |
Do an explicit extend of the given block pointer if we're in ARC.
Definition at line 6130 of file SemaExpr.cpp.
References clang::ImplicitCastExpr::Create(), and clang::ActionResult< PtrTy, CompressInvalid >::get().
void Sema::MaybeSuggestAddingStaticToDecl | ( | const FunctionDecl * | D | ) |
Definition at line 188 of file SemaExpr.cpp.
References clang::FixItHint::CreateInsertion(), Diag(), clang::First, clang::SourceRange::getBegin(), clang::Redeclarable< decl_type >::getFirstDecl(), clang::FunctionDecl::getSourceRange(), and hasAnyExplicitStorageClass().
AlwaysInlineAttr* clang::Sema::mergeAlwaysInlineAttr | ( | Decl * | D, |
SourceRange | Range, | ||
IdentifierInfo * | Ident, | ||
unsigned | AttrSpellingListIndex | ||
) |
AvailabilityAttr* clang::Sema::mergeAvailabilityAttr | ( | NamedDecl * | D, |
SourceRange | Range, | ||
IdentifierInfo * | Platform, | ||
bool | Implicit, | ||
VersionTuple | Introduced, | ||
VersionTuple | Deprecated, | ||
VersionTuple | Obsoleted, | ||
bool | IsUnavailable, | ||
StringRef | Message, | ||
bool | IsStrict, | ||
StringRef | Replacement, | ||
AvailabilityMergeKind | AMK, | ||
int | Priority, | ||
unsigned | AttrSpellingListIndex | ||
) |
Attribute merging methods. Return true if a new attribute was added.
CodeSegAttr* clang::Sema::mergeCodeSegAttr | ( | Decl * | D, |
SourceRange | Range, | ||
StringRef | Name, | ||
unsigned | AttrSpellingListIndex | ||
) |
CommonAttr* clang::Sema::mergeCommonAttr | ( | Decl * | D, |
const ParsedAttr & | AL | ||
) |
CommonAttr* clang::Sema::mergeCommonAttr | ( | Decl * | D, |
const CommonAttr & | AL | ||
) |
bool Sema::MergeCompatibleFunctionDecls | ( | FunctionDecl * | New, |
FunctionDecl * | Old, | ||
Scope * | S, | ||
bool | MergeTypeWithOld | ||
) |
Completes the merge of two function declarations that are known to be compatible.
This routine handles the merging of attributes and other properties of function declarations from the old declaration to the new declaration, once we know that New is in fact a redeclaration of Old.
Definition at line 3636 of file SemaDecl.cpp.
bool Sema::MergeCXXFunctionDecl | ( | FunctionDecl * | New, |
FunctionDecl * | Old, | ||
Scope * | S | ||
) |
MergeCXXFunctionDecl - Merge two declarations of the same C++ function, once we already know that they have the same type.
Subroutine of MergeFunctionDecl. Returns true if there was an error, false otherwise.
Definition at line 435 of file SemaDeclCXX.cpp.
void Sema::mergeDeclAttributes | ( | NamedDecl * | New, |
Decl * | Old, | ||
AvailabilityMergeKind | AMK = AMK_Redeclaration |
||
) |
mergeDeclAttributes - Copy attributes from the Old decl to the New one.
Definition at line 2666 of file SemaDecl.cpp.
References clang::Decl::getAttr(), and clang::Decl::getMostRecentDecl().
Referenced by ActOnForwardProtocolDeclaration(), and ActOnStartProtocolInterface().
DLLExportAttr* clang::Sema::mergeDLLExportAttr | ( | Decl * | D, |
SourceRange | Range, | ||
unsigned | AttrSpellingListIndex | ||
) |
DLLImportAttr* clang::Sema::mergeDLLImportAttr | ( | Decl * | D, |
SourceRange | Range, | ||
unsigned | AttrSpellingListIndex | ||
) |
FormatAttr* clang::Sema::mergeFormatAttr | ( | Decl * | D, |
SourceRange | Range, | ||
IdentifierInfo * | Format, | ||
int | FormatIdx, | ||
int | FirstArg, | ||
unsigned | AttrSpellingListIndex | ||
) |
bool Sema::MergeFunctionDecl | ( | FunctionDecl * | New, |
NamedDecl *& | OldD, | ||
Scope * | S, | ||
bool | MergeTypeWithOld | ||
) |
MergeFunctionDecl - We just parsed a function 'New' from declarator D which has the same name and scope as a previous declaration 'Old'.
Figure out how to resolve this situation, merging decls or emitting diagnostics as appropriate.
In C++, New and Old must be declarations that are not overloaded. Use IsOverload to determine whether New and Old are overloaded, and to select the Old declaration that New should be merged with.
Returns true if there was an error, false otherwise.
Definition at line 3040 of file SemaDecl.cpp.
InternalLinkageAttr* clang::Sema::mergeInternalLinkageAttr | ( | Decl * | D, |
const ParsedAttr & | AL | ||
) |
InternalLinkageAttr* clang::Sema::mergeInternalLinkageAttr | ( | Decl * | D, |
const InternalLinkageAttr & | AL | ||
) |
MinSizeAttr* clang::Sema::mergeMinSizeAttr | ( | Decl * | D, |
SourceRange | Range, | ||
unsigned | AttrSpellingListIndex | ||
) |
MSInheritanceAttr* clang::Sema::mergeMSInheritanceAttr | ( | Decl * | D, |
SourceRange | Range, | ||
bool | BestCase, | ||
unsigned | AttrSpellingListIndex, | ||
MSInheritanceAttr::Spelling | SemanticSpelling | ||
) |
NoSpeculativeLoadHardeningAttr* clang::Sema::mergeNoSpeculativeLoadHardeningAttr | ( | Decl * | D, |
const NoSpeculativeLoadHardeningAttr & | AL | ||
) |
void Sema::mergeObjCMethodDecls | ( | ObjCMethodDecl * | New, |
ObjCMethodDecl * | Old | ||
) |
Definition at line 3672 of file SemaDecl.cpp.
References clang::Decl::getDeclContext(), mergeParamDeclAttributes(), clang::ObjCMethodDecl::param_begin(), and clang::ObjCMethodDecl::param_end().
OptimizeNoneAttr* clang::Sema::mergeOptimizeNoneAttr | ( | Decl * | D, |
SourceRange | Range, | ||
unsigned | AttrSpellingListIndex | ||
) |
SectionAttr* clang::Sema::mergeSectionAttr | ( | Decl * | D, |
SourceRange | Range, | ||
StringRef | Name, | ||
unsigned | AttrSpellingListIndex | ||
) |
SpeculativeLoadHardeningAttr* clang::Sema::mergeSpeculativeLoadHardeningAttr | ( | Decl * | D, |
const SpeculativeLoadHardeningAttr & | AL | ||
) |
void Sema::MergeTypedefNameDecl | ( | Scope * | S, |
TypedefNameDecl * | New, | ||
LookupResult & | OldDecls | ||
) |
MergeTypedefNameDecl - We just parsed a typedef 'New' which has the same name and scope as a previous declaration 'Old'.
Figure out how to resolve this situation, merging decls or emitting diagnostics as appropriate. If there was an error, set New to be invalid.
Definition at line 2155 of file SemaDecl.cpp.
TypeVisibilityAttr* clang::Sema::mergeTypeVisibilityAttr | ( | Decl * | D, |
SourceRange | Range, | ||
TypeVisibilityAttr::VisibilityType | Vis, | ||
unsigned | AttrSpellingListIndex | ||
) |
UuidAttr* clang::Sema::mergeUuidAttr | ( | Decl * | D, |
SourceRange | Range, | ||
unsigned | AttrSpellingListIndex, | ||
StringRef | Uuid | ||
) |
void Sema::MergeVarDecl | ( | VarDecl * | New, |
LookupResult & | Previous | ||
) |
MergeVarDecl - We just parsed a variable 'New' which has the same name and scope as a previous declaration 'Old'.
Figure out how to resolve this situation, merging decls or emitting diagnostics as appropriate.
Tentative definition rules (C99 6.9.2p2) are checked by FinalizeDeclaratorGroup. Unfortunately, we can't analyze tentative definitions here, since the initializer hasn't been attached.
Definition at line 3841 of file SemaDecl.cpp.
References adjustDeclContextForDeclaratorDecl(), clang::frontend::CPlusPlus, clang::VarDecl::Definition, Diag(), clang::Decl::dropAttr(), clang::Decl::getAccess(), clang::VarDecl::getCanonicalDecl(), clang::NamedDecl::getDeclName(), clang::VarDecl::getDefinition(), clang::VarDecl::getDescribedVarTemplate(), clang::LookupResult::getFoundDecl(), clang::NamedDecl::getIdentifier(), clang::Decl::getLexicalDeclContext(), clang::Decl::getLocation(), clang::Redeclarable< decl_type >::getMostRecentDecl(), getNoteDiagForInvalidRedeclaration(), clang::LookupResult::getRepresentativeDecl(), clang::VarDecl::getStorageClass(), clang::VarTemplateDecl::getTemplatedDecl(), clang::TemplateDecl::getTemplateParameters(), clang::VarDecl::getTLSKind(), clang::Decl::hasAttr(), clang::NamedDecl::hasExternalFormalLinkage(), clang::VarDecl::hasExternalStorage(), clang::NamedDecl::hasLinkage(), haveIncompatibleLanguageLinkages(), clang::VarDecl::isConstexpr(), clang::VarDecl::isFileVarDecl(), clang::VarDecl::isInline(), clang::Decl::isInvalidDecl(), clang::VarDecl::isLocalVarDeclOrParm(), clang::VarDecl::isOutOfLine(), clang::DeclContext::isRecord(), clang::LookupResult::isSingleResult(), clang::VarDecl::isStaticDataMember(), clang::VarDecl::isThisDeclarationADefinition(), clang::Decl::isUsed(), mergeTypeWithPrevious(), clang::SC_None, clang::SC_Static, clang::Decl::setAccess(), clang::VarDecl::setImplicitlyInline(), clang::Decl::setInvalidDecl(), clang::Decl::setIsUsed(), clang::Redeclarable< decl_type >::setPreviousDecl(), and clang::VarDecl::TLS_Dynamic.
Merge the exception specifications of two variable declarations.
This is called when there's a redeclaration of a VarDecl. The function checks if the redeclaration might have an exception specification and validates compatibility and merges the specs if necessary.
Definition at line 1481 of file SemaDeclCXX.cpp.
MergeVarDeclTypes - We parsed a variable 'New' which has the same name and scope as a previous declaration 'Old'.
Figure out how to merge their types, emitting diagnostics as appropriate.
Declarations using the auto type specifier (C++ [decl.spec.auto]) call back to here in AddInitializerToDecl. We can't check them before the initializer is attached.
Definition at line 3717 of file SemaDecl.cpp.
References clang::ValueDecl::getType(), clang::Decl::isInvalidDecl(), and clang::Type::isUndeducedType().
VisibilityAttr* clang::Sema::mergeVisibilityAttr | ( | Decl * | D, |
SourceRange | Range, | ||
VisibilityAttr::VisibilityType | Vis, | ||
unsigned | AttrSpellingListIndex | ||
) |
|
inline |
Determine whether it's plausible that E was intended to be a template-name.
Definition at line 1984 of file Sema.h.
References clang::frontend::CPlusPlus, clang::DirectInit, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Greater, clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Less, and Previous.
bool Sema::NeedToCaptureVariable | ( | VarDecl * | Var, |
SourceLocation | Loc | ||
) |
Checks if the variable must be captured.
Definition at line 15850 of file SemaExpr.cpp.
void Sema::NoteAllFoundTemplates | ( | TemplateName | Name | ) |
Definition at line 2997 of file SemaTemplate.cpp.
void Sema::NoteAllOverloadCandidates | ( | Expr * | E, |
QualType | DestType = QualType() , |
||
bool | TakingAddress = false |
||
) |
Definition at line 9666 of file SemaOverload.cpp.
References clang::Expr::getType().
Referenced by DiagnoseReinterpretUpDownCast(), and TryAddressSpaceCast().
void Sema::NoteDeletedFunction | ( | FunctionDecl * | FD | ) |
Emit a note explaining that this function is deleted.
Definition at line 99 of file SemaExpr.cpp.
References Diag(), clang::Decl::getLocation(), and clang::FunctionDecl::isDeleted().
Referenced by CheckCXX98CompatAccessibleCopy(), and CopyObject().
void Sema::NoteDeletedInheritingConstructor | ( | CXXConstructorDecl * | CD | ) |
Definition at line 11213 of file SemaDeclCXX.cpp.
References clang::CXXConstructorDecl::getInheritedConstructor(), clang::Decl::getLocation(), and clang::InheritedConstructor::getShadowDecl().
void Sema::NoteHiddenVirtualMethods | ( | CXXMethodDecl * | MD, |
SmallVectorImpl< CXXMethodDecl *> & | OverloadedMethods | ||
) |
Definition at line 7881 of file SemaDeclCXX.cpp.
References Diag(), clang::Decl::getLocation(), clang::ValueDecl::getType(), and i.
void Sema::NoteOverloadCandidate | ( | NamedDecl * | Found, |
FunctionDecl * | Fn, | ||
QualType | DestType = QualType() , |
||
bool | TakingAddress = false |
||
) |
Definition at line 9644 of file SemaOverload.cpp.
References checkAddressOfCandidateIsAvailable(), Diag(), clang::Decl::getAttr(), clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::Decl::hasAttr(), and clang::FunctionDecl::isMultiVersion().
void Sema::notePreviousDefinition | ( | const NamedDecl * | Old, |
SourceLocation | New | ||
) |
Definition at line 4075 of file SemaDecl.cpp.
References clang::Module::DefinitionLoc, Diag(), clang::SourceManager::getDecomposedLoc(), clang::SourceManager::getFileEntryForID(), clang::SourceManager::getFilename(), clang::Module::getFullModuleName(), clang::SourceManager::getIncludeLoc(), clang::Decl::getLocation(), clang::Decl::getOwningModule(), clang::SourceManager::getSpellingLoc(), clang::SourceLocation::isInvalid(), and clang::SourceLocation::isValid().
Decl * Sema::ParsedFreeStandingDeclSpec | ( | Scope * | S, |
AccessSpecifier | AS, | ||
DeclSpec & | DS, | ||
RecordDecl *& | AnonRecord | ||
) |
ParsedFreeStandingDeclSpec - This method is invoked when a declspec with no declarator (e.g.
"struct foo;") is parsed.
Definition at line 4159 of file SemaDecl.cpp.
Referenced by clang::Parser::ParseTopLevelDecl().
Decl * Sema::ParsedFreeStandingDeclSpec | ( | Scope * | S, |
AccessSpecifier | AS, | ||
DeclSpec & | DS, | ||
MultiTemplateParamsArg | TemplateParams, | ||
bool | IsExplicitInstantiation, | ||
RecordDecl *& | AnonRecord | ||
) |
ParsedFreeStandingDeclSpec - This method is invoked when a declspec with no declarator (e.g.
"struct foo;") is parsed. It also accepts template parameters to cope with template friend declarations.
Definition at line 4269 of file SemaDecl.cpp.
ExprResult Sema::ParseObjCEncodeExpression | ( | SourceLocation | AtLoc, |
SourceLocation | EncodeLoc, | ||
SourceLocation | LParenLoc, | ||
ParsedType | Ty, | ||
SourceLocation | RParenLoc | ||
) |
Definition at line 1106 of file SemaExprObjC.cpp.
ExprResult Sema::ParseObjCProtocolExpression | ( | IdentifierInfo * | ProtocolName, |
SourceLocation | AtLoc, | ||
SourceLocation | ProtoLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | ProtoIdLoc, | ||
SourceLocation | RParenLoc | ||
) |
ParseObjCProtocolExpression - Build protocol expression for @protocol.
Definition at line 1238 of file SemaExprObjC.cpp.
References Diag(), clang::ObjCProtocolDecl::getDefinition(), clang::Decl::getLocation(), and clang::ObjCProtocolDecl::hasDefinition().
ExprResult Sema::ParseObjCSelectorExpression | ( | Selector | Sel, |
SourceLocation | AtLoc, | ||
SourceLocation | SelLoc, | ||
SourceLocation | LParenLoc, | ||
SourceLocation | RParenLoc, | ||
bool | WarnMultipleSelectors | ||
) |
ParseObjCSelectorExpression - Build selector expression for @selector.
Definition at line 1177 of file SemaExprObjC.cpp.
References clang::FixItHint::CreateReplacement(), Diag(), DiagnoseMismatchedSelectors(), clang::Selector::getAsString(), clang::ObjCMethodDecl::getImplementationControl(), clang::Decl::getLocation(), clang::SourceLocation::getLocWithOffset(), clang::Selector::getMethodFamily(), clang::OMF_alloc, clang::OMF_autorelease, clang::OMF_copy, clang::OMF_dealloc, clang::OMF_finalize, clang::OMF_init, clang::OMF_initialize, clang::OMF_mutableCopy, clang::OMF_new, clang::OMF_None, clang::OMF_performSelector, clang::OMF_release, clang::OMF_retain, clang::OMF_retainCount, clang::OMF_self, and clang::ObjCMethodDecl::Optional.
ExprResult Sema::ParseObjCStringLiteral | ( | SourceLocation * | AtLocs, |
ArrayRef< Expr *> | Strings | ||
) |
Definition at line 34 of file SemaExprObjC.cpp.
TypedefDecl * Sema::ParseTypedefDecl | ( | Scope * | S, |
Declarator & | D, | ||
QualType | T, | ||
TypeSourceInfo * | TInfo | ||
) |
Subroutines of ActOnDeclarator().
Definition at line 14162 of file SemaDecl.cpp.
|
inline |
Build a partial diagnostic.
Definition at line 24 of file SemaInternal.h.
References Context, and clang::ASTContext::getDiagAllocator().
Referenced by ActOnCXXDelete(), ActOnStartClassImplementation(), AnalyzeComparison(), BuildNonArrayForRange(), CheckCXX98CompatAccessibleCopy(), checkDestructorReference(), CheckEquivalentExceptionSpec(), CheckExceptionSpecCompatibility(), CheckFormatString(), CheckForNullPointerDereference(), CheckNonNullArgument(), CheckOverridingFunctionExceptionSpec(), CheckParamExceptionSpec(), CopyObject(), DiagnoseAdditionInShift(), DiagnoseBadDivideOrRemainderValues(), DiagnoseBadShiftValues(), DiagnoseBitwiseOpInBitwiseOp(), DiagnoseBitwisePrecedence(), DiagnoseConditionalPrecedence(), DiagnoseFloatingImpCast(), DiagnoseImpCast(), DiagnoseShiftCompare(), diagnoseTautologicalComparison(), EmitDiagnosticForLogicalAndInLogicalOr(), FindProtocolDeclaration(), FinishOverloadedCallExpr(), isArithmeticArgumentPromotion(), LookupMemberExpr(), MaybeBindToTemporary(), clang::InitializationSequence::Perform(), PerformImplicitConversion(), resolveAllocationOverload(), resolveBuiltinNewDeleteOverload(), and TryNamespaceTypoCorrection().
ExprResult Sema::PerformContextualImplicitConversion | ( | SourceLocation | Loc, |
Expr * | From, | ||
ContextualImplicitConverter & | Converter | ||
) |
Perform a contextual implicit conversion.
Attempt to convert the given expression to a type which is accepted by the given converter.
This routine will attempt to convert an expression of class type to a type accepted by the specified converter. In C++11 and before, the class must have a single non-explicit conversion function converting to a matching type. In C++1y, there can be multiple such conversion functions, but only one target type.
Loc | The source location of the construct that requires the conversion. |
From | The expression we're converting from. |
Converter | Used to control and diagnose the conversion process. |
Definition at line 5767 of file SemaOverload.cpp.
References clang::UnresolvedSetImpl::addDecl(), clang::OverloadCandidateSet::BestViableFunction(), collectViableConversionCandidates(), clang::frontend::CPlusPlus14, clang::OverloadCandidateSet::CSK_Normal, diagnoseAmbiguousConversion(), clang::Sema::ContextualImplicitConverter::diagnoseIncomplete(), clang::Sema::ContextualImplicitConverter::diagnoseNoMatch(), diagnoseNoViableConversion(), distance(), clang::ExprError(), finishContextualImplicitConversion(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), clang::CXXConversionDecl::getConversionType(), clang::RecordType::getDecl(), clang::QualType::getNonReferenceType(), clang::Stmt::getSourceRange(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::Expr::getType(), clang::NamedDecl::getUnderlyingDecl(), clang::QualType::getUnqualifiedType(), clang::Expr::hasPlaceholderType(), clang::CXXConversionDecl::isExplicit(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isNull(), clang::Expr::isTypeDependent(), clang::DeclAccessPair::make(), clang::Sema::ContextualImplicitConverter::match(), clang::OR_Ambiguous, clang::OR_Deleted, clang::OR_No_Viable_Function, clang::OR_Success, recordConversion(), result, clang::UnresolvedSetImpl::size(), and clang::Sema::ContextualImplicitConverter::Suppress.
Referenced by ActOnCXXDelete().
ExprResult Sema::PerformContextuallyConvertToBool | ( | Expr * | From | ) |
PerformContextuallyConvertToBool - Perform a contextual conversion of the expression From to bool (C++0x [conv]p3).
Definition at line 5320 of file SemaOverload.cpp.
References checkPlaceholderForOverload(), clang::ExprError(), clang::ImplicitConversionSequence::isBad(), and TryContextuallyConvertToBool().
Referenced by CheckCXXBooleanCondition().
ExprResult Sema::PerformContextuallyConvertToObjCPointer | ( | Expr * | From | ) |
PerformContextuallyConvertToObjCPointer - Perform a contextual conversion of the expression From to an Objective-C pointer type.
Returns a valid but null ExprResult if no conversion sequence exists.
Definition at line 5603 of file SemaOverload.cpp.
References checkPlaceholderForOverload(), and clang::ExprError().
ExprResult Sema::PerformCopyInitialization | ( | const InitializedEntity & | Entity, |
SourceLocation | EqualLoc, | ||
ExprResult | Init, | ||
bool | TopLevelOfInitList = false , |
||
bool | AllowExplicit = false |
||
) |
Definition at line 9231 of file SemaInit.cpp.
References clang::InitializationKind::CreateCopy(), clang::ExprError(), clang::InitializationSequence::FK_ConstructorOverloadFailed, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), clang::FunctionDecl::getNumParams(), clang::FunctionDecl::getParamDecl(), clang::InitializedEntity::getType(), clang::ValueDecl::getType(), clang::SourceLocation::isInvalid(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::InitializedEntity::isParameterKind(), clang::BadConversionSequence::no_conversion, clang::OR_No_Viable_Function, clang::ovl_fail_bad_conversion, clang::Result, and clang::InitializationSequence::SK_ConstructorInitialization.
Referenced by checkBuiltinArgument(), CheckObjCCollectionLiteralElement(), convertArgsForAvailabilityChecks(), CXXCheckConditionalOperands(), resolveBuiltinNewDeleteOverload(), and SemaBuiltinLaunder().
void Sema::PerformDependentDiagnostics | ( | const DeclContext * | Pattern, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 5595 of file SemaTemplateInstantiateDecl.cpp.
References clang::DependentDiagnostic::Access, and clang::DeclContext::ddiags().
ExprResult Sema::PerformImplicitConversion | ( | Expr * | From, |
QualType | ToType, | ||
AssignmentAction | Action, | ||
bool | AllowExplicit = false |
||
) |
PerformImplicitConversion - Perform an implicit conversion of the expression From to the type ToType.
Returns the converted expression. Flavor is the kind of conversion we're performing, used in the error message. If AllowExplicit
, explicit user-defined conversions are permitted.
Definition at line 1415 of file SemaOverload.cpp.
Referenced by ActOnCXXDelete(), buildCounterInit(), buildCounterUpdate(), CheckConvertedConstantExpression(), checkOpenMPLoop(), FindConditionalOverload(), clang::InitializationSequence::Perform(), PerformImplicitConversion(), and widenIterationCount().
ExprResult Sema::PerformImplicitConversion | ( | Expr * | From, |
QualType | ToType, | ||
AssignmentAction | Action, | ||
bool | AllowExplicit, | ||
ImplicitConversionSequence & | ICS | ||
) |
Definition at line 1422 of file SemaOverload.cpp.
References checkPlaceholderForOverload(), clang::ExprError(), clang::Stmt::getBeginLoc(), clang::Expr::getType(), and TryImplicitConversion().
ExprResult Sema::PerformImplicitConversion | ( | Expr * | From, |
QualType | ToType, | ||
const ImplicitConversionSequence & | ICS, | ||
AssignmentAction | Action, | ||
CheckedConversionKind | CCK = CCK_ImplicitConversion |
||
) |
PerformImplicitConversion - Perform an implicit conversion of the expression From to the type ToType using the pre-computed implicit conversion sequence ICS.
Returns the converted expression. Action is the kind of conversion we're performing, used in the error message.
Definition at line 3782 of file SemaExprCXX.cpp.
References AA_Converting, clang::UserDefinedConversionSequence::After, clang::ImplicitConversionSequence::AmbiguousConversion, clang::ImplicitConversionSequence::BadConversion, clang::UserDefinedConversionSequence::Before, BuildCXXCastArgument(), CCK_ForBuiltinOverloadedOp, Context, clang::UserDefinedConversionSequence::ConversionFunction, clang::ImplicitConversionSequence::DiagnoseAmbiguousConversion(), DiagnoseAssignmentResult(), clang::UserDefinedConversionSequence::EllipsisConversion, clang::ImplicitConversionSequence::EllipsisConversion, clang::ExprError(), clang::UserDefinedConversionSequence::FoundConversionFunction, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getBeginLoc(), clang::Expr::getExprLoc(), clang::ImplicitConversionSequence::getKind(), clang::QualType::getNonReferenceType(), clang::FunctionDecl::getParamDecl(), clang::Stmt::getSourceRange(), clang::ASTContext::getTagDeclType(), clang::Expr::getType(), clang::ValueDecl::getType(), clang::UserDefinedConversionSequence::HadMultipleCandidates, Incompatible, clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Type::isRecordType(), PDiag(), PerformImplicitConversion(), clang::ImplicitConversionSequence::Standard, clang::ImplicitConversionSequence::StandardConversion, clang::ImplicitConversionSequence::UserDefined, and clang::ImplicitConversionSequence::UserDefinedConversion.
ExprResult Sema::PerformImplicitConversion | ( | Expr * | From, |
QualType | ToType, | ||
const StandardConversionSequence & | SCS, | ||
AssignmentAction | Action, | ||
CheckedConversionKind | CCK | ||
) |
PerformImplicitConversion - Perform an implicit conversion of the expression From to the type ToType by following the standard conversion sequence SCS.
Returns the converted expression. Flavor is the context in which we're performing this conversion, for use in error messages.
Definition at line 3882 of file SemaExprCXX.cpp.
References AA_Assigning, AA_Casting, AA_Converting, AA_Initializing, AA_Passing, AA_Passing_CFAudited, AA_Returning, AA_Sending, clang::LangOptions::allowsNonTrivialObjCLifetimeQualifiers(), clang::ASTContext::BoolTy, BuildCXXConstructExpr(), clang::Type::castAs(), CCK_CStyleCast, CCK_FunctionalCast, CheckDerivedToBaseConversion(), CheckExceptionSpecCompatibility(), CheckMemberPointerConversion(), CheckObjCARCUnavailableWeakConversion(), CheckObjCConversion(), CheckPointerConversion(), CheckTransparentUnionArgumentConstraints(), clang::CXXConstructExpr::CK_Complete, Compatible, CompleteConstructorCall(), Context, clang::StandardConversionSequence::CopyConstructor, clang::ImplicitCastExpr::Create(), DefaultLvalueConversion(), clang::StandardConversionSequence::DeprecatedStringLiteralToCharPtr, Diag(), diagnoseNullableToNonnullConversion(), DiagnoseUseOfDecl(), EmitRelatedResultTypeNote(), clang::ExprError(), clang::StandardConversionSequence::First, FixOverloadedFunctionReference(), clang::ASTContext::FloatTy, clang::StandardConversionSequence::FoundCopyConstructor, clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::QualType::getAddressSpace(), clang::ASTContext::getArrayDecayedType(), clang::Type::getAs(), clang::Stmt::getBeginLoc(), clang::TargetInfo::getCXXABI(), clang::EnumType::getDecl(), clang::ComplexType::getElementType(), clang::Expr::getExprLoc(), getLangOpts(), clang::QualType::getNonLValueExprType(), clang::QualType::getNonReferenceType(), clang::Expr::getObjectKind(), clang::Type::getPointeeType(), clang::ASTContext::getPointerType(), clang::Stmt::getSourceRange(), clang::ASTContext::getTargetInfo(), clang::Expr::getType(), clang::QualType::getUnqualifiedType(), clang::Expr::getValueKind(), clang::AtomicType::getValueType(), clang::ASTContext::hasSameType(), clang::ASTContext::hasSameUnqualifiedType(), clang::ICK_Array_To_Pointer, clang::ICK_Block_Pointer_Conversion, clang::ICK_Boolean_Conversion, clang::ICK_C_Only_Conversion, clang::ICK_Compatible_Conversion, clang::ICK_Complex_Conversion, clang::ICK_Complex_Promotion, clang::ICK_Complex_Real, clang::ICK_Derived_To_Base, clang::ICK_Floating_Conversion, clang::ICK_Floating_Integral, clang::ICK_Floating_Promotion, clang::ICK_Function_Conversion, clang::ICK_Function_To_Pointer, clang::ICK_Identity, clang::ICK_Incompatible_Pointer_Conversion, clang::ICK_Integral_Conversion, clang::ICK_Integral_Promotion, clang::ICK_Lvalue_To_Rvalue, clang::ICK_Num_Conversion_Kinds, clang::ICK_Pointer_Conversion, clang::ICK_Pointer_Member, clang::ICK_Qualification, clang::ICK_TransparentUnionConversion, clang::ICK_Vector_Conversion, clang::ICK_Vector_Splat, clang::ICK_Writeback_Conversion, clang::ICK_Zero_Event_Conversion, clang::ICK_Zero_Queue_Conversion, ImpCastExprToType(), clang::StandardConversionSequence::IncompatibleObjC, clang::Qualifiers::isAddressSpaceSupersetOf(), clang::Type::isBooleanType(), isCast(), isCompleteType(), clang::EnumDecl::isFixed(), clang::Type::isHalfType(), clang::Type::isIntegerType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::TargetCXXABI::isMicrosoft(), clang::QualType::isNull(), clang::Type::isObjCObjectPointerType(), clang::Type::isPointerType(), clang::Type::isRealFloatingType(), clang::Type::isReferenceType(), clang::OK_ObjCProperty, clang::ASTContext::OverloadTy, PrepareCastToObjCObjectPointer(), prepareVectorSplat(), ResolveAddressOfOverloadedFunction(), ScalarTypeToBooleanCastKind(), clang::StandardConversionSequence::Second, clang::StandardConversionSequence::Third, and clang::VK_RValue.
ExprResult Sema::PerformMemberExprBaseConversion | ( | Expr * | Base, |
bool | IsArrow | ||
) |
Perform conversions on the LHS of a member access expression.
Definition at line 1228 of file SemaExprMember.cpp.
References clang::Expr::getType(), and clang::Type::isFunctionType().
Referenced by LookupMemberExpr().
ExprResult Sema::PerformMoveOrCopyInitialization | ( | const InitializedEntity & | Entity, |
const VarDecl * | NRVOCandidate, | ||
QualType | ResultType, | ||
Expr * | Value, | ||
bool | AllowNRVO = true |
||
) |
Perform the initialization of a potentially-movable value, which is the result of return value.
This routine implements C++14 [class.copy]p32, which attempts to treat returned lvalues as rvalues in certain cases (to prefer move construction), then falls back to treating them as lvalues if that failed.
Definition at line 3079 of file SemaStmt.cpp.
References clang::ExprError(), clang::Expr::getExprLoc(), clang::QualType::getNonReferenceType(), clang::ValueDecl::getType(), clang::QualType::getUnqualifiedType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::QualType::isTriviallyCopyableType(), and TryMoveInitialization().
Referenced by checkEscapingByref(), and noteMemberDeclaredHere().
ExprResult Sema::PerformObjectArgumentInitialization | ( | Expr * | From, |
NestedNameSpecifier * | Qualifier, | ||
NamedDecl * | FoundDecl, | ||
CXXMethodDecl * | Method | ||
) |
PerformObjectArgumentInitialization - Perform initialization of the implicit object parameter for the given Method with the given expression.
Definition at line 5216 of file SemaOverload.cpp.
References clang::Expr::Classify(), clang::Type::getAs(), clang::Type::getPointeeType(), clang::CXXMethodDecl::getThisType(), clang::Expr::getType(), and clang::Expr::Classification::makeSimpleLValue().
Referenced by convertArgsForAvailabilityChecks().
ExprResult Sema::PerformObjectMemberConversion | ( | Expr * | From, |
NestedNameSpecifier * | Qualifier, | ||
NamedDecl * | FoundDecl, | ||
NamedDecl * | Member | ||
) |
Cast a base object to a member's actual type.
Logically this happens in three phases:
Definition at line 2650 of file SemaExpr.cpp.
ExprResult Sema::PerformOpenMPImplicitIntegerConversion | ( | SourceLocation | OpLoc, |
Expr * | Op | ||
) |
Definition at line 9864 of file SemaOpenMP.cpp.
References Diag(), clang::ExprError(), clang::Decl::getLocation(), and clang::Type::isEnumeralType().
Referenced by isNonNegativeIntegerValue().
Performs template instantiation for all implicit template instantiations we have seen until this point.
Definition at line 5517 of file SemaTemplateInstantiateDecl.cpp.
References clang::Redeclarable< decl_type >::getMostRecentDecl(), clang::VarDecl::getTemplateSpecializationKindForInstantiation(), clang::FunctionDecl::isDefined(), clang::Decl::isInvalidDecl(), clang::VarDecl::isStaticDataMember(), clang::FunctionDecl::setInstantiationIsPending(), clang::TSK_ExplicitInstantiationDeclaration, clang::TSK_ExplicitInstantiationDefinition, clang::TSK_ExplicitSpecialization, clang::TSK_ImplicitInstantiation, and clang::TSK_Undeclared.
Referenced by ActOnEndOfTranslationUnitFragment().
ExprResult Sema::PerformQualificationConversion | ( | Expr * | E, |
QualType | Ty, | ||
ExprValueKind | VK = VK_RValue , |
||
CheckedConversionKind | CCK = CCK_ImplicitConversion |
||
) |
Definition at line 7360 of file SemaInit.cpp.
References clang::QualType::getAddressSpace(), clang::Type::getPointeeType(), clang::Expr::getType(), and clang::VK_RValue.
Referenced by clang::InitializationSequence::Perform().
void Sema::popCodeSynthesisContext | ( | ) |
Definition at line 370 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContextLookupModules, CodeSynthesisContexts, InNonInstantiationSFINAEContext, LastEmittedCodeSynthesisContextDepth, LookupModulesCache, and NonInstantiationEntries.
Referenced by clang::Sema::InstantiatingTemplate::Clear(), and clang::Sema::SynthesizedFunctionScope::~SynthesizedFunctionScope().
void Sema::PopCompoundScope | ( | ) |
Definition at line 1739 of file Sema.cpp.
References clang::sema::FunctionScopeInfo::CompoundScopes, and getCurFunction().
void Sema::PopDeclContext | ( | ) |
Definition at line 1244 of file SemaDecl.cpp.
void Sema::PopExpressionEvaluationContext | ( | ) |
Definition at line 14778 of file SemaExpr.cpp.
References Diag(), clang::Sema::ExpressionEvaluationContextRecord::ExprContext, clang::Sema::ExpressionEvaluationContextRecord::isConstantEvaluated(), clang::Sema::ExpressionEvaluationContextRecord::isUnevaluated(), clang::Sema::ExpressionEvaluationContextRecord::Lambdas, clang::Sema::ExpressionEvaluationContextRecord::NumCleanupObjects, clang::Sema::ExpressionEvaluationContextRecord::NumTypos, clang::Sema::ExpressionEvaluationContextRecord::ParentCleanup, and clang::Sema::ExpressionEvaluationContextRecord::SavedMaybeODRUseExprs.
Referenced by clang::EnterExpressionEvaluationContext::~EnterExpressionEvaluationContext(), and clang::Sema::SynthesizedFunctionScope::~SynthesizedFunctionScope().
bool Sema::PopForceCUDAHostDevice | ( | ) |
Decrements our count of the number of times we've seen a pragma forcing functions to be host device.
Returns false if the count is 0 before incrementing, so you can emit an error.
Definition at line 32 of file SemaCUDA.cpp.
References getLangOpts().
Sema::PoppedFunctionScopePtr Sema::PopFunctionScopeInfo | ( | const sema::AnalysisBasedWarnings::Policy * | WP = nullptr , |
const Decl * | D = nullptr , |
||
QualType | BlockType = QualType() |
||
) |
Pop a function (or block or lambda or captured region) scope from the stack.
WP | The warning policy to use for CFG-based warnings, or null if such warnings should not be produced. |
D | The declaration corresponding to this function scope, if producing CFG-based warnings. |
BlockType | The type of the block expression, if D is a BlockDecl. |
Definition at line 1704 of file Sema.cpp.
References AnalysisWarnings, Diag(), FunctionScopes, clang::sema::AnalysisBasedWarnings::IssueWarnings(), LangOpts, markEscapingByrefs(), and clang::Sema::PoppedFunctionScopeDeleter::operator()().
Referenced by clang::Sema::FunctionScopeRAII::~FunctionScopeRAII(), and clang::Sema::SynthesizedFunctionScope::~SynthesizedFunctionScope().
void Sema::popObjCTypeParamList | ( | Scope * | S, |
ObjCTypeParamList * | typeParamList | ||
) |
Definition at line 804 of file SemaDeclObjC.cpp.
Referenced by clang::Parser::ObjCTypeParamListScope::leave().
|
inline |
Definition at line 4167 of file Sema.h.
References clang::Sema::DelayedDiagnostics::popUndelayed().
void clang::Sema::PopParsingDeclaration | ( | ParsingDeclState | state, |
Decl * | decl | ||
) |
Referenced by clang::ParsingDeclRAIIObject::abortAndRemember(), and clang::SuppressAccessChecks::done().
void Sema::PopPragmaVisibility | ( | bool | IsNamespaceEnd, |
SourceLocation | EndLoc | ||
) |
PopPragmaVisibility - Pop the top element of the visibility stack; used for '#pragma GCC visibility' and visibility attributes on namespaces.
Definition at line 839 of file SemaAttr.cpp.
References Diag(), and VisContext.
Referenced by ActOnPragmaVisibility().
CastKind Sema::PrepareCastToObjCObjectPointer | ( | ExprResult & | E | ) |
Prepare a conversion of the given expression to an ObjC object pointer type.
Definition at line 6145 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::isBlockPointerType(), clang::Type::isObjCObjectPointerType(), and clang::Type::isPointerType().
Referenced by PerformImplicitConversion(), and TryReinterpretCast().
CastKind Sema::PrepareScalarCast | ( | ExprResult & | Src, |
QualType | DestTy | ||
) |
Prepares for a scalar cast, performing all the necessary stages except the final cast and returning the kind required.
Definition at line 6160 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get().
Referenced by CXXCheckConditionalOperands(), and DiagnoseBadFunctionCast().
ExprResult Sema::prepareVectorSplat | ( | QualType | VectorTy, |
Expr * | SplattedExpr | ||
) |
Prepare SplattedExpr
for a vector splat operation, adding implicit casts if necessary.
Definition at line 6450 of file SemaExpr.cpp.
References clang::Type::castAs(), clang::Expr::getType(), clang::Type::isBooleanType(), clang::Type::isExtVectorType(), clang::Type::isFloatingType(), and clang::Type::isIntegralOrEnumerationType().
Referenced by DiagnoseBadFunctionCast(), PerformImplicitConversion(), and TryAddressSpaceCast().
|
inline |
Definition at line 7822 of file Sema.h.
Referenced by EmitCurrentDiagnostic().
void Sema::PrintInstantiationStack | ( | ) |
Prints the current instantiation stack through a series of notes.
Definition at line 436 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, clang::Sema::CodeSynthesisContext::DeducedTemplateArgumentSubstitution, clang::Sema::CodeSynthesisContext::DefaultFunctionArgumentInstantiation, clang::Sema::CodeSynthesisContext::DefaultTemplateArgumentInstantiation, Diags, clang::Sema::CodeSynthesisContext::ExplicitTemplateArgumentSubstitution, clang::Decl::getDeclContext(), getPrintingPolicy(), getTemplateArgumentBindingsText(), clang::DiagnosticsEngine::getTemplateBacktraceLimit(), clang::TemplateDecl::getTemplateParameters(), clang::NamedDecl::printName(), clang::printTemplateArgumentList(), clang::Sema::CodeSynthesisContext::PriorTemplateArgumentSubstitution, clang::DiagnosticsEngine::Report(), and clang::Sema::CodeSynthesisContext::TemplateInstantiation.
void Sema::PrintPragmaAttributeInstantiationPoint | ( | ) |
Definition at line 712 of file SemaAttr.cpp.
References Diags, clang::Decl::getBeginLoc(), PragmaAttributeCurrentTargetDecl, and clang::DiagnosticsEngine::Report().
void Sema::PrintStats | ( | ) | const |
Print out statistics about the semantic analysis.
Definition at line 434 of file Sema.cpp.
References AnalysisWarnings, BumpAlloc, NumSFINAEErrors, and clang::sema::AnalysisBasedWarnings::PrintStats().
bool clang::Sema::ProcessAccessDeclAttributeList | ( | AccessSpecDecl * | ASDecl, |
const ParsedAttributesView & | AttrList | ||
) |
void clang::Sema::ProcessDeclAttributeDelayed | ( | Decl * | D, |
const ParsedAttributesView & | AttrList | ||
) |
void clang::Sema::ProcessDeclAttributeList | ( | Scope * | S, |
Decl * | D, | ||
const ParsedAttributesView & | AL, | ||
bool | IncludeCXX11Attributes = true |
||
) |
void clang::Sema::ProcessDeclAttributes | ( | Scope * | S, |
Decl * | D, | ||
const Declarator & | PD | ||
) |
void Sema::ProcessPropertyDecl | ( | ObjCPropertyDecl * | property | ) |
Process the specified property declaration and create decls for the setters and getters as needed.
ProcessPropertyDecl - Make sure that any user-defined setter/getter methods have the property type and issue diagnostics if they don't.
property | The property declaration being processed |
Also synthesize a getter/setter method if none exist (and update the appropriate lookup tables.
Definition at line 2322 of file SemaObjCProperty.cpp.
References clang::Decl::addAttr(), clang::DeclContext::addDecl(), AddFactoryMethodToGlobalPool(), AddInstanceMethodToGlobalPool(), AddPropertyAttrs(), CheckARCMethodDecl(), CheckObjCMethodOverrides(), Context, clang::ObjCMethodDecl::Create(), clang::ParmVarDecl::Create(), Diag(), DiagnosePropertyAccessorMismatch(), clang::Decl::getAttr(), clang::ASTContext::getAttributedType(), clang::ASTContext::getCanonicalType(), clang::ObjCMethodDecl::getClassInterface(), clang::ObjCContainerDecl::getClassMethod(), clang::NamedDecl::getDeclName(), clang::ObjCPropertyDecl::getGetterName(), clang::NamedDecl::getIdentifier(), clang::ObjCContainerDecl::getInstanceMethod(), getLangOpts(), clang::Decl::getLocation(), clang::ObjCPropertyDecl::getPropertyAttributes(), clang::ObjCPropertyDecl::getSetterName(), clang::Decl::hasAttr(), clang::ASTContext::hasSameUnqualifiedType(), clang::Decl::isInvalidDecl(), clang::ObjCPropertyDecl::isReadOnly(), clang::ObjCPropertyDecl::OBJC_PR_null_resettable, clang::ObjCMethodDecl::Optional, clang::ObjCPropertyDecl::Optional, clang::ObjCMethodDecl::Required, RTC_Unknown, clang::SC_None, clang::ObjCMethodDecl::setPropertyAccessor(), clang::AttributedType::stripOuterNullability(), clang::Unspecified, and clang::ASTContext::VoidTy.
StmtResult Sema::ProcessStmtAttributes | ( | Stmt * | Stmt, |
const ParsedAttributesView & | Attrs, | ||
SourceRange | Range | ||
) |
Stmt attributes - this routine is the top level dispatcher.
Definition at line 344 of file SemaStmtAttr.cpp.
QualType Sema::ProduceCallSignatureHelp | ( | Scope * | S, |
Expr * | Fn, | ||
ArrayRef< Expr *> | Args, | ||
SourceLocation | OpenParLoc | ||
) |
Reports signatures for a call to CodeCompleteConsumer and returns the preferred type for the current argument.
Returned type can be null.
Definition at line 5101 of file SemaCodeComplete.cpp.
References anyNullArguments(), clang::OverloadCandidateSet::CSK_Normal, clang::Expr::getExprLoc(), clang::Expr::hasAnyTypeDependentArguments(), and clang::Expr::isTypeDependent().
QualType Sema::ProduceConstructorSignatureHelp | ( | Scope * | S, |
QualType | Type, | ||
SourceLocation | Loc, | ||
ArrayRef< Expr *> | Args, | ||
SourceLocation | OpenParLoc | ||
) |
Definition at line 5197 of file SemaCodeComplete.cpp.
References clang::OverloadCandidateSet::CSK_Normal, clang::Type::getAsCXXRecordDecl(), and clang::DeclAccessPair::make().
Referenced by clang::Parser::ParseUnqualifiedId().
QualType Sema::ProduceCtorInitMemberSignatureHelp | ( | Scope * | S, |
Decl * | ConstructorDecl, | ||
CXXScopeSpec | SS, | ||
ParsedType | TemplateTypeTy, | ||
ArrayRef< Expr *> | ArgExprs, | ||
IdentifierInfo * | II, | ||
SourceLocation | OpenParLoc | ||
) |
Definition at line 5236 of file SemaCodeComplete.cpp.
References clang::CXXMethodDecl::getParent().
void Sema::propagateDLLAttrToBaseClassTemplate | ( | CXXRecordDecl * | Class, |
Attr * | ClassAttr, | ||
ClassTemplateSpecializationDecl * | BaseTemplateSpec, | ||
SourceLocation | BaseLoc | ||
) |
Perform propagation of DLL attributes from a derived class to a templated base class for MS compatibility.
Definition at line 5841 of file SemaDeclCXX.cpp.
References clang::Decl::addAttr(), clang::Attr::clone(), Diag(), clang::getDLLAttr(), clang::Attr::getLocation(), clang::Decl::getLocation(), clang::ClassTemplateSpecializationDecl::getPointOfInstantiation(), clang::ClassTemplateSpecializationDecl::getSpecializationKind(), clang::ClassTemplateSpecializationDecl::getSpecializedTemplate(), clang::ClassTemplateDecl::getTemplatedDecl(), clang::ClassTemplateSpecializationDecl::isExplicitSpecialization(), clang::TSK_ExplicitInstantiationDeclaration, clang::TSK_ImplicitInstantiation, and clang::TSK_Undeclared.
Referenced by dllExportImportClassTemplateSpecialization().
Definition at line 1611 of file Sema.cpp.
References FunctionScopes, and getDiagnostics().
void Sema::PushCapturedRegionScope | ( | Scope * | RegionScope, |
CapturedDecl * | CD, | ||
RecordDecl * | RD, | ||
CapturedRegionKind | K | ||
) |
Definition at line 2115 of file Sema.cpp.
References Context, clang::CR_OpenMP, FunctionScopes, clang::CapturedDecl::getContextParam(), getDiagnostics(), getLangOpts(), clang::sema::CapturingScopeInfo::ReturnType, and clang::ASTContext::VoidTy.
void Sema::pushCodeSynthesisContext | ( | CodeSynthesisContext | Ctx | ) |
Definition at line 360 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, InNonInstantiationSFINAEContext, clang::Sema::CodeSynthesisContext::isInstantiationRecord(), NonInstantiationEntries, and clang::Sema::CodeSynthesisContext::SavedInNonInstantiationSFINAEContext.
Referenced by clang::Sema::SynthesizedFunctionScope::addContextNote(), and clang::Sema::CodeSynthesisContext::isInstantiationRecord().
void Sema::PushCompoundScope | ( | bool | IsStmtExpr | ) |
Definition at line 1735 of file Sema.cpp.
References clang::sema::FunctionScopeInfo::CompoundScopes, and getCurFunction().
void Sema::PushDeclContext | ( | Scope * | S, |
DeclContext * | DC | ||
) |
Set the current declaration context until it gets popped.
Definition at line 1237 of file SemaDecl.cpp.
Referenced by ActOnStartOfObjCMethodDef().
void Sema::PushExpressionEvaluationContext | ( | ExpressionEvaluationContext | NewContext, |
Decl * | LambdaContextDecl = nullptr , |
||
ExpressionEvaluationContextRecord::ExpressionKind | Type = ExpressionEvaluationContextRecord::EK_Other |
||
) |
Definition at line 14715 of file SemaExpr.cpp.
Referenced by ActOnStartOfObjCMethodDef(), clang::EnterExpressionEvaluationContext::EnterExpressionEvaluationContext(), and clang::Sema::SynthesizedFunctionScope::SynthesizedFunctionScope().
void Sema::PushExpressionEvaluationContext | ( | ExpressionEvaluationContext | NewContext, |
ReuseLambdaContextDecl_t | , | ||
ExpressionEvaluationContextRecord::ExpressionKind | Type = ExpressionEvaluationContextRecord::EK_Other |
||
) |
Definition at line 14726 of file SemaExpr.cpp.
void Sema::PushForceCUDAHostDevice | ( | ) |
Increments our count of the number of times we've seen a pragma forcing functions to be host device.
So long as this count is greater than zero, all functions encountered will be host device.
Definition at line 27 of file SemaCUDA.cpp.
References getLangOpts().
void Sema::PushFunctionScope | ( | ) |
Enter a new function scope.
Definition at line 1599 of file Sema.cpp.
References CachedFunctionScope, FunctionScopes, getDiagnostics(), and LangOpts.
Referenced by ActOnStartOfObjCMethodDef(), and clang::Sema::SynthesizedFunctionScope::SynthesizedFunctionScope().
LambdaScopeInfo * Sema::PushLambdaScope | ( | ) |
Definition at line 1616 of file Sema.cpp.
References FunctionScopes, and getDiagnostics().
Referenced by addConstevalToLambdaDeclSpecifier().
void Sema::PushNamespaceVisibilityAttr | ( | const VisibilityAttr * | Attr, |
SourceLocation | Loc | ||
) |
PushNamespaceVisibilityAttr - Note that we've entered a namespace with a visibility attribute.
Definition at line 830 of file SemaAttr.cpp.
References NoVisibility, and PushPragmaVisibility().
Add this decl to the scope shadowed decl chains.
Definition at line 1370 of file SemaDecl.cpp.
Referenced by ActOnCompatibilityAlias(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), ActOnStartClassImplementation(), ActOnStartOfObjCMethodDef(), ActOnStartProtocolInterface(), and Initialize().
|
inline |
Definition at line 4164 of file Sema.h.
References clang::Sema::DelayedDiagnostics::pushUndelayed().
|
inline |
Definition at line 4158 of file Sema.h.
References clang::ast_matchers::decl, clang::Sema::DelayedDiagnostics::push(), and clang::CodeGen::state.
Referenced by clang::ParsingDeclRAIIObject::abortAndRemember(), and clang::SuppressAccessChecks::SuppressAccessChecks().
void Sema::PushUsingDirective | ( | Scope * | S, |
UsingDirectiveDecl * | UDir | ||
) |
Definition at line 9504 of file SemaDeclCXX.cpp.
References clang::DeclContext::addDecl(), clang::Scope::getEntity(), clang::DeclContext::isFunctionOrMethod(), and clang::Scope::PushUsingDirective().
void Sema::ReadMethodPool | ( | Selector | Sel | ) |
Read the contents of the method pool for a given selector from external storage.
Definition at line 3388 of file SemaDeclObjC.cpp.
Referenced by AddClassMessageCompletions(), AreMultipleMethodsInGlobalPool(), CollectMultipleMethodsInGlobalPool(), and updateOutOfDateSelector().
ExprResult Sema::RebuildExprInCurrentInstantiation | ( | Expr * | E | ) |
Definition at line 10184 of file SemaTemplate.cpp.
References clang::Expr::getExprLoc().
bool Sema::RebuildNestedNameSpecifierInCurrentInstantiation | ( | CXXScopeSpec & | SS | ) |
Definition at line 10190 of file SemaTemplate.cpp.
References clang::CXXScopeSpec::getWithLocInContext(), and clang::CXXScopeSpec::isInvalid().
bool Sema::RebuildTemplateParamsInCurrentInstantiation | ( | TemplateParameterList * | Params | ) |
Rebuild the template parameters now that we know we're in a current instantiation.
Definition at line 10208 of file SemaTemplate.cpp.
References clang::NamedDecl::getDeclName(), clang::Decl::getLocation(), clang::TemplateParameterList::getParam(), clang::DeclaratorDecl::getTypeSourceInfo(), and clang::TemplateParameterList::size().
TypeSourceInfo * Sema::RebuildTypeInCurrentInstantiation | ( | TypeSourceInfo * | T, |
SourceLocation | Loc, | ||
DeclarationName | Name | ||
) |
Rebuilds a type within the context of the current instantiation.
The type T
is part of the type of an out-of-line member definition of a class template (or class template partial specialization) that was parsed and constructed before we entered the scope of the class template (or partial specialization thereof). This routine will rebuild that type now that we have entered the declarator's scope, which may produce different canonical types, e.g.,
Here, the type "typename X<T>::pointer" will be created as a DependentNameType, since we do not know that we can look into X<T> when we parsed the type. This function will rebuild the type, performing the lookup of "pointer" in X<T> and returning an ElaboratedType whose canonical type is the same as the canonical type of T*, allowing the return types of the out-of-line definition and the declaration to match.
Definition at line 10174 of file SemaTemplate.cpp.
void Sema::RecordParsingTemplateParameterDepth | ( | unsigned | Depth | ) |
This is used to inform Sema what the current TemplateParameterDepth is during Parsing.
Currently it is used to pass on the depth when parsing generic lambda 'auto' parameters.
Definition at line 1622 of file Sema.cpp.
References Depth, and getCurLambda().
Referenced by addConstevalToLambdaDeclSpecifier().
Expr * Sema::recreateSyntacticForm | ( | PseudoObjectExpr * | E | ) |
Given a pseudo-object expression, recreate what it looks like syntactically without the attendant OpaqueValueExprs.
This is a hack which should be removed when TreeTransform is capable of rebuilding a tree without stripping implicit operations.
Definition at line 1645 of file SemaPseudoObject.cpp.
References clang::PseudoObjectExpr::getSyntacticForm(), and stripOpaqueValuesFromPseudoObjectRef().
void clang::Sema::redelayDiagnostics | ( | sema::DelayedDiagnosticPool & | pool | ) |
Referenced by clang::SuppressAccessChecks::redelay().
void Sema::referenceDLLExportedClassMethods | ( | ) |
Definition at line 11437 of file SemaDeclCXX.cpp.
References ReferenceDllExportedMembers().
Referenced by dllExportImportClassTemplateSpecialization().
void Sema::RefersToMemberWithReducedAlignment | ( | Expr * | E, |
llvm::function_ref< void(Expr *, RecordDecl *, FieldDecl *, CharUnits)> | Action | ||
) |
This function calls Action when it determines that E designates a misaligned member due to the packed attribute.
This is used to emit local diagnostics like in reference binding.
Definition at line 14211 of file SemaChecking.cpp.
References clang::Type::getAs(), clang::MemberExpr::getBase(), clang::Type::getPointeeType(), clang::QualType::getQualifiers(), clang::Expr::getType(), clang::Decl::hasAttr(), clang::Qualifiers::hasUnaligned(), clang::Expr::IgnoreParenImpCasts(), and clang::Decl::isInvalidDecl().
Register the given locally-scoped extern "C" declaration so that it can be found later for redeclarations.
We include any extern "C" declaration that is not visible in the translation unit here, not just function-scope declarations.
Definition at line 5726 of file SemaDecl.cpp.
void Sema::RegisterTypeTagForDatatype | ( | const IdentifierInfo * | ArgumentKind, |
uint64_t | MagicValue, | ||
QualType | Type, | ||
bool | LayoutCompatible, | ||
bool | MustBeNull | ||
) |
Register a magic integral constant to be used as a type tag.
Definition at line 14049 of file SemaChecking.cpp.
Completely replace the auto
in TypeWithAuto
by Replacement
.
This does not retain any auto
type sugar.
Definition at line 4594 of file SemaTemplateDeduction.cpp.
bool Sema::RequireCompleteDeclContext | ( | CXXScopeSpec & | SS, |
DeclContext * | DC | ||
) |
Require that the context specified by SS be complete.
If SS refers to a type, this routine checks whether the type is complete enough (or can be made complete enough) for name lookup into the DeclContext. A type that is not yet completed can be considered "complete enough" if it is a class/struct/union/enum that is currently being defined. Or, if we have a type that names a class template specialization that is not a complete type, we will attempt to instantiate that class template.
Definition at line 199 of file SemaCXXScopeSpec.cpp.
References Context, Definition, Diag(), diagnoseMissingImport(), clang::Type::getAsTagDecl(), clang::SourceRange::getBegin(), clang::EnumDecl::getInstantiatedFromMemberEnum(), clang::CXXScopeSpec::getLastQualifierNameLoc(), clang::CXXScopeSpec::getRange(), getTemplateInstantiationArgs(), clang::MemberSpecializationInfo::getTemplateSpecializationKind(), clang::ASTContext::getTypeDeclType(), hasVisibleDefinition(), InstantiateEnum(), clang::TagDecl::isBeingDefined(), clang::DeclContext::isDependentContext(), clang::SourceLocation::isInvalid(), isSFINAEContext(), RequireCompleteType(), clang::CXXScopeSpec::SetInvalid(), clang::TSK_ExplicitSpecialization, and clang::TSK_ImplicitInstantiation.
Referenced by LookupMemberExprInRecord(), clang::TreeTransform< Derived >::RebuildDependentNameType(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
bool Sema::RequireCompleteExprType | ( | Expr * | E, |
TypeDiagnoser & | Diagnoser | ||
) |
Ensure that the type of the given expression is complete.
This routine checks whether the expression E
has a complete type. If the expression refers to an instantiable construct, that instantiation is performed as needed to complete its type. Furthermore Sema::RequireCompleteType is called for the expression's type (or in the case of a reference type, the referred-to type).
E | The expression whose type is required to be complete. |
Diagnoser | The object that will emit a diagnostic if the type is incomplete. |
true
if the type of E
is incomplete and diagnosed, false
otherwise. Definition at line 7786 of file SemaType.cpp.
References clang::Expr::getExprLoc(), clang::Expr::getType(), and clang::Type::isIncompleteArrayType().
Definition at line 7804 of file SemaType.cpp.
bool Sema::RequireCompleteType | ( | SourceLocation | Loc, |
QualType | T, | ||
TypeDiagnoser & | Diagnoser | ||
) |
Ensure that the type T is a complete type.
This routine checks whether the type T
is complete in any context where a complete type is required. If T
is a complete type, returns false. If T
is a class template specialization, this routine then attempts to perform class template instantiation. If instantiation fails, or if T
is incomplete and cannot be completed, issues the diagnostic diag
(giving it the type T
) and returns true.
Loc | The location in the source that the incomplete type diagnostic should refer to. |
T | The type that this routine is examining for completeness. |
true
if T
is incomplete and a diagnostic was emitted, false
otherwise. Definition at line 7826 of file SemaType.cpp.
References clang::Type::getAs().
Referenced by ActOnCXXDelete(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), ActOnStartOfObjCMethodDef(), BuildCXXTypeConstructExpr(), CheckAllocatedType(), checkArithmeticIncompletePointerType(), CheckCommaOperands(), CheckForModifiableLvalue(), checkMemberDecomposition(), CheckPointerToMemberOperands(), CheckSpecifiedExceptionType(), CheckUnaryTypeTraitTypeCompleteness(), ComputeDefaultedSpecialMemberExceptionSpec(), CopyObject(), DiagnoseBadFunctionCast(), diagReturnOnAllocFailure(), EvaluateBinaryTypeTrait(), evaluateTypeTrait(), getCastAwayConstnessCastKind(), IgnoredValueConversions(), LookupMemberExpr(), LookupMemberExprInRecord(), lookupStdTypeTraitMember(), RequireCompleteDeclContext(), SemaBuiltinLaunder(), and TryStaticImplicitCast().
bool Sema::RequireCompleteType | ( | SourceLocation | Loc, |
QualType | T, | ||
unsigned | DiagID | ||
) |
Definition at line 8138 of file SemaType.cpp.
|
inline |
bool Sema::RequireLiteralType | ( | SourceLocation | Loc, |
QualType | T, | ||
TypeDiagnoser & | Diagnoser | ||
) |
Ensure that the type T is a literal type.
This routine checks whether the type T
is a literal type. If T
is an incomplete type, an attempt is made to complete it. If T
is a literal type, or AllowIncompleteType
is true and T
is an incomplete type, returns false. Otherwise, this routine issues the diagnostic PD
(giving it the type T
), along with notes explaining why the type is not a literal type, and returns true.
Loc | The location in the source that the non-literal type diagnostic should refer to. |
T | The type that this routine is examining for literalness. |
Diagnoser | Emits a diagnostic if T is not a literal type. |
true
if T
is not a literal type and a diagnostic was emitted, false
otherwise. Definition at line 8176 of file SemaType.cpp.
References clang::Type::isDependentType().
Referenced by CheckConstexprDeclStmt(), and CheckConstexprParameterTypes().
bool Sema::RequireLiteralType | ( | SourceLocation | Loc, |
QualType | T, | ||
unsigned | DiagID | ||
) |
Definition at line 8258 of file SemaType.cpp.
|
inline |
bool Sema::RequireNonAbstractType | ( | SourceLocation | Loc, |
QualType | T, | ||
TypeDiagnoser & | Diagnoser | ||
) |
Definition at line 5331 of file SemaDeclCXX.cpp.
Referenced by CheckAllocatedType(), clang::InitializationSequence::Perform(), and TryStaticImplicitCast().
|
inline |
FunctionDecl * Sema::resolveAddressOfOnlyViableOverloadCandidate | ( | Expr * | E, |
DeclAccessPair & | Pair | ||
) |
Given an expression that refers to an overloaded function, try to resolve that function to a single function that can have its address taken.
This will modify Pair
iff it returns non-null.
This routine can only realistically succeed if all but one candidates in the overload set for SrcExpr cannot have their addresses taken.
Definition at line 11517 of file SemaOverload.cpp.
References checkAddressOfFunctionIsAvailable(), clang::OverloadExpr::decls_begin(), clang::OverloadExpr::decls_end(), clang::OverloadExpr::FindResult::Expression, and clang::OverloadExpr::find().
Referenced by ResolveOverloadForDeduction().
FunctionDecl * Sema::ResolveAddressOfOverloadedFunction | ( | Expr * | AddressOfExpr, |
QualType | TargetType, | ||
bool | Complain, | ||
DeclAccessPair & | FoundResult, | ||
bool * | pHadMultipleCandidates = nullptr |
||
) |
ResolveAddressOfOverloadedFunction - Try to resolve the address of an overloaded function (C++ [over.over]), where From
is an expression with overloaded function type and ToType
is the type we're trying to resolve to.
For example:
This routine returns the resulting FunctionDecl if it could be resolved, and NULL otherwise. When Complain
is true, this routine will emit diagnostics if there is an error.
Definition at line 11471 of file SemaOverload.cpp.
References clang::Expr::getType().
Referenced by DiagnoseBadFunctionCast(), IsStandardConversion(), PerformImplicitConversion(), ResolveOverloadedFunctionForReferenceBinding(), TryAddressSpaceCast(), TryListConversion(), TryReferenceInit(), and TryStaticMemberPointerUpcast().
bool Sema::resolveAndFixAddressOfOnlyViableOverloadCandidate | ( | ExprResult & | SrcExpr, |
bool | DoFunctionPointerConverion = false |
||
) |
Given an overloaded function, tries to turn it into a non-overloaded function reference using resolveAddressOfOnlyViableOverloadCandidate.
This will perform access checks, diagnose the use of the resultant decl, and, if requested, potentially perform a function-to-pointer decay.
Returns false if resolveAddressOfOnlyViableOverloadCandidate fails. Otherwise, returns true. This may emit diagnostics and return true.
Definition at line 11553 of file SemaOverload.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::Expr::getType().
Referenced by fixOverloadedReinterpretCastExpr().
bool Sema::ResolveAndFixSingleFunctionTemplateSpecialization | ( | ExprResult & | SrcExpr, |
bool | DoFunctionPointerConverion = false , |
||
bool | Complain = false , |
||
SourceRange | OpRangeForComplaining = SourceRange() , |
||
QualType | DestTypeForComplaining = QualType() , |
||
unsigned | DiagIDForComplaining = 0 |
||
) |
Definition at line 11671 of file SemaOverload.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get().
Referenced by DiagnoseReinterpretUpDownCast(), fixOverloadedReinterpretCastExpr(), and TryAddressSpaceCast().
bool Sema::resolveAssumedTemplateNameAsType | ( | Scope * | S, |
TemplateName & | Name, | ||
SourceLocation | NameLoc, | ||
bool | Diagnose = true |
||
) |
Definition at line 3441 of file SemaTemplate.cpp.
const FunctionProtoType * clang::Sema::ResolveExceptionSpec | ( | SourceLocation | Loc, |
const FunctionProtoType * | FPT | ||
) |
Definition at line 188 of file SemaExceptionSpec.cpp.
References clang::Type::castAs(), Diag(), clang::EST_Unevaluated, clang::EST_Unparsed, EvaluateImplicitExceptionSpec(), clang::FunctionProtoType::getExceptionSpecDecl(), clang::FunctionProtoType::getExceptionSpecType(), clang::ValueDecl::getType(), InstantiateExceptionSpec(), and clang::isUnresolvedExceptionSpec().
Referenced by clang::canCalleeThrow(), clang::CheckEquivalentExceptionSpecImpl(), checkEscapingByref(), CheckExceptionSpecSubset(), completeFunctionType(), and EvaluateUnaryTypeTrait().
FunctionDecl * Sema::ResolveSingleFunctionTemplateSpecialization | ( | OverloadExpr * | ovl, |
bool | Complain = false , |
||
DeclAccessPair * | FoundResult = nullptr |
||
) |
Given an expression that refers to an overloaded function, try to resolve that overloaded function expression down to a single function.
This routine can only resolve template-ids that refer to a single function template, where that template-id refers to a single template whose template arguments are either provided by the template-id or have defaults, as described in C++0x [temp.arg.explicit]p3.
If no template-ids are found, no diagnostics are emitted and NULL is returned.
Definition at line 11588 of file SemaOverload.cpp.
References clang::OverloadExpr::copyTemplateArgumentsInto(), clang::OverloadExpr::decls_begin(), clang::OverloadExpr::decls_end(), DeduceTemplateArguments(), clang::OverloadExpr::getNameLoc(), clang::FunctionTemplateDecl::getTemplatedDecl(), clang::OverloadExpr::hasExplicitTemplateArgs(), and clang::MakeDeductionFailureInfo().
Referenced by ResolveOverloadForDeduction().
void Sema::RestoreNestedNameSpecifierAnnotation | ( | void * | Annotation, |
SourceRange | AnnotationRange, | ||
CXXScopeSpec & | SS | ||
) |
Given an annotation pointer for a nested-name-specifier, restore the nested-name-specifier structure.
Annotation | The annotation pointer, produced by SaveNestedNameSpecifierAnnotation() . |
AnnotationRange | The source range corresponding to the annotation. |
SS | The nested-name-specifier that will be updated with the contents of the annotation pointer. |
Definition at line 1007 of file SemaCXXScopeSpec.cpp.
References clang::CXXScopeSpec::Adopt(), and clang::CXXScopeSpec::SetInvalid().
void * Sema::SaveNestedNameSpecifierAnnotation | ( | CXXScopeSpec & | SS | ) |
Given a C++ nested-name-specifier, produce an annotation value that the parser can use later to reconstruct the given nested-name-specifier.
SS | A nested-name-specifier. |
SS
. Definition at line 993 of file SemaCXXScopeSpec.cpp.
References clang::ASTContext::Allocate(), Context, clang::CXXScopeSpec::getScopeRep(), clang::CXXScopeSpec::isEmpty(), clang::CXXScopeSpec::isInvalid(), clang::CXXScopeSpec::location_data(), clang::CXXScopeSpec::location_size(), and memcpy().
Referenced by clang::Parser::ParseTopLevelDecl().
ScalarTypeToBooleanCastKind - Returns the cast kind corresponding to the conversion from scalar type ScalarTy to the Boolean type.
Definition at line 541 of file Sema.cpp.
References clang::Type::getScalarTypeKind(), clang::Type::STK_BlockPointer, clang::Type::STK_Bool, clang::Type::STK_CPointer, clang::Type::STK_FixedPoint, clang::Type::STK_Floating, clang::Type::STK_FloatingComplex, clang::Type::STK_Integral, clang::Type::STK_IntegralComplex, clang::Type::STK_MemberPointer, and clang::Type::STK_ObjCObjectPointer.
Referenced by PerformImplicitConversion().
const ObjCMethodDecl * Sema::SelectorsForTypoCorrection | ( | Selector | Sel, |
QualType | ObjectType = QualType() |
||
) |
Definition at line 3667 of file SemaDeclObjC.cpp.
References b, clang::Type::getAsObjCInterfacePointerType(), clang::Selector::getAsString(), clang::Selector::getNumArgs(), HelperIsMethodInObjCType(), HelperSelectorsForTypoCorrection(), i, clang::QualType::isNull(), clang::Type::isObjCClassType(), clang::Type::isObjCIdType(), clang::Type::isObjCObjectPointerType(), clang::Type::isObjCQualifiedClassType(), clang::Type::isObjCQualifiedIdType(), and MethodPool.
ExprResult Sema::SemaBuiltinShuffleVector | ( | CallExpr * | TheCall | ) |
SemaBuiltinShuffleVector - Handle __builtin_shufflevector.
Definition at line 5758 of file SemaChecking.cpp.
References Diag(), clang::ExprError(), clang::CallExpr::getArg(), clang::Type::getAs(), clang::Stmt::getBeginLoc(), clang::CallExpr::getBeginLoc(), clang::CallExpr::getDirectCallee(), clang::Stmt::getEndLoc(), clang::CallExpr::getEndLoc(), clang::CallExpr::getNumArgs(), clang::Stmt::getSourceRange(), clang::Expr::getType(), clang::Type::hasIntegerRepresentation(), clang::Expr::isTypeDependent(), and clang::Type::isVectorType().
Referenced by clang::TreeTransform< Derived >::RebuildShuffleVectorExpr().
ExprResult Sema::SemaConvertVectorExpr | ( | Expr * | E, |
TypeSourceInfo * | TInfo, | ||
SourceLocation | BuiltinLoc, | ||
SourceLocation | RParenLoc | ||
) |
SemaConvertVectorExpr - Handle __builtin_convertvector.
Definition at line 5844 of file SemaChecking.cpp.
References Diag(), clang::ExprError(), clang::Type::getAs(), clang::Stmt::getSourceRange(), clang::TypeSourceInfo::getType(), clang::Expr::getType(), clang::Type::isDependentType(), clang::Type::isVectorType(), clang::OK_Ordinary, and clang::VK_RValue.
Referenced by clang::TreeTransform< Derived >::RebuildConvertVectorExpr().
bool Sema::SetCtorInitializers | ( | CXXConstructorDecl * | Constructor, |
bool | AnyErrors, | ||
ArrayRef< CXXCtorInitializer *> | Initializers = None |
||
) |
Definition at line 4751 of file SemaDeclCXX.cpp.
References clang::DeclContext::isDependentContext(), and clang::CXXConstructorDecl::setNumCtorInitializers().
|
inline |
void Sema::setCurrentOpenCLExtensionForDecl | ( | Decl * | FD | ) |
Set current OpenCL extensions for a declaration which can only be used when these OpenCL extensions are enabled.
If current OpenCL extension is empty, do nothing.
Definition at line 2161 of file Sema.cpp.
References setOpenCLExtensionForDecl().
Referenced by clang::Parser::ParseTopLevelDecl().
void Sema::setCurrentOpenCLExtensionForType | ( | QualType | T | ) |
Set current OpenCL extensions for a type which can only be used when these OpenCL extensions are enabled.
If current OpenCL extension is empty, do nothing.
Definition at line 2155 of file Sema.cpp.
References setOpenCLExtensionForType().
void Sema::SetDeclDefaulted | ( | Decl * | dcl, |
SourceLocation | DefaultLoc | ||
) |
Definition at line 14760 of file SemaDeclCXX.cpp.
References DefineImplicitSpecialMember(), Diag(), clang::FunctionDecl::getCanonicalDecl(), clang::CXXMethodDecl::getParent(), clang::FunctionDecl::getTemplateInstantiationPattern(), clang::FunctionDecl::isDefaulted(), clang::TagDecl::isDependentType(), clang::Decl::isInvalidDecl(), clang::FunctionDecl::setDefaulted(), clang::FunctionDecl::setExplicitlyDefaulted(), and clang::FunctionDecl::setWillHaveBody().
Referenced by clang::Parser::ParseTopLevelDecl(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
void Sema::SetDeclDeleted | ( | Decl * | dcl, |
SourceLocation | DelLoc | ||
) |
Definition at line 14692 of file SemaDeclCXX.cpp.
References clang::CXXMethodDecl::begin_overridden_methods(), Diag(), clang::FunctionDecl::getCanonicalDecl(), clang::NamedDecl::getDeclName(), clang::getDLLAttr(), clang::Decl::getLocation(), clang::Redeclarable< decl_type >::getPreviousDecl(), clang::FunctionDecl::isDefaulted(), clang::FunctionDecl::isDeleted(), clang::FunctionDecl::isMain(), clang::CXXMethodDecl::overridden_methods(), clang::FunctionDecl::setDeletedAsWritten(), clang::FunctionDecl::setImplicitlyInline(), clang::Decl::setInvalidDecl(), clang::FunctionDecl::setWillHaveBody(), and clang::TSK_ExplicitSpecialization.
Referenced by clang::Parser::ParseTopLevelDecl(), and clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
bool Sema::SetDelegatingInitializer | ( | CXXConstructorDecl * | Constructor, |
CXXCtorInitializer * | Initializer | ||
) |
Definition at line 4730 of file SemaDeclCXX.cpp.
References clang::CXXCtorInitializer::isDelegatingInitializer(), and clang::CXXConstructorDecl::setNumCtorInitializers().
void Sema::setFunctionHasBranchIntoScope | ( | ) |
Definition at line 1752 of file Sema.cpp.
References FunctionScopes.
void Sema::setFunctionHasBranchProtectedScope | ( | ) |
Definition at line 1757 of file Sema.cpp.
References FunctionScopes.
void Sema::setFunctionHasIndirectGoto | ( | ) |
Definition at line 1762 of file Sema.cpp.
References FunctionScopes.
void Sema::SetIvarInitializers | ( | ObjCImplementationDecl * | ObjCImplementation | ) |
SetIvarInitializers - This routine builds initialization ASTs for the Objective-C implementation whose ivars need be initialized.
Definition at line 15308 of file SemaDeclCXX.cpp.
References clang::frontend::CPlusPlus, clang::InitializationKind::CreateDefault(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::ObjCImplDecl::getClassInterface(), clang::Decl::getLocation(), i, clang::InitializedEntity::InitializeMember(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Decl::isInvalidDecl(), and clang::None.
|
inline |
Definition at line 697 of file Sema.h.
References P.
Referenced by clang::Parser::ParseTopLevelDecl().
bool Sema::SetMemberAccessSpecifier | ( | NamedDecl * | MemberDecl, |
NamedDecl * | PrevMemberDecl, | ||
AccessSpecifier | LexicalAS | ||
) |
SetMemberAccessSpecifier - Set the access specifier of a member.
Returns true on error (when the previous member decl access specifier is different from the new member decl access specifier).
Definition at line 39 of file SemaAccess.cpp.
References clang::AS_none, Diag(), clang::Decl::getAccess(), clang::Decl::getLocation(), and clang::Decl::setAccess().
void Sema::setOpenCLExtensionForDecl | ( | Decl * | FD, |
llvm::StringRef | Exts | ||
) |
Set OpenCL extensions for a declaration which can only be used when these OpenCL extensions are enabled.
If Exts
is empty, do nothing.
Exts | A space separated list of OpenCL extensions. |
Definition at line 2146 of file Sema.cpp.
Referenced by setCurrentOpenCLExtensionForDecl().
void Sema::setOpenCLExtensionForType | ( | QualType | T, |
llvm::StringRef | Exts | ||
) |
Set OpenCL extensions for a type which can only be used when these OpenCL extensions are enabled.
If Exts
is empty, do nothing.
Exts | A space separated list of OpenCL extensions. |
Definition at line 2136 of file Sema.cpp.
References clang::QualType::getCanonicalType(), and clang::QualType::getTypePtr().
Referenced by Initialize(), and setCurrentOpenCLExtensionForType().
Sets OpenMP capture kind (OMPC_private, OMPC_firstprivate, OMPC_map etc.) for FD
based on DSA for the provided corresponding captured declaration D
.
Definition at line 1904 of file SemaOpenMP.cpp.
References DSAStack, getCanonicalDecl(), clang::ValueDecl::getType(), clang::isOpenMPTargetExecutionDirective(), clang::Type::isScalarType(), and clang::OMPC_unknown.
bool Sema::SetParamDefaultArgument | ( | ParmVarDecl * | Param, |
Expr * | DefaultArg, | ||
SourceLocation | EqualLoc | ||
) |
Definition at line 249 of file SemaDeclCXX.cpp.
References clang::Decl::getLocation(), clang::ValueDecl::getType(), clang::InitializedEntity::InitializeParameter(), and clang::Decl::setInvalidDecl().
Referenced by SubstParmVarDecl().
void Sema::setTagNameForLinkagePurposes | ( | TagDecl * | TagFromDeclSpec, |
TypedefNameDecl * | NewTD | ||
) |
Definition at line 4204 of file SemaDecl.cpp.
References clang::TagDecl::hasNameForLinkage(), clang::Decl::isInvalidDecl(), and clang::TagDecl::isThisDeclarationADefinition().
bool Sema::ShouldDeleteSpecialMember | ( | CXXMethodDecl * | MD, |
CXXSpecialMember | CSM, | ||
InheritedConstructorInfo * | ICI = nullptr , |
||
bool | Diagnose = false |
||
) |
Determine if a special member function should have a deleted definition when it is defaulted.
Determine whether a defaulted special member function should be defined as deleted, as specified in C++11 [class.ctor]p5, C++11 [class.copy]p11, C++11 [class.copy]p23, and C++11 [class.dtor]p5.
Definition at line 7225 of file SemaDeclCXX.cpp.
References clang::CXXRecordDecl::ctors(), Diag(), clang::Decl::getLocation(), clang::CXXMethodDecl::getParent(), clang::CXXRecordDecl::hasUserDeclaredMoveAssignment(), clang::CXXRecordDecl::hasUserDeclaredMoveConstructor(), clang::RecordDecl::isAnonymousStructOrUnion(), clang::TagDecl::isDependentType(), clang::Decl::isImplicit(), clang::Decl::isInvalidDecl(), clang::CXXRecordDecl::isLambda(), clang::CXXMethodDecl::isMoveAssignmentOperator(), clang::CXXMethodDecl::isVirtual(), clang::CXXRecordDecl::lambdaIsDefaultConstructibleAndAssignable(), clang::CXXRecordDecl::methods(), and clang::LangOptions::MSVC2015.
bool Sema::ShouldEnterDeclaratorScope | ( | Scope * | S, |
const CXXScopeSpec & | SS | ||
) |
Definition at line 1020 of file SemaCXXScopeSpec.cpp.
Referenced by clang::Parser::ParseUnqualifiedId().
Checks if the new declaration declared in dependent context must be put in the same redeclaration chain as the specified declaration.
D | Declaration that is checked. |
PrevDecl | Previous declaration found with proper lookup method for the same declaration name. |
Definition at line 9474 of file SemaDecl.cpp.
References clang::Decl::getDeclContext(), clang::Decl::getFriendObjectKind(), clang::Decl::getLexicalDeclContext(), clang::DeclContext::isDependentContext(), and clang::DeclContext::isFileContext().
Sema::SkipBodyInfo Sema::shouldSkipAnonEnumBody | ( | Scope * | S, |
IdentifierInfo * | II, | ||
SourceLocation | IILoc | ||
) |
Determine whether the body of an anonymous enumeration should be skipped.
II | The name of the first enumerator. |
Definition at line 16862 of file SemaDecl.cpp.
bool Sema::ShouldWarnIfUnusedFileScopedDecl | ( | const DeclaratorDecl * | D | ) | const |
Definition at line 1583 of file SemaDecl.cpp.
References clang::Decl::getDeclContext(), clang::Decl::getLexicalDeclContext(), clang::Decl::hasAttr(), clang::DeclContext::isDependentContext(), IsDisallowedCopyOrAssign(), clang::Decl::isInvalidDecl(), isMainFileLoc(), clang::Decl::isUsed(), clang::TSK_ExplicitSpecialization, and clang::TSK_ImplicitInstantiation.
Referenced by ShouldRemoveFromUnused().
bool Sema::SpecialMemberIsTrivial | ( | CXXMethodDecl * | MD, |
CXXSpecialMember | CSM, | ||
TrivialABIHandling | TAH = TAH_IgnoreTrivialABI , |
||
bool | Diagnose = false |
||
) |
Determine whether a defaulted or deleted special member function is trivial, as specified in C++11 [class.ctor]p5, C++11 [class.copy]p12, C++11 [class.copy]p25, and C++11 [class.dtor]p5.
Definition at line 7636 of file SemaDeclCXX.cpp.
References clang::Qualifiers::Const, Diag(), clang::Type::getAs(), clang::QualType::getCVRQualifiers(), clang::Decl::getLocation(), clang::FunctionDecl::getParamDecl(), clang::CXXMethodDecl::getParent(), clang::ReferenceType::getPointeeType(), clang::ParmVarDecl::getSourceRange(), clang::ValueDecl::getType(), and clang::CXXMethodDecl::isUserProvided().
Referenced by checkTrivialSubobjectCall().
CXXMethodDecl * Sema::startLambdaDefinition | ( | CXXRecordDecl * | Class, |
SourceRange | IntroducerRange, | ||
TypeSourceInfo * | MethodType, | ||
SourceLocation | EndLoc, | ||
ArrayRef< ParmVarDecl *> | Params, | ||
ConstexprSpecKind | ConstexprKind, | ||
Optional< std::pair< unsigned, Decl *>> | Mangling = None |
||
) |
Start the definition of a lambda expression.
Definition at line 370 of file SemaLambda.cpp.
References clang::Type::castAs(), getGenericLambdaTemplateParameterList(), clang::FunctionType::getReturnType(), clang::TypeSourceInfo::getType(), and clang::DeclContext::isDependentContext().
void Sema::StartOpenMPClause | ( | OpenMPClauseKind | K | ) |
void Sema::StartOpenMPDSABlock | ( | OpenMPDirectiveKind | K, |
const DeclarationNameInfo & | DirName, | ||
Scope * | CurScope, | ||
SourceLocation | Loc | ||
) |
Called on start of new data sharing attribute block.
Definition at line 1955 of file SemaOpenMP.cpp.
References DSAStack.
Referenced by clang::TreeTransform< Derived >::TransformOMPExecutableDirective().
void Sema::startOpenMPLoop | ( | ) |
If the current region is a loop-based region, mark the start of the loop construct.
Definition at line 1863 of file SemaOpenMP.cpp.
References DSAStack, and clang::isOpenMPLoopDirective().
stripARCUnbridgedCast - Given an expression of ARCUnbridgedCast type, remove the placeholder cast.
Definition at line 4341 of file SemaExprObjC.cpp.
References clang::Expr::hasPlaceholderType().
Referenced by clang::OverloadCandidateSet::clear().
bool Sema::Subst | ( | const TemplateArgumentLoc * | Args, |
unsigned | NumArgs, | ||
TemplateArgumentListInfo & | Result, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 2908 of file SemaTemplateInstantiate.cpp.
Referenced by clang::TemplateDeclInstantiator::InstantiateClassTemplatePartialSpecialization(), clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), clang::TemplateDeclInstantiator::VisitFunctionDecl(), and clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl().
Substitute Replacement for auto
in TypeWithAuto
.
Definition at line 4571 of file SemaTemplateDeduction.cpp.
References clang::Type::containsUnexpandedParameterPack(), and clang::Type::isDependentType().
TypeSourceInfo * Sema::SubstAutoTypeSourceInfo | ( | TypeSourceInfo * | TypeWithAuto, |
QualType | Replacement | ||
) |
Substitute Replacement for auto in TypeWithAuto.
Definition at line 4582 of file SemaTemplateDeduction.cpp.
References clang::Type::containsUnexpandedParameterPack(), and clang::Type::isDependentType().
bool Sema::SubstBaseSpecifiers | ( | CXXRecordDecl * | Instantiation, |
CXXRecordDecl * | Pattern, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Perform substitution on the base class specifiers of the given class template specialization.
Produces a diagnostic and returns true on error, returns false and attaches the instantiated base classes to the class template specialization if successful.
Definition at line 1880 of file SemaTemplateInstantiate.cpp.
References AttachBaseSpecifiers(), clang::CXXRecordDecl::bases(), clang::C, CheckBaseSpecifier(), CheckParameterPacksForExpansion(), collectUnexpandedParameterPacks(), Context, clang::sema::instantiateTemplateAttribute(), clang::Decl::setInvalidDecl(), and SubstType().
Decl * Sema::SubstDecl | ( | Decl * | D, |
DeclContext * | Owner, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 3412 of file SemaTemplateInstantiateDecl.cpp.
References clang::Decl::isInvalidDecl(), and clang::declvisitor::Base< Ptr, ImplClass, RetTy >::Visit().
Referenced by ConvertDeducedTemplateArgument().
DeclarationNameInfo Sema::SubstDeclarationNameInfo | ( | const DeclarationNameInfo & | NameInfo, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Do template substitution on declaration name info.
Definition at line 2890 of file SemaTemplateInstantiate.cpp.
References clang::DeclarationNameInfo::getLoc(), and clang::DeclarationNameInfo::getName().
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
TemplateArgumentLoc Sema::SubstDefaultTemplateArgumentIfAvailable | ( | TemplateDecl * | Template, |
SourceLocation | TemplateLoc, | ||
SourceLocation | RAngleLoc, | ||
Decl * | Param, | ||
SmallVectorImpl< TemplateArgument > & | Converted, | ||
bool & | HasDefaultArg | ||
) |
If the given template parameter has a default template argument, substitute into that default template argument and return the corresponding template argument.
Definition at line 4769 of file SemaTemplate.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::getAs(), clang::TemplateTemplateParmDecl::getDefaultArgument(), clang::TemplateArgumentLoc::getTemplateNameLoc(), clang::TemplateArgumentLoc::getTemplateQualifierLoc(), clang::TypeSourceInfo::getType(), hasVisibleDefaultArgument(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::TemplateName::isNull(), and SubstDefaultTemplateArgument().
void Sema::SubstExceptionSpec | ( | FunctionDecl * | New, |
const FunctionProtoType * | Proto, | ||
const MultiLevelTemplateArgumentList & | Args | ||
) |
Definition at line 1733 of file SemaTemplateInstantiate.cpp.
References clang::EST_None, clang::FunctionProtoType::ExtProtoInfo::ExceptionSpec, clang::TypeLoc::getEndLoc(), clang::FunctionProtoType::getExtProtoInfo(), clang::TypeSourceInfo::getTypeLoc(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::FunctionProtoType::ExceptionSpecInfo::Type, and UpdateExceptionSpec().
Referenced by clang::TemplateDeclInstantiator::InitFunctionInstantiation().
bool Sema::SubstExceptionSpec | ( | SourceLocation | Loc, |
FunctionProtoType::ExceptionSpecInfo & | ESI, | ||
SmallVectorImpl< QualType > & | ExceptionStorage, | ||
const MultiLevelTemplateArgumentList & | Args | ||
) |
Definition at line 1721 of file SemaTemplateInstantiate.cpp.
References clang::EST_Uninstantiated, and clang::FunctionProtoType::ExceptionSpecInfo::Type.
ExprResult Sema::SubstExpr | ( | Expr * | E, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
bool Sema::SubstExprs | ( | ArrayRef< Expr *> | Exprs, |
bool | IsCall, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
SmallVectorImpl< Expr *> & | Outputs | ||
) |
Substitute the given template arguments into a list of expressions, expanding pack expansions if required.
Exprs | The list of expressions to substitute into. |
IsCall | Whether this is some form of call, in which case default arguments will be dropped. |
TemplateArgs | The set of template arguments to substitute. |
Outputs | Will receive all of the substituted arguments. |
Definition at line 2864 of file SemaTemplateInstantiate.cpp.
TypeSourceInfo * Sema::SubstFunctionDeclType | ( | TypeSourceInfo * | T, |
const MultiLevelTemplateArgumentList & | Args, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity, | ||
CXXRecordDecl * | ThisContext, | ||
Qualifiers | ThisTypeQuals | ||
) |
A form of SubstType intended specifically for instantiating the type of a FunctionDecl.
Its purpose is solely to force the instantiation of default-argument expressions and to avoid instantiating an exception-specification.
Definition at line 1679 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, Context, clang::TypeLoc::getAs(), clang::TypeLoc::getFullDataSize(), clang::TypeSourceInfo::getTypeLoc(), clang::TypeLocBuilder::getTypeSourceInfo(), clang::TypeLoc::IgnoreParens(), clang::QualType::isNull(), NeedsInstantiationAsFunctionType(), clang::TypeLocBuilder::reserve(), and clang::Result.
Referenced by clang::TemplateDeclInstantiator::SubstFunctionType().
ExprResult Sema::SubstInitializer | ( | Expr * | E, |
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
bool | CXXDirectInit | ||
) |
Definition at line 2855 of file SemaTemplateInstantiate.cpp.
Referenced by InstantiateInClassInitializer().
Sema::TemplateDeductionResult Sema::SubstituteExplicitTemplateArguments | ( | FunctionTemplateDecl * | FunctionTemplate, |
TemplateArgumentListInfo & | ExplicitTemplateArgs, | ||
SmallVectorImpl< DeducedTemplateArgument > & | Deduced, | ||
SmallVectorImpl< QualType > & | ParamTypes, | ||
QualType * | FunctionType, | ||
sema::TemplateDeductionInfo & | Info | ||
) |
Substitute the explicitly-provided template arguments into the given function template according to C++ [temp.arg.explicit].
FunctionTemplate | the function template into which the explicit template arguments will be substituted. |
ExplicitTemplateArgs | the explicitly-specified template arguments. |
Deduced | the deduced template arguments, which will be populated with the converted and checked explicit template arguments. |
ParamTypes | will be populated with the instantiated function parameters. |
FunctionType | if non-NULL, the result type of the function template will also be instantiated and the pointed-to value will be updated with the instantiated function type. |
Info | if substitution fails for any reason, this object will be populated with more information about the failure. |
Definition at line 2964 of file SemaTemplateDeduction.cpp.
References clang::FunctionTemplateDecl::getTemplatedDecl(), clang::TemplateDecl::getTemplateParameters(), clang::ValueDecl::getType(), P, clang::FunctionDecl::parameters(), clang::TemplateArgumentListInfo::size(), and Unevaluated.
NestedNameSpecifierLoc Sema::SubstNestedNameSpecifierLoc | ( | NestedNameSpecifierLoc | NNS, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 2878 of file SemaTemplateInstantiate.cpp.
References clang::NestedNameSpecifierLoc::getBeginLoc().
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), SubstDefaultTemplateArgument(), SubstQualifier(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
bool Sema::SubstParmTypes | ( | SourceLocation | Loc, |
ArrayRef< ParmVarDecl *> | Params, | ||
const FunctionProtoType::ExtParameterInfo * | ExtParamInfos, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
SmallVectorImpl< QualType > & | ParamTypes, | ||
SmallVectorImpl< ParmVarDecl *> * | OutParams, | ||
ExtParameterInfoBuilder & | ParamInfos | ||
) |
Substitute the given template arguments into the given set of parameters, producing the set of parameter types that would be generated from such a substitution.
Definition at line 1856 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts.
Referenced by clang::TemplateDeclInstantiator::SubstFunctionType().
ParmVarDecl * Sema::SubstParmVarDecl | ( | ParmVarDecl * | D, |
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
int | indexAdjustment, | ||
Optional< unsigned > | NumExpansions, | ||
bool | ExpectParameterPack | ||
) |
Definition at line 1747 of file SemaTemplateInstantiate.cpp.
References CheckPackExpansion(), CheckParameter(), clang::Type::containsUnexpandedParameterPack(), Context, CurContext, CurrentInstantiationScope, Diag(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::TypeLoc::getAs(), clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::ParmVarDecl::getDefaultArg(), clang::ParmVarDecl::getFunctionScopeDepth(), clang::ParmVarDecl::getFunctionScopeIndex(), clang::NamedDecl::getIdentifier(), clang::DeclaratorDecl::getInnerLocStart(), clang::Decl::getLocation(), clang::VarDecl::getStorageClass(), clang::ASTContext::getTranslationUnitDecl(), clang::TypeSourceInfo::getType(), clang::TypeSourceInfo::getTypeLoc(), clang::DeclaratorDecl::getTypeSourceInfo(), clang::ParmVarDecl::getUninstantiatedDefaultArg(), clang::ParmVarDecl::hasInheritedDefaultArg(), clang::ParmVarDecl::hasUninstantiatedDefaultArg(), clang::ParmVarDecl::hasUnparsedDefaultArg(), InstantiateAttrs(), clang::LocalInstantiationScope::InstantiatedLocal(), clang::LocalInstantiationScope::InstantiatedLocalPackArg(), clang::Decl::isLexicallyWithinFunctionOrMethod(), clang::VarDecl::isParameterPack(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::Type::isVoidType(), clang::Decl::setDeclContext(), clang::ParmVarDecl::setHasInheritedDefaultArg(), SetParamDefaultArgument(), clang::ParmVarDecl::setScopeInfo(), clang::ParmVarDecl::setUninstantiatedDefaultArg(), clang::ParmVarDecl::setUnparsedDefaultArg(), SubstExpr(), SubstType(), and UnparsedDefaultArgInstantiations.
Referenced by clang::TemplateDeclInstantiator::VisitCXXMethodDecl().
StmtResult Sema::SubstStmt | ( | Stmt * | S, |
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 2834 of file SemaTemplateInstantiate.cpp.
TemplateName Sema::SubstTemplateName | ( | NestedNameSpecifierLoc | QualifierLoc, |
TemplateName | Name, | ||
SourceLocation | Loc, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 2898 of file SemaTemplateInstantiate.cpp.
References clang::CXXScopeSpec::Adopt().
Referenced by SubstDefaultTemplateArgument().
TemplateParameterList * Sema::SubstTemplateParams | ( | TemplateParameterList * | Params, |
DeclContext * | Owner, | ||
const MultiLevelTemplateArgumentList & | TemplateArgs | ||
) |
Definition at line 3458 of file SemaTemplateInstantiateDecl.cpp.
References clang::TemplateDeclInstantiator::SubstTemplateParams().
TypeSourceInfo * Sema::SubstType | ( | TypeSourceInfo * | T, |
const MultiLevelTemplateArgumentList & | Args, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity, | ||
bool | AllowDeducedTST = false |
||
) |
Perform substitution on the type T with a given set of template arguments.
This routine substitutes the given template arguments into the type T and produces the instantiated type.
T | the type into which the template arguments will be substituted. If this type is not dependent, it will be returned immediately. |
Args | the template arguments that will be substituted for the top-level template parameters within T. |
Loc | the location in the source code where this substitution is being performed. It will typically be the location of the declarator (if we're instantiating the type of some declaration) or the location of the type in the source code (if, e.g., we're instantiating the type of a cast expression). |
Entity | the name of the entity associated with a declaration being instantiated (if any). May be empty to indicate that there is no such entity (if, e.g., this is a type that occurs as part of a cast expression) or that the entity has no name (e.g., an unnamed function parameter). |
AllowDeducedTST | Whether a DeducedTemplateSpecializationType is acceptable as the top level type of the result. |
Definition at line 1588 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, clang::TypeSourceInfo::getType(), clang::Type::isInstantiationDependentType(), and clang::Type::isVariablyModifiedType().
Referenced by ConvertDeducedTemplateArgument(), clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization(), SubstBaseSpecifiers(), SubstDefaultTemplateArgument(), SubstParmVarDecl(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), clang::TemplateDeclInstantiator::VisitVarDecl(), and clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl().
QualType Sema::SubstType | ( | QualType | T, |
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity | ||
) |
Deprecated form of the above.
Definition at line 1637 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, clang::Type::isInstantiationDependentType(), and clang::Type::isVariablyModifiedType().
TypeSourceInfo * Sema::SubstType | ( | TypeLoc | TL, |
const MultiLevelTemplateArgumentList & | TemplateArgs, | ||
SourceLocation | Loc, | ||
DeclarationName | Entity | ||
) |
Definition at line 1606 of file SemaTemplateInstantiate.cpp.
References CodeSynthesisContexts, Context, clang::TypeLoc::getFullDataSize(), clang::TypeLoc::getType(), clang::TypeLocBuilder::getTypeSourceInfo(), clang::Type::isInstantiationDependentType(), clang::QualType::isNull(), clang::Type::isVariablyModifiedType(), clang::TypeLocBuilder::pushFullCopy(), clang::TypeLocBuilder::reserve(), and clang::Result.
Sema::DeviceDiagBuilder Sema::targetDiag | ( | SourceLocation | Loc, |
unsigned | DiagID | ||
) |
Definition at line 1538 of file Sema.cpp.
References CUDADiagIfDeviceCode(), CUDADiagIfHostCode(), clang::Sema::DeviceDiagBuilder::DeviceDiagBuilder(), diagIfOpenMPDeviceCode(), getCurFunctionDecl(), getLangOpts(), clang::Sema::DeviceDiagBuilder::K_Immediate, and LangOpts.
bool Sema::TemplateParameterListsAreEqual | ( | TemplateParameterList * | New, |
TemplateParameterList * | Old, | ||
bool | Complain, | ||
TemplateParameterListEqualKind | Kind, | ||
SourceLocation | TemplateArgLoc = SourceLocation() |
||
) |
Determine whether the given template parameter lists are equivalent.
New | The new template parameter list, typically written in the source code as part of a new template declaration. |
Old | The old template parameter list, typically found via name lookup of the template declared with this template parameter list. |
Complain | If true, this routine will produce a diagnostic if the template parameter lists are not equivalent. |
Kind | describes how we are to match the template parameter lists. |
TemplateArgLoc | If this source location is valid, then we are actually checking the template parameter list of a template argument (New) against the template parameter list of its corresponding template template parameter (Old). We produce slightly different diagnostics in this scenario. |
Definition at line 7265 of file SemaTemplate.cpp.
References clang::TemplateParameterList::begin(), DiagnoseTemplateParameterListArityMismatch(), clang::TemplateParameterList::end(), MatchTemplateParameterKind(), and clang::TemplateParameterList::size().
Referenced by clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), and MatchTemplateParameterKind().
ExprResult Sema::TemporaryMaterializationConversion | ( | Expr * | E | ) |
If E
is a prvalue denoting an unmaterialized temporary, materialize it as an xvalue.
In C++98, the result will still be a prvalue, because we don't have xvalues there.
Definition at line 7342 of file SemaInit.cpp.
References clang::ExprError(), clang::Expr::getExprLoc(), clang::Expr::getType(), and clang::Expr::isRValue().
Referenced by CheckPointerToMemberOperands().
|
inlinestatic |
To be used for checking whether the arguments being passed to function exceeds the number of parameters expected for it.
Definition at line 11157 of file Sema.h.
Referenced by checkDirectCallValidity().
ExprResult Sema::TransformToPotentiallyEvaluated | ( | Expr * | E | ) |
Definition at line 14704 of file SemaExpr.cpp.
void Sema::translateTemplateArguments | ( | const ASTTemplateArgsPtr & | TemplateArgsIn, |
TemplateArgumentListInfo & | TemplateArgs | ||
) |
Translates template arguments as provided by the parser into template arguments used by semantic analysis.
Definition at line 918 of file SemaTemplate.cpp.
References clang::TemplateArgumentListInfo::addArgument(), clang::Last, and translateTemplateArgument().
Referenced by makeTemplateArgumentListInfo().
ObjCMethodDecl * Sema::tryCaptureObjCSelf | ( | SourceLocation | Loc | ) |
Try to capture an implicit reference to 'self'.
Definition at line 1264 of file SemaExprObjC.cpp.
References clang::ObjCMethodDecl::getSelfDecl().
void Sema::tryCaptureOpenMPLambdas | ( | ValueDecl * | V | ) |
Function tries to capture lambda's captured variables in the OpenMP region before the original lambda is captured.
Definition at line 3355 of file SemaOpenMP.cpp.
References DSAStack, clang::DeclContext::Encloses(), clang::Type::getAsCXXRecordDecl(), clang::QualType::getCanonicalType(), clang::Decl::getDeclContext(), clang::QualType::getNonReferenceType(), clang::ValueDecl::getType(), clang::QualType::isNull(), clang::isOpenMPTargetDataManagementDirective(), clang::isOpenMPTargetExecutionDirective(), clang::LCK_ByRef, and clang::LCK_This.
Referenced by MarkVarDeclODRUsed().
bool Sema::tryCaptureVariable | ( | VarDecl * | Var, |
SourceLocation | Loc, | ||
TryCaptureKind | Kind, | ||
SourceLocation | EllipsisLoc, | ||
bool | BuildAndDiagnose, | ||
QualType & | CaptureType, | ||
QualType & | DeclRefType, | ||
const unsigned *const | FunctionScopeIndexToStopAt | ||
) |
Try to capture the given variable.
Var | The variable to capture. |
Loc | The location at which the capture occurs. |
Kind | The kind of capture, which may be implicit (for either a block or a lambda), or explicit by-value or by-reference (for a lambda). |
EllipsisLoc | The location of the ellipsis, if one is provided in an explicit lambda capture. |
BuildAndDiagnose | Whether we are actually supposed to add the captures or diagnose errors. If false, this routine merely check whether the capture can occur without performing the capture itself or complaining if the variable cannot be captured. |
CaptureType | Will be set to the type of the field used to capture this variable in the innermost block or lambda. Only valid when the variable can be captured. |
DeclRefType | Will be set to the type of a reference to the capture from within the current scope. Only valid when the variable can be captured. |
FunctionScopeIndexToStopAt | If non-null, it points to the index of the FunctionScopeInfo stack beyond which we do not attempt to capture. This is useful when enclosing lambdas must speculatively capture variables that may or may not be used in certain specializations of a nested generic lambda. |
Definition at line 15635 of file SemaExpr.cpp.
References captureVariablyModifiedType(), Diag(), diagnoseUncapturableValueReference(), clang::TypeDecl::getBeginLoc(), clang::VarDecl::getCanonicalDecl(), clang::sema::CapturingScopeInfo::getCapture(), clang::Decl::getDeclContext(), clang::NamedDecl::getDeclName(), clang::getLambdaAwareParentOfDeclContext(), clang::Decl::getLocation(), clang::QualType::getNonReferenceType(), clang::DeclContext::getParent(), getParentOfCapturingContextOrNull(), clang::ValueDecl::getType(), clang::VarDecl::hasLocalStorage(), clang::sema::CapturingScopeInfo::ImpCap_None, clang::sema::CapturingScopeInfo::ImpCaptureStyle, clang::isGenericLambdaCallOperatorSpecialization(), clang::VarDecl::isInitCapture(), isVariableAlreadyCapturedInScopeInfo(), clang::Type::isVariablyModifiedType(), clang::sema::LambdaScopeInfo::Lambda, and clang::sema::Capture::markUsed().
Referenced by MarkVarDeclODRUsed().
bool Sema::tryCaptureVariable | ( | VarDecl * | Var, |
SourceLocation | Loc, | ||
TryCaptureKind | Kind = TryCapture_Implicit , |
||
SourceLocation | EllipsisLoc = SourceLocation() |
||
) |
Try to capture the given variable.
Definition at line 15841 of file SemaExpr.cpp.
bool Sema::tryExprAsCall | ( | Expr & | E, |
QualType & | ZeroArgCallReturnTy, | ||
UnresolvedSetImpl & | OverloadSet | ||
) |
Figure out if an expression could be turned into a call.
Use this when trying to recover from an error where the programmer may have written just the name of a function instead of actually calling it.
E | - The expression to examine. |
ZeroArgCallReturnTy | - If the expression can be turned into a call with no arguments, this parameter is set to the type returned by such a call; otherwise, it is set to an empty QualType. |
OverloadSet | - If the expression is an overloaded function name, this parameter is populated with the decls of the various overloads. |
Definition at line 1880 of file Sema.cpp.
References clang::UnresolvedSetImpl::addDecl(), clang::ASTContext::BoundMemberTy, BuildCallToMemberFunction(), clang::UnresolvedSetImpl::clear(), Context, clang::OverloadExpr::decls_begin(), clang::OverloadExpr::decls_end(), clang::OverloadExpr::FindResult::Expression, clang::OverloadExpr::find(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Type::getAs(), getDiagnostics(), clang::Type::getPointeeType(), clang::FunctionType::getReturnType(), clang::DiagnosticsEngine::getSuppressAllDiagnostics(), clang::Expr::getType(), clang::OverloadExpr::FindResult::HasFormOfMemberPointer, clang::Expr::IgnoreParens(), clang::QualType::isNull(), clang::Expr::isTypeDependent(), clang::ActionResult< PtrTy, CompressInvalid >::isUsable(), clang::ASTContext::OverloadTy, and clang::DiagnosticsEngine::setSuppressAllDiagnostics().
Referenced by tryToRecoverWithCall().
ImplicitConversionSequence Sema::TryImplicitConversion | ( | Expr * | From, |
QualType | ToType, | ||
bool | SuppressUserConversions, | ||
bool | AllowExplicit, | ||
bool | InOverloadResolution, | ||
bool | CStyle, | ||
bool | AllowObjCWritebackConversion | ||
) |
Definition at line 1396 of file SemaOverload.cpp.
References TryImplicitConversion().
Referenced by TryReferenceInitializationCore().
bool Sema::tryResolveExplicitSpecifier | ( | ExplicitSpecifier & | ExplicitSpec | ) |
tryResolveExplicitSpecifier - Attempt to resolve the explict specifier.
Returns true if the explicit specifier is now resolved.
Definition at line 10877 of file SemaDeclCXX.cpp.
References CheckConvertedConstantExpression(), clang::ExplicitSpecifier::getExpr(), and clang::Result.
bool Sema::tryToRecoverWithCall | ( | ExprResult & | E, |
const PartialDiagnostic & | PD, | ||
bool | ForceComplain = false , |
||
bool(*)(QualType) | IsPlausibleResult = nullptr |
||
) |
Try to recover by turning the given expression into a call.
Returns true if recovery was attempted or an error was emitted; this may also leave the ExprResult invalid.
Definition at line 2062 of file Sema.cpp.
References BuildCallExpr(), clang::FixItHint::CreateInsertion(), Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::SourceRange::getEnd(), getLocForEndOfToken(), clang::SourceLocation::getLocWithOffset(), IsCallableWithAppend(), IsCPUDispatchCPUSpecificMultiVersion(), clang::QualType::isNull(), notePlausibleOverloads(), and tryExprAsCall().
Referenced by LookupMemberExpr().
bool Sema::UnifySection | ( | StringRef | SectionName, |
int | SectionFlags, | ||
DeclaratorDecl * | TheDecl | ||
) |
Definition at line 344 of file SemaAttr.cpp.
References Context, Diag(), clang::Decl::getAttr(), clang::Decl::getLocation(), clang::ASTContext::PSF_Implicit, and clang::ASTContext::SectionInfos.
Referenced by ActOnPragmaMSSection().
bool Sema::UnifySection | ( | StringRef | SectionName, |
int | SectionFlags, | ||
SourceLocation | PragmaSectionLocation | ||
) |
Definition at line 371 of file SemaAttr.cpp.
References Context, Diag(), clang::ASTContext::PSF_Implicit, and clang::ASTContext::SectionInfos.
void Sema::UnmarkAsLateParsedTemplate | ( | FunctionDecl * | FD | ) |
Definition at line 10310 of file SemaTemplate.cpp.
References clang::FunctionDecl::setLateTemplateParsed().
void clang::Sema::UpdateExceptionSpec | ( | FunctionDecl * | FD, |
const FunctionProtoType::ExceptionSpecInfo & | ESI | ||
) |
Definition at line 221 of file SemaExceptionSpec.cpp.
References clang::ASTContext::adjustExceptionSpec(), Context, getASTMutationListener(), clang::isUnresolvedExceptionSpec(), clang::Redeclarable< decl_type >::redecls(), and clang::FunctionProtoType::ExceptionSpecInfo::Type.
Referenced by SubstExceptionSpec().
void Sema::updateOutOfDateSelector | ( | Selector | Sel | ) |
Definition at line 3393 of file SemaDeclObjC.cpp.
References addMethodToGlobalList(), clang::Decl::getDeclContext(), clang::ObjCMethodDecl::getSelector(), MethodPool, ReadMethodPool(), and clang::ObjCMethodDecl::setDefined().
Referenced by AddLazyVectorDecls().
bool Sema::UseArgumentDependentLookup | ( | const CXXScopeSpec & | SS, |
const LookupResult & | R, | ||
bool | HasTrailingLParen | ||
) |
Definition at line 2803 of file SemaExpr.cpp.
References clang::FunctionDecl::getBuiltinID(), clang::Decl::isImplicit(), and clang::CXXScopeSpec::isSet().
bool Sema::usesPartialOrExplicitSpecialization | ( | SourceLocation | Loc, |
ClassTemplateSpecializationDecl * | ClassTemplateSpec | ||
) |
Definition at line 2405 of file SemaTemplateInstantiate.cpp.
References clang::CXXRecordDecl::getTemplateSpecializationKind(), and clang::TSK_ExplicitSpecialization.
QualType Sema::UsualArithmeticConversions | ( | ExprResult & | LHS, |
ExprResult & | RHS, | ||
bool | IsCompAssign = false |
||
) |
UsualArithmeticConversions - Performs various conversions that are common to binary operators (C99 6.3.1.8).
If both operands aren't arithmetic, this routine returns the first non-arithmetic type found. The client is responsible for emitting appropriate error diagnostics.
Definition at line 1338 of file SemaExpr.cpp.
References clang::ActionResult< PtrTy, CompressInvalid >::get(), and clang::ActionResult< PtrTy, CompressInvalid >::isInvalid().
Referenced by checkArithmeticOrEnumeralCompare(), checkArithmeticOrEnumeralThreeWayCompare(), and CXXCheckConditionalOperands().
ExprResult Sema::UsualUnaryConversions | ( | Expr * | E | ) |
UsualUnaryConversions - Performs various conversions that are common to most operators (C99 6.3).
The conversions of array and function types are sometimes suppressed. For example, the array->pointer conversion doesn't apply if the array is an argument to the sizeof or address (&) operators. In these instances, this routine should not be called.
Definition at line 689 of file SemaExpr.cpp.
References clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Expr::getType(), clang::Type::isHalfType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), and clang::QualType::isNull().
Referenced by CheckIndirectionOperand(), and checkVectorShift().
ExprResult Sema::VerifyBitField | ( | SourceLocation | FieldLoc, |
IdentifierInfo * | FieldName, | ||
QualType | FieldTy, | ||
bool | IsMsStruct, | ||
Expr * | BitWidth, | ||
bool * | ZeroWidth = nullptr |
||
) |
VerifyBitField - verifies that a bit field expression is an ICE and has the correct width, and that the field type is valid.
Returns false on success. Can optionally return whether the bit-field is of width 0
Definition at line 15579 of file SemaDecl.cpp.
References Diag(), clang::ExprError(), clang::ActionResult< PtrTy, CompressInvalid >::get(), clang::Stmt::getSourceRange(), clang::Type::isDependentType(), clang::Type::isIntegralOrEnumerationType(), clang::ActionResult< PtrTy, CompressInvalid >::isInvalid(), clang::Expr::isTypeDependent(), and clang::Expr::isValueDependent().
ExprResult Sema::VerifyIntegerConstantExpression | ( | Expr * | E, |
llvm::APSInt * | Result, | ||
VerifyICEDiagnoser & | Diagnoser, | ||
bool | AllowFold = true |
||
) |
VerifyIntegerConstantExpression - Verifies that an expression is an ICE, and reports the appropriate diagnostics.
Returns false on success. Can optionally return the value of the expression.
Definition at line 14526 of file SemaExpr.cpp.
References clang::frontend::CPlusPlus11, and clang::Stmt::getBeginLoc().
Referenced by ActOnCXXNew(), ActOnNoexceptSpec(), EvaluateArrayTypeTrait(), and isTupleLike().
ExprResult Sema::VerifyIntegerConstantExpression | ( | Expr * | E, |
llvm::APSInt * | Result, | ||
unsigned | DiagID, | ||
bool | AllowFold = true |
||
) |
Definition at line 14501 of file SemaExpr.cpp.
ExprResult Sema::VerifyIntegerConstantExpression | ( | Expr * | E, |
llvm::APSInt * | Result = nullptr |
||
) |
Definition at line 14489 of file SemaExpr.cpp.
void Sema::WarnConflictingTypedMethods | ( | ObjCMethodDecl * | Method, |
ObjCMethodDecl * | MethodDecl, | ||
bool | IsProtocolMethodDecl | ||
) |
Definition at line 2549 of file SemaDeclObjC.cpp.
References checkMethodFamilyMismatch(), CheckMethodOverrideParam(), CheckMethodOverrideReturn(), Diag(), getLangOpts(), clang::Decl::getLocation(), clang::ObjCMethodDecl::isVariadic(), clang::ObjCMethodDecl::param_begin(), and clang::ObjCMethodDecl::param_end().
Referenced by MatchAllMethodDeclarations().
void Sema::WarnExactTypedMethods | ( | ObjCMethodDecl * | ImpMethodDecl, |
ObjCMethodDecl * | MethodDecl, | ||
bool | IsProtocolMethodDecl | ||
) |
WarnExactTypedMethods - This routine issues a warning if method implementation declaration matches exactly that of its declaration.
Definition at line 2600 of file SemaDeclObjC.cpp.
References CheckMethodOverrideParam(), CheckMethodOverrideReturn(), Context, Diag(), clang::NamedDecl::getDeclName(), clang::ObjCMethodDecl::getImplementationControl(), clang::Decl::getLocation(), clang::GetNullarySelector(), clang::ObjCMethodDecl::getSelector(), clang::Decl::hasAttr(), clang::ObjCMethodDecl::isClassMethod(), clang::ObjCMethodDecl::isVariadic(), clang::ast_matchers::match(), clang::ObjCMethodDecl::Optional, clang::ObjCMethodDecl::param_begin(), and clang::ObjCMethodDecl::param_end().
Referenced by MatchAllMethodDeclarations().
void Sema::WarnOnPendingNoDerefs | ( | ExpressionEvaluationContextRecord & | Rec | ) |
Emit a warning for all pending noderef expressions that we recorded.
Definition at line 14762 of file SemaExpr.cpp.
References Diag(), clang::DeclRefExpr::getDecl(), clang::Expr::getExprLoc(), clang::Decl::getLocation(), clang::NamedDecl::getName(), clang::Stmt::getSourceRange(), and clang::Sema::ExpressionEvaluationContextRecord::PossibleDerefs.
|
inline |
|
friend |
|
friend |
bool clang::Sema::AccessCheckingSFINAE |
When true, access checking violations are treated as SFINAE failures rather than hard errors.
Definition at line 6361 of file Sema.h.
Referenced by EmitCurrentDiagnostic(), clang::Sema::SFINAETrap::SFINAETrap(), and clang::Sema::SFINAETrap::~SFINAETrap().
bool clang::Sema::AllowAbstractFieldReference |
sema::AnalysisBasedWarnings clang::Sema::AnalysisWarnings |
Worker object for performing CFG-based warnings.
Definition at line 7932 of file Sema.h.
Referenced by PopFunctionScopeInfo(), and PrintStats().
int clang::Sema::ArgumentPackSubstitutionIndex |
The current index into pack expansion arguments that will be used for substitution of parameter packs.
The pack expansion index will be -1 to indicate that parameter packs should be instantiated as themselves. Otherwise, the index specifies which argument within the parameter pack will be used for substitution.
Definition at line 7649 of file Sema.h.
Referenced by clang::TreeTransform< Derived >::AlwaysRebuild(), clang::Sema::ArgumentPackSubstitutionIndexRAII::ArgumentPackSubstitutionIndexRAII(), and clang::Sema::ArgumentPackSubstitutionIndexRAII::~ArgumentPackSubstitutionIndexRAII().
ObjCMethodDecl* clang::Sema::ArrayWithObjectsMethod |
PragmaStack<StringLiteral *> clang::Sema::BSSSegStack |
Definition at line 521 of file Sema.h.
Referenced by clang::Sema::PragmaStackSentinelRAII::~PragmaStackSentinelRAII().
llvm::BumpPtrAllocator clang::Sema::BumpAlloc |
Definition at line 1161 of file Sema.h.
Referenced by PrintStats().
std::unique_ptr<sema::FunctionScopeInfo> clang::Sema::CachedFunctionScope |
Definition at line 598 of file Sema.h.
Referenced by PushFunctionScope().
RecordDecl* clang::Sema::CFError = nullptr |
The struct behind the CFErrorRef pointer.
Definition at line 11119 of file Sema.h.
Referenced by classifyPointerDeclarator().
CleanupInfo clang::Sema::Cleanup |
Used to control the generation of ExprWithCleanups.
Definition at line 583 of file Sema.h.
Referenced by checkIndirectCopyRestoreSource(), MaybeBindToTemporary(), MaybeCreateExprWithCleanups(), MaybeCreateStmtWithCleanups(), and clang::InitializationSequence::Perform().
CodeCompleteConsumer* clang::Sema::CodeCompleter |
Code-completion consumer.
Definition at line 383 of file Sema.h.
Referenced by AddRecordMembersCompletionResults(), and ProduceSignatureHelp().
PragmaStack<StringLiteral *> clang::Sema::CodeSegStack |
Definition at line 523 of file Sema.h.
Referenced by clang::Sema::PragmaStackSentinelRAII::~PragmaStackSentinelRAII().
SmallVector<Module*, 16> clang::Sema::CodeSynthesisContextLookupModules |
Extra modules inspected when performing a lookup during a template instantiation.
Computed lazily.
Definition at line 7595 of file Sema.h.
Referenced by popCodeSynthesisContext().
SmallVector<CodeSynthesisContext, 16> clang::Sema::CodeSynthesisContexts |
List of active code synthesis contexts.
This vector is treated as a stack. As synthesis of one entity requires synthesis of another, additional contexts are pushed onto the stack.
Definition at line 7584 of file Sema.h.
Referenced by clang::Sema::InstantiatingTemplate::Clear(), getCurBlock(), getCurLambda(), clang::TemplateDeclInstantiator::InitFunctionInstantiation(), isSFINAEContext(), popCodeSynthesisContext(), PrintInstantiationStack(), pushCodeSynthesisContext(), SubstFunctionDeclType(), SubstParmTypes(), and SubstType().
bool clang::Sema::CollectStats |
Flag indicating whether or not to collect detailed statistics.
Definition at line 380 of file Sema.h.
Referenced by clang::sema::AnalysisBasedWarnings::IssueWarnings().
PragmaStack<StringLiteral *> clang::Sema::ConstSegStack |
Definition at line 522 of file Sema.h.
Referenced by clang::Sema::PragmaStackSentinelRAII::~PragmaStackSentinelRAII().
ASTConsumer& clang::Sema::Consumer |
Definition at line 375 of file Sema.h.
Referenced by ActOnPragmaMSComment(), assignInheritanceModel(), Initialize(), InstantiateClassMembers(), ReferenceDllExportedMembers(), and ~Sema().
ASTContext& clang::Sema::Context |
Definition at line 374 of file Sema.h.
Referenced by ActOnArrayTypeTrait(), ActOnComment(), ActOnCompatibilityAlias(), ActOnCXXDelete(), ActOnCXXGlobalScopeSpecifier(), ActOnCXXNestedNameSpecifierDecltype(), ActOnCXXNew(), ActOnCXXTypeConstructExpr(), ActOnDecltypeExpression(), ActOnFinishFullExpr(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), ActOnPragmaMSComment(), ActOnPragmaOptionsAlign(), ActOnPragmaPack(), ActOnPseudoDestructorExpr(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), ActOnStartOfObjCMethodDef(), ActOnStartProtocolInterface(), ActOnTypeTrait(), AddAlignmentAttributesForRecord(), AddCFAuditedAttribute(), AddLazyVectorDecls(), AddMsStructLayoutForRecord(), AddOptnoneAttributeIfNoConflicts(), AddSuperSendCompletion(), AdjustFunctionParmAndArgTypesForDeduction(), AnalyzeBitFieldAssignment(), AnalyzeComparison(), attemptRecovery(), attributeParsedArgsUnevaluated(), BuildAddressSpaceIndex(), BuildArrayTypeTrait(), BuildCookedLiteralOperatorCall(), buildCounterInit(), buildCounterUpdate(), BuildCXXNoexceptExpr(), BuildCXXThisExpr(), BuildCXXTypeConstructExpr(), buildDeclareReductionRef(), BuildExpressionTrait(), BuildFloatingLiteral(), BuildImplicitBaseInitializer(), BuildImplicitMemberInitializer(), buildMemcpyForAssignmentOp(), BuildMSPropertyRefExpr(), buildPostUpdate(), BuildPseudoDestructorExpr(), buildSingleCopyAssign(), BuildTypeTrait(), buildUserDefinedMapperRef(), buildVarDecl(), canConvertIntToOtherIntTy(), canConvertIntTyToFloatTy(), canPassInRegisters(), clang::canTypeidThrow(), castForMoving(), CastForMoving(), CastsAwayConstness(), CheckAllocatedType(), checkAllowedCUDAInitializer(), CheckARCMethodDecl(), checkArithmeticOrEnumeralCompare(), checkArithmeticOrEnumeralThreeWayCompare(), checkBlockPointerTypesForAssignment(), CheckBoolLikeConversion(), checkBuiltinArgument(), checkComplexDecomposition(), checkConditionalBlockPointerCompatibility(), checkConditionalNullPointer(), checkConditionalObjectPointersCompatibility(), checkConditionalPointerCompatibility(), checkConditionalVoidType(), CheckConvertedConstantExpression(), CheckCXXBooleanCondition(), checkEnumComparison(), CheckEquivalentExceptionSpec(), clang::CheckEquivalentExceptionSpecImpl(), checkEscapingByref(), CheckFormatString(), checkFormatStringExpr(), CheckForModifiableLvalue(), checkForMultipleExportedDefaultConstructors(), CheckForNullPointerDereference(), CheckForReference(), CheckImplementationIvars(), CheckImplicitConversion(), CheckIncrementDecrementOperand(), checkIndirectCopyRestoreSource(), CheckIndirectionOperand(), checkInitMethod(), checkIntToPointerCast(), CheckKeyForObjCARCConversion(), checkLiteralOperatorTemplateParameterList(), checkMemberDecomposition(), CheckMoveOnConstruction(), CheckNonNullArguments(), CheckNonNullExpr(), checkNullabilityConsistency(), checkNullabilityTypeSpecifier(), CheckObjCBridgeCFCast(), CheckObjCBridgeNSCast(), CheckObjCCollectionLiteralElement(), checkObjCKindOfType(), CheckObjCMethodOverride(), checkObjCPointerTypesForAssignment(), CheckObjCPropertyAttributes(), checkOpenCLEnqueueLocalSizeArgs(), checkOpenCLPipePacketType(), checkOpenMPLoop(), CheckOperatorDeleteDeclaration(), CheckOperatorNewDeclaration(), CheckOperatorNewDeleteTypes(), CheckPointerToMemberOperands(), checkPointerTypesForAssignment(), checkSimdlenSafelenSpecified(), CheckSpecifiedExceptionType(), CheckTautologicalComparison(), CheckTemplateArgumentAddressOfObjectOrFunction(), CheckTemplateArgumentIsCompatibleWithParameter(), CheckTemplateArgumentPointerToMember(), checkThreeWayNarrowingConversion(), checkTrivialClassMembers(), checkTupleLikeDecomposition(), checkTypeMappable(), checkVAStartABI(), checkVectorDecomposition(), checkVectorResult(), checkVectorShift(), CloneDesignatedInitExpr(), CollectFieldInitializer(), CompareDerivedToBaseConversions(), compareOverloads(), CompareQualificationConversions(), CompareStandardConversionSequences(), computeDeclContext(), ComputeDefaultedSpecialMemberExceptionSpec(), convertArgsForAvailabilityChecks(), ConvertDeducedTemplateArgument(), convertVector(), CopyObject(), CUDASetLambdaAttrs(), CXXCheckConditionalOperands(), DeclareGlobalNewDelete(), DeduceFromInitializerList(), DeduceNonTypeTemplateArgument(), DeduceNullPtrTemplateArgument(), clang::deduceOpenCLPointeeAddrSpace(), DeduceTemplateArguments(), DeduceTemplateArguments(), DeduceTemplateArgumentsByTypeMatch(), defaultedSpecialMemberIsConstexpr(), diagnoseArithmeticOnTwoFunctionPointers(), diagnoseArrayStarInParamType(), DiagnoseBadDivideOrRemainderValues(), DiagnoseBadFunctionCast(), DiagnoseBadShiftValues(), DiagnoseBaseOrMemInitializerOrder(), DiagnoseCallingConvCast(), DiagnoseCastOfObjCSEL(), DiagnoseFloatingImpCast(), DiagnoseForRangeConstVariableCopies(), DiagnoseForRangeReferenceVariableCopies(), diagnoseListInit(), DiagnoseNarrowingInInitList(), diagnoseNoViableConversion(), diagnoseNullableToNonnullConversion(), DiagnoseNullConversion(), diagnoseObjCARCConversion(), DiagnosePropertyAccessorMismatch(), DiagnosePropertyMismatch(), DiagnoseReinterpretUpDownCast(), diagnoseTautologicalComparison(), DiagnoseTwoPhaseOperatorLookup(), DiagnoseUninitializedUse(), doesUsualArrayDeleteWantSize(), DoMarkVarDeclReferenced(), EmitCurrentDiagnostic(), emitReplacement(), EvaluateArrayTypeTrait(), EvaluateBinaryTypeTrait(), evaluateTypeTrait(), EvaluateUnaryTypeTrait(), ExpandAnonymousFieldDesignator(), FindAllocationFunctions(), FindBaseInitializer(), findCapturingExpr(), FindCompositePointerType(), FindProtocolDeclaration(), fitsInto(), getCastAwayConstnessCastKind(), getCCForDeclaratorChunk(), clang::TypoCorrectionConsumer::getCorrectionValidator(), getCudaConfigureFuncName(), GetDeclSpecTypeForDeclarator(), getDecltypeForExpr(), clang::getDeclUsageType(), getFloat128Identifier(), getGenericLambdaTemplateParameterList(), getImplicitMethodEPI(), getParamType(), getPreviousDeclForInstantiation(), getSuperIdentifier(), getTrivialIntegralTemplateArgument(), getTupleLikeElementType(), GetTypeOfFunction(), GetTypeSourceInfoForDeclarator(), HandleAddressSpaceTypeAttribute(), handleFixedPointConversion(), handleFunctionTypeAttr(), handleIntegerConversion(), handleMSPointerTypeQualifierAttr(), HandleNeonVectorTypeAttr(), handleObjCGCTypeAttr(), handleObjCOwnershipTypeAttr(), HandleOpenCLAccessAttr(), handlerCanCatch(), hasDeducibleTemplateParameters(), IgnoredValueConversions(), ImpCastExprToType(), inferARCWriteback(), inferCUDATargetForImplicitSpecialMember(), clang::TemplateDeclInstantiator::InitFunctionInstantiation(), Initialize(), clang::InitializationSequence::InitializeFrom(), InstantiateClassMembers(), clang::TemplateDeclInstantiator::InstantiateClassTemplatePartialSpecialization(), InstantiateEnum(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), InstantiateInClassInitializer(), clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), clang::TemplateDeclInstantiator::InstantiateVarTemplatePartialSpecialization(), clang::TreeTransform< Derived >::InventTypeSourceInfo(), isAcceptableNestedNameSpecifier(), isArithmeticArgumentPromotion(), isAtLeastAsSpecializedAs(), IsImplicitBoolFloatConversion(), IsInitializerListConstructorConversion(), isLibstdcxxEagerExceptionSpecHack(), isNonNegativeIntegerValue(), isNonPlacementDeallocationFunction(), isNullPointerValueTemplateArgument(), isObjCReceiverType(), isPermittedNeonBaseType(), IsStandardConversion(), IsStringLiteralToNonConstPointerConversion(), isTupleLike(), IsUserDefinedConversion(), IsVectorConversion(), LookupDirect(), LookupMemberExpr(), LookupMethodInReceiverType(), lookupStdTypeTraitMember(), LookupVisibleDecls(), makeUnavailableInSystemHeader(), MarkVarDeclODRUsed(), MatchTemplateParameterKind(), maybeAddCUDAHostDeviceAttrs(), MaybeBindToTemporary(), MaybeCreateExprWithCleanups(), MaybeCreateStmtWithCleanups(), mergeExceptionSpecs(), noteMemberDeclaredHere(), OpenCLArithmeticConversions(), OpenCLConvertScalarsToVectors(), PDiag(), clang::InitializationSequence::Perform(), PerformConstructorInitialization(), PerformImplicitConversion(), ProcessPropertyDecl(), PushCapturedRegionScope(), clang::TreeTransform< Derived >::RebuildAtomicExpr(), clang::TreeTransform< Derived >::RebuildAutoType(), clang::TreeTransform< Derived >::RebuildDeducedTemplateSpecializationType(), clang::TreeTransform< Derived >::RebuildDependentNameType(), clang::TreeTransform< Derived >::RebuildDependentTemplateSpecializationType(), clang::TreeTransform< Derived >::RebuildElaboratedType(), clang::TreeTransform< Derived >::RebuildEnumType(), clang::TreeTransform< Derived >::RebuildImplicitValueInitExpr(), clang::TreeTransform< Derived >::RebuildMacroQualifiedType(), clang::TreeTransform< Derived >::RebuildRecordType(), clang::TreeTransform< Derived >::RebuildShuffleVectorExpr(), clang::TreeTransform< Derived >::RebuildSizeOfPackExpr(), clang::TreeTransform< Derived >::RebuildTypedefType(), recordConversion(), ReferenceDllExportedMembers(), RemoveAddressSpaceFromPtr(), RequireCompleteDeclContext(), resolveAllocationOverload(), resolveBuiltinNewDeleteOverload(), ResolveConstructorOverload(), ResolveOverloadedFunctionForReferenceBinding(), ResolveOverloadForDeduction(), SaveNestedNameSpecifierAnnotation(), SemaBuiltinCommitRWPipe(), SemaBuiltinCpuIs(), SemaBuiltinCpuSupports(), SemaBuiltinLaunder(), SemaBuiltinReserveRWPipe(), SemaBuiltinRWPipe(), SemaOpenCLBuiltinEnqueueKernel(), SemaOpenCLBuiltinToAddr(), shouldIgnoreDueToReservedName(), ShouldRemoveFromUnused(), ShouldTryAgainWithRedefinitionType(), SubstBaseSpecifiers(), SubstFunctionDeclType(), SubstParmVarDecl(), clang::TemplateDeclInstantiator::SubstTemplateParams(), SubstType(), transferARCOwnershipToDeclaratorChunk(), transferARCOwnershipToDeclSpec(), translateTemplateArgument(), TryAddressSpaceCast(), TryClassUnification(), TryConstCast(), TryConstructorInitialization(), TryContextuallyConvertToBool(), TryContextuallyConvertToObjCPointer(), TryDefaultInitialization(), tryExprAsCall(), tryGCCVectorConvertAndSplat(), TryImplicitConversion(), TryListConversion(), TryListInitialization(), tryObjCWritebackConversion(), TryObjectArgumentInitialization(), TryOCLSamplerInitialization(), TryReferenceInit(), TryReferenceInitialization(), TryReferenceInitializationCore(), TryReferenceListInitialization(), TryRefInitWithConversionFunction(), TryReinterpretCast(), TryStaticCast(), TryStaticMemberPointerUpcast(), TryStaticPointerDowncast(), TryStaticReferenceDowncast(), TryUserDefinedConversion(), TryValueInitialization(), tryVectorConvertAndSplat(), UnifySection(), UpdateExceptionSpec(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), clang::TemplateDeclInstantiator::VisitFunctionDecl(), clang::TemplateDeclInstantiator::VisitVarDecl(), clang::TemplateDeclInstantiator::VisitVarTemplateSpecializationDecl(), WarnExactTypedMethods(), widenIterationCount(), clang::ASTWriter::WriteAST(), and ~Sema().
DeclContext* clang::Sema::CurContext |
CurContext - This is the current declaration context of parsing.
Definition at line 386 of file Sema.h.
Referenced by ActOnCompatibilityAlias(), ActOnFinishFullExpr(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), ActOnStartProtocolInterface(), AddClassMessageCompletions(), clang::Sema::SynthesizedFunctionScope::addContextNote(), AddKeywordsToConsumer(), buildCaptureDecl(), buildDeclareReductionRef(), BuildObjCExceptionDecl(), buildUserDefinedMapperRef(), buildVarDecl(), checkAllocateClauses(), CheckCUDACall(), CheckExplicitInstantiationScope(), CheckIfAnyEnclosingLambdasMustCaptureAnyPotentialCaptures(), CheckObjCDeclScope(), checkOpenMPLoop(), CheckTemplateSpecializationScope(), checkTypeMappable(), checkVAStartIsInVariadicFunction(), computeDeclContext(), clang::Sema::ContextRAII::ContextRAII(), ConvertDeducedTemplateArgument(), CUDADiagIfDeviceCode(), CUDADiagIfHostCode(), CUDASetLambdaAttrs(), DiagnoseTwoPhaseLookup(), DoMarkVarDeclReferenced(), FinishForRangeVarDecl(), clang::TypoCorrectionConsumer::getCorrectionValidator(), getCurBlock(), getCurLambda(), getCurrentInstantiationOf(), GetDeclSpecTypeForDeclarator(), getFunctionLevelDeclContext(), getFunctionStorageClass(), getNullabilityCompletenessCheckFileID(), getObjCContainerKind(), isLibstdcxxEagerExceptionSpecHack(), isNonPlacementDeallocationFunction(), isOdrUseContext(), isReferenceToNonConstCapture(), isUsualDeallocationFunction(), LookupMethodInReceiverType(), makeUnavailableInSystemHeader(), clang::Parser::ParseTopLevelDecl(), clang::Sema::ContextRAII::pop(), SubstParmVarDecl(), tryImplicitlyCaptureThisIfImplicitMemberFunctionAccessWithDependentArgs(), warnAboutAmbiguousFunction(), and clang::Sema::SynthesizedFunctionScope::~SynthesizedFunctionScope().
StringLiteral* clang::Sema::CurInitSeg |
Last section used with #pragma init_seg.
Definition at line 542 of file Sema.h.
Referenced by ActOnPragmaMSInitSeg().
SourceLocation clang::Sema::CurInitSegLoc |
Definition at line 543 of file Sema.h.
Referenced by ActOnPragmaMSInitSeg().
LocalInstantiationScope* clang::Sema::CurrentInstantiationScope |
The current instantiation scope used to store local variables.
Definition at line 7914 of file Sema.h.
Referenced by clang::LocalInstantiationScope::cloneScopes(), clang::TemplateDeclInstantiator::enableLateAttributeInstantiation(), clang::LocalInstantiationScope::Exit(), clang::TemplateDeclInstantiator::InstantiateEnumDefinition(), clang::TemplateDeclInstantiator::InstantiateTypedefNameDecl(), isSFINAEContext(), clang::LocalInstantiationScope::LocalInstantiationScope(), clang::TemplateDeclInstantiator::SubstFunctionType(), SubstParmVarDecl(), clang::TemplateDeclInstantiator::VisitCXXMethodDecl(), and clang::TemplateDeclInstantiator::VisitVarDecl().
llvm::SmallVector<QualType, 4> clang::Sema::CurrentParameterCopyTypes |
SmallVector<Scope*, 2> clang::Sema::CurrentSEHFinally |
QualType clang::Sema::CXXThisTypeOverride |
When non-NULL, the C++ 'this' expression is allowed despite the current context not being a non-static member function.
In such cases, this provides the type used for 'this'.
Definition at line 5347 of file Sema.h.
Referenced by ClassifyImplicitMemberAccess(), clang::Sema::ContextRAII::ContextRAII(), isThisOutsideMemberFunctionBody(), clang::Sema::ContextRAII::pop(), and clang::Sema::CXXThisScopeRAII::~CXXThisScopeRAII().
RecordDecl* clang::Sema::CXXTypeInfoDecl |
PragmaStack<StringLiteral *> clang::Sema::DataSegStack |
Definition at line 520 of file Sema.h.
Referenced by clang::Sema::PragmaStackSentinelRAII::~PragmaStackSentinelRAII().
Referenced by clang::Sema::ContextRAII::pop().
SmallVector<CXXRecordDecl*, 4> clang::Sema::DelayedDllExportClasses |
Definition at line 11167 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), and dllExportImportClassTemplateSpecialization().
SmallVector<CXXMethodDecl*, 4> clang::Sema::DelayedDllExportMemberFunctions |
Definition at line 11168 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit().
SmallVector<std::pair<FunctionDecl*, FunctionDecl*>, 2> clang::Sema::DelayedEquivalentExceptionSpecChecks |
All the function redeclarations seen during a class definition that had their exception spec checks delayed, plus the prior declaration they should be checked against.
Except during error recovery, the new decl should always be a friend declaration, as that's the only valid way to redeclare a special member before its class is complete.
Definition at line 683 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), and CheckEquivalentExceptionSpec().
SmallVector<std::pair<const CXXMethodDecl*, const CXXMethodDecl*>, 2> clang::Sema::DelayedOverridingExceptionSpecChecks |
All the overriding functions seen during a class definition that had their exception spec checks delayed, plus the overridden function.
Definition at line 675 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), and CheckOverridingFunctionExceptionSpec().
DelegatingCtorDeclsType clang::Sema::DelegatingCtorDecls |
All the delegating constructors seen so far in the file, used for cycle detection at the end of the TU.
Definition at line 669 of file Sema.h.
Referenced by AddLazyVectorDecls().
llvm::MapVector<FieldDecl *, DeleteLocs> clang::Sema::DeleteExprs |
Definition at line 632 of file Sema.h.
Referenced by DiagnoseMismatchedNewDelete(), and getMismatchingDeleteExpressions().
llvm::DenseMap< CanonicalDeclPtr<FunctionDecl>, llvm::MapVector<CanonicalDeclPtr<FunctionDecl>, SourceLocation> > clang::Sema::DeviceCallGraph |
A partial call graph maintained during CUDA/OpenMP device code compilation to support deferred diagnostics.
Functions are only added here if, at the time they're considered, they are not known-emitted. As soon as we discover that a function is known-emitted, we remove it and everything it transitively calls from this set and add those functions to DeviceKnownEmittedFns.
Definition at line 10424 of file Sema.h.
Referenced by CheckCUDACall(), and markKnownEmitted().
llvm::DenseMap<CanonicalDeclPtr<FunctionDecl>, std::vector<PartialDiagnosticAt> > clang::Sema::DeviceDeferredDiags |
llvm::DenseMap< CanonicalDeclPtr<FunctionDecl>, FunctionDeclAndLoc> clang::Sema::DeviceKnownEmittedFns |
An inverse call graph, mapping known-emitted functions to one of their known-emitted callers (plus the location of the call).
Functions that we can tell a priori must be emitted aren't added to this map.
Definition at line 10412 of file Sema.h.
Referenced by markKnownEmitted().
DiagnosticsEngine& clang::Sema::Diags |
Definition at line 376 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), CheckConditionalOperator(), CheckCXX98CompatAccessibleCopy(), DiagnoseBadFunctionCast(), DiagnoseBaseOrMemInitializerOrder(), DiagnoseCallingConvCast(), DiagnoseForRangeVariableCopies(), DiagnoseMismatchedNewDelete(), DiagnoseMultipleMethodInGlobalPool(), DiagnoseNullConversion(), diagnoseZeroToNullptrConversion(), EmitCurrentDiagnostic(), getNullabilityCompletenessCheckFileID(), clang::Sema::CodeSynthesisContext::isInstantiationRecord(), LookupMemberExpr(), LookupMethodInReceiverType(), clang::TemplateSpecCandidateSet::NoteCandidates(), clang::OverloadCandidateSet::NoteCandidates(), noteOverloads(), PrintInstantiationStack(), PrintPragmaAttributeInstantiationPoint(), and ReferenceDllExportedMembers().
ObjCMethodDecl* clang::Sema::DictionaryWithObjectsMethod |
bool clang::Sema::DisableTypoCorrection |
Tracks whether we are in a context where typo correction is disabled.
Definition at line 7918 of file Sema.h.
Referenced by attemptRecovery(), clang::Sema::TentativeAnalysisScope::TentativeAnalysisScope(), and clang::Sema::TentativeAnalysisScope::~TentativeAnalysisScope().
SmallVector<BlockDecl*, 8> clang::Sema::ExprCleanupObjects |
ExprCleanupObjects - This is the stack of objects requiring cleanup that are created by the current full expression.
The element type here is ExprWithCleanups::Object.
Definition at line 588 of file Sema.h.
Referenced by MaybeCreateExprWithCleanups().
SmallVector<ExpressionEvaluationContextRecord, 8> clang::Sema::ExprEvalContexts |
A stack of expression evaluation contexts.
Definition at line 1090 of file Sema.h.
Referenced by ActOnDecltypeExpression(), ActOnStartOfObjCMethodDef(), CheckCUDACall(), ClassifyImplicitMemberAccess(), CorrectDelayedTyposInExpr(), isOdrUseContext(), isPotentiallyConstantEvaluatedContext(), MaybeBindToTemporary(), MaybeCreateExprWithCleanups(), and clang::Parser::ParseConstantExpressionInExprEvalContext().
llvm::DenseMap<IdentifierInfo*,AsmLabelAttr*> clang::Sema::ExtnameUndeclaredIdentifiers |
ExtVectorDeclsType clang::Sema::ExtVectorDecls |
ExtVectorDecls - This is a list all the extended vector types.
This allows us to associate a raw vector type with one of the ext_vector type names. This is only necessary for issuing pretty diagnostics.
Definition at line 611 of file Sema.h.
Referenced by AddLazyVectorDecls().
std::unique_ptr<CXXFieldCollector> clang::Sema::FieldCollector |
|
mutable |
FPOptions clang::Sema::FPFeatures |
Definition at line 370 of file Sema.h.
Referenced by ActOnPragmaFEnvAccess(), and ActOnPragmaFPContract().
SmallVector<sema::FunctionScopeInfo *, 4> clang::Sema::FunctionScopes |
Stack containing information about each of the nested function, block, and method scopes that are currently active.
Definition at line 602 of file Sema.h.
Referenced by CheckCXXThisCapture(), getCurBlock(), getCurCapturedRegion(), getCurLambda(), getEnclosingFunction(), PopFunctionScopeInfo(), PushBlockScope(), PushCapturedRegionScope(), PushFunctionScope(), PushLambdaScope(), setFunctionHasBranchIntoScope(), setFunctionHasBranchProtectedScope(), setFunctionHasIndirectGoto(), and ~Sema().
bool clang::Sema::GlobalNewDeleteDeclared |
A flag to remember whether the implicit forms of operator new and delete have been declared.
Definition at line 958 of file Sema.h.
Referenced by DeclareGlobalNewDelete().
IdentifierResolver clang::Sema::IdResolver |
Definition at line 872 of file Sema.h.
Referenced by AddLazyVectorDecls(), clang::ASTReader::getIdResolver(), and Initialize().
llvm::SmallVector<std::pair<SourceLocation, const BlockDecl *>, 1> clang::Sema::ImplicitlyRetainedSelfLocs |
List of SourceLocations where 'self' is implicitly retained inside a block.
Definition at line 1218 of file Sema.h.
Referenced by ActOnStartOfObjCMethodDef().
SourceLocation clang::Sema::ImplicitMSInheritanceAttrLoc |
Source location for newly created implicit MSInheritanceAttrs.
Definition at line 406 of file Sema.h.
Referenced by ActOnPragmaMSPointersToMembers(), and assignInheritanceModel().
bool clang::Sema::InNonInstantiationSFINAEContext |
Whether we are in a SFINAE context that is not associated with template instantiation.
This is used when setting up a SFINAE trap (see
SFINAETrap) outside of a template instantiation or template argument deduction.
Definition at line 7616 of file Sema.h.
Referenced by isSFINAEContext(), popCodeSynthesisContext(), pushCodeSynthesisContext(), clang::Sema::SFINAETrap::SFINAETrap(), and clang::Sema::SFINAETrap::~SFINAETrap().
llvm::DenseSet<QualType> clang::Sema::InstantiatedNonDependentTypes |
llvm::DenseSet<std::pair<Decl *, unsigned> > clang::Sema::InstantiatingSpecializations |
Specializations whose definitions are currently being instantiated.
Definition at line 7587 of file Sema.h.
Referenced by clang::Sema::InstantiatingTemplate::Clear(), and clang::Sema::CodeSynthesisContext::isInstantiationRecord().
bool clang::Sema::IsBuildingRecoveryCallExpr |
Flag indicating if Sema is building a recovery call expression.
This flag is used to avoid building recovery call expressions if Sema is already doing so, which would cause infinite recursions.
Definition at line 580 of file Sema.h.
Referenced by BuildRecoveryCallExpr(), and DiagnoseTwoPhaseOperatorLookup().
bool clang::Sema::isConstantEvaluatedOverride |
Used to change context to isConstantEvaluated without pushing a heavy ExpressionEvaluationContextRecord object.
|
static |
Definition at line 510 of file Sema.h.
Referenced by ActOnPragmaOptionsAlign(), ActOnPragmaPack(), and AddAlignmentAttributesForRecord().
const LangOptions& clang::Sema::LangOpts |
Definition at line 372 of file Sema.h.
Referenced by ActOnComment(), ActOnEndOfTranslationUnit(), ActOnPragmaAttributeAttribute(), CheckImplementationIvars(), checkVectorShift(), DiagnoseUnterminatedPragmaPack(), MarkVarDeclODRUsed(), PopFunctionScopeInfo(), PushFunctionScope(), and targetDiag().
unsigned clang::Sema::LastEmittedCodeSynthesisContextDepth = 0 |
The depth of the context stack at the point when the most recent error or warning was produced.
This value is used to suppress printing of redundant context stacks when there are multiple errors or warnings in the same instantiation.
Definition at line 7633 of file Sema.h.
Referenced by popCodeSynthesisContext().
SmallVector<PendingImplicitInstantiation, 1> clang::Sema::LateParsedInstantiations |
Queue of implicit template instantiations that cannot be performed eagerly.
Definition at line 7951 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), and ActOnEndOfTranslationUnitFragment().
LateParsedTemplateMapT clang::Sema::LateParsedTemplateMap |
LateTemplateParserCB* clang::Sema::LateTemplateParser |
LateTemplateParserCleanupCB* clang::Sema::LateTemplateParserCleanup |
Definition at line 694 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit().
llvm::DenseSet<FunctionDeclAndLoc> clang::Sema::LocsWithCUDACallDiags |
FunctionDecls and SourceLocations for which CheckCUDACall has emitted a (maybe deferred) "bad call" diagnostic.
We use this to avoid emitting the same deferred diag twice.
Definition at line 10403 of file Sema.h.
Referenced by CheckCUDACall().
llvm::DenseSet<Module*> clang::Sema::LookupModulesCache |
Cache of additional modules that should be used for name lookup within the current template instantiation.
Computed lazily; use getLookupModules() to get a complete set.
Definition at line 7600 of file Sema.h.
Referenced by popCodeSynthesisContext().
MaybeODRUseExprSet clang::Sema::MaybeODRUseExprs |
Definition at line 596 of file Sema.h.
Referenced by DoMarkVarDeclReferenced().
GlobalMethodPool clang::Sema::MethodPool |
Method Pool - allows efficient lookup when typechecking messages to "id".
We need to maintain a list, since selectors can have differing signatures across classes. In Cocoa, this happens to be extremely uncommon (only 1% of selectors are "overloaded"). At the head of the list it is recorded whether there were 0, 1, or >= 2 methods inside categories with a particular selector.
Definition at line 1209 of file Sema.h.
Referenced by AddClassMessageCompletions(), AreMultipleMethodsInGlobalPool(), CheckObjCMethodOverrides(), CollectMultipleMethodsInGlobalPool(), LookupImplementedMethodInGlobalPool(), SelectorsForTypoCorrection(), and updateOutOfDateSelector().
LangOptions::PragmaMSPointersToMembersKind clang::Sema::MSPointerToMemberRepresentationMethod |
Controls member pointer representation format under the MS ABI.
Definition at line 400 of file Sema.h.
Referenced by ActOnPragmaMSPointersToMembers(), and assignInheritanceModel().
bool clang::Sema::MSStructPragmaOn |
Definition at line 396 of file Sema.h.
Referenced by ActOnPragmaMSStruct(), and AddMsStructLayoutForRecord().
RecordDecl* clang::Sema::MSVCGuidDecl |
unsigned clang::Sema::NonInstantiationEntries |
The number of CodeSynthesisContexts
that are not template instantiations and, therefore, should not be counted as part of the instantiation depth.
When the instantiation depth reaches the user-configurable limit LangOptions::InstantiationDepth
we will abort instantiation.
Definition at line 7625 of file Sema.h.
Referenced by clang::Sema::InstantiatingTemplate::Clear(), popCodeSynthesisContext(), and pushCodeSynthesisContext().
std::unique_ptr<NSAPI> clang::Sema::NSAPIObj |
Caches identifiers/selectors for NSFoundation APIs.
Definition at line 909 of file Sema.h.
Referenced by CheckObjCCollectionLiteralElement(), CheckTautologicalComparison(), GetNSMutableArrayArgumentIndex(), GetNSMutableDictionaryArgumentIndex(), GetNSSetArgumentIndex(), hasIsEqualMethod(), isMethodDeclaredInRootProtocol(), and isObjCSignedCharBool().
ObjCInterfaceDecl* clang::Sema::NSArrayDecl |
The declaration of the Objective-C NSArray class.
Definition at line 939 of file Sema.h.
Referenced by checkObjCArrayLiteral().
ObjCInterfaceDecl* clang::Sema::NSDictionaryDecl |
The declaration of the Objective-C NSDictionary class.
Definition at line 945 of file Sema.h.
Referenced by checkObjCDictionaryLiteral().
ObjCInterfaceDecl* clang::Sema::NSNumberDecl |
ObjCMethodDecl* clang::Sema::NSNumberLiteralMethods[NSAPI::NumNSNumberLiteralMethods] |
QualType clang::Sema::NSNumberPointer |
ObjCInterfaceDecl* clang::Sema::NSStringDecl |
QualType clang::Sema::NSStringPointer |
ObjCInterfaceDecl* clang::Sema::NSValueDecl |
QualType clang::Sema::NSValuePointer |
FileNullabilityMap clang::Sema::NullabilityMap |
A mapping that describes the nullability we've seen in each header file.
Definition at line 539 of file Sema.h.
Referenced by checkNullabilityConsistency(), and recordNullabilitySeen().
unsigned clang::Sema::NumSFINAEErrors |
The number of SFINAE diagnostics that have been trapped.
Definition at line 1164 of file Sema.h.
Referenced by EmitCurrentDiagnostic(), clang::Sema::SFINAETrap::hasErrorOccurred(), PrintStats(), and clang::Sema::SFINAETrap::~SFINAETrap().
void* clang::Sema::OpaqueParser |
Definition at line 695 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit().
OpenCLOptions clang::Sema::OpenCLFeatures |
SourceLocation clang::Sema::OptimizeOffPragmaLocation |
This represents the last location of a "#pragma clang optimize off" directive if such a directive has not been closed by an "on" yet.
If optimizations are currently "on", this is set to an invalid location.
Definition at line 574 of file Sema.h.
Referenced by ActOnPragmaOptimize(), and AddRangeBasedOptnone().
DeclContext* clang::Sema::OriginalLexicalContext |
Generally null except when we temporarily switch decl contexts, like in.
SmallVector<PackIncludeState, 8> clang::Sema::PackIncludeStack |
Definition at line 518 of file Sema.h.
Referenced by AddAlignmentAttributesForRecord(), and DiagnoseNonDefaultPragmaPack().
PragmaStack<unsigned> clang::Sema::PackStack |
Definition at line 511 of file Sema.h.
Referenced by ActOnPragmaOptionsAlign(), ActOnPragmaPack(), AddAlignmentAttributesForRecord(), DiagnoseNonDefaultPragmaPack(), and DiagnoseUnterminatedPragmaPack().
llvm::SmallPtrSet<const Decl*, 4> clang::Sema::ParsingInitForAutoVars |
std::deque<PendingImplicitInstantiation> clang::Sema::PendingInstantiations |
The queue of implicit template instantiations that are required but have not yet been performed.
Definition at line 7947 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), ActOnEndOfTranslationUnitFragment(), AddLazyVectorDecls(), DoMarkVarDeclReferenced(), and clang::Sema::GlobalEagerInstantiationScope::GlobalEagerInstantiationScope().
std::deque<PendingImplicitInstantiation> clang::Sema::PendingLocalImplicitInstantiations |
The queue of implicit template instantiations that are required and must be performed within the current local scope.
This queue is only used for member functions of local classes in templates, which must be instantiated in the same scope as their enclosing function, so that they can reference function-local types, static variables, enumerators, etc.
Definition at line 7998 of file Sema.h.
Referenced by AddLazyVectorDecls(), InstantiateClassMembers(), clang::Sema::LocalEagerInstantiationScope::LocalEagerInstantiationScope(), and clang::TemplateDeclInstantiator::VisitFunctionDecl().
Preprocessor& clang::Sema::PP |
Definition at line 373 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), AddCFAuditedAttribute(), AddLazyVectorDecls(), BuildNonArrayForRange(), checkTupleLikeDecomposition(), DeclareGlobalNewDelete(), DiagnoseOwningPropertyGetterSynthesis(), diagReturnOnAllocFailure(), clang::arcmt::trans::getNilString(), getTupleLikeElementType(), Initialize(), isTupleLike(), LookupMemberExpr(), LookupMethodInReceiverType(), LookupStdInitializerList(), lookupStdTypeTraitMember(), noteMemberDeclaredHere(), and clang::ASTWriter::WriteAST().
const Decl* clang::Sema::PragmaAttributeCurrentTargetDecl |
The declaration that is currently receiving an attribute from the #pragma attribute stack.
Definition at line 569 of file Sema.h.
Referenced by AddPragmaAttributes(), and PrintPragmaAttributeInstantiationPoint().
SmallVector<PragmaAttributeGroup, 2> clang::Sema::PragmaAttributeStack |
Definition at line 565 of file Sema.h.
Referenced by ActOnPragmaAttributeAttribute(), ActOnPragmaAttributeEmptyPush(), ActOnPragmaAttributePop(), AddPragmaAttributes(), and DiagnoseUnterminatedPragmaAttribute().
PragmaClangSection clang::Sema::PragmaClangBSSSection |
Definition at line 432 of file Sema.h.
Referenced by ActOnPragmaClangSection().
PragmaClangSection clang::Sema::PragmaClangDataSection |
Definition at line 433 of file Sema.h.
Referenced by ActOnPragmaClangSection().
PragmaClangSection clang::Sema::PragmaClangRodataSection |
Definition at line 434 of file Sema.h.
Referenced by ActOnPragmaClangSection().
PragmaClangSection clang::Sema::PragmaClangTextSection |
Definition at line 435 of file Sema.h.
Referenced by ActOnPragmaClangSection().
std::unique_ptr<RecordDeclSetTy> clang::Sema::PureVirtualClassDiagSet |
llvm::MapVector<Selector, SourceLocation> clang::Sema::ReferencedSelectors |
Method selectors used in a @selector expression.
Used for implementation of -Wselector.
Definition at line 1213 of file Sema.h.
Referenced by DiagnoseUseOfUnimplementedSelectors(), and RemoveSelectorFromWarningCache().
Selector clang::Sema::RespondsToSelectorSel |
SourceManager& clang::Sema::SourceMgr |
Definition at line 377 of file Sema.h.
Referenced by ActOnComment(), ActOnStartOfTranslationUnit(), AnalyzeCompoundAssignment(), DiagnoseNullConversion(), DiagnoseUnterminatedPragmaPack(), diagnoseZeroToNullptrConversion(), fixItNullability(), getNullabilityCompletenessCheckFileID(), clang::sema::AnalysisBasedWarnings::IssueWarnings(), shouldIgnoreDueToReservedName(), and warnAboutAmbiguousFunction().
llvm::FoldingSet<SpecialMemberOverloadResultEntry> clang::Sema::SpecialMemberCache |
llvm::SmallPtrSet<SpecialMemberDecl, 4> clang::Sema::SpecialMembersBeingDeclared |
LazyDeclPtr clang::Sema::StdAlignValT |
The C++ "std::align_val_t" enum class, which is defined by the C++ standard library.
Definition at line 888 of file Sema.h.
Referenced by AddLazyVectorDecls(), and DeclareGlobalNewDelete().
LazyDeclPtr clang::Sema::StdBadAlloc |
The C++ "std::bad_alloc" class, which is defined by the C++ standard library.
Definition at line 884 of file Sema.h.
Referenced by AddLazyVectorDecls(), and DeclareGlobalNewDelete().
ClassTemplateDecl* clang::Sema::StdCoroutineTraitsCache |
NamespaceDecl* clang::Sema::StdExperimentalNamespaceCache |
ClassTemplateDecl* clang::Sema::StdInitializerList |
LazyDeclPtr clang::Sema::StdNamespace |
The C++ "std" namespace, where the standard library resides.
Definition at line 880 of file Sema.h.
Referenced by AddLazyVectorDecls().
ObjCMethodDecl* clang::Sema::StringWithUTF8StringMethod |
SuppressedDiagnosticsMap clang::Sema::SuppressedDiagnostics |
std::vector<std::unique_ptr<TemplateInstantiationCallback> > clang::Sema::TemplateInstCallbacks |
The template instantiation callbacks to trace or track instantiations (objects can be chained).
This callbacks is used to print, trace or track template instantiations as they are being constructed.
Definition at line 7641 of file Sema.h.
Referenced by clang::Sema::InstantiatingTemplate::Clear(), clang::TemplightDumpAction::ExecuteAction(), clang::TemplateDeclInstantiator::InitFunctionInstantiation(), and clang::Sema::CodeSynthesisContext::isInstantiationRecord().
TentativeDefinitionsType clang::Sema::TentativeDefinitions |
All the tentative definitions encountered in the TU.
Definition at line 653 of file Sema.h.
Referenced by AddLazyVectorDecls().
threadSafety::BeforeSet* clang::Sema::ThreadSafetyDeclCache |
Definition at line 7933 of file Sema.h.
Referenced by clang::sema::AnalysisBasedWarnings::IssueWarnings(), and ~Sema().
TranslationUnitKind clang::Sema::TUKind |
The kind of translation unit we are processing.
When we're processing a complete translation unit, Sema will perform end-of-translation-unit semantic tasks (such as creating initializers for tentative definitions in C) once parsing has completed. Modules and precompiled headers perform different kinds of checks.
Definition at line 1159 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit().
Scope* clang::Sema::TUScope |
Translation Unit Scope - useful to Objective-C actions that need to lookup file scope declarations in the "ordinary" C decl namespace.
For example, user-defined classes, built-in "id" type, etc.
Definition at line 877 of file Sema.h.
Referenced by ActOnCompatibilityAlias(), ActOnEndOfTranslationUnit(), ActOnForwardClassDeclaration(), ActOnForwardProtocolDeclaration(), ActOnStartCategoryImplementation(), ActOnStartCategoryInterface(), ActOnStartClassImplementation(), ActOnStartProtocolInterface(), ActOnTypedefedProtocols(), buildMemcpyForAssignmentOp(), CheckObjCBridgeCFCast(), CheckObjCBridgeNSCast(), FindProtocolDeclaration(), Initialize(), and isMethodDeclaredInRootProtocol().
llvm::SmallPtrSet<const NamedDecl *, 4> clang::Sema::TypoCorrectedFunctionDefinitions |
The function definitions which were renamed as part of typo-correction to match their respective declarations.
We want to keep track of them to ensure that we don't emit a "redefinition" error if we encounter a correctly named definition after the renamed definition.
IdentifierSourceLocations clang::Sema::TypoCorrectionFailures |
unsigned clang::Sema::TyposCorrected |
llvm::MapVector<NamedDecl *, SourceLocation> clang::Sema::UndefinedButUsed |
UndefinedInternals - all the used, undefined objects which require a definition in this translation unit.
Definition at line 1184 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), getUndefinedButUsed(), and MarkVarDeclODRUsed().
UnparsedDefaultArgInstantiationsMap clang::Sema::UnparsedDefaultArgInstantiations |
A mapping from parameters with unparsed default arguments to the set of instantiations of each parameter.
This mapping is a temporary data structure used when parsing nested class templates or nested classes of class templates, where we might end up instantiating an inner class before the default arguments of its methods have been parsed.
Definition at line 1176 of file Sema.h.
Referenced by SubstParmVarDecl().
llvm::DenseMap<ParmVarDecl *, SourceLocation> clang::Sema::UnparsedDefaultArgLocs |
UnusedFileScopedDeclsType clang::Sema::UnusedFileScopedDecls |
The set of file scoped decls seen so far that have not been used and must warn if not used.
Only contains the first declaration.
Definition at line 661 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), and AddLazyVectorDecls().
llvm::SmallSetVector<const TypedefNameDecl *, 4> clang::Sema::UnusedLocalTypedefNameCandidates |
Set containing all typedefs that are likely unused.
Definition at line 623 of file Sema.h.
Referenced by AddLazyVectorDecls(), and emitAndClearUnusedLocalTypedefWarnings().
NamedDeclSetType clang::Sema::UnusedPrivateFields |
DeclarationName clang::Sema::VAListTagName |
VAListTagName - The declaration name corresponding to __va_list_tag.
This is used as part of a hack to omit that class from ADL results.
Definition at line 394 of file Sema.h.
Referenced by Initialize().
ObjCMethodDecl* clang::Sema::ValueWithBytesObjCTypeMethod |
void* clang::Sema::VisContext |
VisContext - Manages the stack for #pragma GCC visibility.
Definition at line 546 of file Sema.h.
Referenced by AddPushedVisibilityAttribute(), FreeVisContext(), PopPragmaVisibility(), PushPragmaVisibility(), and ~Sema().
llvm::DenseMap<CXXRecordDecl *, bool> clang::Sema::VTablesUsed |
The set of classes whose vtables have been used within this translation unit, and a bit that will be true if the vtable is required to be emitted (otherwise, it should be emitted only if needed by code generation).
Definition at line 6106 of file Sema.h.
Referenced by AddLazyVectorDecls().
SmallVector<VTableUse, 16> clang::Sema::VTableUses |
The list of vtables that are required but have not yet been materialized.
Definition at line 6100 of file Sema.h.
Referenced by AddLazyVectorDecls(), and clang::Sema::GlobalEagerInstantiationScope::GlobalEagerInstantiationScope().
PragmaStack<MSVtorDispAttr::Mode> clang::Sema::VtorDispStack |
Whether to insert vtordisps prior to virtual bases in the Microsoft C++ ABI.
Possible values are 0, 1, and 2, which mean:
0: Suppress all vtordisps 1: Insert vtordisps in the presence of vbase overrides and non-trivial structors 2: Always insert vtordisps to support RTTI on partially constructed objects
Definition at line 507 of file Sema.h.
Referenced by ActOnPragmaMSVtorDisp(), AddMsStructLayoutForRecord(), and clang::Sema::PragmaStackSentinelRAII::~PragmaStackSentinelRAII().
SmallVector<Decl*,2> clang::Sema::WeakTopLevelDecl |
WeakTopLevelDecl - Translation-unit scoped declarations generated by #pragma weak during processing of other Decls.
I couldn't figure out a clean way to generate these in-line, so we store them here and handle separately – which is a hack. It would be best to refactor this.
llvm::MapVector<IdentifierInfo *, WeakInfo> clang::Sema::WeakUndeclaredIdentifiers |
WeakUndeclaredIdentifiers - Identifiers contained in #pragma weak before declared.
rare. may alias another identifier, declared or undeclared
Definition at line 853 of file Sema.h.
Referenced by ActOnEndOfTranslationUnit(), AddLazyVectorDecls(), and LoadExternalWeakUndeclaredIdentifiers().