23#include "llvm/ADT/ArrayRef.h"
24#include "llvm/ADT/StringExtras.h"
25#include "llvm/ADT/StringSet.h"
26#include "llvm/MC/MCParser/MCAsmParser.h"
34 Expr *ExprUnderCast =
nullptr;
38 ParentsToUpdate.push_back(
Parent);
39 if (
auto *ParenE = dyn_cast<ParenExpr>(
Parent)) {
40 Parent = ParenE->getSubExpr();
44 Expr *Child =
nullptr;
51 if (
auto *CastE = dyn_cast<CastExpr>(Child))
52 if (CastE->getCastKind() == CK_LValueToRValue) {
53 ExprUnderCast = CastE->getSubExpr();
62 assert(ExprUnderCast &&
63 "Should be reachable only if LValueToRValue cast was found!");
65 for (
Expr *
E : ParentsToUpdate)
111 for (
unsigned p = 0, e = AsmStrPieces.size(); p != e; ++p) {
128 if (!
Func->hasAttr<NakedAttr>())
132 WorkList.push_back(
E);
133 while (WorkList.size()) {
134 Expr *
E = WorkList.pop_back_val();
135 if (isa<CXXThisExpr>(
E)) {
137 S.
Diag(
Func->getAttr<NakedAttr>()->getLocation(), diag::note_attribute);
141 if (isa<ParmVarDecl>(DRE->getDecl())) {
142 S.
Diag(DRE->getBeginLoc(), diag::err_asm_naked_parm_ref);
143 S.
Diag(
Func->getAttr<NakedAttr>()->getLocation(), diag::note_attribute);
148 if (
Expr *
E = dyn_cast_or_null<Expr>(Child))
149 WorkList.push_back(
E);
159 bool is_input_expr) {
165 } EType = ExprSafeType;
170 EType = ExprBitfield;
172 EType = ExprVectorElt;
174 EType = ExprGlobalRegVar;
176 if (EType != ExprSafeType) {
196 if (
Target.isValidGCCRegisterName(
Attr->getLabel()))
197 return Target.getNormalizedGCCRegisterName(
Attr->getLabel(),
true);
208 Expr **Clobbers,
int NumClobbers,
unsigned NumLabels,
210 llvm::StringSet<> InOutVars;
213 for (
unsigned int i = 0; i < Exprs.size() - NumLabels; ++i) {
214 std::string Constraint =
216 StringRef InOutReg =
Target.getConstraintRegister(
219 InOutVars.insert(InOutReg);
223 for (
int i = 0; i < NumClobbers; ++i) {
224 std::string Clobber =
228 if (Clobber ==
"cc" || Clobber ==
"memory" || Clobber ==
"unwind")
230 Clobber =
Target.getNormalizedGCCRegisterName(Clobber,
true);
232 if (InOutVars.count(Clobber))
242 if (
auto *SL = dyn_cast<StringLiteral>(
Expr)) {
243 assert(SL->isOrdinary());
244 if (ForAsmLabel && SL->getString().empty()) {
246 << SL->getSourceRange();
259 if (ForAsmLabel &&
V.getArrayInitializedElts() == 0) {
270 bool IsVolatile,
unsigned NumOutputs,
276 unsigned NumClobbers = clobbers.size();
281 llvm::StringMap<bool> FeatureMap;
284 auto CreateGCCAsmStmt = [&] {
287 Names, constraints.data(), Exprs.data(), asmString,
288 NumClobbers, clobbers.data(), NumLabels, RParenLoc);
295 llvm::any_of(clobbers, [](
Expr *
E) {
298 return CreateGCCAsmStmt();
300 for (
unsigned i = 0; i != NumOutputs; i++) {
301 Expr *Constraint = constraints[i];
302 StringRef OutputName;
304 OutputName = Names[i]->
getName();
306 std::string ConstraintStr =
313 diag::err_asm_invalid_output_constraint)
315 return CreateGCCAsmStmt();
324 Expr *OutputExpr = Exprs[i];
343 OutputConstraintInfos.push_back(Info);
367 diag::err_dereference_incomplete_type))
372 diag::err_asm_invalid_lvalue_in_output)
383 return CreateGCCAsmStmt();
389 for (
unsigned i = NumOutputs, e = NumOutputs + NumInputs; i != e; i++) {
390 Expr *Constraint = constraints[i];
394 InputName = Names[i]->
getName();
396 std::string ConstraintStr =
403 diag::err_asm_invalid_input_constraint)
405 return CreateGCCAsmStmt();
413 Expr *InputExpr = Exprs[i];
417 diag::err_asm_pmf_through_constraint_not_permitted)
433 diag::err_asm_invalid_lvalue_in_input)
441 InputExpr = Exprs[i] =
Result.get();
449 llvm::APSInt IntResult;
455 diag::err_invalid_asm_value_for_constraint)
478 InputConstraintInfos.push_back(Info);
480 const Type *Ty = Exprs[i]->getType().getTypePtr();
486 diag::err_dereference_incomplete_type))
493 diag::err_asm_invalid_input_size)
497 std::optional<SourceLocation> UnwindClobberLoc;
500 for (
unsigned i = 0; i != NumClobbers; i++) {
501 Expr *ClobberExpr = clobbers[i];
503 std::string Clobber =
508 diag::err_asm_unknown_register_name)
511 Context, AsmLoc, IsSimple, IsVolatile, NumOutputs, NumInputs, Names,
512 constraints.data(), Exprs.data(), asmString, NumClobbers,
513 clobbers.data(), NumLabels, RParenLoc);
516 if (Clobber ==
"unwind") {
522 if (UnwindClobberLoc && NumLabels > 0) {
523 targetDiag(*UnwindClobberLoc, diag::err_asm_unwind_and_goto);
524 return CreateGCCAsmStmt();
531 auto GetLocation = [
this](
const Expr *Str,
unsigned Offset) {
532 if (
auto *SL = dyn_cast<StringLiteral>(Str))
539 if (
unsigned DiagID =
NS->AnalyzeAsmString(Pieces,
Context, DiagOffs)) {
540 targetDiag(GetLocation(asmString, DiagOffs), DiagID)
546 for (
unsigned i = 0, e = Pieces.size(); i != e; ++i) {
552 unsigned NumOperands =
NS->getNumOutputs() +
NS->getNumInputs();
554 if (
NS->isAsmGoto() && ConstraintIdx >= NumOperands)
558 if (ConstraintIdx >= NumOperands) {
559 unsigned I = 0,
E =
NS->getNumOutputs();
561 for (
unsigned Cnt = ConstraintIdx - NumOperands; I !=
E; ++I)
562 if (OutputConstraintInfos[I].isReadWrite() && Cnt-- == 0) {
567 assert(I !=
E &&
"Invalid operand number should have been caught in "
568 " AnalyzeAsmString");
572 Expr *Constraint = constraints[ConstraintIdx];
573 const Type *Ty = Exprs[ConstraintIdx]->getType().getTypePtr();
578 std::string SuggestedModifier;
582 targetDiag(Exprs[ConstraintIdx]->getBeginLoc(),
583 diag::warn_asm_mismatched_size_modifier);
585 if (!SuggestedModifier.empty()) {
587 diag::note_asm_missing_constraint_modifier)
588 << SuggestedModifier;
589 if (isa<StringLiteral>(Constraint)) {
590 SuggestedModifier =
"%" + SuggestedModifier + Piece.
getString();
599 unsigned NumAlternatives = ~0
U;
600 for (
unsigned i = 0, e = OutputConstraintInfos.size(); i != e; ++i) {
603 unsigned AltCount = ConstraintStr.count(
',') + 1;
604 if (NumAlternatives == ~0
U) {
605 NumAlternatives = AltCount;
606 }
else if (NumAlternatives != AltCount) {
608 diag::err_asm_unexpected_constraint_alternatives)
609 << NumAlternatives << AltCount;
615 for (
unsigned i = 0, e = InputConstraintInfos.size(); i != e; ++i) {
618 unsigned AltCount = ConstraintStr.count(
',') + 1;
619 if (NumAlternatives == ~0
U) {
620 NumAlternatives = AltCount;
621 }
else if (NumAlternatives != AltCount) {
623 diag::err_asm_unexpected_constraint_alternatives)
624 << NumAlternatives << AltCount;
634 unsigned InputOpNo = i+NumOutputs;
635 Expr *OutputExpr = Exprs[TiedTo];
636 Expr *InputExpr = Exprs[InputOpNo];
639 assert(TiedTo < InputMatchedToOutput.size() &&
"TiedTo value out of range");
640 if (InputMatchedToOutput[TiedTo] != ~0
U) {
642 diag::err_asm_input_duplicate_match)
644 targetDiag(
NS->getInputExpr(InputMatchedToOutput[TiedTo])->getBeginLoc(),
645 diag::note_asm_input_duplicate_first)
649 InputMatchedToOutput[TiedTo] = i;
662 AD_Int, AD_FP, AD_Other
663 } InputDomain, OutputDomain;
666 InputDomain = AD_Int;
670 InputDomain = AD_Other;
673 OutputDomain = AD_Int;
675 OutputDomain = AD_FP;
677 OutputDomain = AD_Other;
687 if (OutSize == InSize && InputDomain == OutputDomain &&
688 InputDomain != AD_Other)
694 bool SmallerValueMentioned =
false;
702 SmallerValueMentioned |= InSize < OutSize;
707 SmallerValueMentioned |= OutSize < InSize;
712 bool FPTiedToInt = (InputDomain == AD_FP) ^ (OutputDomain == AD_FP);
717 if (!SmallerValueMentioned && !FPTiedToInt && InputDomain != AD_Other &&
718 OutputConstraintInfos[TiedTo].allowsRegister()) {
735 if (InputDomain == AD_Int && OutputDomain == AD_Int &&
739 (OutTy->
isBooleanType() ? CK_IntegralToBoolean : CK_IntegralCast);
741 Exprs[InputOpNo] = InputExpr;
742 NS->setInputExpr(i, InputExpr);
754 Exprs, constraints.data(), clobbers.data(), NumClobbers, NumLabels,
757 targetDiag(ConstraintLoc, diag::error_inoutput_conflict_with_clobber);
760 typedef std::pair<StringRef , Expr *> NamedOperand;
762 for (
unsigned i = 0, e = NumOutputs + NumInputs + NumLabels; i != e; ++i)
764 NamedOperandList.emplace_back(
765 std::make_pair(Names[i]->getName(), Exprs[i]));
767 llvm::stable_sort(NamedOperandList, llvm::less_first());
770 std::adjacent_find(begin(NamedOperandList), end(NamedOperandList),
771 [](
const NamedOperand &LHS,
const NamedOperand &RHS) {
772 return LHS.first == RHS.first;
774 if (
Found != NamedOperandList.end()) {
776 diag::error_duplicate_asm_operand_name)
777 << (
Found + 1)->first;
778 Diag(
Found->second->getBeginLoc(), diag::note_duplicate_asm_operand_name)
791 llvm::InlineAsmIdentifierInfo &Info) {
795 return Info.setLabel(Res);
797 bool IsEnum = isa<clang::EnumType>(
T);
798 if (
DeclRefExpr *DRE = dyn_cast<clang::DeclRefExpr>(Res))
799 if (DRE->getDecl()->getKind() == Decl::EnumConstant)
802 return Info.setEnum(Eval.
Val.
getInt().getSExtValue());
804 return Info.setLabel(Res);
807 unsigned Type = Size;
810 bool IsGlobalLV =
false;
813 Info.setVar(Res, IsGlobalLV, Size,
Type);
819 bool IsUnevaluatedContext) {
821 if (IsUnevaluatedContext)
832 if (IsUnevaluatedContext)
867 Member.split(Members,
".");
874 FoundDecl = PT->getPointeeType()->getAsTagDecl();
885 for (StringRef NextMember : Members) {
887 if (
VarDecl *VD = dyn_cast<VarDecl>(FoundDecl))
892 QualType QT = TD->getUnderlyingType();
896 }
else if (
TypeDecl *TD = dyn_cast<TypeDecl>(FoundDecl))
898 ->getAsCanonical<RecordType>();
899 else if (
FieldDecl *TD = dyn_cast<FieldDecl>(FoundDecl))
905 diag::err_asm_incomplete_type))
920 FieldDecl *FD = dyn_cast<FieldDecl>(FoundDecl);
945 nullptr, NameInfo,
nullptr);
962 FD = dyn_cast<IndirectFieldDecl>(FieldResult.
getFoundDecl());
977 unsigned NumOutputs,
unsigned NumInputs,
982 bool IsSimple = (NumOutputs != 0 || NumInputs != 0);
985 bool InvalidOperand =
false;
986 for (uint64_t I = 0; I < NumOutputs + NumInputs; ++I) {
989 InvalidOperand =
true;
994 InvalidOperand =
true;
1006 true, AsmToks, NumOutputs, NumInputs,
1007 Constraints, Exprs, AsmString,
1014 bool AlwaysCreate) {
1018 if (
Label->isMSAsmLabel()) {
1023 std::string InternalName;
1024 llvm::raw_string_ostream
OS(InternalName);
1030 OS <<
"__MSASMLABEL_.${:uid}__";
1031 for (
char C : ExternalLabelName) {
1037 Label->setMSAsmLabel(
OS.str());
1043 Label->setMSAsmLabelResolved();
1046 Label->setLocation(Location);
Defines the clang::Expr interface and subclasses for C++ expressions.
llvm::MachO::Target Target
Defines the clang::Preprocessor interface.
static std::string toString(const clang::SanitizerSet &Sanitizers)
Produce a string containing comma-separated names of sanitizers in Sanitizers set.
static bool isOperandMentioned(unsigned OpNo, ArrayRef< GCCAsmStmt::AsmStringPiece > AsmStrPieces)
isOperandMentioned - Return true if the specified operand # is mentioned anywhere in the decomposed a...
static SourceLocation getClobberConflictLocation(MultiExprArg Exprs, Expr **Constraints, Expr **Clobbers, int NumClobbers, unsigned NumLabels, const TargetInfo &Target, ASTContext &Cont)
static bool CheckAsmLValue(Expr *E, Sema &S)
CheckAsmLValue - GNU C has an extremely ugly extension whereby they silently ignore "noop" casts in p...
static StringRef extractRegisterName(const Expr *Expression, const TargetInfo &Target)
static bool CheckNakedParmReference(Expr *E, Sema &S)
static bool checkExprMemoryConstraintCompat(Sema &S, Expr *E, TargetInfo::ConstraintInfo &Info, bool is_input_expr)
Returns true if given expression is not compatible with inline assembly's memory constraint; false ot...
static void removeLValueToRValueCast(Expr *E)
Remove the upper-level LValueToRValue cast from an expression.
static void emitAndFixInvalidAsmCastLValue(const Expr *LVal, Expr *BadArgument, Sema &S)
Emit a warning about usage of "noop"-like casts for lvalues (GNU extension) and fix the argument with...
Defines the clang::TypeLoc interface and its subclasses.
APValue - This class implements a discriminated union of [uninitialized] [APSInt] [APFloat],...
bool toIntegralConstant(APSInt &Result, QualType SrcTy, const ASTContext &Ctx) const
Try to convert this value to an integral constant.
Holds long-lived AST nodes (such as types and decls) that can be referred to throughout the semantic ...
const ASTRecordLayout & getASTRecordLayout(const RecordDecl *D) const
Get or compute information about the layout of the specified record (struct/union/class) D,...
bool hasSameType(QualType T1, QualType T2) const
Determine whether the given types T1 and T2 are equivalent.
QualType getIntTypeForBitwidth(unsigned DestWidth, unsigned Signed) const
getIntTypeForBitwidth - sets integer QualTy according to specified details: bitwidth,...
const ArrayType * getAsArrayType(QualType T) const
Type Query functions.
uint64_t getTypeSize(QualType T) const
Return the size of the specified (complete) type T, in bits.
CharUnits getTypeSizeInChars(QualType T) const
Return the size of the specified (complete) type T, in characters.
CanQualType getCanonicalTypeDeclType(const TypeDecl *TD) const
const TargetInfo & getTargetInfo() const
CharUnits toCharUnitsFromBits(int64_t BitSize) const
Convert a size in bits to a size in characters.
void getFunctionFeatureMap(llvm::StringMap< bool > &FeatureMap, const FunctionDecl *) const
ASTRecordLayout - This class contains layout information for one RecordDecl, which is a struct/union/...
uint64_t getFieldOffset(unsigned FieldNo) const
getFieldOffset - Get the offset of the given field index, in bits.
Attr - This represents one attribute.
static CXXDependentScopeMemberExpr * Create(const ASTContext &Ctx, Expr *Base, QualType BaseType, bool IsArrow, SourceLocation OperatorLoc, NestedNameSpecifierLoc QualifierLoc, SourceLocation TemplateKWLoc, NamedDecl *FirstQualifierFoundInScope, DeclarationNameInfo MemberNameInfo, const TemplateArgumentListInfo *TemplateArgs)
Represents a C++ nested-name-specifier or a global scope specifier.
CastExpr - Base class for type casts, including both implicit casts (ImplicitCastExpr) and explicit c...
SourceLocation getBegin() const
CharUnits - This is an opaque type for sizes expressed in character units.
QuantityType getQuantity() const
getQuantity - Get the raw integer representation of this quantity.
ConstantExpr - An expression that occurs in a constant context and optionally the result of evaluatin...
void SetResult(APValue Value, const ASTContext &Context)
static ConstantExpr * Create(const ASTContext &Context, Expr *E, const APValue &Result)
A reference to a declared variable, function, enum, etc.
SourceLocation getLocation() const
This represents one expression.
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 sa...
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 incomplet...
bool isValueDependent() const
Determines whether the value of this expression depends on.
ExprValueKind getValueKind() const
getValueKind - The value kind that this expression produces.
bool refersToVectorElement() const
Returns whether this expression refers to a vector element.
bool isTypeDependent() const
Determines whether the type of this expression depends on.
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 ...
bool isEvaluatable(const ASTContext &Ctx, SideEffectsKind AllowSideEffects=SE_NoSideEffects) const
isEvaluatable - Call EvaluateAsRValue to see if this expression can be constant folded without side-e...
bool isLValue() const
isLValue - True if this expression is an "l-value" according to the rules of the current language.
FieldDecl * getSourceBitField()
If this expression refers to a bit-field, retrieve the declaration of that bit-field.
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 t...
void setValueKind(ExprValueKind Cat)
setValueKind - Set the value kind produced by this expression.
SourceLocation getExprLoc() const LLVM_READONLY
getExprLoc - Return the preferred location for the arrow when diagnosing a problem with a generic exp...
bool refersToBitField() const
Returns true if this expression is a gl-value that potentially refers to a bit-field.
bool refersToGlobalRegisterVar() const
Returns whether this expression refers to a global register variable.
ExprDependence getDependence() const
Represents a member of a struct/union/class.
unsigned getFieldIndex() const
Returns the index of this field within its record, as appropriate for passing to ASTRecordLayout::get...
static FixItHint CreateReplacement(CharSourceRange RemoveRange, StringRef Code)
Create a code modification hint that replaces the given source range with the given code string.
Represents a function declaration or definition.
AsmStringPiece - this is part of a decomposed asm string specification (for use with the AnalyzeAsmSt...
const std::string & getString() const
unsigned getOperandNo() const
CharSourceRange getRange() const
char getModifier() const
getModifier - Get the modifier for this operand, if present.
This represents a GCC inline-assembly statement extension.
static std::string ExtractStringFromGCCAsmStmtComponent(const Expr *E)
One of these records is kept for each identifier that is lexed.
StringRef getName() const
Return the actual identifier string.
IdentifierInfo & get(StringRef Name)
Return the identifier token info for the specified named identifier.
Represents the declaration of a label.
Represents the results of name lookup.
NamedDecl * getFoundDecl() const
Fetch the unique decl found by this lookup.
bool isSingleResult() const
Determines if this names a single result which is not an unresolved value using decl.
This represents a Microsoft inline-assembly statement extension.
This represents a decl that may have a name.
A C++ nested-name-specifier augmented with source location information.
PointerType - C99 6.7.5.1 - Pointer Declarators.
IdentifierInfo * getIdentifierInfo(StringRef Name) const
Return information about the specified preprocessor identifier token.
A (possibly-)qualified type.
bool isNull() const
Return true if this QualType doesn't point to a type yet.
Represents a struct/union/class.
RecordDecl * getDefinitionOrSelf() const
A helper class that allows the use of isa/cast/dyncast to detect TagType objects of structs/unions/cl...
RecordDecl * getOriginalDecl() const
SemaDiagnosticBuilder Diag(SourceLocation Loc, unsigned DiagID, bool DeferHint=false)
Emit a diagnostic.
Sema - This implements semantic analysis and AST building for C.
QualType getCurrentThisType()
Try to retrieve the type of the 'this' pointer.
Scope * getCurScope() const
Retrieve the parser's current scope.
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)
@ LookupOrdinaryName
Ordinary name lookup, which finds ordinary names (functions, variables, typedefs, etc....
@ LookupMemberName
Member name lookup, which finds the names of class/struct/union members.
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)
void PushExpressionEvaluationContext(ExpressionEvaluationContext NewContext, Decl *LambdaContextDecl=nullptr, ExpressionEvaluationContextRecord::ExpressionKind Type=ExpressionEvaluationContextRecord::EK_Other)
ExprResult ActOnIdExpression(Scope *S, CXXScopeSpec &SS, SourceLocation TemplateKWLoc, UnqualifiedId &Id, bool HasTrailingLParen, bool IsAddressOfOperand, CorrectionCandidateCallback *CCC=nullptr, bool IsInlineAsmIdentifier=false, Token *KeywordReplacement=nullptr)
void setFunctionHasBranchIntoScope()
ExprResult LookupInlineAsmIdentifier(CXXScopeSpec &SS, SourceLocation TemplateKWLoc, UnqualifiedId &Id, bool IsUnevaluatedContext)
void CleanupVarDeclMarking()
ExprResult DefaultFunctionArrayLvalueConversion(Expr *E, bool Diagnose=true)
ASTContext & getASTContext() const
void PopExpressionEvaluationContext()
ExprResult ImpCastExprToType(Expr *E, QualType Type, CastKind CK, ExprValueKind VK=VK_PRValue, const CXXCastPath *BasePath=nullptr, CheckedConversionKind CCK=CheckedConversionKind::Implicit)
ImpCastExprToType - If Expr is not of type 'Type', insert an implicit cast.
const LangOptions & getLangOpts() const
bool RequireCompleteExprType(Expr *E, CompleteTypeKind Kind, TypeDiagnoser &Diagnoser)
Ensure that the type of the given expression is complete.
bool DiagnoseUnexpandedParameterPack(SourceLocation Loc, TypeSourceInfo *T, UnexpandedParameterPackContext UPPC)
If the given type contains an unexpanded parameter pack, diagnose the error.
const LangOptions & LangOpts
void MarkAnyDeclReferenced(SourceLocation Loc, Decl *D, bool MightBeOdrUse)
Perform marking for a reference to an arbitrary declaration.
DeclContext * getCurLexicalContext() const
bool EvaluateAsString(Expr *Message, APValue &Result, ASTContext &Ctx, StringEvaluationContext EvalContext, bool ErrorOnInvalidMessage)
SourceLocation getLocationOfStringLiteralByte(const StringLiteral *SL, unsigned ByteNo) const
DeclContext * CurContext
CurContext - This is the current declaration context of parsing.
void FillInlineAsmIdentifierInfo(Expr *Res, llvm::InlineAsmIdentifierInfo &Info)
ExprResult CheckPlaceholderExpr(Expr *E)
Check for operands with placeholder types and complain if found.
bool LookupInlineAsmField(StringRef Base, StringRef Member, unsigned &Offset, SourceLocation AsmLoc)
LabelDecl * LookupOrCreateLabel(IdentifierInfo *II, SourceLocation IdentLoc, SourceLocation GnuLabelLoc=SourceLocation())
LookupOrCreateLabel - Do a name lookup of a label with the specified name.
ExprResult LookupInlineAsmVarDeclField(Expr *RefExpr, StringRef Member, SourceLocation AsmLoc)
void setFunctionHasBranchProtectedScope()
@ UnevaluatedAbstract
The current expression occurs within an unevaluated operand that unconditionally permits abstract ref...
bool RequireCompleteType(SourceLocation Loc, QualType T, CompleteTypeKind Kind, TypeDiagnoser &Diagnoser)
Ensure that the type T is a complete type.
bool LookupQualifiedName(LookupResult &R, DeclContext *LookupCtx, bool InUnqualifiedLookup=false)
Perform qualified name lookup into a given context.
void DiscardCleanupsInEvaluationContext()
LabelDecl * GetOrCreateMSAsmLabel(StringRef ExternalLabelName, SourceLocation Location, bool AlwaysCreate)
SemaDiagnosticBuilder targetDiag(SourceLocation Loc, unsigned DiagID, const FunctionDecl *FD=nullptr)
ExprResult ActOnGCCAsmStmtString(Expr *Stm, bool ForAsmLabel)
bool LookupName(LookupResult &R, Scope *S, bool AllowBuiltinCreation=false, bool ForceNoCPlusPlus=false)
Perform unqualified name lookup starting from a given scope.
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)
Encodes a location in the source.
bool isValid() const
Return true if this is a valid SourceLocation object.
Stmt - This represents one statement.
SourceRange getSourceRange() const LLVM_READONLY
SourceLocation tokens are not useful in isolation - they are low level value objects created/interpre...
SourceLocation getBeginLoc() const LLVM_READONLY
Exposes information about the current target.
bool validateInputConstraint(MutableArrayRef< ConstraintInfo > OutputConstraints, ConstraintInfo &info) const
virtual bool validateOutputSize(const llvm::StringMap< bool > &FeatureMap, StringRef, unsigned) const
virtual bool validateInputSize(const llvm::StringMap< bool > &FeatureMap, StringRef, unsigned) const
virtual bool validateConstraintModifier(StringRef, char, unsigned, std::string &) const
bool validateOutputConstraint(ConstraintInfo &Info) const
bool isValidClobber(StringRef Name) const
Returns whether the passed in string is a valid clobber in an inline asm statement.
Represents a declaration of a type.
The base class of the type hierarchy.
bool isStructureType() const
bool isBooleanType() const
RecordDecl * getAsRecordDecl() const
Retrieves the RecordDecl this type refers to.
bool isPointerType() const
bool isIntegerType() const
isIntegerType() does not include complex integers (a GCC extension).
QualType getPointeeType() const
If this is a pointer, ObjC object pointer, or block pointer, this returns the respective pointee.
bool isBitIntType() const
bool isDependentType() const
Whether this type is a dependent type, meaning that its definition somehow depends on a template para...
bool isMemberPointerType() const
bool isIncompleteType(NamedDecl **Def=nullptr) const
Types are partitioned into 3 broad categories (C99 6.2.5p1): object types, function types,...
bool isFunctionType() const
bool isRealFloatingType() const
Floating point categories.
const T * getAsCanonical() const
If this type is canonically the specified type, return its canonical type cast to that specified type...
const T * getAs() const
Member-template getAs<specific type>'.
Base class for declarations which introduce a typedef-name.
Represents a C++ unqualified-id that has been parsed.
Represent the declaration of a variable (in which case it is an lvalue) a function (in which case it ...
Represents a variable declaration or definition.
StorageClass getStorageClass() const
Returns the storage class as written in the source.
Defines the clang::TargetInfo interface.
The JSON file list parser is used to communicate input to InstallAPI.
@ Result
The result type of a method or function.
ActionResult< Expr * > ExprResult
CastKind
CastKind - The kind of operation required for a conversion.
const FunctionProtoType * T
ActionResult< CXXBaseSpecifier * > BaseResult
DeclarationNameInfo - A collector data type for bundling together a DeclarationName and the correspon...
void setLoc(SourceLocation L)
setLoc - Sets the main location of the declaration name.
void setName(DeclarationName N)
setName - Sets the embedded declaration name.
EvalResult is a struct with detailed info about an evaluated expression.
APValue Val
Val - This is the value the expression can be folded to.
bool isGlobalLValue() const
const std::string & getConstraintStr() const
unsigned getTiedOperand() const
bool allowsMemory() const
bool isValidAsmImmediate(const llvm::APInt &Value) const
bool requiresImmediateConstant() const
bool hasTiedOperand() const
Return true if this input operand is a matching constraint that ties it to an output operand.
bool allowsRegister() const