1//===--- SemaExprMember.cpp - Semantic Analysis for Expressions -----------===//
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 semantic analysis member access expressions.
10//
11//===----------------------------------------------------------------------===//
12#include "clang/AST/DeclCXX.h"
13#include "clang/AST/DeclObjC.h"
14#include "clang/AST/DeclTemplate.h"
15#include "clang/AST/ExprCXX.h"
16#include "clang/AST/ExprObjC.h"
17#include "clang/Lex/Preprocessor.h"
18#include "clang/Sema/Lookup.h"
19#include "clang/Sema/Overload.h"
20#include "clang/Sema/Scope.h"
21#include "clang/Sema/ScopeInfo.h"
22#include "clang/Sema/SemaObjC.h"
23#include "clang/Sema/SemaOpenMP.h"
24
25using namespace clang;
26using namespace sema;
27
28typedef llvm::SmallPtrSet<const CXXRecordDecl*, 4> BaseSet;
29
30/// Determines if the given class is provably not derived from all of
31/// the prospective base classes.
32static bool isProvablyNotDerivedFrom(Sema &SemaRef, CXXRecordDecl *Record,
33 const BaseSet &Bases) {
34 auto BaseIsNotInSet = [&Bases](const CXXRecordDecl *Base) {
35 return !Bases.count(Ptr: Base->getCanonicalDecl());
36 };
37 return BaseIsNotInSet(Record) && Record->forallBases(BaseMatches: BaseIsNotInSet);
38}
39
40enum IMAKind {
41 /// The reference is definitely not an instance member access.
42 IMA_Static,
43
44 /// The reference may be an implicit instance member access.
45 IMA_Mixed,
46
47 /// The reference may be to an instance member, but it might be invalid if
48 /// so, because the context is not an instance method.
49 IMA_Mixed_StaticOrExplicitContext,
50
51 /// The reference may be to an instance member, but it is invalid if
52 /// so, because the context is from an unrelated class.
53 IMA_Mixed_Unrelated,
54
55 /// The reference is definitely an implicit instance member access.
56 IMA_Instance,
57
58 /// The reference may be to an unresolved using declaration.
59 IMA_Unresolved,
60
61 /// The reference is a contextually-permitted abstract member reference.
62 IMA_Abstract,
63
64 /// Whether the context is static is dependent on the enclosing template (i.e.
65 /// in a dependent class scope explicit specialization).
66 IMA_Dependent,
67
68 /// The reference may be to an unresolved using declaration and the
69 /// context is not an instance method.
70 IMA_Unresolved_StaticOrExplicitContext,
71
72 // The reference refers to a field which is not a member of the containing
73 // class, which is allowed because we're in C++11 mode and the context is
74 // unevaluated.
75 IMA_Field_Uneval_Context,
76
77 /// All possible referrents are instance members and the current
78 /// context is not an instance method.
79 IMA_Error_StaticOrExplicitContext,
80
81 /// All possible referrents are instance members of an unrelated
82 /// class.
83 IMA_Error_Unrelated
84};
85
86/// The given lookup names class member(s) and is not being used for
87/// an address-of-member expression. Classify the type of access
88/// according to whether it's possible that this reference names an
89/// instance member. This is best-effort in dependent contexts; it is okay to
90/// conservatively answer "yes", in which case some errors will simply
91/// not be caught until template-instantiation.
92static IMAKind ClassifyImplicitMemberAccess(Sema &SemaRef,
93 const LookupResult &R) {
94 assert(!R.empty() && (*R.begin())->isCXXClassMember());
95
96 DeclContext *DC = SemaRef.getFunctionLevelDeclContext();
97
98 bool couldInstantiateToStatic = false;
99 bool isStaticOrExplicitContext = SemaRef.CXXThisTypeOverride.isNull();
100
101 if (auto *MD = dyn_cast<CXXMethodDecl>(Val: DC)) {
102 if (MD->isImplicitObjectMemberFunction()) {
103 isStaticOrExplicitContext = false;
104 // A dependent class scope function template explicit specialization
105 // that is neither declared 'static' nor with an explicit object
106 // parameter could instantiate to a static or non-static member function.
107 couldInstantiateToStatic = MD->getDependentSpecializationInfo();
108 }
109 }
110
111 if (R.isUnresolvableResult()) {
112 if (couldInstantiateToStatic)
113 return IMA_Dependent;
114 return isStaticOrExplicitContext ? IMA_Unresolved_StaticOrExplicitContext
115 : IMA_Unresolved;
116 }
117
118 // Collect all the declaring classes of instance members we find.
119 bool hasNonInstance = false;
120 bool isField = false;
121 BaseSet Classes;
122 for (NamedDecl *D : R) {
123 // Look through any using decls.
124 D = D->getUnderlyingDecl();
125
126 if (D->isCXXInstanceMember()) {
127 isField |= isa<FieldDecl>(Val: D) || isa<MSPropertyDecl>(Val: D) ||
128 isa<IndirectFieldDecl>(Val: D);
129
130 CXXRecordDecl *R = cast<CXXRecordDecl>(D->getDeclContext());
131 Classes.insert(Ptr: R->getCanonicalDecl());
132 } else
133 hasNonInstance = true;
134 }
135
136 // If we didn't find any instance members, it can't be an implicit
137 // member reference.
138 if (Classes.empty())
139 return IMA_Static;
140
141 if (couldInstantiateToStatic)
142 return IMA_Dependent;
143
144 // C++11 [expr.prim.general]p12:
145 // An id-expression that denotes a non-static data member or non-static
146 // member function of a class can only be used:
147 // (...)
148 // - if that id-expression denotes a non-static data member and it
149 // appears in an unevaluated operand.
150 //
151 // This rule is specific to C++11. However, we also permit this form
152 // in unevaluated inline assembly operands, like the operand to a SIZE.
153 IMAKind AbstractInstanceResult = IMA_Static; // happens to be 'false'
154 assert(!AbstractInstanceResult);
155 switch (SemaRef.ExprEvalContexts.back().Context) {
156 case Sema::ExpressionEvaluationContext::Unevaluated:
157 case Sema::ExpressionEvaluationContext::UnevaluatedList:
158 if (isField && SemaRef.getLangOpts().CPlusPlus11)
159 AbstractInstanceResult = IMA_Field_Uneval_Context;
160 break;
161
162 case Sema::ExpressionEvaluationContext::UnevaluatedAbstract:
163 AbstractInstanceResult = IMA_Abstract;
164 break;
165
166 case Sema::ExpressionEvaluationContext::DiscardedStatement:
167 case Sema::ExpressionEvaluationContext::ConstantEvaluated:
168 case Sema::ExpressionEvaluationContext::ImmediateFunctionContext:
169 case Sema::ExpressionEvaluationContext::PotentiallyEvaluated:
170 case Sema::ExpressionEvaluationContext::PotentiallyEvaluatedIfUsed:
171 break;
172 }
173
174 // If the current context is not an instance method, it can't be
175 // an implicit member reference.
176 if (isStaticOrExplicitContext) {
177 if (hasNonInstance)
178 return IMA_Mixed_StaticOrExplicitContext;
179
180 return AbstractInstanceResult ? AbstractInstanceResult
181 : IMA_Error_StaticOrExplicitContext;
182 }
183
184 CXXRecordDecl *contextClass;
185 if (auto *MD = dyn_cast<CXXMethodDecl>(Val: DC))
186 contextClass = MD->getParent()->getCanonicalDecl();
187 else if (auto *RD = dyn_cast<CXXRecordDecl>(Val: DC))
188 contextClass = RD;
189 else
190 return AbstractInstanceResult ? AbstractInstanceResult
191 : IMA_Error_StaticOrExplicitContext;
192
193 // [class.mfct.non-static]p3:
194 // ...is used in the body of a non-static member function of class X,
195 // if name lookup (3.4.1) resolves the name in the id-expression to a
196 // non-static non-type member of some class C [...]
197 // ...if C is not X or a base class of X, the class member access expression
198 // is ill-formed.
199 if (R.getNamingClass() &&
200 contextClass->getCanonicalDecl() !=
201 R.getNamingClass()->getCanonicalDecl()) {
202 // If the naming class is not the current context, this was a qualified
203 // member name lookup, and it's sufficient to check that we have the naming
204 // class as a base class.
205 Classes.clear();
206 Classes.insert(Ptr: R.getNamingClass()->getCanonicalDecl());
207 }
208
209 // If we can prove that the current context is unrelated to all the
210 // declaring classes, it can't be an implicit member reference (in
211 // which case it's an error if any of those members are selected).
212 if (isProvablyNotDerivedFrom(SemaRef, Record: contextClass, Bases: Classes))
213 return hasNonInstance ? IMA_Mixed_Unrelated :
214 AbstractInstanceResult ? AbstractInstanceResult :
215 IMA_Error_Unrelated;
216
217 return (hasNonInstance ? IMA_Mixed : IMA_Instance);
218}
219
220/// Diagnose a reference to a field with no object available.
221static void diagnoseInstanceReference(Sema &SemaRef,
222 const CXXScopeSpec &SS,
223 NamedDecl *Rep,
224 const DeclarationNameInfo &nameInfo) {
225 SourceLocation Loc = nameInfo.getLoc();
226 SourceRange Range(Loc);
227 if (SS.isSet()) Range.setBegin(SS.getRange().getBegin());
228
229 // Look through using shadow decls and aliases.
230 Rep = Rep->getUnderlyingDecl();
231
232 DeclContext *FunctionLevelDC = SemaRef.getFunctionLevelDeclContext();
233 CXXMethodDecl *Method = dyn_cast<CXXMethodDecl>(Val: FunctionLevelDC);
234 CXXRecordDecl *ContextClass = Method ? Method->getParent() : nullptr;
235 CXXRecordDecl *RepClass = dyn_cast<CXXRecordDecl>(Rep->getDeclContext());
236
237 bool InStaticMethod = Method && Method->isStatic();
238 bool InExplicitObjectMethod =
239 Method && Method->isExplicitObjectMemberFunction();
240 bool IsField = isa<FieldDecl>(Val: Rep) || isa<IndirectFieldDecl>(Val: Rep);
241
242 std::string Replacement;
243 if (InExplicitObjectMethod) {
244 DeclarationName N = Method->getParamDecl(0)->getDeclName();
245 if (!N.isEmpty()) {
246 Replacement.append(str: N.getAsString());
247 Replacement.append(s: ".");
248 }
249 }
250 if (IsField && InStaticMethod)
251 // "invalid use of member 'x' in static member function"
252 SemaRef.Diag(Loc, diag::err_invalid_member_use_in_method)
253 << Range << nameInfo.getName() << /*static*/ 0;
254 else if (IsField && InExplicitObjectMethod) {
255 auto Diag = SemaRef.Diag(Loc, diag::err_invalid_member_use_in_method)
256 << Range << nameInfo.getName() << /*explicit*/ 1;
257 if (!Replacement.empty())
258 Diag << FixItHint::CreateInsertion(InsertionLoc: Loc, Code: Replacement);
259 } else if (ContextClass && RepClass && SS.isEmpty() &&
260 !InExplicitObjectMethod && !InStaticMethod &&
261 !RepClass->Equals(ContextClass) &&
262 RepClass->Encloses(ContextClass))
263 // Unqualified lookup in a non-static member function found a member of an
264 // enclosing class.
265 SemaRef.Diag(Loc, diag::err_nested_non_static_member_use)
266 << IsField << RepClass << nameInfo.getName() << ContextClass << Range;
267 else if (IsField)
268 SemaRef.Diag(Loc, diag::err_invalid_non_static_member_use)
269 << nameInfo.getName() << Range;
270 else if (!InExplicitObjectMethod)
271 SemaRef.Diag(Loc, diag::err_member_call_without_object)
272 << Range << /*static*/ 0;
273 else {
274 if (const auto *Tpl = dyn_cast<FunctionTemplateDecl>(Val: Rep))
275 Rep = Tpl->getTemplatedDecl();
276 const auto *Callee = cast<CXXMethodDecl>(Val: Rep);
277 auto Diag = SemaRef.Diag(Loc, diag::err_member_call_without_object)
278 << Range << Callee->isExplicitObjectMemberFunction();
279 if (!Replacement.empty())
280 Diag << FixItHint::CreateInsertion(InsertionLoc: Loc, Code: Replacement);
281 }
282}
283
284bool Sema::isPotentialImplicitMemberAccess(const CXXScopeSpec &SS,
285 LookupResult &R,
286 bool IsAddressOfOperand) {
287 if (!getLangOpts().CPlusPlus)
288 return false;
289 else if (R.empty() || !R.begin()->isCXXClassMember())
290 return false;
291 else if (!IsAddressOfOperand)
292 return true;
293 else if (!SS.isEmpty())
294 return false;
295 else if (R.isOverloadedResult())
296 return false;
297 else if (R.isUnresolvableResult())
298 return true;
299 else
300 return isa<FieldDecl, IndirectFieldDecl, MSPropertyDecl>(Val: R.getFoundDecl());
301}
302
303ExprResult Sema::BuildPossibleImplicitMemberExpr(
304 const CXXScopeSpec &SS, SourceLocation TemplateKWLoc, LookupResult &R,
305 const TemplateArgumentListInfo *TemplateArgs, const Scope *S) {
306 switch (IMAKind Classification = ClassifyImplicitMemberAccess(SemaRef&: *this, R)) {
307 case IMA_Instance:
308 case IMA_Mixed:
309 case IMA_Mixed_Unrelated:
310 case IMA_Unresolved:
311 return BuildImplicitMemberExpr(
312 SS, TemplateKWLoc, R, TemplateArgs,
313 /*IsKnownInstance=*/IsDefiniteInstance: Classification == IMA_Instance, S);
314 case IMA_Field_Uneval_Context:
315 Diag(R.getNameLoc(), diag::warn_cxx98_compat_non_static_member_use)
316 << R.getLookupNameInfo().getName();
317 [[fallthrough]];
318 case IMA_Static:
319 case IMA_Abstract:
320 case IMA_Mixed_StaticOrExplicitContext:
321 case IMA_Unresolved_StaticOrExplicitContext:
322 if (TemplateArgs || TemplateKWLoc.isValid())
323 return BuildTemplateIdExpr(SS, TemplateKWLoc, R, /*RequiresADL=*/false,
324 TemplateArgs);
325 return BuildDeclarationNameExpr(SS, R, /*NeedsADL=*/false,
326 /*AcceptInvalidDecl=*/false);
327 case IMA_Dependent:
328 R.suppressDiagnostics();
329 return UnresolvedLookupExpr::Create(
330 Context, NamingClass: R.getNamingClass(), QualifierLoc: SS.getWithLocInContext(Context),
331 TemplateKWLoc, NameInfo: R.getLookupNameInfo(), /*RequiresADL=*/false,
332 Args: TemplateArgs, Begin: R.begin(), End: R.end(), /*KnownDependent=*/true,
333 /*KnownInstantiationDependent=*/true);
334
335 case IMA_Error_StaticOrExplicitContext:
336 case IMA_Error_Unrelated:
337 diagnoseInstanceReference(SemaRef&: *this, SS, Rep: R.getRepresentativeDecl(),
338 nameInfo: R.getLookupNameInfo());
339 return ExprError();
340 }
341
342 llvm_unreachable("unexpected instance member access kind");
343}
344
345/// Determine whether input char is from rgba component set.
346static bool
347IsRGBA(char c) {
348 switch (c) {
349 case 'r':
350 case 'g':
351 case 'b':
352 case 'a':
353 return true;
354 default:
355 return false;
356 }
357}
358
359// OpenCL v1.1, s6.1.7
360// The component swizzle length must be in accordance with the acceptable
361// vector sizes.
362static bool IsValidOpenCLComponentSwizzleLength(unsigned len)
363{
364 return (len >= 1 && len <= 4) || len == 8 || len == 16;
365}
366
367/// Check an ext-vector component access expression.
368///
369/// VK should be set in advance to the value kind of the base
370/// expression.
371static QualType
372CheckExtVectorComponent(Sema &S, QualType baseType, ExprValueKind &VK,
373 SourceLocation OpLoc, const IdentifierInfo *CompName,
374 SourceLocation CompLoc) {
375 // FIXME: Share logic with ExtVectorElementExpr::containsDuplicateElements,
376 // see FIXME there.
377 //
378 // FIXME: This logic can be greatly simplified by splitting it along
379 // halving/not halving and reworking the component checking.
380 const ExtVectorType *vecType = baseType->castAs<ExtVectorType>();
381
382 // The vector accessor can't exceed the number of elements.
383 const char *compStr = CompName->getNameStart();
384
385 // This flag determines whether or not the component is one of the four
386 // special names that indicate a subset of exactly half the elements are
387 // to be selected.
388 bool HalvingSwizzle = false;
389
390 // This flag determines whether or not CompName has an 's' char prefix,
391 // indicating that it is a string of hex values to be used as vector indices.
392 bool HexSwizzle = (*compStr == 's' || *compStr == 'S') && compStr[1];
393
394 bool HasRepeated = false;
395 bool HasIndex[16] = {};
396
397 int Idx;
398
399 // Check that we've found one of the special components, or that the component
400 // names must come from the same set.
401 if (!strcmp(s1: compStr, s2: "hi") || !strcmp(s1: compStr, s2: "lo") ||
402 !strcmp(s1: compStr, s2: "even") || !strcmp(s1: compStr, s2: "odd")) {
403 HalvingSwizzle = true;
404 } else if (!HexSwizzle &&
405 (Idx = vecType->getPointAccessorIdx(c: *compStr)) != -1) {
406 bool HasRGBA = IsRGBA(c: *compStr);
407 do {
408 // Ensure that xyzw and rgba components don't intermingle.
409 if (HasRGBA != IsRGBA(c: *compStr))
410 break;
411 if (HasIndex[Idx]) HasRepeated = true;
412 HasIndex[Idx] = true;
413 compStr++;
414 } while (*compStr && (Idx = vecType->getPointAccessorIdx(c: *compStr)) != -1);
415
416 // Emit a warning if an rgba selector is used earlier than OpenCL C 3.0.
417 if (HasRGBA || (*compStr && IsRGBA(c: *compStr))) {
418 if (S.getLangOpts().OpenCL &&
419 S.getLangOpts().getOpenCLCompatibleVersion() < 300) {
420 const char *DiagBegin = HasRGBA ? CompName->getNameStart() : compStr;
421 S.Diag(OpLoc, diag::ext_opencl_ext_vector_type_rgba_selector)
422 << StringRef(DiagBegin, 1) << SourceRange(CompLoc);
423 }
424 }
425 } else {
426 if (HexSwizzle) compStr++;
427 while ((Idx = vecType->getNumericAccessorIdx(c: *compStr)) != -1) {
428 if (HasIndex[Idx]) HasRepeated = true;
429 HasIndex[Idx] = true;
430 compStr++;
431 }
432 }
433
434 if (!HalvingSwizzle && *compStr) {
435 // We didn't get to the end of the string. This means the component names
436 // didn't come from the same set *or* we encountered an illegal name.
437 size_t Offset = compStr - CompName->getNameStart() + 1;
438 char Fmt[3] = {'\'', *compStr, '\''};
439 S.Diag(OpLoc.getLocWithOffset(Offset),
440 diag::err_ext_vector_component_name_illegal)
441 << StringRef(Fmt, 3) << SourceRange(CompLoc);
442 return QualType();
443 }
444
445 // Ensure no component accessor exceeds the width of the vector type it
446 // operates on.
447 if (!HalvingSwizzle) {
448 compStr = CompName->getNameStart();
449
450 if (HexSwizzle)
451 compStr++;
452
453 while (*compStr) {
454 if (!vecType->isAccessorWithinNumElements(c: *compStr++, isNumericAccessor: HexSwizzle)) {
455 S.Diag(OpLoc, diag::err_ext_vector_component_exceeds_length)
456 << baseType << SourceRange(CompLoc);
457 return QualType();
458 }
459 }
460 }
461
462 // OpenCL mode requires swizzle length to be in accordance with accepted
463 // sizes. Clang however supports arbitrary lengths for other languages.
464 if (S.getLangOpts().OpenCL && !HalvingSwizzle) {
465 unsigned SwizzleLength = CompName->getLength();
466
467 if (HexSwizzle)
468 SwizzleLength--;
469
470 if (IsValidOpenCLComponentSwizzleLength(len: SwizzleLength) == false) {
471 S.Diag(OpLoc, diag::err_opencl_ext_vector_component_invalid_length)
472 << SwizzleLength << SourceRange(CompLoc);
473 return QualType();
474 }
475 }
476
477 // The component accessor looks fine - now we need to compute the actual type.
478 // The vector type is implied by the component accessor. For example,
479 // vec4.b is a float, vec4.xy is a vec2, vec4.rgb is a vec3, etc.
480 // vec4.s0 is a float, vec4.s23 is a vec3, etc.
481 // vec4.hi, vec4.lo, vec4.e, and vec4.o all return vec2.
482 unsigned CompSize = HalvingSwizzle ? (vecType->getNumElements() + 1) / 2
483 : CompName->getLength();
484 if (HexSwizzle)
485 CompSize--;
486
487 if (CompSize == 1)
488 return vecType->getElementType();
489
490 if (HasRepeated)
491 VK = VK_PRValue;
492
493 QualType VT = S.Context.getExtVectorType(VectorType: vecType->getElementType(), NumElts: CompSize);
494 // Now look up the TypeDefDecl from the vector type. Without this,
495 // diagostics look bad. We want extended vector types to appear built-in.
496 for (Sema::ExtVectorDeclsType::iterator
497 I = S.ExtVectorDecls.begin(source: S.getExternalSource()),
498 E = S.ExtVectorDecls.end();
499 I != E; ++I) {
500 if ((*I)->getUnderlyingType() == VT)
501 return S.Context.getTypedefType(Decl: *I);
502 }
503
504 return VT; // should never get here (a typedef type should always be found).
505}
506
507static Decl *FindGetterSetterNameDeclFromProtocolList(const ObjCProtocolDecl*PDecl,
508 IdentifierInfo *Member,
509 const Selector &Sel,
510 ASTContext &Context) {
511 if (Member)
512 if (ObjCPropertyDecl *PD = PDecl->FindPropertyDeclaration(
513 Member, ObjCPropertyQueryKind::OBJC_PR_query_instance))
514 return PD;
515 if (ObjCMethodDecl *OMD = PDecl->getInstanceMethod(Sel))
516 return OMD;
517
518 for (const auto *I : PDecl->protocols()) {
519 if (Decl *D = FindGetterSetterNameDeclFromProtocolList(PDecl: I, Member, Sel,
520 Context))
521 return D;
522 }
523 return nullptr;
524}
525
526static Decl *FindGetterSetterNameDecl(const ObjCObjectPointerType *QIdTy,
527 IdentifierInfo *Member,
528 const Selector &Sel,
529 ASTContext &Context) {
530 // Check protocols on qualified interfaces.
531 Decl *GDecl = nullptr;
532 for (const auto *I : QIdTy->quals()) {
533 if (Member)
534 if (ObjCPropertyDecl *PD = I->FindPropertyDeclaration(
535 Member, ObjCPropertyQueryKind::OBJC_PR_query_instance)) {
536 GDecl = PD;
537 break;
538 }
539 // Also must look for a getter or setter name which uses property syntax.
540 if (ObjCMethodDecl *OMD = I->getInstanceMethod(Sel)) {
541 GDecl = OMD;
542 break;
543 }
544 }
545 if (!GDecl) {
546 for (const auto *I : QIdTy->quals()) {
547 // Search in the protocol-qualifier list of current protocol.
548 GDecl = FindGetterSetterNameDeclFromProtocolList(I, Member, Sel, Context);
549 if (GDecl)
550 return GDecl;
551 }
552 }
553 return GDecl;
554}
555
556ExprResult
557Sema::ActOnDependentMemberExpr(Expr *BaseExpr, QualType BaseType,
558 bool IsArrow, SourceLocation OpLoc,
559 const CXXScopeSpec &SS,
560 SourceLocation TemplateKWLoc,
561 NamedDecl *FirstQualifierInScope,
562 const DeclarationNameInfo &NameInfo,
563 const TemplateArgumentListInfo *TemplateArgs) {
564 // Even in dependent contexts, try to diagnose base expressions with
565 // obviously wrong types, e.g.:
566 //
567 // T* t;
568 // t.f;
569 //
570 // In Obj-C++, however, the above expression is valid, since it could be
571 // accessing the 'f' property if T is an Obj-C interface. The extra check
572 // allows this, while still reporting an error if T is a struct pointer.
573 if (!IsArrow) {
574 const PointerType *PT = BaseType->getAs<PointerType>();
575 if (PT && (!getLangOpts().ObjC ||
576 PT->getPointeeType()->isRecordType())) {
577 assert(BaseExpr && "cannot happen with implicit member accesses");
578 Diag(OpLoc, diag::err_typecheck_member_reference_struct_union)
579 << BaseType << BaseExpr->getSourceRange() << NameInfo.getSourceRange();
580 return ExprError();
581 }
582 }
583
584 assert(BaseType->isDependentType() || NameInfo.getName().isDependentName() ||
585 isDependentScopeSpecifier(SS) ||
586 (TemplateArgs && llvm::any_of(TemplateArgs->arguments(),
587 [](const TemplateArgumentLoc &Arg) {
588 return Arg.getArgument().isDependent();
589 })));
590
591 // Get the type being accessed in BaseType. If this is an arrow, the BaseExpr
592 // must have pointer type, and the accessed type is the pointee.
593 return CXXDependentScopeMemberExpr::Create(
594 Ctx: Context, Base: BaseExpr, BaseType, IsArrow, OperatorLoc: OpLoc,
595 QualifierLoc: SS.getWithLocInContext(Context), TemplateKWLoc, FirstQualifierFoundInScope: FirstQualifierInScope,
596 MemberNameInfo: NameInfo, TemplateArgs);
597}
598
599/// We know that the given qualified member reference points only to
600/// declarations which do not belong to the static type of the base
601/// expression. Diagnose the problem.
602static void DiagnoseQualifiedMemberReference(Sema &SemaRef,
603 Expr *BaseExpr,
604 QualType BaseType,
605 const CXXScopeSpec &SS,
606 NamedDecl *rep,
607 const DeclarationNameInfo &nameInfo) {
608 // If this is an implicit member access, use a different set of
609 // diagnostics.
610 if (!BaseExpr)
611 return diagnoseInstanceReference(SemaRef, SS, Rep: rep, nameInfo);
612
613 SemaRef.Diag(nameInfo.getLoc(), diag::err_qualified_member_of_unrelated)
614 << SS.getRange() << rep << BaseType;
615}
616
617bool Sema::CheckQualifiedMemberReference(Expr *BaseExpr,
618 QualType BaseType,
619 const CXXScopeSpec &SS,
620 const LookupResult &R) {
621 CXXRecordDecl *BaseRecord =
622 cast_or_null<CXXRecordDecl>(Val: computeDeclContext(T: BaseType));
623 if (!BaseRecord) {
624 // We can't check this yet because the base type is still
625 // dependent.
626 assert(BaseType->isDependentType());
627 return false;
628 }
629
630 for (LookupResult::iterator I = R.begin(), E = R.end(); I != E; ++I) {
631 // If this is an implicit member reference and we find a
632 // non-instance member, it's not an error.
633 if (!BaseExpr && !(*I)->isCXXInstanceMember())
634 return false;
635
636 // Note that we use the DC of the decl, not the underlying decl.
637 DeclContext *DC = (*I)->getDeclContext()->getNonTransparentContext();
638 if (!DC->isRecord())
639 continue;
640
641 CXXRecordDecl *MemberRecord = cast<CXXRecordDecl>(Val: DC)->getCanonicalDecl();
642 if (BaseRecord->getCanonicalDecl() == MemberRecord ||
643 !BaseRecord->isProvablyNotDerivedFrom(Base: MemberRecord))
644 return false;
645 }
646
647 DiagnoseQualifiedMemberReference(SemaRef&: *this, BaseExpr, BaseType, SS,
648 rep: R.getRepresentativeDecl(),
649 nameInfo: R.getLookupNameInfo());
650 return true;
651}
652
653namespace {
654
655// Callback to only accept typo corrections that are either a ValueDecl or a
656// FunctionTemplateDecl and are declared in the current record or, for a C++
657// classes, one of its base classes.
658class RecordMemberExprValidatorCCC final : public CorrectionCandidateCallback {
659public:
660 explicit RecordMemberExprValidatorCCC(QualType RTy)
661 : Record(RTy->getAsRecordDecl()) {
662 // Don't add bare keywords to the consumer since they will always fail
663 // validation by virtue of not being associated with any decls.
664 WantTypeSpecifiers = false;
665 WantExpressionKeywords = false;
666 WantCXXNamedCasts = false;
667 WantFunctionLikeCasts = false;
668 WantRemainingKeywords = false;
669 }
670
671 bool ValidateCandidate(const TypoCorrection &candidate) override {
672 NamedDecl *ND = candidate.getCorrectionDecl();
673 // Don't accept candidates that cannot be member functions, constants,
674 // variables, or templates.
675 if (!ND || !(isa<ValueDecl>(Val: ND) || isa<FunctionTemplateDecl>(Val: ND)))
676 return false;
677
678 // Accept candidates that occur in the current record.
679 if (Record->containsDecl(ND))
680 return true;
681
682 if (const auto *RD = dyn_cast<CXXRecordDecl>(Val: Record)) {
683 // Accept candidates that occur in any of the current class' base classes.
684 for (const auto &BS : RD->bases()) {
685 if (const auto *BSTy = BS.getType()->getAs<RecordType>()) {
686 if (BSTy->getDecl()->containsDecl(ND))
687 return true;
688 }
689 }
690 }
691
692 return false;
693 }
694
695 std::unique_ptr<CorrectionCandidateCallback> clone() override {
696 return std::make_unique<RecordMemberExprValidatorCCC>(args&: *this);
697 }
698
699private:
700 const RecordDecl *const Record;
701};
702
703}
704
705static bool LookupMemberExprInRecord(Sema &SemaRef, LookupResult &R,
706 Expr *BaseExpr, QualType RTy,
707 SourceLocation OpLoc, bool IsArrow,
708 CXXScopeSpec &SS, bool HasTemplateArgs,
709 SourceLocation TemplateKWLoc,
710 TypoExpr *&TE) {
711 SourceRange BaseRange = BaseExpr ? BaseExpr->getSourceRange() : SourceRange();
712 if (!RTy->isDependentType() &&
713 !SemaRef.isThisOutsideMemberFunctionBody(RTy) &&
714 SemaRef.RequireCompleteType(
715 OpLoc, RTy, diag::err_typecheck_incomplete_tag, BaseRange))
716 return true;
717
718 // LookupTemplateName/LookupParsedName don't expect these both to exist
719 // simultaneously.
720 QualType ObjectType = SS.isSet() ? QualType() : RTy;
721 if (HasTemplateArgs || TemplateKWLoc.isValid())
722 return SemaRef.LookupTemplateName(R,
723 /*S=*/nullptr, SS, ObjectType,
724 /*EnteringContext=*/false, RequiredTemplate: TemplateKWLoc);
725
726 SemaRef.LookupParsedName(R, /*S=*/nullptr, SS: &SS, ObjectType);
727
728 if (!R.empty() || R.wasNotFoundInCurrentInstantiation())
729 return false;
730
731 DeclarationName Typo = R.getLookupName();
732 SourceLocation TypoLoc = R.getNameLoc();
733 // Recompute the lookup context.
734 DeclContext *DC = SS.isSet() ? SemaRef.computeDeclContext(SS)
735 : SemaRef.computeDeclContext(T: RTy);
736
737 struct QueryState {
738 Sema &SemaRef;
739 DeclarationNameInfo NameInfo;
740 Sema::LookupNameKind LookupKind;
741 RedeclarationKind Redecl;
742 };
743 QueryState Q = {.SemaRef: R.getSema(), .NameInfo: R.getLookupNameInfo(), .LookupKind: R.getLookupKind(),
744 .Redecl: R.redeclarationKind()};
745 RecordMemberExprValidatorCCC CCC(RTy);
746 TE = SemaRef.CorrectTypoDelayed(
747 Typo: R.getLookupNameInfo(), LookupKind: R.getLookupKind(), S: nullptr, SS: &SS, CCC,
748 TDG: [=, &SemaRef](const TypoCorrection &TC) {
749 if (TC) {
750 assert(!TC.isKeyword() &&
751 "Got a keyword as a correction for a member!");
752 bool DroppedSpecifier =
753 TC.WillReplaceSpecifier() &&
754 Typo.getAsString() == TC.getAsString(LO: SemaRef.getLangOpts());
755 SemaRef.diagnoseTypo(TC, SemaRef.PDiag(diag::err_no_member_suggest)
756 << Typo << DC << DroppedSpecifier
757 << SS.getRange());
758 } else {
759 SemaRef.Diag(TypoLoc, diag::err_no_member)
760 << Typo << DC << (SS.isSet() ? SS.getRange() : BaseRange);
761 }
762 },
763 TRC: [=](Sema &SemaRef, TypoExpr *TE, TypoCorrection TC) mutable {
764 LookupResult R(Q.SemaRef, Q.NameInfo, Q.LookupKind, Q.Redecl);
765 R.clear(); // Ensure there's no decls lingering in the shared state.
766 R.suppressDiagnostics();
767 R.setLookupName(TC.getCorrection());
768 for (NamedDecl *ND : TC)
769 R.addDecl(D: ND);
770 R.resolveKind();
771 return SemaRef.BuildMemberReferenceExpr(
772 Base: BaseExpr, BaseType: BaseExpr->getType(), OpLoc, IsArrow, SS, TemplateKWLoc: SourceLocation(),
773 FirstQualifierInScope: nullptr, R, TemplateArgs: nullptr, S: nullptr);
774 },
775 Mode: CorrectTypoKind::ErrorRecovery, MemberContext: DC);
776
777 return false;
778}
779
780static ExprResult LookupMemberExpr(Sema &S, LookupResult &R,
781 ExprResult &BaseExpr, bool &IsArrow,
782 SourceLocation OpLoc, CXXScopeSpec &SS,
783 Decl *ObjCImpDecl, bool HasTemplateArgs,
784 SourceLocation TemplateKWLoc);
785
786ExprResult Sema::BuildMemberReferenceExpr(
787 Expr *Base, QualType BaseType, SourceLocation OpLoc, bool IsArrow,
788 CXXScopeSpec &SS, SourceLocation TemplateKWLoc,
789 NamedDecl *FirstQualifierInScope, const DeclarationNameInfo &NameInfo,
790 const TemplateArgumentListInfo *TemplateArgs, const Scope *S,
791 ActOnMemberAccessExtraArgs *ExtraArgs) {
792 LookupResult R(*this, NameInfo, LookupMemberName);
793
794 // Implicit member accesses.
795 if (!Base) {
796 TypoExpr *TE = nullptr;
797 QualType RecordTy = BaseType;
798 if (IsArrow) RecordTy = RecordTy->castAs<PointerType>()->getPointeeType();
799 if (LookupMemberExprInRecord(SemaRef&: *this, R, BaseExpr: nullptr, RTy: RecordTy, OpLoc, IsArrow,
800 SS, HasTemplateArgs: TemplateArgs != nullptr, TemplateKWLoc,
801 TE))
802 return ExprError();
803 if (TE)
804 return TE;
805
806 // Explicit member accesses.
807 } else {
808 ExprResult BaseResult = Base;
809 ExprResult Result =
810 LookupMemberExpr(S&: *this, R, BaseExpr&: BaseResult, IsArrow, OpLoc, SS,
811 ObjCImpDecl: ExtraArgs ? ExtraArgs->ObjCImpDecl : nullptr,
812 HasTemplateArgs: TemplateArgs != nullptr, TemplateKWLoc);
813
814 if (BaseResult.isInvalid())
815 return ExprError();
816 Base = BaseResult.get();
817
818 if (Result.isInvalid())
819 return ExprError();
820
821 if (Result.get())
822 return Result;
823
824 // LookupMemberExpr can modify Base, and thus change BaseType
825 BaseType = Base->getType();
826 }
827
828 // BuildMemberReferenceExpr expects the nested-name-specifier, if any, to be
829 // valid.
830 if (SS.isInvalid())
831 return ExprError();
832
833 return BuildMemberReferenceExpr(Base, BaseType,
834 OpLoc, IsArrow, SS, TemplateKWLoc,
835 FirstQualifierInScope, R, TemplateArgs, S,
836 SuppressQualifierCheck: false, ExtraArgs);
837}
838
839ExprResult
840Sema::BuildAnonymousStructUnionMemberReference(const CXXScopeSpec &SS,
841 SourceLocation loc,
842 IndirectFieldDecl *indirectField,
843 DeclAccessPair foundDecl,
844 Expr *baseObjectExpr,
845 SourceLocation opLoc) {
846 // First, build the expression that refers to the base object.
847
848 // Case 1: the base of the indirect field is not a field.
849 VarDecl *baseVariable = indirectField->getVarDecl();
850 CXXScopeSpec EmptySS;
851 if (baseVariable) {
852 assert(baseVariable->getType()->isRecordType());
853
854 // In principle we could have a member access expression that
855 // accesses an anonymous struct/union that's a static member of
856 // the base object's class. However, under the current standard,
857 // static data members cannot be anonymous structs or unions.
858 // Supporting this is as easy as building a MemberExpr here.
859 assert(!baseObjectExpr && "anonymous struct/union is static data member?");
860
861 DeclarationNameInfo baseNameInfo(DeclarationName(), loc);
862
863 ExprResult result
864 = BuildDeclarationNameExpr(EmptySS, baseNameInfo, baseVariable);
865 if (result.isInvalid()) return ExprError();
866
867 baseObjectExpr = result.get();
868 }
869
870 assert((baseVariable || baseObjectExpr) &&
871 "referencing anonymous struct/union without a base variable or "
872 "expression");
873
874 // Build the implicit member references to the field of the
875 // anonymous struct/union.
876 Expr *result = baseObjectExpr;
877 IndirectFieldDecl::chain_iterator
878 FI = indirectField->chain_begin(), FEnd = indirectField->chain_end();
879
880 // Case 2: the base of the indirect field is a field and the user
881 // wrote a member expression.
882 if (!baseVariable) {
883 FieldDecl *field = cast<FieldDecl>(Val: *FI);
884
885 bool baseObjectIsPointer = baseObjectExpr->getType()->isPointerType();
886
887 // Make a nameInfo that properly uses the anonymous name.
888 DeclarationNameInfo memberNameInfo(field->getDeclName(), loc);
889
890 // Build the first member access in the chain with full information.
891 result =
892 BuildFieldReferenceExpr(BaseExpr: result, IsArrow: baseObjectIsPointer, OpLoc: SourceLocation(),
893 SS, Field: field, FoundDecl: foundDecl, MemberNameInfo: memberNameInfo)
894 .get();
895 if (!result)
896 return ExprError();
897 }
898
899 // In all cases, we should now skip the first declaration in the chain.
900 ++FI;
901
902 while (FI != FEnd) {
903 FieldDecl *field = cast<FieldDecl>(Val: *FI++);
904
905 // FIXME: these are somewhat meaningless
906 DeclarationNameInfo memberNameInfo(field->getDeclName(), loc);
907 DeclAccessPair fakeFoundDecl =
908 DeclAccessPair::make(D: field, AS: field->getAccess());
909
910 result =
911 BuildFieldReferenceExpr(BaseExpr: result, /*isarrow*/ IsArrow: false, OpLoc: SourceLocation(),
912 SS: (FI == FEnd ? SS : EmptySS), Field: field,
913 FoundDecl: fakeFoundDecl, MemberNameInfo: memberNameInfo)
914 .get();
915 }
916
917 return result;
918}
919
920static ExprResult
921BuildMSPropertyRefExpr(Sema &S, Expr *BaseExpr, bool IsArrow,
922 const CXXScopeSpec &SS,
923 MSPropertyDecl *PD,
924 const DeclarationNameInfo &NameInfo) {
925 // Property names are always simple identifiers and therefore never
926 // require any interesting additional storage.
927 return new (S.Context) MSPropertyRefExpr(BaseExpr, PD, IsArrow,
928 S.Context.PseudoObjectTy, VK_LValue,
929 SS.getWithLocInContext(Context&: S.Context),
930 NameInfo.getLoc());
931}
932
933MemberExpr *Sema::BuildMemberExpr(
934 Expr *Base, bool IsArrow, SourceLocation OpLoc, NestedNameSpecifierLoc NNS,
935 SourceLocation TemplateKWLoc, ValueDecl *Member, DeclAccessPair FoundDecl,
936 bool HadMultipleCandidates, const DeclarationNameInfo &MemberNameInfo,
937 QualType Ty, ExprValueKind VK, ExprObjectKind OK,
938 const TemplateArgumentListInfo *TemplateArgs) {
939 assert((!IsArrow || Base->isPRValue()) &&
940 "-> base must be a pointer prvalue");
941 MemberExpr *E =
942 MemberExpr::Create(C: Context, Base, IsArrow, OperatorLoc: OpLoc, QualifierLoc: NNS, TemplateKWLoc,
943 MemberDecl: Member, FoundDecl, MemberNameInfo, TemplateArgs, T: Ty,
944 VK, OK, NOUR: getNonOdrUseReasonInCurrentContext(D: Member));
945 E->setHadMultipleCandidates(HadMultipleCandidates);
946 MarkMemberReferenced(E);
947
948 // C++ [except.spec]p17:
949 // An exception-specification is considered to be needed when:
950 // - in an expression the function is the unique lookup result or the
951 // selected member of a set of overloaded functions
952 if (auto *FPT = Ty->getAs<FunctionProtoType>()) {
953 if (isUnresolvedExceptionSpec(ESpecType: FPT->getExceptionSpecType())) {
954 if (auto *NewFPT = ResolveExceptionSpec(Loc: MemberNameInfo.getLoc(), FPT))
955 E->setType(Context.getQualifiedType(NewFPT, Ty.getQualifiers()));
956 }
957 }
958
959 return E;
960}
961
962/// Determine if the given scope is within a function-try-block handler.
963static bool IsInFnTryBlockHandler(const Scope *S) {
964 // Walk the scope stack until finding a FnTryCatchScope, or leave the
965 // function scope. If a FnTryCatchScope is found, check whether the TryScope
966 // flag is set. If it is not, it's a function-try-block handler.
967 for (; S != S->getFnParent(); S = S->getParent()) {
968 if (S->isFnTryCatchScope())
969 return (S->getFlags() & Scope::TryScope) != Scope::TryScope;
970 }
971 return false;
972}
973
974ExprResult
975Sema::BuildMemberReferenceExpr(Expr *BaseExpr, QualType BaseExprType,
976 SourceLocation OpLoc, bool IsArrow,
977 const CXXScopeSpec &SS,
978 SourceLocation TemplateKWLoc,
979 NamedDecl *FirstQualifierInScope,
980 LookupResult &R,
981 const TemplateArgumentListInfo *TemplateArgs,
982 const Scope *S,
983 bool SuppressQualifierCheck,
984 ActOnMemberAccessExtraArgs *ExtraArgs) {
985 assert(!SS.isInvalid() && "nested-name-specifier cannot be invalid");
986 // If the member wasn't found in the current instantiation, or if the
987 // arrow operator was used with a dependent non-pointer object expression,
988 // build a CXXDependentScopeMemberExpr.
989 if (R.wasNotFoundInCurrentInstantiation() ||
990 (R.getLookupName().getCXXOverloadedOperator() == OO_Equal &&
991 (SS.isSet() ? SS.getScopeRep()->isDependent()
992 : BaseExprType->isDependentType())))
993 return ActOnDependentMemberExpr(BaseExpr, BaseType: BaseExprType, IsArrow, OpLoc, SS,
994 TemplateKWLoc, FirstQualifierInScope,
995 NameInfo: R.getLookupNameInfo(), TemplateArgs);
996
997 QualType BaseType = BaseExprType;
998 if (IsArrow) {
999 assert(BaseType->isPointerType());
1000 BaseType = BaseType->castAs<PointerType>()->getPointeeType();
1001 }
1002 R.setBaseObjectType(BaseType);
1003
1004 assert((SS.isEmpty()
1005 ? !BaseType->isDependentType() || computeDeclContext(BaseType)
1006 : !isDependentScopeSpecifier(SS) || computeDeclContext(SS)) &&
1007 "dependent lookup context that isn't the current instantiation?");
1008
1009 const DeclarationNameInfo &MemberNameInfo = R.getLookupNameInfo();
1010 DeclarationName MemberName = MemberNameInfo.getName();
1011 SourceLocation MemberLoc = MemberNameInfo.getLoc();
1012
1013 if (R.isAmbiguous())
1014 return ExprError();
1015
1016 // [except.handle]p10: Referring to any non-static member or base class of an
1017 // object in the handler for a function-try-block of a constructor or
1018 // destructor for that object results in undefined behavior.
1019 const auto *FD = getCurFunctionDecl();
1020 if (S && BaseExpr && FD &&
1021 (isa<CXXDestructorDecl>(FD) || isa<CXXConstructorDecl>(FD)) &&
1022 isa<CXXThisExpr>(BaseExpr->IgnoreImpCasts()) &&
1023 IsInFnTryBlockHandler(S))
1024 Diag(MemberLoc, diag::warn_cdtor_function_try_handler_mem_expr)
1025 << isa<CXXDestructorDecl>(FD);
1026
1027 if (R.empty()) {
1028 ExprResult RetryExpr = ExprError();
1029 if (ExtraArgs && !IsArrow && BaseExpr && !BaseExpr->isTypeDependent()) {
1030 SFINAETrap Trap(*this, true);
1031 ParsedType ObjectType;
1032 bool MayBePseudoDestructor = false;
1033 RetryExpr = ActOnStartCXXMemberReference(S: getCurScope(), Base: BaseExpr, OpLoc,
1034 OpKind: tok::arrow, ObjectType,
1035 MayBePseudoDestructor);
1036 if (RetryExpr.isUsable() && !Trap.hasErrorOccurred()) {
1037 CXXScopeSpec TempSS(SS);
1038 RetryExpr = ActOnMemberAccessExpr(
1039 S: ExtraArgs->S, Base: RetryExpr.get(), OpLoc, OpKind: tok::arrow, SS&: TempSS,
1040 TemplateKWLoc, Member&: ExtraArgs->Id, ObjCImpDecl: ExtraArgs->ObjCImpDecl);
1041 }
1042 if (Trap.hasErrorOccurred())
1043 RetryExpr = ExprError();
1044 }
1045
1046 // Rederive where we looked up.
1047 DeclContext *DC =
1048 (SS.isSet() ? computeDeclContext(SS) : computeDeclContext(T: BaseType));
1049 assert(DC);
1050
1051 if (RetryExpr.isUsable())
1052 Diag(OpLoc, diag::err_no_member_overloaded_arrow)
1053 << MemberName << DC << FixItHint::CreateReplacement(OpLoc, "->");
1054 else
1055 Diag(R.getNameLoc(), diag::err_no_member)
1056 << MemberName << DC
1057 << (SS.isSet()
1058 ? SS.getRange()
1059 : (BaseExpr ? BaseExpr->getSourceRange() : SourceRange()));
1060 return RetryExpr;
1061 }
1062
1063 // Diagnose lookups that find only declarations from a non-base
1064 // type. This is possible for either qualified lookups (which may
1065 // have been qualified with an unrelated type) or implicit member
1066 // expressions (which were found with unqualified lookup and thus
1067 // may have come from an enclosing scope). Note that it's okay for
1068 // lookup to find declarations from a non-base type as long as those
1069 // aren't the ones picked by overload resolution.
1070 if ((SS.isSet() || !BaseExpr ||
1071 (isa<CXXThisExpr>(Val: BaseExpr) &&
1072 cast<CXXThisExpr>(Val: BaseExpr)->isImplicit())) &&
1073 !SuppressQualifierCheck &&
1074 CheckQualifiedMemberReference(BaseExpr, BaseType, SS, R))
1075 return ExprError();
1076
1077 // Construct an unresolved result if we in fact got an unresolved
1078 // result.
1079 if (R.isOverloadedResult() || R.isUnresolvableResult()) {
1080 // Suppress any lookup-related diagnostics; we'll do these when we
1081 // pick a member.
1082 R.suppressDiagnostics();
1083
1084 UnresolvedMemberExpr *MemExpr
1085 = UnresolvedMemberExpr::Create(Context, HasUnresolvedUsing: R.isUnresolvableResult(),
1086 Base: BaseExpr, BaseType: BaseExprType,
1087 IsArrow, OperatorLoc: OpLoc,
1088 QualifierLoc: SS.getWithLocInContext(Context),
1089 TemplateKWLoc, MemberNameInfo,
1090 TemplateArgs, Begin: R.begin(), End: R.end());
1091
1092 return MemExpr;
1093 }
1094
1095 assert(R.isSingleResult());
1096 DeclAccessPair FoundDecl = R.begin().getPair();
1097 NamedDecl *MemberDecl = R.getFoundDecl();
1098
1099 // FIXME: diagnose the presence of template arguments now.
1100
1101 // If the decl being referenced had an error, return an error for this
1102 // sub-expr without emitting another error, in order to avoid cascading
1103 // error cases.
1104 if (MemberDecl->isInvalidDecl())
1105 return ExprError();
1106
1107 // Handle the implicit-member-access case.
1108 if (!BaseExpr) {
1109 // If this is not an instance member, convert to a non-member access.
1110 if (!MemberDecl->isCXXInstanceMember()) {
1111 // We might have a variable template specialization (or maybe one day a
1112 // member concept-id).
1113 if (TemplateArgs || TemplateKWLoc.isValid())
1114 return BuildTemplateIdExpr(SS, TemplateKWLoc, R, /*ADL*/RequiresADL: false, TemplateArgs);
1115
1116 return BuildDeclarationNameExpr(SS, NameInfo: R.getLookupNameInfo(), D: MemberDecl,
1117 FoundD: FoundDecl, TemplateArgs);
1118 }
1119 SourceLocation Loc = R.getNameLoc();
1120 if (SS.getRange().isValid())
1121 Loc = SS.getRange().getBegin();
1122 BaseExpr = BuildCXXThisExpr(Loc, Type: BaseExprType, /*IsImplicit=*/true);
1123 }
1124
1125 // C++17 [expr.ref]p2, per CWG2813:
1126 // For the first option (dot), if the id-expression names a static member or
1127 // an enumerator, the first expression is a discarded-value expression; if
1128 // the id-expression names a non-static data member, the first expression
1129 // shall be a glvalue.
1130 auto ConvertBaseExprToDiscardedValue = [&] {
1131 assert(getLangOpts().CPlusPlus &&
1132 "Static member / member enumerator outside of C++");
1133 if (IsArrow)
1134 return false;
1135 ExprResult Converted = IgnoredValueConversions(E: BaseExpr);
1136 if (Converted.isInvalid())
1137 return true;
1138 BaseExpr = Converted.get();
1139 return false;
1140 };
1141 auto ConvertBaseExprToGLValue = [&] {
1142 if (IsArrow || !BaseExpr->isPRValue())
1143 return false;
1144 ExprResult Converted = TemporaryMaterializationConversion(E: BaseExpr);
1145 if (Converted.isInvalid())
1146 return true;
1147 BaseExpr = Converted.get();
1148 return false;
1149 };
1150
1151 // Check the use of this member.
1152 if (DiagnoseUseOfDecl(D: MemberDecl, Locs: MemberLoc))
1153 return ExprError();
1154
1155 if (FieldDecl *FD = dyn_cast<FieldDecl>(Val: MemberDecl)) {
1156 if (ConvertBaseExprToGLValue())
1157 return ExprError();
1158 return BuildFieldReferenceExpr(BaseExpr, IsArrow, OpLoc, SS, Field: FD, FoundDecl,
1159 MemberNameInfo);
1160 }
1161
1162 if (MSPropertyDecl *PD = dyn_cast<MSPropertyDecl>(Val: MemberDecl)) {
1163 // No temporaries are materialized for property references yet.
1164 // They might be materialized when this is transformed into a member call.
1165 // Note that this is slightly different behaviour from MSVC which doesn't
1166 // implement CWG2813 yet: MSVC might materialize an extra temporary if the
1167 // getter or setter function is an explicit object member function.
1168 return BuildMSPropertyRefExpr(S&: *this, BaseExpr, IsArrow, SS, PD,
1169 NameInfo: MemberNameInfo);
1170 }
1171
1172 if (IndirectFieldDecl *FD = dyn_cast<IndirectFieldDecl>(Val: MemberDecl)) {
1173 if (ConvertBaseExprToGLValue())
1174 return ExprError();
1175 // We may have found a field within an anonymous union or struct
1176 // (C++ [class.union]).
1177 return BuildAnonymousStructUnionMemberReference(SS, loc: MemberLoc, indirectField: FD,
1178 foundDecl: FoundDecl, baseObjectExpr: BaseExpr,
1179 opLoc: OpLoc);
1180 }
1181
1182 // Static data member
1183 if (VarDecl *Var = dyn_cast<VarDecl>(Val: MemberDecl)) {
1184 if (ConvertBaseExprToDiscardedValue())
1185 return ExprError();
1186 return BuildMemberExpr(Base: BaseExpr, IsArrow, OpLoc,
1187 NNS: SS.getWithLocInContext(Context), TemplateKWLoc, Member: Var,
1188 FoundDecl, /*HadMultipleCandidates=*/false,
1189 MemberNameInfo, Ty: Var->getType().getNonReferenceType(),
1190 VK: VK_LValue, OK: OK_Ordinary);
1191 }
1192
1193 if (CXXMethodDecl *MemberFn = dyn_cast<CXXMethodDecl>(Val: MemberDecl)) {
1194 ExprValueKind valueKind;
1195 QualType type;
1196 if (MemberFn->isInstance()) {
1197 valueKind = VK_PRValue;
1198 type = Context.BoundMemberTy;
1199 if (MemberFn->isImplicitObjectMemberFunction() &&
1200 ConvertBaseExprToGLValue())
1201 return ExprError();
1202 } else {
1203 // Static member function
1204 if (ConvertBaseExprToDiscardedValue())
1205 return ExprError();
1206 valueKind = VK_LValue;
1207 type = MemberFn->getType();
1208 }
1209
1210 return BuildMemberExpr(BaseExpr, IsArrow, OpLoc,
1211 SS.getWithLocInContext(Context), TemplateKWLoc,
1212 MemberFn, FoundDecl, /*HadMultipleCandidates=*/false,
1213 MemberNameInfo, type, valueKind, OK_Ordinary);
1214 }
1215 assert(!isa<FunctionDecl>(MemberDecl) && "member function not C++ method?");
1216
1217 if (EnumConstantDecl *Enum = dyn_cast<EnumConstantDecl>(Val: MemberDecl)) {
1218 if (ConvertBaseExprToDiscardedValue())
1219 return ExprError();
1220 return BuildMemberExpr(
1221 Base: BaseExpr, IsArrow, OpLoc, NNS: SS.getWithLocInContext(Context),
1222 TemplateKWLoc, Member: Enum, FoundDecl, /*HadMultipleCandidates=*/false,
1223 MemberNameInfo, Ty: Enum->getType(), VK: VK_PRValue, OK: OK_Ordinary);
1224 }
1225
1226 if (VarTemplateDecl *VarTempl = dyn_cast<VarTemplateDecl>(Val: MemberDecl)) {
1227 if (ConvertBaseExprToDiscardedValue())
1228 return ExprError();
1229 if (!TemplateArgs) {
1230 diagnoseMissingTemplateArguments(
1231 SS, /*TemplateKeyword=*/TemplateKWLoc.isValid(), VarTempl, MemberLoc);
1232 return ExprError();
1233 }
1234
1235 DeclResult VDecl = CheckVarTemplateId(Template: VarTempl, TemplateLoc: TemplateKWLoc,
1236 TemplateNameLoc: MemberNameInfo.getLoc(), TemplateArgs: *TemplateArgs);
1237 if (VDecl.isInvalid())
1238 return ExprError();
1239
1240 // Non-dependent member, but dependent template arguments.
1241 if (!VDecl.get())
1242 return ActOnDependentMemberExpr(
1243 BaseExpr, BaseType: BaseExpr->getType(), IsArrow, OpLoc, SS, TemplateKWLoc,
1244 FirstQualifierInScope, NameInfo: MemberNameInfo, TemplateArgs);
1245
1246 VarDecl *Var = cast<VarDecl>(Val: VDecl.get());
1247 if (!Var->getTemplateSpecializationKind())
1248 Var->setTemplateSpecializationKind(TSK: TSK_ImplicitInstantiation, PointOfInstantiation: MemberLoc);
1249
1250 return BuildMemberExpr(Base: BaseExpr, IsArrow, OpLoc,
1251 NNS: SS.getWithLocInContext(Context), TemplateKWLoc, Member: Var,
1252 FoundDecl, /*HadMultipleCandidates=*/false,
1253 MemberNameInfo, Ty: Var->getType().getNonReferenceType(),
1254 VK: VK_LValue, OK: OK_Ordinary, TemplateArgs);
1255 }
1256
1257 // We found something that we didn't expect. Complain.
1258 if (isa<TypeDecl>(MemberDecl))
1259 Diag(MemberLoc, diag::err_typecheck_member_reference_type)
1260 << MemberName << BaseType << int(IsArrow);
1261 else
1262 Diag(MemberLoc, diag::err_typecheck_member_reference_unknown)
1263 << MemberName << BaseType << int(IsArrow);
1264
1265 Diag(MemberDecl->getLocation(), diag::note_member_declared_here)
1266 << MemberName;
1267 R.suppressDiagnostics();
1268 return ExprError();
1269}
1270
1271/// Given that normal member access failed on the given expression,
1272/// and given that the expression's type involves builtin-id or
1273/// builtin-Class, decide whether substituting in the redefinition
1274/// types would be profitable. The redefinition type is whatever
1275/// this translation unit tried to typedef to id/Class; we store
1276/// it to the side and then re-use it in places like this.
1277static bool ShouldTryAgainWithRedefinitionType(Sema &S, ExprResult &base) {
1278 const ObjCObjectPointerType *opty
1279 = base.get()->getType()->getAs<ObjCObjectPointerType>();
1280 if (!opty) return false;
1281
1282 const ObjCObjectType *ty = opty->getObjectType();
1283
1284 QualType redef;
1285 if (ty->isObjCId()) {
1286 redef = S.Context.getObjCIdRedefinitionType();
1287 } else if (ty->isObjCClass()) {
1288 redef = S.Context.getObjCClassRedefinitionType();
1289 } else {
1290 return false;
1291 }
1292
1293 // Do the substitution as long as the redefinition type isn't just a
1294 // possibly-qualified pointer to builtin-id or builtin-Class again.
1295 opty = redef->getAs<ObjCObjectPointerType>();
1296 if (opty && !opty->getObjectType()->getInterface())
1297 return false;
1298
1299 base = S.ImpCastExprToType(E: base.get(), Type: redef, CK: CK_BitCast);
1300 return true;
1301}
1302
1303static bool isRecordType(QualType T) {
1304 return T->isRecordType();
1305}
1306static bool isPointerToRecordType(QualType T) {
1307 if (const PointerType *PT = T->getAs<PointerType>())
1308 return PT->getPointeeType()->isRecordType();
1309 return false;
1310}
1311
1312ExprResult
1313Sema::PerformMemberExprBaseConversion(Expr *Base, bool IsArrow) {
1314 if (IsArrow && !Base->getType()->isFunctionType())
1315 return DefaultFunctionArrayLvalueConversion(E: Base);
1316
1317 return CheckPlaceholderExpr(E: Base);
1318}
1319
1320/// Look up the given member of the given non-type-dependent
1321/// expression. This can return in one of two ways:
1322/// * If it returns a sentinel null-but-valid result, the caller will
1323/// assume that lookup was performed and the results written into
1324/// the provided structure. It will take over from there.
1325/// * Otherwise, the returned expression will be produced in place of
1326/// an ordinary member expression.
1327///
1328/// The ObjCImpDecl bit is a gross hack that will need to be properly
1329/// fixed for ObjC++.
1330static ExprResult LookupMemberExpr(Sema &S, LookupResult &R,
1331 ExprResult &BaseExpr, bool &IsArrow,
1332 SourceLocation OpLoc, CXXScopeSpec &SS,
1333 Decl *ObjCImpDecl, bool HasTemplateArgs,
1334 SourceLocation TemplateKWLoc) {
1335 assert(BaseExpr.get() && "no base expression");
1336
1337 // Perform default conversions.
1338 BaseExpr = S.PerformMemberExprBaseConversion(Base: BaseExpr.get(), IsArrow);
1339 if (BaseExpr.isInvalid())
1340 return ExprError();
1341
1342 QualType BaseType = BaseExpr.get()->getType();
1343
1344 DeclarationName MemberName = R.getLookupName();
1345 SourceLocation MemberLoc = R.getNameLoc();
1346
1347 // For later type-checking purposes, turn arrow accesses into dot
1348 // accesses. The only access type we support that doesn't follow
1349 // the C equivalence "a->b === (*a).b" is ObjC property accesses,
1350 // and those never use arrows, so this is unaffected.
1351 if (IsArrow) {
1352 if (const PointerType *Ptr = BaseType->getAs<PointerType>())
1353 BaseType = Ptr->getPointeeType();
1354 else if (const ObjCObjectPointerType *Ptr =
1355 BaseType->getAs<ObjCObjectPointerType>())
1356 BaseType = Ptr->getPointeeType();
1357 else if (BaseType->isFunctionType())
1358 goto fail;
1359 else if (BaseType->isDependentType())
1360 BaseType = S.Context.DependentTy;
1361 else if (BaseType->isRecordType()) {
1362 // Recover from arrow accesses to records, e.g.:
1363 // struct MyRecord foo;
1364 // foo->bar
1365 // This is actually well-formed in C++ if MyRecord has an
1366 // overloaded operator->, but that should have been dealt with
1367 // by now--or a diagnostic message already issued if a problem
1368 // was encountered while looking for the overloaded operator->.
1369 if (!S.getLangOpts().CPlusPlus) {
1370 S.Diag(OpLoc, diag::err_typecheck_member_reference_suggestion)
1371 << BaseType << int(IsArrow) << BaseExpr.get()->getSourceRange()
1372 << FixItHint::CreateReplacement(OpLoc, ".");
1373 }
1374 IsArrow = false;
1375 } else {
1376 S.Diag(MemberLoc, diag::err_typecheck_member_reference_arrow)
1377 << BaseType << BaseExpr.get()->getSourceRange();
1378 return ExprError();
1379 }
1380 }
1381
1382 // If the base type is an atomic type, this access is undefined behavior per
1383 // C11 6.5.2.3p5. Instead of giving a typecheck error, we'll warn the user
1384 // about the UB and recover by converting the atomic lvalue into a non-atomic
1385 // lvalue. Because this is inherently unsafe as an atomic operation, the
1386 // warning defaults to an error.
1387 if (const auto *ATy = BaseType->getAs<AtomicType>()) {
1388 S.DiagRuntimeBehavior(OpLoc, BaseExpr.get(),
1389 S.PDiag(diag::warn_atomic_member_access));
1390 BaseType = ATy->getValueType().getUnqualifiedType();
1391 BaseExpr = ImplicitCastExpr::Create(
1392 Context: S.Context, T: IsArrow ? S.Context.getPointerType(T: BaseType) : BaseType,
1393 Kind: CK_AtomicToNonAtomic, Operand: BaseExpr.get(), BasePath: nullptr,
1394 Cat: BaseExpr.get()->getValueKind(), FPO: FPOptionsOverride());
1395 }
1396
1397 // Handle field access to simple records.
1398 if (BaseType->getAsRecordDecl()) {
1399 TypoExpr *TE = nullptr;
1400 if (LookupMemberExprInRecord(SemaRef&: S, R, BaseExpr: BaseExpr.get(), RTy: BaseType, OpLoc, IsArrow,
1401 SS, HasTemplateArgs, TemplateKWLoc, TE))
1402 return ExprError();
1403
1404 // Returning valid-but-null is how we indicate to the caller that
1405 // the lookup result was filled in. If typo correction was attempted and
1406 // failed, the lookup result will have been cleared--that combined with the
1407 // valid-but-null ExprResult will trigger the appropriate diagnostics.
1408 return ExprResult(TE);
1409 } else if (BaseType->isDependentType()) {
1410 R.setNotFoundInCurrentInstantiation();
1411 return ExprEmpty();
1412 }
1413
1414 // Handle ivar access to Objective-C objects.
1415 if (const ObjCObjectType *OTy = BaseType->getAs<ObjCObjectType>()) {
1416 if (!SS.isEmpty() && !SS.isInvalid()) {
1417 S.Diag(SS.getRange().getBegin(), diag::err_qualified_objc_access)
1418 << 1 << SS.getScopeRep()
1419 << FixItHint::CreateRemoval(SS.getRange());
1420 SS.clear();
1421 }
1422
1423 IdentifierInfo *Member = MemberName.getAsIdentifierInfo();
1424
1425 // There are three cases for the base type:
1426 // - builtin id (qualified or unqualified)
1427 // - builtin Class (qualified or unqualified)
1428 // - an interface
1429 ObjCInterfaceDecl *IDecl = OTy->getInterface();
1430 if (!IDecl) {
1431 if (S.getLangOpts().ObjCAutoRefCount &&
1432 (OTy->isObjCId() || OTy->isObjCClass()))
1433 goto fail;
1434 // There's an implicit 'isa' ivar on all objects.
1435 // But we only actually find it this way on objects of type 'id',
1436 // apparently.
1437 if (OTy->isObjCId() && Member->isStr(Str: "isa"))
1438 return new (S.Context) ObjCIsaExpr(BaseExpr.get(), IsArrow, MemberLoc,
1439 OpLoc, S.Context.getObjCClassType());
1440 if (ShouldTryAgainWithRedefinitionType(S, base&: BaseExpr))
1441 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1442 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1443 goto fail;
1444 }
1445
1446 if (S.RequireCompleteType(OpLoc, BaseType,
1447 diag::err_typecheck_incomplete_tag,
1448 BaseExpr.get()))
1449 return ExprError();
1450
1451 ObjCInterfaceDecl *ClassDeclared = nullptr;
1452 ObjCIvarDecl *IV = IDecl->lookupInstanceVariable(IVarName: Member, ClassDeclared);
1453
1454 if (!IV) {
1455 // Attempt to correct for typos in ivar names.
1456 DeclFilterCCC<ObjCIvarDecl> Validator{};
1457 Validator.IsObjCIvarLookup = IsArrow;
1458 if (TypoCorrection Corrected = S.CorrectTypo(
1459 R.getLookupNameInfo(), Sema::LookupMemberName, nullptr, nullptr,
1460 Validator, CorrectTypoKind::ErrorRecovery, IDecl)) {
1461 IV = Corrected.getCorrectionDeclAs<ObjCIvarDecl>();
1462 S.diagnoseTypo(
1463 Corrected,
1464 S.PDiag(diag::err_typecheck_member_reference_ivar_suggest)
1465 << IDecl->getDeclName() << MemberName);
1466
1467 // Figure out the class that declares the ivar.
1468 assert(!ClassDeclared);
1469
1470 Decl *D = cast<Decl>(IV->getDeclContext());
1471 if (auto *Category = dyn_cast<ObjCCategoryDecl>(D))
1472 D = Category->getClassInterface();
1473
1474 if (auto *Implementation = dyn_cast<ObjCImplementationDecl>(D))
1475 ClassDeclared = Implementation->getClassInterface();
1476 else if (auto *Interface = dyn_cast<ObjCInterfaceDecl>(D))
1477 ClassDeclared = Interface;
1478
1479 assert(ClassDeclared && "cannot query interface");
1480 } else {
1481 if (IsArrow &&
1482 IDecl->FindPropertyDeclaration(
1483 Member, ObjCPropertyQueryKind::OBJC_PR_query_instance)) {
1484 S.Diag(MemberLoc, diag::err_property_found_suggest)
1485 << Member << BaseExpr.get()->getType()
1486 << FixItHint::CreateReplacement(OpLoc, ".");
1487 return ExprError();
1488 }
1489
1490 S.Diag(MemberLoc, diag::err_typecheck_member_reference_ivar)
1491 << IDecl->getDeclName() << MemberName
1492 << BaseExpr.get()->getSourceRange();
1493 return ExprError();
1494 }
1495 }
1496
1497 assert(ClassDeclared);
1498
1499 // If the decl being referenced had an error, return an error for this
1500 // sub-expr without emitting another error, in order to avoid cascading
1501 // error cases.
1502 if (IV->isInvalidDecl())
1503 return ExprError();
1504
1505 // Check whether we can reference this field.
1506 if (S.DiagnoseUseOfDecl(IV, MemberLoc))
1507 return ExprError();
1508 if (IV->getAccessControl() != ObjCIvarDecl::Public &&
1509 IV->getAccessControl() != ObjCIvarDecl::Package) {
1510 ObjCInterfaceDecl *ClassOfMethodDecl = nullptr;
1511 if (ObjCMethodDecl *MD = S.getCurMethodDecl())
1512 ClassOfMethodDecl = MD->getClassInterface();
1513 else if (ObjCImpDecl && S.getCurFunctionDecl()) {
1514 // Case of a c-function declared inside an objc implementation.
1515 // FIXME: For a c-style function nested inside an objc implementation
1516 // class, there is no implementation context available, so we pass
1517 // down the context as argument to this routine. Ideally, this context
1518 // need be passed down in the AST node and somehow calculated from the
1519 // AST for a function decl.
1520 if (ObjCImplementationDecl *IMPD =
1521 dyn_cast<ObjCImplementationDecl>(Val: ObjCImpDecl))
1522 ClassOfMethodDecl = IMPD->getClassInterface();
1523 else if (ObjCCategoryImplDecl* CatImplClass =
1524 dyn_cast<ObjCCategoryImplDecl>(Val: ObjCImpDecl))
1525 ClassOfMethodDecl = CatImplClass->getClassInterface();
1526 }
1527 if (!S.getLangOpts().DebuggerSupport) {
1528 if (IV->getAccessControl() == ObjCIvarDecl::Private) {
1529 if (!declaresSameEntity(ClassDeclared, IDecl) ||
1530 !declaresSameEntity(ClassOfMethodDecl, ClassDeclared))
1531 S.Diag(MemberLoc, diag::err_private_ivar_access)
1532 << IV->getDeclName();
1533 } else if (!IDecl->isSuperClassOf(ClassOfMethodDecl))
1534 // @protected
1535 S.Diag(MemberLoc, diag::err_protected_ivar_access)
1536 << IV->getDeclName();
1537 }
1538 }
1539 bool warn = true;
1540 if (S.getLangOpts().ObjCWeak) {
1541 Expr *BaseExp = BaseExpr.get()->IgnoreParenImpCasts();
1542 if (UnaryOperator *UO = dyn_cast<UnaryOperator>(Val: BaseExp))
1543 if (UO->getOpcode() == UO_Deref)
1544 BaseExp = UO->getSubExpr()->IgnoreParenCasts();
1545
1546 if (DeclRefExpr *DE = dyn_cast<DeclRefExpr>(Val: BaseExp))
1547 if (DE->getType().getObjCLifetime() == Qualifiers::OCL_Weak) {
1548 S.Diag(DE->getLocation(), diag::err_arc_weak_ivar_access);
1549 warn = false;
1550 }
1551 }
1552 if (warn) {
1553 if (ObjCMethodDecl *MD = S.getCurMethodDecl()) {
1554 ObjCMethodFamily MF = MD->getMethodFamily();
1555 warn = (MF != OMF_init && MF != OMF_dealloc && MF != OMF_finalize &&
1556 !S.ObjC().IvarBacksCurrentMethodAccessor(IFace: IDecl, Method: MD, IV));
1557 }
1558 if (warn)
1559 S.Diag(MemberLoc, diag::warn_direct_ivar_access) << IV->getDeclName();
1560 }
1561
1562 ObjCIvarRefExpr *Result = new (S.Context) ObjCIvarRefExpr(
1563 IV, IV->getUsageType(objectType: BaseType), MemberLoc, OpLoc, BaseExpr.get(),
1564 IsArrow);
1565
1566 if (IV->getType().getObjCLifetime() == Qualifiers::OCL_Weak) {
1567 if (!S.isUnevaluatedContext() &&
1568 !S.Diags.isIgnored(diag::warn_arc_repeated_use_of_weak, MemberLoc))
1569 S.getCurFunction()->recordUseOfWeak(E: Result);
1570 }
1571
1572 return Result;
1573 }
1574
1575 // Objective-C property access.
1576 const ObjCObjectPointerType *OPT;
1577 if (!IsArrow && (OPT = BaseType->getAs<ObjCObjectPointerType>())) {
1578 if (!SS.isEmpty() && !SS.isInvalid()) {
1579 S.Diag(SS.getRange().getBegin(), diag::err_qualified_objc_access)
1580 << 0 << SS.getScopeRep() << FixItHint::CreateRemoval(SS.getRange());
1581 SS.clear();
1582 }
1583
1584 // This actually uses the base as an r-value.
1585 BaseExpr = S.DefaultLvalueConversion(E: BaseExpr.get());
1586 if (BaseExpr.isInvalid())
1587 return ExprError();
1588
1589 assert(S.Context.hasSameUnqualifiedType(BaseType,
1590 BaseExpr.get()->getType()));
1591
1592 IdentifierInfo *Member = MemberName.getAsIdentifierInfo();
1593
1594 const ObjCObjectType *OT = OPT->getObjectType();
1595
1596 // id, with and without qualifiers.
1597 if (OT->isObjCId()) {
1598 // Check protocols on qualified interfaces.
1599 Selector Sel = S.PP.getSelectorTable().getNullarySelector(ID: Member);
1600 if (Decl *PMDecl =
1601 FindGetterSetterNameDecl(QIdTy: OPT, Member, Sel, Context&: S.Context)) {
1602 if (ObjCPropertyDecl *PD = dyn_cast<ObjCPropertyDecl>(Val: PMDecl)) {
1603 // Check the use of this declaration
1604 if (S.DiagnoseUseOfDecl(PD, MemberLoc))
1605 return ExprError();
1606
1607 return new (S.Context)
1608 ObjCPropertyRefExpr(PD, S.Context.PseudoObjectTy, VK_LValue,
1609 OK_ObjCProperty, MemberLoc, BaseExpr.get());
1610 }
1611
1612 if (ObjCMethodDecl *OMD = dyn_cast<ObjCMethodDecl>(Val: PMDecl)) {
1613 Selector SetterSel =
1614 SelectorTable::constructSetterSelector(Idents&: S.PP.getIdentifierTable(),
1615 SelTable&: S.PP.getSelectorTable(),
1616 Name: Member);
1617 ObjCMethodDecl *SMD = nullptr;
1618 if (Decl *SDecl = FindGetterSetterNameDecl(QIdTy: OPT,
1619 /*Property id*/ Member: nullptr,
1620 Sel: SetterSel, Context&: S.Context))
1621 SMD = dyn_cast<ObjCMethodDecl>(Val: SDecl);
1622
1623 return new (S.Context)
1624 ObjCPropertyRefExpr(OMD, SMD, S.Context.PseudoObjectTy, VK_LValue,
1625 OK_ObjCProperty, MemberLoc, BaseExpr.get());
1626 }
1627 }
1628 // Use of id.member can only be for a property reference. Do not
1629 // use the 'id' redefinition in this case.
1630 if (IsArrow && ShouldTryAgainWithRedefinitionType(S, base&: BaseExpr))
1631 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1632 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1633
1634 return ExprError(S.Diag(MemberLoc, diag::err_property_not_found)
1635 << MemberName << BaseType);
1636 }
1637
1638 // 'Class', unqualified only.
1639 if (OT->isObjCClass()) {
1640 // Only works in a method declaration (??!).
1641 ObjCMethodDecl *MD = S.getCurMethodDecl();
1642 if (!MD) {
1643 if (ShouldTryAgainWithRedefinitionType(S, base&: BaseExpr))
1644 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1645 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1646
1647 goto fail;
1648 }
1649
1650 // Also must look for a getter name which uses property syntax.
1651 Selector Sel = S.PP.getSelectorTable().getNullarySelector(ID: Member);
1652 ObjCInterfaceDecl *IFace = MD->getClassInterface();
1653 if (!IFace)
1654 goto fail;
1655
1656 ObjCMethodDecl *Getter;
1657 if ((Getter = IFace->lookupClassMethod(Sel))) {
1658 // Check the use of this method.
1659 if (S.DiagnoseUseOfDecl(Getter, MemberLoc))
1660 return ExprError();
1661 } else
1662 Getter = IFace->lookupPrivateMethod(Sel, Instance: false);
1663 // If we found a getter then this may be a valid dot-reference, we
1664 // will look for the matching setter, in case it is needed.
1665 Selector SetterSel =
1666 SelectorTable::constructSetterSelector(Idents&: S.PP.getIdentifierTable(),
1667 SelTable&: S.PP.getSelectorTable(),
1668 Name: Member);
1669 ObjCMethodDecl *Setter = IFace->lookupClassMethod(Sel: SetterSel);
1670 if (!Setter) {
1671 // If this reference is in an @implementation, also check for 'private'
1672 // methods.
1673 Setter = IFace->lookupPrivateMethod(Sel: SetterSel, Instance: false);
1674 }
1675
1676 if (Setter && S.DiagnoseUseOfDecl(Setter, MemberLoc))
1677 return ExprError();
1678
1679 if (Getter || Setter) {
1680 return new (S.Context) ObjCPropertyRefExpr(
1681 Getter, Setter, S.Context.PseudoObjectTy, VK_LValue,
1682 OK_ObjCProperty, MemberLoc, BaseExpr.get());
1683 }
1684
1685 if (ShouldTryAgainWithRedefinitionType(S, base&: BaseExpr))
1686 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1687 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1688
1689 return ExprError(S.Diag(MemberLoc, diag::err_property_not_found)
1690 << MemberName << BaseType);
1691 }
1692
1693 // Normal property access.
1694 return S.ObjC().HandleExprPropertyRefExpr(
1695 OPT, BaseExpr: BaseExpr.get(), OpLoc, MemberName, MemberLoc, SuperLoc: SourceLocation(),
1696 SuperType: QualType(), Super: false);
1697 }
1698
1699 if (BaseType->isPackedVectorBoolType(ctx: S.Context)) {
1700 // We disallow element access for ext_vector_type bool. There is no way to
1701 // materialize a reference to a vector element as a pointer (each element is
1702 // one bit in the vector).
1703 S.Diag(R.getNameLoc(), diag::err_ext_vector_component_name_illegal)
1704 << MemberName
1705 << (BaseExpr.get() ? BaseExpr.get()->getSourceRange() : SourceRange());
1706 return ExprError();
1707 }
1708
1709 // Handle 'field access' to vectors, such as 'V.xx'.
1710 if (BaseType->isExtVectorType()) {
1711 // FIXME: this expr should store IsArrow.
1712 IdentifierInfo *Member = MemberName.getAsIdentifierInfo();
1713 ExprValueKind VK = (IsArrow ? VK_LValue : BaseExpr.get()->getValueKind());
1714 QualType ret = CheckExtVectorComponent(S, baseType: BaseType, VK, OpLoc,
1715 CompName: Member, CompLoc: MemberLoc);
1716 if (ret.isNull())
1717 return ExprError();
1718 Qualifiers BaseQ =
1719 S.Context.getCanonicalType(T: BaseExpr.get()->getType()).getQualifiers();
1720 ret = S.Context.getQualifiedType(T: ret, Qs: BaseQ);
1721
1722 return new (S.Context)
1723 ExtVectorElementExpr(ret, VK, BaseExpr.get(), *Member, MemberLoc);
1724 }
1725
1726 // Adjust builtin-sel to the appropriate redefinition type if that's
1727 // not just a pointer to builtin-sel again.
1728 if (IsArrow && BaseType->isSpecificBuiltinType(K: BuiltinType::ObjCSel) &&
1729 !S.Context.getObjCSelRedefinitionType()->isObjCSelType()) {
1730 BaseExpr = S.ImpCastExprToType(
1731 E: BaseExpr.get(), Type: S.Context.getObjCSelRedefinitionType(), CK: CK_BitCast);
1732 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1733 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1734 }
1735
1736 // Failure cases.
1737 fail:
1738
1739 // Recover from dot accesses to pointers, e.g.:
1740 // type *foo;
1741 // foo.bar
1742 // This is actually well-formed in two cases:
1743 // - 'type' is an Objective C type
1744 // - 'bar' is a pseudo-destructor name which happens to refer to
1745 // the appropriate pointer type
1746 if (const PointerType *Ptr = BaseType->getAs<PointerType>()) {
1747 if (!IsArrow && Ptr->getPointeeType()->isRecordType() &&
1748 MemberName.getNameKind() != DeclarationName::CXXDestructorName) {
1749 S.Diag(OpLoc, diag::err_typecheck_member_reference_suggestion)
1750 << BaseType << int(IsArrow) << BaseExpr.get()->getSourceRange()
1751 << FixItHint::CreateReplacement(OpLoc, "->");
1752
1753 if (S.isSFINAEContext())
1754 return ExprError();
1755
1756 // Recurse as an -> access.
1757 IsArrow = true;
1758 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1759 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1760 }
1761 }
1762
1763 // If the user is trying to apply -> or . to a function name, it's probably
1764 // because they forgot parentheses to call that function.
1765 if (S.tryToRecoverWithCall(
1766 BaseExpr, S.PDiag(diag::err_member_reference_needs_call),
1767 /*complain*/ false,
1768 IsArrow ? &isPointerToRecordType : &isRecordType)) {
1769 if (BaseExpr.isInvalid())
1770 return ExprError();
1771 BaseExpr = S.DefaultFunctionArrayConversion(E: BaseExpr.get());
1772 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS,
1773 ObjCImpDecl, HasTemplateArgs, TemplateKWLoc);
1774 }
1775
1776 // HLSL supports implicit conversion of scalar types to single element vector
1777 // rvalues in member expressions.
1778 if (S.getLangOpts().HLSL && BaseType->isScalarType()) {
1779 QualType VectorTy = S.Context.getExtVectorType(VectorType: BaseType, NumElts: 1);
1780 BaseExpr = S.ImpCastExprToType(E: BaseExpr.get(), Type: VectorTy, CK: CK_VectorSplat,
1781 VK: BaseExpr.get()->getValueKind());
1782 return LookupMemberExpr(S, R, BaseExpr, IsArrow, OpLoc, SS, ObjCImpDecl,
1783 HasTemplateArgs, TemplateKWLoc);
1784 }
1785
1786 S.Diag(OpLoc, diag::err_typecheck_member_reference_struct_union)
1787 << BaseType << BaseExpr.get()->getSourceRange() << MemberLoc;
1788
1789 return ExprError();
1790}
1791
1792ExprResult Sema::ActOnMemberAccessExpr(Scope *S, Expr *Base,
1793 SourceLocation OpLoc,
1794 tok::TokenKind OpKind, CXXScopeSpec &SS,
1795 SourceLocation TemplateKWLoc,
1796 UnqualifiedId &Id, Decl *ObjCImpDecl) {
1797 // Warn about the explicit constructor calls Microsoft extension.
1798 if (getLangOpts().MicrosoftExt &&
1799 Id.getKind() == UnqualifiedIdKind::IK_ConstructorName)
1800 Diag(Id.getSourceRange().getBegin(),
1801 diag::ext_ms_explicit_constructor_call);
1802
1803 TemplateArgumentListInfo TemplateArgsBuffer;
1804
1805 // Decompose the name into its component parts.
1806 DeclarationNameInfo NameInfo;
1807 const TemplateArgumentListInfo *TemplateArgs;
1808 DecomposeUnqualifiedId(Id, Buffer&: TemplateArgsBuffer,
1809 NameInfo, TemplateArgs);
1810
1811 bool IsArrow = (OpKind == tok::arrow);
1812
1813 if (getLangOpts().HLSL && IsArrow)
1814 return ExprError(Diag(OpLoc, diag::err_hlsl_operator_unsupported) << 2);
1815
1816 NamedDecl *FirstQualifierInScope
1817 = (!SS.isSet() ? nullptr : FindFirstQualifierInScope(S, NNS: SS.getScopeRep()));
1818
1819 // This is a postfix expression, so get rid of ParenListExprs.
1820 ExprResult Result = MaybeConvertParenListExprToParenExpr(S, ME: Base);
1821 if (Result.isInvalid()) return ExprError();
1822 Base = Result.get();
1823
1824 ActOnMemberAccessExtraArgs ExtraArgs = {.S: S, .Id: Id, .ObjCImpDecl: ObjCImpDecl};
1825 ExprResult Res = BuildMemberReferenceExpr(
1826 Base, BaseType: Base->getType(), OpLoc, IsArrow, SS, TemplateKWLoc,
1827 FirstQualifierInScope, NameInfo, TemplateArgs, S, ExtraArgs: &ExtraArgs);
1828
1829 if (!Res.isInvalid() && isa<MemberExpr>(Val: Res.get()))
1830 CheckMemberAccessOfNoDeref(E: cast<MemberExpr>(Val: Res.get()));
1831
1832 return Res;
1833}
1834
1835void Sema::CheckMemberAccessOfNoDeref(const MemberExpr *E) {
1836 if (isUnevaluatedContext())
1837 return;
1838
1839 QualType ResultTy = E->getType();
1840
1841 // Member accesses have four cases:
1842 // 1: non-array member via "->": dereferences
1843 // 2: non-array member via ".": nothing interesting happens
1844 // 3: array member access via "->": nothing interesting happens
1845 // (this returns an array lvalue and does not actually dereference memory)
1846 // 4: array member access via ".": *adds* a layer of indirection
1847 if (ResultTy->isArrayType()) {
1848 if (!E->isArrow()) {
1849 // This might be something like:
1850 // (*structPtr).arrayMember
1851 // which behaves roughly like:
1852 // &(*structPtr).pointerMember
1853 // in that the apparent dereference in the base expression does not
1854 // actually happen.
1855 CheckAddressOfNoDeref(E: E->getBase());
1856 }
1857 } else if (E->isArrow()) {
1858 if (const auto *Ptr = dyn_cast<PointerType>(
1859 Val: E->getBase()->getType().getDesugaredType(Context))) {
1860 if (Ptr->getPointeeType()->hasAttr(attr::NoDeref))
1861 ExprEvalContexts.back().PossibleDerefs.insert(E);
1862 }
1863 }
1864}
1865
1866ExprResult
1867Sema::BuildFieldReferenceExpr(Expr *BaseExpr, bool IsArrow,
1868 SourceLocation OpLoc, const CXXScopeSpec &SS,
1869 FieldDecl *Field, DeclAccessPair FoundDecl,
1870 const DeclarationNameInfo &MemberNameInfo) {
1871 // x.a is an l-value if 'a' has a reference type. Otherwise:
1872 // x.a is an l-value/x-value/pr-value if the base is (and note
1873 // that *x is always an l-value), except that if the base isn't
1874 // an ordinary object then we must have an rvalue.
1875 ExprValueKind VK = VK_LValue;
1876 ExprObjectKind OK = OK_Ordinary;
1877 if (!IsArrow) {
1878 if (BaseExpr->getObjectKind() == OK_Ordinary)
1879 VK = BaseExpr->getValueKind();
1880 else
1881 VK = VK_PRValue;
1882 }
1883 if (VK != VK_PRValue && Field->isBitField())
1884 OK = OK_BitField;
1885
1886 // Figure out the type of the member; see C99 6.5.2.3p3, C++ [expr.ref]
1887 QualType MemberType = Field->getType();
1888 if (const ReferenceType *Ref = MemberType->getAs<ReferenceType>()) {
1889 MemberType = Ref->getPointeeType();
1890 VK = VK_LValue;
1891 } else {
1892 QualType BaseType = BaseExpr->getType();
1893 if (IsArrow) BaseType = BaseType->castAs<PointerType>()->getPointeeType();
1894
1895 Qualifiers BaseQuals = BaseType.getQualifiers();
1896
1897 // GC attributes are never picked up by members.
1898 BaseQuals.removeObjCGCAttr();
1899
1900 // CVR attributes from the base are picked up by members,
1901 // except that 'mutable' members don't pick up 'const'.
1902 if (Field->isMutable()) BaseQuals.removeConst();
1903
1904 Qualifiers MemberQuals =
1905 Context.getCanonicalType(T: MemberType).getQualifiers();
1906
1907 assert(!MemberQuals.hasAddressSpace());
1908
1909 Qualifiers Combined = BaseQuals + MemberQuals;
1910 if (Combined != MemberQuals)
1911 MemberType = Context.getQualifiedType(T: MemberType, Qs: Combined);
1912
1913 // Pick up NoDeref from the base in case we end up using AddrOf on the
1914 // result. E.g. the expression
1915 // &someNoDerefPtr->pointerMember
1916 // should be a noderef pointer again.
1917 if (BaseType->hasAttr(attr::NoDeref))
1918 MemberType =
1919 Context.getAttributedType(attr::NoDeref, MemberType, MemberType);
1920 }
1921
1922 auto isDefaultedSpecialMember = [this](const DeclContext *Ctx) {
1923 auto *Method = dyn_cast<CXXMethodDecl>(Val: CurContext);
1924 if (!Method || !Method->isDefaulted())
1925 return false;
1926
1927 return getDefaultedFunctionKind(Method).isSpecialMember();
1928 };
1929
1930 // Implicit special members should not mark fields as used.
1931 if (!isDefaultedSpecialMember(CurContext))
1932 UnusedPrivateFields.remove(Field);
1933
1934 ExprResult Base = PerformObjectMemberConversion(BaseExpr, SS.getScopeRep(),
1935 FoundDecl, Field);
1936 if (Base.isInvalid())
1937 return ExprError();
1938
1939 // Build a reference to a private copy for non-static data members in
1940 // non-static member functions, privatized by OpenMP constructs.
1941 if (getLangOpts().OpenMP && IsArrow &&
1942 !CurContext->isDependentContext() &&
1943 isa<CXXThisExpr>(Val: Base.get()->IgnoreParenImpCasts())) {
1944 if (auto *PrivateCopy = OpenMP().isOpenMPCapturedDecl(Field)) {
1945 return OpenMP().getOpenMPCapturedExpr(Capture: PrivateCopy, VK, OK,
1946 Loc: MemberNameInfo.getLoc());
1947 }
1948 }
1949
1950 return BuildMemberExpr(
1951 Base.get(), IsArrow, OpLoc, SS.getWithLocInContext(Context),
1952 /*TemplateKWLoc=*/SourceLocation(), Field, FoundDecl,
1953 /*HadMultipleCandidates=*/false, MemberNameInfo, MemberType, VK, OK);
1954}
1955
1956ExprResult
1957Sema::BuildImplicitMemberExpr(const CXXScopeSpec &SS,
1958 SourceLocation TemplateKWLoc,
1959 LookupResult &R,
1960 const TemplateArgumentListInfo *TemplateArgs,
1961 bool IsKnownInstance, const Scope *S) {
1962 assert(!R.empty() && !R.isAmbiguous());
1963
1964 SourceLocation loc = R.getNameLoc();
1965
1966 // If this is known to be an instance access, go ahead and build an
1967 // implicit 'this' expression now.
1968 QualType ThisTy = getCurrentThisType();
1969 assert(!ThisTy.isNull() && "didn't correctly pre-flight capture of 'this'");
1970
1971 Expr *baseExpr = nullptr; // null signifies implicit access
1972 if (IsKnownInstance) {
1973 SourceLocation Loc = R.getNameLoc();
1974 if (SS.getRange().isValid())
1975 Loc = SS.getRange().getBegin();
1976 baseExpr = BuildCXXThisExpr(Loc: loc, Type: ThisTy, /*IsImplicit=*/true);
1977 }
1978
1979 return BuildMemberReferenceExpr(
1980 BaseExpr: baseExpr, BaseExprType: ThisTy,
1981 /*OpLoc=*/SourceLocation(),
1982 /*IsArrow=*/!getLangOpts().HLSL, SS, TemplateKWLoc,
1983 /*FirstQualifierInScope=*/nullptr, R, TemplateArgs, S);
1984}
1985

Provided by KDAB

Privacy Policy
Improve your Profiling and Debugging skills
Find out more

source code of clang/lib/Sema/SemaExprMember.cpp