A rewritten comparison expression that was originally written using operator syntax.
More...
|
| CXXRewrittenBinaryOperator (Expr *SemanticForm, bool IsReversed) |
|
| CXXRewrittenBinaryOperator (EmptyShell Empty) |
|
Expr * | getSemanticForm () |
| Get an equivalent semantic form for this expression. More...
|
|
const Expr * | getSemanticForm () const |
|
DecomposedForm | getDecomposedForm () const LLVM_READONLY |
| Decompose this operator into its syntactic form. More...
|
|
bool | isReversed () const |
| Determine whether this expression was rewritten in reverse form. More...
|
|
BinaryOperatorKind | getOperator () const |
|
const Expr * | getLHS () const |
|
const Expr * | getRHS () const |
|
SourceLocation | getOperatorLoc () const LLVM_READONLY |
|
SourceLocation | getExprLoc () const LLVM_READONLY |
|
child_range | children () |
|
|
SourceLocation | getBeginLoc () const LLVM_READONLY |
| Compute the begin and end locations from the decomposed form. More...
|
|
SourceLocation | getEndLoc () const LLVM_READONLY |
|
SourceRange | getSourceRange () const LLVM_READONLY |
|
| 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) |
|
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, 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. More...
|
|
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. More...
|
|
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. More...
|
|
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. More...
|
|
bool | EvaluateAsFixedPoint (EvalResult &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 fixed point value. 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...
|
|
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. 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 | EvaluateAsConstantExpr (EvalResult &Result, ConstExprUsage Usage, const ASTContext &Ctx) const |
| Evaluate an expression that is required to be a constant expression. 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 |
| Skip past any implicit casts which might surround this expression until reaching a fixed point. More...
|
|
const Expr * | IgnoreImpCasts () const |
|
Expr * | IgnoreCasts () LLVM_READONLY |
| Skip past any casts which might surround this expression until reaching a fixed point. More...
|
|
const Expr * | IgnoreCasts () const |
|
Expr * | IgnoreImplicit () LLVM_READONLY |
| Skip past any implicit AST nodes which might surround this expression until reaching a fixed point. More...
|
|
const Expr * | IgnoreImplicit () const |
|
Expr * | IgnoreParens () LLVM_READONLY |
| Skip past any parentheses which might surround this expression until reaching a fixed point. More...
|
|
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. More...
|
|
const Expr * | IgnoreParenImpCasts () const |
|
Expr * | IgnoreParenCasts () LLVM_READONLY |
| Skip past any parentheses and casts which might surround this expression until reaching a fixed point. More...
|
|
const Expr * | IgnoreParenCasts () const |
|
Expr * | IgnoreConversionOperator () LLVM_READONLY |
| Skip conversion operators. More...
|
|
const Expr * | IgnoreConversionOperator () const |
|
Expr * | IgnoreParenLValueCasts () LLVM_READONLY |
| Skip past any parentheses and lvalue casts which might surround this expression until reaching a fixed point. More...
|
|
const Expr * | IgnoreParenLValueCasts () const |
|
Expr * | IgnoreParenNoopCasts (const ASTContext &Ctx) LLVM_READONLY |
| Skip past any parenthese and casts which do not change the value (including ptr->int casts of the same size) until reaching a fixed point. More...
|
|
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. More...
|
|
const Expr * | ignoreParenBaseCasts () const |
|
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 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 |
|
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 |
|
bool | isOMPStructuredBlock () const |
|
void | setIsOMPStructuredBlock (bool IsOMPStructuredBlock) |
|
SourceRange | getSourceRange () const LLVM_READONLY |
| SourceLocation tokens are not useful in isolation - they are low level value objects created/interpreted by SourceManager. More...
|
|
SourceLocation | getBeginLoc () const LLVM_READONLY |
|
SourceLocation | getEndLoc () 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 |
|
int64_t | getID (const ASTContext &Context) 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, StringRef NewlineSymbol="\, const ASTContext *Context=nullptr) const |
|
void | printJson (raw_ostream &Out, PrinterHelper *Helper, const PrintingPolicy &Policy, bool AddQuotes) const |
| Pretty-prints in JSON format. More...
|
|
void | viewAST () const |
| viewAST - Visualize an AST rooted at this Stmt* using GraphViz. More...
|
|
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 * | IgnoreContainers (bool IgnoreCaptured=false) const |
|
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...
|
|
A rewritten comparison expression that was originally written using operator syntax.
In C++20, the following rewrites are performed:
a == b
-> b == a
a != b
-> !(a == b)
a != b
-> !(b == a)
- For
@
in <
, <=
, >
, >=
, <=>
:
a @ b
-> (a <=> b) @ 0
a @ b
-> 0 @ (b <=> a)
This expression provides access to both the original syntax and the rewritten expression.
Note that the rewritten calls to ==
, <=>
, and @
are typically CXXOperatorCallExprs
, but could theoretically be BinaryOperators
.
Definition at line 273 of file ExprCXX.h.