1 //===--- SemaDeclAttr.cpp - Declaration Attribute Handling ----------------===//
2 //
3 // Part of the LLVM Project, under the Apache License v2.0 with LLVM Exceptions.
4 // See https://llvm.org/LICENSE.txt for license information.
5 // SPDX-License-Identifier: Apache-2.0 WITH LLVM-exception
6 //
7 //===----------------------------------------------------------------------===//
8 //
9 // This file implements decl-related attribute processing.
10 //
11 //===----------------------------------------------------------------------===//
12
13 #include "clang/AST/ASTConsumer.h"
14 #include "clang/AST/ASTContext.h"
15 #include "clang/AST/ASTMutationListener.h"
16 #include "clang/AST/CXXInheritance.h"
17 #include "clang/AST/DeclCXX.h"
18 #include "clang/AST/DeclObjC.h"
19 #include "clang/AST/DeclTemplate.h"
20 #include "clang/AST/Expr.h"
21 #include "clang/AST/ExprCXX.h"
22 #include "clang/AST/Mangle.h"
23 #include "clang/AST/RecursiveASTVisitor.h"
24 #include "clang/AST/Type.h"
25 #include "clang/Basic/CharInfo.h"
26 #include "clang/Basic/DarwinSDKInfo.h"
27 #include "clang/Basic/LangOptions.h"
28 #include "clang/Basic/SourceLocation.h"
29 #include "clang/Basic/SourceManager.h"
30 #include "clang/Basic/TargetBuiltins.h"
31 #include "clang/Basic/TargetInfo.h"
32 #include "clang/Lex/Preprocessor.h"
33 #include "clang/Sema/DeclSpec.h"
34 #include "clang/Sema/DelayedDiagnostic.h"
35 #include "clang/Sema/Initialization.h"
36 #include "clang/Sema/Lookup.h"
37 #include "clang/Sema/ParsedAttr.h"
38 #include "clang/Sema/Scope.h"
39 #include "clang/Sema/ScopeInfo.h"
40 #include "clang/Sema/SemaInternal.h"
41 #include "llvm/ADT/Optional.h"
42 #include "llvm/ADT/STLExtras.h"
43 #include "llvm/ADT/StringExtras.h"
44 #include "llvm/IR/Assumptions.h"
45 #include "llvm/MC/MCSectionMachO.h"
46 #include "llvm/Support/Error.h"
47 #include "llvm/Support/MathExtras.h"
48 #include "llvm/Support/raw_ostream.h"
49
50 using namespace clang;
51 using namespace sema;
52
53 namespace AttributeLangSupport {
54 enum LANG {
55 C,
56 Cpp,
57 ObjC
58 };
59 } // end namespace AttributeLangSupport
60
61 //===----------------------------------------------------------------------===//
62 // Helper functions
63 //===----------------------------------------------------------------------===//
64
65 /// isFunctionOrMethod - Return true if the given decl has function
66 /// type (function or function-typed variable) or an Objective-C
67 /// method.
isFunctionOrMethod(const Decl * D)68 static bool isFunctionOrMethod(const Decl *D) {
69 return (D->getFunctionType() != nullptr) || isa<ObjCMethodDecl>(D);
70 }
71
72 /// Return true if the given decl has function type (function or
73 /// function-typed variable) or an Objective-C method or a block.
isFunctionOrMethodOrBlock(const Decl * D)74 static bool isFunctionOrMethodOrBlock(const Decl *D) {
75 return isFunctionOrMethod(D) || isa<BlockDecl>(D);
76 }
77
78 /// Return true if the given decl has a declarator that should have
79 /// been processed by Sema::GetTypeForDeclarator.
hasDeclarator(const Decl * D)80 static bool hasDeclarator(const Decl *D) {
81 // In some sense, TypedefDecl really *ought* to be a DeclaratorDecl.
82 return isa<DeclaratorDecl>(D) || isa<BlockDecl>(D) || isa<TypedefNameDecl>(D) ||
83 isa<ObjCPropertyDecl>(D);
84 }
85
86 /// hasFunctionProto - Return true if the given decl has a argument
87 /// information. This decl should have already passed
88 /// isFunctionOrMethod or isFunctionOrMethodOrBlock.
hasFunctionProto(const Decl * D)89 static bool hasFunctionProto(const Decl *D) {
90 if (const FunctionType *FnTy = D->getFunctionType())
91 return isa<FunctionProtoType>(FnTy);
92 return isa<ObjCMethodDecl>(D) || isa<BlockDecl>(D);
93 }
94
95 /// getFunctionOrMethodNumParams - Return number of function or method
96 /// parameters. It is an error to call this on a K&R function (use
97 /// hasFunctionProto first).
getFunctionOrMethodNumParams(const Decl * D)98 static unsigned getFunctionOrMethodNumParams(const Decl *D) {
99 if (const FunctionType *FnTy = D->getFunctionType())
100 return cast<FunctionProtoType>(FnTy)->getNumParams();
101 if (const auto *BD = dyn_cast<BlockDecl>(D))
102 return BD->getNumParams();
103 return cast<ObjCMethodDecl>(D)->param_size();
104 }
105
getFunctionOrMethodParam(const Decl * D,unsigned Idx)106 static const ParmVarDecl *getFunctionOrMethodParam(const Decl *D,
107 unsigned Idx) {
108 if (const auto *FD = dyn_cast<FunctionDecl>(D))
109 return FD->getParamDecl(Idx);
110 if (const auto *MD = dyn_cast<ObjCMethodDecl>(D))
111 return MD->getParamDecl(Idx);
112 if (const auto *BD = dyn_cast<BlockDecl>(D))
113 return BD->getParamDecl(Idx);
114 return nullptr;
115 }
116
getFunctionOrMethodParamType(const Decl * D,unsigned Idx)117 static QualType getFunctionOrMethodParamType(const Decl *D, unsigned Idx) {
118 if (const FunctionType *FnTy = D->getFunctionType())
119 return cast<FunctionProtoType>(FnTy)->getParamType(Idx);
120 if (const auto *BD = dyn_cast<BlockDecl>(D))
121 return BD->getParamDecl(Idx)->getType();
122
123 return cast<ObjCMethodDecl>(D)->parameters()[Idx]->getType();
124 }
125
getFunctionOrMethodParamRange(const Decl * D,unsigned Idx)126 static SourceRange getFunctionOrMethodParamRange(const Decl *D, unsigned Idx) {
127 if (auto *PVD = getFunctionOrMethodParam(D, Idx))
128 return PVD->getSourceRange();
129 return SourceRange();
130 }
131
getFunctionOrMethodResultType(const Decl * D)132 static QualType getFunctionOrMethodResultType(const Decl *D) {
133 if (const FunctionType *FnTy = D->getFunctionType())
134 return FnTy->getReturnType();
135 return cast<ObjCMethodDecl>(D)->getReturnType();
136 }
137
getFunctionOrMethodResultSourceRange(const Decl * D)138 static SourceRange getFunctionOrMethodResultSourceRange(const Decl *D) {
139 if (const auto *FD = dyn_cast<FunctionDecl>(D))
140 return FD->getReturnTypeSourceRange();
141 if (const auto *MD = dyn_cast<ObjCMethodDecl>(D))
142 return MD->getReturnTypeSourceRange();
143 return SourceRange();
144 }
145
isFunctionOrMethodVariadic(const Decl * D)146 static bool isFunctionOrMethodVariadic(const Decl *D) {
147 if (const FunctionType *FnTy = D->getFunctionType())
148 return cast<FunctionProtoType>(FnTy)->isVariadic();
149 if (const auto *BD = dyn_cast<BlockDecl>(D))
150 return BD->isVariadic();
151 return cast<ObjCMethodDecl>(D)->isVariadic();
152 }
153
isInstanceMethod(const Decl * D)154 static bool isInstanceMethod(const Decl *D) {
155 if (const auto *MethodDecl = dyn_cast<CXXMethodDecl>(D))
156 return MethodDecl->isInstance();
157 return false;
158 }
159
isNSStringType(QualType T,ASTContext & Ctx,bool AllowNSAttributedString=false)160 static inline bool isNSStringType(QualType T, ASTContext &Ctx,
161 bool AllowNSAttributedString = false) {
162 const auto *PT = T->getAs<ObjCObjectPointerType>();
163 if (!PT)
164 return false;
165
166 ObjCInterfaceDecl *Cls = PT->getObjectType()->getInterface();
167 if (!Cls)
168 return false;
169
170 IdentifierInfo* ClsName = Cls->getIdentifier();
171
172 if (AllowNSAttributedString &&
173 ClsName == &Ctx.Idents.get("NSAttributedString"))
174 return true;
175 // FIXME: Should we walk the chain of classes?
176 return ClsName == &Ctx.Idents.get("NSString") ||
177 ClsName == &Ctx.Idents.get("NSMutableString");
178 }
179
isCFStringType(QualType T,ASTContext & Ctx)180 static inline bool isCFStringType(QualType T, ASTContext &Ctx) {
181 const auto *PT = T->getAs<PointerType>();
182 if (!PT)
183 return false;
184
185 const auto *RT = PT->getPointeeType()->getAs<RecordType>();
186 if (!RT)
187 return false;
188
189 const RecordDecl *RD = RT->getDecl();
190 if (RD->getTagKind() != TTK_Struct)
191 return false;
192
193 return RD->getIdentifier() == &Ctx.Idents.get("__CFString");
194 }
195
getNumAttributeArgs(const ParsedAttr & AL)196 static unsigned getNumAttributeArgs(const ParsedAttr &AL) {
197 // FIXME: Include the type in the argument list.
198 return AL.getNumArgs() + AL.hasParsedType();
199 }
200
201 /// A helper function to provide Attribute Location for the Attr types
202 /// AND the ParsedAttr.
203 template <typename AttrInfo>
204 static std::enable_if_t<std::is_base_of<Attr, AttrInfo>::value, SourceLocation>
getAttrLoc(const AttrInfo & AL)205 getAttrLoc(const AttrInfo &AL) {
206 return AL.getLocation();
207 }
getAttrLoc(const ParsedAttr & AL)208 static SourceLocation getAttrLoc(const ParsedAttr &AL) { return AL.getLoc(); }
209
210 /// If Expr is a valid integer constant, get the value of the integer
211 /// expression and return success or failure. May output an error.
212 ///
213 /// Negative argument is implicitly converted to unsigned, unless
214 /// \p StrictlyUnsigned is true.
215 template <typename AttrInfo>
checkUInt32Argument(Sema & S,const AttrInfo & AI,const Expr * Expr,uint32_t & Val,unsigned Idx=UINT_MAX,bool StrictlyUnsigned=false)216 static bool checkUInt32Argument(Sema &S, const AttrInfo &AI, const Expr *Expr,
217 uint32_t &Val, unsigned Idx = UINT_MAX,
218 bool StrictlyUnsigned = false) {
219 Optional<llvm::APSInt> I = llvm::APSInt(32);
220 if (Expr->isTypeDependent() ||
221 !(I = Expr->getIntegerConstantExpr(S.Context))) {
222 if (Idx != UINT_MAX)
223 S.Diag(getAttrLoc(AI), diag::err_attribute_argument_n_type)
224 << &AI << Idx << AANT_ArgumentIntegerConstant
225 << Expr->getSourceRange();
226 else
227 S.Diag(getAttrLoc(AI), diag::err_attribute_argument_type)
228 << &AI << AANT_ArgumentIntegerConstant << Expr->getSourceRange();
229 return false;
230 }
231
232 if (!I->isIntN(32)) {
233 S.Diag(Expr->getExprLoc(), diag::err_ice_too_large)
234 << toString(*I, 10, false) << 32 << /* Unsigned */ 1;
235 return false;
236 }
237
238 if (StrictlyUnsigned && I->isSigned() && I->isNegative()) {
239 S.Diag(getAttrLoc(AI), diag::err_attribute_requires_positive_integer)
240 << &AI << /*non-negative*/ 1;
241 return false;
242 }
243
244 Val = (uint32_t)I->getZExtValue();
245 return true;
246 }
247
248 /// Wrapper around checkUInt32Argument, with an extra check to be sure
249 /// that the result will fit into a regular (signed) int. All args have the same
250 /// purpose as they do in checkUInt32Argument.
251 template <typename AttrInfo>
checkPositiveIntArgument(Sema & S,const AttrInfo & AI,const Expr * Expr,int & Val,unsigned Idx=UINT_MAX)252 static bool checkPositiveIntArgument(Sema &S, const AttrInfo &AI, const Expr *Expr,
253 int &Val, unsigned Idx = UINT_MAX) {
254 uint32_t UVal;
255 if (!checkUInt32Argument(S, AI, Expr, UVal, Idx))
256 return false;
257
258 if (UVal > (uint32_t)std::numeric_limits<int>::max()) {
259 llvm::APSInt I(32); // for toString
260 I = UVal;
261 S.Diag(Expr->getExprLoc(), diag::err_ice_too_large)
262 << toString(I, 10, false) << 32 << /* Unsigned */ 0;
263 return false;
264 }
265
266 Val = UVal;
267 return true;
268 }
269
270 /// Diagnose mutually exclusive attributes when present on a given
271 /// declaration. Returns true if diagnosed.
272 template <typename AttrTy>
checkAttrMutualExclusion(Sema & S,Decl * D,const ParsedAttr & AL)273 static bool checkAttrMutualExclusion(Sema &S, Decl *D, const ParsedAttr &AL) {
274 if (const auto *A = D->getAttr<AttrTy>()) {
275 S.Diag(AL.getLoc(), diag::err_attributes_are_not_compatible) << AL << A;
276 S.Diag(A->getLocation(), diag::note_conflicting_attribute);
277 return true;
278 }
279 return false;
280 }
281
282 template <typename AttrTy>
checkAttrMutualExclusion(Sema & S,Decl * D,const Attr & AL)283 static bool checkAttrMutualExclusion(Sema &S, Decl *D, const Attr &AL) {
284 if (const auto *A = D->getAttr<AttrTy>()) {
285 S.Diag(AL.getLocation(), diag::err_attributes_are_not_compatible) << &AL
286 << A;
287 S.Diag(A->getLocation(), diag::note_conflicting_attribute);
288 return true;
289 }
290 return false;
291 }
292
293 /// Check if IdxExpr is a valid parameter index for a function or
294 /// instance method D. May output an error.
295 ///
296 /// \returns true if IdxExpr is a valid index.
297 template <typename AttrInfo>
checkFunctionOrMethodParameterIndex(Sema & S,const Decl * D,const AttrInfo & AI,unsigned AttrArgNum,const Expr * IdxExpr,ParamIdx & Idx,bool CanIndexImplicitThis=false)298 static bool checkFunctionOrMethodParameterIndex(
299 Sema &S, const Decl *D, const AttrInfo &AI, unsigned AttrArgNum,
300 const Expr *IdxExpr, ParamIdx &Idx, bool CanIndexImplicitThis = false) {
301 assert(isFunctionOrMethodOrBlock(D));
302
303 // In C++ the implicit 'this' function parameter also counts.
304 // Parameters are counted from one.
305 bool HP = hasFunctionProto(D);
306 bool HasImplicitThisParam = isInstanceMethod(D);
307 bool IV = HP && isFunctionOrMethodVariadic(D);
308 unsigned NumParams =
309 (HP ? getFunctionOrMethodNumParams(D) : 0) + HasImplicitThisParam;
310
311 Optional<llvm::APSInt> IdxInt;
312 if (IdxExpr->isTypeDependent() ||
313 !(IdxInt = IdxExpr->getIntegerConstantExpr(S.Context))) {
314 S.Diag(getAttrLoc(AI), diag::err_attribute_argument_n_type)
315 << &AI << AttrArgNum << AANT_ArgumentIntegerConstant
316 << IdxExpr->getSourceRange();
317 return false;
318 }
319
320 unsigned IdxSource = IdxInt->getLimitedValue(UINT_MAX);
321 if (IdxSource < 1 || (!IV && IdxSource > NumParams)) {
322 S.Diag(getAttrLoc(AI), diag::err_attribute_argument_out_of_bounds)
323 << &AI << AttrArgNum << IdxExpr->getSourceRange();
324 return false;
325 }
326 if (HasImplicitThisParam && !CanIndexImplicitThis) {
327 if (IdxSource == 1) {
328 S.Diag(getAttrLoc(AI), diag::err_attribute_invalid_implicit_this_argument)
329 << &AI << IdxExpr->getSourceRange();
330 return false;
331 }
332 }
333
334 Idx = ParamIdx(IdxSource, D);
335 return true;
336 }
337
338 /// Check if the argument \p E is a ASCII string literal. If not emit an error
339 /// and return false, otherwise set \p Str to the value of the string literal
340 /// and return true.
checkStringLiteralArgumentAttr(const AttributeCommonInfo & CI,const Expr * E,StringRef & Str,SourceLocation * ArgLocation)341 bool Sema::checkStringLiteralArgumentAttr(const AttributeCommonInfo &CI,
342 const Expr *E, StringRef &Str,
343 SourceLocation *ArgLocation) {
344 const auto *Literal = dyn_cast<StringLiteral>(E->IgnoreParenCasts());
345 if (ArgLocation)
346 *ArgLocation = E->getBeginLoc();
347
348 if (!Literal || !Literal->isOrdinary()) {
349 Diag(E->getBeginLoc(), diag::err_attribute_argument_type)
350 << CI << AANT_ArgumentString;
351 return false;
352 }
353
354 Str = Literal->getString();
355 return true;
356 }
357
358 /// Check if the argument \p ArgNum of \p Attr is a ASCII string literal.
359 /// If not emit an error and return false. If the argument is an identifier it
360 /// will emit an error with a fixit hint and treat it as if it was a string
361 /// literal.
checkStringLiteralArgumentAttr(const ParsedAttr & AL,unsigned ArgNum,StringRef & Str,SourceLocation * ArgLocation)362 bool Sema::checkStringLiteralArgumentAttr(const ParsedAttr &AL, unsigned ArgNum,
363 StringRef &Str,
364 SourceLocation *ArgLocation) {
365 // Look for identifiers. If we have one emit a hint to fix it to a literal.
366 if (AL.isArgIdent(ArgNum)) {
367 IdentifierLoc *Loc = AL.getArgAsIdent(ArgNum);
368 Diag(Loc->Loc, diag::err_attribute_argument_type)
369 << AL << AANT_ArgumentString
370 << FixItHint::CreateInsertion(Loc->Loc, "\"")
371 << FixItHint::CreateInsertion(getLocForEndOfToken(Loc->Loc), "\"");
372 Str = Loc->Ident->getName();
373 if (ArgLocation)
374 *ArgLocation = Loc->Loc;
375 return true;
376 }
377
378 // Now check for an actual string literal.
379 Expr *ArgExpr = AL.getArgAsExpr(ArgNum);
380 return checkStringLiteralArgumentAttr(AL, ArgExpr, Str, ArgLocation);
381 }
382
383 /// Applies the given attribute to the Decl without performing any
384 /// additional semantic checking.
385 template <typename AttrType>
handleSimpleAttribute(Sema & S,Decl * D,const AttributeCommonInfo & CI)386 static void handleSimpleAttribute(Sema &S, Decl *D,
387 const AttributeCommonInfo &CI) {
388 D->addAttr(::new (S.Context) AttrType(S.Context, CI));
389 }
390
391 template <typename... DiagnosticArgs>
392 static const Sema::SemaDiagnosticBuilder&
appendDiagnostics(const Sema::SemaDiagnosticBuilder & Bldr)393 appendDiagnostics(const Sema::SemaDiagnosticBuilder &Bldr) {
394 return Bldr;
395 }
396
397 template <typename T, typename... DiagnosticArgs>
398 static const Sema::SemaDiagnosticBuilder&
appendDiagnostics(const Sema::SemaDiagnosticBuilder & Bldr,T && ExtraArg,DiagnosticArgs &&...ExtraArgs)399 appendDiagnostics(const Sema::SemaDiagnosticBuilder &Bldr, T &&ExtraArg,
400 DiagnosticArgs &&... ExtraArgs) {
401 return appendDiagnostics(Bldr << std::forward<T>(ExtraArg),
402 std::forward<DiagnosticArgs>(ExtraArgs)...);
403 }
404
405 /// Add an attribute @c AttrType to declaration @c D, provided that
406 /// @c PassesCheck is true.
407 /// Otherwise, emit diagnostic @c DiagID, passing in all parameters
408 /// specified in @c ExtraArgs.
409 template <typename AttrType, typename... DiagnosticArgs>
handleSimpleAttributeOrDiagnose(Sema & S,Decl * D,const AttributeCommonInfo & CI,bool PassesCheck,unsigned DiagID,DiagnosticArgs &&...ExtraArgs)410 static void handleSimpleAttributeOrDiagnose(Sema &S, Decl *D,
411 const AttributeCommonInfo &CI,
412 bool PassesCheck, unsigned DiagID,
413 DiagnosticArgs &&... ExtraArgs) {
414 if (!PassesCheck) {
415 Sema::SemaDiagnosticBuilder DB = S.Diag(D->getBeginLoc(), DiagID);
416 appendDiagnostics(DB, std::forward<DiagnosticArgs>(ExtraArgs)...);
417 return;
418 }
419 handleSimpleAttribute<AttrType>(S, D, CI);
420 }
421
422 /// Check if the passed-in expression is of type int or bool.
isIntOrBool(Expr * Exp)423 static bool isIntOrBool(Expr *Exp) {
424 QualType QT = Exp->getType();
425 return QT->isBooleanType() || QT->isIntegerType();
426 }
427
428
429 // Check to see if the type is a smart pointer of some kind. We assume
430 // it's a smart pointer if it defines both operator-> and operator*.
threadSafetyCheckIsSmartPointer(Sema & S,const RecordType * RT)431 static bool threadSafetyCheckIsSmartPointer(Sema &S, const RecordType* RT) {
432 auto IsOverloadedOperatorPresent = [&S](const RecordDecl *Record,
433 OverloadedOperatorKind Op) {
434 DeclContextLookupResult Result =
435 Record->lookup(S.Context.DeclarationNames.getCXXOperatorName(Op));
436 return !Result.empty();
437 };
438
439 const RecordDecl *Record = RT->getDecl();
440 bool foundStarOperator = IsOverloadedOperatorPresent(Record, OO_Star);
441 bool foundArrowOperator = IsOverloadedOperatorPresent(Record, OO_Arrow);
442 if (foundStarOperator && foundArrowOperator)
443 return true;
444
445 const CXXRecordDecl *CXXRecord = dyn_cast<CXXRecordDecl>(Record);
446 if (!CXXRecord)
447 return false;
448
449 for (auto BaseSpecifier : CXXRecord->bases()) {
450 if (!foundStarOperator)
451 foundStarOperator = IsOverloadedOperatorPresent(
452 BaseSpecifier.getType()->getAsRecordDecl(), OO_Star);
453 if (!foundArrowOperator)
454 foundArrowOperator = IsOverloadedOperatorPresent(
455 BaseSpecifier.getType()->getAsRecordDecl(), OO_Arrow);
456 }
457
458 if (foundStarOperator && foundArrowOperator)
459 return true;
460
461 return false;
462 }
463
464 /// Check if passed in Decl is a pointer type.
465 /// Note that this function may produce an error message.
466 /// \return true if the Decl is a pointer type; false otherwise
threadSafetyCheckIsPointer(Sema & S,const Decl * D,const ParsedAttr & AL)467 static bool threadSafetyCheckIsPointer(Sema &S, const Decl *D,
468 const ParsedAttr &AL) {
469 const auto *VD = cast<ValueDecl>(D);
470 QualType QT = VD->getType();
471 if (QT->isAnyPointerType())
472 return true;
473
474 if (const auto *RT = QT->getAs<RecordType>()) {
475 // If it's an incomplete type, it could be a smart pointer; skip it.
476 // (We don't want to force template instantiation if we can avoid it,
477 // since that would alter the order in which templates are instantiated.)
478 if (RT->isIncompleteType())
479 return true;
480
481 if (threadSafetyCheckIsSmartPointer(S, RT))
482 return true;
483 }
484
485 S.Diag(AL.getLoc(), diag::warn_thread_attribute_decl_not_pointer) << AL << QT;
486 return false;
487 }
488
489 /// Checks that the passed in QualType either is of RecordType or points
490 /// to RecordType. Returns the relevant RecordType, null if it does not exit.
getRecordType(QualType QT)491 static const RecordType *getRecordType(QualType QT) {
492 if (const auto *RT = QT->getAs<RecordType>())
493 return RT;
494
495 // Now check if we point to record type.
496 if (const auto *PT = QT->getAs<PointerType>())
497 return PT->getPointeeType()->getAs<RecordType>();
498
499 return nullptr;
500 }
501
502 template <typename AttrType>
checkRecordDeclForAttr(const RecordDecl * RD)503 static bool checkRecordDeclForAttr(const RecordDecl *RD) {
504 // Check if the record itself has the attribute.
505 if (RD->hasAttr<AttrType>())
506 return true;
507
508 // Else check if any base classes have the attribute.
509 if (const auto *CRD = dyn_cast<CXXRecordDecl>(RD)) {
510 if (!CRD->forallBases([](const CXXRecordDecl *Base) {
511 return !Base->hasAttr<AttrType>();
512 }))
513 return true;
514 }
515 return false;
516 }
517
checkRecordTypeForCapability(Sema & S,QualType Ty)518 static bool checkRecordTypeForCapability(Sema &S, QualType Ty) {
519 const RecordType *RT = getRecordType(Ty);
520
521 if (!RT)
522 return false;
523
524 // Don't check for the capability if the class hasn't been defined yet.
525 if (RT->isIncompleteType())
526 return true;
527
528 // Allow smart pointers to be used as capability objects.
529 // FIXME -- Check the type that the smart pointer points to.
530 if (threadSafetyCheckIsSmartPointer(S, RT))
531 return true;
532
533 return checkRecordDeclForAttr<CapabilityAttr>(RT->getDecl());
534 }
535
checkTypedefTypeForCapability(QualType Ty)536 static bool checkTypedefTypeForCapability(QualType Ty) {
537 const auto *TD = Ty->getAs<TypedefType>();
538 if (!TD)
539 return false;
540
541 TypedefNameDecl *TN = TD->getDecl();
542 if (!TN)
543 return false;
544
545 return TN->hasAttr<CapabilityAttr>();
546 }
547
typeHasCapability(Sema & S,QualType Ty)548 static bool typeHasCapability(Sema &S, QualType Ty) {
549 if (checkTypedefTypeForCapability(Ty))
550 return true;
551
552 if (checkRecordTypeForCapability(S, Ty))
553 return true;
554
555 return false;
556 }
557
isCapabilityExpr(Sema & S,const Expr * Ex)558 static bool isCapabilityExpr(Sema &S, const Expr *Ex) {
559 // Capability expressions are simple expressions involving the boolean logic
560 // operators &&, || or !, a simple DeclRefExpr, CastExpr or a ParenExpr. Once
561 // a DeclRefExpr is found, its type should be checked to determine whether it
562 // is a capability or not.
563
564 if (const auto *E = dyn_cast<CastExpr>(Ex))
565 return isCapabilityExpr(S, E->getSubExpr());
566 else if (const auto *E = dyn_cast<ParenExpr>(Ex))
567 return isCapabilityExpr(S, E->getSubExpr());
568 else if (const auto *E = dyn_cast<UnaryOperator>(Ex)) {
569 if (E->getOpcode() == UO_LNot || E->getOpcode() == UO_AddrOf ||
570 E->getOpcode() == UO_Deref)
571 return isCapabilityExpr(S, E->getSubExpr());
572 return false;
573 } else if (const auto *E = dyn_cast<BinaryOperator>(Ex)) {
574 if (E->getOpcode() == BO_LAnd || E->getOpcode() == BO_LOr)
575 return isCapabilityExpr(S, E->getLHS()) &&
576 isCapabilityExpr(S, E->getRHS());
577 return false;
578 }
579
580 return typeHasCapability(S, Ex->getType());
581 }
582
583 /// Checks that all attribute arguments, starting from Sidx, resolve to
584 /// a capability object.
585 /// \param Sidx The attribute argument index to start checking with.
586 /// \param ParamIdxOk Whether an argument can be indexing into a function
587 /// parameter list.
checkAttrArgsAreCapabilityObjs(Sema & S,Decl * D,const ParsedAttr & AL,SmallVectorImpl<Expr * > & Args,unsigned Sidx=0,bool ParamIdxOk=false)588 static void checkAttrArgsAreCapabilityObjs(Sema &S, Decl *D,
589 const ParsedAttr &AL,
590 SmallVectorImpl<Expr *> &Args,
591 unsigned Sidx = 0,
592 bool ParamIdxOk = false) {
593 if (Sidx == AL.getNumArgs()) {
594 // If we don't have any capability arguments, the attribute implicitly
595 // refers to 'this'. So we need to make sure that 'this' exists, i.e. we're
596 // a non-static method, and that the class is a (scoped) capability.
597 const auto *MD = dyn_cast<const CXXMethodDecl>(D);
598 if (MD && !MD->isStatic()) {
599 const CXXRecordDecl *RD = MD->getParent();
600 // FIXME -- need to check this again on template instantiation
601 if (!checkRecordDeclForAttr<CapabilityAttr>(RD) &&
602 !checkRecordDeclForAttr<ScopedLockableAttr>(RD))
603 S.Diag(AL.getLoc(),
604 diag::warn_thread_attribute_not_on_capability_member)
605 << AL << MD->getParent();
606 } else {
607 S.Diag(AL.getLoc(), diag::warn_thread_attribute_not_on_non_static_member)
608 << AL;
609 }
610 }
611
612 for (unsigned Idx = Sidx; Idx < AL.getNumArgs(); ++Idx) {
613 Expr *ArgExp = AL.getArgAsExpr(Idx);
614
615 if (ArgExp->isTypeDependent()) {
616 // FIXME -- need to check this again on template instantiation
617 Args.push_back(ArgExp);
618 continue;
619 }
620
621 if (const auto *StrLit = dyn_cast<StringLiteral>(ArgExp)) {
622 if (StrLit->getLength() == 0 ||
623 (StrLit->isOrdinary() && StrLit->getString() == StringRef("*"))) {
624 // Pass empty strings to the analyzer without warnings.
625 // Treat "*" as the universal lock.
626 Args.push_back(ArgExp);
627 continue;
628 }
629
630 // We allow constant strings to be used as a placeholder for expressions
631 // that are not valid C++ syntax, but warn that they are ignored.
632 S.Diag(AL.getLoc(), diag::warn_thread_attribute_ignored) << AL;
633 Args.push_back(ArgExp);
634 continue;
635 }
636
637 QualType ArgTy = ArgExp->getType();
638
639 // A pointer to member expression of the form &MyClass::mu is treated
640 // specially -- we need to look at the type of the member.
641 if (const auto *UOp = dyn_cast<UnaryOperator>(ArgExp))
642 if (UOp->getOpcode() == UO_AddrOf)
643 if (const auto *DRE = dyn_cast<DeclRefExpr>(UOp->getSubExpr()))
644 if (DRE->getDecl()->isCXXInstanceMember())
645 ArgTy = DRE->getDecl()->getType();
646
647 // First see if we can just cast to record type, or pointer to record type.
648 const RecordType *RT = getRecordType(ArgTy);
649
650 // Now check if we index into a record type function param.
651 if(!RT && ParamIdxOk) {
652 const auto *FD = dyn_cast<FunctionDecl>(D);
653 const auto *IL = dyn_cast<IntegerLiteral>(ArgExp);
654 if(FD && IL) {
655 unsigned int NumParams = FD->getNumParams();
656 llvm::APInt ArgValue = IL->getValue();
657 uint64_t ParamIdxFromOne = ArgValue.getZExtValue();
658 uint64_t ParamIdxFromZero = ParamIdxFromOne - 1;
659 if (!ArgValue.isStrictlyPositive() || ParamIdxFromOne > NumParams) {
660 S.Diag(AL.getLoc(),
661 diag::err_attribute_argument_out_of_bounds_extra_info)
662 << AL << Idx + 1 << NumParams;
663 continue;
664 }
665 ArgTy = FD->getParamDecl(ParamIdxFromZero)->getType();
666 }
667 }
668
669 // If the type does not have a capability, see if the components of the
670 // expression have capabilities. This allows for writing C code where the
671 // capability may be on the type, and the expression is a capability
672 // boolean logic expression. Eg) requires_capability(A || B && !C)
673 if (!typeHasCapability(S, ArgTy) && !isCapabilityExpr(S, ArgExp))
674 S.Diag(AL.getLoc(), diag::warn_thread_attribute_argument_not_lockable)
675 << AL << ArgTy;
676
677 Args.push_back(ArgExp);
678 }
679 }
680
681 //===----------------------------------------------------------------------===//
682 // Attribute Implementations
683 //===----------------------------------------------------------------------===//
684
handlePtGuardedVarAttr(Sema & S,Decl * D,const ParsedAttr & AL)685 static void handlePtGuardedVarAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
686 if (!threadSafetyCheckIsPointer(S, D, AL))
687 return;
688
689 D->addAttr(::new (S.Context) PtGuardedVarAttr(S.Context, AL));
690 }
691
checkGuardedByAttrCommon(Sema & S,Decl * D,const ParsedAttr & AL,Expr * & Arg)692 static bool checkGuardedByAttrCommon(Sema &S, Decl *D, const ParsedAttr &AL,
693 Expr *&Arg) {
694 SmallVector<Expr *, 1> Args;
695 // check that all arguments are lockable objects
696 checkAttrArgsAreCapabilityObjs(S, D, AL, Args);
697 unsigned Size = Args.size();
698 if (Size != 1)
699 return false;
700
701 Arg = Args[0];
702
703 return true;
704 }
705
handleGuardedByAttr(Sema & S,Decl * D,const ParsedAttr & AL)706 static void handleGuardedByAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
707 Expr *Arg = nullptr;
708 if (!checkGuardedByAttrCommon(S, D, AL, Arg))
709 return;
710
711 D->addAttr(::new (S.Context) GuardedByAttr(S.Context, AL, Arg));
712 }
713
handlePtGuardedByAttr(Sema & S,Decl * D,const ParsedAttr & AL)714 static void handlePtGuardedByAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
715 Expr *Arg = nullptr;
716 if (!checkGuardedByAttrCommon(S, D, AL, Arg))
717 return;
718
719 if (!threadSafetyCheckIsPointer(S, D, AL))
720 return;
721
722 D->addAttr(::new (S.Context) PtGuardedByAttr(S.Context, AL, Arg));
723 }
724
checkAcquireOrderAttrCommon(Sema & S,Decl * D,const ParsedAttr & AL,SmallVectorImpl<Expr * > & Args)725 static bool checkAcquireOrderAttrCommon(Sema &S, Decl *D, const ParsedAttr &AL,
726 SmallVectorImpl<Expr *> &Args) {
727 if (!AL.checkAtLeastNumArgs(S, 1))
728 return false;
729
730 // Check that this attribute only applies to lockable types.
731 QualType QT = cast<ValueDecl>(D)->getType();
732 if (!QT->isDependentType() && !typeHasCapability(S, QT)) {
733 S.Diag(AL.getLoc(), diag::warn_thread_attribute_decl_not_lockable) << AL;
734 return false;
735 }
736
737 // Check that all arguments are lockable objects.
738 checkAttrArgsAreCapabilityObjs(S, D, AL, Args);
739 if (Args.empty())
740 return false;
741
742 return true;
743 }
744
handleAcquiredAfterAttr(Sema & S,Decl * D,const ParsedAttr & AL)745 static void handleAcquiredAfterAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
746 SmallVector<Expr *, 1> Args;
747 if (!checkAcquireOrderAttrCommon(S, D, AL, Args))
748 return;
749
750 Expr **StartArg = &Args[0];
751 D->addAttr(::new (S.Context)
752 AcquiredAfterAttr(S.Context, AL, StartArg, Args.size()));
753 }
754
handleAcquiredBeforeAttr(Sema & S,Decl * D,const ParsedAttr & AL)755 static void handleAcquiredBeforeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
756 SmallVector<Expr *, 1> Args;
757 if (!checkAcquireOrderAttrCommon(S, D, AL, Args))
758 return;
759
760 Expr **StartArg = &Args[0];
761 D->addAttr(::new (S.Context)
762 AcquiredBeforeAttr(S.Context, AL, StartArg, Args.size()));
763 }
764
checkLockFunAttrCommon(Sema & S,Decl * D,const ParsedAttr & AL,SmallVectorImpl<Expr * > & Args)765 static bool checkLockFunAttrCommon(Sema &S, Decl *D, const ParsedAttr &AL,
766 SmallVectorImpl<Expr *> &Args) {
767 // zero or more arguments ok
768 // check that all arguments are lockable objects
769 checkAttrArgsAreCapabilityObjs(S, D, AL, Args, 0, /*ParamIdxOk=*/true);
770
771 return true;
772 }
773
handleAssertSharedLockAttr(Sema & S,Decl * D,const ParsedAttr & AL)774 static void handleAssertSharedLockAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
775 SmallVector<Expr *, 1> Args;
776 if (!checkLockFunAttrCommon(S, D, AL, Args))
777 return;
778
779 unsigned Size = Args.size();
780 Expr **StartArg = Size == 0 ? nullptr : &Args[0];
781 D->addAttr(::new (S.Context)
782 AssertSharedLockAttr(S.Context, AL, StartArg, Size));
783 }
784
handleAssertExclusiveLockAttr(Sema & S,Decl * D,const ParsedAttr & AL)785 static void handleAssertExclusiveLockAttr(Sema &S, Decl *D,
786 const ParsedAttr &AL) {
787 SmallVector<Expr *, 1> Args;
788 if (!checkLockFunAttrCommon(S, D, AL, Args))
789 return;
790
791 unsigned Size = Args.size();
792 Expr **StartArg = Size == 0 ? nullptr : &Args[0];
793 D->addAttr(::new (S.Context)
794 AssertExclusiveLockAttr(S.Context, AL, StartArg, Size));
795 }
796
797 /// Checks to be sure that the given parameter number is in bounds, and
798 /// is an integral type. Will emit appropriate diagnostics if this returns
799 /// false.
800 ///
801 /// AttrArgNo is used to actually retrieve the argument, so it's base-0.
802 template <typename AttrInfo>
checkParamIsIntegerType(Sema & S,const Decl * D,const AttrInfo & AI,unsigned AttrArgNo)803 static bool checkParamIsIntegerType(Sema &S, const Decl *D, const AttrInfo &AI,
804 unsigned AttrArgNo) {
805 assert(AI.isArgExpr(AttrArgNo) && "Expected expression argument");
806 Expr *AttrArg = AI.getArgAsExpr(AttrArgNo);
807 ParamIdx Idx;
808 if (!checkFunctionOrMethodParameterIndex(S, D, AI, AttrArgNo + 1, AttrArg,
809 Idx))
810 return false;
811
812 QualType ParamTy = getFunctionOrMethodParamType(D, Idx.getASTIndex());
813 if (!ParamTy->isIntegerType() && !ParamTy->isCharType()) {
814 SourceLocation SrcLoc = AttrArg->getBeginLoc();
815 S.Diag(SrcLoc, diag::err_attribute_integers_only)
816 << AI << getFunctionOrMethodParamRange(D, Idx.getASTIndex());
817 return false;
818 }
819 return true;
820 }
821
handleAllocSizeAttr(Sema & S,Decl * D,const ParsedAttr & AL)822 static void handleAllocSizeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
823 if (!AL.checkAtLeastNumArgs(S, 1) || !AL.checkAtMostNumArgs(S, 2))
824 return;
825
826 assert(isFunctionOrMethod(D) && hasFunctionProto(D));
827
828 QualType RetTy = getFunctionOrMethodResultType(D);
829 if (!RetTy->isPointerType()) {
830 S.Diag(AL.getLoc(), diag::warn_attribute_return_pointers_only) << AL;
831 return;
832 }
833
834 const Expr *SizeExpr = AL.getArgAsExpr(0);
835 int SizeArgNoVal;
836 // Parameter indices are 1-indexed, hence Index=1
837 if (!checkPositiveIntArgument(S, AL, SizeExpr, SizeArgNoVal, /*Idx=*/1))
838 return;
839 if (!checkParamIsIntegerType(S, D, AL, /*AttrArgNo=*/0))
840 return;
841 ParamIdx SizeArgNo(SizeArgNoVal, D);
842
843 ParamIdx NumberArgNo;
844 if (AL.getNumArgs() == 2) {
845 const Expr *NumberExpr = AL.getArgAsExpr(1);
846 int Val;
847 // Parameter indices are 1-based, hence Index=2
848 if (!checkPositiveIntArgument(S, AL, NumberExpr, Val, /*Idx=*/2))
849 return;
850 if (!checkParamIsIntegerType(S, D, AL, /*AttrArgNo=*/1))
851 return;
852 NumberArgNo = ParamIdx(Val, D);
853 }
854
855 D->addAttr(::new (S.Context)
856 AllocSizeAttr(S.Context, AL, SizeArgNo, NumberArgNo));
857 }
858
checkTryLockFunAttrCommon(Sema & S,Decl * D,const ParsedAttr & AL,SmallVectorImpl<Expr * > & Args)859 static bool checkTryLockFunAttrCommon(Sema &S, Decl *D, const ParsedAttr &AL,
860 SmallVectorImpl<Expr *> &Args) {
861 if (!AL.checkAtLeastNumArgs(S, 1))
862 return false;
863
864 if (!isIntOrBool(AL.getArgAsExpr(0))) {
865 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
866 << AL << 1 << AANT_ArgumentIntOrBool;
867 return false;
868 }
869
870 // check that all arguments are lockable objects
871 checkAttrArgsAreCapabilityObjs(S, D, AL, Args, 1);
872
873 return true;
874 }
875
handleSharedTrylockFunctionAttr(Sema & S,Decl * D,const ParsedAttr & AL)876 static void handleSharedTrylockFunctionAttr(Sema &S, Decl *D,
877 const ParsedAttr &AL) {
878 SmallVector<Expr*, 2> Args;
879 if (!checkTryLockFunAttrCommon(S, D, AL, Args))
880 return;
881
882 D->addAttr(::new (S.Context) SharedTrylockFunctionAttr(
883 S.Context, AL, AL.getArgAsExpr(0), Args.data(), Args.size()));
884 }
885
handleExclusiveTrylockFunctionAttr(Sema & S,Decl * D,const ParsedAttr & AL)886 static void handleExclusiveTrylockFunctionAttr(Sema &S, Decl *D,
887 const ParsedAttr &AL) {
888 SmallVector<Expr*, 2> Args;
889 if (!checkTryLockFunAttrCommon(S, D, AL, Args))
890 return;
891
892 D->addAttr(::new (S.Context) ExclusiveTrylockFunctionAttr(
893 S.Context, AL, AL.getArgAsExpr(0), Args.data(), Args.size()));
894 }
895
handleLockReturnedAttr(Sema & S,Decl * D,const ParsedAttr & AL)896 static void handleLockReturnedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
897 // check that the argument is lockable object
898 SmallVector<Expr*, 1> Args;
899 checkAttrArgsAreCapabilityObjs(S, D, AL, Args);
900 unsigned Size = Args.size();
901 if (Size == 0)
902 return;
903
904 D->addAttr(::new (S.Context) LockReturnedAttr(S.Context, AL, Args[0]));
905 }
906
handleLocksExcludedAttr(Sema & S,Decl * D,const ParsedAttr & AL)907 static void handleLocksExcludedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
908 if (!AL.checkAtLeastNumArgs(S, 1))
909 return;
910
911 // check that all arguments are lockable objects
912 SmallVector<Expr*, 1> Args;
913 checkAttrArgsAreCapabilityObjs(S, D, AL, Args);
914 unsigned Size = Args.size();
915 if (Size == 0)
916 return;
917 Expr **StartArg = &Args[0];
918
919 D->addAttr(::new (S.Context)
920 LocksExcludedAttr(S.Context, AL, StartArg, Size));
921 }
922
checkFunctionConditionAttr(Sema & S,Decl * D,const ParsedAttr & AL,Expr * & Cond,StringRef & Msg)923 static bool checkFunctionConditionAttr(Sema &S, Decl *D, const ParsedAttr &AL,
924 Expr *&Cond, StringRef &Msg) {
925 Cond = AL.getArgAsExpr(0);
926 if (!Cond->isTypeDependent()) {
927 ExprResult Converted = S.PerformContextuallyConvertToBool(Cond);
928 if (Converted.isInvalid())
929 return false;
930 Cond = Converted.get();
931 }
932
933 if (!S.checkStringLiteralArgumentAttr(AL, 1, Msg))
934 return false;
935
936 if (Msg.empty())
937 Msg = "<no message provided>";
938
939 SmallVector<PartialDiagnosticAt, 8> Diags;
940 if (isa<FunctionDecl>(D) && !Cond->isValueDependent() &&
941 !Expr::isPotentialConstantExprUnevaluated(Cond, cast<FunctionDecl>(D),
942 Diags)) {
943 S.Diag(AL.getLoc(), diag::err_attr_cond_never_constant_expr) << AL;
944 for (const PartialDiagnosticAt &PDiag : Diags)
945 S.Diag(PDiag.first, PDiag.second);
946 return false;
947 }
948 return true;
949 }
950
handleEnableIfAttr(Sema & S,Decl * D,const ParsedAttr & AL)951 static void handleEnableIfAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
952 S.Diag(AL.getLoc(), diag::ext_clang_enable_if);
953
954 Expr *Cond;
955 StringRef Msg;
956 if (checkFunctionConditionAttr(S, D, AL, Cond, Msg))
957 D->addAttr(::new (S.Context) EnableIfAttr(S.Context, AL, Cond, Msg));
958 }
959
handleErrorAttr(Sema & S,Decl * D,const ParsedAttr & AL)960 static void handleErrorAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
961 StringRef NewUserDiagnostic;
962 if (!S.checkStringLiteralArgumentAttr(AL, 0, NewUserDiagnostic))
963 return;
964 if (ErrorAttr *EA = S.mergeErrorAttr(D, AL, NewUserDiagnostic))
965 D->addAttr(EA);
966 }
967
968 namespace {
969 /// Determines if a given Expr references any of the given function's
970 /// ParmVarDecls, or the function's implicit `this` parameter (if applicable).
971 class ArgumentDependenceChecker
972 : public RecursiveASTVisitor<ArgumentDependenceChecker> {
973 #ifndef NDEBUG
974 const CXXRecordDecl *ClassType;
975 #endif
976 llvm::SmallPtrSet<const ParmVarDecl *, 16> Parms;
977 bool Result;
978
979 public:
ArgumentDependenceChecker(const FunctionDecl * FD)980 ArgumentDependenceChecker(const FunctionDecl *FD) {
981 #ifndef NDEBUG
982 if (const auto *MD = dyn_cast<CXXMethodDecl>(FD))
983 ClassType = MD->getParent();
984 else
985 ClassType = nullptr;
986 #endif
987 Parms.insert(FD->param_begin(), FD->param_end());
988 }
989
referencesArgs(Expr * E)990 bool referencesArgs(Expr *E) {
991 Result = false;
992 TraverseStmt(E);
993 return Result;
994 }
995
VisitCXXThisExpr(CXXThisExpr * E)996 bool VisitCXXThisExpr(CXXThisExpr *E) {
997 assert(E->getType()->getPointeeCXXRecordDecl() == ClassType &&
998 "`this` doesn't refer to the enclosing class?");
999 Result = true;
1000 return false;
1001 }
1002
VisitDeclRefExpr(DeclRefExpr * DRE)1003 bool VisitDeclRefExpr(DeclRefExpr *DRE) {
1004 if (const auto *PVD = dyn_cast<ParmVarDecl>(DRE->getDecl()))
1005 if (Parms.count(PVD)) {
1006 Result = true;
1007 return false;
1008 }
1009 return true;
1010 }
1011 };
1012 }
1013
handleDiagnoseAsBuiltinAttr(Sema & S,Decl * D,const ParsedAttr & AL)1014 static void handleDiagnoseAsBuiltinAttr(Sema &S, Decl *D,
1015 const ParsedAttr &AL) {
1016 const auto *DeclFD = cast<FunctionDecl>(D);
1017
1018 if (const auto *MethodDecl = dyn_cast<CXXMethodDecl>(DeclFD))
1019 if (!MethodDecl->isStatic()) {
1020 S.Diag(AL.getLoc(), diag::err_attribute_no_member_function) << AL;
1021 return;
1022 }
1023
1024 auto DiagnoseType = [&](unsigned Index, AttributeArgumentNType T) {
1025 SourceLocation Loc = [&]() {
1026 auto Union = AL.getArg(Index - 1);
1027 if (Union.is<Expr *>())
1028 return Union.get<Expr *>()->getBeginLoc();
1029 return Union.get<IdentifierLoc *>()->Loc;
1030 }();
1031
1032 S.Diag(Loc, diag::err_attribute_argument_n_type) << AL << Index << T;
1033 };
1034
1035 FunctionDecl *AttrFD = [&]() -> FunctionDecl * {
1036 if (!AL.isArgExpr(0))
1037 return nullptr;
1038 auto *F = dyn_cast_or_null<DeclRefExpr>(AL.getArgAsExpr(0));
1039 if (!F)
1040 return nullptr;
1041 return dyn_cast_or_null<FunctionDecl>(F->getFoundDecl());
1042 }();
1043
1044 if (!AttrFD || !AttrFD->getBuiltinID(true)) {
1045 DiagnoseType(1, AANT_ArgumentBuiltinFunction);
1046 return;
1047 }
1048
1049 if (AttrFD->getNumParams() != AL.getNumArgs() - 1) {
1050 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments_for)
1051 << AL << AttrFD << AttrFD->getNumParams();
1052 return;
1053 }
1054
1055 SmallVector<unsigned, 8> Indices;
1056
1057 for (unsigned I = 1; I < AL.getNumArgs(); ++I) {
1058 if (!AL.isArgExpr(I)) {
1059 DiagnoseType(I + 1, AANT_ArgumentIntegerConstant);
1060 return;
1061 }
1062
1063 const Expr *IndexExpr = AL.getArgAsExpr(I);
1064 uint32_t Index;
1065
1066 if (!checkUInt32Argument(S, AL, IndexExpr, Index, I + 1, false))
1067 return;
1068
1069 if (Index > DeclFD->getNumParams()) {
1070 S.Diag(AL.getLoc(), diag::err_attribute_bounds_for_function)
1071 << AL << Index << DeclFD << DeclFD->getNumParams();
1072 return;
1073 }
1074
1075 QualType T1 = AttrFD->getParamDecl(I - 1)->getType();
1076 QualType T2 = DeclFD->getParamDecl(Index - 1)->getType();
1077
1078 if (T1.getCanonicalType().getUnqualifiedType() !=
1079 T2.getCanonicalType().getUnqualifiedType()) {
1080 S.Diag(IndexExpr->getBeginLoc(), diag::err_attribute_parameter_types)
1081 << AL << Index << DeclFD << T2 << I << AttrFD << T1;
1082 return;
1083 }
1084
1085 Indices.push_back(Index - 1);
1086 }
1087
1088 D->addAttr(::new (S.Context) DiagnoseAsBuiltinAttr(
1089 S.Context, AL, AttrFD, Indices.data(), Indices.size()));
1090 }
1091
handleDiagnoseIfAttr(Sema & S,Decl * D,const ParsedAttr & AL)1092 static void handleDiagnoseIfAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1093 S.Diag(AL.getLoc(), diag::ext_clang_diagnose_if);
1094
1095 Expr *Cond;
1096 StringRef Msg;
1097 if (!checkFunctionConditionAttr(S, D, AL, Cond, Msg))
1098 return;
1099
1100 StringRef DiagTypeStr;
1101 if (!S.checkStringLiteralArgumentAttr(AL, 2, DiagTypeStr))
1102 return;
1103
1104 DiagnoseIfAttr::DiagnosticType DiagType;
1105 if (!DiagnoseIfAttr::ConvertStrToDiagnosticType(DiagTypeStr, DiagType)) {
1106 S.Diag(AL.getArgAsExpr(2)->getBeginLoc(),
1107 diag::err_diagnose_if_invalid_diagnostic_type);
1108 return;
1109 }
1110
1111 bool ArgDependent = false;
1112 if (const auto *FD = dyn_cast<FunctionDecl>(D))
1113 ArgDependent = ArgumentDependenceChecker(FD).referencesArgs(Cond);
1114 D->addAttr(::new (S.Context) DiagnoseIfAttr(
1115 S.Context, AL, Cond, Msg, DiagType, ArgDependent, cast<NamedDecl>(D)));
1116 }
1117
handleNoBuiltinAttr(Sema & S,Decl * D,const ParsedAttr & AL)1118 static void handleNoBuiltinAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1119 static constexpr const StringRef kWildcard = "*";
1120
1121 llvm::SmallVector<StringRef, 16> Names;
1122 bool HasWildcard = false;
1123
1124 const auto AddBuiltinName = [&Names, &HasWildcard](StringRef Name) {
1125 if (Name == kWildcard)
1126 HasWildcard = true;
1127 Names.push_back(Name);
1128 };
1129
1130 // Add previously defined attributes.
1131 if (const auto *NBA = D->getAttr<NoBuiltinAttr>())
1132 for (StringRef BuiltinName : NBA->builtinNames())
1133 AddBuiltinName(BuiltinName);
1134
1135 // Add current attributes.
1136 if (AL.getNumArgs() == 0)
1137 AddBuiltinName(kWildcard);
1138 else
1139 for (unsigned I = 0, E = AL.getNumArgs(); I != E; ++I) {
1140 StringRef BuiltinName;
1141 SourceLocation LiteralLoc;
1142 if (!S.checkStringLiteralArgumentAttr(AL, I, BuiltinName, &LiteralLoc))
1143 return;
1144
1145 if (Builtin::Context::isBuiltinFunc(BuiltinName))
1146 AddBuiltinName(BuiltinName);
1147 else
1148 S.Diag(LiteralLoc, diag::warn_attribute_no_builtin_invalid_builtin_name)
1149 << BuiltinName << AL;
1150 }
1151
1152 // Repeating the same attribute is fine.
1153 llvm::sort(Names);
1154 Names.erase(std::unique(Names.begin(), Names.end()), Names.end());
1155
1156 // Empty no_builtin must be on its own.
1157 if (HasWildcard && Names.size() > 1)
1158 S.Diag(D->getLocation(),
1159 diag::err_attribute_no_builtin_wildcard_or_builtin_name)
1160 << AL;
1161
1162 if (D->hasAttr<NoBuiltinAttr>())
1163 D->dropAttr<NoBuiltinAttr>();
1164 D->addAttr(::new (S.Context)
1165 NoBuiltinAttr(S.Context, AL, Names.data(), Names.size()));
1166 }
1167
handlePassObjectSizeAttr(Sema & S,Decl * D,const ParsedAttr & AL)1168 static void handlePassObjectSizeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1169 if (D->hasAttr<PassObjectSizeAttr>()) {
1170 S.Diag(D->getBeginLoc(), diag::err_attribute_only_once_per_parameter) << AL;
1171 return;
1172 }
1173
1174 Expr *E = AL.getArgAsExpr(0);
1175 uint32_t Type;
1176 if (!checkUInt32Argument(S, AL, E, Type, /*Idx=*/1))
1177 return;
1178
1179 // pass_object_size's argument is passed in as the second argument of
1180 // __builtin_object_size. So, it has the same constraints as that second
1181 // argument; namely, it must be in the range [0, 3].
1182 if (Type > 3) {
1183 S.Diag(E->getBeginLoc(), diag::err_attribute_argument_out_of_range)
1184 << AL << 0 << 3 << E->getSourceRange();
1185 return;
1186 }
1187
1188 // pass_object_size is only supported on constant pointer parameters; as a
1189 // kindness to users, we allow the parameter to be non-const for declarations.
1190 // At this point, we have no clue if `D` belongs to a function declaration or
1191 // definition, so we defer the constness check until later.
1192 if (!cast<ParmVarDecl>(D)->getType()->isPointerType()) {
1193 S.Diag(D->getBeginLoc(), diag::err_attribute_pointers_only) << AL << 1;
1194 return;
1195 }
1196
1197 D->addAttr(::new (S.Context) PassObjectSizeAttr(S.Context, AL, (int)Type));
1198 }
1199
handleConsumableAttr(Sema & S,Decl * D,const ParsedAttr & AL)1200 static void handleConsumableAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1201 ConsumableAttr::ConsumedState DefaultState;
1202
1203 if (AL.isArgIdent(0)) {
1204 IdentifierLoc *IL = AL.getArgAsIdent(0);
1205 if (!ConsumableAttr::ConvertStrToConsumedState(IL->Ident->getName(),
1206 DefaultState)) {
1207 S.Diag(IL->Loc, diag::warn_attribute_type_not_supported) << AL
1208 << IL->Ident;
1209 return;
1210 }
1211 } else {
1212 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
1213 << AL << AANT_ArgumentIdentifier;
1214 return;
1215 }
1216
1217 D->addAttr(::new (S.Context) ConsumableAttr(S.Context, AL, DefaultState));
1218 }
1219
checkForConsumableClass(Sema & S,const CXXMethodDecl * MD,const ParsedAttr & AL)1220 static bool checkForConsumableClass(Sema &S, const CXXMethodDecl *MD,
1221 const ParsedAttr &AL) {
1222 QualType ThisType = MD->getThisType()->getPointeeType();
1223
1224 if (const CXXRecordDecl *RD = ThisType->getAsCXXRecordDecl()) {
1225 if (!RD->hasAttr<ConsumableAttr>()) {
1226 S.Diag(AL.getLoc(), diag::warn_attr_on_unconsumable_class) << RD;
1227
1228 return false;
1229 }
1230 }
1231
1232 return true;
1233 }
1234
handleCallableWhenAttr(Sema & S,Decl * D,const ParsedAttr & AL)1235 static void handleCallableWhenAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1236 if (!AL.checkAtLeastNumArgs(S, 1))
1237 return;
1238
1239 if (!checkForConsumableClass(S, cast<CXXMethodDecl>(D), AL))
1240 return;
1241
1242 SmallVector<CallableWhenAttr::ConsumedState, 3> States;
1243 for (unsigned ArgIndex = 0; ArgIndex < AL.getNumArgs(); ++ArgIndex) {
1244 CallableWhenAttr::ConsumedState CallableState;
1245
1246 StringRef StateString;
1247 SourceLocation Loc;
1248 if (AL.isArgIdent(ArgIndex)) {
1249 IdentifierLoc *Ident = AL.getArgAsIdent(ArgIndex);
1250 StateString = Ident->Ident->getName();
1251 Loc = Ident->Loc;
1252 } else {
1253 if (!S.checkStringLiteralArgumentAttr(AL, ArgIndex, StateString, &Loc))
1254 return;
1255 }
1256
1257 if (!CallableWhenAttr::ConvertStrToConsumedState(StateString,
1258 CallableState)) {
1259 S.Diag(Loc, diag::warn_attribute_type_not_supported) << AL << StateString;
1260 return;
1261 }
1262
1263 States.push_back(CallableState);
1264 }
1265
1266 D->addAttr(::new (S.Context)
1267 CallableWhenAttr(S.Context, AL, States.data(), States.size()));
1268 }
1269
handleParamTypestateAttr(Sema & S,Decl * D,const ParsedAttr & AL)1270 static void handleParamTypestateAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1271 ParamTypestateAttr::ConsumedState ParamState;
1272
1273 if (AL.isArgIdent(0)) {
1274 IdentifierLoc *Ident = AL.getArgAsIdent(0);
1275 StringRef StateString = Ident->Ident->getName();
1276
1277 if (!ParamTypestateAttr::ConvertStrToConsumedState(StateString,
1278 ParamState)) {
1279 S.Diag(Ident->Loc, diag::warn_attribute_type_not_supported)
1280 << AL << StateString;
1281 return;
1282 }
1283 } else {
1284 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
1285 << AL << AANT_ArgumentIdentifier;
1286 return;
1287 }
1288
1289 // FIXME: This check is currently being done in the analysis. It can be
1290 // enabled here only after the parser propagates attributes at
1291 // template specialization definition, not declaration.
1292 //QualType ReturnType = cast<ParmVarDecl>(D)->getType();
1293 //const CXXRecordDecl *RD = ReturnType->getAsCXXRecordDecl();
1294 //
1295 //if (!RD || !RD->hasAttr<ConsumableAttr>()) {
1296 // S.Diag(AL.getLoc(), diag::warn_return_state_for_unconsumable_type) <<
1297 // ReturnType.getAsString();
1298 // return;
1299 //}
1300
1301 D->addAttr(::new (S.Context) ParamTypestateAttr(S.Context, AL, ParamState));
1302 }
1303
handleReturnTypestateAttr(Sema & S,Decl * D,const ParsedAttr & AL)1304 static void handleReturnTypestateAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1305 ReturnTypestateAttr::ConsumedState ReturnState;
1306
1307 if (AL.isArgIdent(0)) {
1308 IdentifierLoc *IL = AL.getArgAsIdent(0);
1309 if (!ReturnTypestateAttr::ConvertStrToConsumedState(IL->Ident->getName(),
1310 ReturnState)) {
1311 S.Diag(IL->Loc, diag::warn_attribute_type_not_supported) << AL
1312 << IL->Ident;
1313 return;
1314 }
1315 } else {
1316 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
1317 << AL << AANT_ArgumentIdentifier;
1318 return;
1319 }
1320
1321 // FIXME: This check is currently being done in the analysis. It can be
1322 // enabled here only after the parser propagates attributes at
1323 // template specialization definition, not declaration.
1324 //QualType ReturnType;
1325 //
1326 //if (const ParmVarDecl *Param = dyn_cast<ParmVarDecl>(D)) {
1327 // ReturnType = Param->getType();
1328 //
1329 //} else if (const CXXConstructorDecl *Constructor =
1330 // dyn_cast<CXXConstructorDecl>(D)) {
1331 // ReturnType = Constructor->getThisType()->getPointeeType();
1332 //
1333 //} else {
1334 //
1335 // ReturnType = cast<FunctionDecl>(D)->getCallResultType();
1336 //}
1337 //
1338 //const CXXRecordDecl *RD = ReturnType->getAsCXXRecordDecl();
1339 //
1340 //if (!RD || !RD->hasAttr<ConsumableAttr>()) {
1341 // S.Diag(Attr.getLoc(), diag::warn_return_state_for_unconsumable_type) <<
1342 // ReturnType.getAsString();
1343 // return;
1344 //}
1345
1346 D->addAttr(::new (S.Context) ReturnTypestateAttr(S.Context, AL, ReturnState));
1347 }
1348
handleSetTypestateAttr(Sema & S,Decl * D,const ParsedAttr & AL)1349 static void handleSetTypestateAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1350 if (!checkForConsumableClass(S, cast<CXXMethodDecl>(D), AL))
1351 return;
1352
1353 SetTypestateAttr::ConsumedState NewState;
1354 if (AL.isArgIdent(0)) {
1355 IdentifierLoc *Ident = AL.getArgAsIdent(0);
1356 StringRef Param = Ident->Ident->getName();
1357 if (!SetTypestateAttr::ConvertStrToConsumedState(Param, NewState)) {
1358 S.Diag(Ident->Loc, diag::warn_attribute_type_not_supported) << AL
1359 << Param;
1360 return;
1361 }
1362 } else {
1363 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
1364 << AL << AANT_ArgumentIdentifier;
1365 return;
1366 }
1367
1368 D->addAttr(::new (S.Context) SetTypestateAttr(S.Context, AL, NewState));
1369 }
1370
handleTestTypestateAttr(Sema & S,Decl * D,const ParsedAttr & AL)1371 static void handleTestTypestateAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1372 if (!checkForConsumableClass(S, cast<CXXMethodDecl>(D), AL))
1373 return;
1374
1375 TestTypestateAttr::ConsumedState TestState;
1376 if (AL.isArgIdent(0)) {
1377 IdentifierLoc *Ident = AL.getArgAsIdent(0);
1378 StringRef Param = Ident->Ident->getName();
1379 if (!TestTypestateAttr::ConvertStrToConsumedState(Param, TestState)) {
1380 S.Diag(Ident->Loc, diag::warn_attribute_type_not_supported) << AL
1381 << Param;
1382 return;
1383 }
1384 } else {
1385 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
1386 << AL << AANT_ArgumentIdentifier;
1387 return;
1388 }
1389
1390 D->addAttr(::new (S.Context) TestTypestateAttr(S.Context, AL, TestState));
1391 }
1392
handleExtVectorTypeAttr(Sema & S,Decl * D,const ParsedAttr & AL)1393 static void handleExtVectorTypeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1394 // Remember this typedef decl, we will need it later for diagnostics.
1395 S.ExtVectorDecls.push_back(cast<TypedefNameDecl>(D));
1396 }
1397
handlePackedAttr(Sema & S,Decl * D,const ParsedAttr & AL)1398 static void handlePackedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1399 if (auto *TD = dyn_cast<TagDecl>(D))
1400 TD->addAttr(::new (S.Context) PackedAttr(S.Context, AL));
1401 else if (auto *FD = dyn_cast<FieldDecl>(D)) {
1402 bool BitfieldByteAligned = (!FD->getType()->isDependentType() &&
1403 !FD->getType()->isIncompleteType() &&
1404 FD->isBitField() &&
1405 S.Context.getTypeAlign(FD->getType()) <= 8);
1406
1407 if (S.getASTContext().getTargetInfo().getTriple().isPS()) {
1408 if (BitfieldByteAligned)
1409 // The PS4/PS5 targets need to maintain ABI backwards compatibility.
1410 S.Diag(AL.getLoc(), diag::warn_attribute_ignored_for_field_of_type)
1411 << AL << FD->getType();
1412 else
1413 FD->addAttr(::new (S.Context) PackedAttr(S.Context, AL));
1414 } else {
1415 // Report warning about changed offset in the newer compiler versions.
1416 if (BitfieldByteAligned)
1417 S.Diag(AL.getLoc(), diag::warn_attribute_packed_for_bitfield);
1418
1419 FD->addAttr(::new (S.Context) PackedAttr(S.Context, AL));
1420 }
1421
1422 } else
1423 S.Diag(AL.getLoc(), diag::warn_attribute_ignored) << AL;
1424 }
1425
handlePreferredName(Sema & S,Decl * D,const ParsedAttr & AL)1426 static void handlePreferredName(Sema &S, Decl *D, const ParsedAttr &AL) {
1427 auto *RD = cast<CXXRecordDecl>(D);
1428 ClassTemplateDecl *CTD = RD->getDescribedClassTemplate();
1429 assert(CTD && "attribute does not appertain to this declaration");
1430
1431 ParsedType PT = AL.getTypeArg();
1432 TypeSourceInfo *TSI = nullptr;
1433 QualType T = S.GetTypeFromParser(PT, &TSI);
1434 if (!TSI)
1435 TSI = S.Context.getTrivialTypeSourceInfo(T, AL.getLoc());
1436
1437 if (!T.hasQualifiers() && T->isTypedefNameType()) {
1438 // Find the template name, if this type names a template specialization.
1439 const TemplateDecl *Template = nullptr;
1440 if (const auto *CTSD = dyn_cast_or_null<ClassTemplateSpecializationDecl>(
1441 T->getAsCXXRecordDecl())) {
1442 Template = CTSD->getSpecializedTemplate();
1443 } else if (const auto *TST = T->getAs<TemplateSpecializationType>()) {
1444 while (TST && TST->isTypeAlias())
1445 TST = TST->getAliasedType()->getAs<TemplateSpecializationType>();
1446 if (TST)
1447 Template = TST->getTemplateName().getAsTemplateDecl();
1448 }
1449
1450 if (Template && declaresSameEntity(Template, CTD)) {
1451 D->addAttr(::new (S.Context) PreferredNameAttr(S.Context, AL, TSI));
1452 return;
1453 }
1454 }
1455
1456 S.Diag(AL.getLoc(), diag::err_attribute_preferred_name_arg_invalid)
1457 << T << CTD;
1458 if (const auto *TT = T->getAs<TypedefType>())
1459 S.Diag(TT->getDecl()->getLocation(), diag::note_entity_declared_at)
1460 << TT->getDecl();
1461 }
1462
checkIBOutletCommon(Sema & S,Decl * D,const ParsedAttr & AL)1463 static bool checkIBOutletCommon(Sema &S, Decl *D, const ParsedAttr &AL) {
1464 // The IBOutlet/IBOutletCollection attributes only apply to instance
1465 // variables or properties of Objective-C classes. The outlet must also
1466 // have an object reference type.
1467 if (const auto *VD = dyn_cast<ObjCIvarDecl>(D)) {
1468 if (!VD->getType()->getAs<ObjCObjectPointerType>()) {
1469 S.Diag(AL.getLoc(), diag::warn_iboutlet_object_type)
1470 << AL << VD->getType() << 0;
1471 return false;
1472 }
1473 }
1474 else if (const auto *PD = dyn_cast<ObjCPropertyDecl>(D)) {
1475 if (!PD->getType()->getAs<ObjCObjectPointerType>()) {
1476 S.Diag(AL.getLoc(), diag::warn_iboutlet_object_type)
1477 << AL << PD->getType() << 1;
1478 return false;
1479 }
1480 }
1481 else {
1482 S.Diag(AL.getLoc(), diag::warn_attribute_iboutlet) << AL;
1483 return false;
1484 }
1485
1486 return true;
1487 }
1488
handleIBOutlet(Sema & S,Decl * D,const ParsedAttr & AL)1489 static void handleIBOutlet(Sema &S, Decl *D, const ParsedAttr &AL) {
1490 if (!checkIBOutletCommon(S, D, AL))
1491 return;
1492
1493 D->addAttr(::new (S.Context) IBOutletAttr(S.Context, AL));
1494 }
1495
handleIBOutletCollection(Sema & S,Decl * D,const ParsedAttr & AL)1496 static void handleIBOutletCollection(Sema &S, Decl *D, const ParsedAttr &AL) {
1497
1498 // The iboutletcollection attribute can have zero or one arguments.
1499 if (AL.getNumArgs() > 1) {
1500 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments) << AL << 1;
1501 return;
1502 }
1503
1504 if (!checkIBOutletCommon(S, D, AL))
1505 return;
1506
1507 ParsedType PT;
1508
1509 if (AL.hasParsedType())
1510 PT = AL.getTypeArg();
1511 else {
1512 PT = S.getTypeName(S.Context.Idents.get("NSObject"), AL.getLoc(),
1513 S.getScopeForContext(D->getDeclContext()->getParent()));
1514 if (!PT) {
1515 S.Diag(AL.getLoc(), diag::err_iboutletcollection_type) << "NSObject";
1516 return;
1517 }
1518 }
1519
1520 TypeSourceInfo *QTLoc = nullptr;
1521 QualType QT = S.GetTypeFromParser(PT, &QTLoc);
1522 if (!QTLoc)
1523 QTLoc = S.Context.getTrivialTypeSourceInfo(QT, AL.getLoc());
1524
1525 // Diagnose use of non-object type in iboutletcollection attribute.
1526 // FIXME. Gnu attribute extension ignores use of builtin types in
1527 // attributes. So, __attribute__((iboutletcollection(char))) will be
1528 // treated as __attribute__((iboutletcollection())).
1529 if (!QT->isObjCIdType() && !QT->isObjCObjectType()) {
1530 S.Diag(AL.getLoc(),
1531 QT->isBuiltinType() ? diag::err_iboutletcollection_builtintype
1532 : diag::err_iboutletcollection_type) << QT;
1533 return;
1534 }
1535
1536 D->addAttr(::new (S.Context) IBOutletCollectionAttr(S.Context, AL, QTLoc));
1537 }
1538
isValidPointerAttrType(QualType T,bool RefOkay)1539 bool Sema::isValidPointerAttrType(QualType T, bool RefOkay) {
1540 if (RefOkay) {
1541 if (T->isReferenceType())
1542 return true;
1543 } else {
1544 T = T.getNonReferenceType();
1545 }
1546
1547 // The nonnull attribute, and other similar attributes, can be applied to a
1548 // transparent union that contains a pointer type.
1549 if (const RecordType *UT = T->getAsUnionType()) {
1550 if (UT && UT->getDecl()->hasAttr<TransparentUnionAttr>()) {
1551 RecordDecl *UD = UT->getDecl();
1552 for (const auto *I : UD->fields()) {
1553 QualType QT = I->getType();
1554 if (QT->isAnyPointerType() || QT->isBlockPointerType())
1555 return true;
1556 }
1557 }
1558 }
1559
1560 return T->isAnyPointerType() || T->isBlockPointerType();
1561 }
1562
attrNonNullArgCheck(Sema & S,QualType T,const ParsedAttr & AL,SourceRange AttrParmRange,SourceRange TypeRange,bool isReturnValue=false)1563 static bool attrNonNullArgCheck(Sema &S, QualType T, const ParsedAttr &AL,
1564 SourceRange AttrParmRange,
1565 SourceRange TypeRange,
1566 bool isReturnValue = false) {
1567 if (!S.isValidPointerAttrType(T)) {
1568 if (isReturnValue)
1569 S.Diag(AL.getLoc(), diag::warn_attribute_return_pointers_only)
1570 << AL << AttrParmRange << TypeRange;
1571 else
1572 S.Diag(AL.getLoc(), diag::warn_attribute_pointers_only)
1573 << AL << AttrParmRange << TypeRange << 0;
1574 return false;
1575 }
1576 return true;
1577 }
1578
handleNonNullAttr(Sema & S,Decl * D,const ParsedAttr & AL)1579 static void handleNonNullAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1580 SmallVector<ParamIdx, 8> NonNullArgs;
1581 for (unsigned I = 0; I < AL.getNumArgs(); ++I) {
1582 Expr *Ex = AL.getArgAsExpr(I);
1583 ParamIdx Idx;
1584 if (!checkFunctionOrMethodParameterIndex(S, D, AL, I + 1, Ex, Idx))
1585 return;
1586
1587 // Is the function argument a pointer type?
1588 if (Idx.getASTIndex() < getFunctionOrMethodNumParams(D) &&
1589 !attrNonNullArgCheck(
1590 S, getFunctionOrMethodParamType(D, Idx.getASTIndex()), AL,
1591 Ex->getSourceRange(),
1592 getFunctionOrMethodParamRange(D, Idx.getASTIndex())))
1593 continue;
1594
1595 NonNullArgs.push_back(Idx);
1596 }
1597
1598 // If no arguments were specified to __attribute__((nonnull)) then all pointer
1599 // arguments have a nonnull attribute; warn if there aren't any. Skip this
1600 // check if the attribute came from a macro expansion or a template
1601 // instantiation.
1602 if (NonNullArgs.empty() && AL.getLoc().isFileID() &&
1603 !S.inTemplateInstantiation()) {
1604 bool AnyPointers = isFunctionOrMethodVariadic(D);
1605 for (unsigned I = 0, E = getFunctionOrMethodNumParams(D);
1606 I != E && !AnyPointers; ++I) {
1607 QualType T = getFunctionOrMethodParamType(D, I);
1608 if (T->isDependentType() || S.isValidPointerAttrType(T))
1609 AnyPointers = true;
1610 }
1611
1612 if (!AnyPointers)
1613 S.Diag(AL.getLoc(), diag::warn_attribute_nonnull_no_pointers);
1614 }
1615
1616 ParamIdx *Start = NonNullArgs.data();
1617 unsigned Size = NonNullArgs.size();
1618 llvm::array_pod_sort(Start, Start + Size);
1619 D->addAttr(::new (S.Context) NonNullAttr(S.Context, AL, Start, Size));
1620 }
1621
handleNonNullAttrParameter(Sema & S,ParmVarDecl * D,const ParsedAttr & AL)1622 static void handleNonNullAttrParameter(Sema &S, ParmVarDecl *D,
1623 const ParsedAttr &AL) {
1624 if (AL.getNumArgs() > 0) {
1625 if (D->getFunctionType()) {
1626 handleNonNullAttr(S, D, AL);
1627 } else {
1628 S.Diag(AL.getLoc(), diag::warn_attribute_nonnull_parm_no_args)
1629 << D->getSourceRange();
1630 }
1631 return;
1632 }
1633
1634 // Is the argument a pointer type?
1635 if (!attrNonNullArgCheck(S, D->getType(), AL, SourceRange(),
1636 D->getSourceRange()))
1637 return;
1638
1639 D->addAttr(::new (S.Context) NonNullAttr(S.Context, AL, nullptr, 0));
1640 }
1641
handleReturnsNonNullAttr(Sema & S,Decl * D,const ParsedAttr & AL)1642 static void handleReturnsNonNullAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1643 QualType ResultType = getFunctionOrMethodResultType(D);
1644 SourceRange SR = getFunctionOrMethodResultSourceRange(D);
1645 if (!attrNonNullArgCheck(S, ResultType, AL, SourceRange(), SR,
1646 /* isReturnValue */ true))
1647 return;
1648
1649 D->addAttr(::new (S.Context) ReturnsNonNullAttr(S.Context, AL));
1650 }
1651
handleNoEscapeAttr(Sema & S,Decl * D,const ParsedAttr & AL)1652 static void handleNoEscapeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1653 if (D->isInvalidDecl())
1654 return;
1655
1656 // noescape only applies to pointer types.
1657 QualType T = cast<ParmVarDecl>(D)->getType();
1658 if (!S.isValidPointerAttrType(T, /* RefOkay */ true)) {
1659 S.Diag(AL.getLoc(), diag::warn_attribute_pointers_only)
1660 << AL << AL.getRange() << 0;
1661 return;
1662 }
1663
1664 D->addAttr(::new (S.Context) NoEscapeAttr(S.Context, AL));
1665 }
1666
handleAssumeAlignedAttr(Sema & S,Decl * D,const ParsedAttr & AL)1667 static void handleAssumeAlignedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1668 Expr *E = AL.getArgAsExpr(0),
1669 *OE = AL.getNumArgs() > 1 ? AL.getArgAsExpr(1) : nullptr;
1670 S.AddAssumeAlignedAttr(D, AL, E, OE);
1671 }
1672
handleAllocAlignAttr(Sema & S,Decl * D,const ParsedAttr & AL)1673 static void handleAllocAlignAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1674 S.AddAllocAlignAttr(D, AL, AL.getArgAsExpr(0));
1675 }
1676
AddAssumeAlignedAttr(Decl * D,const AttributeCommonInfo & CI,Expr * E,Expr * OE)1677 void Sema::AddAssumeAlignedAttr(Decl *D, const AttributeCommonInfo &CI, Expr *E,
1678 Expr *OE) {
1679 QualType ResultType = getFunctionOrMethodResultType(D);
1680 SourceRange SR = getFunctionOrMethodResultSourceRange(D);
1681
1682 AssumeAlignedAttr TmpAttr(Context, CI, E, OE);
1683 SourceLocation AttrLoc = TmpAttr.getLocation();
1684
1685 if (!isValidPointerAttrType(ResultType, /* RefOkay */ true)) {
1686 Diag(AttrLoc, diag::warn_attribute_return_pointers_refs_only)
1687 << &TmpAttr << TmpAttr.getRange() << SR;
1688 return;
1689 }
1690
1691 if (!E->isValueDependent()) {
1692 Optional<llvm::APSInt> I = llvm::APSInt(64);
1693 if (!(I = E->getIntegerConstantExpr(Context))) {
1694 if (OE)
1695 Diag(AttrLoc, diag::err_attribute_argument_n_type)
1696 << &TmpAttr << 1 << AANT_ArgumentIntegerConstant
1697 << E->getSourceRange();
1698 else
1699 Diag(AttrLoc, diag::err_attribute_argument_type)
1700 << &TmpAttr << AANT_ArgumentIntegerConstant
1701 << E->getSourceRange();
1702 return;
1703 }
1704
1705 if (!I->isPowerOf2()) {
1706 Diag(AttrLoc, diag::err_alignment_not_power_of_two)
1707 << E->getSourceRange();
1708 return;
1709 }
1710
1711 if (*I > Sema::MaximumAlignment)
1712 Diag(CI.getLoc(), diag::warn_assume_aligned_too_great)
1713 << CI.getRange() << Sema::MaximumAlignment;
1714 }
1715
1716 if (OE && !OE->isValueDependent() && !OE->isIntegerConstantExpr(Context)) {
1717 Diag(AttrLoc, diag::err_attribute_argument_n_type)
1718 << &TmpAttr << 2 << AANT_ArgumentIntegerConstant
1719 << OE->getSourceRange();
1720 return;
1721 }
1722
1723 D->addAttr(::new (Context) AssumeAlignedAttr(Context, CI, E, OE));
1724 }
1725
AddAllocAlignAttr(Decl * D,const AttributeCommonInfo & CI,Expr * ParamExpr)1726 void Sema::AddAllocAlignAttr(Decl *D, const AttributeCommonInfo &CI,
1727 Expr *ParamExpr) {
1728 QualType ResultType = getFunctionOrMethodResultType(D);
1729
1730 AllocAlignAttr TmpAttr(Context, CI, ParamIdx());
1731 SourceLocation AttrLoc = CI.getLoc();
1732
1733 if (!ResultType->isDependentType() &&
1734 !isValidPointerAttrType(ResultType, /* RefOkay */ true)) {
1735 Diag(AttrLoc, diag::warn_attribute_return_pointers_refs_only)
1736 << &TmpAttr << CI.getRange() << getFunctionOrMethodResultSourceRange(D);
1737 return;
1738 }
1739
1740 ParamIdx Idx;
1741 const auto *FuncDecl = cast<FunctionDecl>(D);
1742 if (!checkFunctionOrMethodParameterIndex(*this, FuncDecl, TmpAttr,
1743 /*AttrArgNum=*/1, ParamExpr, Idx))
1744 return;
1745
1746 QualType Ty = getFunctionOrMethodParamType(D, Idx.getASTIndex());
1747 if (!Ty->isDependentType() && !Ty->isIntegralType(Context) &&
1748 !Ty->isAlignValT()) {
1749 Diag(ParamExpr->getBeginLoc(), diag::err_attribute_integers_only)
1750 << &TmpAttr
1751 << FuncDecl->getParamDecl(Idx.getASTIndex())->getSourceRange();
1752 return;
1753 }
1754
1755 D->addAttr(::new (Context) AllocAlignAttr(Context, CI, Idx));
1756 }
1757
1758 /// Check if \p AssumptionStr is a known assumption and warn if not.
checkAssumptionAttr(Sema & S,SourceLocation Loc,StringRef AssumptionStr)1759 static void checkAssumptionAttr(Sema &S, SourceLocation Loc,
1760 StringRef AssumptionStr) {
1761 if (llvm::KnownAssumptionStrings.count(AssumptionStr))
1762 return;
1763
1764 unsigned BestEditDistance = 3;
1765 StringRef Suggestion;
1766 for (const auto &KnownAssumptionIt : llvm::KnownAssumptionStrings) {
1767 unsigned EditDistance =
1768 AssumptionStr.edit_distance(KnownAssumptionIt.getKey());
1769 if (EditDistance < BestEditDistance) {
1770 Suggestion = KnownAssumptionIt.getKey();
1771 BestEditDistance = EditDistance;
1772 }
1773 }
1774
1775 if (!Suggestion.empty())
1776 S.Diag(Loc, diag::warn_assume_attribute_string_unknown_suggested)
1777 << AssumptionStr << Suggestion;
1778 else
1779 S.Diag(Loc, diag::warn_assume_attribute_string_unknown) << AssumptionStr;
1780 }
1781
handleAssumumptionAttr(Sema & S,Decl * D,const ParsedAttr & AL)1782 static void handleAssumumptionAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1783 // Handle the case where the attribute has a text message.
1784 StringRef Str;
1785 SourceLocation AttrStrLoc;
1786 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &AttrStrLoc))
1787 return;
1788
1789 checkAssumptionAttr(S, AttrStrLoc, Str);
1790
1791 D->addAttr(::new (S.Context) AssumptionAttr(S.Context, AL, Str));
1792 }
1793
1794 /// Normalize the attribute, __foo__ becomes foo.
1795 /// Returns true if normalization was applied.
normalizeName(StringRef & AttrName)1796 static bool normalizeName(StringRef &AttrName) {
1797 if (AttrName.size() > 4 && AttrName.startswith("__") &&
1798 AttrName.endswith("__")) {
1799 AttrName = AttrName.drop_front(2).drop_back(2);
1800 return true;
1801 }
1802 return false;
1803 }
1804
handleOwnershipAttr(Sema & S,Decl * D,const ParsedAttr & AL)1805 static void handleOwnershipAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1806 // This attribute must be applied to a function declaration. The first
1807 // argument to the attribute must be an identifier, the name of the resource,
1808 // for example: malloc. The following arguments must be argument indexes, the
1809 // arguments must be of integer type for Returns, otherwise of pointer type.
1810 // The difference between Holds and Takes is that a pointer may still be used
1811 // after being held. free() should be __attribute((ownership_takes)), whereas
1812 // a list append function may well be __attribute((ownership_holds)).
1813
1814 if (!AL.isArgIdent(0)) {
1815 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
1816 << AL << 1 << AANT_ArgumentIdentifier;
1817 return;
1818 }
1819
1820 // Figure out our Kind.
1821 OwnershipAttr::OwnershipKind K =
1822 OwnershipAttr(S.Context, AL, nullptr, nullptr, 0).getOwnKind();
1823
1824 // Check arguments.
1825 switch (K) {
1826 case OwnershipAttr::Takes:
1827 case OwnershipAttr::Holds:
1828 if (AL.getNumArgs() < 2) {
1829 S.Diag(AL.getLoc(), diag::err_attribute_too_few_arguments) << AL << 2;
1830 return;
1831 }
1832 break;
1833 case OwnershipAttr::Returns:
1834 if (AL.getNumArgs() > 2) {
1835 S.Diag(AL.getLoc(), diag::err_attribute_too_many_arguments) << AL << 1;
1836 return;
1837 }
1838 break;
1839 }
1840
1841 IdentifierInfo *Module = AL.getArgAsIdent(0)->Ident;
1842
1843 StringRef ModuleName = Module->getName();
1844 if (normalizeName(ModuleName)) {
1845 Module = &S.PP.getIdentifierTable().get(ModuleName);
1846 }
1847
1848 SmallVector<ParamIdx, 8> OwnershipArgs;
1849 for (unsigned i = 1; i < AL.getNumArgs(); ++i) {
1850 Expr *Ex = AL.getArgAsExpr(i);
1851 ParamIdx Idx;
1852 if (!checkFunctionOrMethodParameterIndex(S, D, AL, i, Ex, Idx))
1853 return;
1854
1855 // Is the function argument a pointer type?
1856 QualType T = getFunctionOrMethodParamType(D, Idx.getASTIndex());
1857 int Err = -1; // No error
1858 switch (K) {
1859 case OwnershipAttr::Takes:
1860 case OwnershipAttr::Holds:
1861 if (!T->isAnyPointerType() && !T->isBlockPointerType())
1862 Err = 0;
1863 break;
1864 case OwnershipAttr::Returns:
1865 if (!T->isIntegerType())
1866 Err = 1;
1867 break;
1868 }
1869 if (-1 != Err) {
1870 S.Diag(AL.getLoc(), diag::err_ownership_type) << AL << Err
1871 << Ex->getSourceRange();
1872 return;
1873 }
1874
1875 // Check we don't have a conflict with another ownership attribute.
1876 for (const auto *I : D->specific_attrs<OwnershipAttr>()) {
1877 // Cannot have two ownership attributes of different kinds for the same
1878 // index.
1879 if (I->getOwnKind() != K && I->args_end() !=
1880 std::find(I->args_begin(), I->args_end(), Idx)) {
1881 S.Diag(AL.getLoc(), diag::err_attributes_are_not_compatible) << AL << I;
1882 return;
1883 } else if (K == OwnershipAttr::Returns &&
1884 I->getOwnKind() == OwnershipAttr::Returns) {
1885 // A returns attribute conflicts with any other returns attribute using
1886 // a different index.
1887 if (!llvm::is_contained(I->args(), Idx)) {
1888 S.Diag(I->getLocation(), diag::err_ownership_returns_index_mismatch)
1889 << I->args_begin()->getSourceIndex();
1890 if (I->args_size())
1891 S.Diag(AL.getLoc(), diag::note_ownership_returns_index_mismatch)
1892 << Idx.getSourceIndex() << Ex->getSourceRange();
1893 return;
1894 }
1895 }
1896 }
1897 OwnershipArgs.push_back(Idx);
1898 }
1899
1900 ParamIdx *Start = OwnershipArgs.data();
1901 unsigned Size = OwnershipArgs.size();
1902 llvm::array_pod_sort(Start, Start + Size);
1903 D->addAttr(::new (S.Context)
1904 OwnershipAttr(S.Context, AL, Module, Start, Size));
1905 }
1906
handleWeakRefAttr(Sema & S,Decl * D,const ParsedAttr & AL)1907 static void handleWeakRefAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1908 // Check the attribute arguments.
1909 if (AL.getNumArgs() > 1) {
1910 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments) << AL << 1;
1911 return;
1912 }
1913
1914 // gcc rejects
1915 // class c {
1916 // static int a __attribute__((weakref ("v2")));
1917 // static int b() __attribute__((weakref ("f3")));
1918 // };
1919 // and ignores the attributes of
1920 // void f(void) {
1921 // static int a __attribute__((weakref ("v2")));
1922 // }
1923 // we reject them
1924 const DeclContext *Ctx = D->getDeclContext()->getRedeclContext();
1925 if (!Ctx->isFileContext()) {
1926 S.Diag(AL.getLoc(), diag::err_attribute_weakref_not_global_context)
1927 << cast<NamedDecl>(D);
1928 return;
1929 }
1930
1931 // The GCC manual says
1932 //
1933 // At present, a declaration to which `weakref' is attached can only
1934 // be `static'.
1935 //
1936 // It also says
1937 //
1938 // Without a TARGET,
1939 // given as an argument to `weakref' or to `alias', `weakref' is
1940 // equivalent to `weak'.
1941 //
1942 // gcc 4.4.1 will accept
1943 // int a7 __attribute__((weakref));
1944 // as
1945 // int a7 __attribute__((weak));
1946 // This looks like a bug in gcc. We reject that for now. We should revisit
1947 // it if this behaviour is actually used.
1948
1949 // GCC rejects
1950 // static ((alias ("y"), weakref)).
1951 // Should we? How to check that weakref is before or after alias?
1952
1953 // FIXME: it would be good for us to keep the WeakRefAttr as-written instead
1954 // of transforming it into an AliasAttr. The WeakRefAttr never uses the
1955 // StringRef parameter it was given anyway.
1956 StringRef Str;
1957 if (AL.getNumArgs() && S.checkStringLiteralArgumentAttr(AL, 0, Str))
1958 // GCC will accept anything as the argument of weakref. Should we
1959 // check for an existing decl?
1960 D->addAttr(::new (S.Context) AliasAttr(S.Context, AL, Str));
1961
1962 D->addAttr(::new (S.Context) WeakRefAttr(S.Context, AL));
1963 }
1964
handleIFuncAttr(Sema & S,Decl * D,const ParsedAttr & AL)1965 static void handleIFuncAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1966 StringRef Str;
1967 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str))
1968 return;
1969
1970 // Aliases should be on declarations, not definitions.
1971 const auto *FD = cast<FunctionDecl>(D);
1972 if (FD->isThisDeclarationADefinition()) {
1973 S.Diag(AL.getLoc(), diag::err_alias_is_definition) << FD << 1;
1974 return;
1975 }
1976
1977 D->addAttr(::new (S.Context) IFuncAttr(S.Context, AL, Str));
1978 }
1979
handleAliasAttr(Sema & S,Decl * D,const ParsedAttr & AL)1980 static void handleAliasAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
1981 StringRef Str;
1982 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str))
1983 return;
1984
1985 if (S.Context.getTargetInfo().getTriple().isOSDarwin()) {
1986 S.Diag(AL.getLoc(), diag::err_alias_not_supported_on_darwin);
1987 return;
1988 }
1989 if (S.Context.getTargetInfo().getTriple().isNVPTX()) {
1990 S.Diag(AL.getLoc(), diag::err_alias_not_supported_on_nvptx);
1991 }
1992
1993 // Aliases should be on declarations, not definitions.
1994 if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
1995 if (FD->isThisDeclarationADefinition()) {
1996 S.Diag(AL.getLoc(), diag::err_alias_is_definition) << FD << 0;
1997 return;
1998 }
1999 } else {
2000 const auto *VD = cast<VarDecl>(D);
2001 if (VD->isThisDeclarationADefinition() && VD->isExternallyVisible()) {
2002 S.Diag(AL.getLoc(), diag::err_alias_is_definition) << VD << 0;
2003 return;
2004 }
2005 }
2006
2007 // Mark target used to prevent unneeded-internal-declaration warnings.
2008 if (!S.LangOpts.CPlusPlus) {
2009 // FIXME: demangle Str for C++, as the attribute refers to the mangled
2010 // linkage name, not the pre-mangled identifier.
2011 const DeclarationNameInfo target(&S.Context.Idents.get(Str), AL.getLoc());
2012 LookupResult LR(S, target, Sema::LookupOrdinaryName);
2013 if (S.LookupQualifiedName(LR, S.getCurLexicalContext()))
2014 for (NamedDecl *ND : LR)
2015 ND->markUsed(S.Context);
2016 }
2017
2018 D->addAttr(::new (S.Context) AliasAttr(S.Context, AL, Str));
2019 }
2020
handleTLSModelAttr(Sema & S,Decl * D,const ParsedAttr & AL)2021 static void handleTLSModelAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2022 StringRef Model;
2023 SourceLocation LiteralLoc;
2024 // Check that it is a string.
2025 if (!S.checkStringLiteralArgumentAttr(AL, 0, Model, &LiteralLoc))
2026 return;
2027
2028 // Check that the value.
2029 if (Model != "global-dynamic" && Model != "local-dynamic"
2030 && Model != "initial-exec" && Model != "local-exec") {
2031 S.Diag(LiteralLoc, diag::err_attr_tlsmodel_arg);
2032 return;
2033 }
2034
2035 if (S.Context.getTargetInfo().getTriple().isOSAIX() &&
2036 Model != "global-dynamic") {
2037 S.Diag(LiteralLoc, diag::err_aix_attr_unsupported_tls_model) << Model;
2038 return;
2039 }
2040
2041 D->addAttr(::new (S.Context) TLSModelAttr(S.Context, AL, Model));
2042 }
2043
handleRestrictAttr(Sema & S,Decl * D,const ParsedAttr & AL)2044 static void handleRestrictAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2045 QualType ResultType = getFunctionOrMethodResultType(D);
2046 if (ResultType->isAnyPointerType() || ResultType->isBlockPointerType()) {
2047 D->addAttr(::new (S.Context) RestrictAttr(S.Context, AL));
2048 return;
2049 }
2050
2051 S.Diag(AL.getLoc(), diag::warn_attribute_return_pointers_only)
2052 << AL << getFunctionOrMethodResultSourceRange(D);
2053 }
2054
handleCPUSpecificAttr(Sema & S,Decl * D,const ParsedAttr & AL)2055 static void handleCPUSpecificAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2056 // Ensure we don't combine these with themselves, since that causes some
2057 // confusing behavior.
2058 if (AL.getParsedKind() == ParsedAttr::AT_CPUDispatch) {
2059 if (checkAttrMutualExclusion<CPUSpecificAttr>(S, D, AL))
2060 return;
2061
2062 if (const auto *Other = D->getAttr<CPUDispatchAttr>()) {
2063 S.Diag(AL.getLoc(), diag::err_disallowed_duplicate_attribute) << AL;
2064 S.Diag(Other->getLocation(), diag::note_conflicting_attribute);
2065 return;
2066 }
2067 } else if (AL.getParsedKind() == ParsedAttr::AT_CPUSpecific) {
2068 if (checkAttrMutualExclusion<CPUDispatchAttr>(S, D, AL))
2069 return;
2070
2071 if (const auto *Other = D->getAttr<CPUSpecificAttr>()) {
2072 S.Diag(AL.getLoc(), diag::err_disallowed_duplicate_attribute) << AL;
2073 S.Diag(Other->getLocation(), diag::note_conflicting_attribute);
2074 return;
2075 }
2076 }
2077
2078 FunctionDecl *FD = cast<FunctionDecl>(D);
2079
2080 if (const auto *MD = dyn_cast<CXXMethodDecl>(D)) {
2081 if (MD->getParent()->isLambda()) {
2082 S.Diag(AL.getLoc(), diag::err_attribute_dll_lambda) << AL;
2083 return;
2084 }
2085 }
2086
2087 if (!AL.checkAtLeastNumArgs(S, 1))
2088 return;
2089
2090 SmallVector<IdentifierInfo *, 8> CPUs;
2091 for (unsigned ArgNo = 0; ArgNo < getNumAttributeArgs(AL); ++ArgNo) {
2092 if (!AL.isArgIdent(ArgNo)) {
2093 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
2094 << AL << AANT_ArgumentIdentifier;
2095 return;
2096 }
2097
2098 IdentifierLoc *CPUArg = AL.getArgAsIdent(ArgNo);
2099 StringRef CPUName = CPUArg->Ident->getName().trim();
2100
2101 if (!S.Context.getTargetInfo().validateCPUSpecificCPUDispatch(CPUName)) {
2102 S.Diag(CPUArg->Loc, diag::err_invalid_cpu_specific_dispatch_value)
2103 << CPUName << (AL.getKind() == ParsedAttr::AT_CPUDispatch);
2104 return;
2105 }
2106
2107 const TargetInfo &Target = S.Context.getTargetInfo();
2108 if (llvm::any_of(CPUs, [CPUName, &Target](const IdentifierInfo *Cur) {
2109 return Target.CPUSpecificManglingCharacter(CPUName) ==
2110 Target.CPUSpecificManglingCharacter(Cur->getName());
2111 })) {
2112 S.Diag(AL.getLoc(), diag::warn_multiversion_duplicate_entries);
2113 return;
2114 }
2115 CPUs.push_back(CPUArg->Ident);
2116 }
2117
2118 FD->setIsMultiVersion(true);
2119 if (AL.getKind() == ParsedAttr::AT_CPUSpecific)
2120 D->addAttr(::new (S.Context)
2121 CPUSpecificAttr(S.Context, AL, CPUs.data(), CPUs.size()));
2122 else
2123 D->addAttr(::new (S.Context)
2124 CPUDispatchAttr(S.Context, AL, CPUs.data(), CPUs.size()));
2125 }
2126
handleCommonAttr(Sema & S,Decl * D,const ParsedAttr & AL)2127 static void handleCommonAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2128 if (S.LangOpts.CPlusPlus) {
2129 S.Diag(AL.getLoc(), diag::err_attribute_not_supported_in_lang)
2130 << AL << AttributeLangSupport::Cpp;
2131 return;
2132 }
2133
2134 D->addAttr(::new (S.Context) CommonAttr(S.Context, AL));
2135 }
2136
handleCmseNSEntryAttr(Sema & S,Decl * D,const ParsedAttr & AL)2137 static void handleCmseNSEntryAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2138 if (S.LangOpts.CPlusPlus && !D->getDeclContext()->isExternCContext()) {
2139 S.Diag(AL.getLoc(), diag::err_attribute_not_clinkage) << AL;
2140 return;
2141 }
2142
2143 const auto *FD = cast<FunctionDecl>(D);
2144 if (!FD->isExternallyVisible()) {
2145 S.Diag(AL.getLoc(), diag::warn_attribute_cmse_entry_static);
2146 return;
2147 }
2148
2149 D->addAttr(::new (S.Context) CmseNSEntryAttr(S.Context, AL));
2150 }
2151
handleNakedAttr(Sema & S,Decl * D,const ParsedAttr & AL)2152 static void handleNakedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2153 if (AL.isDeclspecAttribute()) {
2154 const auto &Triple = S.getASTContext().getTargetInfo().getTriple();
2155 const auto &Arch = Triple.getArch();
2156 if (Arch != llvm::Triple::x86 &&
2157 (Arch != llvm::Triple::arm && Arch != llvm::Triple::thumb)) {
2158 S.Diag(AL.getLoc(), diag::err_attribute_not_supported_on_arch)
2159 << AL << Triple.getArchName();
2160 return;
2161 }
2162
2163 // This form is not allowed to be written on a member function (static or
2164 // nonstatic) when in Microsoft compatibility mode.
2165 if (S.getLangOpts().MSVCCompat && isa<CXXMethodDecl>(D)) {
2166 S.Diag(AL.getLoc(), diag::err_attribute_wrong_decl_type_str)
2167 << AL << "non-member functions";
2168 return;
2169 }
2170 }
2171
2172 D->addAttr(::new (S.Context) NakedAttr(S.Context, AL));
2173 }
2174
handleNoReturnAttr(Sema & S,Decl * D,const ParsedAttr & Attrs)2175 static void handleNoReturnAttr(Sema &S, Decl *D, const ParsedAttr &Attrs) {
2176 if (hasDeclarator(D)) return;
2177
2178 if (!isa<ObjCMethodDecl>(D)) {
2179 S.Diag(Attrs.getLoc(), diag::warn_attribute_wrong_decl_type)
2180 << Attrs << ExpectedFunctionOrMethod;
2181 return;
2182 }
2183
2184 D->addAttr(::new (S.Context) NoReturnAttr(S.Context, Attrs));
2185 }
2186
handleStandardNoReturnAttr(Sema & S,Decl * D,const ParsedAttr & A)2187 static void handleStandardNoReturnAttr(Sema &S, Decl *D, const ParsedAttr &A) {
2188 // The [[_Noreturn]] spelling is deprecated in C2x, so if that was used,
2189 // issue an appropriate diagnostic. However, don't issue a diagnostic if the
2190 // attribute name comes from a macro expansion. We don't want to punish users
2191 // who write [[noreturn]] after including <stdnoreturn.h> (where 'noreturn'
2192 // is defined as a macro which expands to '_Noreturn').
2193 if (!S.getLangOpts().CPlusPlus &&
2194 A.getSemanticSpelling() == CXX11NoReturnAttr::C2x_Noreturn &&
2195 !(A.getLoc().isMacroID() &&
2196 S.getSourceManager().isInSystemMacro(A.getLoc())))
2197 S.Diag(A.getLoc(), diag::warn_deprecated_noreturn_spelling) << A.getRange();
2198
2199 D->addAttr(::new (S.Context) CXX11NoReturnAttr(S.Context, A));
2200 }
2201
handleNoCfCheckAttr(Sema & S,Decl * D,const ParsedAttr & Attrs)2202 static void handleNoCfCheckAttr(Sema &S, Decl *D, const ParsedAttr &Attrs) {
2203 if (!S.getLangOpts().CFProtectionBranch)
2204 S.Diag(Attrs.getLoc(), diag::warn_nocf_check_attribute_ignored);
2205 else
2206 handleSimpleAttribute<AnyX86NoCfCheckAttr>(S, D, Attrs);
2207 }
2208
CheckAttrNoArgs(const ParsedAttr & Attrs)2209 bool Sema::CheckAttrNoArgs(const ParsedAttr &Attrs) {
2210 if (!Attrs.checkExactlyNumArgs(*this, 0)) {
2211 Attrs.setInvalid();
2212 return true;
2213 }
2214
2215 return false;
2216 }
2217
CheckAttrTarget(const ParsedAttr & AL)2218 bool Sema::CheckAttrTarget(const ParsedAttr &AL) {
2219 // Check whether the attribute is valid on the current target.
2220 if (!AL.existsInTarget(Context.getTargetInfo())) {
2221 Diag(AL.getLoc(), diag::warn_unknown_attribute_ignored)
2222 << AL << AL.getRange();
2223 AL.setInvalid();
2224 return true;
2225 }
2226
2227 return false;
2228 }
2229
handleAnalyzerNoReturnAttr(Sema & S,Decl * D,const ParsedAttr & AL)2230 static void handleAnalyzerNoReturnAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2231
2232 // The checking path for 'noreturn' and 'analyzer_noreturn' are different
2233 // because 'analyzer_noreturn' does not impact the type.
2234 if (!isFunctionOrMethodOrBlock(D)) {
2235 ValueDecl *VD = dyn_cast<ValueDecl>(D);
2236 if (!VD || (!VD->getType()->isBlockPointerType() &&
2237 !VD->getType()->isFunctionPointerType())) {
2238 S.Diag(AL.getLoc(), AL.isStandardAttributeSyntax()
2239 ? diag::err_attribute_wrong_decl_type
2240 : diag::warn_attribute_wrong_decl_type)
2241 << AL << ExpectedFunctionMethodOrBlock;
2242 return;
2243 }
2244 }
2245
2246 D->addAttr(::new (S.Context) AnalyzerNoReturnAttr(S.Context, AL));
2247 }
2248
2249 // PS3 PPU-specific.
handleVecReturnAttr(Sema & S,Decl * D,const ParsedAttr & AL)2250 static void handleVecReturnAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2251 /*
2252 Returning a Vector Class in Registers
2253
2254 According to the PPU ABI specifications, a class with a single member of
2255 vector type is returned in memory when used as the return value of a
2256 function.
2257 This results in inefficient code when implementing vector classes. To return
2258 the value in a single vector register, add the vecreturn attribute to the
2259 class definition. This attribute is also applicable to struct types.
2260
2261 Example:
2262
2263 struct Vector
2264 {
2265 __vector float xyzw;
2266 } __attribute__((vecreturn));
2267
2268 Vector Add(Vector lhs, Vector rhs)
2269 {
2270 Vector result;
2271 result.xyzw = vec_add(lhs.xyzw, rhs.xyzw);
2272 return result; // This will be returned in a register
2273 }
2274 */
2275 if (VecReturnAttr *A = D->getAttr<VecReturnAttr>()) {
2276 S.Diag(AL.getLoc(), diag::err_repeat_attribute) << A;
2277 return;
2278 }
2279
2280 const auto *R = cast<RecordDecl>(D);
2281 int count = 0;
2282
2283 if (!isa<CXXRecordDecl>(R)) {
2284 S.Diag(AL.getLoc(), diag::err_attribute_vecreturn_only_vector_member);
2285 return;
2286 }
2287
2288 if (!cast<CXXRecordDecl>(R)->isPOD()) {
2289 S.Diag(AL.getLoc(), diag::err_attribute_vecreturn_only_pod_record);
2290 return;
2291 }
2292
2293 for (const auto *I : R->fields()) {
2294 if ((count == 1) || !I->getType()->isVectorType()) {
2295 S.Diag(AL.getLoc(), diag::err_attribute_vecreturn_only_vector_member);
2296 return;
2297 }
2298 count++;
2299 }
2300
2301 D->addAttr(::new (S.Context) VecReturnAttr(S.Context, AL));
2302 }
2303
handleDependencyAttr(Sema & S,Scope * Scope,Decl * D,const ParsedAttr & AL)2304 static void handleDependencyAttr(Sema &S, Scope *Scope, Decl *D,
2305 const ParsedAttr &AL) {
2306 if (isa<ParmVarDecl>(D)) {
2307 // [[carries_dependency]] can only be applied to a parameter if it is a
2308 // parameter of a function declaration or lambda.
2309 if (!(Scope->getFlags() & clang::Scope::FunctionDeclarationScope)) {
2310 S.Diag(AL.getLoc(),
2311 diag::err_carries_dependency_param_not_function_decl);
2312 return;
2313 }
2314 }
2315
2316 D->addAttr(::new (S.Context) CarriesDependencyAttr(S.Context, AL));
2317 }
2318
handleUnusedAttr(Sema & S,Decl * D,const ParsedAttr & AL)2319 static void handleUnusedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2320 bool IsCXX17Attr = AL.isCXX11Attribute() && !AL.getScopeName();
2321
2322 // If this is spelled as the standard C++17 attribute, but not in C++17, warn
2323 // about using it as an extension.
2324 if (!S.getLangOpts().CPlusPlus17 && IsCXX17Attr)
2325 S.Diag(AL.getLoc(), diag::ext_cxx17_attr) << AL;
2326
2327 D->addAttr(::new (S.Context) UnusedAttr(S.Context, AL));
2328 }
2329
handleConstructorAttr(Sema & S,Decl * D,const ParsedAttr & AL)2330 static void handleConstructorAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2331 uint32_t priority = ConstructorAttr::DefaultPriority;
2332 if (AL.getNumArgs() &&
2333 !checkUInt32Argument(S, AL, AL.getArgAsExpr(0), priority))
2334 return;
2335
2336 D->addAttr(::new (S.Context) ConstructorAttr(S.Context, AL, priority));
2337 }
2338
handleDestructorAttr(Sema & S,Decl * D,const ParsedAttr & AL)2339 static void handleDestructorAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2340 uint32_t priority = DestructorAttr::DefaultPriority;
2341 if (AL.getNumArgs() &&
2342 !checkUInt32Argument(S, AL, AL.getArgAsExpr(0), priority))
2343 return;
2344
2345 D->addAttr(::new (S.Context) DestructorAttr(S.Context, AL, priority));
2346 }
2347
2348 template <typename AttrTy>
handleAttrWithMessage(Sema & S,Decl * D,const ParsedAttr & AL)2349 static void handleAttrWithMessage(Sema &S, Decl *D, const ParsedAttr &AL) {
2350 // Handle the case where the attribute has a text message.
2351 StringRef Str;
2352 if (AL.getNumArgs() == 1 && !S.checkStringLiteralArgumentAttr(AL, 0, Str))
2353 return;
2354
2355 D->addAttr(::new (S.Context) AttrTy(S.Context, AL, Str));
2356 }
2357
handleObjCSuppresProtocolAttr(Sema & S,Decl * D,const ParsedAttr & AL)2358 static void handleObjCSuppresProtocolAttr(Sema &S, Decl *D,
2359 const ParsedAttr &AL) {
2360 if (!cast<ObjCProtocolDecl>(D)->isThisDeclarationADefinition()) {
2361 S.Diag(AL.getLoc(), diag::err_objc_attr_protocol_requires_definition)
2362 << AL << AL.getRange();
2363 return;
2364 }
2365
2366 D->addAttr(::new (S.Context) ObjCExplicitProtocolImplAttr(S.Context, AL));
2367 }
2368
checkAvailabilityAttr(Sema & S,SourceRange Range,IdentifierInfo * Platform,VersionTuple Introduced,VersionTuple Deprecated,VersionTuple Obsoleted)2369 static bool checkAvailabilityAttr(Sema &S, SourceRange Range,
2370 IdentifierInfo *Platform,
2371 VersionTuple Introduced,
2372 VersionTuple Deprecated,
2373 VersionTuple Obsoleted) {
2374 StringRef PlatformName
2375 = AvailabilityAttr::getPrettyPlatformName(Platform->getName());
2376 if (PlatformName.empty())
2377 PlatformName = Platform->getName();
2378
2379 // Ensure that Introduced <= Deprecated <= Obsoleted (although not all
2380 // of these steps are needed).
2381 if (!Introduced.empty() && !Deprecated.empty() &&
2382 !(Introduced <= Deprecated)) {
2383 S.Diag(Range.getBegin(), diag::warn_availability_version_ordering)
2384 << 1 << PlatformName << Deprecated.getAsString()
2385 << 0 << Introduced.getAsString();
2386 return true;
2387 }
2388
2389 if (!Introduced.empty() && !Obsoleted.empty() &&
2390 !(Introduced <= Obsoleted)) {
2391 S.Diag(Range.getBegin(), diag::warn_availability_version_ordering)
2392 << 2 << PlatformName << Obsoleted.getAsString()
2393 << 0 << Introduced.getAsString();
2394 return true;
2395 }
2396
2397 if (!Deprecated.empty() && !Obsoleted.empty() &&
2398 !(Deprecated <= Obsoleted)) {
2399 S.Diag(Range.getBegin(), diag::warn_availability_version_ordering)
2400 << 2 << PlatformName << Obsoleted.getAsString()
2401 << 1 << Deprecated.getAsString();
2402 return true;
2403 }
2404
2405 return false;
2406 }
2407
2408 /// Check whether the two versions match.
2409 ///
2410 /// If either version tuple is empty, then they are assumed to match. If
2411 /// \p BeforeIsOkay is true, then \p X can be less than or equal to \p Y.
versionsMatch(const VersionTuple & X,const VersionTuple & Y,bool BeforeIsOkay)2412 static bool versionsMatch(const VersionTuple &X, const VersionTuple &Y,
2413 bool BeforeIsOkay) {
2414 if (X.empty() || Y.empty())
2415 return true;
2416
2417 if (X == Y)
2418 return true;
2419
2420 if (BeforeIsOkay && X < Y)
2421 return true;
2422
2423 return false;
2424 }
2425
mergeAvailabilityAttr(NamedDecl * D,const AttributeCommonInfo & CI,IdentifierInfo * Platform,bool Implicit,VersionTuple Introduced,VersionTuple Deprecated,VersionTuple Obsoleted,bool IsUnavailable,StringRef Message,bool IsStrict,StringRef Replacement,AvailabilityMergeKind AMK,int Priority)2426 AvailabilityAttr *Sema::mergeAvailabilityAttr(
2427 NamedDecl *D, const AttributeCommonInfo &CI, IdentifierInfo *Platform,
2428 bool Implicit, VersionTuple Introduced, VersionTuple Deprecated,
2429 VersionTuple Obsoleted, bool IsUnavailable, StringRef Message,
2430 bool IsStrict, StringRef Replacement, AvailabilityMergeKind AMK,
2431 int Priority) {
2432 VersionTuple MergedIntroduced = Introduced;
2433 VersionTuple MergedDeprecated = Deprecated;
2434 VersionTuple MergedObsoleted = Obsoleted;
2435 bool FoundAny = false;
2436 bool OverrideOrImpl = false;
2437 switch (AMK) {
2438 case AMK_None:
2439 case AMK_Redeclaration:
2440 OverrideOrImpl = false;
2441 break;
2442
2443 case AMK_Override:
2444 case AMK_ProtocolImplementation:
2445 case AMK_OptionalProtocolImplementation:
2446 OverrideOrImpl = true;
2447 break;
2448 }
2449
2450 if (D->hasAttrs()) {
2451 AttrVec &Attrs = D->getAttrs();
2452 for (unsigned i = 0, e = Attrs.size(); i != e;) {
2453 const auto *OldAA = dyn_cast<AvailabilityAttr>(Attrs[i]);
2454 if (!OldAA) {
2455 ++i;
2456 continue;
2457 }
2458
2459 IdentifierInfo *OldPlatform = OldAA->getPlatform();
2460 if (OldPlatform != Platform) {
2461 ++i;
2462 continue;
2463 }
2464
2465 // If there is an existing availability attribute for this platform that
2466 // has a lower priority use the existing one and discard the new
2467 // attribute.
2468 if (OldAA->getPriority() < Priority)
2469 return nullptr;
2470
2471 // If there is an existing attribute for this platform that has a higher
2472 // priority than the new attribute then erase the old one and continue
2473 // processing the attributes.
2474 if (OldAA->getPriority() > Priority) {
2475 Attrs.erase(Attrs.begin() + i);
2476 --e;
2477 continue;
2478 }
2479
2480 FoundAny = true;
2481 VersionTuple OldIntroduced = OldAA->getIntroduced();
2482 VersionTuple OldDeprecated = OldAA->getDeprecated();
2483 VersionTuple OldObsoleted = OldAA->getObsoleted();
2484 bool OldIsUnavailable = OldAA->getUnavailable();
2485
2486 if (!versionsMatch(OldIntroduced, Introduced, OverrideOrImpl) ||
2487 !versionsMatch(Deprecated, OldDeprecated, OverrideOrImpl) ||
2488 !versionsMatch(Obsoleted, OldObsoleted, OverrideOrImpl) ||
2489 !(OldIsUnavailable == IsUnavailable ||
2490 (OverrideOrImpl && !OldIsUnavailable && IsUnavailable))) {
2491 if (OverrideOrImpl) {
2492 int Which = -1;
2493 VersionTuple FirstVersion;
2494 VersionTuple SecondVersion;
2495 if (!versionsMatch(OldIntroduced, Introduced, OverrideOrImpl)) {
2496 Which = 0;
2497 FirstVersion = OldIntroduced;
2498 SecondVersion = Introduced;
2499 } else if (!versionsMatch(Deprecated, OldDeprecated, OverrideOrImpl)) {
2500 Which = 1;
2501 FirstVersion = Deprecated;
2502 SecondVersion = OldDeprecated;
2503 } else if (!versionsMatch(Obsoleted, OldObsoleted, OverrideOrImpl)) {
2504 Which = 2;
2505 FirstVersion = Obsoleted;
2506 SecondVersion = OldObsoleted;
2507 }
2508
2509 if (Which == -1) {
2510 Diag(OldAA->getLocation(),
2511 diag::warn_mismatched_availability_override_unavail)
2512 << AvailabilityAttr::getPrettyPlatformName(Platform->getName())
2513 << (AMK == AMK_Override);
2514 } else if (Which != 1 && AMK == AMK_OptionalProtocolImplementation) {
2515 // Allow different 'introduced' / 'obsoleted' availability versions
2516 // on a method that implements an optional protocol requirement. It
2517 // makes less sense to allow this for 'deprecated' as the user can't
2518 // see if the method is 'deprecated' as 'respondsToSelector' will
2519 // still return true when the method is deprecated.
2520 ++i;
2521 continue;
2522 } else {
2523 Diag(OldAA->getLocation(),
2524 diag::warn_mismatched_availability_override)
2525 << Which
2526 << AvailabilityAttr::getPrettyPlatformName(Platform->getName())
2527 << FirstVersion.getAsString() << SecondVersion.getAsString()
2528 << (AMK == AMK_Override);
2529 }
2530 if (AMK == AMK_Override)
2531 Diag(CI.getLoc(), diag::note_overridden_method);
2532 else
2533 Diag(CI.getLoc(), diag::note_protocol_method);
2534 } else {
2535 Diag(OldAA->getLocation(), diag::warn_mismatched_availability);
2536 Diag(CI.getLoc(), diag::note_previous_attribute);
2537 }
2538
2539 Attrs.erase(Attrs.begin() + i);
2540 --e;
2541 continue;
2542 }
2543
2544 VersionTuple MergedIntroduced2 = MergedIntroduced;
2545 VersionTuple MergedDeprecated2 = MergedDeprecated;
2546 VersionTuple MergedObsoleted2 = MergedObsoleted;
2547
2548 if (MergedIntroduced2.empty())
2549 MergedIntroduced2 = OldIntroduced;
2550 if (MergedDeprecated2.empty())
2551 MergedDeprecated2 = OldDeprecated;
2552 if (MergedObsoleted2.empty())
2553 MergedObsoleted2 = OldObsoleted;
2554
2555 if (checkAvailabilityAttr(*this, OldAA->getRange(), Platform,
2556 MergedIntroduced2, MergedDeprecated2,
2557 MergedObsoleted2)) {
2558 Attrs.erase(Attrs.begin() + i);
2559 --e;
2560 continue;
2561 }
2562
2563 MergedIntroduced = MergedIntroduced2;
2564 MergedDeprecated = MergedDeprecated2;
2565 MergedObsoleted = MergedObsoleted2;
2566 ++i;
2567 }
2568 }
2569
2570 if (FoundAny &&
2571 MergedIntroduced == Introduced &&
2572 MergedDeprecated == Deprecated &&
2573 MergedObsoleted == Obsoleted)
2574 return nullptr;
2575
2576 // Only create a new attribute if !OverrideOrImpl, but we want to do
2577 // the checking.
2578 if (!checkAvailabilityAttr(*this, CI.getRange(), Platform, MergedIntroduced,
2579 MergedDeprecated, MergedObsoleted) &&
2580 !OverrideOrImpl) {
2581 auto *Avail = ::new (Context) AvailabilityAttr(
2582 Context, CI, Platform, Introduced, Deprecated, Obsoleted, IsUnavailable,
2583 Message, IsStrict, Replacement, Priority);
2584 Avail->setImplicit(Implicit);
2585 return Avail;
2586 }
2587 return nullptr;
2588 }
2589
handleAvailabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)2590 static void handleAvailabilityAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2591 if (isa<UsingDecl, UnresolvedUsingTypenameDecl, UnresolvedUsingValueDecl>(
2592 D)) {
2593 S.Diag(AL.getRange().getBegin(), diag::warn_deprecated_ignored_on_using)
2594 << AL;
2595 return;
2596 }
2597
2598 if (!AL.checkExactlyNumArgs(S, 1))
2599 return;
2600 IdentifierLoc *Platform = AL.getArgAsIdent(0);
2601
2602 IdentifierInfo *II = Platform->Ident;
2603 if (AvailabilityAttr::getPrettyPlatformName(II->getName()).empty())
2604 S.Diag(Platform->Loc, diag::warn_availability_unknown_platform)
2605 << Platform->Ident;
2606
2607 auto *ND = dyn_cast<NamedDecl>(D);
2608 if (!ND) // We warned about this already, so just return.
2609 return;
2610
2611 AvailabilityChange Introduced = AL.getAvailabilityIntroduced();
2612 AvailabilityChange Deprecated = AL.getAvailabilityDeprecated();
2613 AvailabilityChange Obsoleted = AL.getAvailabilityObsoleted();
2614 bool IsUnavailable = AL.getUnavailableLoc().isValid();
2615 bool IsStrict = AL.getStrictLoc().isValid();
2616 StringRef Str;
2617 if (const auto *SE = dyn_cast_or_null<StringLiteral>(AL.getMessageExpr()))
2618 Str = SE->getString();
2619 StringRef Replacement;
2620 if (const auto *SE = dyn_cast_or_null<StringLiteral>(AL.getReplacementExpr()))
2621 Replacement = SE->getString();
2622
2623 if (II->isStr("swift")) {
2624 if (Introduced.isValid() || Obsoleted.isValid() ||
2625 (!IsUnavailable && !Deprecated.isValid())) {
2626 S.Diag(AL.getLoc(),
2627 diag::warn_availability_swift_unavailable_deprecated_only);
2628 return;
2629 }
2630 }
2631
2632 if (II->isStr("fuchsia")) {
2633 Optional<unsigned> Min, Sub;
2634 if ((Min = Introduced.Version.getMinor()) ||
2635 (Sub = Introduced.Version.getSubminor())) {
2636 S.Diag(AL.getLoc(), diag::warn_availability_fuchsia_unavailable_minor);
2637 return;
2638 }
2639 }
2640
2641 int PriorityModifier = AL.isPragmaClangAttribute()
2642 ? Sema::AP_PragmaClangAttribute
2643 : Sema::AP_Explicit;
2644 AvailabilityAttr *NewAttr = S.mergeAvailabilityAttr(
2645 ND, AL, II, false /*Implicit*/, Introduced.Version, Deprecated.Version,
2646 Obsoleted.Version, IsUnavailable, Str, IsStrict, Replacement,
2647 Sema::AMK_None, PriorityModifier);
2648 if (NewAttr)
2649 D->addAttr(NewAttr);
2650
2651 // Transcribe "ios" to "watchos" (and add a new attribute) if the versioning
2652 // matches before the start of the watchOS platform.
2653 if (S.Context.getTargetInfo().getTriple().isWatchOS()) {
2654 IdentifierInfo *NewII = nullptr;
2655 if (II->getName() == "ios")
2656 NewII = &S.Context.Idents.get("watchos");
2657 else if (II->getName() == "ios_app_extension")
2658 NewII = &S.Context.Idents.get("watchos_app_extension");
2659
2660 if (NewII) {
2661 const auto *SDKInfo = S.getDarwinSDKInfoForAvailabilityChecking();
2662 const auto *IOSToWatchOSMapping =
2663 SDKInfo ? SDKInfo->getVersionMapping(
2664 DarwinSDKInfo::OSEnvPair::iOStoWatchOSPair())
2665 : nullptr;
2666
2667 auto adjustWatchOSVersion =
2668 [IOSToWatchOSMapping](VersionTuple Version) -> VersionTuple {
2669 if (Version.empty())
2670 return Version;
2671 auto MinimumWatchOSVersion = VersionTuple(2, 0);
2672
2673 if (IOSToWatchOSMapping) {
2674 if (auto MappedVersion = IOSToWatchOSMapping->map(
2675 Version, MinimumWatchOSVersion, None)) {
2676 return MappedVersion.value();
2677 }
2678 }
2679
2680 auto Major = Version.getMajor();
2681 auto NewMajor = Major >= 9 ? Major - 7 : 0;
2682 if (NewMajor >= 2) {
2683 if (Version.getMinor()) {
2684 if (Version.getSubminor())
2685 return VersionTuple(NewMajor, Version.getMinor().value(),
2686 Version.getSubminor().value());
2687 else
2688 return VersionTuple(NewMajor, Version.getMinor().value());
2689 }
2690 return VersionTuple(NewMajor);
2691 }
2692
2693 return MinimumWatchOSVersion;
2694 };
2695
2696 auto NewIntroduced = adjustWatchOSVersion(Introduced.Version);
2697 auto NewDeprecated = adjustWatchOSVersion(Deprecated.Version);
2698 auto NewObsoleted = adjustWatchOSVersion(Obsoleted.Version);
2699
2700 AvailabilityAttr *NewAttr = S.mergeAvailabilityAttr(
2701 ND, AL, NewII, true /*Implicit*/, NewIntroduced, NewDeprecated,
2702 NewObsoleted, IsUnavailable, Str, IsStrict, Replacement,
2703 Sema::AMK_None,
2704 PriorityModifier + Sema::AP_InferredFromOtherPlatform);
2705 if (NewAttr)
2706 D->addAttr(NewAttr);
2707 }
2708 } else if (S.Context.getTargetInfo().getTriple().isTvOS()) {
2709 // Transcribe "ios" to "tvos" (and add a new attribute) if the versioning
2710 // matches before the start of the tvOS platform.
2711 IdentifierInfo *NewII = nullptr;
2712 if (II->getName() == "ios")
2713 NewII = &S.Context.Idents.get("tvos");
2714 else if (II->getName() == "ios_app_extension")
2715 NewII = &S.Context.Idents.get("tvos_app_extension");
2716
2717 if (NewII) {
2718 const auto *SDKInfo = S.getDarwinSDKInfoForAvailabilityChecking();
2719 const auto *IOSToTvOSMapping =
2720 SDKInfo ? SDKInfo->getVersionMapping(
2721 DarwinSDKInfo::OSEnvPair::iOStoTvOSPair())
2722 : nullptr;
2723
2724 auto AdjustTvOSVersion =
2725 [IOSToTvOSMapping](VersionTuple Version) -> VersionTuple {
2726 if (Version.empty())
2727 return Version;
2728
2729 if (IOSToTvOSMapping) {
2730 if (auto MappedVersion =
2731 IOSToTvOSMapping->map(Version, VersionTuple(0, 0), None)) {
2732 return *MappedVersion;
2733 }
2734 }
2735 return Version;
2736 };
2737
2738 auto NewIntroduced = AdjustTvOSVersion(Introduced.Version);
2739 auto NewDeprecated = AdjustTvOSVersion(Deprecated.Version);
2740 auto NewObsoleted = AdjustTvOSVersion(Obsoleted.Version);
2741
2742 AvailabilityAttr *NewAttr = S.mergeAvailabilityAttr(
2743 ND, AL, NewII, true /*Implicit*/, NewIntroduced, NewDeprecated,
2744 NewObsoleted, IsUnavailable, Str, IsStrict, Replacement,
2745 Sema::AMK_None,
2746 PriorityModifier + Sema::AP_InferredFromOtherPlatform);
2747 if (NewAttr)
2748 D->addAttr(NewAttr);
2749 }
2750 } else if (S.Context.getTargetInfo().getTriple().getOS() ==
2751 llvm::Triple::IOS &&
2752 S.Context.getTargetInfo().getTriple().isMacCatalystEnvironment()) {
2753 auto GetSDKInfo = [&]() {
2754 return S.getDarwinSDKInfoForAvailabilityChecking(AL.getRange().getBegin(),
2755 "macOS");
2756 };
2757
2758 // Transcribe "ios" to "maccatalyst" (and add a new attribute).
2759 IdentifierInfo *NewII = nullptr;
2760 if (II->getName() == "ios")
2761 NewII = &S.Context.Idents.get("maccatalyst");
2762 else if (II->getName() == "ios_app_extension")
2763 NewII = &S.Context.Idents.get("maccatalyst_app_extension");
2764 if (NewII) {
2765 auto MinMacCatalystVersion = [](const VersionTuple &V) {
2766 if (V.empty())
2767 return V;
2768 if (V.getMajor() < 13 ||
2769 (V.getMajor() == 13 && V.getMinor() && *V.getMinor() < 1))
2770 return VersionTuple(13, 1); // The min Mac Catalyst version is 13.1.
2771 return V;
2772 };
2773 AvailabilityAttr *NewAttr = S.mergeAvailabilityAttr(
2774 ND, AL.getRange(), NewII, true /*Implicit*/,
2775 MinMacCatalystVersion(Introduced.Version),
2776 MinMacCatalystVersion(Deprecated.Version),
2777 MinMacCatalystVersion(Obsoleted.Version), IsUnavailable, Str,
2778 IsStrict, Replacement, Sema::AMK_None,
2779 PriorityModifier + Sema::AP_InferredFromOtherPlatform);
2780 if (NewAttr)
2781 D->addAttr(NewAttr);
2782 } else if (II->getName() == "macos" && GetSDKInfo() &&
2783 (!Introduced.Version.empty() || !Deprecated.Version.empty() ||
2784 !Obsoleted.Version.empty())) {
2785 if (const auto *MacOStoMacCatalystMapping =
2786 GetSDKInfo()->getVersionMapping(
2787 DarwinSDKInfo::OSEnvPair::macOStoMacCatalystPair())) {
2788 // Infer Mac Catalyst availability from the macOS availability attribute
2789 // if it has versioned availability. Don't infer 'unavailable'. This
2790 // inferred availability has lower priority than the other availability
2791 // attributes that are inferred from 'ios'.
2792 NewII = &S.Context.Idents.get("maccatalyst");
2793 auto RemapMacOSVersion =
2794 [&](const VersionTuple &V) -> Optional<VersionTuple> {
2795 if (V.empty())
2796 return None;
2797 // API_TO_BE_DEPRECATED is 100000.
2798 if (V.getMajor() == 100000)
2799 return VersionTuple(100000);
2800 // The minimum iosmac version is 13.1
2801 return MacOStoMacCatalystMapping->map(V, VersionTuple(13, 1), None);
2802 };
2803 Optional<VersionTuple> NewIntroduced =
2804 RemapMacOSVersion(Introduced.Version),
2805 NewDeprecated =
2806 RemapMacOSVersion(Deprecated.Version),
2807 NewObsoleted =
2808 RemapMacOSVersion(Obsoleted.Version);
2809 if (NewIntroduced || NewDeprecated || NewObsoleted) {
2810 auto VersionOrEmptyVersion =
2811 [](const Optional<VersionTuple> &V) -> VersionTuple {
2812 return V ? *V : VersionTuple();
2813 };
2814 AvailabilityAttr *NewAttr = S.mergeAvailabilityAttr(
2815 ND, AL.getRange(), NewII, true /*Implicit*/,
2816 VersionOrEmptyVersion(NewIntroduced),
2817 VersionOrEmptyVersion(NewDeprecated),
2818 VersionOrEmptyVersion(NewObsoleted), /*IsUnavailable=*/false, Str,
2819 IsStrict, Replacement, Sema::AMK_None,
2820 PriorityModifier + Sema::AP_InferredFromOtherPlatform +
2821 Sema::AP_InferredFromOtherPlatform);
2822 if (NewAttr)
2823 D->addAttr(NewAttr);
2824 }
2825 }
2826 }
2827 }
2828 }
2829
handleExternalSourceSymbolAttr(Sema & S,Decl * D,const ParsedAttr & AL)2830 static void handleExternalSourceSymbolAttr(Sema &S, Decl *D,
2831 const ParsedAttr &AL) {
2832 if (!AL.checkAtLeastNumArgs(S, 1) || !AL.checkAtMostNumArgs(S, 3))
2833 return;
2834
2835 StringRef Language;
2836 if (const auto *SE = dyn_cast_or_null<StringLiteral>(AL.getArgAsExpr(0)))
2837 Language = SE->getString();
2838 StringRef DefinedIn;
2839 if (const auto *SE = dyn_cast_or_null<StringLiteral>(AL.getArgAsExpr(1)))
2840 DefinedIn = SE->getString();
2841 bool IsGeneratedDeclaration = AL.getArgAsIdent(2) != nullptr;
2842
2843 D->addAttr(::new (S.Context) ExternalSourceSymbolAttr(
2844 S.Context, AL, Language, DefinedIn, IsGeneratedDeclaration));
2845 }
2846
2847 template <class T>
mergeVisibilityAttr(Sema & S,Decl * D,const AttributeCommonInfo & CI,typename T::VisibilityType value)2848 static T *mergeVisibilityAttr(Sema &S, Decl *D, const AttributeCommonInfo &CI,
2849 typename T::VisibilityType value) {
2850 T *existingAttr = D->getAttr<T>();
2851 if (existingAttr) {
2852 typename T::VisibilityType existingValue = existingAttr->getVisibility();
2853 if (existingValue == value)
2854 return nullptr;
2855 S.Diag(existingAttr->getLocation(), diag::err_mismatched_visibility);
2856 S.Diag(CI.getLoc(), diag::note_previous_attribute);
2857 D->dropAttr<T>();
2858 }
2859 return ::new (S.Context) T(S.Context, CI, value);
2860 }
2861
mergeVisibilityAttr(Decl * D,const AttributeCommonInfo & CI,VisibilityAttr::VisibilityType Vis)2862 VisibilityAttr *Sema::mergeVisibilityAttr(Decl *D,
2863 const AttributeCommonInfo &CI,
2864 VisibilityAttr::VisibilityType Vis) {
2865 return ::mergeVisibilityAttr<VisibilityAttr>(*this, D, CI, Vis);
2866 }
2867
2868 TypeVisibilityAttr *
mergeTypeVisibilityAttr(Decl * D,const AttributeCommonInfo & CI,TypeVisibilityAttr::VisibilityType Vis)2869 Sema::mergeTypeVisibilityAttr(Decl *D, const AttributeCommonInfo &CI,
2870 TypeVisibilityAttr::VisibilityType Vis) {
2871 return ::mergeVisibilityAttr<TypeVisibilityAttr>(*this, D, CI, Vis);
2872 }
2873
handleVisibilityAttr(Sema & S,Decl * D,const ParsedAttr & AL,bool isTypeVisibility)2874 static void handleVisibilityAttr(Sema &S, Decl *D, const ParsedAttr &AL,
2875 bool isTypeVisibility) {
2876 // Visibility attributes don't mean anything on a typedef.
2877 if (isa<TypedefNameDecl>(D)) {
2878 S.Diag(AL.getRange().getBegin(), diag::warn_attribute_ignored) << AL;
2879 return;
2880 }
2881
2882 // 'type_visibility' can only go on a type or namespace.
2883 if (isTypeVisibility &&
2884 !(isa<TagDecl>(D) ||
2885 isa<ObjCInterfaceDecl>(D) ||
2886 isa<NamespaceDecl>(D))) {
2887 S.Diag(AL.getRange().getBegin(), diag::err_attribute_wrong_decl_type)
2888 << AL << ExpectedTypeOrNamespace;
2889 return;
2890 }
2891
2892 // Check that the argument is a string literal.
2893 StringRef TypeStr;
2894 SourceLocation LiteralLoc;
2895 if (!S.checkStringLiteralArgumentAttr(AL, 0, TypeStr, &LiteralLoc))
2896 return;
2897
2898 VisibilityAttr::VisibilityType type;
2899 if (!VisibilityAttr::ConvertStrToVisibilityType(TypeStr, type)) {
2900 S.Diag(LiteralLoc, diag::warn_attribute_type_not_supported) << AL
2901 << TypeStr;
2902 return;
2903 }
2904
2905 // Complain about attempts to use protected visibility on targets
2906 // (like Darwin) that don't support it.
2907 if (type == VisibilityAttr::Protected &&
2908 !S.Context.getTargetInfo().hasProtectedVisibility()) {
2909 S.Diag(AL.getLoc(), diag::warn_attribute_protected_visibility);
2910 type = VisibilityAttr::Default;
2911 }
2912
2913 Attr *newAttr;
2914 if (isTypeVisibility) {
2915 newAttr = S.mergeTypeVisibilityAttr(
2916 D, AL, (TypeVisibilityAttr::VisibilityType)type);
2917 } else {
2918 newAttr = S.mergeVisibilityAttr(D, AL, type);
2919 }
2920 if (newAttr)
2921 D->addAttr(newAttr);
2922 }
2923
handleObjCDirectAttr(Sema & S,Decl * D,const ParsedAttr & AL)2924 static void handleObjCDirectAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2925 // objc_direct cannot be set on methods declared in the context of a protocol
2926 if (isa<ObjCProtocolDecl>(D->getDeclContext())) {
2927 S.Diag(AL.getLoc(), diag::err_objc_direct_on_protocol) << false;
2928 return;
2929 }
2930
2931 if (S.getLangOpts().ObjCRuntime.allowsDirectDispatch()) {
2932 handleSimpleAttribute<ObjCDirectAttr>(S, D, AL);
2933 } else {
2934 S.Diag(AL.getLoc(), diag::warn_objc_direct_ignored) << AL;
2935 }
2936 }
2937
handleObjCDirectMembersAttr(Sema & S,Decl * D,const ParsedAttr & AL)2938 static void handleObjCDirectMembersAttr(Sema &S, Decl *D,
2939 const ParsedAttr &AL) {
2940 if (S.getLangOpts().ObjCRuntime.allowsDirectDispatch()) {
2941 handleSimpleAttribute<ObjCDirectMembersAttr>(S, D, AL);
2942 } else {
2943 S.Diag(AL.getLoc(), diag::warn_objc_direct_ignored) << AL;
2944 }
2945 }
2946
handleObjCMethodFamilyAttr(Sema & S,Decl * D,const ParsedAttr & AL)2947 static void handleObjCMethodFamilyAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
2948 const auto *M = cast<ObjCMethodDecl>(D);
2949 if (!AL.isArgIdent(0)) {
2950 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
2951 << AL << 1 << AANT_ArgumentIdentifier;
2952 return;
2953 }
2954
2955 IdentifierLoc *IL = AL.getArgAsIdent(0);
2956 ObjCMethodFamilyAttr::FamilyKind F;
2957 if (!ObjCMethodFamilyAttr::ConvertStrToFamilyKind(IL->Ident->getName(), F)) {
2958 S.Diag(IL->Loc, diag::warn_attribute_type_not_supported) << AL << IL->Ident;
2959 return;
2960 }
2961
2962 if (F == ObjCMethodFamilyAttr::OMF_init &&
2963 !M->getReturnType()->isObjCObjectPointerType()) {
2964 S.Diag(M->getLocation(), diag::err_init_method_bad_return_type)
2965 << M->getReturnType();
2966 // Ignore the attribute.
2967 return;
2968 }
2969
2970 D->addAttr(new (S.Context) ObjCMethodFamilyAttr(S.Context, AL, F));
2971 }
2972
handleObjCNSObject(Sema & S,Decl * D,const ParsedAttr & AL)2973 static void handleObjCNSObject(Sema &S, Decl *D, const ParsedAttr &AL) {
2974 if (const auto *TD = dyn_cast<TypedefNameDecl>(D)) {
2975 QualType T = TD->getUnderlyingType();
2976 if (!T->isCARCBridgableType()) {
2977 S.Diag(TD->getLocation(), diag::err_nsobject_attribute);
2978 return;
2979 }
2980 }
2981 else if (const auto *PD = dyn_cast<ObjCPropertyDecl>(D)) {
2982 QualType T = PD->getType();
2983 if (!T->isCARCBridgableType()) {
2984 S.Diag(PD->getLocation(), diag::err_nsobject_attribute);
2985 return;
2986 }
2987 }
2988 else {
2989 // It is okay to include this attribute on properties, e.g.:
2990 //
2991 // @property (retain, nonatomic) struct Bork *Q __attribute__((NSObject));
2992 //
2993 // In this case it follows tradition and suppresses an error in the above
2994 // case.
2995 S.Diag(D->getLocation(), diag::warn_nsobject_attribute);
2996 }
2997 D->addAttr(::new (S.Context) ObjCNSObjectAttr(S.Context, AL));
2998 }
2999
handleObjCIndependentClass(Sema & S,Decl * D,const ParsedAttr & AL)3000 static void handleObjCIndependentClass(Sema &S, Decl *D, const ParsedAttr &AL) {
3001 if (const auto *TD = dyn_cast<TypedefNameDecl>(D)) {
3002 QualType T = TD->getUnderlyingType();
3003 if (!T->isObjCObjectPointerType()) {
3004 S.Diag(TD->getLocation(), diag::warn_ptr_independentclass_attribute);
3005 return;
3006 }
3007 } else {
3008 S.Diag(D->getLocation(), diag::warn_independentclass_attribute);
3009 return;
3010 }
3011 D->addAttr(::new (S.Context) ObjCIndependentClassAttr(S.Context, AL));
3012 }
3013
handleBlocksAttr(Sema & S,Decl * D,const ParsedAttr & AL)3014 static void handleBlocksAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3015 if (!AL.isArgIdent(0)) {
3016 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
3017 << AL << 1 << AANT_ArgumentIdentifier;
3018 return;
3019 }
3020
3021 IdentifierInfo *II = AL.getArgAsIdent(0)->Ident;
3022 BlocksAttr::BlockType type;
3023 if (!BlocksAttr::ConvertStrToBlockType(II->getName(), type)) {
3024 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported) << AL << II;
3025 return;
3026 }
3027
3028 D->addAttr(::new (S.Context) BlocksAttr(S.Context, AL, type));
3029 }
3030
handleSentinelAttr(Sema & S,Decl * D,const ParsedAttr & AL)3031 static void handleSentinelAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3032 unsigned sentinel = (unsigned)SentinelAttr::DefaultSentinel;
3033 if (AL.getNumArgs() > 0) {
3034 Expr *E = AL.getArgAsExpr(0);
3035 Optional<llvm::APSInt> Idx = llvm::APSInt(32);
3036 if (E->isTypeDependent() || !(Idx = E->getIntegerConstantExpr(S.Context))) {
3037 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
3038 << AL << 1 << AANT_ArgumentIntegerConstant << E->getSourceRange();
3039 return;
3040 }
3041
3042 if (Idx->isSigned() && Idx->isNegative()) {
3043 S.Diag(AL.getLoc(), diag::err_attribute_sentinel_less_than_zero)
3044 << E->getSourceRange();
3045 return;
3046 }
3047
3048 sentinel = Idx->getZExtValue();
3049 }
3050
3051 unsigned nullPos = (unsigned)SentinelAttr::DefaultNullPos;
3052 if (AL.getNumArgs() > 1) {
3053 Expr *E = AL.getArgAsExpr(1);
3054 Optional<llvm::APSInt> Idx = llvm::APSInt(32);
3055 if (E->isTypeDependent() || !(Idx = E->getIntegerConstantExpr(S.Context))) {
3056 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
3057 << AL << 2 << AANT_ArgumentIntegerConstant << E->getSourceRange();
3058 return;
3059 }
3060 nullPos = Idx->getZExtValue();
3061
3062 if ((Idx->isSigned() && Idx->isNegative()) || nullPos > 1) {
3063 // FIXME: This error message could be improved, it would be nice
3064 // to say what the bounds actually are.
3065 S.Diag(AL.getLoc(), diag::err_attribute_sentinel_not_zero_or_one)
3066 << E->getSourceRange();
3067 return;
3068 }
3069 }
3070
3071 if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
3072 const FunctionType *FT = FD->getType()->castAs<FunctionType>();
3073 if (isa<FunctionNoProtoType>(FT)) {
3074 S.Diag(AL.getLoc(), diag::warn_attribute_sentinel_named_arguments);
3075 return;
3076 }
3077
3078 if (!cast<FunctionProtoType>(FT)->isVariadic()) {
3079 S.Diag(AL.getLoc(), diag::warn_attribute_sentinel_not_variadic) << 0;
3080 return;
3081 }
3082 } else if (const auto *MD = dyn_cast<ObjCMethodDecl>(D)) {
3083 if (!MD->isVariadic()) {
3084 S.Diag(AL.getLoc(), diag::warn_attribute_sentinel_not_variadic) << 0;
3085 return;
3086 }
3087 } else if (const auto *BD = dyn_cast<BlockDecl>(D)) {
3088 if (!BD->isVariadic()) {
3089 S.Diag(AL.getLoc(), diag::warn_attribute_sentinel_not_variadic) << 1;
3090 return;
3091 }
3092 } else if (const auto *V = dyn_cast<VarDecl>(D)) {
3093 QualType Ty = V->getType();
3094 if (Ty->isBlockPointerType() || Ty->isFunctionPointerType()) {
3095 const FunctionType *FT = Ty->isFunctionPointerType()
3096 ? D->getFunctionType()
3097 : Ty->castAs<BlockPointerType>()
3098 ->getPointeeType()
3099 ->castAs<FunctionType>();
3100 if (!cast<FunctionProtoType>(FT)->isVariadic()) {
3101 int m = Ty->isFunctionPointerType() ? 0 : 1;
3102 S.Diag(AL.getLoc(), diag::warn_attribute_sentinel_not_variadic) << m;
3103 return;
3104 }
3105 } else {
3106 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
3107 << AL << ExpectedFunctionMethodOrBlock;
3108 return;
3109 }
3110 } else {
3111 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
3112 << AL << ExpectedFunctionMethodOrBlock;
3113 return;
3114 }
3115 D->addAttr(::new (S.Context) SentinelAttr(S.Context, AL, sentinel, nullPos));
3116 }
3117
handleWarnUnusedResult(Sema & S,Decl * D,const ParsedAttr & AL)3118 static void handleWarnUnusedResult(Sema &S, Decl *D, const ParsedAttr &AL) {
3119 if (D->getFunctionType() &&
3120 D->getFunctionType()->getReturnType()->isVoidType() &&
3121 !isa<CXXConstructorDecl>(D)) {
3122 S.Diag(AL.getLoc(), diag::warn_attribute_void_function_method) << AL << 0;
3123 return;
3124 }
3125 if (const auto *MD = dyn_cast<ObjCMethodDecl>(D))
3126 if (MD->getReturnType()->isVoidType()) {
3127 S.Diag(AL.getLoc(), diag::warn_attribute_void_function_method) << AL << 1;
3128 return;
3129 }
3130
3131 StringRef Str;
3132 if (AL.isStandardAttributeSyntax() && !AL.getScopeName()) {
3133 // The standard attribute cannot be applied to variable declarations such
3134 // as a function pointer.
3135 if (isa<VarDecl>(D))
3136 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type_str)
3137 << AL << "functions, classes, or enumerations";
3138
3139 // If this is spelled as the standard C++17 attribute, but not in C++17,
3140 // warn about using it as an extension. If there are attribute arguments,
3141 // then claim it's a C++2a extension instead.
3142 // FIXME: If WG14 does not seem likely to adopt the same feature, add an
3143 // extension warning for C2x mode.
3144 const LangOptions &LO = S.getLangOpts();
3145 if (AL.getNumArgs() == 1) {
3146 if (LO.CPlusPlus && !LO.CPlusPlus20)
3147 S.Diag(AL.getLoc(), diag::ext_cxx20_attr) << AL;
3148
3149 // Since this this is spelled [[nodiscard]], get the optional string
3150 // literal. If in C++ mode, but not in C++2a mode, diagnose as an
3151 // extension.
3152 // FIXME: C2x should support this feature as well, even as an extension.
3153 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, nullptr))
3154 return;
3155 } else if (LO.CPlusPlus && !LO.CPlusPlus17)
3156 S.Diag(AL.getLoc(), diag::ext_cxx17_attr) << AL;
3157 }
3158
3159 if ((!AL.isGNUAttribute() &&
3160 !(AL.isStandardAttributeSyntax() && AL.isClangScope())) &&
3161 isa<TypedefNameDecl>(D)) {
3162 S.Diag(AL.getLoc(), diag::warn_unused_result_typedef_unsupported_spelling)
3163 << AL.isGNUScope();
3164 return;
3165 }
3166
3167 D->addAttr(::new (S.Context) WarnUnusedResultAttr(S.Context, AL, Str));
3168 }
3169
handleWeakImportAttr(Sema & S,Decl * D,const ParsedAttr & AL)3170 static void handleWeakImportAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3171 // weak_import only applies to variable & function declarations.
3172 bool isDef = false;
3173 if (!D->canBeWeakImported(isDef)) {
3174 if (isDef)
3175 S.Diag(AL.getLoc(), diag::warn_attribute_invalid_on_definition)
3176 << "weak_import";
3177 else if (isa<ObjCPropertyDecl>(D) || isa<ObjCMethodDecl>(D) ||
3178 (S.Context.getTargetInfo().getTriple().isOSDarwin() &&
3179 (isa<ObjCInterfaceDecl>(D) || isa<EnumDecl>(D)))) {
3180 // Nothing to warn about here.
3181 } else
3182 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
3183 << AL << ExpectedVariableOrFunction;
3184
3185 return;
3186 }
3187
3188 D->addAttr(::new (S.Context) WeakImportAttr(S.Context, AL));
3189 }
3190
3191 // Handles reqd_work_group_size and work_group_size_hint.
3192 template <typename WorkGroupAttr>
handleWorkGroupSize(Sema & S,Decl * D,const ParsedAttr & AL)3193 static void handleWorkGroupSize(Sema &S, Decl *D, const ParsedAttr &AL) {
3194 uint32_t WGSize[3];
3195 for (unsigned i = 0; i < 3; ++i) {
3196 const Expr *E = AL.getArgAsExpr(i);
3197 if (!checkUInt32Argument(S, AL, E, WGSize[i], i,
3198 /*StrictlyUnsigned=*/true))
3199 return;
3200 if (WGSize[i] == 0) {
3201 S.Diag(AL.getLoc(), diag::err_attribute_argument_is_zero)
3202 << AL << E->getSourceRange();
3203 return;
3204 }
3205 }
3206
3207 WorkGroupAttr *Existing = D->getAttr<WorkGroupAttr>();
3208 if (Existing && !(Existing->getXDim() == WGSize[0] &&
3209 Existing->getYDim() == WGSize[1] &&
3210 Existing->getZDim() == WGSize[2]))
3211 S.Diag(AL.getLoc(), diag::warn_duplicate_attribute) << AL;
3212
3213 D->addAttr(::new (S.Context)
3214 WorkGroupAttr(S.Context, AL, WGSize[0], WGSize[1], WGSize[2]));
3215 }
3216
3217 // Handles intel_reqd_sub_group_size.
handleSubGroupSize(Sema & S,Decl * D,const ParsedAttr & AL)3218 static void handleSubGroupSize(Sema &S, Decl *D, const ParsedAttr &AL) {
3219 uint32_t SGSize;
3220 const Expr *E = AL.getArgAsExpr(0);
3221 if (!checkUInt32Argument(S, AL, E, SGSize))
3222 return;
3223 if (SGSize == 0) {
3224 S.Diag(AL.getLoc(), diag::err_attribute_argument_is_zero)
3225 << AL << E->getSourceRange();
3226 return;
3227 }
3228
3229 OpenCLIntelReqdSubGroupSizeAttr *Existing =
3230 D->getAttr<OpenCLIntelReqdSubGroupSizeAttr>();
3231 if (Existing && Existing->getSubGroupSize() != SGSize)
3232 S.Diag(AL.getLoc(), diag::warn_duplicate_attribute) << AL;
3233
3234 D->addAttr(::new (S.Context)
3235 OpenCLIntelReqdSubGroupSizeAttr(S.Context, AL, SGSize));
3236 }
3237
handleVecTypeHint(Sema & S,Decl * D,const ParsedAttr & AL)3238 static void handleVecTypeHint(Sema &S, Decl *D, const ParsedAttr &AL) {
3239 if (!AL.hasParsedType()) {
3240 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments) << AL << 1;
3241 return;
3242 }
3243
3244 TypeSourceInfo *ParmTSI = nullptr;
3245 QualType ParmType = S.GetTypeFromParser(AL.getTypeArg(), &ParmTSI);
3246 assert(ParmTSI && "no type source info for attribute argument");
3247
3248 if (!ParmType->isExtVectorType() && !ParmType->isFloatingType() &&
3249 (ParmType->isBooleanType() ||
3250 !ParmType->isIntegralType(S.getASTContext()))) {
3251 S.Diag(AL.getLoc(), diag::err_attribute_invalid_argument) << 2 << AL;
3252 return;
3253 }
3254
3255 if (VecTypeHintAttr *A = D->getAttr<VecTypeHintAttr>()) {
3256 if (!S.Context.hasSameType(A->getTypeHint(), ParmType)) {
3257 S.Diag(AL.getLoc(), diag::warn_duplicate_attribute) << AL;
3258 return;
3259 }
3260 }
3261
3262 D->addAttr(::new (S.Context) VecTypeHintAttr(S.Context, AL, ParmTSI));
3263 }
3264
mergeSectionAttr(Decl * D,const AttributeCommonInfo & CI,StringRef Name)3265 SectionAttr *Sema::mergeSectionAttr(Decl *D, const AttributeCommonInfo &CI,
3266 StringRef Name) {
3267 // Explicit or partial specializations do not inherit
3268 // the section attribute from the primary template.
3269 if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
3270 if (CI.getAttributeSpellingListIndex() == SectionAttr::Declspec_allocate &&
3271 FD->isFunctionTemplateSpecialization())
3272 return nullptr;
3273 }
3274 if (SectionAttr *ExistingAttr = D->getAttr<SectionAttr>()) {
3275 if (ExistingAttr->getName() == Name)
3276 return nullptr;
3277 Diag(ExistingAttr->getLocation(), diag::warn_mismatched_section)
3278 << 1 /*section*/;
3279 Diag(CI.getLoc(), diag::note_previous_attribute);
3280 return nullptr;
3281 }
3282 return ::new (Context) SectionAttr(Context, CI, Name);
3283 }
3284
3285 /// Used to implement to perform semantic checking on
3286 /// attribute((section("foo"))) specifiers.
3287 ///
3288 /// In this case, "foo" is passed in to be checked. If the section
3289 /// specifier is invalid, return an Error that indicates the problem.
3290 ///
3291 /// This is a simple quality of implementation feature to catch errors
3292 /// and give good diagnostics in cases when the assembler or code generator
3293 /// would otherwise reject the section specifier.
isValidSectionSpecifier(StringRef SecName)3294 llvm::Error Sema::isValidSectionSpecifier(StringRef SecName) {
3295 if (!Context.getTargetInfo().getTriple().isOSDarwin())
3296 return llvm::Error::success();
3297
3298 // Let MCSectionMachO validate this.
3299 StringRef Segment, Section;
3300 unsigned TAA, StubSize;
3301 bool HasTAA;
3302 return llvm::MCSectionMachO::ParseSectionSpecifier(SecName, Segment, Section,
3303 TAA, HasTAA, StubSize);
3304 }
3305
checkSectionName(SourceLocation LiteralLoc,StringRef SecName)3306 bool Sema::checkSectionName(SourceLocation LiteralLoc, StringRef SecName) {
3307 if (llvm::Error E = isValidSectionSpecifier(SecName)) {
3308 Diag(LiteralLoc, diag::err_attribute_section_invalid_for_target)
3309 << toString(std::move(E)) << 1 /*'section'*/;
3310 return false;
3311 }
3312 return true;
3313 }
3314
handleSectionAttr(Sema & S,Decl * D,const ParsedAttr & AL)3315 static void handleSectionAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3316 // Make sure that there is a string literal as the sections's single
3317 // argument.
3318 StringRef Str;
3319 SourceLocation LiteralLoc;
3320 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &LiteralLoc))
3321 return;
3322
3323 if (!S.checkSectionName(LiteralLoc, Str))
3324 return;
3325
3326 SectionAttr *NewAttr = S.mergeSectionAttr(D, AL, Str);
3327 if (NewAttr) {
3328 D->addAttr(NewAttr);
3329 if (isa<FunctionDecl, FunctionTemplateDecl, ObjCMethodDecl,
3330 ObjCPropertyDecl>(D))
3331 S.UnifySection(NewAttr->getName(),
3332 ASTContext::PSF_Execute | ASTContext::PSF_Read,
3333 cast<NamedDecl>(D));
3334 }
3335 }
3336
3337 // This is used for `__declspec(code_seg("segname"))` on a decl.
3338 // `#pragma code_seg("segname")` uses checkSectionName() instead.
checkCodeSegName(Sema & S,SourceLocation LiteralLoc,StringRef CodeSegName)3339 static bool checkCodeSegName(Sema &S, SourceLocation LiteralLoc,
3340 StringRef CodeSegName) {
3341 if (llvm::Error E = S.isValidSectionSpecifier(CodeSegName)) {
3342 S.Diag(LiteralLoc, diag::err_attribute_section_invalid_for_target)
3343 << toString(std::move(E)) << 0 /*'code-seg'*/;
3344 return false;
3345 }
3346
3347 return true;
3348 }
3349
mergeCodeSegAttr(Decl * D,const AttributeCommonInfo & CI,StringRef Name)3350 CodeSegAttr *Sema::mergeCodeSegAttr(Decl *D, const AttributeCommonInfo &CI,
3351 StringRef Name) {
3352 // Explicit or partial specializations do not inherit
3353 // the code_seg attribute from the primary template.
3354 if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
3355 if (FD->isFunctionTemplateSpecialization())
3356 return nullptr;
3357 }
3358 if (const auto *ExistingAttr = D->getAttr<CodeSegAttr>()) {
3359 if (ExistingAttr->getName() == Name)
3360 return nullptr;
3361 Diag(ExistingAttr->getLocation(), diag::warn_mismatched_section)
3362 << 0 /*codeseg*/;
3363 Diag(CI.getLoc(), diag::note_previous_attribute);
3364 return nullptr;
3365 }
3366 return ::new (Context) CodeSegAttr(Context, CI, Name);
3367 }
3368
handleCodeSegAttr(Sema & S,Decl * D,const ParsedAttr & AL)3369 static void handleCodeSegAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3370 StringRef Str;
3371 SourceLocation LiteralLoc;
3372 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &LiteralLoc))
3373 return;
3374 if (!checkCodeSegName(S, LiteralLoc, Str))
3375 return;
3376 if (const auto *ExistingAttr = D->getAttr<CodeSegAttr>()) {
3377 if (!ExistingAttr->isImplicit()) {
3378 S.Diag(AL.getLoc(),
3379 ExistingAttr->getName() == Str
3380 ? diag::warn_duplicate_codeseg_attribute
3381 : diag::err_conflicting_codeseg_attribute);
3382 return;
3383 }
3384 D->dropAttr<CodeSegAttr>();
3385 }
3386 if (CodeSegAttr *CSA = S.mergeCodeSegAttr(D, AL, Str))
3387 D->addAttr(CSA);
3388 }
3389
3390 // Check for things we'd like to warn about. Multiversioning issues are
3391 // handled later in the process, once we know how many exist.
checkTargetAttr(SourceLocation LiteralLoc,StringRef AttrStr)3392 bool Sema::checkTargetAttr(SourceLocation LiteralLoc, StringRef AttrStr) {
3393 enum FirstParam { Unsupported, Duplicate, Unknown };
3394 enum SecondParam { None, Architecture, Tune };
3395 enum ThirdParam { Target, TargetClones };
3396 if (AttrStr.contains("fpmath="))
3397 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3398 << Unsupported << None << "fpmath=" << Target;
3399
3400 // Diagnose use of tune if target doesn't support it.
3401 if (!Context.getTargetInfo().supportsTargetAttributeTune() &&
3402 AttrStr.contains("tune="))
3403 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3404 << Unsupported << None << "tune=" << Target;
3405
3406 ParsedTargetAttr ParsedAttrs = TargetAttr::parse(AttrStr);
3407
3408 if (!ParsedAttrs.Architecture.empty() &&
3409 !Context.getTargetInfo().isValidCPUName(ParsedAttrs.Architecture))
3410 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3411 << Unknown << Architecture << ParsedAttrs.Architecture << Target;
3412
3413 if (!ParsedAttrs.Tune.empty() &&
3414 !Context.getTargetInfo().isValidCPUName(ParsedAttrs.Tune))
3415 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3416 << Unknown << Tune << ParsedAttrs.Tune << Target;
3417
3418 if (ParsedAttrs.DuplicateArchitecture)
3419 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3420 << Duplicate << None << "arch=" << Target;
3421 if (ParsedAttrs.DuplicateTune)
3422 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3423 << Duplicate << None << "tune=" << Target;
3424
3425 for (const auto &Feature : ParsedAttrs.Features) {
3426 auto CurFeature = StringRef(Feature).drop_front(); // remove + or -.
3427 if (!Context.getTargetInfo().isValidFeatureName(CurFeature))
3428 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3429 << Unsupported << None << CurFeature << Target;
3430 }
3431
3432 TargetInfo::BranchProtectionInfo BPI;
3433 StringRef DiagMsg;
3434 if (ParsedAttrs.BranchProtection.empty())
3435 return false;
3436 if (!Context.getTargetInfo().validateBranchProtection(
3437 ParsedAttrs.BranchProtection, ParsedAttrs.Architecture, BPI,
3438 DiagMsg)) {
3439 if (DiagMsg.empty())
3440 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3441 << Unsupported << None << "branch-protection" << Target;
3442 return Diag(LiteralLoc, diag::err_invalid_branch_protection_spec)
3443 << DiagMsg;
3444 }
3445 if (!DiagMsg.empty())
3446 Diag(LiteralLoc, diag::warn_unsupported_branch_protection_spec) << DiagMsg;
3447
3448 return false;
3449 }
3450
handleTargetAttr(Sema & S,Decl * D,const ParsedAttr & AL)3451 static void handleTargetAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3452 StringRef Str;
3453 SourceLocation LiteralLoc;
3454 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &LiteralLoc) ||
3455 S.checkTargetAttr(LiteralLoc, Str))
3456 return;
3457
3458 TargetAttr *NewAttr = ::new (S.Context) TargetAttr(S.Context, AL, Str);
3459 D->addAttr(NewAttr);
3460 }
3461
checkTargetClonesAttrString(SourceLocation LiteralLoc,StringRef Str,const StringLiteral * Literal,bool & HasDefault,bool & HasCommas,SmallVectorImpl<StringRef> & Strings)3462 bool Sema::checkTargetClonesAttrString(SourceLocation LiteralLoc, StringRef Str,
3463 const StringLiteral *Literal,
3464 bool &HasDefault, bool &HasCommas,
3465 SmallVectorImpl<StringRef> &Strings) {
3466 enum FirstParam { Unsupported, Duplicate, Unknown };
3467 enum SecondParam { None, Architecture, Tune };
3468 enum ThirdParam { Target, TargetClones };
3469 HasCommas = HasCommas || Str.contains(',');
3470 // Warn on empty at the beginning of a string.
3471 if (Str.size() == 0)
3472 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3473 << Unsupported << None << "" << TargetClones;
3474
3475 std::pair<StringRef, StringRef> Parts = {{}, Str};
3476 while (!Parts.second.empty()) {
3477 Parts = Parts.second.split(',');
3478 StringRef Cur = Parts.first.trim();
3479 SourceLocation CurLoc = Literal->getLocationOfByte(
3480 Cur.data() - Literal->getString().data(), getSourceManager(),
3481 getLangOpts(), Context.getTargetInfo());
3482
3483 bool DefaultIsDupe = false;
3484 if (Cur.empty())
3485 return Diag(CurLoc, diag::warn_unsupported_target_attribute)
3486 << Unsupported << None << "" << TargetClones;
3487
3488 if (Cur.startswith("arch=")) {
3489 if (!Context.getTargetInfo().isValidCPUName(
3490 Cur.drop_front(sizeof("arch=") - 1)))
3491 return Diag(CurLoc, diag::warn_unsupported_target_attribute)
3492 << Unsupported << Architecture
3493 << Cur.drop_front(sizeof("arch=") - 1) << TargetClones;
3494 } else if (Cur == "default") {
3495 DefaultIsDupe = HasDefault;
3496 HasDefault = true;
3497 } else if (!Context.getTargetInfo().isValidFeatureName(Cur))
3498 return Diag(CurLoc, diag::warn_unsupported_target_attribute)
3499 << Unsupported << None << Cur << TargetClones;
3500
3501 if (llvm::is_contained(Strings, Cur) || DefaultIsDupe)
3502 Diag(CurLoc, diag::warn_target_clone_duplicate_options);
3503 // Note: Add even if there are duplicates, since it changes name mangling.
3504 Strings.push_back(Cur);
3505 }
3506
3507 if (Str.rtrim().endswith(","))
3508 return Diag(LiteralLoc, diag::warn_unsupported_target_attribute)
3509 << Unsupported << None << "" << TargetClones;
3510 return false;
3511 }
3512
handleTargetClonesAttr(Sema & S,Decl * D,const ParsedAttr & AL)3513 static void handleTargetClonesAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3514 // Ensure we don't combine these with themselves, since that causes some
3515 // confusing behavior.
3516 if (const auto *Other = D->getAttr<TargetClonesAttr>()) {
3517 S.Diag(AL.getLoc(), diag::err_disallowed_duplicate_attribute) << AL;
3518 S.Diag(Other->getLocation(), diag::note_conflicting_attribute);
3519 return;
3520 }
3521 if (checkAttrMutualExclusion<TargetClonesAttr>(S, D, AL))
3522 return;
3523
3524 SmallVector<StringRef, 2> Strings;
3525 bool HasCommas = false, HasDefault = false;
3526
3527 for (unsigned I = 0, E = AL.getNumArgs(); I != E; ++I) {
3528 StringRef CurStr;
3529 SourceLocation LiteralLoc;
3530 if (!S.checkStringLiteralArgumentAttr(AL, I, CurStr, &LiteralLoc) ||
3531 S.checkTargetClonesAttrString(
3532 LiteralLoc, CurStr,
3533 cast<StringLiteral>(AL.getArgAsExpr(I)->IgnoreParenCasts()),
3534 HasDefault, HasCommas, Strings))
3535 return;
3536 }
3537
3538 if (HasCommas && AL.getNumArgs() > 1)
3539 S.Diag(AL.getLoc(), diag::warn_target_clone_mixed_values);
3540
3541 if (!HasDefault) {
3542 S.Diag(AL.getLoc(), diag::err_target_clone_must_have_default);
3543 return;
3544 }
3545
3546 // FIXME: We could probably figure out how to get this to work for lambdas
3547 // someday.
3548 if (const auto *MD = dyn_cast<CXXMethodDecl>(D)) {
3549 if (MD->getParent()->isLambda()) {
3550 S.Diag(D->getLocation(), diag::err_multiversion_doesnt_support)
3551 << static_cast<unsigned>(MultiVersionKind::TargetClones)
3552 << /*Lambda*/ 9;
3553 return;
3554 }
3555 }
3556
3557 cast<FunctionDecl>(D)->setIsMultiVersion();
3558 TargetClonesAttr *NewAttr = ::new (S.Context)
3559 TargetClonesAttr(S.Context, AL, Strings.data(), Strings.size());
3560 D->addAttr(NewAttr);
3561 }
3562
handleMinVectorWidthAttr(Sema & S,Decl * D,const ParsedAttr & AL)3563 static void handleMinVectorWidthAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3564 Expr *E = AL.getArgAsExpr(0);
3565 uint32_t VecWidth;
3566 if (!checkUInt32Argument(S, AL, E, VecWidth)) {
3567 AL.setInvalid();
3568 return;
3569 }
3570
3571 MinVectorWidthAttr *Existing = D->getAttr<MinVectorWidthAttr>();
3572 if (Existing && Existing->getVectorWidth() != VecWidth) {
3573 S.Diag(AL.getLoc(), diag::warn_duplicate_attribute) << AL;
3574 return;
3575 }
3576
3577 D->addAttr(::new (S.Context) MinVectorWidthAttr(S.Context, AL, VecWidth));
3578 }
3579
handleCleanupAttr(Sema & S,Decl * D,const ParsedAttr & AL)3580 static void handleCleanupAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3581 Expr *E = AL.getArgAsExpr(0);
3582 SourceLocation Loc = E->getExprLoc();
3583 FunctionDecl *FD = nullptr;
3584 DeclarationNameInfo NI;
3585
3586 // gcc only allows for simple identifiers. Since we support more than gcc, we
3587 // will warn the user.
3588 if (auto *DRE = dyn_cast<DeclRefExpr>(E)) {
3589 if (DRE->hasQualifier())
3590 S.Diag(Loc, diag::warn_cleanup_ext);
3591 FD = dyn_cast<FunctionDecl>(DRE->getDecl());
3592 NI = DRE->getNameInfo();
3593 if (!FD) {
3594 S.Diag(Loc, diag::err_attribute_cleanup_arg_not_function) << 1
3595 << NI.getName();
3596 return;
3597 }
3598 } else if (auto *ULE = dyn_cast<UnresolvedLookupExpr>(E)) {
3599 if (ULE->hasExplicitTemplateArgs())
3600 S.Diag(Loc, diag::warn_cleanup_ext);
3601 FD = S.ResolveSingleFunctionTemplateSpecialization(ULE, true);
3602 NI = ULE->getNameInfo();
3603 if (!FD) {
3604 S.Diag(Loc, diag::err_attribute_cleanup_arg_not_function) << 2
3605 << NI.getName();
3606 if (ULE->getType() == S.Context.OverloadTy)
3607 S.NoteAllOverloadCandidates(ULE);
3608 return;
3609 }
3610 } else {
3611 S.Diag(Loc, diag::err_attribute_cleanup_arg_not_function) << 0;
3612 return;
3613 }
3614
3615 if (FD->getNumParams() != 1) {
3616 S.Diag(Loc, diag::err_attribute_cleanup_func_must_take_one_arg)
3617 << NI.getName();
3618 return;
3619 }
3620
3621 // We're currently more strict than GCC about what function types we accept.
3622 // If this ever proves to be a problem it should be easy to fix.
3623 QualType Ty = S.Context.getPointerType(cast<VarDecl>(D)->getType());
3624 QualType ParamTy = FD->getParamDecl(0)->getType();
3625 if (S.CheckAssignmentConstraints(FD->getParamDecl(0)->getLocation(),
3626 ParamTy, Ty) != Sema::Compatible) {
3627 S.Diag(Loc, diag::err_attribute_cleanup_func_arg_incompatible_type)
3628 << NI.getName() << ParamTy << Ty;
3629 return;
3630 }
3631
3632 D->addAttr(::new (S.Context) CleanupAttr(S.Context, AL, FD));
3633 }
3634
handleEnumExtensibilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)3635 static void handleEnumExtensibilityAttr(Sema &S, Decl *D,
3636 const ParsedAttr &AL) {
3637 if (!AL.isArgIdent(0)) {
3638 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
3639 << AL << 0 << AANT_ArgumentIdentifier;
3640 return;
3641 }
3642
3643 EnumExtensibilityAttr::Kind ExtensibilityKind;
3644 IdentifierInfo *II = AL.getArgAsIdent(0)->Ident;
3645 if (!EnumExtensibilityAttr::ConvertStrToKind(II->getName(),
3646 ExtensibilityKind)) {
3647 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported) << AL << II;
3648 return;
3649 }
3650
3651 D->addAttr(::new (S.Context)
3652 EnumExtensibilityAttr(S.Context, AL, ExtensibilityKind));
3653 }
3654
3655 /// Handle __attribute__((format_arg((idx)))) attribute based on
3656 /// http://gcc.gnu.org/onlinedocs/gcc/Function-Attributes.html
handleFormatArgAttr(Sema & S,Decl * D,const ParsedAttr & AL)3657 static void handleFormatArgAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3658 Expr *IdxExpr = AL.getArgAsExpr(0);
3659 ParamIdx Idx;
3660 if (!checkFunctionOrMethodParameterIndex(S, D, AL, 1, IdxExpr, Idx))
3661 return;
3662
3663 // Make sure the format string is really a string.
3664 QualType Ty = getFunctionOrMethodParamType(D, Idx.getASTIndex());
3665
3666 bool NotNSStringTy = !isNSStringType(Ty, S.Context);
3667 if (NotNSStringTy &&
3668 !isCFStringType(Ty, S.Context) &&
3669 (!Ty->isPointerType() ||
3670 !Ty->castAs<PointerType>()->getPointeeType()->isCharType())) {
3671 S.Diag(AL.getLoc(), diag::err_format_attribute_not)
3672 << IdxExpr->getSourceRange() << getFunctionOrMethodParamRange(D, 0);
3673 return;
3674 }
3675 Ty = getFunctionOrMethodResultType(D);
3676 // replace instancetype with the class type
3677 auto Instancetype = S.Context.getObjCInstanceTypeDecl()->getTypeForDecl();
3678 if (Ty->getAs<TypedefType>() == Instancetype)
3679 if (auto *OMD = dyn_cast<ObjCMethodDecl>(D))
3680 if (auto *Interface = OMD->getClassInterface())
3681 Ty = S.Context.getObjCObjectPointerType(
3682 QualType(Interface->getTypeForDecl(), 0));
3683 if (!isNSStringType(Ty, S.Context, /*AllowNSAttributedString=*/true) &&
3684 !isCFStringType(Ty, S.Context) &&
3685 (!Ty->isPointerType() ||
3686 !Ty->castAs<PointerType>()->getPointeeType()->isCharType())) {
3687 S.Diag(AL.getLoc(), diag::err_format_attribute_result_not)
3688 << (NotNSStringTy ? "string type" : "NSString")
3689 << IdxExpr->getSourceRange() << getFunctionOrMethodParamRange(D, 0);
3690 return;
3691 }
3692
3693 D->addAttr(::new (S.Context) FormatArgAttr(S.Context, AL, Idx));
3694 }
3695
3696 enum FormatAttrKind {
3697 CFStringFormat,
3698 NSStringFormat,
3699 StrftimeFormat,
3700 SupportedFormat,
3701 IgnoredFormat,
3702 InvalidFormat
3703 };
3704
3705 /// getFormatAttrKind - Map from format attribute names to supported format
3706 /// types.
getFormatAttrKind(StringRef Format)3707 static FormatAttrKind getFormatAttrKind(StringRef Format) {
3708 return llvm::StringSwitch<FormatAttrKind>(Format)
3709 // Check for formats that get handled specially.
3710 .Case("NSString", NSStringFormat)
3711 .Case("CFString", CFStringFormat)
3712 .Case("strftime", StrftimeFormat)
3713
3714 // Otherwise, check for supported formats.
3715 .Cases("scanf", "printf", "printf0", "strfmon", SupportedFormat)
3716 .Cases("cmn_err", "vcmn_err", "zcmn_err", SupportedFormat)
3717 .Case("kprintf", SupportedFormat) // OpenBSD.
3718 .Case("freebsd_kprintf", SupportedFormat) // FreeBSD.
3719 .Case("os_trace", SupportedFormat)
3720 .Case("os_log", SupportedFormat)
3721
3722 .Cases("gcc_diag", "gcc_cdiag", "gcc_cxxdiag", "gcc_tdiag", IgnoredFormat)
3723 .Default(InvalidFormat);
3724 }
3725
3726 /// Handle __attribute__((init_priority(priority))) attributes based on
3727 /// http://gcc.gnu.org/onlinedocs/gcc/C_002b_002b-Attributes.html
handleInitPriorityAttr(Sema & S,Decl * D,const ParsedAttr & AL)3728 static void handleInitPriorityAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3729 if (!S.getLangOpts().CPlusPlus) {
3730 S.Diag(AL.getLoc(), diag::warn_attribute_ignored) << AL;
3731 return;
3732 }
3733
3734 if (S.getCurFunctionOrMethodDecl()) {
3735 S.Diag(AL.getLoc(), diag::err_init_priority_object_attr);
3736 AL.setInvalid();
3737 return;
3738 }
3739 QualType T = cast<VarDecl>(D)->getType();
3740 if (S.Context.getAsArrayType(T))
3741 T = S.Context.getBaseElementType(T);
3742 if (!T->getAs<RecordType>()) {
3743 S.Diag(AL.getLoc(), diag::err_init_priority_object_attr);
3744 AL.setInvalid();
3745 return;
3746 }
3747
3748 Expr *E = AL.getArgAsExpr(0);
3749 uint32_t prioritynum;
3750 if (!checkUInt32Argument(S, AL, E, prioritynum)) {
3751 AL.setInvalid();
3752 return;
3753 }
3754
3755 // Only perform the priority check if the attribute is outside of a system
3756 // header. Values <= 100 are reserved for the implementation, and libc++
3757 // benefits from being able to specify values in that range.
3758 if ((prioritynum < 101 || prioritynum > 65535) &&
3759 !S.getSourceManager().isInSystemHeader(AL.getLoc())) {
3760 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_range)
3761 << E->getSourceRange() << AL << 101 << 65535;
3762 AL.setInvalid();
3763 return;
3764 }
3765 D->addAttr(::new (S.Context) InitPriorityAttr(S.Context, AL, prioritynum));
3766 }
3767
mergeErrorAttr(Decl * D,const AttributeCommonInfo & CI,StringRef NewUserDiagnostic)3768 ErrorAttr *Sema::mergeErrorAttr(Decl *D, const AttributeCommonInfo &CI,
3769 StringRef NewUserDiagnostic) {
3770 if (const auto *EA = D->getAttr<ErrorAttr>()) {
3771 std::string NewAttr = CI.getNormalizedFullName();
3772 assert((NewAttr == "error" || NewAttr == "warning") &&
3773 "unexpected normalized full name");
3774 bool Match = (EA->isError() && NewAttr == "error") ||
3775 (EA->isWarning() && NewAttr == "warning");
3776 if (!Match) {
3777 Diag(EA->getLocation(), diag::err_attributes_are_not_compatible)
3778 << CI << EA;
3779 Diag(CI.getLoc(), diag::note_conflicting_attribute);
3780 return nullptr;
3781 }
3782 if (EA->getUserDiagnostic() != NewUserDiagnostic) {
3783 Diag(CI.getLoc(), diag::warn_duplicate_attribute) << EA;
3784 Diag(EA->getLoc(), diag::note_previous_attribute);
3785 }
3786 D->dropAttr<ErrorAttr>();
3787 }
3788 return ::new (Context) ErrorAttr(Context, CI, NewUserDiagnostic);
3789 }
3790
mergeFormatAttr(Decl * D,const AttributeCommonInfo & CI,IdentifierInfo * Format,int FormatIdx,int FirstArg)3791 FormatAttr *Sema::mergeFormatAttr(Decl *D, const AttributeCommonInfo &CI,
3792 IdentifierInfo *Format, int FormatIdx,
3793 int FirstArg) {
3794 // Check whether we already have an equivalent format attribute.
3795 for (auto *F : D->specific_attrs<FormatAttr>()) {
3796 if (F->getType() == Format &&
3797 F->getFormatIdx() == FormatIdx &&
3798 F->getFirstArg() == FirstArg) {
3799 // If we don't have a valid location for this attribute, adopt the
3800 // location.
3801 if (F->getLocation().isInvalid())
3802 F->setRange(CI.getRange());
3803 return nullptr;
3804 }
3805 }
3806
3807 return ::new (Context) FormatAttr(Context, CI, Format, FormatIdx, FirstArg);
3808 }
3809
3810 /// Handle __attribute__((format(type,idx,firstarg))) attributes based on
3811 /// http://gcc.gnu.org/onlinedocs/gcc/Function-Attributes.html
handleFormatAttr(Sema & S,Decl * D,const ParsedAttr & AL)3812 static void handleFormatAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3813 if (!AL.isArgIdent(0)) {
3814 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
3815 << AL << 1 << AANT_ArgumentIdentifier;
3816 return;
3817 }
3818
3819 // In C++ the implicit 'this' function parameter also counts, and they are
3820 // counted from one.
3821 bool HasImplicitThisParam = isInstanceMethod(D);
3822 unsigned NumArgs = getFunctionOrMethodNumParams(D) + HasImplicitThisParam;
3823
3824 IdentifierInfo *II = AL.getArgAsIdent(0)->Ident;
3825 StringRef Format = II->getName();
3826
3827 if (normalizeName(Format)) {
3828 // If we've modified the string name, we need a new identifier for it.
3829 II = &S.Context.Idents.get(Format);
3830 }
3831
3832 // Check for supported formats.
3833 FormatAttrKind Kind = getFormatAttrKind(Format);
3834
3835 if (Kind == IgnoredFormat)
3836 return;
3837
3838 if (Kind == InvalidFormat) {
3839 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported)
3840 << AL << II->getName();
3841 return;
3842 }
3843
3844 // checks for the 2nd argument
3845 Expr *IdxExpr = AL.getArgAsExpr(1);
3846 uint32_t Idx;
3847 if (!checkUInt32Argument(S, AL, IdxExpr, Idx, 2))
3848 return;
3849
3850 if (Idx < 1 || Idx > NumArgs) {
3851 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
3852 << AL << 2 << IdxExpr->getSourceRange();
3853 return;
3854 }
3855
3856 // FIXME: Do we need to bounds check?
3857 unsigned ArgIdx = Idx - 1;
3858
3859 if (HasImplicitThisParam) {
3860 if (ArgIdx == 0) {
3861 S.Diag(AL.getLoc(),
3862 diag::err_format_attribute_implicit_this_format_string)
3863 << IdxExpr->getSourceRange();
3864 return;
3865 }
3866 ArgIdx--;
3867 }
3868
3869 // make sure the format string is really a string
3870 QualType Ty = getFunctionOrMethodParamType(D, ArgIdx);
3871
3872 if (!isNSStringType(Ty, S.Context, true) &&
3873 !isCFStringType(Ty, S.Context) &&
3874 (!Ty->isPointerType() ||
3875 !Ty->castAs<PointerType>()->getPointeeType()->isCharType())) {
3876 S.Diag(AL.getLoc(), diag::err_format_attribute_not)
3877 << IdxExpr->getSourceRange() << getFunctionOrMethodParamRange(D, ArgIdx);
3878 return;
3879 }
3880
3881 // check the 3rd argument
3882 Expr *FirstArgExpr = AL.getArgAsExpr(2);
3883 uint32_t FirstArg;
3884 if (!checkUInt32Argument(S, AL, FirstArgExpr, FirstArg, 3))
3885 return;
3886
3887 // check if the function is variadic if the 3rd argument non-zero
3888 if (FirstArg != 0) {
3889 if (isFunctionOrMethodVariadic(D))
3890 ++NumArgs; // +1 for ...
3891 else
3892 S.Diag(D->getLocation(), diag::warn_gcc_requires_variadic_function) << AL;
3893 }
3894
3895 // strftime requires FirstArg to be 0 because it doesn't read from any
3896 // variable the input is just the current time + the format string.
3897 if (Kind == StrftimeFormat) {
3898 if (FirstArg != 0) {
3899 S.Diag(AL.getLoc(), diag::err_format_strftime_third_parameter)
3900 << FirstArgExpr->getSourceRange();
3901 return;
3902 }
3903 // if 0 it disables parameter checking (to use with e.g. va_list)
3904 } else if (FirstArg != 0 && FirstArg != NumArgs) {
3905 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
3906 << AL << 3 << FirstArgExpr->getSourceRange();
3907 return;
3908 }
3909
3910 FormatAttr *NewAttr = S.mergeFormatAttr(D, AL, II, Idx, FirstArg);
3911 if (NewAttr)
3912 D->addAttr(NewAttr);
3913 }
3914
3915 /// Handle __attribute__((callback(CalleeIdx, PayloadIdx0, ...))) attributes.
handleCallbackAttr(Sema & S,Decl * D,const ParsedAttr & AL)3916 static void handleCallbackAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
3917 // The index that identifies the callback callee is mandatory.
3918 if (AL.getNumArgs() == 0) {
3919 S.Diag(AL.getLoc(), diag::err_callback_attribute_no_callee)
3920 << AL.getRange();
3921 return;
3922 }
3923
3924 bool HasImplicitThisParam = isInstanceMethod(D);
3925 int32_t NumArgs = getFunctionOrMethodNumParams(D);
3926
3927 FunctionDecl *FD = D->getAsFunction();
3928 assert(FD && "Expected a function declaration!");
3929
3930 llvm::StringMap<int> NameIdxMapping;
3931 NameIdxMapping["__"] = -1;
3932
3933 NameIdxMapping["this"] = 0;
3934
3935 int Idx = 1;
3936 for (const ParmVarDecl *PVD : FD->parameters())
3937 NameIdxMapping[PVD->getName()] = Idx++;
3938
3939 auto UnknownName = NameIdxMapping.end();
3940
3941 SmallVector<int, 8> EncodingIndices;
3942 for (unsigned I = 0, E = AL.getNumArgs(); I < E; ++I) {
3943 SourceRange SR;
3944 int32_t ArgIdx;
3945
3946 if (AL.isArgIdent(I)) {
3947 IdentifierLoc *IdLoc = AL.getArgAsIdent(I);
3948 auto It = NameIdxMapping.find(IdLoc->Ident->getName());
3949 if (It == UnknownName) {
3950 S.Diag(AL.getLoc(), diag::err_callback_attribute_argument_unknown)
3951 << IdLoc->Ident << IdLoc->Loc;
3952 return;
3953 }
3954
3955 SR = SourceRange(IdLoc->Loc);
3956 ArgIdx = It->second;
3957 } else if (AL.isArgExpr(I)) {
3958 Expr *IdxExpr = AL.getArgAsExpr(I);
3959
3960 // If the expression is not parseable as an int32_t we have a problem.
3961 if (!checkUInt32Argument(S, AL, IdxExpr, (uint32_t &)ArgIdx, I + 1,
3962 false)) {
3963 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
3964 << AL << (I + 1) << IdxExpr->getSourceRange();
3965 return;
3966 }
3967
3968 // Check oob, excluding the special values, 0 and -1.
3969 if (ArgIdx < -1 || ArgIdx > NumArgs) {
3970 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
3971 << AL << (I + 1) << IdxExpr->getSourceRange();
3972 return;
3973 }
3974
3975 SR = IdxExpr->getSourceRange();
3976 } else {
3977 llvm_unreachable("Unexpected ParsedAttr argument type!");
3978 }
3979
3980 if (ArgIdx == 0 && !HasImplicitThisParam) {
3981 S.Diag(AL.getLoc(), diag::err_callback_implicit_this_not_available)
3982 << (I + 1) << SR;
3983 return;
3984 }
3985
3986 // Adjust for the case we do not have an implicit "this" parameter. In this
3987 // case we decrease all positive values by 1 to get LLVM argument indices.
3988 if (!HasImplicitThisParam && ArgIdx > 0)
3989 ArgIdx -= 1;
3990
3991 EncodingIndices.push_back(ArgIdx);
3992 }
3993
3994 int CalleeIdx = EncodingIndices.front();
3995 // Check if the callee index is proper, thus not "this" and not "unknown".
3996 // This means the "CalleeIdx" has to be non-negative if "HasImplicitThisParam"
3997 // is false and positive if "HasImplicitThisParam" is true.
3998 if (CalleeIdx < (int)HasImplicitThisParam) {
3999 S.Diag(AL.getLoc(), diag::err_callback_attribute_invalid_callee)
4000 << AL.getRange();
4001 return;
4002 }
4003
4004 // Get the callee type, note the index adjustment as the AST doesn't contain
4005 // the this type (which the callee cannot reference anyway!).
4006 const Type *CalleeType =
4007 getFunctionOrMethodParamType(D, CalleeIdx - HasImplicitThisParam)
4008 .getTypePtr();
4009 if (!CalleeType || !CalleeType->isFunctionPointerType()) {
4010 S.Diag(AL.getLoc(), diag::err_callback_callee_no_function_type)
4011 << AL.getRange();
4012 return;
4013 }
4014
4015 const Type *CalleeFnType =
4016 CalleeType->getPointeeType()->getUnqualifiedDesugaredType();
4017
4018 // TODO: Check the type of the callee arguments.
4019
4020 const auto *CalleeFnProtoType = dyn_cast<FunctionProtoType>(CalleeFnType);
4021 if (!CalleeFnProtoType) {
4022 S.Diag(AL.getLoc(), diag::err_callback_callee_no_function_type)
4023 << AL.getRange();
4024 return;
4025 }
4026
4027 if (CalleeFnProtoType->getNumParams() > EncodingIndices.size() - 1) {
4028 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments)
4029 << AL << (unsigned)(EncodingIndices.size() - 1);
4030 return;
4031 }
4032
4033 if (CalleeFnProtoType->getNumParams() < EncodingIndices.size() - 1) {
4034 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments)
4035 << AL << (unsigned)(EncodingIndices.size() - 1);
4036 return;
4037 }
4038
4039 if (CalleeFnProtoType->isVariadic()) {
4040 S.Diag(AL.getLoc(), diag::err_callback_callee_is_variadic) << AL.getRange();
4041 return;
4042 }
4043
4044 // Do not allow multiple callback attributes.
4045 if (D->hasAttr<CallbackAttr>()) {
4046 S.Diag(AL.getLoc(), diag::err_callback_attribute_multiple) << AL.getRange();
4047 return;
4048 }
4049
4050 D->addAttr(::new (S.Context) CallbackAttr(
4051 S.Context, AL, EncodingIndices.data(), EncodingIndices.size()));
4052 }
4053
isFunctionLike(const Type & T)4054 static bool isFunctionLike(const Type &T) {
4055 // Check for explicit function types.
4056 // 'called_once' is only supported in Objective-C and it has
4057 // function pointers and block pointers.
4058 return T.isFunctionPointerType() || T.isBlockPointerType();
4059 }
4060
4061 /// Handle 'called_once' attribute.
handleCalledOnceAttr(Sema & S,Decl * D,const ParsedAttr & AL)4062 static void handleCalledOnceAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4063 // 'called_once' only applies to parameters representing functions.
4064 QualType T = cast<ParmVarDecl>(D)->getType();
4065
4066 if (!isFunctionLike(*T)) {
4067 S.Diag(AL.getLoc(), diag::err_called_once_attribute_wrong_type);
4068 return;
4069 }
4070
4071 D->addAttr(::new (S.Context) CalledOnceAttr(S.Context, AL));
4072 }
4073
handleTransparentUnionAttr(Sema & S,Decl * D,const ParsedAttr & AL)4074 static void handleTransparentUnionAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4075 // Try to find the underlying union declaration.
4076 RecordDecl *RD = nullptr;
4077 const auto *TD = dyn_cast<TypedefNameDecl>(D);
4078 if (TD && TD->getUnderlyingType()->isUnionType())
4079 RD = TD->getUnderlyingType()->getAsUnionType()->getDecl();
4080 else
4081 RD = dyn_cast<RecordDecl>(D);
4082
4083 if (!RD || !RD->isUnion()) {
4084 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type) << AL
4085 << ExpectedUnion;
4086 return;
4087 }
4088
4089 if (!RD->isCompleteDefinition()) {
4090 if (!RD->isBeingDefined())
4091 S.Diag(AL.getLoc(),
4092 diag::warn_transparent_union_attribute_not_definition);
4093 return;
4094 }
4095
4096 RecordDecl::field_iterator Field = RD->field_begin(),
4097 FieldEnd = RD->field_end();
4098 if (Field == FieldEnd) {
4099 S.Diag(AL.getLoc(), diag::warn_transparent_union_attribute_zero_fields);
4100 return;
4101 }
4102
4103 FieldDecl *FirstField = *Field;
4104 QualType FirstType = FirstField->getType();
4105 if (FirstType->hasFloatingRepresentation() || FirstType->isVectorType()) {
4106 S.Diag(FirstField->getLocation(),
4107 diag::warn_transparent_union_attribute_floating)
4108 << FirstType->isVectorType() << FirstType;
4109 return;
4110 }
4111
4112 if (FirstType->isIncompleteType())
4113 return;
4114 uint64_t FirstSize = S.Context.getTypeSize(FirstType);
4115 uint64_t FirstAlign = S.Context.getTypeAlign(FirstType);
4116 for (; Field != FieldEnd; ++Field) {
4117 QualType FieldType = Field->getType();
4118 if (FieldType->isIncompleteType())
4119 return;
4120 // FIXME: this isn't fully correct; we also need to test whether the
4121 // members of the union would all have the same calling convention as the
4122 // first member of the union. Checking just the size and alignment isn't
4123 // sufficient (consider structs passed on the stack instead of in registers
4124 // as an example).
4125 if (S.Context.getTypeSize(FieldType) != FirstSize ||
4126 S.Context.getTypeAlign(FieldType) > FirstAlign) {
4127 // Warn if we drop the attribute.
4128 bool isSize = S.Context.getTypeSize(FieldType) != FirstSize;
4129 unsigned FieldBits = isSize ? S.Context.getTypeSize(FieldType)
4130 : S.Context.getTypeAlign(FieldType);
4131 S.Diag(Field->getLocation(),
4132 diag::warn_transparent_union_attribute_field_size_align)
4133 << isSize << *Field << FieldBits;
4134 unsigned FirstBits = isSize ? FirstSize : FirstAlign;
4135 S.Diag(FirstField->getLocation(),
4136 diag::note_transparent_union_first_field_size_align)
4137 << isSize << FirstBits;
4138 return;
4139 }
4140 }
4141
4142 RD->addAttr(::new (S.Context) TransparentUnionAttr(S.Context, AL));
4143 }
4144
AddAnnotationAttr(Decl * D,const AttributeCommonInfo & CI,StringRef Str,MutableArrayRef<Expr * > Args)4145 void Sema::AddAnnotationAttr(Decl *D, const AttributeCommonInfo &CI,
4146 StringRef Str, MutableArrayRef<Expr *> Args) {
4147 auto *Attr = AnnotateAttr::Create(Context, Str, Args.data(), Args.size(), CI);
4148 if (ConstantFoldAttrArgs(
4149 CI, MutableArrayRef<Expr *>(Attr->args_begin(), Attr->args_end()))) {
4150 D->addAttr(Attr);
4151 }
4152 }
4153
handleAnnotateAttr(Sema & S,Decl * D,const ParsedAttr & AL)4154 static void handleAnnotateAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4155 // Make sure that there is a string literal as the annotation's first
4156 // argument.
4157 StringRef Str;
4158 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str))
4159 return;
4160
4161 llvm::SmallVector<Expr *, 4> Args;
4162 Args.reserve(AL.getNumArgs() - 1);
4163 for (unsigned Idx = 1; Idx < AL.getNumArgs(); Idx++) {
4164 assert(!AL.isArgIdent(Idx));
4165 Args.push_back(AL.getArgAsExpr(Idx));
4166 }
4167
4168 S.AddAnnotationAttr(D, AL, Str, Args);
4169 }
4170
handleAlignValueAttr(Sema & S,Decl * D,const ParsedAttr & AL)4171 static void handleAlignValueAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4172 S.AddAlignValueAttr(D, AL, AL.getArgAsExpr(0));
4173 }
4174
AddAlignValueAttr(Decl * D,const AttributeCommonInfo & CI,Expr * E)4175 void Sema::AddAlignValueAttr(Decl *D, const AttributeCommonInfo &CI, Expr *E) {
4176 AlignValueAttr TmpAttr(Context, CI, E);
4177 SourceLocation AttrLoc = CI.getLoc();
4178
4179 QualType T;
4180 if (const auto *TD = dyn_cast<TypedefNameDecl>(D))
4181 T = TD->getUnderlyingType();
4182 else if (const auto *VD = dyn_cast<ValueDecl>(D))
4183 T = VD->getType();
4184 else
4185 llvm_unreachable("Unknown decl type for align_value");
4186
4187 if (!T->isDependentType() && !T->isAnyPointerType() &&
4188 !T->isReferenceType() && !T->isMemberPointerType()) {
4189 Diag(AttrLoc, diag::warn_attribute_pointer_or_reference_only)
4190 << &TmpAttr << T << D->getSourceRange();
4191 return;
4192 }
4193
4194 if (!E->isValueDependent()) {
4195 llvm::APSInt Alignment;
4196 ExprResult ICE = VerifyIntegerConstantExpression(
4197 E, &Alignment, diag::err_align_value_attribute_argument_not_int);
4198 if (ICE.isInvalid())
4199 return;
4200
4201 if (!Alignment.isPowerOf2()) {
4202 Diag(AttrLoc, diag::err_alignment_not_power_of_two)
4203 << E->getSourceRange();
4204 return;
4205 }
4206
4207 D->addAttr(::new (Context) AlignValueAttr(Context, CI, ICE.get()));
4208 return;
4209 }
4210
4211 // Save dependent expressions in the AST to be instantiated.
4212 D->addAttr(::new (Context) AlignValueAttr(Context, CI, E));
4213 }
4214
handleAlignedAttr(Sema & S,Decl * D,const ParsedAttr & AL)4215 static void handleAlignedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4216 // check the attribute arguments.
4217 if (AL.getNumArgs() > 1) {
4218 S.Diag(AL.getLoc(), diag::err_attribute_wrong_number_arguments) << AL << 1;
4219 return;
4220 }
4221
4222 if (AL.getNumArgs() == 0) {
4223 D->addAttr(::new (S.Context) AlignedAttr(S.Context, AL, true, nullptr));
4224 return;
4225 }
4226
4227 Expr *E = AL.getArgAsExpr(0);
4228 if (AL.isPackExpansion() && !E->containsUnexpandedParameterPack()) {
4229 S.Diag(AL.getEllipsisLoc(),
4230 diag::err_pack_expansion_without_parameter_packs);
4231 return;
4232 }
4233
4234 if (!AL.isPackExpansion() && S.DiagnoseUnexpandedParameterPack(E))
4235 return;
4236
4237 S.AddAlignedAttr(D, AL, E, AL.isPackExpansion());
4238 }
4239
AddAlignedAttr(Decl * D,const AttributeCommonInfo & CI,Expr * E,bool IsPackExpansion)4240 void Sema::AddAlignedAttr(Decl *D, const AttributeCommonInfo &CI, Expr *E,
4241 bool IsPackExpansion) {
4242 AlignedAttr TmpAttr(Context, CI, true, E);
4243 SourceLocation AttrLoc = CI.getLoc();
4244
4245 // C++11 alignas(...) and C11 _Alignas(...) have additional requirements.
4246 if (TmpAttr.isAlignas()) {
4247 // C++11 [dcl.align]p1:
4248 // An alignment-specifier may be applied to a variable or to a class
4249 // data member, but it shall not be applied to a bit-field, a function
4250 // parameter, the formal parameter of a catch clause, or a variable
4251 // declared with the register storage class specifier. An
4252 // alignment-specifier may also be applied to the declaration of a class
4253 // or enumeration type.
4254 // CWG 2354:
4255 // CWG agreed to remove permission for alignas to be applied to
4256 // enumerations.
4257 // C11 6.7.5/2:
4258 // An alignment attribute shall not be specified in a declaration of
4259 // a typedef, or a bit-field, or a function, or a parameter, or an
4260 // object declared with the register storage-class specifier.
4261 int DiagKind = -1;
4262 if (isa<ParmVarDecl>(D)) {
4263 DiagKind = 0;
4264 } else if (const auto *VD = dyn_cast<VarDecl>(D)) {
4265 if (VD->getStorageClass() == SC_Register)
4266 DiagKind = 1;
4267 if (VD->isExceptionVariable())
4268 DiagKind = 2;
4269 } else if (const auto *FD = dyn_cast<FieldDecl>(D)) {
4270 if (FD->isBitField())
4271 DiagKind = 3;
4272 } else if (const auto *ED = dyn_cast<EnumDecl>(D)) {
4273 if (ED->getLangOpts().CPlusPlus)
4274 DiagKind = 4;
4275 } else if (!isa<TagDecl>(D)) {
4276 Diag(AttrLoc, diag::err_attribute_wrong_decl_type) << &TmpAttr
4277 << (TmpAttr.isC11() ? ExpectedVariableOrField
4278 : ExpectedVariableFieldOrTag);
4279 return;
4280 }
4281 if (DiagKind != -1) {
4282 Diag(AttrLoc, diag::err_alignas_attribute_wrong_decl_type)
4283 << &TmpAttr << DiagKind;
4284 return;
4285 }
4286 }
4287
4288 if (E->isValueDependent()) {
4289 // We can't support a dependent alignment on a non-dependent type,
4290 // because we have no way to model that a type is "alignment-dependent"
4291 // but not dependent in any other way.
4292 if (const auto *TND = dyn_cast<TypedefNameDecl>(D)) {
4293 if (!TND->getUnderlyingType()->isDependentType()) {
4294 Diag(AttrLoc, diag::err_alignment_dependent_typedef_name)
4295 << E->getSourceRange();
4296 return;
4297 }
4298 }
4299
4300 // Save dependent expressions in the AST to be instantiated.
4301 AlignedAttr *AA = ::new (Context) AlignedAttr(Context, CI, true, E);
4302 AA->setPackExpansion(IsPackExpansion);
4303 D->addAttr(AA);
4304 return;
4305 }
4306
4307 // FIXME: Cache the number on the AL object?
4308 llvm::APSInt Alignment;
4309 ExprResult ICE = VerifyIntegerConstantExpression(
4310 E, &Alignment, diag::err_aligned_attribute_argument_not_int);
4311 if (ICE.isInvalid())
4312 return;
4313
4314 uint64_t AlignVal = Alignment.getZExtValue();
4315 // C++11 [dcl.align]p2:
4316 // -- if the constant expression evaluates to zero, the alignment
4317 // specifier shall have no effect
4318 // C11 6.7.5p6:
4319 // An alignment specification of zero has no effect.
4320 if (!(TmpAttr.isAlignas() && !Alignment)) {
4321 if (!llvm::isPowerOf2_64(AlignVal)) {
4322 Diag(AttrLoc, diag::err_alignment_not_power_of_two)
4323 << E->getSourceRange();
4324 return;
4325 }
4326 }
4327
4328 uint64_t MaximumAlignment = Sema::MaximumAlignment;
4329 if (Context.getTargetInfo().getTriple().isOSBinFormatCOFF())
4330 MaximumAlignment = std::min(MaximumAlignment, uint64_t(8192));
4331 if (AlignVal > MaximumAlignment) {
4332 Diag(AttrLoc, diag::err_attribute_aligned_too_great)
4333 << MaximumAlignment << E->getSourceRange();
4334 return;
4335 }
4336
4337 const auto *VD = dyn_cast<VarDecl>(D);
4338 if (VD && Context.getTargetInfo().isTLSSupported()) {
4339 unsigned MaxTLSAlign =
4340 Context.toCharUnitsFromBits(Context.getTargetInfo().getMaxTLSAlign())
4341 .getQuantity();
4342 if (MaxTLSAlign && AlignVal > MaxTLSAlign &&
4343 VD->getTLSKind() != VarDecl::TLS_None) {
4344 Diag(VD->getLocation(), diag::err_tls_var_aligned_over_maximum)
4345 << (unsigned)AlignVal << VD << MaxTLSAlign;
4346 return;
4347 }
4348 }
4349
4350 // On AIX, an aligned attribute can not decrease the alignment when applied
4351 // to a variable declaration with vector type.
4352 if (VD && Context.getTargetInfo().getTriple().isOSAIX()) {
4353 const Type *Ty = VD->getType().getTypePtr();
4354 if (Ty->isVectorType() && AlignVal < 16) {
4355 Diag(VD->getLocation(), diag::warn_aligned_attr_underaligned)
4356 << VD->getType() << 16;
4357 return;
4358 }
4359 }
4360
4361 AlignedAttr *AA = ::new (Context) AlignedAttr(Context, CI, true, ICE.get());
4362 AA->setPackExpansion(IsPackExpansion);
4363 D->addAttr(AA);
4364 }
4365
AddAlignedAttr(Decl * D,const AttributeCommonInfo & CI,TypeSourceInfo * TS,bool IsPackExpansion)4366 void Sema::AddAlignedAttr(Decl *D, const AttributeCommonInfo &CI,
4367 TypeSourceInfo *TS, bool IsPackExpansion) {
4368 // FIXME: Cache the number on the AL object if non-dependent?
4369 // FIXME: Perform checking of type validity
4370 AlignedAttr *AA = ::new (Context) AlignedAttr(Context, CI, false, TS);
4371 AA->setPackExpansion(IsPackExpansion);
4372 D->addAttr(AA);
4373 }
4374
CheckAlignasUnderalignment(Decl * D)4375 void Sema::CheckAlignasUnderalignment(Decl *D) {
4376 assert(D->hasAttrs() && "no attributes on decl");
4377
4378 QualType UnderlyingTy, DiagTy;
4379 if (const auto *VD = dyn_cast<ValueDecl>(D)) {
4380 UnderlyingTy = DiagTy = VD->getType();
4381 } else {
4382 UnderlyingTy = DiagTy = Context.getTagDeclType(cast<TagDecl>(D));
4383 if (const auto *ED = dyn_cast<EnumDecl>(D))
4384 UnderlyingTy = ED->getIntegerType();
4385 }
4386 if (DiagTy->isDependentType() || DiagTy->isIncompleteType())
4387 return;
4388
4389 // C++11 [dcl.align]p5, C11 6.7.5/4:
4390 // The combined effect of all alignment attributes in a declaration shall
4391 // not specify an alignment that is less strict than the alignment that
4392 // would otherwise be required for the entity being declared.
4393 AlignedAttr *AlignasAttr = nullptr;
4394 AlignedAttr *LastAlignedAttr = nullptr;
4395 unsigned Align = 0;
4396 for (auto *I : D->specific_attrs<AlignedAttr>()) {
4397 if (I->isAlignmentDependent())
4398 return;
4399 if (I->isAlignas())
4400 AlignasAttr = I;
4401 Align = std::max(Align, I->getAlignment(Context));
4402 LastAlignedAttr = I;
4403 }
4404
4405 if (Align && DiagTy->isSizelessType()) {
4406 Diag(LastAlignedAttr->getLocation(), diag::err_attribute_sizeless_type)
4407 << LastAlignedAttr << DiagTy;
4408 } else if (AlignasAttr && Align) {
4409 CharUnits RequestedAlign = Context.toCharUnitsFromBits(Align);
4410 CharUnits NaturalAlign = Context.getTypeAlignInChars(UnderlyingTy);
4411 if (NaturalAlign > RequestedAlign)
4412 Diag(AlignasAttr->getLocation(), diag::err_alignas_underaligned)
4413 << DiagTy << (unsigned)NaturalAlign.getQuantity();
4414 }
4415 }
4416
checkMSInheritanceAttrOnDefinition(CXXRecordDecl * RD,SourceRange Range,bool BestCase,MSInheritanceModel ExplicitModel)4417 bool Sema::checkMSInheritanceAttrOnDefinition(
4418 CXXRecordDecl *RD, SourceRange Range, bool BestCase,
4419 MSInheritanceModel ExplicitModel) {
4420 assert(RD->hasDefinition() && "RD has no definition!");
4421
4422 // We may not have seen base specifiers or any virtual methods yet. We will
4423 // have to wait until the record is defined to catch any mismatches.
4424 if (!RD->getDefinition()->isCompleteDefinition())
4425 return false;
4426
4427 // The unspecified model never matches what a definition could need.
4428 if (ExplicitModel == MSInheritanceModel::Unspecified)
4429 return false;
4430
4431 if (BestCase) {
4432 if (RD->calculateInheritanceModel() == ExplicitModel)
4433 return false;
4434 } else {
4435 if (RD->calculateInheritanceModel() <= ExplicitModel)
4436 return false;
4437 }
4438
4439 Diag(Range.getBegin(), diag::err_mismatched_ms_inheritance)
4440 << 0 /*definition*/;
4441 Diag(RD->getDefinition()->getLocation(), diag::note_defined_here) << RD;
4442 return true;
4443 }
4444
4445 /// parseModeAttrArg - Parses attribute mode string and returns parsed type
4446 /// attribute.
parseModeAttrArg(Sema & S,StringRef Str,unsigned & DestWidth,bool & IntegerMode,bool & ComplexMode,FloatModeKind & ExplicitType)4447 static void parseModeAttrArg(Sema &S, StringRef Str, unsigned &DestWidth,
4448 bool &IntegerMode, bool &ComplexMode,
4449 FloatModeKind &ExplicitType) {
4450 IntegerMode = true;
4451 ComplexMode = false;
4452 ExplicitType = FloatModeKind::NoFloat;
4453 switch (Str.size()) {
4454 case 2:
4455 switch (Str[0]) {
4456 case 'Q':
4457 DestWidth = 8;
4458 break;
4459 case 'H':
4460 DestWidth = 16;
4461 break;
4462 case 'S':
4463 DestWidth = 32;
4464 break;
4465 case 'D':
4466 DestWidth = 64;
4467 break;
4468 case 'X':
4469 DestWidth = 96;
4470 break;
4471 case 'K': // KFmode - IEEE quad precision (__float128)
4472 ExplicitType = FloatModeKind::Float128;
4473 DestWidth = Str[1] == 'I' ? 0 : 128;
4474 break;
4475 case 'T':
4476 ExplicitType = FloatModeKind::LongDouble;
4477 DestWidth = 128;
4478 break;
4479 case 'I':
4480 ExplicitType = FloatModeKind::Ibm128;
4481 DestWidth = Str[1] == 'I' ? 0 : 128;
4482 break;
4483 }
4484 if (Str[1] == 'F') {
4485 IntegerMode = false;
4486 } else if (Str[1] == 'C') {
4487 IntegerMode = false;
4488 ComplexMode = true;
4489 } else if (Str[1] != 'I') {
4490 DestWidth = 0;
4491 }
4492 break;
4493 case 4:
4494 // FIXME: glibc uses 'word' to define register_t; this is narrower than a
4495 // pointer on PIC16 and other embedded platforms.
4496 if (Str == "word")
4497 DestWidth = S.Context.getTargetInfo().getRegisterWidth();
4498 else if (Str == "byte")
4499 DestWidth = S.Context.getTargetInfo().getCharWidth();
4500 break;
4501 case 7:
4502 if (Str == "pointer")
4503 DestWidth = S.Context.getTargetInfo().getPointerWidth(0);
4504 break;
4505 case 11:
4506 if (Str == "unwind_word")
4507 DestWidth = S.Context.getTargetInfo().getUnwindWordWidth();
4508 break;
4509 }
4510 }
4511
4512 /// handleModeAttr - This attribute modifies the width of a decl with primitive
4513 /// type.
4514 ///
4515 /// Despite what would be logical, the mode attribute is a decl attribute, not a
4516 /// type attribute: 'int ** __attribute((mode(HI))) *G;' tries to make 'G' be
4517 /// HImode, not an intermediate pointer.
handleModeAttr(Sema & S,Decl * D,const ParsedAttr & AL)4518 static void handleModeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4519 // This attribute isn't documented, but glibc uses it. It changes
4520 // the width of an int or unsigned int to the specified size.
4521 if (!AL.isArgIdent(0)) {
4522 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
4523 << AL << AANT_ArgumentIdentifier;
4524 return;
4525 }
4526
4527 IdentifierInfo *Name = AL.getArgAsIdent(0)->Ident;
4528
4529 S.AddModeAttr(D, AL, Name);
4530 }
4531
AddModeAttr(Decl * D,const AttributeCommonInfo & CI,IdentifierInfo * Name,bool InInstantiation)4532 void Sema::AddModeAttr(Decl *D, const AttributeCommonInfo &CI,
4533 IdentifierInfo *Name, bool InInstantiation) {
4534 StringRef Str = Name->getName();
4535 normalizeName(Str);
4536 SourceLocation AttrLoc = CI.getLoc();
4537
4538 unsigned DestWidth = 0;
4539 bool IntegerMode = true;
4540 bool ComplexMode = false;
4541 FloatModeKind ExplicitType = FloatModeKind::NoFloat;
4542 llvm::APInt VectorSize(64, 0);
4543 if (Str.size() >= 4 && Str[0] == 'V') {
4544 // Minimal length of vector mode is 4: 'V' + NUMBER(>=1) + TYPE(>=2).
4545 size_t StrSize = Str.size();
4546 size_t VectorStringLength = 0;
4547 while ((VectorStringLength + 1) < StrSize &&
4548 isdigit(Str[VectorStringLength + 1]))
4549 ++VectorStringLength;
4550 if (VectorStringLength &&
4551 !Str.substr(1, VectorStringLength).getAsInteger(10, VectorSize) &&
4552 VectorSize.isPowerOf2()) {
4553 parseModeAttrArg(*this, Str.substr(VectorStringLength + 1), DestWidth,
4554 IntegerMode, ComplexMode, ExplicitType);
4555 // Avoid duplicate warning from template instantiation.
4556 if (!InInstantiation)
4557 Diag(AttrLoc, diag::warn_vector_mode_deprecated);
4558 } else {
4559 VectorSize = 0;
4560 }
4561 }
4562
4563 if (!VectorSize)
4564 parseModeAttrArg(*this, Str, DestWidth, IntegerMode, ComplexMode,
4565 ExplicitType);
4566
4567 // FIXME: Sync this with InitializePredefinedMacros; we need to match int8_t
4568 // and friends, at least with glibc.
4569 // FIXME: Make sure floating-point mappings are accurate
4570 // FIXME: Support XF and TF types
4571 if (!DestWidth) {
4572 Diag(AttrLoc, diag::err_machine_mode) << 0 /*Unknown*/ << Name;
4573 return;
4574 }
4575
4576 QualType OldTy;
4577 if (const auto *TD = dyn_cast<TypedefNameDecl>(D))
4578 OldTy = TD->getUnderlyingType();
4579 else if (const auto *ED = dyn_cast<EnumDecl>(D)) {
4580 // Something like 'typedef enum { X } __attribute__((mode(XX))) T;'.
4581 // Try to get type from enum declaration, default to int.
4582 OldTy = ED->getIntegerType();
4583 if (OldTy.isNull())
4584 OldTy = Context.IntTy;
4585 } else
4586 OldTy = cast<ValueDecl>(D)->getType();
4587
4588 if (OldTy->isDependentType()) {
4589 D->addAttr(::new (Context) ModeAttr(Context, CI, Name));
4590 return;
4591 }
4592
4593 // Base type can also be a vector type (see PR17453).
4594 // Distinguish between base type and base element type.
4595 QualType OldElemTy = OldTy;
4596 if (const auto *VT = OldTy->getAs<VectorType>())
4597 OldElemTy = VT->getElementType();
4598
4599 // GCC allows 'mode' attribute on enumeration types (even incomplete), except
4600 // for vector modes. So, 'enum X __attribute__((mode(QI)));' forms a complete
4601 // type, 'enum { A } __attribute__((mode(V4SI)))' is rejected.
4602 if ((isa<EnumDecl>(D) || OldElemTy->getAs<EnumType>()) &&
4603 VectorSize.getBoolValue()) {
4604 Diag(AttrLoc, diag::err_enum_mode_vector_type) << Name << CI.getRange();
4605 return;
4606 }
4607 bool IntegralOrAnyEnumType = (OldElemTy->isIntegralOrEnumerationType() &&
4608 !OldElemTy->isBitIntType()) ||
4609 OldElemTy->getAs<EnumType>();
4610
4611 if (!OldElemTy->getAs<BuiltinType>() && !OldElemTy->isComplexType() &&
4612 !IntegralOrAnyEnumType)
4613 Diag(AttrLoc, diag::err_mode_not_primitive);
4614 else if (IntegerMode) {
4615 if (!IntegralOrAnyEnumType)
4616 Diag(AttrLoc, diag::err_mode_wrong_type);
4617 } else if (ComplexMode) {
4618 if (!OldElemTy->isComplexType())
4619 Diag(AttrLoc, diag::err_mode_wrong_type);
4620 } else {
4621 if (!OldElemTy->isFloatingType())
4622 Diag(AttrLoc, diag::err_mode_wrong_type);
4623 }
4624
4625 QualType NewElemTy;
4626
4627 if (IntegerMode)
4628 NewElemTy = Context.getIntTypeForBitwidth(DestWidth,
4629 OldElemTy->isSignedIntegerType());
4630 else
4631 NewElemTy = Context.getRealTypeForBitwidth(DestWidth, ExplicitType);
4632
4633 if (NewElemTy.isNull()) {
4634 Diag(AttrLoc, diag::err_machine_mode) << 1 /*Unsupported*/ << Name;
4635 return;
4636 }
4637
4638 if (ComplexMode) {
4639 NewElemTy = Context.getComplexType(NewElemTy);
4640 }
4641
4642 QualType NewTy = NewElemTy;
4643 if (VectorSize.getBoolValue()) {
4644 NewTy = Context.getVectorType(NewTy, VectorSize.getZExtValue(),
4645 VectorType::GenericVector);
4646 } else if (const auto *OldVT = OldTy->getAs<VectorType>()) {
4647 // Complex machine mode does not support base vector types.
4648 if (ComplexMode) {
4649 Diag(AttrLoc, diag::err_complex_mode_vector_type);
4650 return;
4651 }
4652 unsigned NumElements = Context.getTypeSize(OldElemTy) *
4653 OldVT->getNumElements() /
4654 Context.getTypeSize(NewElemTy);
4655 NewTy =
4656 Context.getVectorType(NewElemTy, NumElements, OldVT->getVectorKind());
4657 }
4658
4659 if (NewTy.isNull()) {
4660 Diag(AttrLoc, diag::err_mode_wrong_type);
4661 return;
4662 }
4663
4664 // Install the new type.
4665 if (auto *TD = dyn_cast<TypedefNameDecl>(D))
4666 TD->setModedTypeSourceInfo(TD->getTypeSourceInfo(), NewTy);
4667 else if (auto *ED = dyn_cast<EnumDecl>(D))
4668 ED->setIntegerType(NewTy);
4669 else
4670 cast<ValueDecl>(D)->setType(NewTy);
4671
4672 D->addAttr(::new (Context) ModeAttr(Context, CI, Name));
4673 }
4674
handleNoDebugAttr(Sema & S,Decl * D,const ParsedAttr & AL)4675 static void handleNoDebugAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4676 D->addAttr(::new (S.Context) NoDebugAttr(S.Context, AL));
4677 }
4678
mergeAlwaysInlineAttr(Decl * D,const AttributeCommonInfo & CI,const IdentifierInfo * Ident)4679 AlwaysInlineAttr *Sema::mergeAlwaysInlineAttr(Decl *D,
4680 const AttributeCommonInfo &CI,
4681 const IdentifierInfo *Ident) {
4682 if (OptimizeNoneAttr *Optnone = D->getAttr<OptimizeNoneAttr>()) {
4683 Diag(CI.getLoc(), diag::warn_attribute_ignored) << Ident;
4684 Diag(Optnone->getLocation(), diag::note_conflicting_attribute);
4685 return nullptr;
4686 }
4687
4688 if (D->hasAttr<AlwaysInlineAttr>())
4689 return nullptr;
4690
4691 return ::new (Context) AlwaysInlineAttr(Context, CI);
4692 }
4693
mergeInternalLinkageAttr(Decl * D,const ParsedAttr & AL)4694 InternalLinkageAttr *Sema::mergeInternalLinkageAttr(Decl *D,
4695 const ParsedAttr &AL) {
4696 if (const auto *VD = dyn_cast<VarDecl>(D)) {
4697 // Attribute applies to Var but not any subclass of it (like ParmVar,
4698 // ImplicitParm or VarTemplateSpecialization).
4699 if (VD->getKind() != Decl::Var) {
4700 Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
4701 << AL << (getLangOpts().CPlusPlus ? ExpectedFunctionVariableOrClass
4702 : ExpectedVariableOrFunction);
4703 return nullptr;
4704 }
4705 // Attribute does not apply to non-static local variables.
4706 if (VD->hasLocalStorage()) {
4707 Diag(VD->getLocation(), diag::warn_internal_linkage_local_storage);
4708 return nullptr;
4709 }
4710 }
4711
4712 return ::new (Context) InternalLinkageAttr(Context, AL);
4713 }
4714 InternalLinkageAttr *
mergeInternalLinkageAttr(Decl * D,const InternalLinkageAttr & AL)4715 Sema::mergeInternalLinkageAttr(Decl *D, const InternalLinkageAttr &AL) {
4716 if (const auto *VD = dyn_cast<VarDecl>(D)) {
4717 // Attribute applies to Var but not any subclass of it (like ParmVar,
4718 // ImplicitParm or VarTemplateSpecialization).
4719 if (VD->getKind() != Decl::Var) {
4720 Diag(AL.getLocation(), diag::warn_attribute_wrong_decl_type)
4721 << &AL << (getLangOpts().CPlusPlus ? ExpectedFunctionVariableOrClass
4722 : ExpectedVariableOrFunction);
4723 return nullptr;
4724 }
4725 // Attribute does not apply to non-static local variables.
4726 if (VD->hasLocalStorage()) {
4727 Diag(VD->getLocation(), diag::warn_internal_linkage_local_storage);
4728 return nullptr;
4729 }
4730 }
4731
4732 return ::new (Context) InternalLinkageAttr(Context, AL);
4733 }
4734
mergeMinSizeAttr(Decl * D,const AttributeCommonInfo & CI)4735 MinSizeAttr *Sema::mergeMinSizeAttr(Decl *D, const AttributeCommonInfo &CI) {
4736 if (OptimizeNoneAttr *Optnone = D->getAttr<OptimizeNoneAttr>()) {
4737 Diag(CI.getLoc(), diag::warn_attribute_ignored) << "'minsize'";
4738 Diag(Optnone->getLocation(), diag::note_conflicting_attribute);
4739 return nullptr;
4740 }
4741
4742 if (D->hasAttr<MinSizeAttr>())
4743 return nullptr;
4744
4745 return ::new (Context) MinSizeAttr(Context, CI);
4746 }
4747
mergeSwiftNameAttr(Decl * D,const SwiftNameAttr & SNA,StringRef Name)4748 SwiftNameAttr *Sema::mergeSwiftNameAttr(Decl *D, const SwiftNameAttr &SNA,
4749 StringRef Name) {
4750 if (const auto *PrevSNA = D->getAttr<SwiftNameAttr>()) {
4751 if (PrevSNA->getName() != Name && !PrevSNA->isImplicit()) {
4752 Diag(PrevSNA->getLocation(), diag::err_attributes_are_not_compatible)
4753 << PrevSNA << &SNA;
4754 Diag(SNA.getLoc(), diag::note_conflicting_attribute);
4755 }
4756
4757 D->dropAttr<SwiftNameAttr>();
4758 }
4759 return ::new (Context) SwiftNameAttr(Context, SNA, Name);
4760 }
4761
mergeOptimizeNoneAttr(Decl * D,const AttributeCommonInfo & CI)4762 OptimizeNoneAttr *Sema::mergeOptimizeNoneAttr(Decl *D,
4763 const AttributeCommonInfo &CI) {
4764 if (AlwaysInlineAttr *Inline = D->getAttr<AlwaysInlineAttr>()) {
4765 Diag(Inline->getLocation(), diag::warn_attribute_ignored) << Inline;
4766 Diag(CI.getLoc(), diag::note_conflicting_attribute);
4767 D->dropAttr<AlwaysInlineAttr>();
4768 }
4769 if (MinSizeAttr *MinSize = D->getAttr<MinSizeAttr>()) {
4770 Diag(MinSize->getLocation(), diag::warn_attribute_ignored) << MinSize;
4771 Diag(CI.getLoc(), diag::note_conflicting_attribute);
4772 D->dropAttr<MinSizeAttr>();
4773 }
4774
4775 if (D->hasAttr<OptimizeNoneAttr>())
4776 return nullptr;
4777
4778 return ::new (Context) OptimizeNoneAttr(Context, CI);
4779 }
4780
handleAlwaysInlineAttr(Sema & S,Decl * D,const ParsedAttr & AL)4781 static void handleAlwaysInlineAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4782 if (AlwaysInlineAttr *Inline =
4783 S.mergeAlwaysInlineAttr(D, AL, AL.getAttrName()))
4784 D->addAttr(Inline);
4785 }
4786
handleMinSizeAttr(Sema & S,Decl * D,const ParsedAttr & AL)4787 static void handleMinSizeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4788 if (MinSizeAttr *MinSize = S.mergeMinSizeAttr(D, AL))
4789 D->addAttr(MinSize);
4790 }
4791
handleOptimizeNoneAttr(Sema & S,Decl * D,const ParsedAttr & AL)4792 static void handleOptimizeNoneAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4793 if (OptimizeNoneAttr *Optnone = S.mergeOptimizeNoneAttr(D, AL))
4794 D->addAttr(Optnone);
4795 }
4796
handleConstantAttr(Sema & S,Decl * D,const ParsedAttr & AL)4797 static void handleConstantAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4798 const auto *VD = cast<VarDecl>(D);
4799 if (VD->hasLocalStorage()) {
4800 S.Diag(AL.getLoc(), diag::err_cuda_nonstatic_constdev);
4801 return;
4802 }
4803 // constexpr variable may already get an implicit constant attr, which should
4804 // be replaced by the explicit constant attr.
4805 if (auto *A = D->getAttr<CUDAConstantAttr>()) {
4806 if (!A->isImplicit())
4807 return;
4808 D->dropAttr<CUDAConstantAttr>();
4809 }
4810 D->addAttr(::new (S.Context) CUDAConstantAttr(S.Context, AL));
4811 }
4812
handleSharedAttr(Sema & S,Decl * D,const ParsedAttr & AL)4813 static void handleSharedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4814 const auto *VD = cast<VarDecl>(D);
4815 // extern __shared__ is only allowed on arrays with no length (e.g.
4816 // "int x[]").
4817 if (!S.getLangOpts().GPURelocatableDeviceCode && VD->hasExternalStorage() &&
4818 !isa<IncompleteArrayType>(VD->getType())) {
4819 S.Diag(AL.getLoc(), diag::err_cuda_extern_shared) << VD;
4820 return;
4821 }
4822 if (S.getLangOpts().CUDA && VD->hasLocalStorage() &&
4823 S.CUDADiagIfHostCode(AL.getLoc(), diag::err_cuda_host_shared)
4824 << S.CurrentCUDATarget())
4825 return;
4826 D->addAttr(::new (S.Context) CUDASharedAttr(S.Context, AL));
4827 }
4828
handleGlobalAttr(Sema & S,Decl * D,const ParsedAttr & AL)4829 static void handleGlobalAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4830 const auto *FD = cast<FunctionDecl>(D);
4831 if (!FD->getReturnType()->isVoidType() &&
4832 !FD->getReturnType()->getAs<AutoType>() &&
4833 !FD->getReturnType()->isInstantiationDependentType()) {
4834 SourceRange RTRange = FD->getReturnTypeSourceRange();
4835 S.Diag(FD->getTypeSpecStartLoc(), diag::err_kern_type_not_void_return)
4836 << FD->getType()
4837 << (RTRange.isValid() ? FixItHint::CreateReplacement(RTRange, "void")
4838 : FixItHint());
4839 return;
4840 }
4841 if (const auto *Method = dyn_cast<CXXMethodDecl>(FD)) {
4842 if (Method->isInstance()) {
4843 S.Diag(Method->getBeginLoc(), diag::err_kern_is_nonstatic_method)
4844 << Method;
4845 return;
4846 }
4847 S.Diag(Method->getBeginLoc(), diag::warn_kern_is_method) << Method;
4848 }
4849 // Only warn for "inline" when compiling for host, to cut down on noise.
4850 if (FD->isInlineSpecified() && !S.getLangOpts().CUDAIsDevice)
4851 S.Diag(FD->getBeginLoc(), diag::warn_kern_is_inline) << FD;
4852
4853 D->addAttr(::new (S.Context) CUDAGlobalAttr(S.Context, AL));
4854 // In host compilation the kernel is emitted as a stub function, which is
4855 // a helper function for launching the kernel. The instructions in the helper
4856 // function has nothing to do with the source code of the kernel. Do not emit
4857 // debug info for the stub function to avoid confusing the debugger.
4858 if (S.LangOpts.HIP && !S.LangOpts.CUDAIsDevice)
4859 D->addAttr(NoDebugAttr::CreateImplicit(S.Context));
4860 }
4861
handleDeviceAttr(Sema & S,Decl * D,const ParsedAttr & AL)4862 static void handleDeviceAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4863 if (const auto *VD = dyn_cast<VarDecl>(D)) {
4864 if (VD->hasLocalStorage()) {
4865 S.Diag(AL.getLoc(), diag::err_cuda_nonstatic_constdev);
4866 return;
4867 }
4868 }
4869
4870 if (auto *A = D->getAttr<CUDADeviceAttr>()) {
4871 if (!A->isImplicit())
4872 return;
4873 D->dropAttr<CUDADeviceAttr>();
4874 }
4875 D->addAttr(::new (S.Context) CUDADeviceAttr(S.Context, AL));
4876 }
4877
handleManagedAttr(Sema & S,Decl * D,const ParsedAttr & AL)4878 static void handleManagedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4879 if (const auto *VD = dyn_cast<VarDecl>(D)) {
4880 if (VD->hasLocalStorage()) {
4881 S.Diag(AL.getLoc(), diag::err_cuda_nonstatic_constdev);
4882 return;
4883 }
4884 }
4885 if (!D->hasAttr<HIPManagedAttr>())
4886 D->addAttr(::new (S.Context) HIPManagedAttr(S.Context, AL));
4887 if (!D->hasAttr<CUDADeviceAttr>())
4888 D->addAttr(CUDADeviceAttr::CreateImplicit(S.Context));
4889 }
4890
handleGNUInlineAttr(Sema & S,Decl * D,const ParsedAttr & AL)4891 static void handleGNUInlineAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4892 const auto *Fn = cast<FunctionDecl>(D);
4893 if (!Fn->isInlineSpecified()) {
4894 S.Diag(AL.getLoc(), diag::warn_gnu_inline_attribute_requires_inline);
4895 return;
4896 }
4897
4898 if (S.LangOpts.CPlusPlus && Fn->getStorageClass() != SC_Extern)
4899 S.Diag(AL.getLoc(), diag::warn_gnu_inline_cplusplus_without_extern);
4900
4901 D->addAttr(::new (S.Context) GNUInlineAttr(S.Context, AL));
4902 }
4903
handleCallConvAttr(Sema & S,Decl * D,const ParsedAttr & AL)4904 static void handleCallConvAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4905 if (hasDeclarator(D)) return;
4906
4907 // Diagnostic is emitted elsewhere: here we store the (valid) AL
4908 // in the Decl node for syntactic reasoning, e.g., pretty-printing.
4909 CallingConv CC;
4910 if (S.CheckCallingConvAttr(AL, CC, /*FD*/nullptr))
4911 return;
4912
4913 if (!isa<ObjCMethodDecl>(D)) {
4914 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
4915 << AL << ExpectedFunctionOrMethod;
4916 return;
4917 }
4918
4919 switch (AL.getKind()) {
4920 case ParsedAttr::AT_FastCall:
4921 D->addAttr(::new (S.Context) FastCallAttr(S.Context, AL));
4922 return;
4923 case ParsedAttr::AT_StdCall:
4924 D->addAttr(::new (S.Context) StdCallAttr(S.Context, AL));
4925 return;
4926 case ParsedAttr::AT_ThisCall:
4927 D->addAttr(::new (S.Context) ThisCallAttr(S.Context, AL));
4928 return;
4929 case ParsedAttr::AT_CDecl:
4930 D->addAttr(::new (S.Context) CDeclAttr(S.Context, AL));
4931 return;
4932 case ParsedAttr::AT_Pascal:
4933 D->addAttr(::new (S.Context) PascalAttr(S.Context, AL));
4934 return;
4935 case ParsedAttr::AT_SwiftCall:
4936 D->addAttr(::new (S.Context) SwiftCallAttr(S.Context, AL));
4937 return;
4938 case ParsedAttr::AT_SwiftAsyncCall:
4939 D->addAttr(::new (S.Context) SwiftAsyncCallAttr(S.Context, AL));
4940 return;
4941 case ParsedAttr::AT_VectorCall:
4942 D->addAttr(::new (S.Context) VectorCallAttr(S.Context, AL));
4943 return;
4944 case ParsedAttr::AT_MSABI:
4945 D->addAttr(::new (S.Context) MSABIAttr(S.Context, AL));
4946 return;
4947 case ParsedAttr::AT_SysVABI:
4948 D->addAttr(::new (S.Context) SysVABIAttr(S.Context, AL));
4949 return;
4950 case ParsedAttr::AT_RegCall:
4951 D->addAttr(::new (S.Context) RegCallAttr(S.Context, AL));
4952 return;
4953 case ParsedAttr::AT_Pcs: {
4954 PcsAttr::PCSType PCS;
4955 switch (CC) {
4956 case CC_AAPCS:
4957 PCS = PcsAttr::AAPCS;
4958 break;
4959 case CC_AAPCS_VFP:
4960 PCS = PcsAttr::AAPCS_VFP;
4961 break;
4962 default:
4963 llvm_unreachable("unexpected calling convention in pcs attribute");
4964 }
4965
4966 D->addAttr(::new (S.Context) PcsAttr(S.Context, AL, PCS));
4967 return;
4968 }
4969 case ParsedAttr::AT_AArch64VectorPcs:
4970 D->addAttr(::new (S.Context) AArch64VectorPcsAttr(S.Context, AL));
4971 return;
4972 case ParsedAttr::AT_AArch64SVEPcs:
4973 D->addAttr(::new (S.Context) AArch64SVEPcsAttr(S.Context, AL));
4974 return;
4975 case ParsedAttr::AT_AMDGPUKernelCall:
4976 D->addAttr(::new (S.Context) AMDGPUKernelCallAttr(S.Context, AL));
4977 return;
4978 case ParsedAttr::AT_IntelOclBicc:
4979 D->addAttr(::new (S.Context) IntelOclBiccAttr(S.Context, AL));
4980 return;
4981 case ParsedAttr::AT_PreserveMost:
4982 D->addAttr(::new (S.Context) PreserveMostAttr(S.Context, AL));
4983 return;
4984 case ParsedAttr::AT_PreserveAll:
4985 D->addAttr(::new (S.Context) PreserveAllAttr(S.Context, AL));
4986 return;
4987 default:
4988 llvm_unreachable("unexpected attribute kind");
4989 }
4990 }
4991
handleSuppressAttr(Sema & S,Decl * D,const ParsedAttr & AL)4992 static void handleSuppressAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
4993 if (!AL.checkAtLeastNumArgs(S, 1))
4994 return;
4995
4996 std::vector<StringRef> DiagnosticIdentifiers;
4997 for (unsigned I = 0, E = AL.getNumArgs(); I != E; ++I) {
4998 StringRef RuleName;
4999
5000 if (!S.checkStringLiteralArgumentAttr(AL, I, RuleName, nullptr))
5001 return;
5002
5003 // FIXME: Warn if the rule name is unknown. This is tricky because only
5004 // clang-tidy knows about available rules.
5005 DiagnosticIdentifiers.push_back(RuleName);
5006 }
5007 D->addAttr(::new (S.Context)
5008 SuppressAttr(S.Context, AL, DiagnosticIdentifiers.data(),
5009 DiagnosticIdentifiers.size()));
5010 }
5011
handleLifetimeCategoryAttr(Sema & S,Decl * D,const ParsedAttr & AL)5012 static void handleLifetimeCategoryAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
5013 TypeSourceInfo *DerefTypeLoc = nullptr;
5014 QualType ParmType;
5015 if (AL.hasParsedType()) {
5016 ParmType = S.GetTypeFromParser(AL.getTypeArg(), &DerefTypeLoc);
5017
5018 unsigned SelectIdx = ~0U;
5019 if (ParmType->isReferenceType())
5020 SelectIdx = 0;
5021 else if (ParmType->isArrayType())
5022 SelectIdx = 1;
5023
5024 if (SelectIdx != ~0U) {
5025 S.Diag(AL.getLoc(), diag::err_attribute_invalid_argument)
5026 << SelectIdx << AL;
5027 return;
5028 }
5029 }
5030
5031 // To check if earlier decl attributes do not conflict the newly parsed ones
5032 // we always add (and check) the attribute to the canonical decl. We need
5033 // to repeat the check for attribute mutual exclusion because we're attaching
5034 // all of the attributes to the canonical declaration rather than the current
5035 // declaration.
5036 D = D->getCanonicalDecl();
5037 if (AL.getKind() == ParsedAttr::AT_Owner) {
5038 if (checkAttrMutualExclusion<PointerAttr>(S, D, AL))
5039 return;
5040 if (const auto *OAttr = D->getAttr<OwnerAttr>()) {
5041 const Type *ExistingDerefType = OAttr->getDerefTypeLoc()
5042 ? OAttr->getDerefType().getTypePtr()
5043 : nullptr;
5044 if (ExistingDerefType != ParmType.getTypePtrOrNull()) {
5045 S.Diag(AL.getLoc(), diag::err_attributes_are_not_compatible)
5046 << AL << OAttr;
5047 S.Diag(OAttr->getLocation(), diag::note_conflicting_attribute);
5048 }
5049 return;
5050 }
5051 for (Decl *Redecl : D->redecls()) {
5052 Redecl->addAttr(::new (S.Context) OwnerAttr(S.Context, AL, DerefTypeLoc));
5053 }
5054 } else {
5055 if (checkAttrMutualExclusion<OwnerAttr>(S, D, AL))
5056 return;
5057 if (const auto *PAttr = D->getAttr<PointerAttr>()) {
5058 const Type *ExistingDerefType = PAttr->getDerefTypeLoc()
5059 ? PAttr->getDerefType().getTypePtr()
5060 : nullptr;
5061 if (ExistingDerefType != ParmType.getTypePtrOrNull()) {
5062 S.Diag(AL.getLoc(), diag::err_attributes_are_not_compatible)
5063 << AL << PAttr;
5064 S.Diag(PAttr->getLocation(), diag::note_conflicting_attribute);
5065 }
5066 return;
5067 }
5068 for (Decl *Redecl : D->redecls()) {
5069 Redecl->addAttr(::new (S.Context)
5070 PointerAttr(S.Context, AL, DerefTypeLoc));
5071 }
5072 }
5073 }
5074
handleRandomizeLayoutAttr(Sema & S,Decl * D,const ParsedAttr & AL)5075 static void handleRandomizeLayoutAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
5076 if (checkAttrMutualExclusion<NoRandomizeLayoutAttr>(S, D, AL))
5077 return;
5078 if (!D->hasAttr<RandomizeLayoutAttr>())
5079 D->addAttr(::new (S.Context) RandomizeLayoutAttr(S.Context, AL));
5080 }
5081
handleNoRandomizeLayoutAttr(Sema & S,Decl * D,const ParsedAttr & AL)5082 static void handleNoRandomizeLayoutAttr(Sema &S, Decl *D,
5083 const ParsedAttr &AL) {
5084 if (checkAttrMutualExclusion<RandomizeLayoutAttr>(S, D, AL))
5085 return;
5086 if (!D->hasAttr<NoRandomizeLayoutAttr>())
5087 D->addAttr(::new (S.Context) NoRandomizeLayoutAttr(S.Context, AL));
5088 }
5089
CheckCallingConvAttr(const ParsedAttr & Attrs,CallingConv & CC,const FunctionDecl * FD)5090 bool Sema::CheckCallingConvAttr(const ParsedAttr &Attrs, CallingConv &CC,
5091 const FunctionDecl *FD) {
5092 if (Attrs.isInvalid())
5093 return true;
5094
5095 if (Attrs.hasProcessingCache()) {
5096 CC = (CallingConv) Attrs.getProcessingCache();
5097 return false;
5098 }
5099
5100 unsigned ReqArgs = Attrs.getKind() == ParsedAttr::AT_Pcs ? 1 : 0;
5101 if (!Attrs.checkExactlyNumArgs(*this, ReqArgs)) {
5102 Attrs.setInvalid();
5103 return true;
5104 }
5105
5106 // TODO: diagnose uses of these conventions on the wrong target.
5107 switch (Attrs.getKind()) {
5108 case ParsedAttr::AT_CDecl:
5109 CC = CC_C;
5110 break;
5111 case ParsedAttr::AT_FastCall:
5112 CC = CC_X86FastCall;
5113 break;
5114 case ParsedAttr::AT_StdCall:
5115 CC = CC_X86StdCall;
5116 break;
5117 case ParsedAttr::AT_ThisCall:
5118 CC = CC_X86ThisCall;
5119 break;
5120 case ParsedAttr::AT_Pascal:
5121 CC = CC_X86Pascal;
5122 break;
5123 case ParsedAttr::AT_SwiftCall:
5124 CC = CC_Swift;
5125 break;
5126 case ParsedAttr::AT_SwiftAsyncCall:
5127 CC = CC_SwiftAsync;
5128 break;
5129 case ParsedAttr::AT_VectorCall:
5130 CC = CC_X86VectorCall;
5131 break;
5132 case ParsedAttr::AT_AArch64VectorPcs:
5133 CC = CC_AArch64VectorCall;
5134 break;
5135 case ParsedAttr::AT_AArch64SVEPcs:
5136 CC = CC_AArch64SVEPCS;
5137 break;
5138 case ParsedAttr::AT_AMDGPUKernelCall:
5139 CC = CC_AMDGPUKernelCall;
5140 break;
5141 case ParsedAttr::AT_RegCall:
5142 CC = CC_X86RegCall;
5143 break;
5144 case ParsedAttr::AT_MSABI:
5145 CC = Context.getTargetInfo().getTriple().isOSWindows() ? CC_C :
5146 CC_Win64;
5147 break;
5148 case ParsedAttr::AT_SysVABI:
5149 CC = Context.getTargetInfo().getTriple().isOSWindows() ? CC_X86_64SysV :
5150 CC_C;
5151 break;
5152 case ParsedAttr::AT_Pcs: {
5153 StringRef StrRef;
5154 if (!checkStringLiteralArgumentAttr(Attrs, 0, StrRef)) {
5155 Attrs.setInvalid();
5156 return true;
5157 }
5158 if (StrRef == "aapcs") {
5159 CC = CC_AAPCS;
5160 break;
5161 } else if (StrRef == "aapcs-vfp") {
5162 CC = CC_AAPCS_VFP;
5163 break;
5164 }
5165
5166 Attrs.setInvalid();
5167 Diag(Attrs.getLoc(), diag::err_invalid_pcs);
5168 return true;
5169 }
5170 case ParsedAttr::AT_IntelOclBicc:
5171 CC = CC_IntelOclBicc;
5172 break;
5173 case ParsedAttr::AT_PreserveMost:
5174 CC = CC_PreserveMost;
5175 break;
5176 case ParsedAttr::AT_PreserveAll:
5177 CC = CC_PreserveAll;
5178 break;
5179 default: llvm_unreachable("unexpected attribute kind");
5180 }
5181
5182 TargetInfo::CallingConvCheckResult A = TargetInfo::CCCR_OK;
5183 const TargetInfo &TI = Context.getTargetInfo();
5184 // CUDA functions may have host and/or device attributes which indicate
5185 // their targeted execution environment, therefore the calling convention
5186 // of functions in CUDA should be checked against the target deduced based
5187 // on their host/device attributes.
5188 if (LangOpts.CUDA) {
5189 auto *Aux = Context.getAuxTargetInfo();
5190 auto CudaTarget = IdentifyCUDATarget(FD);
5191 bool CheckHost = false, CheckDevice = false;
5192 switch (CudaTarget) {
5193 case CFT_HostDevice:
5194 CheckHost = true;
5195 CheckDevice = true;
5196 break;
5197 case CFT_Host:
5198 CheckHost = true;
5199 break;
5200 case CFT_Device:
5201 case CFT_Global:
5202 CheckDevice = true;
5203 break;
5204 case CFT_InvalidTarget:
5205 llvm_unreachable("unexpected cuda target");
5206 }
5207 auto *HostTI = LangOpts.CUDAIsDevice ? Aux : &TI;
5208 auto *DeviceTI = LangOpts.CUDAIsDevice ? &TI : Aux;
5209 if (CheckHost && HostTI)
5210 A = HostTI->checkCallingConvention(CC);
5211 if (A == TargetInfo::CCCR_OK && CheckDevice && DeviceTI)
5212 A = DeviceTI->checkCallingConvention(CC);
5213 } else {
5214 A = TI.checkCallingConvention(CC);
5215 }
5216
5217 switch (A) {
5218 case TargetInfo::CCCR_OK:
5219 break;
5220
5221 case TargetInfo::CCCR_Ignore:
5222 // Treat an ignored convention as if it was an explicit C calling convention
5223 // attribute. For example, __stdcall on Win x64 functions as __cdecl, so
5224 // that command line flags that change the default convention to
5225 // __vectorcall don't affect declarations marked __stdcall.
5226 CC = CC_C;
5227 break;
5228
5229 case TargetInfo::CCCR_Error:
5230 Diag(Attrs.getLoc(), diag::error_cconv_unsupported)
5231 << Attrs << (int)CallingConventionIgnoredReason::ForThisTarget;
5232 break;
5233
5234 case TargetInfo::CCCR_Warning: {
5235 Diag(Attrs.getLoc(), diag::warn_cconv_unsupported)
5236 << Attrs << (int)CallingConventionIgnoredReason::ForThisTarget;
5237
5238 // This convention is not valid for the target. Use the default function or
5239 // method calling convention.
5240 bool IsCXXMethod = false, IsVariadic = false;
5241 if (FD) {
5242 IsCXXMethod = FD->isCXXInstanceMember();
5243 IsVariadic = FD->isVariadic();
5244 }
5245 CC = Context.getDefaultCallingConvention(IsVariadic, IsCXXMethod);
5246 break;
5247 }
5248 }
5249
5250 Attrs.setProcessingCache((unsigned) CC);
5251 return false;
5252 }
5253
5254 /// Pointer-like types in the default address space.
isValidSwiftContextType(QualType Ty)5255 static bool isValidSwiftContextType(QualType Ty) {
5256 if (!Ty->hasPointerRepresentation())
5257 return Ty->isDependentType();
5258 return Ty->getPointeeType().getAddressSpace() == LangAS::Default;
5259 }
5260
5261 /// Pointers and references in the default address space.
isValidSwiftIndirectResultType(QualType Ty)5262 static bool isValidSwiftIndirectResultType(QualType Ty) {
5263 if (const auto *PtrType = Ty->getAs<PointerType>()) {
5264 Ty = PtrType->getPointeeType();
5265 } else if (const auto *RefType = Ty->getAs<ReferenceType>()) {
5266 Ty = RefType->getPointeeType();
5267 } else {
5268 return Ty->isDependentType();
5269 }
5270 return Ty.getAddressSpace() == LangAS::Default;
5271 }
5272
5273 /// Pointers and references to pointers in the default address space.
isValidSwiftErrorResultType(QualType Ty)5274 static bool isValidSwiftErrorResultType(QualType Ty) {
5275 if (const auto *PtrType = Ty->getAs<PointerType>()) {
5276 Ty = PtrType->getPointeeType();
5277 } else if (const auto *RefType = Ty->getAs<ReferenceType>()) {
5278 Ty = RefType->getPointeeType();
5279 } else {
5280 return Ty->isDependentType();
5281 }
5282 if (!Ty.getQualifiers().empty())
5283 return false;
5284 return isValidSwiftContextType(Ty);
5285 }
5286
AddParameterABIAttr(Decl * D,const AttributeCommonInfo & CI,ParameterABI abi)5287 void Sema::AddParameterABIAttr(Decl *D, const AttributeCommonInfo &CI,
5288 ParameterABI abi) {
5289
5290 QualType type = cast<ParmVarDecl>(D)->getType();
5291
5292 if (auto existingAttr = D->getAttr<ParameterABIAttr>()) {
5293 if (existingAttr->getABI() != abi) {
5294 Diag(CI.getLoc(), diag::err_attributes_are_not_compatible)
5295 << getParameterABISpelling(abi) << existingAttr;
5296 Diag(existingAttr->getLocation(), diag::note_conflicting_attribute);
5297 return;
5298 }
5299 }
5300
5301 switch (abi) {
5302 case ParameterABI::Ordinary:
5303 llvm_unreachable("explicit attribute for ordinary parameter ABI?");
5304
5305 case ParameterABI::SwiftContext:
5306 if (!isValidSwiftContextType(type)) {
5307 Diag(CI.getLoc(), diag::err_swift_abi_parameter_wrong_type)
5308 << getParameterABISpelling(abi) << /*pointer to pointer */ 0 << type;
5309 }
5310 D->addAttr(::new (Context) SwiftContextAttr(Context, CI));
5311 return;
5312
5313 case ParameterABI::SwiftAsyncContext:
5314 if (!isValidSwiftContextType(type)) {
5315 Diag(CI.getLoc(), diag::err_swift_abi_parameter_wrong_type)
5316 << getParameterABISpelling(abi) << /*pointer to pointer */ 0 << type;
5317 }
5318 D->addAttr(::new (Context) SwiftAsyncContextAttr(Context, CI));
5319 return;
5320
5321 case ParameterABI::SwiftErrorResult:
5322 if (!isValidSwiftErrorResultType(type)) {
5323 Diag(CI.getLoc(), diag::err_swift_abi_parameter_wrong_type)
5324 << getParameterABISpelling(abi) << /*pointer to pointer */ 1 << type;
5325 }
5326 D->addAttr(::new (Context) SwiftErrorResultAttr(Context, CI));
5327 return;
5328
5329 case ParameterABI::SwiftIndirectResult:
5330 if (!isValidSwiftIndirectResultType(type)) {
5331 Diag(CI.getLoc(), diag::err_swift_abi_parameter_wrong_type)
5332 << getParameterABISpelling(abi) << /*pointer*/ 0 << type;
5333 }
5334 D->addAttr(::new (Context) SwiftIndirectResultAttr(Context, CI));
5335 return;
5336 }
5337 llvm_unreachable("bad parameter ABI attribute");
5338 }
5339
5340 /// Checks a regparm attribute, returning true if it is ill-formed and
5341 /// otherwise setting numParams to the appropriate value.
CheckRegparmAttr(const ParsedAttr & AL,unsigned & numParams)5342 bool Sema::CheckRegparmAttr(const ParsedAttr &AL, unsigned &numParams) {
5343 if (AL.isInvalid())
5344 return true;
5345
5346 if (!AL.checkExactlyNumArgs(*this, 1)) {
5347 AL.setInvalid();
5348 return true;
5349 }
5350
5351 uint32_t NP;
5352 Expr *NumParamsExpr = AL.getArgAsExpr(0);
5353 if (!checkUInt32Argument(*this, AL, NumParamsExpr, NP)) {
5354 AL.setInvalid();
5355 return true;
5356 }
5357
5358 if (Context.getTargetInfo().getRegParmMax() == 0) {
5359 Diag(AL.getLoc(), diag::err_attribute_regparm_wrong_platform)
5360 << NumParamsExpr->getSourceRange();
5361 AL.setInvalid();
5362 return true;
5363 }
5364
5365 numParams = NP;
5366 if (numParams > Context.getTargetInfo().getRegParmMax()) {
5367 Diag(AL.getLoc(), diag::err_attribute_regparm_invalid_number)
5368 << Context.getTargetInfo().getRegParmMax() << NumParamsExpr->getSourceRange();
5369 AL.setInvalid();
5370 return true;
5371 }
5372
5373 return false;
5374 }
5375
5376 // Checks whether an argument of launch_bounds attribute is
5377 // acceptable, performs implicit conversion to Rvalue, and returns
5378 // non-nullptr Expr result on success. Otherwise, it returns nullptr
5379 // and may output an error.
makeLaunchBoundsArgExpr(Sema & S,Expr * E,const CUDALaunchBoundsAttr & AL,const unsigned Idx)5380 static Expr *makeLaunchBoundsArgExpr(Sema &S, Expr *E,
5381 const CUDALaunchBoundsAttr &AL,
5382 const unsigned Idx) {
5383 if (S.DiagnoseUnexpandedParameterPack(E))
5384 return nullptr;
5385
5386 // Accept template arguments for now as they depend on something else.
5387 // We'll get to check them when they eventually get instantiated.
5388 if (E->isValueDependent())
5389 return E;
5390
5391 Optional<llvm::APSInt> I = llvm::APSInt(64);
5392 if (!(I = E->getIntegerConstantExpr(S.Context))) {
5393 S.Diag(E->getExprLoc(), diag::err_attribute_argument_n_type)
5394 << &AL << Idx << AANT_ArgumentIntegerConstant << E->getSourceRange();
5395 return nullptr;
5396 }
5397 // Make sure we can fit it in 32 bits.
5398 if (!I->isIntN(32)) {
5399 S.Diag(E->getExprLoc(), diag::err_ice_too_large)
5400 << toString(*I, 10, false) << 32 << /* Unsigned */ 1;
5401 return nullptr;
5402 }
5403 if (*I < 0)
5404 S.Diag(E->getExprLoc(), diag::warn_attribute_argument_n_negative)
5405 << &AL << Idx << E->getSourceRange();
5406
5407 // We may need to perform implicit conversion of the argument.
5408 InitializedEntity Entity = InitializedEntity::InitializeParameter(
5409 S.Context, S.Context.getConstType(S.Context.IntTy), /*consume*/ false);
5410 ExprResult ValArg = S.PerformCopyInitialization(Entity, SourceLocation(), E);
5411 assert(!ValArg.isInvalid() &&
5412 "Unexpected PerformCopyInitialization() failure.");
5413
5414 return ValArg.getAs<Expr>();
5415 }
5416
AddLaunchBoundsAttr(Decl * D,const AttributeCommonInfo & CI,Expr * MaxThreads,Expr * MinBlocks)5417 void Sema::AddLaunchBoundsAttr(Decl *D, const AttributeCommonInfo &CI,
5418 Expr *MaxThreads, Expr *MinBlocks) {
5419 CUDALaunchBoundsAttr TmpAttr(Context, CI, MaxThreads, MinBlocks);
5420 MaxThreads = makeLaunchBoundsArgExpr(*this, MaxThreads, TmpAttr, 0);
5421 if (MaxThreads == nullptr)
5422 return;
5423
5424 if (MinBlocks) {
5425 MinBlocks = makeLaunchBoundsArgExpr(*this, MinBlocks, TmpAttr, 1);
5426 if (MinBlocks == nullptr)
5427 return;
5428 }
5429
5430 D->addAttr(::new (Context)
5431 CUDALaunchBoundsAttr(Context, CI, MaxThreads, MinBlocks));
5432 }
5433
handleLaunchBoundsAttr(Sema & S,Decl * D,const ParsedAttr & AL)5434 static void handleLaunchBoundsAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
5435 if (!AL.checkAtLeastNumArgs(S, 1) || !AL.checkAtMostNumArgs(S, 2))
5436 return;
5437
5438 S.AddLaunchBoundsAttr(D, AL, AL.getArgAsExpr(0),
5439 AL.getNumArgs() > 1 ? AL.getArgAsExpr(1) : nullptr);
5440 }
5441
handleArgumentWithTypeTagAttr(Sema & S,Decl * D,const ParsedAttr & AL)5442 static void handleArgumentWithTypeTagAttr(Sema &S, Decl *D,
5443 const ParsedAttr &AL) {
5444 if (!AL.isArgIdent(0)) {
5445 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
5446 << AL << /* arg num = */ 1 << AANT_ArgumentIdentifier;
5447 return;
5448 }
5449
5450 ParamIdx ArgumentIdx;
5451 if (!checkFunctionOrMethodParameterIndex(S, D, AL, 2, AL.getArgAsExpr(1),
5452 ArgumentIdx))
5453 return;
5454
5455 ParamIdx TypeTagIdx;
5456 if (!checkFunctionOrMethodParameterIndex(S, D, AL, 3, AL.getArgAsExpr(2),
5457 TypeTagIdx))
5458 return;
5459
5460 bool IsPointer = AL.getAttrName()->getName() == "pointer_with_type_tag";
5461 if (IsPointer) {
5462 // Ensure that buffer has a pointer type.
5463 unsigned ArgumentIdxAST = ArgumentIdx.getASTIndex();
5464 if (ArgumentIdxAST >= getFunctionOrMethodNumParams(D) ||
5465 !getFunctionOrMethodParamType(D, ArgumentIdxAST)->isPointerType())
5466 S.Diag(AL.getLoc(), diag::err_attribute_pointers_only) << AL << 0;
5467 }
5468
5469 D->addAttr(::new (S.Context) ArgumentWithTypeTagAttr(
5470 S.Context, AL, AL.getArgAsIdent(0)->Ident, ArgumentIdx, TypeTagIdx,
5471 IsPointer));
5472 }
5473
handleTypeTagForDatatypeAttr(Sema & S,Decl * D,const ParsedAttr & AL)5474 static void handleTypeTagForDatatypeAttr(Sema &S, Decl *D,
5475 const ParsedAttr &AL) {
5476 if (!AL.isArgIdent(0)) {
5477 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
5478 << AL << 1 << AANT_ArgumentIdentifier;
5479 return;
5480 }
5481
5482 if (!AL.checkExactlyNumArgs(S, 1))
5483 return;
5484
5485 if (!isa<VarDecl>(D)) {
5486 S.Diag(AL.getLoc(), diag::err_attribute_wrong_decl_type)
5487 << AL << ExpectedVariable;
5488 return;
5489 }
5490
5491 IdentifierInfo *PointerKind = AL.getArgAsIdent(0)->Ident;
5492 TypeSourceInfo *MatchingCTypeLoc = nullptr;
5493 S.GetTypeFromParser(AL.getMatchingCType(), &MatchingCTypeLoc);
5494 assert(MatchingCTypeLoc && "no type source info for attribute argument");
5495
5496 D->addAttr(::new (S.Context) TypeTagForDatatypeAttr(
5497 S.Context, AL, PointerKind, MatchingCTypeLoc, AL.getLayoutCompatible(),
5498 AL.getMustBeNull()));
5499 }
5500
handleXRayLogArgsAttr(Sema & S,Decl * D,const ParsedAttr & AL)5501 static void handleXRayLogArgsAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
5502 ParamIdx ArgCount;
5503
5504 if (!checkFunctionOrMethodParameterIndex(S, D, AL, 1, AL.getArgAsExpr(0),
5505 ArgCount,
5506 true /* CanIndexImplicitThis */))
5507 return;
5508
5509 // ArgCount isn't a parameter index [0;n), it's a count [1;n]
5510 D->addAttr(::new (S.Context)
5511 XRayLogArgsAttr(S.Context, AL, ArgCount.getSourceIndex()));
5512 }
5513
handlePatchableFunctionEntryAttr(Sema & S,Decl * D,const ParsedAttr & AL)5514 static void handlePatchableFunctionEntryAttr(Sema &S, Decl *D,
5515 const ParsedAttr &AL) {
5516 uint32_t Count = 0, Offset = 0;
5517 if (!checkUInt32Argument(S, AL, AL.getArgAsExpr(0), Count, 0, true))
5518 return;
5519 if (AL.getNumArgs() == 2) {
5520 Expr *Arg = AL.getArgAsExpr(1);
5521 if (!checkUInt32Argument(S, AL, Arg, Offset, 1, true))
5522 return;
5523 if (Count < Offset) {
5524 S.Diag(getAttrLoc(AL), diag::err_attribute_argument_out_of_range)
5525 << &AL << 0 << Count << Arg->getBeginLoc();
5526 return;
5527 }
5528 }
5529 D->addAttr(::new (S.Context)
5530 PatchableFunctionEntryAttr(S.Context, AL, Count, Offset));
5531 }
5532
5533 namespace {
5534 struct IntrinToName {
5535 uint32_t Id;
5536 int32_t FullName;
5537 int32_t ShortName;
5538 };
5539 } // unnamed namespace
5540
ArmBuiltinAliasValid(unsigned BuiltinID,StringRef AliasName,ArrayRef<IntrinToName> Map,const char * IntrinNames)5541 static bool ArmBuiltinAliasValid(unsigned BuiltinID, StringRef AliasName,
5542 ArrayRef<IntrinToName> Map,
5543 const char *IntrinNames) {
5544 if (AliasName.startswith("__arm_"))
5545 AliasName = AliasName.substr(6);
5546 const IntrinToName *It = std::lower_bound(
5547 Map.begin(), Map.end(), BuiltinID,
5548 [](const IntrinToName &L, unsigned Id) { return L.Id < Id; });
5549 if (It == Map.end() || It->Id != BuiltinID)
5550 return false;
5551 StringRef FullName(&IntrinNames[It->FullName]);
5552 if (AliasName == FullName)
5553 return true;
5554 if (It->ShortName == -1)
5555 return false;
5556 StringRef ShortName(&IntrinNames[It->ShortName]);
5557 return AliasName == ShortName;
5558 }
5559
ArmMveAliasValid(unsigned BuiltinID,StringRef AliasName)5560 static bool ArmMveAliasValid(unsigned BuiltinID, StringRef AliasName) {
5561 #include "clang/Basic/arm_mve_builtin_aliases.inc"
5562 // The included file defines:
5563 // - ArrayRef<IntrinToName> Map
5564 // - const char IntrinNames[]
5565 return ArmBuiltinAliasValid(BuiltinID, AliasName, Map, IntrinNames);
5566 }
5567
ArmCdeAliasValid(unsigned BuiltinID,StringRef AliasName)5568 static bool ArmCdeAliasValid(unsigned BuiltinID, StringRef AliasName) {
5569 #include "clang/Basic/arm_cde_builtin_aliases.inc"
5570 return ArmBuiltinAliasValid(BuiltinID, AliasName, Map, IntrinNames);
5571 }
5572
ArmSveAliasValid(ASTContext & Context,unsigned BuiltinID,StringRef AliasName)5573 static bool ArmSveAliasValid(ASTContext &Context, unsigned BuiltinID,
5574 StringRef AliasName) {
5575 if (Context.BuiltinInfo.isAuxBuiltinID(BuiltinID))
5576 BuiltinID = Context.BuiltinInfo.getAuxBuiltinID(BuiltinID);
5577 return BuiltinID >= AArch64::FirstSVEBuiltin &&
5578 BuiltinID <= AArch64::LastSVEBuiltin;
5579 }
5580
handleArmBuiltinAliasAttr(Sema & S,Decl * D,const ParsedAttr & AL)5581 static void handleArmBuiltinAliasAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
5582 if (!AL.isArgIdent(0)) {
5583 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
5584 << AL << 1 << AANT_ArgumentIdentifier;
5585 return;
5586 }
5587
5588 IdentifierInfo *Ident = AL.getArgAsIdent(0)->Ident;
5589 unsigned BuiltinID = Ident->getBuiltinID();
5590 StringRef AliasName = cast<FunctionDecl>(D)->getIdentifier()->getName();
5591
5592 bool IsAArch64 = S.Context.getTargetInfo().getTriple().isAArch64();
5593 if ((IsAArch64 && !ArmSveAliasValid(S.Context, BuiltinID, AliasName)) ||
5594 (!IsAArch64 && !ArmMveAliasValid(BuiltinID, AliasName) &&
5595 !ArmCdeAliasValid(BuiltinID, AliasName))) {
5596 S.Diag(AL.getLoc(), diag::err_attribute_arm_builtin_alias);
5597 return;
5598 }
5599
5600 D->addAttr(::new (S.Context) ArmBuiltinAliasAttr(S.Context, AL, Ident));
5601 }
5602
RISCVAliasValid(unsigned BuiltinID,StringRef AliasName)5603 static bool RISCVAliasValid(unsigned BuiltinID, StringRef AliasName) {
5604 return BuiltinID >= RISCV::FirstRVVBuiltin &&
5605 BuiltinID <= RISCV::LastRVVBuiltin;
5606 }
5607
handleBuiltinAliasAttr(Sema & S,Decl * D,const ParsedAttr & AL)5608 static void handleBuiltinAliasAttr(Sema &S, Decl *D,
5609 const ParsedAttr &AL) {
5610 if (!AL.isArgIdent(0)) {
5611 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
5612 << AL << 1 << AANT_ArgumentIdentifier;
5613 return;
5614 }
5615
5616 IdentifierInfo *Ident = AL.getArgAsIdent(0)->Ident;
5617 unsigned BuiltinID = Ident->getBuiltinID();
5618 StringRef AliasName = cast<FunctionDecl>(D)->getIdentifier()->getName();
5619
5620 bool IsAArch64 = S.Context.getTargetInfo().getTriple().isAArch64();
5621 bool IsARM = S.Context.getTargetInfo().getTriple().isARM();
5622 bool IsRISCV = S.Context.getTargetInfo().getTriple().isRISCV();
5623 bool IsHLSL = S.Context.getLangOpts().HLSL;
5624 if ((IsAArch64 && !ArmSveAliasValid(S.Context, BuiltinID, AliasName)) ||
5625 (IsARM && !ArmMveAliasValid(BuiltinID, AliasName) &&
5626 !ArmCdeAliasValid(BuiltinID, AliasName)) ||
5627 (IsRISCV && !RISCVAliasValid(BuiltinID, AliasName)) ||
5628 (!IsAArch64 && !IsARM && !IsRISCV && !IsHLSL)) {
5629 S.Diag(AL.getLoc(), diag::err_attribute_builtin_alias) << AL;
5630 return;
5631 }
5632
5633 D->addAttr(::new (S.Context) BuiltinAliasAttr(S.Context, AL, Ident));
5634 }
5635
5636 //===----------------------------------------------------------------------===//
5637 // Checker-specific attribute handlers.
5638 //===----------------------------------------------------------------------===//
isValidSubjectOfNSReturnsRetainedAttribute(QualType QT)5639 static bool isValidSubjectOfNSReturnsRetainedAttribute(QualType QT) {
5640 return QT->isDependentType() || QT->isObjCRetainableType();
5641 }
5642
isValidSubjectOfNSAttribute(QualType QT)5643 static bool isValidSubjectOfNSAttribute(QualType QT) {
5644 return QT->isDependentType() || QT->isObjCObjectPointerType() ||
5645 QT->isObjCNSObjectType();
5646 }
5647
isValidSubjectOfCFAttribute(QualType QT)5648 static bool isValidSubjectOfCFAttribute(QualType QT) {
5649 return QT->isDependentType() || QT->isPointerType() ||
5650 isValidSubjectOfNSAttribute(QT);
5651 }
5652
isValidSubjectOfOSAttribute(QualType QT)5653 static bool isValidSubjectOfOSAttribute(QualType QT) {
5654 if (QT->isDependentType())
5655 return true;
5656 QualType PT = QT->getPointeeType();
5657 return !PT.isNull() && PT->getAsCXXRecordDecl() != nullptr;
5658 }
5659
AddXConsumedAttr(Decl * D,const AttributeCommonInfo & CI,RetainOwnershipKind K,bool IsTemplateInstantiation)5660 void Sema::AddXConsumedAttr(Decl *D, const AttributeCommonInfo &CI,
5661 RetainOwnershipKind K,
5662 bool IsTemplateInstantiation) {
5663 ValueDecl *VD = cast<ValueDecl>(D);
5664 switch (K) {
5665 case RetainOwnershipKind::OS:
5666 handleSimpleAttributeOrDiagnose<OSConsumedAttr>(
5667 *this, VD, CI, isValidSubjectOfOSAttribute(VD->getType()),
5668 diag::warn_ns_attribute_wrong_parameter_type,
5669 /*ExtraArgs=*/CI.getRange(), "os_consumed", /*pointers*/ 1);
5670 return;
5671 case RetainOwnershipKind::NS:
5672 handleSimpleAttributeOrDiagnose<NSConsumedAttr>(
5673 *this, VD, CI, isValidSubjectOfNSAttribute(VD->getType()),
5674
5675 // These attributes are normally just advisory, but in ARC, ns_consumed
5676 // is significant. Allow non-dependent code to contain inappropriate
5677 // attributes even in ARC, but require template instantiations to be
5678 // set up correctly.
5679 ((IsTemplateInstantiation && getLangOpts().ObjCAutoRefCount)
5680 ? diag::err_ns_attribute_wrong_parameter_type
5681 : diag::warn_ns_attribute_wrong_parameter_type),
5682 /*ExtraArgs=*/CI.getRange(), "ns_consumed", /*objc pointers*/ 0);
5683 return;
5684 case RetainOwnershipKind::CF:
5685 handleSimpleAttributeOrDiagnose<CFConsumedAttr>(
5686 *this, VD, CI, isValidSubjectOfCFAttribute(VD->getType()),
5687 diag::warn_ns_attribute_wrong_parameter_type,
5688 /*ExtraArgs=*/CI.getRange(), "cf_consumed", /*pointers*/ 1);
5689 return;
5690 }
5691 }
5692
5693 static Sema::RetainOwnershipKind
parsedAttrToRetainOwnershipKind(const ParsedAttr & AL)5694 parsedAttrToRetainOwnershipKind(const ParsedAttr &AL) {
5695 switch (AL.getKind()) {
5696 case ParsedAttr::AT_CFConsumed:
5697 case ParsedAttr::AT_CFReturnsRetained:
5698 case ParsedAttr::AT_CFReturnsNotRetained:
5699 return Sema::RetainOwnershipKind::CF;
5700 case ParsedAttr::AT_OSConsumesThis:
5701 case ParsedAttr::AT_OSConsumed:
5702 case ParsedAttr::AT_OSReturnsRetained:
5703 case ParsedAttr::AT_OSReturnsNotRetained:
5704 case ParsedAttr::AT_OSReturnsRetainedOnZero:
5705 case ParsedAttr::AT_OSReturnsRetainedOnNonZero:
5706 return Sema::RetainOwnershipKind::OS;
5707 case ParsedAttr::AT_NSConsumesSelf:
5708 case ParsedAttr::AT_NSConsumed:
5709 case ParsedAttr::AT_NSReturnsRetained:
5710 case ParsedAttr::AT_NSReturnsNotRetained:
5711 case ParsedAttr::AT_NSReturnsAutoreleased:
5712 return Sema::RetainOwnershipKind::NS;
5713 default:
5714 llvm_unreachable("Wrong argument supplied");
5715 }
5716 }
5717
checkNSReturnsRetainedReturnType(SourceLocation Loc,QualType QT)5718 bool Sema::checkNSReturnsRetainedReturnType(SourceLocation Loc, QualType QT) {
5719 if (isValidSubjectOfNSReturnsRetainedAttribute(QT))
5720 return false;
5721
5722 Diag(Loc, diag::warn_ns_attribute_wrong_return_type)
5723 << "'ns_returns_retained'" << 0 << 0;
5724 return true;
5725 }
5726
5727 /// \return whether the parameter is a pointer to OSObject pointer.
isValidOSObjectOutParameter(const Decl * D)5728 static bool isValidOSObjectOutParameter(const Decl *D) {
5729 const auto *PVD = dyn_cast<ParmVarDecl>(D);
5730 if (!PVD)
5731 return false;
5732 QualType QT = PVD->getType();
5733 QualType PT = QT->getPointeeType();
5734 return !PT.isNull() && isValidSubjectOfOSAttribute(PT);
5735 }
5736
handleXReturnsXRetainedAttr(Sema & S,Decl * D,const ParsedAttr & AL)5737 static void handleXReturnsXRetainedAttr(Sema &S, Decl *D,
5738 const ParsedAttr &AL) {
5739 QualType ReturnType;
5740 Sema::RetainOwnershipKind K = parsedAttrToRetainOwnershipKind(AL);
5741
5742 if (const auto *MD = dyn_cast<ObjCMethodDecl>(D)) {
5743 ReturnType = MD->getReturnType();
5744 } else if (S.getLangOpts().ObjCAutoRefCount && hasDeclarator(D) &&
5745 (AL.getKind() == ParsedAttr::AT_NSReturnsRetained)) {
5746 return; // ignore: was handled as a type attribute
5747 } else if (const auto *PD = dyn_cast<ObjCPropertyDecl>(D)) {
5748 ReturnType = PD->getType();
5749 } else if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
5750 ReturnType = FD->getReturnType();
5751 } else if (const auto *Param = dyn_cast<ParmVarDecl>(D)) {
5752 // Attributes on parameters are used for out-parameters,
5753 // passed as pointers-to-pointers.
5754 unsigned DiagID = K == Sema::RetainOwnershipKind::CF
5755 ? /*pointer-to-CF-pointer*/2
5756 : /*pointer-to-OSObject-pointer*/3;
5757 ReturnType = Param->getType()->getPointeeType();
5758 if (ReturnType.isNull()) {
5759 S.Diag(D->getBeginLoc(), diag::warn_ns_attribute_wrong_parameter_type)
5760 << AL << DiagID << AL.getRange();
5761 return;
5762 }
5763 } else if (AL.isUsedAsTypeAttr()) {
5764 return;
5765 } else {
5766 AttributeDeclKind ExpectedDeclKind;
5767 switch (AL.getKind()) {
5768 default: llvm_unreachable("invalid ownership attribute");
5769 case ParsedAttr::AT_NSReturnsRetained:
5770 case ParsedAttr::AT_NSReturnsAutoreleased:
5771 case ParsedAttr::AT_NSReturnsNotRetained:
5772 ExpectedDeclKind = ExpectedFunctionOrMethod;
5773 break;
5774
5775 case ParsedAttr::AT_OSReturnsRetained:
5776 case ParsedAttr::AT_OSReturnsNotRetained:
5777 case ParsedAttr::AT_CFReturnsRetained:
5778 case ParsedAttr::AT_CFReturnsNotRetained:
5779 ExpectedDeclKind = ExpectedFunctionMethodOrParameter;
5780 break;
5781 }
5782 S.Diag(D->getBeginLoc(), diag::warn_attribute_wrong_decl_type)
5783 << AL.getRange() << AL << ExpectedDeclKind;
5784 return;
5785 }
5786
5787 bool TypeOK;
5788 bool Cf;
5789 unsigned ParmDiagID = 2; // Pointer-to-CF-pointer
5790 switch (AL.getKind()) {
5791 default: llvm_unreachable("invalid ownership attribute");
5792 case ParsedAttr::AT_NSReturnsRetained:
5793 TypeOK = isValidSubjectOfNSReturnsRetainedAttribute(ReturnType);
5794 Cf = false;
5795 break;
5796
5797 case ParsedAttr::AT_NSReturnsAutoreleased:
5798 case ParsedAttr::AT_NSReturnsNotRetained:
5799 TypeOK = isValidSubjectOfNSAttribute(ReturnType);
5800 Cf = false;
5801 break;
5802
5803 case ParsedAttr::AT_CFReturnsRetained:
5804 case ParsedAttr::AT_CFReturnsNotRetained:
5805 TypeOK = isValidSubjectOfCFAttribute(ReturnType);
5806 Cf = true;
5807 break;
5808
5809 case ParsedAttr::AT_OSReturnsRetained:
5810 case ParsedAttr::AT_OSReturnsNotRetained:
5811 TypeOK = isValidSubjectOfOSAttribute(ReturnType);
5812 Cf = true;
5813 ParmDiagID = 3; // Pointer-to-OSObject-pointer
5814 break;
5815 }
5816
5817 if (!TypeOK) {
5818 if (AL.isUsedAsTypeAttr())
5819 return;
5820
5821 if (isa<ParmVarDecl>(D)) {
5822 S.Diag(D->getBeginLoc(), diag::warn_ns_attribute_wrong_parameter_type)
5823 << AL << ParmDiagID << AL.getRange();
5824 } else {
5825 // Needs to be kept in sync with warn_ns_attribute_wrong_return_type.
5826 enum : unsigned {
5827 Function,
5828 Method,
5829 Property
5830 } SubjectKind = Function;
5831 if (isa<ObjCMethodDecl>(D))
5832 SubjectKind = Method;
5833 else if (isa<ObjCPropertyDecl>(D))
5834 SubjectKind = Property;
5835 S.Diag(D->getBeginLoc(), diag::warn_ns_attribute_wrong_return_type)
5836 << AL << SubjectKind << Cf << AL.getRange();
5837 }
5838 return;
5839 }
5840
5841 switch (AL.getKind()) {
5842 default:
5843 llvm_unreachable("invalid ownership attribute");
5844 case ParsedAttr::AT_NSReturnsAutoreleased:
5845 handleSimpleAttribute<NSReturnsAutoreleasedAttr>(S, D, AL);
5846 return;
5847 case ParsedAttr::AT_CFReturnsNotRetained:
5848 handleSimpleAttribute<CFReturnsNotRetainedAttr>(S, D, AL);
5849 return;
5850 case ParsedAttr::AT_NSReturnsNotRetained:
5851 handleSimpleAttribute<NSReturnsNotRetainedAttr>(S, D, AL);
5852 return;
5853 case ParsedAttr::AT_CFReturnsRetained:
5854 handleSimpleAttribute<CFReturnsRetainedAttr>(S, D, AL);
5855 return;
5856 case ParsedAttr::AT_NSReturnsRetained:
5857 handleSimpleAttribute<NSReturnsRetainedAttr>(S, D, AL);
5858 return;
5859 case ParsedAttr::AT_OSReturnsRetained:
5860 handleSimpleAttribute<OSReturnsRetainedAttr>(S, D, AL);
5861 return;
5862 case ParsedAttr::AT_OSReturnsNotRetained:
5863 handleSimpleAttribute<OSReturnsNotRetainedAttr>(S, D, AL);
5864 return;
5865 };
5866 }
5867
handleObjCReturnsInnerPointerAttr(Sema & S,Decl * D,const ParsedAttr & Attrs)5868 static void handleObjCReturnsInnerPointerAttr(Sema &S, Decl *D,
5869 const ParsedAttr &Attrs) {
5870 const int EP_ObjCMethod = 1;
5871 const int EP_ObjCProperty = 2;
5872
5873 SourceLocation loc = Attrs.getLoc();
5874 QualType resultType;
5875 if (isa<ObjCMethodDecl>(D))
5876 resultType = cast<ObjCMethodDecl>(D)->getReturnType();
5877 else
5878 resultType = cast<ObjCPropertyDecl>(D)->getType();
5879
5880 if (!resultType->isReferenceType() &&
5881 (!resultType->isPointerType() || resultType->isObjCRetainableType())) {
5882 S.Diag(D->getBeginLoc(), diag::warn_ns_attribute_wrong_return_type)
5883 << SourceRange(loc) << Attrs
5884 << (isa<ObjCMethodDecl>(D) ? EP_ObjCMethod : EP_ObjCProperty)
5885 << /*non-retainable pointer*/ 2;
5886
5887 // Drop the attribute.
5888 return;
5889 }
5890
5891 D->addAttr(::new (S.Context) ObjCReturnsInnerPointerAttr(S.Context, Attrs));
5892 }
5893
handleObjCRequiresSuperAttr(Sema & S,Decl * D,const ParsedAttr & Attrs)5894 static void handleObjCRequiresSuperAttr(Sema &S, Decl *D,
5895 const ParsedAttr &Attrs) {
5896 const auto *Method = cast<ObjCMethodDecl>(D);
5897
5898 const DeclContext *DC = Method->getDeclContext();
5899 if (const auto *PDecl = dyn_cast_or_null<ObjCProtocolDecl>(DC)) {
5900 S.Diag(D->getBeginLoc(), diag::warn_objc_requires_super_protocol) << Attrs
5901 << 0;
5902 S.Diag(PDecl->getLocation(), diag::note_protocol_decl);
5903 return;
5904 }
5905 if (Method->getMethodFamily() == OMF_dealloc) {
5906 S.Diag(D->getBeginLoc(), diag::warn_objc_requires_super_protocol) << Attrs
5907 << 1;
5908 return;
5909 }
5910
5911 D->addAttr(::new (S.Context) ObjCRequiresSuperAttr(S.Context, Attrs));
5912 }
5913
handleNSErrorDomain(Sema & S,Decl * D,const ParsedAttr & AL)5914 static void handleNSErrorDomain(Sema &S, Decl *D, const ParsedAttr &AL) {
5915 auto *E = AL.getArgAsExpr(0);
5916 auto Loc = E ? E->getBeginLoc() : AL.getLoc();
5917
5918 auto *DRE = dyn_cast<DeclRefExpr>(AL.getArgAsExpr(0));
5919 if (!DRE) {
5920 S.Diag(Loc, diag::err_nserrordomain_invalid_decl) << 0;
5921 return;
5922 }
5923
5924 auto *VD = dyn_cast<VarDecl>(DRE->getDecl());
5925 if (!VD) {
5926 S.Diag(Loc, diag::err_nserrordomain_invalid_decl) << 1 << DRE->getDecl();
5927 return;
5928 }
5929
5930 if (!isNSStringType(VD->getType(), S.Context) &&
5931 !isCFStringType(VD->getType(), S.Context)) {
5932 S.Diag(Loc, diag::err_nserrordomain_wrong_type) << VD;
5933 return;
5934 }
5935
5936 D->addAttr(::new (S.Context) NSErrorDomainAttr(S.Context, AL, VD));
5937 }
5938
handleObjCBridgeAttr(Sema & S,Decl * D,const ParsedAttr & AL)5939 static void handleObjCBridgeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
5940 IdentifierLoc *Parm = AL.isArgIdent(0) ? AL.getArgAsIdent(0) : nullptr;
5941
5942 if (!Parm) {
5943 S.Diag(D->getBeginLoc(), diag::err_objc_attr_not_id) << AL << 0;
5944 return;
5945 }
5946
5947 // Typedefs only allow objc_bridge(id) and have some additional checking.
5948 if (const auto *TD = dyn_cast<TypedefNameDecl>(D)) {
5949 if (!Parm->Ident->isStr("id")) {
5950 S.Diag(AL.getLoc(), diag::err_objc_attr_typedef_not_id) << AL;
5951 return;
5952 }
5953
5954 // Only allow 'cv void *'.
5955 QualType T = TD->getUnderlyingType();
5956 if (!T->isVoidPointerType()) {
5957 S.Diag(AL.getLoc(), diag::err_objc_attr_typedef_not_void_pointer);
5958 return;
5959 }
5960 }
5961
5962 D->addAttr(::new (S.Context) ObjCBridgeAttr(S.Context, AL, Parm->Ident));
5963 }
5964
handleObjCBridgeMutableAttr(Sema & S,Decl * D,const ParsedAttr & AL)5965 static void handleObjCBridgeMutableAttr(Sema &S, Decl *D,
5966 const ParsedAttr &AL) {
5967 IdentifierLoc *Parm = AL.isArgIdent(0) ? AL.getArgAsIdent(0) : nullptr;
5968
5969 if (!Parm) {
5970 S.Diag(D->getBeginLoc(), diag::err_objc_attr_not_id) << AL << 0;
5971 return;
5972 }
5973
5974 D->addAttr(::new (S.Context)
5975 ObjCBridgeMutableAttr(S.Context, AL, Parm->Ident));
5976 }
5977
handleObjCBridgeRelatedAttr(Sema & S,Decl * D,const ParsedAttr & AL)5978 static void handleObjCBridgeRelatedAttr(Sema &S, Decl *D,
5979 const ParsedAttr &AL) {
5980 IdentifierInfo *RelatedClass =
5981 AL.isArgIdent(0) ? AL.getArgAsIdent(0)->Ident : nullptr;
5982 if (!RelatedClass) {
5983 S.Diag(D->getBeginLoc(), diag::err_objc_attr_not_id) << AL << 0;
5984 return;
5985 }
5986 IdentifierInfo *ClassMethod =
5987 AL.getArgAsIdent(1) ? AL.getArgAsIdent(1)->Ident : nullptr;
5988 IdentifierInfo *InstanceMethod =
5989 AL.getArgAsIdent(2) ? AL.getArgAsIdent(2)->Ident : nullptr;
5990 D->addAttr(::new (S.Context) ObjCBridgeRelatedAttr(
5991 S.Context, AL, RelatedClass, ClassMethod, InstanceMethod));
5992 }
5993
handleObjCDesignatedInitializer(Sema & S,Decl * D,const ParsedAttr & AL)5994 static void handleObjCDesignatedInitializer(Sema &S, Decl *D,
5995 const ParsedAttr &AL) {
5996 DeclContext *Ctx = D->getDeclContext();
5997
5998 // This attribute can only be applied to methods in interfaces or class
5999 // extensions.
6000 if (!isa<ObjCInterfaceDecl>(Ctx) &&
6001 !(isa<ObjCCategoryDecl>(Ctx) &&
6002 cast<ObjCCategoryDecl>(Ctx)->IsClassExtension())) {
6003 S.Diag(D->getLocation(), diag::err_designated_init_attr_non_init);
6004 return;
6005 }
6006
6007 ObjCInterfaceDecl *IFace;
6008 if (auto *CatDecl = dyn_cast<ObjCCategoryDecl>(Ctx))
6009 IFace = CatDecl->getClassInterface();
6010 else
6011 IFace = cast<ObjCInterfaceDecl>(Ctx);
6012
6013 if (!IFace)
6014 return;
6015
6016 IFace->setHasDesignatedInitializers();
6017 D->addAttr(::new (S.Context) ObjCDesignatedInitializerAttr(S.Context, AL));
6018 }
6019
handleObjCRuntimeName(Sema & S,Decl * D,const ParsedAttr & AL)6020 static void handleObjCRuntimeName(Sema &S, Decl *D, const ParsedAttr &AL) {
6021 StringRef MetaDataName;
6022 if (!S.checkStringLiteralArgumentAttr(AL, 0, MetaDataName))
6023 return;
6024 D->addAttr(::new (S.Context)
6025 ObjCRuntimeNameAttr(S.Context, AL, MetaDataName));
6026 }
6027
6028 // When a user wants to use objc_boxable with a union or struct
6029 // but they don't have access to the declaration (legacy/third-party code)
6030 // then they can 'enable' this feature with a typedef:
6031 // typedef struct __attribute((objc_boxable)) legacy_struct legacy_struct;
handleObjCBoxable(Sema & S,Decl * D,const ParsedAttr & AL)6032 static void handleObjCBoxable(Sema &S, Decl *D, const ParsedAttr &AL) {
6033 bool notify = false;
6034
6035 auto *RD = dyn_cast<RecordDecl>(D);
6036 if (RD && RD->getDefinition()) {
6037 RD = RD->getDefinition();
6038 notify = true;
6039 }
6040
6041 if (RD) {
6042 ObjCBoxableAttr *BoxableAttr =
6043 ::new (S.Context) ObjCBoxableAttr(S.Context, AL);
6044 RD->addAttr(BoxableAttr);
6045 if (notify) {
6046 // we need to notify ASTReader/ASTWriter about
6047 // modification of existing declaration
6048 if (ASTMutationListener *L = S.getASTMutationListener())
6049 L->AddedAttributeToRecord(BoxableAttr, RD);
6050 }
6051 }
6052 }
6053
handleObjCOwnershipAttr(Sema & S,Decl * D,const ParsedAttr & AL)6054 static void handleObjCOwnershipAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6055 if (hasDeclarator(D)) return;
6056
6057 S.Diag(D->getBeginLoc(), diag::err_attribute_wrong_decl_type)
6058 << AL.getRange() << AL << ExpectedVariable;
6059 }
6060
handleObjCPreciseLifetimeAttr(Sema & S,Decl * D,const ParsedAttr & AL)6061 static void handleObjCPreciseLifetimeAttr(Sema &S, Decl *D,
6062 const ParsedAttr &AL) {
6063 const auto *VD = cast<ValueDecl>(D);
6064 QualType QT = VD->getType();
6065
6066 if (!QT->isDependentType() &&
6067 !QT->isObjCLifetimeType()) {
6068 S.Diag(AL.getLoc(), diag::err_objc_precise_lifetime_bad_type)
6069 << QT;
6070 return;
6071 }
6072
6073 Qualifiers::ObjCLifetime Lifetime = QT.getObjCLifetime();
6074
6075 // If we have no lifetime yet, check the lifetime we're presumably
6076 // going to infer.
6077 if (Lifetime == Qualifiers::OCL_None && !QT->isDependentType())
6078 Lifetime = QT->getObjCARCImplicitLifetime();
6079
6080 switch (Lifetime) {
6081 case Qualifiers::OCL_None:
6082 assert(QT->isDependentType() &&
6083 "didn't infer lifetime for non-dependent type?");
6084 break;
6085
6086 case Qualifiers::OCL_Weak: // meaningful
6087 case Qualifiers::OCL_Strong: // meaningful
6088 break;
6089
6090 case Qualifiers::OCL_ExplicitNone:
6091 case Qualifiers::OCL_Autoreleasing:
6092 S.Diag(AL.getLoc(), diag::warn_objc_precise_lifetime_meaningless)
6093 << (Lifetime == Qualifiers::OCL_Autoreleasing);
6094 break;
6095 }
6096
6097 D->addAttr(::new (S.Context) ObjCPreciseLifetimeAttr(S.Context, AL));
6098 }
6099
handleSwiftAttrAttr(Sema & S,Decl * D,const ParsedAttr & AL)6100 static void handleSwiftAttrAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6101 // Make sure that there is a string literal as the annotation's single
6102 // argument.
6103 StringRef Str;
6104 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str))
6105 return;
6106
6107 D->addAttr(::new (S.Context) SwiftAttrAttr(S.Context, AL, Str));
6108 }
6109
handleSwiftBridge(Sema & S,Decl * D,const ParsedAttr & AL)6110 static void handleSwiftBridge(Sema &S, Decl *D, const ParsedAttr &AL) {
6111 // Make sure that there is a string literal as the annotation's single
6112 // argument.
6113 StringRef BT;
6114 if (!S.checkStringLiteralArgumentAttr(AL, 0, BT))
6115 return;
6116
6117 // Warn about duplicate attributes if they have different arguments, but drop
6118 // any duplicate attributes regardless.
6119 if (const auto *Other = D->getAttr<SwiftBridgeAttr>()) {
6120 if (Other->getSwiftType() != BT)
6121 S.Diag(AL.getLoc(), diag::warn_duplicate_attribute) << AL;
6122 return;
6123 }
6124
6125 D->addAttr(::new (S.Context) SwiftBridgeAttr(S.Context, AL, BT));
6126 }
6127
isErrorParameter(Sema & S,QualType QT)6128 static bool isErrorParameter(Sema &S, QualType QT) {
6129 const auto *PT = QT->getAs<PointerType>();
6130 if (!PT)
6131 return false;
6132
6133 QualType Pointee = PT->getPointeeType();
6134
6135 // Check for NSError**.
6136 if (const auto *OPT = Pointee->getAs<ObjCObjectPointerType>())
6137 if (const auto *ID = OPT->getInterfaceDecl())
6138 if (ID->getIdentifier() == S.getNSErrorIdent())
6139 return true;
6140
6141 // Check for CFError**.
6142 if (const auto *PT = Pointee->getAs<PointerType>())
6143 if (const auto *RT = PT->getPointeeType()->getAs<RecordType>())
6144 if (S.isCFError(RT->getDecl()))
6145 return true;
6146
6147 return false;
6148 }
6149
handleSwiftError(Sema & S,Decl * D,const ParsedAttr & AL)6150 static void handleSwiftError(Sema &S, Decl *D, const ParsedAttr &AL) {
6151 auto hasErrorParameter = [](Sema &S, Decl *D, const ParsedAttr &AL) -> bool {
6152 for (unsigned I = 0, E = getFunctionOrMethodNumParams(D); I != E; ++I) {
6153 if (isErrorParameter(S, getFunctionOrMethodParamType(D, I)))
6154 return true;
6155 }
6156
6157 S.Diag(AL.getLoc(), diag::err_attr_swift_error_no_error_parameter)
6158 << AL << isa<ObjCMethodDecl>(D);
6159 return false;
6160 };
6161
6162 auto hasPointerResult = [](Sema &S, Decl *D, const ParsedAttr &AL) -> bool {
6163 // - C, ObjC, and block pointers are definitely okay.
6164 // - References are definitely not okay.
6165 // - nullptr_t is weird, but acceptable.
6166 QualType RT = getFunctionOrMethodResultType(D);
6167 if (RT->hasPointerRepresentation() && !RT->isReferenceType())
6168 return true;
6169
6170 S.Diag(AL.getLoc(), diag::err_attr_swift_error_return_type)
6171 << AL << AL.getArgAsIdent(0)->Ident->getName() << isa<ObjCMethodDecl>(D)
6172 << /*pointer*/ 1;
6173 return false;
6174 };
6175
6176 auto hasIntegerResult = [](Sema &S, Decl *D, const ParsedAttr &AL) -> bool {
6177 QualType RT = getFunctionOrMethodResultType(D);
6178 if (RT->isIntegralType(S.Context))
6179 return true;
6180
6181 S.Diag(AL.getLoc(), diag::err_attr_swift_error_return_type)
6182 << AL << AL.getArgAsIdent(0)->Ident->getName() << isa<ObjCMethodDecl>(D)
6183 << /*integral*/ 0;
6184 return false;
6185 };
6186
6187 if (D->isInvalidDecl())
6188 return;
6189
6190 IdentifierLoc *Loc = AL.getArgAsIdent(0);
6191 SwiftErrorAttr::ConventionKind Convention;
6192 if (!SwiftErrorAttr::ConvertStrToConventionKind(Loc->Ident->getName(),
6193 Convention)) {
6194 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported)
6195 << AL << Loc->Ident;
6196 return;
6197 }
6198
6199 switch (Convention) {
6200 case SwiftErrorAttr::None:
6201 // No additional validation required.
6202 break;
6203
6204 case SwiftErrorAttr::NonNullError:
6205 if (!hasErrorParameter(S, D, AL))
6206 return;
6207 break;
6208
6209 case SwiftErrorAttr::NullResult:
6210 if (!hasErrorParameter(S, D, AL) || !hasPointerResult(S, D, AL))
6211 return;
6212 break;
6213
6214 case SwiftErrorAttr::NonZeroResult:
6215 case SwiftErrorAttr::ZeroResult:
6216 if (!hasErrorParameter(S, D, AL) || !hasIntegerResult(S, D, AL))
6217 return;
6218 break;
6219 }
6220
6221 D->addAttr(::new (S.Context) SwiftErrorAttr(S.Context, AL, Convention));
6222 }
6223
checkSwiftAsyncErrorBlock(Sema & S,Decl * D,const SwiftAsyncErrorAttr * ErrorAttr,const SwiftAsyncAttr * AsyncAttr)6224 static void checkSwiftAsyncErrorBlock(Sema &S, Decl *D,
6225 const SwiftAsyncErrorAttr *ErrorAttr,
6226 const SwiftAsyncAttr *AsyncAttr) {
6227 if (AsyncAttr->getKind() == SwiftAsyncAttr::None) {
6228 if (ErrorAttr->getConvention() != SwiftAsyncErrorAttr::None) {
6229 S.Diag(AsyncAttr->getLocation(),
6230 diag::err_swift_async_error_without_swift_async)
6231 << AsyncAttr << isa<ObjCMethodDecl>(D);
6232 }
6233 return;
6234 }
6235
6236 const ParmVarDecl *HandlerParam = getFunctionOrMethodParam(
6237 D, AsyncAttr->getCompletionHandlerIndex().getASTIndex());
6238 // handleSwiftAsyncAttr already verified the type is correct, so no need to
6239 // double-check it here.
6240 const auto *FuncTy = HandlerParam->getType()
6241 ->castAs<BlockPointerType>()
6242 ->getPointeeType()
6243 ->getAs<FunctionProtoType>();
6244 ArrayRef<QualType> BlockParams;
6245 if (FuncTy)
6246 BlockParams = FuncTy->getParamTypes();
6247
6248 switch (ErrorAttr->getConvention()) {
6249 case SwiftAsyncErrorAttr::ZeroArgument:
6250 case SwiftAsyncErrorAttr::NonZeroArgument: {
6251 uint32_t ParamIdx = ErrorAttr->getHandlerParamIdx();
6252 if (ParamIdx == 0 || ParamIdx > BlockParams.size()) {
6253 S.Diag(ErrorAttr->getLocation(),
6254 diag::err_attribute_argument_out_of_bounds) << ErrorAttr << 2;
6255 return;
6256 }
6257 QualType ErrorParam = BlockParams[ParamIdx - 1];
6258 if (!ErrorParam->isIntegralType(S.Context)) {
6259 StringRef ConvStr =
6260 ErrorAttr->getConvention() == SwiftAsyncErrorAttr::ZeroArgument
6261 ? "zero_argument"
6262 : "nonzero_argument";
6263 S.Diag(ErrorAttr->getLocation(), diag::err_swift_async_error_non_integral)
6264 << ErrorAttr << ConvStr << ParamIdx << ErrorParam;
6265 return;
6266 }
6267 break;
6268 }
6269 case SwiftAsyncErrorAttr::NonNullError: {
6270 bool AnyErrorParams = false;
6271 for (QualType Param : BlockParams) {
6272 // Check for NSError *.
6273 if (const auto *ObjCPtrTy = Param->getAs<ObjCObjectPointerType>()) {
6274 if (const auto *ID = ObjCPtrTy->getInterfaceDecl()) {
6275 if (ID->getIdentifier() == S.getNSErrorIdent()) {
6276 AnyErrorParams = true;
6277 break;
6278 }
6279 }
6280 }
6281 // Check for CFError *.
6282 if (const auto *PtrTy = Param->getAs<PointerType>()) {
6283 if (const auto *RT = PtrTy->getPointeeType()->getAs<RecordType>()) {
6284 if (S.isCFError(RT->getDecl())) {
6285 AnyErrorParams = true;
6286 break;
6287 }
6288 }
6289 }
6290 }
6291
6292 if (!AnyErrorParams) {
6293 S.Diag(ErrorAttr->getLocation(),
6294 diag::err_swift_async_error_no_error_parameter)
6295 << ErrorAttr << isa<ObjCMethodDecl>(D);
6296 return;
6297 }
6298 break;
6299 }
6300 case SwiftAsyncErrorAttr::None:
6301 break;
6302 }
6303 }
6304
handleSwiftAsyncError(Sema & S,Decl * D,const ParsedAttr & AL)6305 static void handleSwiftAsyncError(Sema &S, Decl *D, const ParsedAttr &AL) {
6306 IdentifierLoc *IDLoc = AL.getArgAsIdent(0);
6307 SwiftAsyncErrorAttr::ConventionKind ConvKind;
6308 if (!SwiftAsyncErrorAttr::ConvertStrToConventionKind(IDLoc->Ident->getName(),
6309 ConvKind)) {
6310 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported)
6311 << AL << IDLoc->Ident;
6312 return;
6313 }
6314
6315 uint32_t ParamIdx = 0;
6316 switch (ConvKind) {
6317 case SwiftAsyncErrorAttr::ZeroArgument:
6318 case SwiftAsyncErrorAttr::NonZeroArgument: {
6319 if (!AL.checkExactlyNumArgs(S, 2))
6320 return;
6321
6322 Expr *IdxExpr = AL.getArgAsExpr(1);
6323 if (!checkUInt32Argument(S, AL, IdxExpr, ParamIdx))
6324 return;
6325 break;
6326 }
6327 case SwiftAsyncErrorAttr::NonNullError:
6328 case SwiftAsyncErrorAttr::None: {
6329 if (!AL.checkExactlyNumArgs(S, 1))
6330 return;
6331 break;
6332 }
6333 }
6334
6335 auto *ErrorAttr =
6336 ::new (S.Context) SwiftAsyncErrorAttr(S.Context, AL, ConvKind, ParamIdx);
6337 D->addAttr(ErrorAttr);
6338
6339 if (auto *AsyncAttr = D->getAttr<SwiftAsyncAttr>())
6340 checkSwiftAsyncErrorBlock(S, D, ErrorAttr, AsyncAttr);
6341 }
6342
6343 // For a function, this will validate a compound Swift name, e.g.
6344 // <code>init(foo:bar:baz:)</code> or <code>controllerForName(_:)</code>, and
6345 // the function will output the number of parameter names, and whether this is a
6346 // single-arg initializer.
6347 //
6348 // For a type, enum constant, property, or variable declaration, this will
6349 // validate either a simple identifier, or a qualified
6350 // <code>context.identifier</code> name.
6351 static bool
validateSwiftFunctionName(Sema & S,const ParsedAttr & AL,SourceLocation Loc,StringRef Name,unsigned & SwiftParamCount,bool & IsSingleParamInit)6352 validateSwiftFunctionName(Sema &S, const ParsedAttr &AL, SourceLocation Loc,
6353 StringRef Name, unsigned &SwiftParamCount,
6354 bool &IsSingleParamInit) {
6355 SwiftParamCount = 0;
6356 IsSingleParamInit = false;
6357
6358 // Check whether this will be mapped to a getter or setter of a property.
6359 bool IsGetter = false, IsSetter = false;
6360 if (Name.startswith("getter:")) {
6361 IsGetter = true;
6362 Name = Name.substr(7);
6363 } else if (Name.startswith("setter:")) {
6364 IsSetter = true;
6365 Name = Name.substr(7);
6366 }
6367
6368 if (Name.back() != ')') {
6369 S.Diag(Loc, diag::warn_attr_swift_name_function) << AL;
6370 return false;
6371 }
6372
6373 bool IsMember = false;
6374 StringRef ContextName, BaseName, Parameters;
6375
6376 std::tie(BaseName, Parameters) = Name.split('(');
6377
6378 // Split at the first '.', if it exists, which separates the context name
6379 // from the base name.
6380 std::tie(ContextName, BaseName) = BaseName.split('.');
6381 if (BaseName.empty()) {
6382 BaseName = ContextName;
6383 ContextName = StringRef();
6384 } else if (ContextName.empty() || !isValidAsciiIdentifier(ContextName)) {
6385 S.Diag(Loc, diag::warn_attr_swift_name_invalid_identifier)
6386 << AL << /*context*/ 1;
6387 return false;
6388 } else {
6389 IsMember = true;
6390 }
6391
6392 if (!isValidAsciiIdentifier(BaseName) || BaseName == "_") {
6393 S.Diag(Loc, diag::warn_attr_swift_name_invalid_identifier)
6394 << AL << /*basename*/ 0;
6395 return false;
6396 }
6397
6398 bool IsSubscript = BaseName == "subscript";
6399 // A subscript accessor must be a getter or setter.
6400 if (IsSubscript && !IsGetter && !IsSetter) {
6401 S.Diag(Loc, diag::warn_attr_swift_name_subscript_invalid_parameter)
6402 << AL << /* getter or setter */ 0;
6403 return false;
6404 }
6405
6406 if (Parameters.empty()) {
6407 S.Diag(Loc, diag::warn_attr_swift_name_missing_parameters) << AL;
6408 return false;
6409 }
6410
6411 assert(Parameters.back() == ')' && "expected ')'");
6412 Parameters = Parameters.drop_back(); // ')'
6413
6414 if (Parameters.empty()) {
6415 // Setters and subscripts must have at least one parameter.
6416 if (IsSubscript) {
6417 S.Diag(Loc, diag::warn_attr_swift_name_subscript_invalid_parameter)
6418 << AL << /* have at least one parameter */1;
6419 return false;
6420 }
6421
6422 if (IsSetter) {
6423 S.Diag(Loc, diag::warn_attr_swift_name_setter_parameters) << AL;
6424 return false;
6425 }
6426
6427 return true;
6428 }
6429
6430 if (Parameters.back() != ':') {
6431 S.Diag(Loc, diag::warn_attr_swift_name_function) << AL;
6432 return false;
6433 }
6434
6435 StringRef CurrentParam;
6436 llvm::Optional<unsigned> SelfLocation;
6437 unsigned NewValueCount = 0;
6438 llvm::Optional<unsigned> NewValueLocation;
6439 do {
6440 std::tie(CurrentParam, Parameters) = Parameters.split(':');
6441
6442 if (!isValidAsciiIdentifier(CurrentParam)) {
6443 S.Diag(Loc, diag::warn_attr_swift_name_invalid_identifier)
6444 << AL << /*parameter*/2;
6445 return false;
6446 }
6447
6448 if (IsMember && CurrentParam == "self") {
6449 // "self" indicates the "self" argument for a member.
6450
6451 // More than one "self"?
6452 if (SelfLocation) {
6453 S.Diag(Loc, diag::warn_attr_swift_name_multiple_selfs) << AL;
6454 return false;
6455 }
6456
6457 // The "self" location is the current parameter.
6458 SelfLocation = SwiftParamCount;
6459 } else if (CurrentParam == "newValue") {
6460 // "newValue" indicates the "newValue" argument for a setter.
6461
6462 // There should only be one 'newValue', but it's only significant for
6463 // subscript accessors, so don't error right away.
6464 ++NewValueCount;
6465
6466 NewValueLocation = SwiftParamCount;
6467 }
6468
6469 ++SwiftParamCount;
6470 } while (!Parameters.empty());
6471
6472 // Only instance subscripts are currently supported.
6473 if (IsSubscript && !SelfLocation) {
6474 S.Diag(Loc, diag::warn_attr_swift_name_subscript_invalid_parameter)
6475 << AL << /*have a 'self:' parameter*/2;
6476 return false;
6477 }
6478
6479 IsSingleParamInit =
6480 SwiftParamCount == 1 && BaseName == "init" && CurrentParam != "_";
6481
6482 // Check the number of parameters for a getter/setter.
6483 if (IsGetter || IsSetter) {
6484 // Setters have one parameter for the new value.
6485 unsigned NumExpectedParams = IsGetter ? 0 : 1;
6486 unsigned ParamDiag =
6487 IsGetter ? diag::warn_attr_swift_name_getter_parameters
6488 : diag::warn_attr_swift_name_setter_parameters;
6489
6490 // Instance methods have one parameter for "self".
6491 if (SelfLocation)
6492 ++NumExpectedParams;
6493
6494 // Subscripts may have additional parameters beyond the expected params for
6495 // the index.
6496 if (IsSubscript) {
6497 if (SwiftParamCount < NumExpectedParams) {
6498 S.Diag(Loc, ParamDiag) << AL;
6499 return false;
6500 }
6501
6502 // A subscript setter must explicitly label its newValue parameter to
6503 // distinguish it from index parameters.
6504 if (IsSetter) {
6505 if (!NewValueLocation) {
6506 S.Diag(Loc, diag::warn_attr_swift_name_subscript_setter_no_newValue)
6507 << AL;
6508 return false;
6509 }
6510 if (NewValueCount > 1) {
6511 S.Diag(Loc, diag::warn_attr_swift_name_subscript_setter_multiple_newValues)
6512 << AL;
6513 return false;
6514 }
6515 } else {
6516 // Subscript getters should have no 'newValue:' parameter.
6517 if (NewValueLocation) {
6518 S.Diag(Loc, diag::warn_attr_swift_name_subscript_getter_newValue)
6519 << AL;
6520 return false;
6521 }
6522 }
6523 } else {
6524 // Property accessors must have exactly the number of expected params.
6525 if (SwiftParamCount != NumExpectedParams) {
6526 S.Diag(Loc, ParamDiag) << AL;
6527 return false;
6528 }
6529 }
6530 }
6531
6532 return true;
6533 }
6534
DiagnoseSwiftName(Decl * D,StringRef Name,SourceLocation Loc,const ParsedAttr & AL,bool IsAsync)6535 bool Sema::DiagnoseSwiftName(Decl *D, StringRef Name, SourceLocation Loc,
6536 const ParsedAttr &AL, bool IsAsync) {
6537 if (isa<ObjCMethodDecl>(D) || isa<FunctionDecl>(D)) {
6538 ArrayRef<ParmVarDecl*> Params;
6539 unsigned ParamCount;
6540
6541 if (const auto *Method = dyn_cast<ObjCMethodDecl>(D)) {
6542 ParamCount = Method->getSelector().getNumArgs();
6543 Params = Method->parameters().slice(0, ParamCount);
6544 } else {
6545 const auto *F = cast<FunctionDecl>(D);
6546
6547 ParamCount = F->getNumParams();
6548 Params = F->parameters();
6549
6550 if (!F->hasWrittenPrototype()) {
6551 Diag(Loc, diag::warn_attribute_wrong_decl_type) << AL
6552 << ExpectedFunctionWithProtoType;
6553 return false;
6554 }
6555 }
6556
6557 // The async name drops the last callback parameter.
6558 if (IsAsync) {
6559 if (ParamCount == 0) {
6560 Diag(Loc, diag::warn_attr_swift_name_decl_missing_params)
6561 << AL << isa<ObjCMethodDecl>(D);
6562 return false;
6563 }
6564 ParamCount -= 1;
6565 }
6566
6567 unsigned SwiftParamCount;
6568 bool IsSingleParamInit;
6569 if (!validateSwiftFunctionName(*this, AL, Loc, Name,
6570 SwiftParamCount, IsSingleParamInit))
6571 return false;
6572
6573 bool ParamCountValid;
6574 if (SwiftParamCount == ParamCount) {
6575 ParamCountValid = true;
6576 } else if (SwiftParamCount > ParamCount) {
6577 ParamCountValid = IsSingleParamInit && ParamCount == 0;
6578 } else {
6579 // We have fewer Swift parameters than Objective-C parameters, but that
6580 // might be because we've transformed some of them. Check for potential
6581 // "out" parameters and err on the side of not warning.
6582 unsigned MaybeOutParamCount =
6583 llvm::count_if(Params, [](const ParmVarDecl *Param) -> bool {
6584 QualType ParamTy = Param->getType();
6585 if (ParamTy->isReferenceType() || ParamTy->isPointerType())
6586 return !ParamTy->getPointeeType().isConstQualified();
6587 return false;
6588 });
6589
6590 ParamCountValid = SwiftParamCount + MaybeOutParamCount >= ParamCount;
6591 }
6592
6593 if (!ParamCountValid) {
6594 Diag(Loc, diag::warn_attr_swift_name_num_params)
6595 << (SwiftParamCount > ParamCount) << AL << ParamCount
6596 << SwiftParamCount;
6597 return false;
6598 }
6599 } else if ((isa<EnumConstantDecl>(D) || isa<ObjCProtocolDecl>(D) ||
6600 isa<ObjCInterfaceDecl>(D) || isa<ObjCPropertyDecl>(D) ||
6601 isa<VarDecl>(D) || isa<TypedefNameDecl>(D) || isa<TagDecl>(D) ||
6602 isa<IndirectFieldDecl>(D) || isa<FieldDecl>(D)) &&
6603 !IsAsync) {
6604 StringRef ContextName, BaseName;
6605
6606 std::tie(ContextName, BaseName) = Name.split('.');
6607 if (BaseName.empty()) {
6608 BaseName = ContextName;
6609 ContextName = StringRef();
6610 } else if (!isValidAsciiIdentifier(ContextName)) {
6611 Diag(Loc, diag::warn_attr_swift_name_invalid_identifier) << AL
6612 << /*context*/1;
6613 return false;
6614 }
6615
6616 if (!isValidAsciiIdentifier(BaseName)) {
6617 Diag(Loc, diag::warn_attr_swift_name_invalid_identifier) << AL
6618 << /*basename*/0;
6619 return false;
6620 }
6621 } else {
6622 Diag(Loc, diag::warn_attr_swift_name_decl_kind) << AL;
6623 return false;
6624 }
6625 return true;
6626 }
6627
handleSwiftName(Sema & S,Decl * D,const ParsedAttr & AL)6628 static void handleSwiftName(Sema &S, Decl *D, const ParsedAttr &AL) {
6629 StringRef Name;
6630 SourceLocation Loc;
6631 if (!S.checkStringLiteralArgumentAttr(AL, 0, Name, &Loc))
6632 return;
6633
6634 if (!S.DiagnoseSwiftName(D, Name, Loc, AL, /*IsAsync=*/false))
6635 return;
6636
6637 D->addAttr(::new (S.Context) SwiftNameAttr(S.Context, AL, Name));
6638 }
6639
handleSwiftAsyncName(Sema & S,Decl * D,const ParsedAttr & AL)6640 static void handleSwiftAsyncName(Sema &S, Decl *D, const ParsedAttr &AL) {
6641 StringRef Name;
6642 SourceLocation Loc;
6643 if (!S.checkStringLiteralArgumentAttr(AL, 0, Name, &Loc))
6644 return;
6645
6646 if (!S.DiagnoseSwiftName(D, Name, Loc, AL, /*IsAsync=*/true))
6647 return;
6648
6649 D->addAttr(::new (S.Context) SwiftAsyncNameAttr(S.Context, AL, Name));
6650 }
6651
handleSwiftNewType(Sema & S,Decl * D,const ParsedAttr & AL)6652 static void handleSwiftNewType(Sema &S, Decl *D, const ParsedAttr &AL) {
6653 // Make sure that there is an identifier as the annotation's single argument.
6654 if (!AL.checkExactlyNumArgs(S, 1))
6655 return;
6656
6657 if (!AL.isArgIdent(0)) {
6658 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
6659 << AL << AANT_ArgumentIdentifier;
6660 return;
6661 }
6662
6663 SwiftNewTypeAttr::NewtypeKind Kind;
6664 IdentifierInfo *II = AL.getArgAsIdent(0)->Ident;
6665 if (!SwiftNewTypeAttr::ConvertStrToNewtypeKind(II->getName(), Kind)) {
6666 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported) << AL << II;
6667 return;
6668 }
6669
6670 if (!isa<TypedefNameDecl>(D)) {
6671 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type_str)
6672 << AL << "typedefs";
6673 return;
6674 }
6675
6676 D->addAttr(::new (S.Context) SwiftNewTypeAttr(S.Context, AL, Kind));
6677 }
6678
handleSwiftAsyncAttr(Sema & S,Decl * D,const ParsedAttr & AL)6679 static void handleSwiftAsyncAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6680 if (!AL.isArgIdent(0)) {
6681 S.Diag(AL.getLoc(), diag::err_attribute_argument_n_type)
6682 << AL << 1 << AANT_ArgumentIdentifier;
6683 return;
6684 }
6685
6686 SwiftAsyncAttr::Kind Kind;
6687 IdentifierInfo *II = AL.getArgAsIdent(0)->Ident;
6688 if (!SwiftAsyncAttr::ConvertStrToKind(II->getName(), Kind)) {
6689 S.Diag(AL.getLoc(), diag::err_swift_async_no_access) << AL << II;
6690 return;
6691 }
6692
6693 ParamIdx Idx;
6694 if (Kind == SwiftAsyncAttr::None) {
6695 // If this is 'none', then there shouldn't be any additional arguments.
6696 if (!AL.checkExactlyNumArgs(S, 1))
6697 return;
6698 } else {
6699 // Non-none swift_async requires a completion handler index argument.
6700 if (!AL.checkExactlyNumArgs(S, 2))
6701 return;
6702
6703 Expr *HandlerIdx = AL.getArgAsExpr(1);
6704 if (!checkFunctionOrMethodParameterIndex(S, D, AL, 2, HandlerIdx, Idx))
6705 return;
6706
6707 const ParmVarDecl *CompletionBlock =
6708 getFunctionOrMethodParam(D, Idx.getASTIndex());
6709 QualType CompletionBlockType = CompletionBlock->getType();
6710 if (!CompletionBlockType->isBlockPointerType()) {
6711 S.Diag(CompletionBlock->getLocation(),
6712 diag::err_swift_async_bad_block_type)
6713 << CompletionBlock->getType();
6714 return;
6715 }
6716 QualType BlockTy =
6717 CompletionBlockType->castAs<BlockPointerType>()->getPointeeType();
6718 if (!BlockTy->castAs<FunctionType>()->getReturnType()->isVoidType()) {
6719 S.Diag(CompletionBlock->getLocation(),
6720 diag::err_swift_async_bad_block_type)
6721 << CompletionBlock->getType();
6722 return;
6723 }
6724 }
6725
6726 auto *AsyncAttr =
6727 ::new (S.Context) SwiftAsyncAttr(S.Context, AL, Kind, Idx);
6728 D->addAttr(AsyncAttr);
6729
6730 if (auto *ErrorAttr = D->getAttr<SwiftAsyncErrorAttr>())
6731 checkSwiftAsyncErrorBlock(S, D, ErrorAttr, AsyncAttr);
6732 }
6733
6734 //===----------------------------------------------------------------------===//
6735 // Microsoft specific attribute handlers.
6736 //===----------------------------------------------------------------------===//
6737
mergeUuidAttr(Decl * D,const AttributeCommonInfo & CI,StringRef UuidAsWritten,MSGuidDecl * GuidDecl)6738 UuidAttr *Sema::mergeUuidAttr(Decl *D, const AttributeCommonInfo &CI,
6739 StringRef UuidAsWritten, MSGuidDecl *GuidDecl) {
6740 if (const auto *UA = D->getAttr<UuidAttr>()) {
6741 if (declaresSameEntity(UA->getGuidDecl(), GuidDecl))
6742 return nullptr;
6743 if (!UA->getGuid().empty()) {
6744 Diag(UA->getLocation(), diag::err_mismatched_uuid);
6745 Diag(CI.getLoc(), diag::note_previous_uuid);
6746 D->dropAttr<UuidAttr>();
6747 }
6748 }
6749
6750 return ::new (Context) UuidAttr(Context, CI, UuidAsWritten, GuidDecl);
6751 }
6752
handleUuidAttr(Sema & S,Decl * D,const ParsedAttr & AL)6753 static void handleUuidAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6754 if (!S.LangOpts.CPlusPlus) {
6755 S.Diag(AL.getLoc(), diag::err_attribute_not_supported_in_lang)
6756 << AL << AttributeLangSupport::C;
6757 return;
6758 }
6759
6760 StringRef OrigStrRef;
6761 SourceLocation LiteralLoc;
6762 if (!S.checkStringLiteralArgumentAttr(AL, 0, OrigStrRef, &LiteralLoc))
6763 return;
6764
6765 // GUID format is "XXXXXXXX-XXXX-XXXX-XXXX-XXXXXXXXXXXX" or
6766 // "{XXXXXXXX-XXXX-XXXX-XXXX-XXXXXXXXXXXX}", normalize to the former.
6767 StringRef StrRef = OrigStrRef;
6768 if (StrRef.size() == 38 && StrRef.front() == '{' && StrRef.back() == '}')
6769 StrRef = StrRef.drop_front().drop_back();
6770
6771 // Validate GUID length.
6772 if (StrRef.size() != 36) {
6773 S.Diag(LiteralLoc, diag::err_attribute_uuid_malformed_guid);
6774 return;
6775 }
6776
6777 for (unsigned i = 0; i < 36; ++i) {
6778 if (i == 8 || i == 13 || i == 18 || i == 23) {
6779 if (StrRef[i] != '-') {
6780 S.Diag(LiteralLoc, diag::err_attribute_uuid_malformed_guid);
6781 return;
6782 }
6783 } else if (!isHexDigit(StrRef[i])) {
6784 S.Diag(LiteralLoc, diag::err_attribute_uuid_malformed_guid);
6785 return;
6786 }
6787 }
6788
6789 // Convert to our parsed format and canonicalize.
6790 MSGuidDecl::Parts Parsed;
6791 StrRef.substr(0, 8).getAsInteger(16, Parsed.Part1);
6792 StrRef.substr(9, 4).getAsInteger(16, Parsed.Part2);
6793 StrRef.substr(14, 4).getAsInteger(16, Parsed.Part3);
6794 for (unsigned i = 0; i != 8; ++i)
6795 StrRef.substr(19 + 2 * i + (i >= 2 ? 1 : 0), 2)
6796 .getAsInteger(16, Parsed.Part4And5[i]);
6797 MSGuidDecl *Guid = S.Context.getMSGuidDecl(Parsed);
6798
6799 // FIXME: It'd be nice to also emit a fixit removing uuid(...) (and, if it's
6800 // the only thing in the [] list, the [] too), and add an insertion of
6801 // __declspec(uuid(...)). But sadly, neither the SourceLocs of the commas
6802 // separating attributes nor of the [ and the ] are in the AST.
6803 // Cf "SourceLocations of attribute list delimiters - [[ ... , ... ]] etc"
6804 // on cfe-dev.
6805 if (AL.isMicrosoftAttribute()) // Check for [uuid(...)] spelling.
6806 S.Diag(AL.getLoc(), diag::warn_atl_uuid_deprecated);
6807
6808 UuidAttr *UA = S.mergeUuidAttr(D, AL, OrigStrRef, Guid);
6809 if (UA)
6810 D->addAttr(UA);
6811 }
6812
handleHLSLNumThreadsAttr(Sema & S,Decl * D,const ParsedAttr & AL)6813 static void handleHLSLNumThreadsAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6814 using llvm::Triple;
6815 Triple Target = S.Context.getTargetInfo().getTriple();
6816 if (!llvm::is_contained({Triple::Compute, Triple::Mesh, Triple::Amplification,
6817 Triple::Library},
6818 Target.getEnvironment())) {
6819 uint32_t Pipeline =
6820 (uint32_t)S.Context.getTargetInfo().getTriple().getEnvironment() -
6821 (uint32_t)llvm::Triple::Pixel;
6822 S.Diag(AL.getLoc(), diag::err_hlsl_attr_unsupported_in_stage)
6823 << AL << Pipeline << "Compute, Amplification, Mesh or Library";
6824 return;
6825 }
6826
6827 llvm::VersionTuple SMVersion = Target.getOSVersion();
6828 uint32_t ZMax = 1024;
6829 uint32_t ThreadMax = 1024;
6830 if (SMVersion.getMajor() <= 4) {
6831 ZMax = 1;
6832 ThreadMax = 768;
6833 } else if (SMVersion.getMajor() == 5) {
6834 ZMax = 64;
6835 ThreadMax = 1024;
6836 }
6837
6838 uint32_t X;
6839 if (!checkUInt32Argument(S, AL, AL.getArgAsExpr(0), X))
6840 return;
6841 if (X > 1024) {
6842 S.Diag(AL.getArgAsExpr(0)->getExprLoc(),
6843 diag::err_hlsl_numthreads_argument_oor) << 0 << 1024;
6844 return;
6845 }
6846 uint32_t Y;
6847 if (!checkUInt32Argument(S, AL, AL.getArgAsExpr(1), Y))
6848 return;
6849 if (Y > 1024) {
6850 S.Diag(AL.getArgAsExpr(1)->getExprLoc(),
6851 diag::err_hlsl_numthreads_argument_oor) << 1 << 1024;
6852 return;
6853 }
6854 uint32_t Z;
6855 if (!checkUInt32Argument(S, AL, AL.getArgAsExpr(2), Z))
6856 return;
6857 if (Z > ZMax) {
6858 S.Diag(AL.getArgAsExpr(2)->getExprLoc(),
6859 diag::err_hlsl_numthreads_argument_oor) << 2 << ZMax;
6860 return;
6861 }
6862
6863 if (X * Y * Z > ThreadMax) {
6864 S.Diag(AL.getLoc(), diag::err_hlsl_numthreads_invalid) << ThreadMax;
6865 return;
6866 }
6867
6868 HLSLNumThreadsAttr *NewAttr = S.mergeHLSLNumThreadsAttr(D, AL, X, Y, Z);
6869 if (NewAttr)
6870 D->addAttr(NewAttr);
6871 }
6872
mergeHLSLNumThreadsAttr(Decl * D,const AttributeCommonInfo & AL,int X,int Y,int Z)6873 HLSLNumThreadsAttr *Sema::mergeHLSLNumThreadsAttr(Decl *D,
6874 const AttributeCommonInfo &AL,
6875 int X, int Y, int Z) {
6876 if (HLSLNumThreadsAttr *NT = D->getAttr<HLSLNumThreadsAttr>()) {
6877 if (NT->getX() != X || NT->getY() != Y || NT->getZ() != Z) {
6878 Diag(NT->getLocation(), diag::err_hlsl_attribute_param_mismatch) << AL;
6879 Diag(AL.getLoc(), diag::note_conflicting_attribute);
6880 }
6881 return nullptr;
6882 }
6883 return ::new (Context) HLSLNumThreadsAttr(Context, AL, X, Y, Z);
6884 }
6885
handleHLSLSVGroupIndexAttr(Sema & S,Decl * D,const ParsedAttr & AL)6886 static void handleHLSLSVGroupIndexAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6887 using llvm::Triple;
6888 Triple Target = S.Context.getTargetInfo().getTriple();
6889 if (Target.getEnvironment() != Triple::Compute) {
6890 uint32_t Pipeline =
6891 (uint32_t)S.Context.getTargetInfo().getTriple().getEnvironment() -
6892 (uint32_t)llvm::Triple::Pixel;
6893 S.Diag(AL.getLoc(), diag::err_hlsl_attr_unsupported_in_stage)
6894 << AL << Pipeline << "Compute";
6895 return;
6896 }
6897
6898 D->addAttr(::new (S.Context) HLSLSV_GroupIndexAttr(S.Context, AL));
6899 }
6900
handleHLSLShaderAttr(Sema & S,Decl * D,const ParsedAttr & AL)6901 static void handleHLSLShaderAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6902 StringRef Str;
6903 SourceLocation ArgLoc;
6904 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
6905 return;
6906
6907 HLSLShaderAttr::ShaderType ShaderType;
6908 if (!HLSLShaderAttr::ConvertStrToShaderType(Str, ShaderType)) {
6909 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported)
6910 << AL << Str << ArgLoc;
6911 return;
6912 }
6913
6914 // FIXME: check function match the shader stage.
6915
6916 HLSLShaderAttr *NewAttr = S.mergeHLSLShaderAttr(D, AL, ShaderType);
6917 if (NewAttr)
6918 D->addAttr(NewAttr);
6919 }
6920
6921 HLSLShaderAttr *
mergeHLSLShaderAttr(Decl * D,const AttributeCommonInfo & AL,HLSLShaderAttr::ShaderType ShaderType)6922 Sema::mergeHLSLShaderAttr(Decl *D, const AttributeCommonInfo &AL,
6923 HLSLShaderAttr::ShaderType ShaderType) {
6924 if (HLSLShaderAttr *NT = D->getAttr<HLSLShaderAttr>()) {
6925 if (NT->getType() != ShaderType) {
6926 Diag(NT->getLocation(), diag::err_hlsl_attribute_param_mismatch) << AL;
6927 Diag(AL.getLoc(), diag::note_conflicting_attribute);
6928 }
6929 return nullptr;
6930 }
6931 return HLSLShaderAttr::Create(Context, ShaderType, AL);
6932 }
6933
handleMSInheritanceAttr(Sema & S,Decl * D,const ParsedAttr & AL)6934 static void handleMSInheritanceAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6935 if (!S.LangOpts.CPlusPlus) {
6936 S.Diag(AL.getLoc(), diag::err_attribute_not_supported_in_lang)
6937 << AL << AttributeLangSupport::C;
6938 return;
6939 }
6940 MSInheritanceAttr *IA = S.mergeMSInheritanceAttr(
6941 D, AL, /*BestCase=*/true, (MSInheritanceModel)AL.getSemanticSpelling());
6942 if (IA) {
6943 D->addAttr(IA);
6944 S.Consumer.AssignInheritanceModel(cast<CXXRecordDecl>(D));
6945 }
6946 }
6947
handleDeclspecThreadAttr(Sema & S,Decl * D,const ParsedAttr & AL)6948 static void handleDeclspecThreadAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6949 const auto *VD = cast<VarDecl>(D);
6950 if (!S.Context.getTargetInfo().isTLSSupported()) {
6951 S.Diag(AL.getLoc(), diag::err_thread_unsupported);
6952 return;
6953 }
6954 if (VD->getTSCSpec() != TSCS_unspecified) {
6955 S.Diag(AL.getLoc(), diag::err_declspec_thread_on_thread_variable);
6956 return;
6957 }
6958 if (VD->hasLocalStorage()) {
6959 S.Diag(AL.getLoc(), diag::err_thread_non_global) << "__declspec(thread)";
6960 return;
6961 }
6962 D->addAttr(::new (S.Context) ThreadAttr(S.Context, AL));
6963 }
6964
handleAbiTagAttr(Sema & S,Decl * D,const ParsedAttr & AL)6965 static void handleAbiTagAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6966 SmallVector<StringRef, 4> Tags;
6967 for (unsigned I = 0, E = AL.getNumArgs(); I != E; ++I) {
6968 StringRef Tag;
6969 if (!S.checkStringLiteralArgumentAttr(AL, I, Tag))
6970 return;
6971 Tags.push_back(Tag);
6972 }
6973
6974 if (const auto *NS = dyn_cast<NamespaceDecl>(D)) {
6975 if (!NS->isInline()) {
6976 S.Diag(AL.getLoc(), diag::warn_attr_abi_tag_namespace) << 0;
6977 return;
6978 }
6979 if (NS->isAnonymousNamespace()) {
6980 S.Diag(AL.getLoc(), diag::warn_attr_abi_tag_namespace) << 1;
6981 return;
6982 }
6983 if (AL.getNumArgs() == 0)
6984 Tags.push_back(NS->getName());
6985 } else if (!AL.checkAtLeastNumArgs(S, 1))
6986 return;
6987
6988 // Store tags sorted and without duplicates.
6989 llvm::sort(Tags);
6990 Tags.erase(std::unique(Tags.begin(), Tags.end()), Tags.end());
6991
6992 D->addAttr(::new (S.Context)
6993 AbiTagAttr(S.Context, AL, Tags.data(), Tags.size()));
6994 }
6995
handleARMInterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)6996 static void handleARMInterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
6997 // Check the attribute arguments.
6998 if (AL.getNumArgs() > 1) {
6999 S.Diag(AL.getLoc(), diag::err_attribute_too_many_arguments) << AL << 1;
7000 return;
7001 }
7002
7003 StringRef Str;
7004 SourceLocation ArgLoc;
7005
7006 if (AL.getNumArgs() == 0)
7007 Str = "";
7008 else if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
7009 return;
7010
7011 ARMInterruptAttr::InterruptType Kind;
7012 if (!ARMInterruptAttr::ConvertStrToInterruptType(Str, Kind)) {
7013 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported) << AL << Str
7014 << ArgLoc;
7015 return;
7016 }
7017
7018 D->addAttr(::new (S.Context) ARMInterruptAttr(S.Context, AL, Kind));
7019 }
7020
handleMSP430InterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7021 static void handleMSP430InterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7022 // MSP430 'interrupt' attribute is applied to
7023 // a function with no parameters and void return type.
7024 if (!isFunctionOrMethod(D)) {
7025 S.Diag(D->getLocation(), diag::warn_attribute_wrong_decl_type)
7026 << "'interrupt'" << ExpectedFunctionOrMethod;
7027 return;
7028 }
7029
7030 if (hasFunctionProto(D) && getFunctionOrMethodNumParams(D) != 0) {
7031 S.Diag(D->getLocation(), diag::warn_interrupt_attribute_invalid)
7032 << /*MSP430*/ 1 << 0;
7033 return;
7034 }
7035
7036 if (!getFunctionOrMethodResultType(D)->isVoidType()) {
7037 S.Diag(D->getLocation(), diag::warn_interrupt_attribute_invalid)
7038 << /*MSP430*/ 1 << 1;
7039 return;
7040 }
7041
7042 // The attribute takes one integer argument.
7043 if (!AL.checkExactlyNumArgs(S, 1))
7044 return;
7045
7046 if (!AL.isArgExpr(0)) {
7047 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
7048 << AL << AANT_ArgumentIntegerConstant;
7049 return;
7050 }
7051
7052 Expr *NumParamsExpr = static_cast<Expr *>(AL.getArgAsExpr(0));
7053 Optional<llvm::APSInt> NumParams = llvm::APSInt(32);
7054 if (!(NumParams = NumParamsExpr->getIntegerConstantExpr(S.Context))) {
7055 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
7056 << AL << AANT_ArgumentIntegerConstant
7057 << NumParamsExpr->getSourceRange();
7058 return;
7059 }
7060 // The argument should be in range 0..63.
7061 unsigned Num = NumParams->getLimitedValue(255);
7062 if (Num > 63) {
7063 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
7064 << AL << (int)NumParams->getSExtValue()
7065 << NumParamsExpr->getSourceRange();
7066 return;
7067 }
7068
7069 D->addAttr(::new (S.Context) MSP430InterruptAttr(S.Context, AL, Num));
7070 D->addAttr(UsedAttr::CreateImplicit(S.Context));
7071 }
7072
handleMipsInterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7073 static void handleMipsInterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7074 // Only one optional argument permitted.
7075 if (AL.getNumArgs() > 1) {
7076 S.Diag(AL.getLoc(), diag::err_attribute_too_many_arguments) << AL << 1;
7077 return;
7078 }
7079
7080 StringRef Str;
7081 SourceLocation ArgLoc;
7082
7083 if (AL.getNumArgs() == 0)
7084 Str = "";
7085 else if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
7086 return;
7087
7088 // Semantic checks for a function with the 'interrupt' attribute for MIPS:
7089 // a) Must be a function.
7090 // b) Must have no parameters.
7091 // c) Must have the 'void' return type.
7092 // d) Cannot have the 'mips16' attribute, as that instruction set
7093 // lacks the 'eret' instruction.
7094 // e) The attribute itself must either have no argument or one of the
7095 // valid interrupt types, see [MipsInterruptDocs].
7096
7097 if (!isFunctionOrMethod(D)) {
7098 S.Diag(D->getLocation(), diag::warn_attribute_wrong_decl_type)
7099 << "'interrupt'" << ExpectedFunctionOrMethod;
7100 return;
7101 }
7102
7103 if (hasFunctionProto(D) && getFunctionOrMethodNumParams(D) != 0) {
7104 S.Diag(D->getLocation(), diag::warn_interrupt_attribute_invalid)
7105 << /*MIPS*/ 0 << 0;
7106 return;
7107 }
7108
7109 if (!getFunctionOrMethodResultType(D)->isVoidType()) {
7110 S.Diag(D->getLocation(), diag::warn_interrupt_attribute_invalid)
7111 << /*MIPS*/ 0 << 1;
7112 return;
7113 }
7114
7115 // We still have to do this manually because the Interrupt attributes are
7116 // a bit special due to sharing their spellings across targets.
7117 if (checkAttrMutualExclusion<Mips16Attr>(S, D, AL))
7118 return;
7119
7120 MipsInterruptAttr::InterruptType Kind;
7121 if (!MipsInterruptAttr::ConvertStrToInterruptType(Str, Kind)) {
7122 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported)
7123 << AL << "'" + std::string(Str) + "'";
7124 return;
7125 }
7126
7127 D->addAttr(::new (S.Context) MipsInterruptAttr(S.Context, AL, Kind));
7128 }
7129
handleM68kInterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7130 static void handleM68kInterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7131 if (!AL.checkExactlyNumArgs(S, 1))
7132 return;
7133
7134 if (!AL.isArgExpr(0)) {
7135 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
7136 << AL << AANT_ArgumentIntegerConstant;
7137 return;
7138 }
7139
7140 // FIXME: Check for decl - it should be void ()(void).
7141
7142 Expr *NumParamsExpr = static_cast<Expr *>(AL.getArgAsExpr(0));
7143 auto MaybeNumParams = NumParamsExpr->getIntegerConstantExpr(S.Context);
7144 if (!MaybeNumParams) {
7145 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
7146 << AL << AANT_ArgumentIntegerConstant
7147 << NumParamsExpr->getSourceRange();
7148 return;
7149 }
7150
7151 unsigned Num = MaybeNumParams->getLimitedValue(255);
7152 if ((Num & 1) || Num > 30) {
7153 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
7154 << AL << (int)MaybeNumParams->getSExtValue()
7155 << NumParamsExpr->getSourceRange();
7156 return;
7157 }
7158
7159 D->addAttr(::new (S.Context) M68kInterruptAttr(S.Context, AL, Num));
7160 D->addAttr(UsedAttr::CreateImplicit(S.Context));
7161 }
7162
handleAnyX86InterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7163 static void handleAnyX86InterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7164 // Semantic checks for a function with the 'interrupt' attribute.
7165 // a) Must be a function.
7166 // b) Must have the 'void' return type.
7167 // c) Must take 1 or 2 arguments.
7168 // d) The 1st argument must be a pointer.
7169 // e) The 2nd argument (if any) must be an unsigned integer.
7170 if (!isFunctionOrMethod(D) || !hasFunctionProto(D) || isInstanceMethod(D) ||
7171 CXXMethodDecl::isStaticOverloadedOperator(
7172 cast<NamedDecl>(D)->getDeclName().getCXXOverloadedOperator())) {
7173 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
7174 << AL << ExpectedFunctionWithProtoType;
7175 return;
7176 }
7177 // Interrupt handler must have void return type.
7178 if (!getFunctionOrMethodResultType(D)->isVoidType()) {
7179 S.Diag(getFunctionOrMethodResultSourceRange(D).getBegin(),
7180 diag::err_anyx86_interrupt_attribute)
7181 << (S.Context.getTargetInfo().getTriple().getArch() == llvm::Triple::x86
7182 ? 0
7183 : 1)
7184 << 0;
7185 return;
7186 }
7187 // Interrupt handler must have 1 or 2 parameters.
7188 unsigned NumParams = getFunctionOrMethodNumParams(D);
7189 if (NumParams < 1 || NumParams > 2) {
7190 S.Diag(D->getBeginLoc(), diag::err_anyx86_interrupt_attribute)
7191 << (S.Context.getTargetInfo().getTriple().getArch() == llvm::Triple::x86
7192 ? 0
7193 : 1)
7194 << 1;
7195 return;
7196 }
7197 // The first argument must be a pointer.
7198 if (!getFunctionOrMethodParamType(D, 0)->isPointerType()) {
7199 S.Diag(getFunctionOrMethodParamRange(D, 0).getBegin(),
7200 diag::err_anyx86_interrupt_attribute)
7201 << (S.Context.getTargetInfo().getTriple().getArch() == llvm::Triple::x86
7202 ? 0
7203 : 1)
7204 << 2;
7205 return;
7206 }
7207 // The second argument, if present, must be an unsigned integer.
7208 unsigned TypeSize =
7209 S.Context.getTargetInfo().getTriple().getArch() == llvm::Triple::x86_64
7210 ? 64
7211 : 32;
7212 if (NumParams == 2 &&
7213 (!getFunctionOrMethodParamType(D, 1)->isUnsignedIntegerType() ||
7214 S.Context.getTypeSize(getFunctionOrMethodParamType(D, 1)) != TypeSize)) {
7215 S.Diag(getFunctionOrMethodParamRange(D, 1).getBegin(),
7216 diag::err_anyx86_interrupt_attribute)
7217 << (S.Context.getTargetInfo().getTriple().getArch() == llvm::Triple::x86
7218 ? 0
7219 : 1)
7220 << 3 << S.Context.getIntTypeForBitwidth(TypeSize, /*Signed=*/false);
7221 return;
7222 }
7223 D->addAttr(::new (S.Context) AnyX86InterruptAttr(S.Context, AL));
7224 D->addAttr(UsedAttr::CreateImplicit(S.Context));
7225 }
7226
handleAVRInterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7227 static void handleAVRInterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7228 if (!isFunctionOrMethod(D)) {
7229 S.Diag(D->getLocation(), diag::warn_attribute_wrong_decl_type)
7230 << "'interrupt'" << ExpectedFunction;
7231 return;
7232 }
7233
7234 if (!AL.checkExactlyNumArgs(S, 0))
7235 return;
7236
7237 handleSimpleAttribute<AVRInterruptAttr>(S, D, AL);
7238 }
7239
handleAVRSignalAttr(Sema & S,Decl * D,const ParsedAttr & AL)7240 static void handleAVRSignalAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7241 if (!isFunctionOrMethod(D)) {
7242 S.Diag(D->getLocation(), diag::warn_attribute_wrong_decl_type)
7243 << "'signal'" << ExpectedFunction;
7244 return;
7245 }
7246
7247 if (!AL.checkExactlyNumArgs(S, 0))
7248 return;
7249
7250 handleSimpleAttribute<AVRSignalAttr>(S, D, AL);
7251 }
7252
handleBPFPreserveAIRecord(Sema & S,RecordDecl * RD)7253 static void handleBPFPreserveAIRecord(Sema &S, RecordDecl *RD) {
7254 // Add preserve_access_index attribute to all fields and inner records.
7255 for (auto D : RD->decls()) {
7256 if (D->hasAttr<BPFPreserveAccessIndexAttr>())
7257 continue;
7258
7259 D->addAttr(BPFPreserveAccessIndexAttr::CreateImplicit(S.Context));
7260 if (auto *Rec = dyn_cast<RecordDecl>(D))
7261 handleBPFPreserveAIRecord(S, Rec);
7262 }
7263 }
7264
handleBPFPreserveAccessIndexAttr(Sema & S,Decl * D,const ParsedAttr & AL)7265 static void handleBPFPreserveAccessIndexAttr(Sema &S, Decl *D,
7266 const ParsedAttr &AL) {
7267 auto *Rec = cast<RecordDecl>(D);
7268 handleBPFPreserveAIRecord(S, Rec);
7269 Rec->addAttr(::new (S.Context) BPFPreserveAccessIndexAttr(S.Context, AL));
7270 }
7271
hasBTFDeclTagAttr(Decl * D,StringRef Tag)7272 static bool hasBTFDeclTagAttr(Decl *D, StringRef Tag) {
7273 for (const auto *I : D->specific_attrs<BTFDeclTagAttr>()) {
7274 if (I->getBTFDeclTag() == Tag)
7275 return true;
7276 }
7277 return false;
7278 }
7279
handleBTFDeclTagAttr(Sema & S,Decl * D,const ParsedAttr & AL)7280 static void handleBTFDeclTagAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7281 StringRef Str;
7282 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str))
7283 return;
7284 if (hasBTFDeclTagAttr(D, Str))
7285 return;
7286
7287 D->addAttr(::new (S.Context) BTFDeclTagAttr(S.Context, AL, Str));
7288 }
7289
mergeBTFDeclTagAttr(Decl * D,const BTFDeclTagAttr & AL)7290 BTFDeclTagAttr *Sema::mergeBTFDeclTagAttr(Decl *D, const BTFDeclTagAttr &AL) {
7291 if (hasBTFDeclTagAttr(D, AL.getBTFDeclTag()))
7292 return nullptr;
7293 return ::new (Context) BTFDeclTagAttr(Context, AL, AL.getBTFDeclTag());
7294 }
7295
handleWebAssemblyExportNameAttr(Sema & S,Decl * D,const ParsedAttr & AL)7296 static void handleWebAssemblyExportNameAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7297 if (!isFunctionOrMethod(D)) {
7298 S.Diag(D->getLocation(), diag::warn_attribute_wrong_decl_type)
7299 << "'export_name'" << ExpectedFunction;
7300 return;
7301 }
7302
7303 auto *FD = cast<FunctionDecl>(D);
7304 if (FD->isThisDeclarationADefinition()) {
7305 S.Diag(D->getLocation(), diag::err_alias_is_definition) << FD << 0;
7306 return;
7307 }
7308
7309 StringRef Str;
7310 SourceLocation ArgLoc;
7311 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
7312 return;
7313
7314 D->addAttr(::new (S.Context) WebAssemblyExportNameAttr(S.Context, AL, Str));
7315 D->addAttr(UsedAttr::CreateImplicit(S.Context));
7316 }
7317
7318 WebAssemblyImportModuleAttr *
mergeImportModuleAttr(Decl * D,const WebAssemblyImportModuleAttr & AL)7319 Sema::mergeImportModuleAttr(Decl *D, const WebAssemblyImportModuleAttr &AL) {
7320 auto *FD = cast<FunctionDecl>(D);
7321
7322 if (const auto *ExistingAttr = FD->getAttr<WebAssemblyImportModuleAttr>()) {
7323 if (ExistingAttr->getImportModule() == AL.getImportModule())
7324 return nullptr;
7325 Diag(ExistingAttr->getLocation(), diag::warn_mismatched_import) << 0
7326 << ExistingAttr->getImportModule() << AL.getImportModule();
7327 Diag(AL.getLoc(), diag::note_previous_attribute);
7328 return nullptr;
7329 }
7330 if (FD->hasBody()) {
7331 Diag(AL.getLoc(), diag::warn_import_on_definition) << 0;
7332 return nullptr;
7333 }
7334 return ::new (Context) WebAssemblyImportModuleAttr(Context, AL,
7335 AL.getImportModule());
7336 }
7337
7338 WebAssemblyImportNameAttr *
mergeImportNameAttr(Decl * D,const WebAssemblyImportNameAttr & AL)7339 Sema::mergeImportNameAttr(Decl *D, const WebAssemblyImportNameAttr &AL) {
7340 auto *FD = cast<FunctionDecl>(D);
7341
7342 if (const auto *ExistingAttr = FD->getAttr<WebAssemblyImportNameAttr>()) {
7343 if (ExistingAttr->getImportName() == AL.getImportName())
7344 return nullptr;
7345 Diag(ExistingAttr->getLocation(), diag::warn_mismatched_import) << 1
7346 << ExistingAttr->getImportName() << AL.getImportName();
7347 Diag(AL.getLoc(), diag::note_previous_attribute);
7348 return nullptr;
7349 }
7350 if (FD->hasBody()) {
7351 Diag(AL.getLoc(), diag::warn_import_on_definition) << 1;
7352 return nullptr;
7353 }
7354 return ::new (Context) WebAssemblyImportNameAttr(Context, AL,
7355 AL.getImportName());
7356 }
7357
7358 static void
handleWebAssemblyImportModuleAttr(Sema & S,Decl * D,const ParsedAttr & AL)7359 handleWebAssemblyImportModuleAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7360 auto *FD = cast<FunctionDecl>(D);
7361
7362 StringRef Str;
7363 SourceLocation ArgLoc;
7364 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
7365 return;
7366 if (FD->hasBody()) {
7367 S.Diag(AL.getLoc(), diag::warn_import_on_definition) << 0;
7368 return;
7369 }
7370
7371 FD->addAttr(::new (S.Context)
7372 WebAssemblyImportModuleAttr(S.Context, AL, Str));
7373 }
7374
7375 static void
handleWebAssemblyImportNameAttr(Sema & S,Decl * D,const ParsedAttr & AL)7376 handleWebAssemblyImportNameAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7377 auto *FD = cast<FunctionDecl>(D);
7378
7379 StringRef Str;
7380 SourceLocation ArgLoc;
7381 if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
7382 return;
7383 if (FD->hasBody()) {
7384 S.Diag(AL.getLoc(), diag::warn_import_on_definition) << 1;
7385 return;
7386 }
7387
7388 FD->addAttr(::new (S.Context) WebAssemblyImportNameAttr(S.Context, AL, Str));
7389 }
7390
handleRISCVInterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7391 static void handleRISCVInterruptAttr(Sema &S, Decl *D,
7392 const ParsedAttr &AL) {
7393 // Warn about repeated attributes.
7394 if (const auto *A = D->getAttr<RISCVInterruptAttr>()) {
7395 S.Diag(AL.getRange().getBegin(),
7396 diag::warn_riscv_repeated_interrupt_attribute);
7397 S.Diag(A->getLocation(), diag::note_riscv_repeated_interrupt_attribute);
7398 return;
7399 }
7400
7401 // Check the attribute argument. Argument is optional.
7402 if (!AL.checkAtMostNumArgs(S, 1))
7403 return;
7404
7405 StringRef Str;
7406 SourceLocation ArgLoc;
7407
7408 // 'machine'is the default interrupt mode.
7409 if (AL.getNumArgs() == 0)
7410 Str = "machine";
7411 else if (!S.checkStringLiteralArgumentAttr(AL, 0, Str, &ArgLoc))
7412 return;
7413
7414 // Semantic checks for a function with the 'interrupt' attribute:
7415 // - Must be a function.
7416 // - Must have no parameters.
7417 // - Must have the 'void' return type.
7418 // - The attribute itself must either have no argument or one of the
7419 // valid interrupt types, see [RISCVInterruptDocs].
7420
7421 if (D->getFunctionType() == nullptr) {
7422 S.Diag(D->getLocation(), diag::warn_attribute_wrong_decl_type)
7423 << "'interrupt'" << ExpectedFunction;
7424 return;
7425 }
7426
7427 if (hasFunctionProto(D) && getFunctionOrMethodNumParams(D) != 0) {
7428 S.Diag(D->getLocation(), diag::warn_interrupt_attribute_invalid)
7429 << /*RISC-V*/ 2 << 0;
7430 return;
7431 }
7432
7433 if (!getFunctionOrMethodResultType(D)->isVoidType()) {
7434 S.Diag(D->getLocation(), diag::warn_interrupt_attribute_invalid)
7435 << /*RISC-V*/ 2 << 1;
7436 return;
7437 }
7438
7439 RISCVInterruptAttr::InterruptType Kind;
7440 if (!RISCVInterruptAttr::ConvertStrToInterruptType(Str, Kind)) {
7441 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported) << AL << Str
7442 << ArgLoc;
7443 return;
7444 }
7445
7446 D->addAttr(::new (S.Context) RISCVInterruptAttr(S.Context, AL, Kind));
7447 }
7448
handleInterruptAttr(Sema & S,Decl * D,const ParsedAttr & AL)7449 static void handleInterruptAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7450 // Dispatch the interrupt attribute based on the current target.
7451 switch (S.Context.getTargetInfo().getTriple().getArch()) {
7452 case llvm::Triple::msp430:
7453 handleMSP430InterruptAttr(S, D, AL);
7454 break;
7455 case llvm::Triple::mipsel:
7456 case llvm::Triple::mips:
7457 handleMipsInterruptAttr(S, D, AL);
7458 break;
7459 case llvm::Triple::m68k:
7460 handleM68kInterruptAttr(S, D, AL);
7461 break;
7462 case llvm::Triple::x86:
7463 case llvm::Triple::x86_64:
7464 handleAnyX86InterruptAttr(S, D, AL);
7465 break;
7466 case llvm::Triple::avr:
7467 handleAVRInterruptAttr(S, D, AL);
7468 break;
7469 case llvm::Triple::riscv32:
7470 case llvm::Triple::riscv64:
7471 handleRISCVInterruptAttr(S, D, AL);
7472 break;
7473 default:
7474 handleARMInterruptAttr(S, D, AL);
7475 break;
7476 }
7477 }
7478
7479 static bool
checkAMDGPUFlatWorkGroupSizeArguments(Sema & S,Expr * MinExpr,Expr * MaxExpr,const AMDGPUFlatWorkGroupSizeAttr & Attr)7480 checkAMDGPUFlatWorkGroupSizeArguments(Sema &S, Expr *MinExpr, Expr *MaxExpr,
7481 const AMDGPUFlatWorkGroupSizeAttr &Attr) {
7482 // Accept template arguments for now as they depend on something else.
7483 // We'll get to check them when they eventually get instantiated.
7484 if (MinExpr->isValueDependent() || MaxExpr->isValueDependent())
7485 return false;
7486
7487 uint32_t Min = 0;
7488 if (!checkUInt32Argument(S, Attr, MinExpr, Min, 0))
7489 return true;
7490
7491 uint32_t Max = 0;
7492 if (!checkUInt32Argument(S, Attr, MaxExpr, Max, 1))
7493 return true;
7494
7495 if (Min == 0 && Max != 0) {
7496 S.Diag(Attr.getLocation(), diag::err_attribute_argument_invalid)
7497 << &Attr << 0;
7498 return true;
7499 }
7500 if (Min > Max) {
7501 S.Diag(Attr.getLocation(), diag::err_attribute_argument_invalid)
7502 << &Attr << 1;
7503 return true;
7504 }
7505
7506 return false;
7507 }
7508
addAMDGPUFlatWorkGroupSizeAttr(Decl * D,const AttributeCommonInfo & CI,Expr * MinExpr,Expr * MaxExpr)7509 void Sema::addAMDGPUFlatWorkGroupSizeAttr(Decl *D,
7510 const AttributeCommonInfo &CI,
7511 Expr *MinExpr, Expr *MaxExpr) {
7512 AMDGPUFlatWorkGroupSizeAttr TmpAttr(Context, CI, MinExpr, MaxExpr);
7513
7514 if (checkAMDGPUFlatWorkGroupSizeArguments(*this, MinExpr, MaxExpr, TmpAttr))
7515 return;
7516
7517 D->addAttr(::new (Context)
7518 AMDGPUFlatWorkGroupSizeAttr(Context, CI, MinExpr, MaxExpr));
7519 }
7520
handleAMDGPUFlatWorkGroupSizeAttr(Sema & S,Decl * D,const ParsedAttr & AL)7521 static void handleAMDGPUFlatWorkGroupSizeAttr(Sema &S, Decl *D,
7522 const ParsedAttr &AL) {
7523 Expr *MinExpr = AL.getArgAsExpr(0);
7524 Expr *MaxExpr = AL.getArgAsExpr(1);
7525
7526 S.addAMDGPUFlatWorkGroupSizeAttr(D, AL, MinExpr, MaxExpr);
7527 }
7528
checkAMDGPUWavesPerEUArguments(Sema & S,Expr * MinExpr,Expr * MaxExpr,const AMDGPUWavesPerEUAttr & Attr)7529 static bool checkAMDGPUWavesPerEUArguments(Sema &S, Expr *MinExpr,
7530 Expr *MaxExpr,
7531 const AMDGPUWavesPerEUAttr &Attr) {
7532 if (S.DiagnoseUnexpandedParameterPack(MinExpr) ||
7533 (MaxExpr && S.DiagnoseUnexpandedParameterPack(MaxExpr)))
7534 return true;
7535
7536 // Accept template arguments for now as they depend on something else.
7537 // We'll get to check them when they eventually get instantiated.
7538 if (MinExpr->isValueDependent() || (MaxExpr && MaxExpr->isValueDependent()))
7539 return false;
7540
7541 uint32_t Min = 0;
7542 if (!checkUInt32Argument(S, Attr, MinExpr, Min, 0))
7543 return true;
7544
7545 uint32_t Max = 0;
7546 if (MaxExpr && !checkUInt32Argument(S, Attr, MaxExpr, Max, 1))
7547 return true;
7548
7549 if (Min == 0 && Max != 0) {
7550 S.Diag(Attr.getLocation(), diag::err_attribute_argument_invalid)
7551 << &Attr << 0;
7552 return true;
7553 }
7554 if (Max != 0 && Min > Max) {
7555 S.Diag(Attr.getLocation(), diag::err_attribute_argument_invalid)
7556 << &Attr << 1;
7557 return true;
7558 }
7559
7560 return false;
7561 }
7562
addAMDGPUWavesPerEUAttr(Decl * D,const AttributeCommonInfo & CI,Expr * MinExpr,Expr * MaxExpr)7563 void Sema::addAMDGPUWavesPerEUAttr(Decl *D, const AttributeCommonInfo &CI,
7564 Expr *MinExpr, Expr *MaxExpr) {
7565 AMDGPUWavesPerEUAttr TmpAttr(Context, CI, MinExpr, MaxExpr);
7566
7567 if (checkAMDGPUWavesPerEUArguments(*this, MinExpr, MaxExpr, TmpAttr))
7568 return;
7569
7570 D->addAttr(::new (Context)
7571 AMDGPUWavesPerEUAttr(Context, CI, MinExpr, MaxExpr));
7572 }
7573
handleAMDGPUWavesPerEUAttr(Sema & S,Decl * D,const ParsedAttr & AL)7574 static void handleAMDGPUWavesPerEUAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7575 if (!AL.checkAtLeastNumArgs(S, 1) || !AL.checkAtMostNumArgs(S, 2))
7576 return;
7577
7578 Expr *MinExpr = AL.getArgAsExpr(0);
7579 Expr *MaxExpr = (AL.getNumArgs() > 1) ? AL.getArgAsExpr(1) : nullptr;
7580
7581 S.addAMDGPUWavesPerEUAttr(D, AL, MinExpr, MaxExpr);
7582 }
7583
handleAMDGPUNumSGPRAttr(Sema & S,Decl * D,const ParsedAttr & AL)7584 static void handleAMDGPUNumSGPRAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7585 uint32_t NumSGPR = 0;
7586 Expr *NumSGPRExpr = AL.getArgAsExpr(0);
7587 if (!checkUInt32Argument(S, AL, NumSGPRExpr, NumSGPR))
7588 return;
7589
7590 D->addAttr(::new (S.Context) AMDGPUNumSGPRAttr(S.Context, AL, NumSGPR));
7591 }
7592
handleAMDGPUNumVGPRAttr(Sema & S,Decl * D,const ParsedAttr & AL)7593 static void handleAMDGPUNumVGPRAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7594 uint32_t NumVGPR = 0;
7595 Expr *NumVGPRExpr = AL.getArgAsExpr(0);
7596 if (!checkUInt32Argument(S, AL, NumVGPRExpr, NumVGPR))
7597 return;
7598
7599 D->addAttr(::new (S.Context) AMDGPUNumVGPRAttr(S.Context, AL, NumVGPR));
7600 }
7601
handleX86ForceAlignArgPointerAttr(Sema & S,Decl * D,const ParsedAttr & AL)7602 static void handleX86ForceAlignArgPointerAttr(Sema &S, Decl *D,
7603 const ParsedAttr &AL) {
7604 // If we try to apply it to a function pointer, don't warn, but don't
7605 // do anything, either. It doesn't matter anyway, because there's nothing
7606 // special about calling a force_align_arg_pointer function.
7607 const auto *VD = dyn_cast<ValueDecl>(D);
7608 if (VD && VD->getType()->isFunctionPointerType())
7609 return;
7610 // Also don't warn on function pointer typedefs.
7611 const auto *TD = dyn_cast<TypedefNameDecl>(D);
7612 if (TD && (TD->getUnderlyingType()->isFunctionPointerType() ||
7613 TD->getUnderlyingType()->isFunctionType()))
7614 return;
7615 // Attribute can only be applied to function types.
7616 if (!isa<FunctionDecl>(D)) {
7617 S.Diag(AL.getLoc(), diag::warn_attribute_wrong_decl_type)
7618 << AL << ExpectedFunction;
7619 return;
7620 }
7621
7622 D->addAttr(::new (S.Context) X86ForceAlignArgPointerAttr(S.Context, AL));
7623 }
7624
handleLayoutVersion(Sema & S,Decl * D,const ParsedAttr & AL)7625 static void handleLayoutVersion(Sema &S, Decl *D, const ParsedAttr &AL) {
7626 uint32_t Version;
7627 Expr *VersionExpr = static_cast<Expr *>(AL.getArgAsExpr(0));
7628 if (!checkUInt32Argument(S, AL, AL.getArgAsExpr(0), Version))
7629 return;
7630
7631 // TODO: Investigate what happens with the next major version of MSVC.
7632 if (Version != LangOptions::MSVC2015 / 100) {
7633 S.Diag(AL.getLoc(), diag::err_attribute_argument_out_of_bounds)
7634 << AL << Version << VersionExpr->getSourceRange();
7635 return;
7636 }
7637
7638 // The attribute expects a "major" version number like 19, but new versions of
7639 // MSVC have moved to updating the "minor", or less significant numbers, so we
7640 // have to multiply by 100 now.
7641 Version *= 100;
7642
7643 D->addAttr(::new (S.Context) LayoutVersionAttr(S.Context, AL, Version));
7644 }
7645
mergeDLLImportAttr(Decl * D,const AttributeCommonInfo & CI)7646 DLLImportAttr *Sema::mergeDLLImportAttr(Decl *D,
7647 const AttributeCommonInfo &CI) {
7648 if (D->hasAttr<DLLExportAttr>()) {
7649 Diag(CI.getLoc(), diag::warn_attribute_ignored) << "'dllimport'";
7650 return nullptr;
7651 }
7652
7653 if (D->hasAttr<DLLImportAttr>())
7654 return nullptr;
7655
7656 return ::new (Context) DLLImportAttr(Context, CI);
7657 }
7658
mergeDLLExportAttr(Decl * D,const AttributeCommonInfo & CI)7659 DLLExportAttr *Sema::mergeDLLExportAttr(Decl *D,
7660 const AttributeCommonInfo &CI) {
7661 if (DLLImportAttr *Import = D->getAttr<DLLImportAttr>()) {
7662 Diag(Import->getLocation(), diag::warn_attribute_ignored) << Import;
7663 D->dropAttr<DLLImportAttr>();
7664 }
7665
7666 if (D->hasAttr<DLLExportAttr>())
7667 return nullptr;
7668
7669 return ::new (Context) DLLExportAttr(Context, CI);
7670 }
7671
handleDLLAttr(Sema & S,Decl * D,const ParsedAttr & A)7672 static void handleDLLAttr(Sema &S, Decl *D, const ParsedAttr &A) {
7673 if (isa<ClassTemplatePartialSpecializationDecl>(D) &&
7674 (S.Context.getTargetInfo().shouldDLLImportComdatSymbols())) {
7675 S.Diag(A.getRange().getBegin(), diag::warn_attribute_ignored) << A;
7676 return;
7677 }
7678
7679 if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
7680 if (FD->isInlined() && A.getKind() == ParsedAttr::AT_DLLImport &&
7681 !(S.Context.getTargetInfo().shouldDLLImportComdatSymbols())) {
7682 // MinGW doesn't allow dllimport on inline functions.
7683 S.Diag(A.getRange().getBegin(), diag::warn_attribute_ignored_on_inline)
7684 << A;
7685 return;
7686 }
7687 }
7688
7689 if (const auto *MD = dyn_cast<CXXMethodDecl>(D)) {
7690 if ((S.Context.getTargetInfo().shouldDLLImportComdatSymbols()) &&
7691 MD->getParent()->isLambda()) {
7692 S.Diag(A.getRange().getBegin(), diag::err_attribute_dll_lambda) << A;
7693 return;
7694 }
7695 }
7696
7697 Attr *NewAttr = A.getKind() == ParsedAttr::AT_DLLExport
7698 ? (Attr *)S.mergeDLLExportAttr(D, A)
7699 : (Attr *)S.mergeDLLImportAttr(D, A);
7700 if (NewAttr)
7701 D->addAttr(NewAttr);
7702 }
7703
7704 MSInheritanceAttr *
mergeMSInheritanceAttr(Decl * D,const AttributeCommonInfo & CI,bool BestCase,MSInheritanceModel Model)7705 Sema::mergeMSInheritanceAttr(Decl *D, const AttributeCommonInfo &CI,
7706 bool BestCase,
7707 MSInheritanceModel Model) {
7708 if (MSInheritanceAttr *IA = D->getAttr<MSInheritanceAttr>()) {
7709 if (IA->getInheritanceModel() == Model)
7710 return nullptr;
7711 Diag(IA->getLocation(), diag::err_mismatched_ms_inheritance)
7712 << 1 /*previous declaration*/;
7713 Diag(CI.getLoc(), diag::note_previous_ms_inheritance);
7714 D->dropAttr<MSInheritanceAttr>();
7715 }
7716
7717 auto *RD = cast<CXXRecordDecl>(D);
7718 if (RD->hasDefinition()) {
7719 if (checkMSInheritanceAttrOnDefinition(RD, CI.getRange(), BestCase,
7720 Model)) {
7721 return nullptr;
7722 }
7723 } else {
7724 if (isa<ClassTemplatePartialSpecializationDecl>(RD)) {
7725 Diag(CI.getLoc(), diag::warn_ignored_ms_inheritance)
7726 << 1 /*partial specialization*/;
7727 return nullptr;
7728 }
7729 if (RD->getDescribedClassTemplate()) {
7730 Diag(CI.getLoc(), diag::warn_ignored_ms_inheritance)
7731 << 0 /*primary template*/;
7732 return nullptr;
7733 }
7734 }
7735
7736 return ::new (Context) MSInheritanceAttr(Context, CI, BestCase);
7737 }
7738
handleCapabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)7739 static void handleCapabilityAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7740 // The capability attributes take a single string parameter for the name of
7741 // the capability they represent. The lockable attribute does not take any
7742 // parameters. However, semantically, both attributes represent the same
7743 // concept, and so they use the same semantic attribute. Eventually, the
7744 // lockable attribute will be removed.
7745 //
7746 // For backward compatibility, any capability which has no specified string
7747 // literal will be considered a "mutex."
7748 StringRef N("mutex");
7749 SourceLocation LiteralLoc;
7750 if (AL.getKind() == ParsedAttr::AT_Capability &&
7751 !S.checkStringLiteralArgumentAttr(AL, 0, N, &LiteralLoc))
7752 return;
7753
7754 D->addAttr(::new (S.Context) CapabilityAttr(S.Context, AL, N));
7755 }
7756
handleAssertCapabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)7757 static void handleAssertCapabilityAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7758 SmallVector<Expr*, 1> Args;
7759 if (!checkLockFunAttrCommon(S, D, AL, Args))
7760 return;
7761
7762 D->addAttr(::new (S.Context)
7763 AssertCapabilityAttr(S.Context, AL, Args.data(), Args.size()));
7764 }
7765
handleAcquireCapabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)7766 static void handleAcquireCapabilityAttr(Sema &S, Decl *D,
7767 const ParsedAttr &AL) {
7768 SmallVector<Expr*, 1> Args;
7769 if (!checkLockFunAttrCommon(S, D, AL, Args))
7770 return;
7771
7772 D->addAttr(::new (S.Context) AcquireCapabilityAttr(S.Context, AL, Args.data(),
7773 Args.size()));
7774 }
7775
handleTryAcquireCapabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)7776 static void handleTryAcquireCapabilityAttr(Sema &S, Decl *D,
7777 const ParsedAttr &AL) {
7778 SmallVector<Expr*, 2> Args;
7779 if (!checkTryLockFunAttrCommon(S, D, AL, Args))
7780 return;
7781
7782 D->addAttr(::new (S.Context) TryAcquireCapabilityAttr(
7783 S.Context, AL, AL.getArgAsExpr(0), Args.data(), Args.size()));
7784 }
7785
handleReleaseCapabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)7786 static void handleReleaseCapabilityAttr(Sema &S, Decl *D,
7787 const ParsedAttr &AL) {
7788 // Check that all arguments are lockable objects.
7789 SmallVector<Expr *, 1> Args;
7790 checkAttrArgsAreCapabilityObjs(S, D, AL, Args, 0, true);
7791
7792 D->addAttr(::new (S.Context) ReleaseCapabilityAttr(S.Context, AL, Args.data(),
7793 Args.size()));
7794 }
7795
handleRequiresCapabilityAttr(Sema & S,Decl * D,const ParsedAttr & AL)7796 static void handleRequiresCapabilityAttr(Sema &S, Decl *D,
7797 const ParsedAttr &AL) {
7798 if (!AL.checkAtLeastNumArgs(S, 1))
7799 return;
7800
7801 // check that all arguments are lockable objects
7802 SmallVector<Expr*, 1> Args;
7803 checkAttrArgsAreCapabilityObjs(S, D, AL, Args);
7804 if (Args.empty())
7805 return;
7806
7807 RequiresCapabilityAttr *RCA = ::new (S.Context)
7808 RequiresCapabilityAttr(S.Context, AL, Args.data(), Args.size());
7809
7810 D->addAttr(RCA);
7811 }
7812
handleDeprecatedAttr(Sema & S,Decl * D,const ParsedAttr & AL)7813 static void handleDeprecatedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7814 if (const auto *NSD = dyn_cast<NamespaceDecl>(D)) {
7815 if (NSD->isAnonymousNamespace()) {
7816 S.Diag(AL.getLoc(), diag::warn_deprecated_anonymous_namespace);
7817 // Do not want to attach the attribute to the namespace because that will
7818 // cause confusing diagnostic reports for uses of declarations within the
7819 // namespace.
7820 return;
7821 }
7822 } else if (isa<UsingDecl, UnresolvedUsingTypenameDecl,
7823 UnresolvedUsingValueDecl>(D)) {
7824 S.Diag(AL.getRange().getBegin(), diag::warn_deprecated_ignored_on_using)
7825 << AL;
7826 return;
7827 }
7828
7829 // Handle the cases where the attribute has a text message.
7830 StringRef Str, Replacement;
7831 if (AL.isArgExpr(0) && AL.getArgAsExpr(0) &&
7832 !S.checkStringLiteralArgumentAttr(AL, 0, Str))
7833 return;
7834
7835 // Support a single optional message only for Declspec and [[]] spellings.
7836 if (AL.isDeclspecAttribute() || AL.isStandardAttributeSyntax())
7837 AL.checkAtMostNumArgs(S, 1);
7838 else if (AL.isArgExpr(1) && AL.getArgAsExpr(1) &&
7839 !S.checkStringLiteralArgumentAttr(AL, 1, Replacement))
7840 return;
7841
7842 if (!S.getLangOpts().CPlusPlus14 && AL.isCXX11Attribute() && !AL.isGNUScope())
7843 S.Diag(AL.getLoc(), diag::ext_cxx14_attr) << AL;
7844
7845 D->addAttr(::new (S.Context) DeprecatedAttr(S.Context, AL, Str, Replacement));
7846 }
7847
isGlobalVar(const Decl * D)7848 static bool isGlobalVar(const Decl *D) {
7849 if (const auto *S = dyn_cast<VarDecl>(D))
7850 return S->hasGlobalStorage();
7851 return false;
7852 }
7853
isSanitizerAttributeAllowedOnGlobals(StringRef Sanitizer)7854 static bool isSanitizerAttributeAllowedOnGlobals(StringRef Sanitizer) {
7855 return Sanitizer == "address" || Sanitizer == "hwaddress" ||
7856 Sanitizer == "memtag";
7857 }
7858
handleNoSanitizeAttr(Sema & S,Decl * D,const ParsedAttr & AL)7859 static void handleNoSanitizeAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7860 if (!AL.checkAtLeastNumArgs(S, 1))
7861 return;
7862
7863 std::vector<StringRef> Sanitizers;
7864
7865 for (unsigned I = 0, E = AL.getNumArgs(); I != E; ++I) {
7866 StringRef SanitizerName;
7867 SourceLocation LiteralLoc;
7868
7869 if (!S.checkStringLiteralArgumentAttr(AL, I, SanitizerName, &LiteralLoc))
7870 return;
7871
7872 if (parseSanitizerValue(SanitizerName, /*AllowGroups=*/true) ==
7873 SanitizerMask() &&
7874 SanitizerName != "coverage")
7875 S.Diag(LiteralLoc, diag::warn_unknown_sanitizer_ignored) << SanitizerName;
7876 else if (isGlobalVar(D) && !isSanitizerAttributeAllowedOnGlobals(SanitizerName))
7877 S.Diag(D->getLocation(), diag::err_attribute_wrong_decl_type)
7878 << AL << ExpectedFunctionOrMethod;
7879 Sanitizers.push_back(SanitizerName);
7880 }
7881
7882 D->addAttr(::new (S.Context) NoSanitizeAttr(S.Context, AL, Sanitizers.data(),
7883 Sanitizers.size()));
7884 }
7885
handleNoSanitizeSpecificAttr(Sema & S,Decl * D,const ParsedAttr & AL)7886 static void handleNoSanitizeSpecificAttr(Sema &S, Decl *D,
7887 const ParsedAttr &AL) {
7888 StringRef AttrName = AL.getAttrName()->getName();
7889 normalizeName(AttrName);
7890 StringRef SanitizerName = llvm::StringSwitch<StringRef>(AttrName)
7891 .Case("no_address_safety_analysis", "address")
7892 .Case("no_sanitize_address", "address")
7893 .Case("no_sanitize_thread", "thread")
7894 .Case("no_sanitize_memory", "memory");
7895 if (isGlobalVar(D) && SanitizerName != "address")
7896 S.Diag(D->getLocation(), diag::err_attribute_wrong_decl_type)
7897 << AL << ExpectedFunction;
7898
7899 // FIXME: Rather than create a NoSanitizeSpecificAttr, this creates a
7900 // NoSanitizeAttr object; but we need to calculate the correct spelling list
7901 // index rather than incorrectly assume the index for NoSanitizeSpecificAttr
7902 // has the same spellings as the index for NoSanitizeAttr. We don't have a
7903 // general way to "translate" between the two, so this hack attempts to work
7904 // around the issue with hard-coded indices. This is critical for calling
7905 // getSpelling() or prettyPrint() on the resulting semantic attribute object
7906 // without failing assertions.
7907 unsigned TranslatedSpellingIndex = 0;
7908 if (AL.isStandardAttributeSyntax())
7909 TranslatedSpellingIndex = 1;
7910
7911 AttributeCommonInfo Info = AL;
7912 Info.setAttributeSpellingListIndex(TranslatedSpellingIndex);
7913 D->addAttr(::new (S.Context)
7914 NoSanitizeAttr(S.Context, Info, &SanitizerName, 1));
7915 }
7916
handleInternalLinkageAttr(Sema & S,Decl * D,const ParsedAttr & AL)7917 static void handleInternalLinkageAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7918 if (InternalLinkageAttr *Internal = S.mergeInternalLinkageAttr(D, AL))
7919 D->addAttr(Internal);
7920 }
7921
handleOpenCLNoSVMAttr(Sema & S,Decl * D,const ParsedAttr & AL)7922 static void handleOpenCLNoSVMAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7923 if (S.LangOpts.getOpenCLCompatibleVersion() < 200)
7924 S.Diag(AL.getLoc(), diag::err_attribute_requires_opencl_version)
7925 << AL << "2.0" << 1;
7926 else
7927 S.Diag(AL.getLoc(), diag::warn_opencl_attr_deprecated_ignored)
7928 << AL << S.LangOpts.getOpenCLVersionString();
7929 }
7930
handleOpenCLAccessAttr(Sema & S,Decl * D,const ParsedAttr & AL)7931 static void handleOpenCLAccessAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7932 if (D->isInvalidDecl())
7933 return;
7934
7935 // Check if there is only one access qualifier.
7936 if (D->hasAttr<OpenCLAccessAttr>()) {
7937 if (D->getAttr<OpenCLAccessAttr>()->getSemanticSpelling() ==
7938 AL.getSemanticSpelling()) {
7939 S.Diag(AL.getLoc(), diag::warn_duplicate_declspec)
7940 << AL.getAttrName()->getName() << AL.getRange();
7941 } else {
7942 S.Diag(AL.getLoc(), diag::err_opencl_multiple_access_qualifiers)
7943 << D->getSourceRange();
7944 D->setInvalidDecl(true);
7945 return;
7946 }
7947 }
7948
7949 // OpenCL v2.0 s6.6 - read_write can be used for image types to specify that
7950 // an image object can be read and written. OpenCL v2.0 s6.13.6 - A kernel
7951 // cannot read from and write to the same pipe object. Using the read_write
7952 // (or __read_write) qualifier with the pipe qualifier is a compilation error.
7953 // OpenCL v3.0 s6.8 - For OpenCL C 2.0, or with the
7954 // __opencl_c_read_write_images feature, image objects specified as arguments
7955 // to a kernel can additionally be declared to be read-write.
7956 // C++ for OpenCL 1.0 inherits rule from OpenCL C v2.0.
7957 // C++ for OpenCL 2021 inherits rule from OpenCL C v3.0.
7958 if (const auto *PDecl = dyn_cast<ParmVarDecl>(D)) {
7959 const Type *DeclTy = PDecl->getType().getCanonicalType().getTypePtr();
7960 if (AL.getAttrName()->getName().contains("read_write")) {
7961 bool ReadWriteImagesUnsupported =
7962 (S.getLangOpts().getOpenCLCompatibleVersion() < 200) ||
7963 (S.getLangOpts().getOpenCLCompatibleVersion() == 300 &&
7964 !S.getOpenCLOptions().isSupported("__opencl_c_read_write_images",
7965 S.getLangOpts()));
7966 if (ReadWriteImagesUnsupported || DeclTy->isPipeType()) {
7967 S.Diag(AL.getLoc(), diag::err_opencl_invalid_read_write)
7968 << AL << PDecl->getType() << DeclTy->isImageType();
7969 D->setInvalidDecl(true);
7970 return;
7971 }
7972 }
7973 }
7974
7975 D->addAttr(::new (S.Context) OpenCLAccessAttr(S.Context, AL));
7976 }
7977
handleZeroCallUsedRegsAttr(Sema & S,Decl * D,const ParsedAttr & AL)7978 static void handleZeroCallUsedRegsAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
7979 // Check that the argument is a string literal.
7980 StringRef KindStr;
7981 SourceLocation LiteralLoc;
7982 if (!S.checkStringLiteralArgumentAttr(AL, 0, KindStr, &LiteralLoc))
7983 return;
7984
7985 ZeroCallUsedRegsAttr::ZeroCallUsedRegsKind Kind;
7986 if (!ZeroCallUsedRegsAttr::ConvertStrToZeroCallUsedRegsKind(KindStr, Kind)) {
7987 S.Diag(LiteralLoc, diag::warn_attribute_type_not_supported)
7988 << AL << KindStr;
7989 return;
7990 }
7991
7992 D->dropAttr<ZeroCallUsedRegsAttr>();
7993 D->addAttr(ZeroCallUsedRegsAttr::Create(S.Context, Kind, AL));
7994 }
7995
handleFunctionReturnThunksAttr(Sema & S,Decl * D,const ParsedAttr & AL)7996 static void handleFunctionReturnThunksAttr(Sema &S, Decl *D,
7997 const ParsedAttr &AL) {
7998 StringRef KindStr;
7999 SourceLocation LiteralLoc;
8000 if (!S.checkStringLiteralArgumentAttr(AL, 0, KindStr, &LiteralLoc))
8001 return;
8002
8003 FunctionReturnThunksAttr::Kind Kind;
8004 if (!FunctionReturnThunksAttr::ConvertStrToKind(KindStr, Kind)) {
8005 S.Diag(LiteralLoc, diag::warn_attribute_type_not_supported)
8006 << AL << KindStr;
8007 return;
8008 }
8009 // FIXME: it would be good to better handle attribute merging rather than
8010 // silently replacing the existing attribute, so long as it does not break
8011 // the expected codegen tests.
8012 D->dropAttr<FunctionReturnThunksAttr>();
8013 D->addAttr(FunctionReturnThunksAttr::Create(S.Context, Kind, AL));
8014 }
8015
handleSYCLKernelAttr(Sema & S,Decl * D,const ParsedAttr & AL)8016 static void handleSYCLKernelAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8017 // The 'sycl_kernel' attribute applies only to function templates.
8018 const auto *FD = cast<FunctionDecl>(D);
8019 const FunctionTemplateDecl *FT = FD->getDescribedFunctionTemplate();
8020 assert(FT && "Function template is expected");
8021
8022 // Function template must have at least two template parameters.
8023 const TemplateParameterList *TL = FT->getTemplateParameters();
8024 if (TL->size() < 2) {
8025 S.Diag(FT->getLocation(), diag::warn_sycl_kernel_num_of_template_params);
8026 return;
8027 }
8028
8029 // Template parameters must be typenames.
8030 for (unsigned I = 0; I < 2; ++I) {
8031 const NamedDecl *TParam = TL->getParam(I);
8032 if (isa<NonTypeTemplateParmDecl>(TParam)) {
8033 S.Diag(FT->getLocation(),
8034 diag::warn_sycl_kernel_invalid_template_param_type);
8035 return;
8036 }
8037 }
8038
8039 // Function must have at least one argument.
8040 if (getFunctionOrMethodNumParams(D) != 1) {
8041 S.Diag(FT->getLocation(), diag::warn_sycl_kernel_num_of_function_params);
8042 return;
8043 }
8044
8045 // Function must return void.
8046 QualType RetTy = getFunctionOrMethodResultType(D);
8047 if (!RetTy->isVoidType()) {
8048 S.Diag(FT->getLocation(), diag::warn_sycl_kernel_return_type);
8049 return;
8050 }
8051
8052 handleSimpleAttribute<SYCLKernelAttr>(S, D, AL);
8053 }
8054
handleDestroyAttr(Sema & S,Decl * D,const ParsedAttr & A)8055 static void handleDestroyAttr(Sema &S, Decl *D, const ParsedAttr &A) {
8056 if (!cast<VarDecl>(D)->hasGlobalStorage()) {
8057 S.Diag(D->getLocation(), diag::err_destroy_attr_on_non_static_var)
8058 << (A.getKind() == ParsedAttr::AT_AlwaysDestroy);
8059 return;
8060 }
8061
8062 if (A.getKind() == ParsedAttr::AT_AlwaysDestroy)
8063 handleSimpleAttribute<AlwaysDestroyAttr>(S, D, A);
8064 else
8065 handleSimpleAttribute<NoDestroyAttr>(S, D, A);
8066 }
8067
handleUninitializedAttr(Sema & S,Decl * D,const ParsedAttr & AL)8068 static void handleUninitializedAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8069 assert(cast<VarDecl>(D)->getStorageDuration() == SD_Automatic &&
8070 "uninitialized is only valid on automatic duration variables");
8071 D->addAttr(::new (S.Context) UninitializedAttr(S.Context, AL));
8072 }
8073
tryMakeVariablePseudoStrong(Sema & S,VarDecl * VD,bool DiagnoseFailure)8074 static bool tryMakeVariablePseudoStrong(Sema &S, VarDecl *VD,
8075 bool DiagnoseFailure) {
8076 QualType Ty = VD->getType();
8077 if (!Ty->isObjCRetainableType()) {
8078 if (DiagnoseFailure) {
8079 S.Diag(VD->getBeginLoc(), diag::warn_ignored_objc_externally_retained)
8080 << 0;
8081 }
8082 return false;
8083 }
8084
8085 Qualifiers::ObjCLifetime LifetimeQual = Ty.getQualifiers().getObjCLifetime();
8086
8087 // Sema::inferObjCARCLifetime must run after processing decl attributes
8088 // (because __block lowers to an attribute), so if the lifetime hasn't been
8089 // explicitly specified, infer it locally now.
8090 if (LifetimeQual == Qualifiers::OCL_None)
8091 LifetimeQual = Ty->getObjCARCImplicitLifetime();
8092
8093 // The attributes only really makes sense for __strong variables; ignore any
8094 // attempts to annotate a parameter with any other lifetime qualifier.
8095 if (LifetimeQual != Qualifiers::OCL_Strong) {
8096 if (DiagnoseFailure) {
8097 S.Diag(VD->getBeginLoc(), diag::warn_ignored_objc_externally_retained)
8098 << 1;
8099 }
8100 return false;
8101 }
8102
8103 // Tampering with the type of a VarDecl here is a bit of a hack, but we need
8104 // to ensure that the variable is 'const' so that we can error on
8105 // modification, which can otherwise over-release.
8106 VD->setType(Ty.withConst());
8107 VD->setARCPseudoStrong(true);
8108 return true;
8109 }
8110
handleObjCExternallyRetainedAttr(Sema & S,Decl * D,const ParsedAttr & AL)8111 static void handleObjCExternallyRetainedAttr(Sema &S, Decl *D,
8112 const ParsedAttr &AL) {
8113 if (auto *VD = dyn_cast<VarDecl>(D)) {
8114 assert(!isa<ParmVarDecl>(VD) && "should be diagnosed automatically");
8115 if (!VD->hasLocalStorage()) {
8116 S.Diag(D->getBeginLoc(), diag::warn_ignored_objc_externally_retained)
8117 << 0;
8118 return;
8119 }
8120
8121 if (!tryMakeVariablePseudoStrong(S, VD, /*DiagnoseFailure=*/true))
8122 return;
8123
8124 handleSimpleAttribute<ObjCExternallyRetainedAttr>(S, D, AL);
8125 return;
8126 }
8127
8128 // If D is a function-like declaration (method, block, or function), then we
8129 // make every parameter psuedo-strong.
8130 unsigned NumParams =
8131 hasFunctionProto(D) ? getFunctionOrMethodNumParams(D) : 0;
8132 for (unsigned I = 0; I != NumParams; ++I) {
8133 auto *PVD = const_cast<ParmVarDecl *>(getFunctionOrMethodParam(D, I));
8134 QualType Ty = PVD->getType();
8135
8136 // If a user wrote a parameter with __strong explicitly, then assume they
8137 // want "real" strong semantics for that parameter. This works because if
8138 // the parameter was written with __strong, then the strong qualifier will
8139 // be non-local.
8140 if (Ty.getLocalUnqualifiedType().getQualifiers().getObjCLifetime() ==
8141 Qualifiers::OCL_Strong)
8142 continue;
8143
8144 tryMakeVariablePseudoStrong(S, PVD, /*DiagnoseFailure=*/false);
8145 }
8146 handleSimpleAttribute<ObjCExternallyRetainedAttr>(S, D, AL);
8147 }
8148
handleMIGServerRoutineAttr(Sema & S,Decl * D,const ParsedAttr & AL)8149 static void handleMIGServerRoutineAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8150 // Check that the return type is a `typedef int kern_return_t` or a typedef
8151 // around it, because otherwise MIG convention checks make no sense.
8152 // BlockDecl doesn't store a return type, so it's annoying to check,
8153 // so let's skip it for now.
8154 if (!isa<BlockDecl>(D)) {
8155 QualType T = getFunctionOrMethodResultType(D);
8156 bool IsKernReturnT = false;
8157 while (const auto *TT = T->getAs<TypedefType>()) {
8158 IsKernReturnT = (TT->getDecl()->getName() == "kern_return_t");
8159 T = TT->desugar();
8160 }
8161 if (!IsKernReturnT || T.getCanonicalType() != S.getASTContext().IntTy) {
8162 S.Diag(D->getBeginLoc(),
8163 diag::warn_mig_server_routine_does_not_return_kern_return_t);
8164 return;
8165 }
8166 }
8167
8168 handleSimpleAttribute<MIGServerRoutineAttr>(S, D, AL);
8169 }
8170
handleMSAllocatorAttr(Sema & S,Decl * D,const ParsedAttr & AL)8171 static void handleMSAllocatorAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8172 // Warn if the return type is not a pointer or reference type.
8173 if (auto *FD = dyn_cast<FunctionDecl>(D)) {
8174 QualType RetTy = FD->getReturnType();
8175 if (!RetTy->isPointerType() && !RetTy->isReferenceType()) {
8176 S.Diag(AL.getLoc(), diag::warn_declspec_allocator_nonpointer)
8177 << AL.getRange() << RetTy;
8178 return;
8179 }
8180 }
8181
8182 handleSimpleAttribute<MSAllocatorAttr>(S, D, AL);
8183 }
8184
handleAcquireHandleAttr(Sema & S,Decl * D,const ParsedAttr & AL)8185 static void handleAcquireHandleAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8186 if (AL.isUsedAsTypeAttr())
8187 return;
8188 // Warn if the parameter is definitely not an output parameter.
8189 if (const auto *PVD = dyn_cast<ParmVarDecl>(D)) {
8190 if (PVD->getType()->isIntegerType()) {
8191 S.Diag(AL.getLoc(), diag::err_attribute_output_parameter)
8192 << AL.getRange();
8193 return;
8194 }
8195 }
8196 StringRef Argument;
8197 if (!S.checkStringLiteralArgumentAttr(AL, 0, Argument))
8198 return;
8199 D->addAttr(AcquireHandleAttr::Create(S.Context, Argument, AL));
8200 }
8201
8202 template<typename Attr>
handleHandleAttr(Sema & S,Decl * D,const ParsedAttr & AL)8203 static void handleHandleAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8204 StringRef Argument;
8205 if (!S.checkStringLiteralArgumentAttr(AL, 0, Argument))
8206 return;
8207 D->addAttr(Attr::Create(S.Context, Argument, AL));
8208 }
8209
handleCFGuardAttr(Sema & S,Decl * D,const ParsedAttr & AL)8210 static void handleCFGuardAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8211 // The guard attribute takes a single identifier argument.
8212
8213 if (!AL.isArgIdent(0)) {
8214 S.Diag(AL.getLoc(), diag::err_attribute_argument_type)
8215 << AL << AANT_ArgumentIdentifier;
8216 return;
8217 }
8218
8219 CFGuardAttr::GuardArg Arg;
8220 IdentifierInfo *II = AL.getArgAsIdent(0)->Ident;
8221 if (!CFGuardAttr::ConvertStrToGuardArg(II->getName(), Arg)) {
8222 S.Diag(AL.getLoc(), diag::warn_attribute_type_not_supported) << AL << II;
8223 return;
8224 }
8225
8226 D->addAttr(::new (S.Context) CFGuardAttr(S.Context, AL, Arg));
8227 }
8228
8229
8230 template <typename AttrTy>
findEnforceTCBAttrByName(Decl * D,StringRef Name)8231 static const AttrTy *findEnforceTCBAttrByName(Decl *D, StringRef Name) {
8232 auto Attrs = D->specific_attrs<AttrTy>();
8233 auto I = llvm::find_if(Attrs,
8234 [Name](const AttrTy *A) {
8235 return A->getTCBName() == Name;
8236 });
8237 return I == Attrs.end() ? nullptr : *I;
8238 }
8239
8240 template <typename AttrTy, typename ConflictingAttrTy>
handleEnforceTCBAttr(Sema & S,Decl * D,const ParsedAttr & AL)8241 static void handleEnforceTCBAttr(Sema &S, Decl *D, const ParsedAttr &AL) {
8242 StringRef Argument;
8243 if (!S.checkStringLiteralArgumentAttr(AL, 0, Argument))
8244 return;
8245
8246 // A function cannot be have both regular and leaf membership in the same TCB.
8247 if (const ConflictingAttrTy *ConflictingAttr =
8248 findEnforceTCBAttrByName<ConflictingAttrTy>(D, Argument)) {
8249 // We could attach a note to the other attribute but in this case
8250 // there's no need given how the two are very close to each other.
8251 S.Diag(AL.getLoc(), diag::err_tcb_conflicting_attributes)
8252 << AL.getAttrName()->getName() << ConflictingAttr->getAttrName()->getName()
8253 << Argument;
8254
8255 // Error recovery: drop the non-leaf attribute so that to suppress
8256 // all future warnings caused by erroneous attributes. The leaf attribute
8257 // needs to be kept because it can only suppresses warnings, not cause them.
8258 D->dropAttr<EnforceTCBAttr>();
8259 return;
8260 }
8261
8262 D->addAttr(AttrTy::Create(S.Context, Argument, AL));
8263 }
8264
8265 template <typename AttrTy, typename ConflictingAttrTy>
mergeEnforceTCBAttrImpl(Sema & S,Decl * D,const AttrTy & AL)8266 static AttrTy *mergeEnforceTCBAttrImpl(Sema &S, Decl *D, const AttrTy &AL) {
8267 // Check if the new redeclaration has different leaf-ness in the same TCB.
8268 StringRef TCBName = AL.getTCBName();
8269 if (const ConflictingAttrTy *ConflictingAttr =
8270 findEnforceTCBAttrByName<ConflictingAttrTy>(D, TCBName)) {
8271 S.Diag(ConflictingAttr->getLoc(), diag::err_tcb_conflicting_attributes)
8272 << ConflictingAttr->getAttrName()->getName()
8273 << AL.getAttrName()->getName() << TCBName;
8274
8275 // Add a note so that the user could easily find the conflicting attribute.
8276 S.Diag(AL.getLoc(), diag::note_conflicting_attribute);
8277
8278 // More error recovery.
8279 D->dropAttr<EnforceTCBAttr>();
8280 return nullptr;
8281 }
8282
8283 ASTContext &Context = S.getASTContext();
8284 return ::new(Context) AttrTy(Context, AL, AL.getTCBName());
8285 }
8286
mergeEnforceTCBAttr(Decl * D,const EnforceTCBAttr & AL)8287 EnforceTCBAttr *Sema::mergeEnforceTCBAttr(Decl *D, const EnforceTCBAttr &AL) {
8288 return mergeEnforceTCBAttrImpl<EnforceTCBAttr, EnforceTCBLeafAttr>(
8289 *this, D, AL);
8290 }
8291
mergeEnforceTCBLeafAttr(Decl * D,const EnforceTCBLeafAttr & AL)8292 EnforceTCBLeafAttr *Sema::mergeEnforceTCBLeafAttr(
8293 Decl *D, const EnforceTCBLeafAttr &AL) {
8294 return mergeEnforceTCBAttrImpl<EnforceTCBLeafAttr, EnforceTCBAttr>(
8295 *this, D, AL);
8296 }
8297
8298 //===----------------------------------------------------------------------===//
8299 // Top Level Sema Entry Points
8300 //===----------------------------------------------------------------------===//
8301
8302 // Returns true if the attribute must delay setting its arguments until after
8303 // template instantiation, and false otherwise.
MustDelayAttributeArguments(const ParsedAttr & AL)8304 static bool MustDelayAttributeArguments(const ParsedAttr &AL) {
8305 // Only attributes that accept expression parameter packs can delay arguments.
8306 if (!AL.acceptsExprPack())
8307 return false;
8308
8309 bool AttrHasVariadicArg = AL.hasVariadicArg();
8310 unsigned AttrNumArgs = AL.getNumArgMembers();
8311 for (size_t I = 0; I < std::min(AL.getNumArgs(), AttrNumArgs); ++I) {
8312 bool IsLastAttrArg = I == (AttrNumArgs - 1);
8313 // If the argument is the last argument and it is variadic it can contain
8314 // any expression.
8315 if (IsLastAttrArg && AttrHasVariadicArg)
8316 return false;
8317 Expr *E = AL.getArgAsExpr(I);
8318 bool ArgMemberCanHoldExpr = AL.isParamExpr(I);
8319 // If the expression is a pack expansion then arguments must be delayed
8320 // unless the argument is an expression and it is the last argument of the
8321 // attribute.
8322 if (isa<PackExpansionExpr>(E))
8323 return !(IsLastAttrArg && ArgMemberCanHoldExpr);
8324 // Last case is if the expression is value dependent then it must delay
8325 // arguments unless the corresponding argument is able to hold the
8326 // expression.
8327 if (E->isValueDependent() && !ArgMemberCanHoldExpr)
8328 return true;
8329 }
8330 return false;
8331 }
8332
8333 /// ProcessDeclAttribute - Apply the specific attribute to the specified decl if
8334 /// the attribute applies to decls. If the attribute is a type attribute, just
8335 /// silently ignore it if a GNU attribute.
8336 static void
ProcessDeclAttribute(Sema & S,Scope * scope,Decl * D,const ParsedAttr & AL,const Sema::ProcessDeclAttributeOptions & Options)8337 ProcessDeclAttribute(Sema &S, Scope *scope, Decl *D, const ParsedAttr &AL,
8338 const Sema::ProcessDeclAttributeOptions &Options) {
8339 if (AL.isInvalid() || AL.getKind() == ParsedAttr::IgnoredAttribute)
8340 return;
8341
8342 // Ignore C++11 attributes on declarator chunks: they appertain to the type
8343 // instead.
8344 // FIXME: We currently check the attribute syntax directly instead of using
8345 // isCXX11Attribute(), which currently erroneously classifies the C11
8346 // `_Alignas` attribute as a C++11 attribute. `_Alignas` can appear on the
8347 // `DeclSpec`, so we need to let it through here to make sure it is processed
8348 // appropriately. Once the behavior of isCXX11Attribute() is fixed, we can
8349 // go back to using that here.
8350 if (AL.getSyntax() == ParsedAttr::AS_CXX11 && !Options.IncludeCXX11Attributes)
8351 return;
8352
8353 // Unknown attributes are automatically warned on. Target-specific attributes
8354 // which do not apply to the current target architecture are treated as
8355 // though they were unknown attributes.
8356 if (AL.getKind() == ParsedAttr::UnknownAttribute ||
8357 !AL.existsInTarget(S.Context.getTargetInfo())) {
8358 S.Diag(AL.getLoc(),
8359 AL.isDeclspecAttribute()
8360 ? (unsigned)diag::warn_unhandled_ms_attribute_ignored
8361 : (unsigned)diag::warn_unknown_attribute_ignored)
8362 << AL << AL.getRange();
8363 return;
8364 }
8365
8366 // Check if argument population must delayed to after template instantiation.
8367 bool MustDelayArgs = MustDelayAttributeArguments(AL);
8368
8369 // Argument number check must be skipped if arguments are delayed.
8370 if (S.checkCommonAttributeFeatures(D, AL, MustDelayArgs))
8371 return;
8372
8373 if (MustDelayArgs) {
8374 AL.handleAttrWithDelayedArgs(S, D);
8375 return;
8376 }
8377
8378 switch (AL.getKind()) {
8379 default:
8380 if (AL.getInfo().handleDeclAttribute(S, D, AL) != ParsedAttrInfo::NotHandled)
8381 break;
8382 if (!AL.isStmtAttr()) {
8383 assert(AL.isTypeAttr() && "Non-type attribute not handled");
8384 }
8385 if (AL.isTypeAttr()) {
8386 if (Options.IgnoreTypeAttributes)
8387 break;
8388 if (!AL.isStandardAttributeSyntax()) {
8389 // Non-[[]] type attributes are handled in processTypeAttrs(); silently
8390 // move on.
8391 break;
8392 }
8393
8394 // According to the C and C++ standards, we should never see a
8395 // [[]] type attribute on a declaration. However, we have in the past
8396 // allowed some type attributes to "slide" to the `DeclSpec`, so we need
8397 // to continue to support this legacy behavior. We only do this, however,
8398 // if
8399 // - we actually have a `DeclSpec`, i.e. if we're looking at a
8400 // `DeclaratorDecl`, or
8401 // - we are looking at an alias-declaration, where historically we have
8402 // allowed type attributes after the identifier to slide to the type.
8403 if (AL.slidesFromDeclToDeclSpecLegacyBehavior() &&
8404 isa<DeclaratorDecl, TypeAliasDecl>(D)) {
8405 // Suggest moving the attribute to the type instead, but only for our
8406 // own vendor attributes; moving other vendors' attributes might hurt
8407 // portability.
8408 if (AL.isClangScope()) {
8409 S.Diag(AL.getLoc(), diag::warn_type_attribute_deprecated_on_decl)
8410 << AL << D->getLocation();
8411 }
8412
8413 // Allow this type attribute to be handled in processTypeAttrs();
8414 // silently move on.
8415 break;
8416 }
8417
8418 if (AL.getKind() == ParsedAttr::AT_Regparm) {
8419 // `regparm` is a special case: It's a type attribute but we still want
8420 // to treat it as if it had been written on the declaration because that
8421 // way we'll be able to handle it directly in `processTypeAttr()`.
8422 // If we treated `regparm` it as if it had been written on the
8423 // `DeclSpec`, the logic in `distributeFunctionTypeAttrFromDeclSepc()`
8424 // would try to move it to the declarator, but that doesn't work: We
8425 // can't remove the attribute from the list of declaration attributes
8426 // because it might be needed by other declarators in the same
8427 // declaration.
8428 break;
8429 }
8430
8431 if (AL.getKind() == ParsedAttr::AT_VectorSize) {
8432 // `vector_size` is a special case: It's a type attribute semantically,
8433 // but GCC expects the [[]] syntax to be written on the declaration (and
8434 // warns that the attribute has no effect if it is placed on the
8435 // decl-specifier-seq).
8436 // Silently move on and allow the attribute to be handled in
8437 // processTypeAttr().
8438 break;
8439 }
8440
8441 if (AL.getKind() == ParsedAttr::AT_NoDeref) {
8442 // FIXME: `noderef` currently doesn't work correctly in [[]] syntax.
8443 // See https://github.com/llvm/llvm-project/issues/55790 for details.
8444 // We allow processTypeAttrs() to emit a warning and silently move on.
8445 break;
8446 }
8447 }
8448 // N.B., ClangAttrEmitter.cpp emits a diagnostic helper that ensures a
8449 // statement attribute is not written on a declaration, but this code is
8450 // needed for type attributes as well as statement attributes in Attr.td
8451 // that do not list any subjects.
8452 S.Diag(AL.getLoc(), diag::err_attribute_invalid_on_decl)
8453 << AL << D->getLocation();
8454 break;
8455 case ParsedAttr::AT_Interrupt:
8456 handleInterruptAttr(S, D, AL);
8457 break;
8458 case ParsedAttr::AT_X86ForceAlignArgPointer:
8459 handleX86ForceAlignArgPointerAttr(S, D, AL);
8460 break;
8461 case ParsedAttr::AT_DLLExport:
8462 case ParsedAttr::AT_DLLImport:
8463 handleDLLAttr(S, D, AL);
8464 break;
8465 case ParsedAttr::AT_AMDGPUFlatWorkGroupSize:
8466 handleAMDGPUFlatWorkGroupSizeAttr(S, D, AL);
8467 break;
8468 case ParsedAttr::AT_AMDGPUWavesPerEU:
8469 handleAMDGPUWavesPerEUAttr(S, D, AL);
8470 break;
8471 case ParsedAttr::AT_AMDGPUNumSGPR:
8472 handleAMDGPUNumSGPRAttr(S, D, AL);
8473 break;
8474 case ParsedAttr::AT_AMDGPUNumVGPR:
8475 handleAMDGPUNumVGPRAttr(S, D, AL);
8476 break;
8477 case ParsedAttr::AT_AVRSignal:
8478 handleAVRSignalAttr(S, D, AL);
8479 break;
8480 case ParsedAttr::AT_BPFPreserveAccessIndex:
8481 handleBPFPreserveAccessIndexAttr(S, D, AL);
8482 break;
8483 case ParsedAttr::AT_BTFDeclTag:
8484 handleBTFDeclTagAttr(S, D, AL);
8485 break;
8486 case ParsedAttr::AT_WebAssemblyExportName:
8487 handleWebAssemblyExportNameAttr(S, D, AL);
8488 break;
8489 case ParsedAttr::AT_WebAssemblyImportModule:
8490 handleWebAssemblyImportModuleAttr(S, D, AL);
8491 break;
8492 case ParsedAttr::AT_WebAssemblyImportName:
8493 handleWebAssemblyImportNameAttr(S, D, AL);
8494 break;
8495 case ParsedAttr::AT_IBOutlet:
8496 handleIBOutlet(S, D, AL);
8497 break;
8498 case ParsedAttr::AT_IBOutletCollection:
8499 handleIBOutletCollection(S, D, AL);
8500 break;
8501 case ParsedAttr::AT_IFunc:
8502 handleIFuncAttr(S, D, AL);
8503 break;
8504 case ParsedAttr::AT_Alias:
8505 handleAliasAttr(S, D, AL);
8506 break;
8507 case ParsedAttr::AT_Aligned:
8508 handleAlignedAttr(S, D, AL);
8509 break;
8510 case ParsedAttr::AT_AlignValue:
8511 handleAlignValueAttr(S, D, AL);
8512 break;
8513 case ParsedAttr::AT_AllocSize:
8514 handleAllocSizeAttr(S, D, AL);
8515 break;
8516 case ParsedAttr::AT_AlwaysInline:
8517 handleAlwaysInlineAttr(S, D, AL);
8518 break;
8519 case ParsedAttr::AT_AnalyzerNoReturn:
8520 handleAnalyzerNoReturnAttr(S, D, AL);
8521 break;
8522 case ParsedAttr::AT_TLSModel:
8523 handleTLSModelAttr(S, D, AL);
8524 break;
8525 case ParsedAttr::AT_Annotate:
8526 handleAnnotateAttr(S, D, AL);
8527 break;
8528 case ParsedAttr::AT_Availability:
8529 handleAvailabilityAttr(S, D, AL);
8530 break;
8531 case ParsedAttr::AT_CarriesDependency:
8532 handleDependencyAttr(S, scope, D, AL);
8533 break;
8534 case ParsedAttr::AT_CPUDispatch:
8535 case ParsedAttr::AT_CPUSpecific:
8536 handleCPUSpecificAttr(S, D, AL);
8537 break;
8538 case ParsedAttr::AT_Common:
8539 handleCommonAttr(S, D, AL);
8540 break;
8541 case ParsedAttr::AT_CUDAConstant:
8542 handleConstantAttr(S, D, AL);
8543 break;
8544 case ParsedAttr::AT_PassObjectSize:
8545 handlePassObjectSizeAttr(S, D, AL);
8546 break;
8547 case ParsedAttr::AT_Constructor:
8548 handleConstructorAttr(S, D, AL);
8549 break;
8550 case ParsedAttr::AT_Deprecated:
8551 handleDeprecatedAttr(S, D, AL);
8552 break;
8553 case ParsedAttr::AT_Destructor:
8554 handleDestructorAttr(S, D, AL);
8555 break;
8556 case ParsedAttr::AT_EnableIf:
8557 handleEnableIfAttr(S, D, AL);
8558 break;
8559 case ParsedAttr::AT_Error:
8560 handleErrorAttr(S, D, AL);
8561 break;
8562 case ParsedAttr::AT_DiagnoseIf:
8563 handleDiagnoseIfAttr(S, D, AL);
8564 break;
8565 case ParsedAttr::AT_DiagnoseAsBuiltin:
8566 handleDiagnoseAsBuiltinAttr(S, D, AL);
8567 break;
8568 case ParsedAttr::AT_NoBuiltin:
8569 handleNoBuiltinAttr(S, D, AL);
8570 break;
8571 case ParsedAttr::AT_ExtVectorType:
8572 handleExtVectorTypeAttr(S, D, AL);
8573 break;
8574 case ParsedAttr::AT_ExternalSourceSymbol:
8575 handleExternalSourceSymbolAttr(S, D, AL);
8576 break;
8577 case ParsedAttr::AT_MinSize:
8578 handleMinSizeAttr(S, D, AL);
8579 break;
8580 case ParsedAttr::AT_OptimizeNone:
8581 handleOptimizeNoneAttr(S, D, AL);
8582 break;
8583 case ParsedAttr::AT_EnumExtensibility:
8584 handleEnumExtensibilityAttr(S, D, AL);
8585 break;
8586 case ParsedAttr::AT_SYCLKernel:
8587 handleSYCLKernelAttr(S, D, AL);
8588 break;
8589 case ParsedAttr::AT_SYCLSpecialClass:
8590 handleSimpleAttribute<SYCLSpecialClassAttr>(S, D, AL);
8591 break;
8592 case ParsedAttr::AT_Format:
8593 handleFormatAttr(S, D, AL);
8594 break;
8595 case ParsedAttr::AT_FormatArg:
8596 handleFormatArgAttr(S, D, AL);
8597 break;
8598 case ParsedAttr::AT_Callback:
8599 handleCallbackAttr(S, D, AL);
8600 break;
8601 case ParsedAttr::AT_CalledOnce:
8602 handleCalledOnceAttr(S, D, AL);
8603 break;
8604 case ParsedAttr::AT_CUDAGlobal:
8605 handleGlobalAttr(S, D, AL);
8606 break;
8607 case ParsedAttr::AT_CUDADevice:
8608 handleDeviceAttr(S, D, AL);
8609 break;
8610 case ParsedAttr::AT_HIPManaged:
8611 handleManagedAttr(S, D, AL);
8612 break;
8613 case ParsedAttr::AT_GNUInline:
8614 handleGNUInlineAttr(S, D, AL);
8615 break;
8616 case ParsedAttr::AT_CUDALaunchBounds:
8617 handleLaunchBoundsAttr(S, D, AL);
8618 break;
8619 case ParsedAttr::AT_Restrict:
8620 handleRestrictAttr(S, D, AL);
8621 break;
8622 case ParsedAttr::AT_Mode:
8623 handleModeAttr(S, D, AL);
8624 break;
8625 case ParsedAttr::AT_NonNull:
8626 if (auto *PVD = dyn_cast<ParmVarDecl>(D))
8627 handleNonNullAttrParameter(S, PVD, AL);
8628 else
8629 handleNonNullAttr(S, D, AL);
8630 break;
8631 case ParsedAttr::AT_ReturnsNonNull:
8632 handleReturnsNonNullAttr(S, D, AL);
8633 break;
8634 case ParsedAttr::AT_NoEscape:
8635 handleNoEscapeAttr(S, D, AL);
8636 break;
8637 case ParsedAttr::AT_AssumeAligned:
8638 handleAssumeAlignedAttr(S, D, AL);
8639 break;
8640 case ParsedAttr::AT_AllocAlign:
8641 handleAllocAlignAttr(S, D, AL);
8642 break;
8643 case ParsedAttr::AT_Ownership:
8644 handleOwnershipAttr(S, D, AL);
8645 break;
8646 case ParsedAttr::AT_Naked:
8647 handleNakedAttr(S, D, AL);
8648 break;
8649 case ParsedAttr::AT_NoReturn:
8650 handleNoReturnAttr(S, D, AL);
8651 break;
8652 case ParsedAttr::AT_CXX11NoReturn:
8653 handleStandardNoReturnAttr(S, D, AL);
8654 break;
8655 case ParsedAttr::AT_AnyX86NoCfCheck:
8656 handleNoCfCheckAttr(S, D, AL);
8657 break;
8658 case ParsedAttr::AT_NoThrow:
8659 if (!AL.isUsedAsTypeAttr())
8660 handleSimpleAttribute<NoThrowAttr>(S, D, AL);
8661 break;
8662 case ParsedAttr::AT_CUDAShared:
8663 handleSharedAttr(S, D, AL);
8664 break;
8665 case ParsedAttr::AT_VecReturn:
8666 handleVecReturnAttr(S, D, AL);
8667 break;
8668 case ParsedAttr::AT_ObjCOwnership:
8669 handleObjCOwnershipAttr(S, D, AL);
8670 break;
8671 case ParsedAttr::AT_ObjCPreciseLifetime:
8672 handleObjCPreciseLifetimeAttr(S, D, AL);
8673 break;
8674 case ParsedAttr::AT_ObjCReturnsInnerPointer:
8675 handleObjCReturnsInnerPointerAttr(S, D, AL);
8676 break;
8677 case ParsedAttr::AT_ObjCRequiresSuper:
8678 handleObjCRequiresSuperAttr(S, D, AL);
8679 break;
8680 case ParsedAttr::AT_ObjCBridge:
8681 handleObjCBridgeAttr(S, D, AL);
8682 break;
8683 case ParsedAttr::AT_ObjCBridgeMutable:
8684 handleObjCBridgeMutableAttr(S, D, AL);
8685 break;
8686 case ParsedAttr::AT_ObjCBridgeRelated:
8687 handleObjCBridgeRelatedAttr(S, D, AL);
8688 break;
8689 case ParsedAttr::AT_ObjCDesignatedInitializer:
8690 handleObjCDesignatedInitializer(S, D, AL);
8691 break;
8692 case ParsedAttr::AT_ObjCRuntimeName:
8693 handleObjCRuntimeName(S, D, AL);
8694 break;
8695 case ParsedAttr::AT_ObjCBoxable:
8696 handleObjCBoxable(S, D, AL);
8697 break;
8698 case ParsedAttr::AT_NSErrorDomain:
8699 handleNSErrorDomain(S, D, AL);
8700 break;
8701 case ParsedAttr::AT_CFConsumed:
8702 case ParsedAttr::AT_NSConsumed:
8703 case ParsedAttr::AT_OSConsumed:
8704 S.AddXConsumedAttr(D, AL, parsedAttrToRetainOwnershipKind(AL),
8705 /*IsTemplateInstantiation=*/false);
8706 break;
8707 case ParsedAttr::AT_OSReturnsRetainedOnZero:
8708 handleSimpleAttributeOrDiagnose<OSReturnsRetainedOnZeroAttr>(
8709 S, D, AL, isValidOSObjectOutParameter(D),
8710 diag::warn_ns_attribute_wrong_parameter_type,
8711 /*Extra Args=*/AL, /*pointer-to-OSObject-pointer*/ 3, AL.getRange());
8712 break;
8713 case ParsedAttr::AT_OSReturnsRetainedOnNonZero:
8714 handleSimpleAttributeOrDiagnose<OSReturnsRetainedOnNonZeroAttr>(
8715 S, D, AL, isValidOSObjectOutParameter(D),
8716 diag::warn_ns_attribute_wrong_parameter_type,
8717 /*Extra Args=*/AL, /*pointer-to-OSObject-poointer*/ 3, AL.getRange());
8718 break;
8719 case ParsedAttr::AT_NSReturnsAutoreleased:
8720 case ParsedAttr::AT_NSReturnsNotRetained:
8721 case ParsedAttr::AT_NSReturnsRetained:
8722 case ParsedAttr::AT_CFReturnsNotRetained:
8723 case ParsedAttr::AT_CFReturnsRetained:
8724 case ParsedAttr::AT_OSReturnsNotRetained:
8725 case ParsedAttr::AT_OSReturnsRetained:
8726 handleXReturnsXRetainedAttr(S, D, AL);
8727 break;
8728 case ParsedAttr::AT_WorkGroupSizeHint:
8729 handleWorkGroupSize<WorkGroupSizeHintAttr>(S, D, AL);
8730 break;
8731 case ParsedAttr::AT_ReqdWorkGroupSize:
8732 handleWorkGroupSize<ReqdWorkGroupSizeAttr>(S, D, AL);
8733 break;
8734 case ParsedAttr::AT_OpenCLIntelReqdSubGroupSize:
8735 handleSubGroupSize(S, D, AL);
8736 break;
8737 case ParsedAttr::AT_VecTypeHint:
8738 handleVecTypeHint(S, D, AL);
8739 break;
8740 case ParsedAttr::AT_InitPriority:
8741 handleInitPriorityAttr(S, D, AL);
8742 break;
8743 case ParsedAttr::AT_Packed:
8744 handlePackedAttr(S, D, AL);
8745 break;
8746 case ParsedAttr::AT_PreferredName:
8747 handlePreferredName(S, D, AL);
8748 break;
8749 case ParsedAttr::AT_Section:
8750 handleSectionAttr(S, D, AL);
8751 break;
8752 case ParsedAttr::AT_RandomizeLayout:
8753 handleRandomizeLayoutAttr(S, D, AL);
8754 break;
8755 case ParsedAttr::AT_NoRandomizeLayout:
8756 handleNoRandomizeLayoutAttr(S, D, AL);
8757 break;
8758 case ParsedAttr::AT_CodeSeg:
8759 handleCodeSegAttr(S, D, AL);
8760 break;
8761 case ParsedAttr::AT_Target:
8762 handleTargetAttr(S, D, AL);
8763 break;
8764 case ParsedAttr::AT_TargetClones:
8765 handleTargetClonesAttr(S, D, AL);
8766 break;
8767 case ParsedAttr::AT_MinVectorWidth:
8768 handleMinVectorWidthAttr(S, D, AL);
8769 break;
8770 case ParsedAttr::AT_Unavailable:
8771 handleAttrWithMessage<UnavailableAttr>(S, D, AL);
8772 break;
8773 case ParsedAttr::AT_Assumption:
8774 handleAssumumptionAttr(S, D, AL);
8775 break;
8776 case ParsedAttr::AT_ObjCDirect:
8777 handleObjCDirectAttr(S, D, AL);
8778 break;
8779 case ParsedAttr::AT_ObjCDirectMembers:
8780 handleObjCDirectMembersAttr(S, D, AL);
8781 handleSimpleAttribute<ObjCDirectMembersAttr>(S, D, AL);
8782 break;
8783 case ParsedAttr::AT_ObjCExplicitProtocolImpl:
8784 handleObjCSuppresProtocolAttr(S, D, AL);
8785 break;
8786 case ParsedAttr::AT_Unused:
8787 handleUnusedAttr(S, D, AL);
8788 break;
8789 case ParsedAttr::AT_Visibility:
8790 handleVisibilityAttr(S, D, AL, false);
8791 break;
8792 case ParsedAttr::AT_TypeVisibility:
8793 handleVisibilityAttr(S, D, AL, true);
8794 break;
8795 case ParsedAttr::AT_WarnUnusedResult:
8796 handleWarnUnusedResult(S, D, AL);
8797 break;
8798 case ParsedAttr::AT_WeakRef:
8799 handleWeakRefAttr(S, D, AL);
8800 break;
8801 case ParsedAttr::AT_WeakImport:
8802 handleWeakImportAttr(S, D, AL);
8803 break;
8804 case ParsedAttr::AT_TransparentUnion:
8805 handleTransparentUnionAttr(S, D, AL);
8806 break;
8807 case ParsedAttr::AT_ObjCMethodFamily:
8808 handleObjCMethodFamilyAttr(S, D, AL);
8809 break;
8810 case ParsedAttr::AT_ObjCNSObject:
8811 handleObjCNSObject(S, D, AL);
8812 break;
8813 case ParsedAttr::AT_ObjCIndependentClass:
8814 handleObjCIndependentClass(S, D, AL);
8815 break;
8816 case ParsedAttr::AT_Blocks:
8817 handleBlocksAttr(S, D, AL);
8818 break;
8819 case ParsedAttr::AT_Sentinel:
8820 handleSentinelAttr(S, D, AL);
8821 break;
8822 case ParsedAttr::AT_Cleanup:
8823 handleCleanupAttr(S, D, AL);
8824 break;
8825 case ParsedAttr::AT_NoDebug:
8826 handleNoDebugAttr(S, D, AL);
8827 break;
8828 case ParsedAttr::AT_CmseNSEntry:
8829 handleCmseNSEntryAttr(S, D, AL);
8830 break;
8831 case ParsedAttr::AT_StdCall:
8832 case ParsedAttr::AT_CDecl:
8833 case ParsedAttr::AT_FastCall:
8834 case ParsedAttr::AT_ThisCall:
8835 case ParsedAttr::AT_Pascal:
8836 case ParsedAttr::AT_RegCall:
8837 case ParsedAttr::AT_SwiftCall:
8838 case ParsedAttr::AT_SwiftAsyncCall:
8839 case ParsedAttr::AT_VectorCall:
8840 case ParsedAttr::AT_MSABI:
8841 case ParsedAttr::AT_SysVABI:
8842 case ParsedAttr::AT_Pcs:
8843 case ParsedAttr::AT_IntelOclBicc:
8844 case ParsedAttr::AT_PreserveMost:
8845 case ParsedAttr::AT_PreserveAll:
8846 case ParsedAttr::AT_AArch64VectorPcs:
8847 case ParsedAttr::AT_AArch64SVEPcs:
8848 case ParsedAttr::AT_AMDGPUKernelCall:
8849 handleCallConvAttr(S, D, AL);
8850 break;
8851 case ParsedAttr::AT_Suppress:
8852 handleSuppressAttr(S, D, AL);
8853 break;
8854 case ParsedAttr::AT_Owner:
8855 case ParsedAttr::AT_Pointer:
8856 handleLifetimeCategoryAttr(S, D, AL);
8857 break;
8858 case ParsedAttr::AT_OpenCLAccess:
8859 handleOpenCLAccessAttr(S, D, AL);
8860 break;
8861 case ParsedAttr::AT_OpenCLNoSVM:
8862 handleOpenCLNoSVMAttr(S, D, AL);
8863 break;
8864 case ParsedAttr::AT_SwiftContext:
8865 S.AddParameterABIAttr(D, AL, ParameterABI::SwiftContext);
8866 break;
8867 case ParsedAttr::AT_SwiftAsyncContext:
8868 S.AddParameterABIAttr(D, AL, ParameterABI::SwiftAsyncContext);
8869 break;
8870 case ParsedAttr::AT_SwiftErrorResult:
8871 S.AddParameterABIAttr(D, AL, ParameterABI::SwiftErrorResult);
8872 break;
8873 case ParsedAttr::AT_SwiftIndirectResult:
8874 S.AddParameterABIAttr(D, AL, ParameterABI::SwiftIndirectResult);
8875 break;
8876 case ParsedAttr::AT_InternalLinkage:
8877 handleInternalLinkageAttr(S, D, AL);
8878 break;
8879 case ParsedAttr::AT_ZeroCallUsedRegs:
8880 handleZeroCallUsedRegsAttr(S, D, AL);
8881 break;
8882 case ParsedAttr::AT_FunctionReturnThunks:
8883 handleFunctionReturnThunksAttr(S, D, AL);
8884 break;
8885
8886 // Microsoft attributes:
8887 case ParsedAttr::AT_LayoutVersion:
8888 handleLayoutVersion(S, D, AL);
8889 break;
8890 case ParsedAttr::AT_Uuid:
8891 handleUuidAttr(S, D, AL);
8892 break;
8893 case ParsedAttr::AT_MSInheritance:
8894 handleMSInheritanceAttr(S, D, AL);
8895 break;
8896 case ParsedAttr::AT_Thread:
8897 handleDeclspecThreadAttr(S, D, AL);
8898 break;
8899
8900 // HLSL attributes:
8901 case ParsedAttr::AT_HLSLNumThreads:
8902 handleHLSLNumThreadsAttr(S, D, AL);
8903 break;
8904 case ParsedAttr::AT_HLSLSV_GroupIndex:
8905 handleHLSLSVGroupIndexAttr(S, D, AL);
8906 break;
8907 case ParsedAttr::AT_HLSLShader:
8908 handleHLSLShaderAttr(S, D, AL);
8909 break;
8910
8911 case ParsedAttr::AT_AbiTag:
8912 handleAbiTagAttr(S, D, AL);
8913 break;
8914 case ParsedAttr::AT_CFGuard:
8915 handleCFGuardAttr(S, D, AL);
8916 break;
8917
8918 // Thread safety attributes:
8919 case ParsedAttr::AT_AssertExclusiveLock:
8920 handleAssertExclusiveLockAttr(S, D, AL);
8921 break;
8922 case ParsedAttr::AT_AssertSharedLock:
8923 handleAssertSharedLockAttr(S, D, AL);
8924 break;
8925 case ParsedAttr::AT_PtGuardedVar:
8926 handlePtGuardedVarAttr(S, D, AL);
8927 break;
8928 case ParsedAttr::AT_NoSanitize:
8929 handleNoSanitizeAttr(S, D, AL);
8930 break;
8931 case ParsedAttr::AT_NoSanitizeSpecific:
8932 handleNoSanitizeSpecificAttr(S, D, AL);
8933 break;
8934 case ParsedAttr::AT_GuardedBy:
8935 handleGuardedByAttr(S, D, AL);
8936 break;
8937 case ParsedAttr::AT_PtGuardedBy:
8938 handlePtGuardedByAttr(S, D, AL);
8939 break;
8940 case ParsedAttr::AT_ExclusiveTrylockFunction:
8941 handleExclusiveTrylockFunctionAttr(S, D, AL);
8942 break;
8943 case ParsedAttr::AT_LockReturned:
8944 handleLockReturnedAttr(S, D, AL);
8945 break;
8946 case ParsedAttr::AT_LocksExcluded:
8947 handleLocksExcludedAttr(S, D, AL);
8948 break;
8949 case ParsedAttr::AT_SharedTrylockFunction:
8950 handleSharedTrylockFunctionAttr(S, D, AL);
8951 break;
8952 case ParsedAttr::AT_AcquiredBefore:
8953 handleAcquiredBeforeAttr(S, D, AL);
8954 break;
8955 case ParsedAttr::AT_AcquiredAfter:
8956 handleAcquiredAfterAttr(S, D, AL);
8957 break;
8958
8959 // Capability analysis attributes.
8960 case ParsedAttr::AT_Capability:
8961 case ParsedAttr::AT_Lockable:
8962 handleCapabilityAttr(S, D, AL);
8963 break;
8964 case ParsedAttr::AT_RequiresCapability:
8965 handleRequiresCapabilityAttr(S, D, AL);
8966 break;
8967
8968 case ParsedAttr::AT_AssertCapability:
8969 handleAssertCapabilityAttr(S, D, AL);
8970 break;
8971 case ParsedAttr::AT_AcquireCapability:
8972 handleAcquireCapabilityAttr(S, D, AL);
8973 break;
8974 case ParsedAttr::AT_ReleaseCapability:
8975 handleReleaseCapabilityAttr(S, D, AL);
8976 break;
8977 case ParsedAttr::AT_TryAcquireCapability:
8978 handleTryAcquireCapabilityAttr(S, D, AL);
8979 break;
8980
8981 // Consumed analysis attributes.
8982 case ParsedAttr::AT_Consumable:
8983 handleConsumableAttr(S, D, AL);
8984 break;
8985 case ParsedAttr::AT_CallableWhen:
8986 handleCallableWhenAttr(S, D, AL);
8987 break;
8988 case ParsedAttr::AT_ParamTypestate:
8989 handleParamTypestateAttr(S, D, AL);
8990 break;
8991 case ParsedAttr::AT_ReturnTypestate:
8992 handleReturnTypestateAttr(S, D, AL);
8993 break;
8994 case ParsedAttr::AT_SetTypestate:
8995 handleSetTypestateAttr(S, D, AL);
8996 break;
8997 case ParsedAttr::AT_TestTypestate:
8998 handleTestTypestateAttr(S, D, AL);
8999 break;
9000
9001 // Type safety attributes.
9002 case ParsedAttr::AT_ArgumentWithTypeTag:
9003 handleArgumentWithTypeTagAttr(S, D, AL);
9004 break;
9005 case ParsedAttr::AT_TypeTagForDatatype:
9006 handleTypeTagForDatatypeAttr(S, D, AL);
9007 break;
9008
9009 // Swift attributes.
9010 case ParsedAttr::AT_SwiftAsyncName:
9011 handleSwiftAsyncName(S, D, AL);
9012 break;
9013 case ParsedAttr::AT_SwiftAttr:
9014 handleSwiftAttrAttr(S, D, AL);
9015 break;
9016 case ParsedAttr::AT_SwiftBridge:
9017 handleSwiftBridge(S, D, AL);
9018 break;
9019 case ParsedAttr::AT_SwiftError:
9020 handleSwiftError(S, D, AL);
9021 break;
9022 case ParsedAttr::AT_SwiftName:
9023 handleSwiftName(S, D, AL);
9024 break;
9025 case ParsedAttr::AT_SwiftNewType:
9026 handleSwiftNewType(S, D, AL);
9027 break;
9028 case ParsedAttr::AT_SwiftAsync:
9029 handleSwiftAsyncAttr(S, D, AL);
9030 break;
9031 case ParsedAttr::AT_SwiftAsyncError:
9032 handleSwiftAsyncError(S, D, AL);
9033 break;
9034
9035 // XRay attributes.
9036 case ParsedAttr::AT_XRayLogArgs:
9037 handleXRayLogArgsAttr(S, D, AL);
9038 break;
9039
9040 case ParsedAttr::AT_PatchableFunctionEntry:
9041 handlePatchableFunctionEntryAttr(S, D, AL);
9042 break;
9043
9044 case ParsedAttr::AT_AlwaysDestroy:
9045 case ParsedAttr::AT_NoDestroy:
9046 handleDestroyAttr(S, D, AL);
9047 break;
9048
9049 case ParsedAttr::AT_Uninitialized:
9050 handleUninitializedAttr(S, D, AL);
9051 break;
9052
9053 case ParsedAttr::AT_ObjCExternallyRetained:
9054 handleObjCExternallyRetainedAttr(S, D, AL);
9055 break;
9056
9057 case ParsedAttr::AT_MIGServerRoutine:
9058 handleMIGServerRoutineAttr(S, D, AL);
9059 break;
9060
9061 case ParsedAttr::AT_MSAllocator:
9062 handleMSAllocatorAttr(S, D, AL);
9063 break;
9064
9065 case ParsedAttr::AT_ArmBuiltinAlias:
9066 handleArmBuiltinAliasAttr(S, D, AL);
9067 break;
9068
9069 case ParsedAttr::AT_AcquireHandle:
9070 handleAcquireHandleAttr(S, D, AL);
9071 break;
9072
9073 case ParsedAttr::AT_ReleaseHandle:
9074 handleHandleAttr<ReleaseHandleAttr>(S, D, AL);
9075 break;
9076
9077 case ParsedAttr::AT_UseHandle:
9078 handleHandleAttr<UseHandleAttr>(S, D, AL);
9079 break;
9080
9081 case ParsedAttr::AT_EnforceTCB:
9082 handleEnforceTCBAttr<EnforceTCBAttr, EnforceTCBLeafAttr>(S, D, AL);
9083 break;
9084
9085 case ParsedAttr::AT_EnforceTCBLeaf:
9086 handleEnforceTCBAttr<EnforceTCBLeafAttr, EnforceTCBAttr>(S, D, AL);
9087 break;
9088
9089 case ParsedAttr::AT_BuiltinAlias:
9090 handleBuiltinAliasAttr(S, D, AL);
9091 break;
9092
9093 case ParsedAttr::AT_UsingIfExists:
9094 handleSimpleAttribute<UsingIfExistsAttr>(S, D, AL);
9095 break;
9096 }
9097 }
9098
9099 /// ProcessDeclAttributeList - Apply all the decl attributes in the specified
9100 /// attribute list to the specified decl, ignoring any type attributes.
ProcessDeclAttributeList(Scope * S,Decl * D,const ParsedAttributesView & AttrList,const ProcessDeclAttributeOptions & Options)9101 void Sema::ProcessDeclAttributeList(
9102 Scope *S, Decl *D, const ParsedAttributesView &AttrList,
9103 const ProcessDeclAttributeOptions &Options) {
9104 if (AttrList.empty())
9105 return;
9106
9107 for (const ParsedAttr &AL : AttrList)
9108 ProcessDeclAttribute(*this, S, D, AL, Options);
9109
9110 // FIXME: We should be able to handle these cases in TableGen.
9111 // GCC accepts
9112 // static int a9 __attribute__((weakref));
9113 // but that looks really pointless. We reject it.
9114 if (D->hasAttr<WeakRefAttr>() && !D->hasAttr<AliasAttr>()) {
9115 Diag(AttrList.begin()->getLoc(), diag::err_attribute_weakref_without_alias)
9116 << cast<NamedDecl>(D);
9117 D->dropAttr<WeakRefAttr>();
9118 return;
9119 }
9120
9121 // FIXME: We should be able to handle this in TableGen as well. It would be
9122 // good to have a way to specify "these attributes must appear as a group",
9123 // for these. Additionally, it would be good to have a way to specify "these
9124 // attribute must never appear as a group" for attributes like cold and hot.
9125 if (!D->hasAttr<OpenCLKernelAttr>()) {
9126 // These attributes cannot be applied to a non-kernel function.
9127 if (const auto *A = D->getAttr<ReqdWorkGroupSizeAttr>()) {
9128 // FIXME: This emits a different error message than
9129 // diag::err_attribute_wrong_decl_type + ExpectedKernelFunction.
9130 Diag(D->getLocation(), diag::err_opencl_kernel_attr) << A;
9131 D->setInvalidDecl();
9132 } else if (const auto *A = D->getAttr<WorkGroupSizeHintAttr>()) {
9133 Diag(D->getLocation(), diag::err_opencl_kernel_attr) << A;
9134 D->setInvalidDecl();
9135 } else if (const auto *A = D->getAttr<VecTypeHintAttr>()) {
9136 Diag(D->getLocation(), diag::err_opencl_kernel_attr) << A;
9137 D->setInvalidDecl();
9138 } else if (const auto *A = D->getAttr<OpenCLIntelReqdSubGroupSizeAttr>()) {
9139 Diag(D->getLocation(), diag::err_opencl_kernel_attr) << A;
9140 D->setInvalidDecl();
9141 } else if (!D->hasAttr<CUDAGlobalAttr>()) {
9142 if (const auto *A = D->getAttr<AMDGPUFlatWorkGroupSizeAttr>()) {
9143 Diag(D->getLocation(), diag::err_attribute_wrong_decl_type)
9144 << A << ExpectedKernelFunction;
9145 D->setInvalidDecl();
9146 } else if (const auto *A = D->getAttr<AMDGPUWavesPerEUAttr>()) {
9147 Diag(D->getLocation(), diag::err_attribute_wrong_decl_type)
9148 << A << ExpectedKernelFunction;
9149 D->setInvalidDecl();
9150 } else if (const auto *A = D->getAttr<AMDGPUNumSGPRAttr>()) {
9151 Diag(D->getLocation(), diag::err_attribute_wrong_decl_type)
9152 << A << ExpectedKernelFunction;
9153 D->setInvalidDecl();
9154 } else if (const auto *A = D->getAttr<AMDGPUNumVGPRAttr>()) {
9155 Diag(D->getLocation(), diag::err_attribute_wrong_decl_type)
9156 << A << ExpectedKernelFunction;
9157 D->setInvalidDecl();
9158 }
9159 }
9160 }
9161
9162 // Do this check after processing D's attributes because the attribute
9163 // objc_method_family can change whether the given method is in the init
9164 // family, and it can be applied after objc_designated_initializer. This is a
9165 // bit of a hack, but we need it to be compatible with versions of clang that
9166 // processed the attribute list in the wrong order.
9167 if (D->hasAttr<ObjCDesignatedInitializerAttr>() &&
9168 cast<ObjCMethodDecl>(D)->getMethodFamily() != OMF_init) {
9169 Diag(D->getLocation(), diag::err_designated_init_attr_non_init);
9170 D->dropAttr<ObjCDesignatedInitializerAttr>();
9171 }
9172 }
9173
9174 // Helper for delayed processing TransparentUnion or BPFPreserveAccessIndexAttr
9175 // attribute.
ProcessDeclAttributeDelayed(Decl * D,const ParsedAttributesView & AttrList)9176 void Sema::ProcessDeclAttributeDelayed(Decl *D,
9177 const ParsedAttributesView &AttrList) {
9178 for (const ParsedAttr &AL : AttrList)
9179 if (AL.getKind() == ParsedAttr::AT_TransparentUnion) {
9180 handleTransparentUnionAttr(*this, D, AL);
9181 break;
9182 }
9183
9184 // For BPFPreserveAccessIndexAttr, we want to populate the attributes
9185 // to fields and inner records as well.
9186 if (D && D->hasAttr<BPFPreserveAccessIndexAttr>())
9187 handleBPFPreserveAIRecord(*this, cast<RecordDecl>(D));
9188 }
9189
9190 // Annotation attributes are the only attributes allowed after an access
9191 // specifier.
ProcessAccessDeclAttributeList(AccessSpecDecl * ASDecl,const ParsedAttributesView & AttrList)9192 bool Sema::ProcessAccessDeclAttributeList(
9193 AccessSpecDecl *ASDecl, const ParsedAttributesView &AttrList) {
9194 for (const ParsedAttr &AL : AttrList) {
9195 if (AL.getKind() == ParsedAttr::AT_Annotate) {
9196 ProcessDeclAttribute(*this, nullptr, ASDecl, AL,
9197 ProcessDeclAttributeOptions());
9198 } else {
9199 Diag(AL.getLoc(), diag::err_only_annotate_after_access_spec);
9200 return true;
9201 }
9202 }
9203 return false;
9204 }
9205
9206 /// checkUnusedDeclAttributes - Check a list of attributes to see if it
9207 /// contains any decl attributes that we should warn about.
checkUnusedDeclAttributes(Sema & S,const ParsedAttributesView & A)9208 static void checkUnusedDeclAttributes(Sema &S, const ParsedAttributesView &A) {
9209 for (const ParsedAttr &AL : A) {
9210 // Only warn if the attribute is an unignored, non-type attribute.
9211 if (AL.isUsedAsTypeAttr() || AL.isInvalid())
9212 continue;
9213 if (AL.getKind() == ParsedAttr::IgnoredAttribute)
9214 continue;
9215
9216 if (AL.getKind() == ParsedAttr::UnknownAttribute) {
9217 S.Diag(AL.getLoc(), diag::warn_unknown_attribute_ignored)
9218 << AL << AL.getRange();
9219 } else {
9220 S.Diag(AL.getLoc(), diag::warn_attribute_not_on_decl) << AL
9221 << AL.getRange();
9222 }
9223 }
9224 }
9225
9226 /// checkUnusedDeclAttributes - Given a declarator which is not being
9227 /// used to build a declaration, complain about any decl attributes
9228 /// which might be lying around on it.
checkUnusedDeclAttributes(Declarator & D)9229 void Sema::checkUnusedDeclAttributes(Declarator &D) {
9230 ::checkUnusedDeclAttributes(*this, D.getDeclarationAttributes());
9231 ::checkUnusedDeclAttributes(*this, D.getDeclSpec().getAttributes());
9232 ::checkUnusedDeclAttributes(*this, D.getAttributes());
9233 for (unsigned i = 0, e = D.getNumTypeObjects(); i != e; ++i)
9234 ::checkUnusedDeclAttributes(*this, D.getTypeObject(i).getAttrs());
9235 }
9236
9237 /// DeclClonePragmaWeak - clone existing decl (maybe definition),
9238 /// \#pragma weak needs a non-definition decl and source may not have one.
DeclClonePragmaWeak(NamedDecl * ND,const IdentifierInfo * II,SourceLocation Loc)9239 NamedDecl *Sema::DeclClonePragmaWeak(NamedDecl *ND, const IdentifierInfo *II,
9240 SourceLocation Loc) {
9241 assert(isa<FunctionDecl>(ND) || isa<VarDecl>(ND));
9242 NamedDecl *NewD = nullptr;
9243 if (auto *FD = dyn_cast<FunctionDecl>(ND)) {
9244 FunctionDecl *NewFD;
9245 // FIXME: Missing call to CheckFunctionDeclaration().
9246 // FIXME: Mangling?
9247 // FIXME: Is the qualifier info correct?
9248 // FIXME: Is the DeclContext correct?
9249 NewFD = FunctionDecl::Create(
9250 FD->getASTContext(), FD->getDeclContext(), Loc, Loc,
9251 DeclarationName(II), FD->getType(), FD->getTypeSourceInfo(), SC_None,
9252 getCurFPFeatures().isFPConstrained(), false /*isInlineSpecified*/,
9253 FD->hasPrototype(), ConstexprSpecKind::Unspecified,
9254 FD->getTrailingRequiresClause());
9255 NewD = NewFD;
9256
9257 if (FD->getQualifier())
9258 NewFD->setQualifierInfo(FD->getQualifierLoc());
9259
9260 // Fake up parameter variables; they are declared as if this were
9261 // a typedef.
9262 QualType FDTy = FD->getType();
9263 if (const auto *FT = FDTy->getAs<FunctionProtoType>()) {
9264 SmallVector<ParmVarDecl*, 16> Params;
9265 for (const auto &AI : FT->param_types()) {
9266 ParmVarDecl *Param = BuildParmVarDeclForTypedef(NewFD, Loc, AI);
9267 Param->setScopeInfo(0, Params.size());
9268 Params.push_back(Param);
9269 }
9270 NewFD->setParams(Params);
9271 }
9272 } else if (auto *VD = dyn_cast<VarDecl>(ND)) {
9273 NewD = VarDecl::Create(VD->getASTContext(), VD->getDeclContext(),
9274 VD->getInnerLocStart(), VD->getLocation(), II,
9275 VD->getType(), VD->getTypeSourceInfo(),
9276 VD->getStorageClass());
9277 if (VD->getQualifier())
9278 cast<VarDecl>(NewD)->setQualifierInfo(VD->getQualifierLoc());
9279 }
9280 return NewD;
9281 }
9282
9283 /// DeclApplyPragmaWeak - A declaration (maybe definition) needs \#pragma weak
9284 /// applied to it, possibly with an alias.
DeclApplyPragmaWeak(Scope * S,NamedDecl * ND,const WeakInfo & W)9285 void Sema::DeclApplyPragmaWeak(Scope *S, NamedDecl *ND, const WeakInfo &W) {
9286 if (W.getAlias()) { // clone decl, impersonate __attribute(weak,alias(...))
9287 IdentifierInfo *NDId = ND->getIdentifier();
9288 NamedDecl *NewD = DeclClonePragmaWeak(ND, W.getAlias(), W.getLocation());
9289 NewD->addAttr(
9290 AliasAttr::CreateImplicit(Context, NDId->getName(), W.getLocation()));
9291 NewD->addAttr(WeakAttr::CreateImplicit(Context, W.getLocation(),
9292 AttributeCommonInfo::AS_Pragma));
9293 WeakTopLevelDecl.push_back(NewD);
9294 // FIXME: "hideous" code from Sema::LazilyCreateBuiltin
9295 // to insert Decl at TU scope, sorry.
9296 DeclContext *SavedContext = CurContext;
9297 CurContext = Context.getTranslationUnitDecl();
9298 NewD->setDeclContext(CurContext);
9299 NewD->setLexicalDeclContext(CurContext);
9300 PushOnScopeChains(NewD, S);
9301 CurContext = SavedContext;
9302 } else { // just add weak to existing
9303 ND->addAttr(WeakAttr::CreateImplicit(Context, W.getLocation(),
9304 AttributeCommonInfo::AS_Pragma));
9305 }
9306 }
9307
ProcessPragmaWeak(Scope * S,Decl * D)9308 void Sema::ProcessPragmaWeak(Scope *S, Decl *D) {
9309 // It's valid to "forward-declare" #pragma weak, in which case we
9310 // have to do this.
9311 LoadExternalWeakUndeclaredIdentifiers();
9312 if (WeakUndeclaredIdentifiers.empty())
9313 return;
9314 NamedDecl *ND = nullptr;
9315 if (auto *VD = dyn_cast<VarDecl>(D))
9316 if (VD->isExternC())
9317 ND = VD;
9318 if (auto *FD = dyn_cast<FunctionDecl>(D))
9319 if (FD->isExternC())
9320 ND = FD;
9321 if (!ND)
9322 return;
9323 if (IdentifierInfo *Id = ND->getIdentifier()) {
9324 auto I = WeakUndeclaredIdentifiers.find(Id);
9325 if (I != WeakUndeclaredIdentifiers.end()) {
9326 auto &WeakInfos = I->second;
9327 for (const auto &W : WeakInfos)
9328 DeclApplyPragmaWeak(S, ND, W);
9329 std::remove_reference_t<decltype(WeakInfos)> EmptyWeakInfos;
9330 WeakInfos.swap(EmptyWeakInfos);
9331 }
9332 }
9333 }
9334
9335 /// ProcessDeclAttributes - Given a declarator (PD) with attributes indicated in
9336 /// it, apply them to D. This is a bit tricky because PD can have attributes
9337 /// specified in many different places, and we need to find and apply them all.
ProcessDeclAttributes(Scope * S,Decl * D,const Declarator & PD)9338 void Sema::ProcessDeclAttributes(Scope *S, Decl *D, const Declarator &PD) {
9339 // Ordering of attributes can be important, so we take care to process
9340 // attributes in the order in which they appeared in the source code.
9341
9342 // First, process attributes that appeared on the declaration itself (but
9343 // only if they don't have the legacy behavior of "sliding" to the DeclSepc).
9344 ParsedAttributesView NonSlidingAttrs;
9345 for (ParsedAttr &AL : PD.getDeclarationAttributes()) {
9346 if (AL.slidesFromDeclToDeclSpecLegacyBehavior()) {
9347 // Skip processing the attribute, but do check if it appertains to the
9348 // declaration. This is needed for the `MatrixType` attribute, which,
9349 // despite being a type attribute, defines a `SubjectList` that only
9350 // allows it to be used on typedef declarations.
9351 AL.diagnoseAppertainsTo(*this, D);
9352 } else {
9353 NonSlidingAttrs.addAtEnd(&AL);
9354 }
9355 }
9356 ProcessDeclAttributeList(S, D, NonSlidingAttrs);
9357
9358 // Apply decl attributes from the DeclSpec if present.
9359 if (!PD.getDeclSpec().getAttributes().empty()) {
9360 ProcessDeclAttributeList(S, D, PD.getDeclSpec().getAttributes(),
9361 ProcessDeclAttributeOptions()
9362 .WithIncludeCXX11Attributes(false)
9363 .WithIgnoreTypeAttributes(true));
9364 }
9365
9366 // Walk the declarator structure, applying decl attributes that were in a type
9367 // position to the decl itself. This handles cases like:
9368 // int *__attr__(x)** D;
9369 // when X is a decl attribute.
9370 for (unsigned i = 0, e = PD.getNumTypeObjects(); i != e; ++i) {
9371 ProcessDeclAttributeList(S, D, PD.getTypeObject(i).getAttrs(),
9372 ProcessDeclAttributeOptions()
9373 .WithIncludeCXX11Attributes(false)
9374 .WithIgnoreTypeAttributes(true));
9375 }
9376
9377 // Finally, apply any attributes on the decl itself.
9378 ProcessDeclAttributeList(S, D, PD.getAttributes());
9379
9380 // Apply additional attributes specified by '#pragma clang attribute'.
9381 AddPragmaAttributes(S, D);
9382 }
9383
9384 /// Is the given declaration allowed to use a forbidden type?
9385 /// If so, it'll still be annotated with an attribute that makes it
9386 /// illegal to actually use.
isForbiddenTypeAllowed(Sema & S,Decl * D,const DelayedDiagnostic & diag,UnavailableAttr::ImplicitReason & reason)9387 static bool isForbiddenTypeAllowed(Sema &S, Decl *D,
9388 const DelayedDiagnostic &diag,
9389 UnavailableAttr::ImplicitReason &reason) {
9390 // Private ivars are always okay. Unfortunately, people don't
9391 // always properly make their ivars private, even in system headers.
9392 // Plus we need to make fields okay, too.
9393 if (!isa<FieldDecl>(D) && !isa<ObjCPropertyDecl>(D) &&
9394 !isa<FunctionDecl>(D))
9395 return false;
9396
9397 // Silently accept unsupported uses of __weak in both user and system
9398 // declarations when it's been disabled, for ease of integration with
9399 // -fno-objc-arc files. We do have to take some care against attempts
9400 // to define such things; for now, we've only done that for ivars
9401 // and properties.
9402 if ((isa<ObjCIvarDecl>(D) || isa<ObjCPropertyDecl>(D))) {
9403 if (diag.getForbiddenTypeDiagnostic() == diag::err_arc_weak_disabled ||
9404 diag.getForbiddenTypeDiagnostic() == diag::err_arc_weak_no_runtime) {
9405 reason = UnavailableAttr::IR_ForbiddenWeak;
9406 return true;
9407 }
9408 }
9409
9410 // Allow all sorts of things in system headers.
9411 if (S.Context.getSourceManager().isInSystemHeader(D->getLocation())) {
9412 // Currently, all the failures dealt with this way are due to ARC
9413 // restrictions.
9414 reason = UnavailableAttr::IR_ARCForbiddenType;
9415 return true;
9416 }
9417
9418 return false;
9419 }
9420
9421 /// Handle a delayed forbidden-type diagnostic.
handleDelayedForbiddenType(Sema & S,DelayedDiagnostic & DD,Decl * D)9422 static void handleDelayedForbiddenType(Sema &S, DelayedDiagnostic &DD,
9423 Decl *D) {
9424 auto Reason = UnavailableAttr::IR_None;
9425 if (D && isForbiddenTypeAllowed(S, D, DD, Reason)) {
9426 assert(Reason && "didn't set reason?");
9427 D->addAttr(UnavailableAttr::CreateImplicit(S.Context, "", Reason, DD.Loc));
9428 return;
9429 }
9430 if (S.getLangOpts().ObjCAutoRefCount)
9431 if (const auto *FD = dyn_cast<FunctionDecl>(D)) {
9432 // FIXME: we may want to suppress diagnostics for all
9433 // kind of forbidden type messages on unavailable functions.
9434 if (FD->hasAttr<UnavailableAttr>() &&
9435 DD.getForbiddenTypeDiagnostic() ==
9436 diag::err_arc_array_param_no_ownership) {
9437 DD.Triggered = true;
9438 return;
9439 }
9440 }
9441
9442 S.Diag(DD.Loc, DD.getForbiddenTypeDiagnostic())
9443 << DD.getForbiddenTypeOperand() << DD.getForbiddenTypeArgument();
9444 DD.Triggered = true;
9445 }
9446
9447
PopParsingDeclaration(ParsingDeclState state,Decl * decl)9448 void Sema::PopParsingDeclaration(ParsingDeclState state, Decl *decl) {
9449 assert(DelayedDiagnostics.getCurrentPool());
9450 DelayedDiagnosticPool &poppedPool = *DelayedDiagnostics.getCurrentPool();
9451 DelayedDiagnostics.popWithoutEmitting(state);
9452
9453 // When delaying diagnostics to run in the context of a parsed
9454 // declaration, we only want to actually emit anything if parsing
9455 // succeeds.
9456 if (!decl) return;
9457
9458 // We emit all the active diagnostics in this pool or any of its
9459 // parents. In general, we'll get one pool for the decl spec
9460 // and a child pool for each declarator; in a decl group like:
9461 // deprecated_typedef foo, *bar, baz();
9462 // only the declarator pops will be passed decls. This is correct;
9463 // we really do need to consider delayed diagnostics from the decl spec
9464 // for each of the different declarations.
9465 const DelayedDiagnosticPool *pool = &poppedPool;
9466 do {
9467 bool AnyAccessFailures = false;
9468 for (DelayedDiagnosticPool::pool_iterator
9469 i = pool->pool_begin(), e = pool->pool_end(); i != e; ++i) {
9470 // This const_cast is a bit lame. Really, Triggered should be mutable.
9471 DelayedDiagnostic &diag = const_cast<DelayedDiagnostic&>(*i);
9472 if (diag.Triggered)
9473 continue;
9474
9475 switch (diag.Kind) {
9476 case DelayedDiagnostic::Availability:
9477 // Don't bother giving deprecation/unavailable diagnostics if
9478 // the decl is invalid.
9479 if (!decl->isInvalidDecl())
9480 handleDelayedAvailabilityCheck(diag, decl);
9481 break;
9482
9483 case DelayedDiagnostic::Access:
9484 // Only produce one access control diagnostic for a structured binding
9485 // declaration: we don't need to tell the user that all the fields are
9486 // inaccessible one at a time.
9487 if (AnyAccessFailures && isa<DecompositionDecl>(decl))
9488 continue;
9489 HandleDelayedAccessCheck(diag, decl);
9490 if (diag.Triggered)
9491 AnyAccessFailures = true;
9492 break;
9493
9494 case DelayedDiagnostic::ForbiddenType:
9495 handleDelayedForbiddenType(*this, diag, decl);
9496 break;
9497 }
9498 }
9499 } while ((pool = pool->getParent()));
9500 }
9501
9502 /// Given a set of delayed diagnostics, re-emit them as if they had
9503 /// been delayed in the current context instead of in the given pool.
9504 /// Essentially, this just moves them to the current pool.
redelayDiagnostics(DelayedDiagnosticPool & pool)9505 void Sema::redelayDiagnostics(DelayedDiagnosticPool &pool) {
9506 DelayedDiagnosticPool *curPool = DelayedDiagnostics.getCurrentPool();
9507 assert(curPool && "re-emitting in undelayed context not supported");
9508 curPool->steal(pool);
9509 }
9510