|
clang
5.0.0
|
MemberExpr - [C99 6.5.2.3] Structure and Union Members. More...
#include "clang/AST/Expr.h"
Public Member Functions | |
| MemberExpr (Expr *base, bool isarrow, SourceLocation operatorloc, ValueDecl *memberdecl, const DeclarationNameInfo &NameInfo, QualType ty, ExprValueKind VK, ExprObjectKind OK) | |
| MemberExpr (Expr *base, bool isarrow, SourceLocation operatorloc, ValueDecl *memberdecl, SourceLocation l, QualType ty, ExprValueKind VK, ExprObjectKind OK) | |
| void | setBase (Expr *E) |
| Expr * | getBase () const |
| ValueDecl * | getMemberDecl () const |
| Retrieve the member declaration to which this expression refers. More... | |
| void | setMemberDecl (ValueDecl *D) |
| DeclAccessPair | getFoundDecl () const |
| Retrieves the declaration found by lookup. More... | |
| bool | hasQualifier () const |
| Determines whether this member expression actually had a C++ nested-name-specifier prior to the name of the member, e.g., x->Base::foo. More... | |
| NestedNameSpecifierLoc | getQualifierLoc () const |
| If the member name was qualified, retrieves the nested-name-specifier that precedes the member name, with source-location information. More... | |
| NestedNameSpecifier * | getQualifier () const |
| If the member name was qualified, retrieves the nested-name-specifier that precedes the member name. More... | |
| SourceLocation | getTemplateKeywordLoc () const |
| Retrieve the location of the template keyword preceding the member name, if any. More... | |
| SourceLocation | getLAngleLoc () const |
| Retrieve the location of the left angle bracket starting the explicit template argument list following the member name, if any. More... | |
| SourceLocation | getRAngleLoc () const |
| Retrieve the location of the right angle bracket ending the explicit template argument list following the member name, if any. More... | |
| bool | hasTemplateKeyword () const |
| Determines whether the member name was preceded by the template keyword. More... | |
| bool | hasExplicitTemplateArgs () const |
| Determines whether the member name was followed by an explicit template argument list. More... | |
| void | copyTemplateArgumentsInto (TemplateArgumentListInfo &List) const |
| Copies the template arguments (if present) into the given structure. More... | |
| const TemplateArgumentLoc * | getTemplateArgs () const |
| Retrieve the template arguments provided as part of this template-id. More... | |
| unsigned | getNumTemplateArgs () const |
| Retrieve the number of template arguments provided as part of this template-id. More... | |
| ArrayRef< TemplateArgumentLoc > | template_arguments () const |
| DeclarationNameInfo | getMemberNameInfo () const |
| Retrieve the member declaration name info. More... | |
| SourceLocation | getOperatorLoc () const LLVM_READONLY |
| bool | isArrow () const |
| void | setArrow (bool A) |
| SourceLocation | getMemberLoc () const |
| getMemberLoc - Return the location of the "member", in X->F, it is the location of 'F'. More... | |
| void | setMemberLoc (SourceLocation L) |
| SourceLocation | getLocStart () const LLVM_READONLY |
| SourceLocation | getLocEnd () const LLVM_READONLY |
| SourceLocation | getExprLoc () const LLVM_READONLY |
| bool | isImplicitAccess () const |
| Determine whether the base of this explicit is implicit. More... | |
| bool | hadMultipleCandidates () const |
| Returns true if this member expression refers to a method that was resolved from an overloaded set having size greater than 1. More... | |
| void | setHadMultipleCandidates (bool V=true) |
| Sets the flag telling whether this expression refers to a method that was resolved from an overloaded set having size greater than 1. More... | |
| bool | performsVirtualDispatch (const LangOptions &LO) const |
| Returns true if virtual dispatch is performed. More... | |
| child_range | children () |
| const_child_range | children () const |
Public Member Functions inherited from clang::Expr | |
| QualType | getType () const |
| void | setType (QualType t) |
| bool | isValueDependent () const |
| isValueDependent - Determines whether this expression is value-dependent (C++ [temp.dep.constexpr]). More... | |
| void | setValueDependent (bool VD) |
| Set whether this expression is value-dependent or not. More... | |
| bool | isTypeDependent () const |
| isTypeDependent - Determines whether this expression is type-dependent (C++ [temp.dep.expr]), which means that its type could change from one template instantiation to the next. More... | |
| void | setTypeDependent (bool TD) |
| Set whether this expression is type-dependent or not. More... | |
| bool | isInstantiationDependent () const |
| Whether this expression is instantiation-dependent, meaning that it depends in some way on a template parameter, even if neither its type nor (constant) value can change due to the template instantiation. More... | |
| void | setInstantiationDependent (bool ID) |
| Set whether this expression is instantiation-dependent or not. More... | |
| bool | containsUnexpandedParameterPack () const |
| Whether this expression contains an unexpanded parameter pack (for C++11 variadic templates). More... | |
| void | setContainsUnexpandedParameterPack (bool PP=true) |
| Set the bit that describes whether this expression contains an unexpanded parameter pack. More... | |
| SourceLocation | getExprLoc () const LLVM_READONLY |
| getExprLoc - Return the preferred location for the arrow when diagnosing a problem with a generic expression. More... | |
| bool | isUnusedResultAWarning (const Expr *&WarnExpr, SourceLocation &Loc, SourceRange &R1, SourceRange &R2, ASTContext &Ctx) const |
| isUnusedResultAWarning - Return true if this immediate expression should be warned about if the result is unused. More... | |
| bool | isLValue () const |
| isLValue - True if this expression is an "l-value" according to the rules of the current language. More... | |
| bool | isRValue () const |
| bool | isXValue () const |
| bool | isGLValue () const |
| LValueClassification | ClassifyLValue (ASTContext &Ctx) const |
| Reasons why an expression might not be an l-value. More... | |
| isModifiableLvalueResult | isModifiableLvalue (ASTContext &Ctx, SourceLocation *Loc=nullptr) const |
| isModifiableLvalue - C99 6.3.2.1: an lvalue that does not have array type, does not have an incomplete type, does not have a const-qualified type, and if it is a structure or union, does not have any member (including, recursively, any member or element of all contained aggregates or unions) with a const-qualified type. More... | |
| Classification | Classify (ASTContext &Ctx) const |
| Classify - Classify this expression according to the C++11 expression taxonomy. More... | |
| Classification | ClassifyModifiable (ASTContext &Ctx, SourceLocation &Loc) const |
| ClassifyModifiable - Classify this expression according to the C++11 expression taxonomy, and see if it is valid on the left side of an assignment. More... | |
| ExprValueKind | getValueKind () const |
| getValueKind - The value kind that this expression produces. More... | |
| ExprObjectKind | getObjectKind () const |
| getObjectKind - The object kind that this expression produces. More... | |
| bool | isOrdinaryOrBitFieldObject () const |
| void | setValueKind (ExprValueKind Cat) |
| setValueKind - Set the value kind produced by this expression. More... | |
| void | setObjectKind (ExprObjectKind Cat) |
| setObjectKind - Set the object kind produced by this expression. More... | |
| bool | refersToBitField () const |
| Returns true if this expression is a gl-value that potentially refers to a bit-field. More... | |
| FieldDecl * | getSourceBitField () |
| If this expression refers to a bit-field, retrieve the declaration of that bit-field. More... | |
| const FieldDecl * | getSourceBitField () const |
| Decl * | getReferencedDeclOfCallee () |
| const Decl * | getReferencedDeclOfCallee () const |
| const ObjCPropertyRefExpr * | getObjCProperty () const |
| If this expression is an l-value for an Objective C property, find the underlying property reference expression. More... | |
| bool | isObjCSelfExpr () const |
| Check if this expression is the ObjC 'self' implicit parameter. More... | |
| bool | refersToVectorElement () const |
| Returns whether this expression refers to a vector element. More... | |
| bool | refersToGlobalRegisterVar () const |
| Returns whether this expression refers to a global register variable. More... | |
| bool | hasPlaceholderType () const |
| Returns whether this expression has a placeholder type. More... | |
| bool | hasPlaceholderType (BuiltinType::Kind K) const |
| Returns whether this expression has a specific placeholder type. More... | |
| bool | isKnownToHaveBooleanValue () const |
| isKnownToHaveBooleanValue - Return true if this is an integer expression that is known to return 0 or 1. More... | |
| bool | isIntegerConstantExpr (llvm::APSInt &Result, const ASTContext &Ctx, SourceLocation *Loc=nullptr, bool isEvaluated=true) const |
| isIntegerConstantExpr - Return true if this expression is a valid integer constant expression, and, if so, return its value in Result. More... | |
| bool | isIntegerConstantExpr (const ASTContext &Ctx, SourceLocation *Loc=nullptr) const |
| bool | isCXX98IntegralConstantExpr (const ASTContext &Ctx) const |
| isCXX98IntegralConstantExpr - Return true if this expression is an integral constant expression in C++98. More... | |
| bool | isCXX11ConstantExpr (const ASTContext &Ctx, APValue *Result=nullptr, SourceLocation *Loc=nullptr) const |
| isCXX11ConstantExpr - Return true if this expression is a constant expression in C++11. More... | |
| bool | isConstantInitializer (ASTContext &Ctx, bool ForRef, const Expr **Culprit=nullptr) const |
| isConstantInitializer - Returns true if this expression can be emitted to IR as a constant, and thus can be used as a constant initializer in C. More... | |
| bool | EvaluateAsRValue (EvalResult &Result, const ASTContext &Ctx) const |
| EvaluateAsRValue - Return true if this is a constant which we can fold to an rvalue using any crazy technique (that has nothing to do with language standards) that we want to, even if the expression has side-effects. More... | |
| bool | EvaluateAsBooleanCondition (bool &Result, const ASTContext &Ctx) const |
| EvaluateAsBooleanCondition - Return true if this is a constant which we we can fold and convert to a boolean condition using any crazy technique that we want to, even if the expression has side-effects. More... | |
| bool | EvaluateAsInt (llvm::APSInt &Result, const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects) const |
| EvaluateAsInt - Return true if this is a constant which we can fold and convert to an integer, using any crazy technique that we want to. More... | |
| bool | EvaluateAsFloat (llvm::APFloat &Result, const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects) const |
| EvaluateAsFloat - Return true if this is a constant which we can fold and convert to a floating point value, using any crazy technique that we want to. More... | |
| bool | isEvaluatable (const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects) const |
| isEvaluatable - Call EvaluateAsRValue to see if this expression can be constant folded without side-effects, but discard the result. More... | |
| bool | HasSideEffects (const ASTContext &Ctx, bool IncludePossibleEffects=true) const |
| HasSideEffects - This routine returns true for all those expressions which have any effect other than producing a value. More... | |
| bool | hasNonTrivialCall (const ASTContext &Ctx) const |
| Determine whether this expression involves a call to any function that is not trivial. More... | |
| llvm::APSInt | EvaluateKnownConstInt (const ASTContext &Ctx, SmallVectorImpl< PartialDiagnosticAt > *Diag=nullptr) const |
| EvaluateKnownConstInt - Call EvaluateAsRValue and return the folded integer. More... | |
| void | EvaluateForOverflow (const ASTContext &Ctx) const |
| bool | EvaluateAsLValue (EvalResult &Result, const ASTContext &Ctx) const |
| EvaluateAsLValue - Evaluate an expression to see if we can fold it to an lvalue with link time known address, with no side-effects. More... | |
| bool | EvaluateAsInitializer (APValue &Result, const ASTContext &Ctx, const VarDecl *VD, SmallVectorImpl< PartialDiagnosticAt > &Notes) const |
| EvaluateAsInitializer - Evaluate an expression as if it were the initializer of the given declaration. More... | |
| bool | EvaluateWithSubstitution (APValue &Value, ASTContext &Ctx, const FunctionDecl *Callee, ArrayRef< const Expr * > Args, const Expr *This=nullptr) const |
| EvaluateWithSubstitution - Evaluate an expression as if from the context of a call to the given function with the given arguments, inside an unevaluated context. More... | |
| bool | tryEvaluateObjectSize (uint64_t &Result, ASTContext &Ctx, unsigned Type) const |
| If the current Expr is a pointer, this will try to statically determine the number of bytes available where the pointer is pointing. More... | |
| NullPointerConstantKind | isNullPointerConstant (ASTContext &Ctx, NullPointerConstantValueDependence NPC) const |
| isNullPointerConstant - C99 6.3.2.3p3 - Test if this reduces down to a Null pointer constant. More... | |
| bool | isOBJCGCCandidate (ASTContext &Ctx) const |
| isOBJCGCCandidate - Return true if this expression may be used in a read/ write barrier. More... | |
| bool | isBoundMemberFunction (ASTContext &Ctx) const |
| Returns true if this expression is a bound member function. More... | |
| Expr * | IgnoreImpCasts () LLVM_READONLY |
| IgnoreImpCasts - Skip past any implicit casts which might surround this expression. More... | |
| Expr * | IgnoreImplicit () LLVM_READONLY |
| IgnoreImplicit - Skip past any implicit AST nodes which might surround this expression. More... | |
| const Expr * | IgnoreImplicit () const LLVM_READONLY |
| Expr * | IgnoreParens () LLVM_READONLY |
| IgnoreParens - Ignore parentheses. More... | |
| Expr * | IgnoreParenCasts () LLVM_READONLY |
| IgnoreParenCasts - Ignore parentheses and casts. More... | |
| Expr * | IgnoreCasts () LLVM_READONLY |
| Ignore casts. Strip off any CastExprs, returning their operand. More... | |
| Expr * | IgnoreParenImpCasts () LLVM_READONLY |
| IgnoreParenImpCasts - Ignore parentheses and implicit casts. More... | |
| Expr * | IgnoreConversionOperator () LLVM_READONLY |
| IgnoreConversionOperator - Ignore conversion operator. More... | |
| const Expr * | IgnoreConversionOperator () const LLVM_READONLY |
| const Expr * | IgnoreParenImpCasts () const LLVM_READONLY |
| Expr * | IgnoreParenLValueCasts () LLVM_READONLY |
| Ignore parentheses and lvalue casts. More... | |
| const Expr * | IgnoreParenLValueCasts () const LLVM_READONLY |
| Expr * | IgnoreParenNoopCasts (ASTContext &Ctx) LLVM_READONLY |
| IgnoreParenNoopCasts - Ignore parentheses and casts that do not change the value (including ptr->int casts of the same size). More... | |
| Expr * | ignoreParenBaseCasts () LLVM_READONLY |
| Ignore parentheses and derived-to-base casts. More... | |
| const Expr * | ignoreParenBaseCasts () const LLVM_READONLY |
| bool | isDefaultArgument () const |
| Determine whether this expression is a default function argument. More... | |
| bool | isTemporaryObject (ASTContext &Ctx, const CXXRecordDecl *TempTy) const |
| Determine whether the result of this expression is a temporary object of the given class type. More... | |
| bool | isImplicitCXXThis () const |
| Whether this expression is an implicit reference to 'this' in C++. More... | |
| const Expr * | IgnoreImpCasts () const LLVM_READONLY |
| const Expr * | IgnoreParens () const LLVM_READONLY |
| const Expr * | IgnoreParenCasts () const LLVM_READONLY |
| const Expr * | IgnoreCasts () const LLVM_READONLY |
| Strip off casts, but keep parentheses. More... | |
| const Expr * | IgnoreParenNoopCasts (ASTContext &Ctx) const LLVM_READONLY |
| const CXXRecordDecl * | getBestDynamicClassType () const |
| For an expression of class type or pointer to class type, return the most derived class decl the expression is known to refer to. More... | |
| const Expr * | getBestDynamicClassTypeExpr () const |
| Get the inner expression that determines the best dynamic class. More... | |
| const Expr * | skipRValueSubobjectAdjustments (SmallVectorImpl< const Expr * > &CommaLHS, SmallVectorImpl< SubobjectAdjustment > &Adjustments) const |
| Walk outwards from an expression we want to bind a reference to and find the expression whose lifetime needs to be extended. More... | |
| const Expr * | skipRValueSubobjectAdjustments () const |
Public Member Functions inherited from clang::Stmt | |
| void * | operator new (size_t bytes, const ASTContext &C, unsigned alignment=8) |
| void * | operator new (size_t bytes, const ASTContext *C, unsigned alignment=8) |
| void * | operator new (size_t bytes, void *mem) noexcept |
| void | operator delete (void *, const ASTContext &, unsigned) noexcept |
| void | operator delete (void *, const ASTContext *, unsigned) noexcept |
| void | operator delete (void *, size_t) noexcept |
| void | operator delete (void *, void *) noexcept |
| Stmt (StmtClass SC) | |
| StmtClass | getStmtClass () const |
| const char * | getStmtClassName () const |
| SourceRange | getSourceRange () const LLVM_READONLY |
| SourceLocation tokens are not useful in isolation - they are low level value objects created/interpreted by SourceManager. More... | |
| SourceLocation | getLocStart () const LLVM_READONLY |
| SourceLocation | getLocEnd () const LLVM_READONLY |
| void | dump () const |
Dumps the specified AST fragment and all subtrees to llvm::errs(). More... | |
| void | dump (SourceManager &SM) const |
| void | dump (raw_ostream &OS, SourceManager &SM) const |
| void | dump (raw_ostream &OS) const |
| void | dumpColor () const |
| dumpColor - same as dump(), but forces color highlighting. More... | |
| void | dumpPretty (const ASTContext &Context) const |
| dumpPretty/printPretty - These two methods do a "pretty print" of the AST back to its original source language syntax. More... | |
| void | printPretty (raw_ostream &OS, PrinterHelper *Helper, const PrintingPolicy &Policy, unsigned Indentation=0) const |
| void | viewAST () const |
| viewAST - Visualize an AST rooted at this Stmt* using GraphViz. More... | |
| Stmt * | IgnoreImplicit () |
| Skip past any implicit AST nodes which might surround this statement, such as ExprWithCleanups or ImplicitCastExpr nodes. More... | |
| const Stmt * | IgnoreImplicit () const |
| Stmt * | IgnoreContainers (bool IgnoreCaptured=false) |
| Skip no-op (attributed, compound) container stmts and skip captured stmt at the top, if IgnoreCaptured is true. More... | |
| const Stmt * | stripLabelLikeStatements () const |
| Strip off all label-like statements. More... | |
| Stmt * | stripLabelLikeStatements () |
| child_range | children () |
| const_child_range | children () const |
| child_iterator | child_begin () |
| child_iterator | child_end () |
| const_child_iterator | child_begin () const |
| const_child_iterator | child_end () const |
| void | Profile (llvm::FoldingSetNodeID &ID, const ASTContext &Context, bool Canonical) const |
| Produce a unique representation of the given statement. More... | |
| void | ProcessODRHash (llvm::FoldingSetNodeID &ID, ODRHash &Hash) const |
| Calculate a unique representation for a statement that is stable across compiler invocations. More... | |
Static Public Member Functions | |
| static MemberExpr * | Create (const ASTContext &C, Expr *base, bool isarrow, SourceLocation OperatorLoc, NestedNameSpecifierLoc QualifierLoc, SourceLocation TemplateKWLoc, ValueDecl *memberdecl, DeclAccessPair founddecl, DeclarationNameInfo MemberNameInfo, const TemplateArgumentListInfo *targs, QualType ty, ExprValueKind VK, ExprObjectKind OK) |
| static bool | classof (const Stmt *T) |
Static Public Member Functions inherited from clang::Expr | |
| static ExprValueKind | getValueKindForType (QualType T) |
| getValueKindForType - Given a formal return or parameter type, give its value kind. More... | |
| static bool | isPotentialConstantExpr (const FunctionDecl *FD, SmallVectorImpl< PartialDiagnosticAt > &Diags) |
| isPotentialConstantExpr - Return true if this function's definition might be usable in a constant expression in C++11, if it were marked constexpr. More... | |
| static bool | isPotentialConstantExprUnevaluated (Expr *E, const FunctionDecl *FD, SmallVectorImpl< PartialDiagnosticAt > &Diags) |
| isPotentialConstantExprUnevaluted - Return true if this expression might be usable in a constant expression in C++11 in an unevaluated context, if it were in function FD marked constexpr. More... | |
| static QualType | findBoundMemberType (const Expr *expr) |
| Given an expression of bound-member type, find the type of the member. More... | |
| static bool | hasAnyTypeDependentArguments (ArrayRef< Expr * > Exprs) |
| hasAnyTypeDependentArguments - Determines if any of the expressions in Exprs is type-dependent. More... | |
| static bool | classof (const Stmt *T) |
Static Public Member Functions inherited from clang::Stmt | |
| static void | addStmtClass (const StmtClass s) |
| static void | EnableStatistics () |
| static void | PrintStats () |
Public Attributes | |
| friend | TrailingObjects |
Friends | |
| class | ASTReader |
| class | ASTStmtWriter |
MemberExpr - [C99 6.5.2.3] Structure and Union Members.
X->F and X.F.
|
inline |
Definition at line 2430 of file Expr.h.
References clang::NamedDecl::getDeclName(), and clang::DeclarationNameInfo::getName().
Referenced by Create().
|
inline |
|
inline |
|
inline |
Definition at line 2611 of file Expr.h.
References clang::Stmt::getStmtClass().
|
inline |
Copies the template arguments (if present) into the given structure.
Definition at line 2537 of file Expr.h.
References hasExplicitTemplateArgs().
|
static |
Definition at line 1437 of file Expr.cpp.
References clang::ASTContext::Allocate(), E, clang::MemberExprNameQualifier::FoundDecl, clang::DeclAccessPair::getAccess(), clang::Decl::getAccess(), clang::DeclAccessPair::getDecl(), clang::NestedNameSpecifierLoc::getNestedNameSpecifier(), clang::NestedNameSpecifier::isDependent(), clang::NestedNameSpecifier::isInstantiationDependent(), clang::SourceLocation::isValid(), MemberExpr(), clang::MemberExprNameQualifier::QualifierLoc, clang::Expr::setInstantiationDependent(), clang::Expr::setTypeDependent(), clang::Expr::setValueDependent(), and clang::TemplateArgumentListInfo::size().
Referenced by BuildMemberExpr(), clang::Sema::FixOverloadedFunctionReference(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
Definition at line 2468 of file Expr.h.
Referenced by clang::Sema::BuildCallToMemberFunction(), CheckIdentityFieldAssignment(), ClassifyMemberExpr(), DiagnoseForRangeReferenceVariableCopies(), clang::Sema::DiagnoseSelfMove(), clang::CodeGen::CodeGenFunction::EmitCXXMemberCallExpr(), clang::CodeGen::CodeGenFunction::EmitMemberExpr(), EvalVal(), getLocEnd(), getLocStart(), isImplicitAccess(), clang::Expr::isOBJCGCCandidate(), IsReadonlyMessage(), MarkExprReferenced(), clang::Sema::RefersToMemberWithReducedAlignment(), clang::EvaluatedExprVisitorBase< make_ptr, ImplClass >::VisitMemberExpr(), clang::ASTNodeImporter::VisitMemberExpr(), clang::ento::ExprEngine::VisitMemberExpr(), and clang::consumed::ConsumedStmtVisitor::VisitMemberExpr().
|
inline |
Definition at line 2584 of file Expr.h.
Referenced by clang::Sema::ActOnOpenMPDeclareSimdDirective(), and clang::CodeGen::CodeGenFunction::EmitMemberExpr().
|
inline |
Retrieves the declaration found by lookup.
Definition at line 2478 of file Expr.h.
References FoundDecl, getMemberDecl(), and clang::DeclAccessPair::make().
Referenced by clang::Sema::BuildCallToMemberFunction(), clang::tooling::RecursiveSymbolVisitor< T >::VisitMemberExpr(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
Retrieve the location of the left angle bracket starting the explicit template argument list following the member name, if any.
Definition at line 2516 of file Expr.h.
Referenced by hasExplicitTemplateArgs().
| SourceLocation MemberExpr::getLocEnd | ( | ) | const |
Definition at line 1511 of file Expr.cpp.
References getBase(), clang::DeclarationNameInfo::getEndLoc(), clang::Stmt::getLocEnd(), getMemberNameInfo(), getRAngleLoc(), hasExplicitTemplateArgs(), and clang::SourceLocation::isInvalid().
| SourceLocation MemberExpr::getLocStart | ( | ) | const |
Definition at line 1497 of file Expr.cpp.
References getBase(), clang::NestedNameSpecifierLoc::getBeginLoc(), clang::Stmt::getLocStart(), getQualifierLoc(), hasQualifier(), isImplicitAccess(), and clang::SourceLocation::isValid().
Referenced by clang::Sema::BuildCallToMemberFunction(), and clang::Sema::MarkMemberReferenced().
|
inline |
Retrieve the member declaration to which this expression refers.
The returned declaration will be a FieldDecl or (in C++) a VarDecl (for static data members), a CXXMethodDecl, or an EnumConstantDecl.
Definition at line 2474 of file Expr.h.
Referenced by clang::Sema::BuildCallToMemberFunction(), CheckIdentityFieldAssignment(), ClassifyMemberExpr(), clang::Sema::DiagnoseSelfMove(), clang::CodeGen::CodeGenFunction::EmitCXXMemberCallExpr(), clang::CodeGen::CodeGenFunction::EmitMemberExpr(), EvalVal(), getFoundDecl(), clang::sema::LambdaScopeInfo::getPotentialVariableCapture(), isIdenticalStmt(), IsReadonlyMessage(), MarkExprReferenced(), clang::Sema::MarkMemberReferenced(), clang::FunctionCallFilterCCC::ValidateCandidate(), clang::ASTNodeImporter::VisitMemberExpr(), and clang::ento::ExprEngine::VisitMemberExpr().
|
inline |
getMemberLoc - Return the location of the "member", in X->F, it is the location of 'F'.
Definition at line 2578 of file Expr.h.
Referenced by clang::Sema::BuildCallToMemberFunction(), clang::ento::PathDiagnosticLocation::createMemberLoc(), GetUnreachableLoc(), clang::Sema::MarkMemberReferenced(), TryTypoCorrectionForCall(), and clang::tooling::RecursiveSymbolVisitor< T >::VisitMemberExpr().
|
inline |
Retrieve the member declaration name info.
Definition at line 2566 of file Expr.h.
References clang::NamedDecl::getDeclName().
Referenced by getLocEnd(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
Retrieve the number of template arguments provided as part of this template-id.
Definition at line 2554 of file Expr.h.
References hasExplicitTemplateArgs().
Referenced by template_arguments().
|
inline |
Definition at line 2571 of file Expr.h.
Referenced by clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
If the member name was qualified, retrieves the nested-name-specifier that precedes the member name.
Otherwise, returns NULL.
Definition at line 2503 of file Expr.h.
References clang::NestedNameSpecifierLoc::getNestedNameSpecifier(), and getQualifierLoc().
Referenced by clang::Sema::BuildCallToMemberFunction(), clang::CodeGen::CodeGenFunction::EmitCXXMemberCallExpr(), and hasQualifier().
|
inline |
If the member name was qualified, retrieves the nested-name-specifier that precedes the member name, with source-location information.
Definition at line 2493 of file Expr.h.
Referenced by getLocStart(), getQualifier(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
Retrieve the location of the right angle bracket ending the explicit template argument list following the member name, if any.
Definition at line 2523 of file Expr.h.
Referenced by getLocEnd().
|
inline |
Retrieve the template arguments provided as part of this template-id.
Definition at line 2545 of file Expr.h.
References hasExplicitTemplateArgs().
Referenced by template_arguments().
|
inline |
Retrieve the location of the template keyword preceding the member name, if any.
Definition at line 2509 of file Expr.h.
Referenced by hasTemplateKeyword(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
|
inline |
Determines whether the member name was followed by an explicit template argument list.
Definition at line 2533 of file Expr.h.
References getLAngleLoc(), and clang::SourceLocation::isValid().
Referenced by copyTemplateArgumentsInto(), getLocEnd(), getNumTemplateArgs(), getTemplateArgs(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
Determines whether this member expression actually had a C++ nested-name-specifier prior to the name of the member, e.g., x->Base::foo.
Definition at line 2488 of file Expr.h.
References getQualifier().
Referenced by clang::Sema::BuildCallToMemberFunction(), clang::CodeGen::CodeGenFunction::EmitCXXMemberCallExpr(), getLocStart(), and performsVirtualDispatch().
|
inline |
Determines whether the member name was preceded by the template keyword.
Definition at line 2529 of file Expr.h.
References getTemplateKeywordLoc(), and clang::SourceLocation::isValid().
|
inline |
Definition at line 2573 of file Expr.h.
Referenced by ClassifyMemberExpr(), clang::CodeGen::CodeGenFunction::EmitCXXMemberCallExpr(), clang::CodeGen::CodeGenFunction::EmitMemberExpr(), EvalVal(), isCalleeArrow(), clang::Sema::RefersToMemberWithReducedAlignment(), and clang::ASTNodeImporter::VisitMemberExpr().
|
inline |
Determine whether the base of this explicit is implicit.
Definition at line 2587 of file Expr.h.
References getBase(), and clang::Expr::isImplicitCXXThis().
Referenced by getLocStart().
|
inline |
Returns true if virtual dispatch is performed.
If the member access is fully qualified, (i.e. X::f()), virtual dispatching is not performed. In -fapple-kext mode qualified calls to virtual method will still go through the vtable.
Definition at line 2607 of file Expr.h.
References hasQualifier().
Referenced by clang::Sema::BuildCallToMemberFunction(), MarkExprReferenced(), and clang::Sema::MarkMemberReferenced().
|
inline |
Definition at line 2467 of file Expr.h.
References E.
Referenced by clang::Sema::BuildCallToMemberFunction().
Sets the flag telling whether this expression refers to a method that was resolved from an overloaded set having size greater than 1.
Definition at line 2599 of file Expr.h.
Referenced by clang::Sema::BuildCXXMemberCallExpr(), and clang::Sema::FixOverloadedFunctionReference().
|
inline |
|
inline |
|
inline |
Definition at line 2561 of file Expr.h.
References getNumTemplateArgs(), and getTemplateArgs().
|
friend |
1.8.6