|
const CallExpr * | getConfig () const |
|
CallExpr * | getConfig () |
|
Expr * | getCallee () |
|
const Expr * | getCallee () const |
|
void | setCallee (Expr *F) |
|
ADLCallKind | getADLCallKind () const |
|
void | setADLCallKind (ADLCallKind V=UsesADL) |
|
bool | usesADL () const |
|
bool | hasStoredFPFeatures () const |
|
Decl * | getCalleeDecl () |
|
const Decl * | getCalleeDecl () const |
|
FunctionDecl * | getDirectCallee () |
| If the callee is a FunctionDecl, return it. Otherwise return null.
|
|
const FunctionDecl * | getDirectCallee () const |
|
unsigned | getNumArgs () const |
| getNumArgs - Return the number of actual arguments to this call.
|
|
Expr ** | getArgs () |
| Retrieve the call arguments.
|
|
const Expr *const * | getArgs () const |
|
Expr * | getArg (unsigned Arg) |
| getArg - Return the specified argument.
|
|
const Expr * | getArg (unsigned Arg) const |
|
void | setArg (unsigned Arg, Expr *ArgExpr) |
| setArg - Set the specified argument.
|
|
void | computeDependence () |
| Compute and set dependence bits.
|
|
void | shrinkNumArgs (unsigned NewNumArgs) |
| Reduce the number of arguments in this call expression.
|
|
void | setNumArgsUnsafe (unsigned NewNumArgs) |
| Bluntly set a new number of arguments without doing any checks whatsoever.
|
|
arg_range | arguments () |
|
const_arg_range | arguments () const |
|
arg_iterator | arg_begin () |
|
arg_iterator | arg_end () |
|
const_arg_iterator | arg_begin () const |
|
const_arg_iterator | arg_end () const |
|
ArrayRef< Stmt * > | getRawSubExprs () |
| This method provides fast access to all the subexpressions of a CallExpr without going through the slower virtual child_iterator interface.
|
|
FPOptionsOverride | getStoredFPFeatures () const |
| Get FPOptionsOverride from trailing storage.
|
|
void | setStoredFPFeatures (FPOptionsOverride F) |
| Set FPOptionsOverride in trailing storage. Used only by Serialization.
|
|
FPOptionsOverride | getStoredFPFeaturesOrDefault () const |
| Get the store FPOptionsOverride or default if not stored.
|
|
FPOptions | getFPFeaturesInEffect (const LangOptions &LO) const |
| Get the FP features status of this operator.
|
|
FPOptionsOverride | getFPFeatures () const |
|
unsigned | getBuiltinCallee () const |
| getBuiltinCallee - If this is a call to a builtin, return the builtin ID of the callee.
|
|
bool | isUnevaluatedBuiltinCall (const ASTContext &Ctx) const |
| Returns true if this is a call to a builtin which does not evaluate side-effects within its arguments.
|
|
QualType | getCallReturnType (const ASTContext &Ctx) const |
| getCallReturnType - Get the return type of the call expr.
|
|
const Attr * | getUnusedResultAttr (const ASTContext &Ctx) const |
| Returns the WarnUnusedResultAttr that is either declared on the called function, or its return type declaration.
|
|
bool | hasUnusedResultAttr (const ASTContext &Ctx) const |
| Returns true if this call expression should warn on unused results.
|
|
SourceLocation | getRParenLoc () const |
|
void | setRParenLoc (SourceLocation L) |
|
SourceLocation | getBeginLoc () const LLVM_READONLY |
|
SourceLocation | getEndLoc () const LLVM_READONLY |
|
bool | isBuiltinAssumeFalse (const ASTContext &Ctx) const |
| Return true if this is a call to __assume() or __builtin_assume() with a non-value-dependent constant parameter evaluating as false.
|
|
void | markDependentForPostponedNameLookup () |
| Used by Sema to implement MSVC-compatible delayed name lookup.
|
|
bool | isCallToStdMove () const |
|
child_range | children () |
|
const_child_range | children () const |
|
| Expr ()=delete |
|
| Expr (const Expr &)=delete |
|
| Expr (Expr &&)=delete |
|
Expr & | operator= (const Expr &)=delete |
|
Expr & | operator= (Expr &&)=delete |
|
QualType | getType () const |
|
void | setType (QualType t) |
|
QualType | getEnumCoercedType (const ASTContext &Ctx) const |
| If this expression is an enumeration constant, return the enumeration type under which said constant was declared.
|
|
ExprDependence | getDependence () const |
|
bool | isValueDependent () const |
| Determines whether the value of this expression depends on.
|
|
bool | isTypeDependent () const |
| Determines whether the type of this expression depends on.
|
|
bool | isInstantiationDependent () const |
| Whether this expression is instantiation-dependent, meaning that it depends in some way on.
|
|
bool | containsUnexpandedParameterPack () const |
| Whether this expression contains an unexpanded parameter pack (for C++11 variadic templates).
|
|
bool | containsErrors () const |
| Whether this expression contains subexpressions which had errors, e.g.
|
|
SourceLocation | getExprLoc () const LLVM_READONLY |
| getExprLoc - Return the preferred location for the arrow when diagnosing a problem with a generic expression.
|
|
bool | isReadIfDiscardedInCPlusPlus11 () const |
| Determine whether an lvalue-to-rvalue conversion should implicitly be applied to this expression if it appears as a discarded-value expression in C++11 onwards.
|
|
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.
|
|
bool | isLValue () const |
| isLValue - True if this expression is an "l-value" according to the rules of the current language.
|
|
bool | isPRValue () const |
|
bool | isXValue () const |
|
bool | isGLValue () const |
|
LValueClassification | ClassifyLValue (ASTContext &Ctx) const |
| Reasons why an expression might not be an l-value.
|
|
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.
|
|
Classification | Classify (ASTContext &Ctx) const |
| Classify - Classify this expression according to the C++11 expression taxonomy.
|
|
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.
|
|
FPOptions | getFPFeaturesInEffect (const LangOptions &LO) const |
| Returns the set of floating point options that apply to this expression.
|
|
ExprValueKind | getValueKind () const |
| getValueKind - The value kind that this expression produces.
|
|
ExprObjectKind | getObjectKind () const |
| getObjectKind - The object kind that this expression produces.
|
|
bool | isOrdinaryOrBitFieldObject () const |
|
void | setValueKind (ExprValueKind Cat) |
| setValueKind - Set the value kind produced by this expression.
|
|
void | setObjectKind (ExprObjectKind Cat) |
| setObjectKind - Set the object kind produced by this expression.
|
|
bool | refersToBitField () const |
| Returns true if this expression is a gl-value that potentially refers to a bit-field.
|
|
FieldDecl * | getSourceBitField () |
| If this expression refers to a bit-field, retrieve the declaration of that bit-field.
|
|
EnumConstantDecl * | getEnumConstantDecl () |
| If this expression refers to an enum constant, retrieve its declaration.
|
|
const EnumConstantDecl * | getEnumConstantDecl () const |
|
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.
|
|
bool | isObjCSelfExpr () const |
| Check if this expression is the ObjC 'self' implicit parameter.
|
|
bool | refersToVectorElement () const |
| Returns whether this expression refers to a vector element.
|
|
bool | refersToMatrixElement () const |
| Returns whether this expression refers to a matrix element.
|
|
bool | refersToGlobalRegisterVar () const |
| Returns whether this expression refers to a global register variable.
|
|
bool | hasPlaceholderType () const |
| Returns whether this expression has a placeholder type.
|
|
bool | hasPlaceholderType (BuiltinType::Kind K) const |
| Returns whether this expression has a specific placeholder type.
|
|
bool | isKnownToHaveBooleanValue (bool Semantic=true) const |
| isKnownToHaveBooleanValue - Return true if this is an integer expression that is known to return 0 or 1.
|
|
bool | isFlexibleArrayMemberLike (ASTContext &Context, LangOptions::StrictFlexArraysLevelKind StrictFlexArraysLevel, bool IgnoreTemplateOrMacroSubstitution=false) const |
| Check whether this array fits the idiom of a flexible array member, depending on the value of -fstrict-flex-array.
|
|
std::optional< llvm::APSInt > | getIntegerConstantExpr (const ASTContext &Ctx, SourceLocation *Loc=nullptr) const |
| isIntegerConstantExpr - Return the value if this expression is a valid integer constant expression.
|
|
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.
|
|
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.
|
|
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.
|
|
const ValueDecl * | getAsBuiltinConstantDeclRef (const ASTContext &Context) const |
| If this expression is an unambiguous reference to a single declaration, in the style of __builtin_function_start, return that declaration.
|
|
bool | EvaluateAsRValue (EvalResult &Result, const ASTContext &Ctx, bool InConstantContext=false) 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.
|
|
bool | EvaluateAsBooleanCondition (bool &Result, const ASTContext &Ctx, bool InConstantContext=false) const |
| EvaluateAsBooleanCondition - Return true if this is a constant which we can fold and convert to a boolean condition using any crazy technique that we want to, even if the expression has side-effects.
|
|
bool | EvaluateAsInt (EvalResult &Result, const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects, bool InConstantContext=false) 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.
|
|
bool | EvaluateAsFloat (llvm::APFloat &Result, const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects, bool InConstantContext=false) 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.
|
|
bool | EvaluateAsFixedPoint (EvalResult &Result, const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects, bool InConstantContext=false) const |
| EvaluateAsFixedPoint - Return true if this is a constant which we can fold and convert to a fixed point value.
|
|
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.
|
|
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.
|
|
bool | hasNonTrivialCall (const ASTContext &Ctx) const |
| Determine whether this expression involves a call to any function that is not trivial.
|
|
llvm::APSInt | EvaluateKnownConstInt (const ASTContext &Ctx, SmallVectorImpl< PartialDiagnosticAt > *Diag=nullptr) const |
| EvaluateKnownConstInt - Call EvaluateAsRValue and return the folded integer.
|
|
llvm::APSInt | EvaluateKnownConstIntCheckOverflow (const ASTContext &Ctx, SmallVectorImpl< PartialDiagnosticAt > *Diag=nullptr) const |
|
void | EvaluateForOverflow (const ASTContext &Ctx) const |
|
bool | EvaluateAsLValue (EvalResult &Result, const ASTContext &Ctx, bool InConstantContext=false) const |
| EvaluateAsLValue - Evaluate an expression to see if we can fold it to an lvalue with link time known address, with no side-effects.
|
|
bool | EvaluateAsInitializer (APValue &Result, const ASTContext &Ctx, const VarDecl *VD, SmallVectorImpl< PartialDiagnosticAt > &Notes, bool IsConstantInitializer) const |
| EvaluateAsInitializer - Evaluate an expression as if it were the initializer of the given declaration.
|
|
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.
|
|
bool | EvaluateAsConstantExpr (EvalResult &Result, const ASTContext &Ctx, ConstantExprKind Kind=ConstantExprKind::Normal) const |
| Evaluate an expression that is required to be a constant expression.
|
|
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.
|
|
bool | tryEvaluateStrLen (uint64_t &Result, ASTContext &Ctx) const |
| If the current Expr is a pointer, this will try to statically determine the strlen of the string pointed to.
|
|
bool | EvaluateCharRangeAsString (std::string &Result, const Expr *SizeExpression, const Expr *PtrExpression, ASTContext &Ctx, EvalResult &Status) const |
|
std::optional< std::string > | tryEvaluateString (ASTContext &Ctx) const |
| If the current Expr can be evaluated to a pointer to a null-terminated constant string, return the constant string (without the terminating null).
|
|
NullPointerConstantKind | isNullPointerConstant (ASTContext &Ctx, NullPointerConstantValueDependence NPC) const |
| isNullPointerConstant - C99 6.3.2.3p3 - Test if this reduces down to a Null pointer constant.
|
|
bool | isOBJCGCCandidate (ASTContext &Ctx) const |
| isOBJCGCCandidate - Return true if this expression may be used in a read/ write barrier.
|
|
bool | isBoundMemberFunction (ASTContext &Ctx) const |
| Returns true if this expression is a bound member function.
|
|
Expr * | IgnoreUnlessSpelledInSource () |
| Skip past any invisible AST nodes which might surround this statement, such as ExprWithCleanups or ImplicitCastExpr nodes, but also injected CXXMemberExpr and CXXConstructExpr which represent implicit conversions.
|
|
const Expr * | IgnoreUnlessSpelledInSource () const |
|
Expr * | IgnoreImpCasts () LLVM_READONLY |
| Skip past any implicit casts which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreImpCasts () const |
|
Expr * | IgnoreCasts () LLVM_READONLY |
| Skip past any casts which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreCasts () const |
|
Expr * | IgnoreImplicit () LLVM_READONLY |
| Skip past any implicit AST nodes which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreImplicit () const |
|
Expr * | IgnoreImplicitAsWritten () LLVM_READONLY |
| Skip past any implicit AST nodes which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreImplicitAsWritten () const |
|
Expr * | IgnoreParens () LLVM_READONLY |
| Skip past any parentheses which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreParens () const |
|
Expr * | IgnoreParenImpCasts () LLVM_READONLY |
| Skip past any parentheses and implicit casts which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreParenImpCasts () const |
|
Expr * | IgnoreParenCasts () LLVM_READONLY |
| Skip past any parentheses and casts which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreParenCasts () const |
|
Expr * | IgnoreConversionOperatorSingleStep () LLVM_READONLY |
| Skip conversion operators.
|
|
const Expr * | IgnoreConversionOperatorSingleStep () const |
|
Expr * | IgnoreParenLValueCasts () LLVM_READONLY |
| Skip past any parentheses and lvalue casts which might surround this expression until reaching a fixed point.
|
|
const Expr * | IgnoreParenLValueCasts () const |
|
Expr * | IgnoreParenNoopCasts (const ASTContext &Ctx) LLVM_READONLY |
| Skip past any parentheses and casts which do not change the value (including ptr->int casts of the same size) until reaching a fixed point.
|
|
const Expr * | IgnoreParenNoopCasts (const ASTContext &Ctx) const |
|
Expr * | IgnoreParenBaseCasts () LLVM_READONLY |
| Skip past any parentheses and derived-to-base casts until reaching a fixed point.
|
|
const Expr * | IgnoreParenBaseCasts () const |
|
bool | isDefaultArgument () const |
| Determine whether this expression is a default function argument.
|
|
bool | isTemporaryObject (ASTContext &Ctx, const CXXRecordDecl *TempTy) const |
| Determine whether the result of this expression is a temporary object of the given class type.
|
|
bool | isImplicitCXXThis () const |
| Whether this expression is an implicit reference to 'this' in C++.
|
|
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.
|
|
const Expr * | getBestDynamicClassTypeExpr () const |
| Get the inner expression that determines the best dynamic class.
|
|
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.
|
|
const Expr * | skipRValueSubobjectAdjustments () const |
|
const Expr * | getExprStmt () const |
|
Expr * | getExprStmt () |
|
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 ()=delete |
|
| Stmt (const Stmt &)=delete |
|
| Stmt (Stmt &&)=delete |
|
Stmt & | operator= (const Stmt &)=delete |
|
Stmt & | operator= (Stmt &&)=delete |
|
| 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.
|
|
SourceLocation | getBeginLoc () const LLVM_READONLY |
|
SourceLocation | getEndLoc () const LLVM_READONLY |
|
void | dump () const |
| Dumps the specified AST fragment and all subtrees to llvm::errs() .
|
|
void | dump (raw_ostream &OS, const ASTContext &Context) const |
|
int64_t | getID (const ASTContext &Context) const |
|
void | dumpColor () const |
| dumpColor - same as dump(), but forces color highlighting.
|
|
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.
|
|
void | printPretty (raw_ostream &OS, PrinterHelper *Helper, const PrintingPolicy &Policy, unsigned Indentation=0, StringRef NewlineSymbol="\n", const ASTContext *Context=nullptr) const |
|
void | printPrettyControlled (raw_ostream &OS, PrinterHelper *Helper, const PrintingPolicy &Policy, unsigned Indentation=0, StringRef NewlineSymbol="\n", const ASTContext *Context=nullptr) const |
|
void | printJson (raw_ostream &Out, PrinterHelper *Helper, const PrintingPolicy &Policy, bool AddQuotes) const |
| Pretty-prints in JSON format.
|
|
void | viewAST () const |
| viewAST - Visualize an AST rooted at this Stmt* using GraphViz.
|
|
Stmt * | IgnoreContainers (bool IgnoreCaptured=false) |
| Skip no-op (attributed, compound) container stmts and skip captured stmt at the top, if IgnoreCaptured is true.
|
|
const Stmt * | IgnoreContainers (bool IgnoreCaptured=false) const |
|
const Stmt * | stripLabelLikeStatements () const |
| Strip off all label-like statements.
|
|
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, bool ProfileLambdaExpr=false) const |
| Produce a unique representation of the given statement.
|
|
void | ProcessODRHash (llvm::FoldingSetNodeID &ID, ODRHash &Hash) const |
| Calculate a unique representation for a statement that is stable across compiler invocations.
|
|
|
enum class | ADLCallKind : bool { NotADL
, UsesADL
} |
|
typedef ExprIterator | arg_iterator |
|
typedef ConstExprIterator | const_arg_iterator |
|
typedef llvm::iterator_range< arg_iterator > | arg_range |
|
typedef llvm::iterator_range< const_arg_iterator > | const_arg_range |
|
enum | LValueClassification {
LV_Valid
, LV_NotObjectType
, LV_IncompleteVoidType
, LV_DuplicateVectorComponents
,
LV_InvalidExpression
, LV_InvalidMessageExpression
, LV_MemberFunction
, LV_SubObjCPropertySetting
,
LV_ClassTemporary
, LV_ArrayTemporary
} |
|
enum | isModifiableLvalueResult {
MLV_Valid
, MLV_NotObjectType
, MLV_IncompleteVoidType
, MLV_DuplicateVectorComponents
,
MLV_InvalidExpression
, MLV_LValueCast
, MLV_IncompleteType
, MLV_ConstQualified
,
MLV_ConstQualifiedField
, MLV_ConstAddrSpace
, MLV_ArrayType
, MLV_NoSetterProperty
,
MLV_MemberFunction
, MLV_SubObjCPropertySetting
, MLV_InvalidMessageExpression
, MLV_ClassTemporary
,
MLV_ArrayTemporary
} |
|
enum | SideEffectsKind { SE_NoSideEffects
, SE_AllowUndefinedBehavior
, SE_AllowSideEffects
} |
|
enum class | ConstantExprKind { Normal
, NonClassTemplateArgument
, ClassTemplateArgument
, ImmediateInvocation
} |
|
enum | NullPointerConstantKind {
NPCK_NotNull = 0
, NPCK_ZeroExpression
, NPCK_ZeroLiteral
, NPCK_CXX11_nullptr
,
NPCK_GNUNull
} |
| Enumeration used to describe the kind of Null pointer constant returned from isNullPointerConstant() . More...
|
|
enum | NullPointerConstantValueDependence { NPC_NeverValueDependent = 0
, NPC_ValueDependentIsNull
, NPC_ValueDependentIsNotNull
} |
| Enumeration used to describe how isNullPointerConstant() should cope with value-dependent expressions. More...
|
|
enum | StmtClass { NoStmtClass = 0
} |
|
enum | Likelihood { LH_Unlikely = -1
, LH_None
, LH_Likely
} |
| The likelihood of a branch being taken. More...
|
|
using | child_iterator = StmtIterator |
| Child Iterators: All subclasses must implement 'children' to permit easy iteration over the substatements/subexpressions of an AST node.
|
|
using | const_child_iterator = ConstStmtIterator |
|
using | child_range = llvm::iterator_range< child_iterator > |
|
using | const_child_range = llvm::iterator_range< const_child_iterator > |
|
static constexpr ADLCallKind | NotADL = ADLCallKind::NotADL |
|
static constexpr ADLCallKind | UsesADL = ADLCallKind::UsesADL |
|
enum | { NumStmtBits = 8
} |
|
enum | { NumExprBits = NumStmtBits + 5 + llvm::BitWidth<ExprDependence>
} |
|
enum | { NumCallExprBits = 32
} |
|
enum | { NumOverloadExprBits = NumExprBits + 1
} |
|
template<typename T > |
using | ConstCastIterator = CastIterator< T, const T *const, const Stmt *const > |
| Const iterator for iterating over Stmt * arrays that contain only T *.
|
|
using | ExprIterator = CastIterator< Expr > |
|
using | ConstExprIterator = ConstCastIterator< Expr > |
|
| CallExpr (StmtClass SC, Expr *Fn, ArrayRef< Expr * > PreArgs, ArrayRef< Expr * > Args, QualType Ty, ExprValueKind VK, SourceLocation RParenLoc, FPOptionsOverride FPFeatures, unsigned MinNumArgs, ADLCallKind UsesADL) |
| Build a call expression, assuming that appropriate storage has been allocated for the trailing objects.
|
|
| CallExpr (StmtClass SC, unsigned NumPreArgs, unsigned NumArgs, bool hasFPFeatures, EmptyShell Empty) |
| Build an empty call expression, for deserialization.
|
|
Stmt * | getPreArg (unsigned I) |
|
const Stmt * | getPreArg (unsigned I) const |
|
void | setPreArg (unsigned I, Stmt *PreArg) |
|
unsigned | getNumPreArgs () const |
|
FPOptionsOverride * | getTrailingFPFeatures () |
| Return a pointer to the trailing FPOptions.
|
|
const FPOptionsOverride * | getTrailingFPFeatures () const |
|
| Expr (StmtClass SC, QualType T, ExprValueKind VK, ExprObjectKind OK) |
|
| Expr (StmtClass SC, EmptyShell) |
| Construct an empty expression.
|
|
void | setDependence (ExprDependence Deps) |
| Each concrete expr subclass is expected to compute its dependence and call this in the constructor.
|
|
| Stmt (StmtClass SC, EmptyShell) |
| Construct an empty statement.
|
|
| Stmt ()=delete |
|
| Stmt (const Stmt &)=delete |
|
| Stmt (Stmt &&)=delete |
|
| Stmt (StmtClass SC) |
|
void * | operator new (size_t bytes) noexcept |
|
void | operator delete (void *data) noexcept |
|
| Stmt (StmtClass SC, EmptyShell) |
| Construct an empty statement.
|
|
static unsigned | sizeOfTrailingObjects (unsigned NumPreArgs, unsigned NumArgs, bool HasFPFeatures) |
| Return the size in bytes needed for the trailing objects.
|
|
union { |
StmtBitfields StmtBits |
|
NullStmtBitfields NullStmtBits |
|
CompoundStmtBitfields CompoundStmtBits |
|
LabelStmtBitfields LabelStmtBits |
|
AttributedStmtBitfields AttributedStmtBits |
|
IfStmtBitfields IfStmtBits |
|
SwitchStmtBitfields SwitchStmtBits |
|
WhileStmtBitfields WhileStmtBits |
|
DoStmtBitfields DoStmtBits |
|
ForStmtBitfields ForStmtBits |
|
GotoStmtBitfields GotoStmtBits |
|
ContinueStmtBitfields ContinueStmtBits |
|
BreakStmtBitfields BreakStmtBits |
|
ReturnStmtBitfields ReturnStmtBits |
|
SwitchCaseBitfields SwitchCaseBits |
|
ExprBitfields ExprBits |
|
ConstantExprBitfields ConstantExprBits |
|
PredefinedExprBitfields PredefinedExprBits |
|
DeclRefExprBitfields DeclRefExprBits |
|
FloatingLiteralBitfields FloatingLiteralBits |
|
StringLiteralBitfields StringLiteralBits |
|
CharacterLiteralBitfields CharacterLiteralBits |
|
UnaryOperatorBitfields UnaryOperatorBits |
|
UnaryExprOrTypeTraitExprBitfields UnaryExprOrTypeTraitExprBits |
|
ArrayOrMatrixSubscriptExprBitfields ArrayOrMatrixSubscriptExprBits |
|
CallExprBitfields CallExprBits |
|
MemberExprBitfields MemberExprBits |
|
CastExprBitfields CastExprBits |
|
BinaryOperatorBitfields BinaryOperatorBits |
|
InitListExprBitfields InitListExprBits |
|
ParenListExprBitfields ParenListExprBits |
|
GenericSelectionExprBitfields GenericSelectionExprBits |
|
PseudoObjectExprBitfields PseudoObjectExprBits |
|
SourceLocExprBitfields SourceLocExprBits |
|
StmtExprBitfields StmtExprBits |
|
CXXOperatorCallExprBitfields CXXOperatorCallExprBits |
|
CXXRewrittenBinaryOperatorBitfields CXXRewrittenBinaryOperatorBits |
|
CXXBoolLiteralExprBitfields CXXBoolLiteralExprBits |
|
CXXNullPtrLiteralExprBitfields CXXNullPtrLiteralExprBits |
|
CXXThisExprBitfields CXXThisExprBits |
|
CXXThrowExprBitfields CXXThrowExprBits |
|
CXXDefaultArgExprBitfields CXXDefaultArgExprBits |
|
CXXDefaultInitExprBitfields CXXDefaultInitExprBits |
|
CXXScalarValueInitExprBitfields CXXScalarValueInitExprBits |
|
CXXNewExprBitfields CXXNewExprBits |
|
CXXDeleteExprBitfields CXXDeleteExprBits |
|
TypeTraitExprBitfields TypeTraitExprBits |
|
DependentScopeDeclRefExprBitfields DependentScopeDeclRefExprBits |
|
CXXConstructExprBitfields CXXConstructExprBits |
|
ExprWithCleanupsBitfields ExprWithCleanupsBits |
|
CXXUnresolvedConstructExprBitfields CXXUnresolvedConstructExprBits |
|
CXXDependentScopeMemberExprBitfields CXXDependentScopeMemberExprBits |
|
OverloadExprBitfields OverloadExprBits |
|
UnresolvedLookupExprBitfields UnresolvedLookupExprBits |
|
UnresolvedMemberExprBitfields UnresolvedMemberExprBits |
|
CXXNoexceptExprBitfields CXXNoexceptExprBits |
|
SubstNonTypeTemplateParmExprBitfields SubstNonTypeTemplateParmExprBits |
|
LambdaExprBitfields LambdaExprBits |
|
RequiresExprBitfields RequiresExprBits |
|
CoawaitExprBitfields CoawaitBits |
|
ObjCIndirectCopyRestoreExprBitfields ObjCIndirectCopyRestoreExprBits |
|
OpaqueValueExprBitfields OpaqueValueExprBits |
|
}; | |
|