1 //===--- Hover.cpp - Information about code at the cursor location --------===//
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
7 //===----------------------------------------------------------------------===//
12 #include "CodeCompletionStrings.h"
14 #include "FindTarget.h"
16 #include "IncludeCleaner.h"
17 #include "ParsedAST.h"
18 #include "Selection.h"
19 #include "SourceCode.h"
20 #include "clang-include-cleaner/Analysis.h"
21 #include "clang-include-cleaner/IncludeSpeller.h"
22 #include "clang-include-cleaner/Types.h"
23 #include "index/SymbolCollector.h"
24 #include "support/Markup.h"
25 #include "support/Trace.h"
26 #include "clang/AST/ASTContext.h"
27 #include "clang/AST/ASTDiagnostic.h"
28 #include "clang/AST/ASTTypeTraits.h"
29 #include "clang/AST/Attr.h"
30 #include "clang/AST/Decl.h"
31 #include "clang/AST/DeclBase.h"
32 #include "clang/AST/DeclCXX.h"
33 #include "clang/AST/DeclObjC.h"
34 #include "clang/AST/DeclTemplate.h"
35 #include "clang/AST/Expr.h"
36 #include "clang/AST/ExprCXX.h"
37 #include "clang/AST/OperationKinds.h"
38 #include "clang/AST/PrettyPrinter.h"
39 #include "clang/AST/RecordLayout.h"
40 #include "clang/AST/Type.h"
41 #include "clang/Basic/CharInfo.h"
42 #include "clang/Basic/LLVM.h"
43 #include "clang/Basic/SourceLocation.h"
44 #include "clang/Basic/SourceManager.h"
45 #include "clang/Basic/Specifiers.h"
46 #include "clang/Basic/TokenKinds.h"
47 #include "clang/Index/IndexSymbol.h"
48 #include "clang/Tooling/Syntax/Tokens.h"
49 #include "llvm/ADT/ArrayRef.h"
50 #include "llvm/ADT/DenseSet.h"
51 #include "llvm/ADT/STLExtras.h"
52 #include "llvm/ADT/SmallVector.h"
53 #include "llvm/ADT/StringExtras.h"
54 #include "llvm/ADT/StringRef.h"
55 #include "llvm/Support/Casting.h"
56 #include "llvm/Support/Error.h"
57 #include "llvm/Support/Format.h"
58 #include "llvm/Support/ScopedPrinter.h"
59 #include "llvm/Support/raw_ostream.h"
69 PrintingPolicy
getPrintingPolicy(PrintingPolicy Base
) {
70 Base
.AnonymousTagLocations
= false;
71 Base
.TerseOutput
= true;
72 Base
.PolishForDeclaration
= true;
73 Base
.ConstantsAsWritten
= true;
74 Base
.SuppressTemplateArgsInCXXConstructors
= true;
78 /// Given a declaration \p D, return a human-readable string representing the
79 /// local scope in which it is declared, i.e. class(es) and method name. Returns
80 /// an empty string if it is not local.
81 std::string
getLocalScope(const Decl
*D
) {
82 std::vector
<std::string
> Scopes
;
83 const DeclContext
*DC
= D
->getDeclContext();
85 // ObjC scopes won't have multiple components for us to join, instead:
86 // - Methods: "-[Class methodParam1:methodParam2]"
87 // - Classes, categories, and protocols: "MyClass(Category)"
88 if (const ObjCMethodDecl
*MD
= dyn_cast
<ObjCMethodDecl
>(DC
))
89 return printObjCMethod(*MD
);
90 if (const ObjCContainerDecl
*CD
= dyn_cast
<ObjCContainerDecl
>(DC
))
91 return printObjCContainer(*CD
);
93 auto GetName
= [](const TypeDecl
*D
) {
94 if (!D
->getDeclName().isEmpty()) {
95 PrintingPolicy Policy
= D
->getASTContext().getPrintingPolicy();
96 Policy
.SuppressScope
= true;
97 return declaredType(D
).getAsString(Policy
);
99 if (auto *RD
= dyn_cast
<RecordDecl
>(D
))
100 return ("(anonymous " + RD
->getKindName() + ")").str();
101 return std::string("");
104 if (const TypeDecl
*TD
= dyn_cast
<TypeDecl
>(DC
))
105 Scopes
.push_back(GetName(TD
));
106 else if (const FunctionDecl
*FD
= dyn_cast
<FunctionDecl
>(DC
))
107 Scopes
.push_back(FD
->getNameAsString());
108 DC
= DC
->getParent();
111 return llvm::join(llvm::reverse(Scopes
), "::");
114 /// Returns the human-readable representation for namespace containing the
115 /// declaration \p D. Returns empty if it is contained global namespace.
116 std::string
getNamespaceScope(const Decl
*D
) {
117 const DeclContext
*DC
= D
->getDeclContext();
119 // ObjC does not have the concept of namespaces, so instead we support
121 if (isa
<ObjCMethodDecl
, ObjCContainerDecl
>(DC
))
124 if (const TagDecl
*TD
= dyn_cast
<TagDecl
>(DC
))
125 return getNamespaceScope(TD
);
126 if (const FunctionDecl
*FD
= dyn_cast
<FunctionDecl
>(DC
))
127 return getNamespaceScope(FD
);
128 if (const NamespaceDecl
*NSD
= dyn_cast
<NamespaceDecl
>(DC
)) {
129 // Skip inline/anon namespaces.
130 if (NSD
->isInline() || NSD
->isAnonymousNamespace())
131 return getNamespaceScope(NSD
);
133 if (const NamedDecl
*ND
= dyn_cast
<NamedDecl
>(DC
))
134 return printQualifiedName(*ND
);
139 std::string
printDefinition(const Decl
*D
, PrintingPolicy PP
,
140 const syntax::TokenBuffer
&TB
) {
141 if (auto *VD
= llvm::dyn_cast
<VarDecl
>(D
)) {
142 if (auto *IE
= VD
->getInit()) {
143 // Initializers might be huge and result in lots of memory allocations in
144 // some catostrophic cases. Such long lists are not useful in hover cards
146 if (200 < TB
.expandedTokens(IE
->getSourceRange()).size())
147 PP
.SuppressInitializers
= true;
150 std::string Definition
;
151 llvm::raw_string_ostream
OS(Definition
);
157 const char *getMarkdownLanguage(const ASTContext
&Ctx
) {
158 const auto &LangOpts
= Ctx
.getLangOpts();
159 if (LangOpts
.ObjC
&& LangOpts
.CPlusPlus
)
160 return "objective-cpp";
161 return LangOpts
.ObjC
? "objective-c" : "cpp";
164 HoverInfo::PrintedType
printType(QualType QT
, ASTContext
&ASTCtx
,
165 const PrintingPolicy
&PP
) {
166 // TypePrinter doesn't resolve decltypes, so resolve them here.
167 // FIXME: This doesn't handle composite types that contain a decltype in them.
168 // We should rather have a printing policy for that.
169 while (!QT
.isNull() && QT
->isDecltypeType())
170 QT
= QT
->castAs
<DecltypeType
>()->getUnderlyingType();
171 HoverInfo::PrintedType Result
;
172 llvm::raw_string_ostream
OS(Result
.Type
);
173 // Special case: if the outer type is a tag type without qualifiers, then
174 // include the tag for extra clarity.
175 // This isn't very idiomatic, so don't attempt it for complex cases, including
176 // pointers/references, template specializations, etc.
177 if (!QT
.isNull() && !QT
.hasQualifiers() && PP
.SuppressTagKeyword
) {
178 if (auto *TT
= llvm::dyn_cast
<TagType
>(QT
.getTypePtr()))
179 OS
<< TT
->getDecl()->getKindName() << " ";
184 const Config
&Cfg
= Config::current();
185 if (!QT
.isNull() && Cfg
.Hover
.ShowAKA
) {
186 bool ShouldAKA
= false;
187 QualType DesugaredTy
= clang::desugarForDiagnostic(ASTCtx
, QT
, ShouldAKA
);
189 Result
.AKA
= DesugaredTy
.getAsString(PP
);
194 HoverInfo::PrintedType
printType(const TemplateTypeParmDecl
*TTP
) {
195 HoverInfo::PrintedType Result
;
196 Result
.Type
= TTP
->wasDeclaredWithTypename() ? "typename" : "class";
197 if (TTP
->isParameterPack())
198 Result
.Type
+= "...";
202 HoverInfo::PrintedType
printType(const NonTypeTemplateParmDecl
*NTTP
,
203 const PrintingPolicy
&PP
) {
204 auto PrintedType
= printType(NTTP
->getType(), NTTP
->getASTContext(), PP
);
205 if (NTTP
->isParameterPack()) {
206 PrintedType
.Type
+= "...";
208 *PrintedType
.AKA
+= "...";
213 HoverInfo::PrintedType
printType(const TemplateTemplateParmDecl
*TTP
,
214 const PrintingPolicy
&PP
) {
215 HoverInfo::PrintedType Result
;
216 llvm::raw_string_ostream
OS(Result
.Type
);
218 llvm::StringRef Sep
= "";
219 for (const Decl
*Param
: *TTP
->getTemplateParameters()) {
222 if (const auto *TTP
= dyn_cast
<TemplateTypeParmDecl
>(Param
))
223 OS
<< printType(TTP
).Type
;
224 else if (const auto *NTTP
= dyn_cast
<NonTypeTemplateParmDecl
>(Param
))
225 OS
<< printType(NTTP
, PP
).Type
;
226 else if (const auto *TTPD
= dyn_cast
<TemplateTemplateParmDecl
>(Param
))
227 OS
<< printType(TTPD
, PP
).Type
;
229 // FIXME: TemplateTemplateParameter doesn't store the info on whether this
230 // param was a "typename" or "class".
236 std::vector
<HoverInfo::Param
>
237 fetchTemplateParameters(const TemplateParameterList
*Params
,
238 const PrintingPolicy
&PP
) {
240 std::vector
<HoverInfo::Param
> TempParameters
;
242 for (const Decl
*Param
: *Params
) {
244 if (const auto *TTP
= dyn_cast
<TemplateTypeParmDecl
>(Param
)) {
245 P
.Type
= printType(TTP
);
247 if (!TTP
->getName().empty())
248 P
.Name
= TTP
->getNameAsString();
250 if (TTP
->hasDefaultArgument()) {
252 llvm::raw_string_ostream
Out(*P
.Default
);
253 TTP
->getDefaultArgument().getArgument().print(PP
, Out
,
254 /*IncludeType=*/false);
256 } else if (const auto *NTTP
= dyn_cast
<NonTypeTemplateParmDecl
>(Param
)) {
257 P
.Type
= printType(NTTP
, PP
);
259 if (IdentifierInfo
*II
= NTTP
->getIdentifier())
260 P
.Name
= II
->getName().str();
262 if (NTTP
->hasDefaultArgument()) {
264 llvm::raw_string_ostream
Out(*P
.Default
);
265 NTTP
->getDefaultArgument().getArgument().print(PP
, Out
,
266 /*IncludeType=*/false);
268 } else if (const auto *TTPD
= dyn_cast
<TemplateTemplateParmDecl
>(Param
)) {
269 P
.Type
= printType(TTPD
, PP
);
271 if (!TTPD
->getName().empty())
272 P
.Name
= TTPD
->getNameAsString();
274 if (TTPD
->hasDefaultArgument()) {
276 llvm::raw_string_ostream
Out(*P
.Default
);
277 TTPD
->getDefaultArgument().getArgument().print(PP
, Out
,
278 /*IncludeType*/ false);
281 TempParameters
.push_back(std::move(P
));
284 return TempParameters
;
287 const FunctionDecl
*getUnderlyingFunction(const Decl
*D
) {
288 // Extract lambda from variables.
289 if (const VarDecl
*VD
= llvm::dyn_cast
<VarDecl
>(D
)) {
290 auto QT
= VD
->getType();
292 while (!QT
->getPointeeType().isNull())
293 QT
= QT
->getPointeeType();
295 if (const auto *CD
= QT
->getAsCXXRecordDecl())
296 return CD
->getLambdaCallOperator();
300 // Non-lambda functions.
301 return D
->getAsFunction();
304 // Returns the decl that should be used for querying comments, either from index
306 const NamedDecl
*getDeclForComment(const NamedDecl
*D
) {
307 const NamedDecl
*DeclForComment
= D
;
308 if (const auto *TSD
= llvm::dyn_cast
<ClassTemplateSpecializationDecl
>(D
)) {
309 // Template may not be instantiated e.g. if the type didn't need to be
310 // complete; fallback to primary template.
311 if (TSD
->getTemplateSpecializationKind() == TSK_Undeclared
)
312 DeclForComment
= TSD
->getSpecializedTemplate();
313 else if (const auto *TIP
= TSD
->getTemplateInstantiationPattern())
314 DeclForComment
= TIP
;
315 } else if (const auto *TSD
=
316 llvm::dyn_cast
<VarTemplateSpecializationDecl
>(D
)) {
317 if (TSD
->getTemplateSpecializationKind() == TSK_Undeclared
)
318 DeclForComment
= TSD
->getSpecializedTemplate();
319 else if (const auto *TIP
= TSD
->getTemplateInstantiationPattern())
320 DeclForComment
= TIP
;
321 } else if (const auto *FD
= D
->getAsFunction())
322 if (const auto *TIP
= FD
->getTemplateInstantiationPattern())
323 DeclForComment
= TIP
;
324 // Ensure that getDeclForComment(getDeclForComment(X)) = getDeclForComment(X).
325 // This is usually not needed, but in strange cases of comparision operators
326 // being instantiated from spasceship operater, which itself is a template
327 // instantiation the recursrive call is necessary.
328 if (D
!= DeclForComment
)
329 DeclForComment
= getDeclForComment(DeclForComment
);
330 return DeclForComment
;
333 // Look up information about D from the index, and add it to Hover.
334 void enhanceFromIndex(HoverInfo
&Hover
, const NamedDecl
&ND
,
335 const SymbolIndex
*Index
) {
336 assert(&ND
== getDeclForComment(&ND
));
337 // We only add documentation, so don't bother if we already have some.
338 if (!Hover
.Documentation
.empty() || !Index
)
341 // Skip querying for non-indexable symbols, there's no point.
342 // We're searching for symbols that might be indexed outside this main file.
343 if (!SymbolCollector::shouldCollectSymbol(ND
, ND
.getASTContext(),
344 SymbolCollector::Options(),
345 /*IsMainFileOnly=*/false))
347 auto ID
= getSymbolID(&ND
);
352 Index
->lookup(Req
, [&](const Symbol
&S
) {
353 Hover
.Documentation
= std::string(S
.Documentation
);
357 // Default argument might exist but be unavailable, in the case of unparsed
358 // arguments for example. This function returns the default argument if it is
360 const Expr
*getDefaultArg(const ParmVarDecl
*PVD
) {
361 // Default argument can be unparsed or uninstantiated. For the former we
362 // can't do much, as token information is only stored in Sema and not
363 // attached to the AST node. For the latter though, it is safe to proceed as
364 // the expression is still valid.
365 if (!PVD
->hasDefaultArg() || PVD
->hasUnparsedDefaultArg())
367 return PVD
->hasUninstantiatedDefaultArg() ? PVD
->getUninstantiatedDefaultArg()
368 : PVD
->getDefaultArg();
371 HoverInfo::Param
toHoverInfoParam(const ParmVarDecl
*PVD
,
372 const PrintingPolicy
&PP
) {
373 HoverInfo::Param Out
;
374 Out
.Type
= printType(PVD
->getType(), PVD
->getASTContext(), PP
);
375 if (!PVD
->getName().empty())
376 Out
.Name
= PVD
->getNameAsString();
377 if (const Expr
*DefArg
= getDefaultArg(PVD
)) {
378 Out
.Default
.emplace();
379 llvm::raw_string_ostream
OS(*Out
.Default
);
380 DefArg
->printPretty(OS
, nullptr, PP
);
385 // Populates Type, ReturnType, and Parameters for function-like decls.
386 void fillFunctionTypeAndParams(HoverInfo
&HI
, const Decl
*D
,
387 const FunctionDecl
*FD
,
388 const PrintingPolicy
&PP
) {
389 HI
.Parameters
.emplace();
390 for (const ParmVarDecl
*PVD
: FD
->parameters())
391 HI
.Parameters
->emplace_back(toHoverInfoParam(PVD
, PP
));
393 // We don't want any type info, if name already contains it. This is true for
394 // constructors/destructors and conversion operators.
395 const auto NK
= FD
->getDeclName().getNameKind();
396 if (NK
== DeclarationName::CXXConstructorName
||
397 NK
== DeclarationName::CXXDestructorName
||
398 NK
== DeclarationName::CXXConversionFunctionName
)
401 HI
.ReturnType
= printType(FD
->getReturnType(), FD
->getASTContext(), PP
);
402 QualType QT
= FD
->getType();
403 if (const VarDecl
*VD
= llvm::dyn_cast
<VarDecl
>(D
)) // Lambdas
404 QT
= VD
->getType().getDesugaredType(D
->getASTContext());
405 HI
.Type
= printType(QT
, D
->getASTContext(), PP
);
406 // FIXME: handle variadics.
409 // Non-negative numbers are printed using min digits
412 // Negative numbers are sign-extended to 32/64 bits
414 // -2^32 => 0xffffffff00000000
415 static llvm::FormattedNumber
printHex(const llvm::APSInt
&V
) {
416 assert(V
.getSignificantBits() <= 64 && "Can't print more than 64 bits.");
418 V
.getBitWidth() > 64 ? V
.trunc(64).getZExtValue() : V
.getZExtValue();
419 if (V
.isNegative() && V
.getSignificantBits() <= 32)
420 return llvm::format_hex(uint32_t(Bits
), 0);
421 return llvm::format_hex(Bits
, 0);
424 std::optional
<std::string
> printExprValue(const Expr
*E
,
425 const ASTContext
&Ctx
) {
426 // InitListExpr has two forms, syntactic and semantic. They are the same thing
427 // (refer to a same AST node) in most cases.
428 // When they are different, RAV returns the syntactic form, and we should feed
429 // the semantic form to EvaluateAsRValue.
430 if (const auto *ILE
= llvm::dyn_cast
<InitListExpr
>(E
)) {
431 if (!ILE
->isSemanticForm())
432 E
= ILE
->getSemanticForm();
435 // Evaluating [[foo]]() as "&foo" isn't useful, and prevents us walking up
436 // to the enclosing call. Evaluating an expression of void type doesn't
437 // produce a meaningful result.
438 QualType T
= E
->getType();
439 if (T
.isNull() || T
->isFunctionType() || T
->isFunctionPointerType() ||
440 T
->isFunctionReferenceType() || T
->isVoidType())
443 Expr::EvalResult Constant
;
444 // Attempt to evaluate. If expr is dependent, evaluation crashes!
445 if (E
->isValueDependent() || !E
->EvaluateAsRValue(Constant
, Ctx
) ||
446 // Disable printing for record-types, as they are usually confusing and
447 // might make clang crash while printing the expressions.
448 Constant
.Val
.isStruct() || Constant
.Val
.isUnion())
451 // Show enums symbolically, not numerically like APValue::printPretty().
452 if (T
->isEnumeralType() && Constant
.Val
.isInt() &&
453 Constant
.Val
.getInt().getSignificantBits() <= 64) {
454 // Compare to int64_t to avoid bit-width match requirements.
455 int64_t Val
= Constant
.Val
.getInt().getExtValue();
456 for (const EnumConstantDecl
*ECD
:
457 T
->castAs
<EnumType
>()->getDecl()->enumerators())
458 if (ECD
->getInitVal() == Val
)
459 return llvm::formatv("{0} ({1})", ECD
->getNameAsString(),
460 printHex(Constant
.Val
.getInt()))
463 // Show hex value of integers if they're at least 10 (or negative!)
464 if (T
->isIntegralOrEnumerationType() && Constant
.Val
.isInt() &&
465 Constant
.Val
.getInt().getSignificantBits() <= 64 &&
466 Constant
.Val
.getInt().uge(10))
467 return llvm::formatv("{0} ({1})", Constant
.Val
.getAsString(Ctx
, T
),
468 printHex(Constant
.Val
.getInt()))
470 return Constant
.Val
.getAsString(Ctx
, T
);
473 struct PrintExprResult
{
474 /// The evaluation result on expression `Expr`.
475 std::optional
<std::string
> PrintedValue
;
476 /// The Expr object that represents the closest evaluable
478 const clang::Expr
*TheExpr
;
479 /// The node of selection tree where the traversal stops.
480 const SelectionTree::Node
*TheNode
;
483 // Seek the closest evaluable expression along the ancestors of node N
484 // in a selection tree. If a node in the path can be converted to an evaluable
485 // Expr, a possible evaluation would happen and the associated context
487 // If evaluation couldn't be done, return the node where the traversal ends.
488 PrintExprResult
printExprValue(const SelectionTree::Node
*N
,
489 const ASTContext
&Ctx
) {
490 for (; N
; N
= N
->Parent
) {
491 // Try to evaluate the first evaluatable enclosing expression.
492 if (const Expr
*E
= N
->ASTNode
.get
<Expr
>()) {
493 // Once we cross an expression of type 'cv void', the evaluated result
494 // has nothing to do with our original cursor position.
495 if (!E
->getType().isNull() && E
->getType()->isVoidType())
497 if (auto Val
= printExprValue(E
, Ctx
))
498 return PrintExprResult
{/*PrintedValue=*/std::move(Val
), /*Expr=*/E
,
500 } else if (N
->ASTNode
.get
<Decl
>() || N
->ASTNode
.get
<Stmt
>()) {
501 // Refuse to cross certain non-exprs. (TypeLoc are OK as part of Exprs).
502 // This tries to ensure we're showing a value related to the cursor.
506 return PrintExprResult
{/*PrintedValue=*/std::nullopt
, /*Expr=*/nullptr,
510 std::optional
<StringRef
> fieldName(const Expr
*E
) {
511 const auto *ME
= llvm::dyn_cast
<MemberExpr
>(E
->IgnoreCasts());
512 if (!ME
|| !llvm::isa
<CXXThisExpr
>(ME
->getBase()->IgnoreCasts()))
514 const auto *Field
= llvm::dyn_cast
<FieldDecl
>(ME
->getMemberDecl());
515 if (!Field
|| !Field
->getDeclName().isIdentifier())
517 return Field
->getDeclName().getAsIdentifierInfo()->getName();
520 // If CMD is of the form T foo() { return FieldName; } then returns "FieldName".
521 std::optional
<StringRef
> getterVariableName(const CXXMethodDecl
*CMD
) {
522 assert(CMD
->hasBody());
523 if (CMD
->getNumParams() != 0 || CMD
->isVariadic())
525 const auto *Body
= llvm::dyn_cast
<CompoundStmt
>(CMD
->getBody());
526 const auto *OnlyReturn
= (Body
&& Body
->size() == 1)
527 ? llvm::dyn_cast
<ReturnStmt
>(Body
->body_front())
529 if (!OnlyReturn
|| !OnlyReturn
->getRetValue())
531 return fieldName(OnlyReturn
->getRetValue());
534 // If CMD is one of the forms:
535 // void foo(T arg) { FieldName = arg; }
536 // R foo(T arg) { FieldName = arg; return *this; }
537 // void foo(T arg) { FieldName = std::move(arg); }
538 // R foo(T arg) { FieldName = std::move(arg); return *this; }
539 // then returns "FieldName"
540 std::optional
<StringRef
> setterVariableName(const CXXMethodDecl
*CMD
) {
541 assert(CMD
->hasBody());
542 if (CMD
->isConst() || CMD
->getNumParams() != 1 || CMD
->isVariadic())
544 const ParmVarDecl
*Arg
= CMD
->getParamDecl(0);
545 if (Arg
->isParameterPack())
548 const auto *Body
= llvm::dyn_cast
<CompoundStmt
>(CMD
->getBody());
549 if (!Body
|| Body
->size() == 0 || Body
->size() > 2)
551 // If the second statement exists, it must be `return this` or `return *this`.
552 if (Body
->size() == 2) {
553 auto *Ret
= llvm::dyn_cast
<ReturnStmt
>(Body
->body_back());
554 if (!Ret
|| !Ret
->getRetValue())
556 const Expr
*RetVal
= Ret
->getRetValue()->IgnoreCasts();
557 if (const auto *UO
= llvm::dyn_cast
<UnaryOperator
>(RetVal
)) {
558 if (UO
->getOpcode() != UO_Deref
)
560 RetVal
= UO
->getSubExpr()->IgnoreCasts();
562 if (!llvm::isa
<CXXThisExpr
>(RetVal
))
565 // The first statement must be an assignment of the arg to a field.
566 const Expr
*LHS
, *RHS
;
567 if (const auto *BO
= llvm::dyn_cast
<BinaryOperator
>(Body
->body_front())) {
568 if (BO
->getOpcode() != BO_Assign
)
572 } else if (const auto *COCE
=
573 llvm::dyn_cast
<CXXOperatorCallExpr
>(Body
->body_front())) {
574 if (COCE
->getOperator() != OO_Equal
|| COCE
->getNumArgs() != 2)
576 LHS
= COCE
->getArg(0);
577 RHS
= COCE
->getArg(1);
582 // Detect the case when the item is moved into the field.
583 if (auto *CE
= llvm::dyn_cast
<CallExpr
>(RHS
->IgnoreCasts())) {
584 if (CE
->getNumArgs() != 1)
586 auto *ND
= llvm::dyn_cast_or_null
<NamedDecl
>(CE
->getCalleeDecl());
587 if (!ND
|| !ND
->getIdentifier() || ND
->getName() != "move" ||
588 !ND
->isInStdNamespace())
593 auto *DRE
= llvm::dyn_cast
<DeclRefExpr
>(RHS
->IgnoreCasts());
594 if (!DRE
|| DRE
->getDecl() != Arg
)
596 return fieldName(LHS
);
599 std::string
synthesizeDocumentation(const NamedDecl
*ND
) {
600 if (const auto *CMD
= llvm::dyn_cast
<CXXMethodDecl
>(ND
)) {
601 // Is this an ordinary, non-static method whose definition is visible?
602 if (CMD
->getDeclName().isIdentifier() && !CMD
->isStatic() &&
603 (CMD
= llvm::dyn_cast_or_null
<CXXMethodDecl
>(CMD
->getDefinition())) &&
605 if (const auto GetterField
= getterVariableName(CMD
))
606 return llvm::formatv("Trivial accessor for `{0}`.", *GetterField
);
607 if (const auto SetterField
= setterVariableName(CMD
))
608 return llvm::formatv("Trivial setter for `{0}`.", *SetterField
);
614 /// Generate a \p Hover object given the declaration \p D.
615 HoverInfo
getHoverContents(const NamedDecl
*D
, const PrintingPolicy
&PP
,
616 const SymbolIndex
*Index
,
617 const syntax::TokenBuffer
&TB
) {
619 auto &Ctx
= D
->getASTContext();
621 HI
.AccessSpecifier
= getAccessSpelling(D
->getAccess()).str();
622 HI
.NamespaceScope
= getNamespaceScope(D
);
623 if (!HI
.NamespaceScope
->empty())
624 HI
.NamespaceScope
->append("::");
625 HI
.LocalScope
= getLocalScope(D
);
626 if (!HI
.LocalScope
.empty())
627 HI
.LocalScope
.append("::");
629 HI
.Name
= printName(Ctx
, *D
);
630 const auto *CommentD
= getDeclForComment(D
);
631 HI
.Documentation
= getDeclComment(Ctx
, *CommentD
);
632 enhanceFromIndex(HI
, *CommentD
, Index
);
633 if (HI
.Documentation
.empty())
634 HI
.Documentation
= synthesizeDocumentation(D
);
636 HI
.Kind
= index::getSymbolInfo(D
).Kind
;
638 // Fill in template params.
639 if (const TemplateDecl
*TD
= D
->getDescribedTemplate()) {
640 HI
.TemplateParameters
=
641 fetchTemplateParameters(TD
->getTemplateParameters(), PP
);
643 } else if (const FunctionDecl
*FD
= D
->getAsFunction()) {
644 if (const auto *FTD
= FD
->getDescribedTemplate()) {
645 HI
.TemplateParameters
=
646 fetchTemplateParameters(FTD
->getTemplateParameters(), PP
);
651 // Fill in types and params.
652 if (const FunctionDecl
*FD
= getUnderlyingFunction(D
))
653 fillFunctionTypeAndParams(HI
, D
, FD
, PP
);
654 else if (const auto *VD
= dyn_cast
<ValueDecl
>(D
))
655 HI
.Type
= printType(VD
->getType(), Ctx
, PP
);
656 else if (const auto *TTP
= dyn_cast
<TemplateTypeParmDecl
>(D
))
657 HI
.Type
= TTP
->wasDeclaredWithTypename() ? "typename" : "class";
658 else if (const auto *TTP
= dyn_cast
<TemplateTemplateParmDecl
>(D
))
659 HI
.Type
= printType(TTP
, PP
);
660 else if (const auto *VT
= dyn_cast
<VarTemplateDecl
>(D
))
661 HI
.Type
= printType(VT
->getTemplatedDecl()->getType(), Ctx
, PP
);
662 else if (const auto *TN
= dyn_cast
<TypedefNameDecl
>(D
))
663 HI
.Type
= printType(TN
->getUnderlyingType().getDesugaredType(Ctx
), Ctx
, PP
);
664 else if (const auto *TAT
= dyn_cast
<TypeAliasTemplateDecl
>(D
))
665 HI
.Type
= printType(TAT
->getTemplatedDecl()->getUnderlyingType(), Ctx
, PP
);
667 // Fill in value with evaluated initializer if possible.
668 if (const auto *Var
= dyn_cast
<VarDecl
>(D
); Var
&& !Var
->isInvalidDecl()) {
669 if (const Expr
*Init
= Var
->getInit())
670 HI
.Value
= printExprValue(Init
, Ctx
);
671 } else if (const auto *ECD
= dyn_cast
<EnumConstantDecl
>(D
)) {
672 // Dependent enums (e.g. nested in template classes) don't have values yet.
673 if (!ECD
->getType()->isDependentType())
674 HI
.Value
= toString(ECD
->getInitVal(), 10);
677 HI
.Definition
= printDefinition(D
, PP
, TB
);
681 /// The standard defines __func__ as a "predefined variable".
682 std::optional
<HoverInfo
>
683 getPredefinedExprHoverContents(const PredefinedExpr
&PE
, ASTContext
&Ctx
,
684 const PrintingPolicy
&PP
) {
686 HI
.Name
= PE
.getIdentKindName();
687 HI
.Kind
= index::SymbolKind::Variable
;
688 HI
.Documentation
= "Name of the current function (predefined variable)";
689 if (const StringLiteral
*Name
= PE
.getFunctionName()) {
691 llvm::raw_string_ostream
OS(*HI
.Value
);
692 Name
->outputString(OS
);
693 HI
.Type
= printType(Name
->getType(), Ctx
, PP
);
695 // Inside templates, the approximate type `const char[]` is still useful.
696 QualType StringType
= Ctx
.getIncompleteArrayType(Ctx
.CharTy
.withConst(),
697 ArraySizeModifier::Normal
,
698 /*IndexTypeQuals=*/0);
699 HI
.Type
= printType(StringType
, Ctx
, PP
);
704 HoverInfo
evaluateMacroExpansion(unsigned int SpellingBeginOffset
,
705 unsigned int SpellingEndOffset
,
706 llvm::ArrayRef
<syntax::Token
> Expanded
,
708 auto &Context
= AST
.getASTContext();
709 auto &Tokens
= AST
.getTokens();
710 auto PP
= getPrintingPolicy(Context
.getPrintingPolicy());
711 auto Tree
= SelectionTree::createRight(Context
, Tokens
, SpellingBeginOffset
,
714 // If macro expands to one single token, rule out punctuator or digraph.
715 // E.g., for the case `array L_BRACKET 42 R_BRACKET;` where L_BRACKET and
716 // R_BRACKET expand to
717 // '[' and ']' respectively, we don't want the type of
718 // 'array[42]' when user hovers on L_BRACKET.
719 if (Expanded
.size() == 1)
720 if (tok::getPunctuatorSpelling(Expanded
[0].kind()))
723 auto *StartNode
= Tree
.commonAncestor();
726 // If the common ancestor is partially selected, do evaluate if it has no
727 // children, thus we can disallow evaluation on incomplete expression.
731 // In this case we don't want to present 'value: 2' as PLUS_2 actually expands
732 // to a non-value rather than a binary operand.
733 if (StartNode
->Selected
== SelectionTree::Selection::Partial
)
734 if (!StartNode
->Children
.empty())
738 // Attempt to evaluate it from Expr first.
739 auto ExprResult
= printExprValue(StartNode
, Context
);
740 HI
.Value
= std::move(ExprResult
.PrintedValue
);
741 if (auto *E
= ExprResult
.TheExpr
)
742 HI
.Type
= printType(E
->getType(), Context
, PP
);
744 // If failed, extract the type from Decl if possible.
745 if (!HI
.Value
&& !HI
.Type
&& ExprResult
.TheNode
)
746 if (auto *VD
= ExprResult
.TheNode
->ASTNode
.get
<VarDecl
>())
747 HI
.Type
= printType(VD
->getType(), Context
, PP
);
752 /// Generate a \p Hover object given the macro \p MacroDecl.
753 HoverInfo
getHoverContents(const DefinedMacro
&Macro
, const syntax::Token
&Tok
,
756 SourceManager
&SM
= AST
.getSourceManager();
757 HI
.Name
= std::string(Macro
.Name
);
758 HI
.Kind
= index::SymbolKind::Macro
;
759 // FIXME: Populate documentation
760 // FIXME: Populate parameters
762 // Try to get the full definition, not just the name
763 SourceLocation StartLoc
= Macro
.Info
->getDefinitionLoc();
764 SourceLocation EndLoc
= Macro
.Info
->getDefinitionEndLoc();
765 // Ensure that EndLoc is a valid offset. For example it might come from
766 // preamble, and source file might've changed, in such a scenario EndLoc still
767 // stays valid, but getLocForEndOfToken will fail as it is no longer a valid
769 // Note that this check is just to ensure there's text data inside the range.
770 // It will still succeed even when the data inside the range is irrelevant to
772 if (SM
.getPresumedLoc(EndLoc
, /*UseLineDirectives=*/false).isValid()) {
773 EndLoc
= Lexer::getLocForEndOfToken(EndLoc
, 0, SM
, AST
.getLangOpts());
775 StringRef Buffer
= SM
.getBufferData(SM
.getFileID(StartLoc
), &Invalid
);
777 unsigned StartOffset
= SM
.getFileOffset(StartLoc
);
778 unsigned EndOffset
= SM
.getFileOffset(EndLoc
);
779 if (EndOffset
<= Buffer
.size() && StartOffset
< EndOffset
)
781 ("#define " + Buffer
.substr(StartOffset
, EndOffset
- StartOffset
))
786 if (auto Expansion
= AST
.getTokens().expansionStartingAt(&Tok
)) {
787 // We drop expansion that's longer than the threshold.
788 // For extremely long expansion text, it's not readable from hover card
790 std::string ExpansionText
;
791 for (const auto &ExpandedTok
: Expansion
->Expanded
) {
792 ExpansionText
+= ExpandedTok
.text(SM
);
793 ExpansionText
+= " ";
794 if (ExpansionText
.size() > 2048) {
795 ExpansionText
.clear();
800 if (!ExpansionText
.empty()) {
801 if (!HI
.Definition
.empty()) {
802 HI
.Definition
+= "\n\n";
804 HI
.Definition
+= "// Expands to\n";
805 HI
.Definition
+= ExpansionText
;
808 auto Evaluated
= evaluateMacroExpansion(
809 /*SpellingBeginOffset=*/SM
.getFileOffset(Tok
.location()),
810 /*SpellingEndOffset=*/SM
.getFileOffset(Tok
.endLocation()),
811 /*Expanded=*/Expansion
->Expanded
, AST
);
812 HI
.Value
= std::move(Evaluated
.Value
);
813 HI
.Type
= std::move(Evaluated
.Type
);
818 std::string
typeAsDefinition(const HoverInfo::PrintedType
&PType
) {
820 llvm::raw_string_ostream
OS(Result
);
823 OS
<< " // aka: " << *PType
.AKA
;
828 std::optional
<HoverInfo
> getThisExprHoverContents(const CXXThisExpr
*CTE
,
830 const PrintingPolicy
&PP
) {
831 QualType OriginThisType
= CTE
->getType()->getPointeeType();
832 QualType ClassType
= declaredType(OriginThisType
->getAsTagDecl());
833 // For partial specialization class, origin `this` pointee type will be
834 // parsed as `InjectedClassNameType`, which will ouput template arguments
835 // like "type-parameter-0-0". So we retrieve user written class type in this
837 QualType PrettyThisType
= ASTCtx
.getPointerType(
838 QualType(ClassType
.getTypePtr(), OriginThisType
.getCVRQualifiers()));
842 HI
.Definition
= typeAsDefinition(printType(PrettyThisType
, ASTCtx
, PP
));
846 /// Generate a HoverInfo object given the deduced type \p QT
847 HoverInfo
getDeducedTypeHoverContents(QualType QT
, const syntax::Token
&Tok
,
849 const PrintingPolicy
&PP
,
850 const SymbolIndex
*Index
) {
852 // FIXME: distinguish decltype(auto) vs decltype(expr)
853 HI
.Name
= tok::getTokenName(Tok
.kind());
854 HI
.Kind
= index::SymbolKind::TypeAlias
;
856 if (QT
->isUndeducedAutoType()) {
857 HI
.Definition
= "/* not deduced */";
859 HI
.Definition
= typeAsDefinition(printType(QT
, ASTCtx
, PP
));
861 if (const auto *D
= QT
->getAsTagDecl()) {
862 const auto *CommentD
= getDeclForComment(D
);
863 HI
.Documentation
= getDeclComment(ASTCtx
, *CommentD
);
864 enhanceFromIndex(HI
, *CommentD
, Index
);
871 HoverInfo
getStringLiteralContents(const StringLiteral
*SL
,
872 const PrintingPolicy
&PP
) {
875 HI
.Name
= "string-literal";
876 HI
.Size
= (SL
->getLength() + 1) * SL
->getCharByteWidth() * 8;
877 HI
.Type
= SL
->getType().getAsString(PP
).c_str();
882 bool isLiteral(const Expr
*E
) {
883 // Unfortunately there's no common base Literal classes inherits from
884 // (apart from Expr), therefore these exclusions.
885 return llvm::isa
<CompoundLiteralExpr
>(E
) ||
886 llvm::isa
<CXXBoolLiteralExpr
>(E
) ||
887 llvm::isa
<CXXNullPtrLiteralExpr
>(E
) ||
888 llvm::isa
<FixedPointLiteral
>(E
) || llvm::isa
<FloatingLiteral
>(E
) ||
889 llvm::isa
<ImaginaryLiteral
>(E
) || llvm::isa
<IntegerLiteral
>(E
) ||
890 llvm::isa
<StringLiteral
>(E
) || llvm::isa
<UserDefinedLiteral
>(E
);
893 llvm::StringLiteral
getNameForExpr(const Expr
*E
) {
894 // FIXME: Come up with names for `special` expressions.
896 // It's an known issue for GCC5, https://godbolt.org/z/Z_tbgi. Work around
897 // that by using explicit conversion constructor.
899 // TODO: Once GCC5 is fully retired and not the minimal requirement as stated
900 // in `GettingStarted`, please remove the explicit conversion constructor.
901 return llvm::StringLiteral("expression");
904 void maybeAddCalleeArgInfo(const SelectionTree::Node
*N
, HoverInfo
&HI
,
905 const PrintingPolicy
&PP
);
907 // Generates hover info for `this` and evaluatable expressions.
908 // FIXME: Support hover for literals (esp user-defined)
909 std::optional
<HoverInfo
> getHoverContents(const SelectionTree::Node
*N
,
910 const Expr
*E
, ParsedAST
&AST
,
911 const PrintingPolicy
&PP
,
912 const SymbolIndex
*Index
) {
913 std::optional
<HoverInfo
> HI
;
915 if (const StringLiteral
*SL
= dyn_cast
<StringLiteral
>(E
)) {
916 // Print the type and the size for string literals
917 HI
= getStringLiteralContents(SL
, PP
);
918 } else if (isLiteral(E
)) {
919 // There's not much value in hovering over "42" and getting a hover card
920 // saying "42 is an int", similar for most other literals.
921 // However, if we have CalleeArgInfo, it's still useful to show it.
922 maybeAddCalleeArgInfo(N
, HI
.emplace(), PP
);
923 if (HI
->CalleeArgInfo
) {
924 // FIXME Might want to show the expression's value here instead?
925 // E.g. if the literal is in hex it might be useful to show the decimal
927 HI
->Name
= "literal";
933 // For `this` expr we currently generate hover with pointee type.
934 if (const CXXThisExpr
*CTE
= dyn_cast
<CXXThisExpr
>(E
))
935 HI
= getThisExprHoverContents(CTE
, AST
.getASTContext(), PP
);
936 if (const PredefinedExpr
*PE
= dyn_cast
<PredefinedExpr
>(E
))
937 HI
= getPredefinedExprHoverContents(*PE
, AST
.getASTContext(), PP
);
938 // For expressions we currently print the type and the value, iff it is
940 if (auto Val
= printExprValue(E
, AST
.getASTContext())) {
942 HI
->Type
= printType(E
->getType(), AST
.getASTContext(), PP
);
944 HI
->Name
= std::string(getNameForExpr(E
));
948 maybeAddCalleeArgInfo(N
, *HI
, PP
);
953 // Generates hover info for attributes.
954 std::optional
<HoverInfo
> getHoverContents(const Attr
*A
, ParsedAST
&AST
) {
956 HI
.Name
= A
->getSpelling();
958 HI
.LocalScope
= A
->getScopeName()->getName().str();
960 llvm::raw_string_ostream
OS(HI
.Definition
);
961 A
->printPretty(OS
, AST
.getASTContext().getPrintingPolicy());
963 HI
.Documentation
= Attr::getDocumentation(A
->getKind()).str();
967 bool isParagraphBreak(llvm::StringRef Rest
) {
968 return Rest
.ltrim(" \t").starts_with("\n");
971 bool punctuationIndicatesLineBreak(llvm::StringRef Line
) {
972 constexpr llvm::StringLiteral Punctuation
= R
"txt(.:,;!?)txt";
975 return !Line
.empty() && Punctuation
.contains(Line
.back());
978 bool isHardLineBreakIndicator(llvm::StringRef Rest
) {
979 // '-'/'*' md list, '@'/'\' documentation command, '>' md blockquote,
980 // '#' headings, '`' code blocks
981 constexpr llvm::StringLiteral LinebreakIndicators
= R
"txt(-*@\>#`)txt";
983 Rest
= Rest
.ltrim(" \t");
987 if (LinebreakIndicators
.contains(Rest
.front()))
990 if (llvm::isDigit(Rest
.front())) {
991 llvm::StringRef AfterDigit
= Rest
.drop_while(llvm::isDigit
);
992 if (AfterDigit
.starts_with(".") || AfterDigit
.starts_with(")"))
998 bool isHardLineBreakAfter(llvm::StringRef Line
, llvm::StringRef Rest
) {
999 // Should we also consider whether Line is short?
1000 return punctuationIndicatesLineBreak(Line
) || isHardLineBreakIndicator(Rest
);
1003 void addLayoutInfo(const NamedDecl
&ND
, HoverInfo
&HI
) {
1004 if (ND
.isInvalidDecl())
1007 const auto &Ctx
= ND
.getASTContext();
1008 if (auto *RD
= llvm::dyn_cast
<RecordDecl
>(&ND
)) {
1009 if (auto Size
= Ctx
.getTypeSizeInCharsIfKnown(RD
->getTypeForDecl()))
1010 HI
.Size
= Size
->getQuantity() * 8;
1011 if (!RD
->isDependentType() && RD
->isCompleteDefinition())
1012 HI
.Align
= Ctx
.getTypeAlign(RD
->getTypeForDecl());
1016 if (const auto *FD
= llvm::dyn_cast
<FieldDecl
>(&ND
)) {
1017 const auto *Record
= FD
->getParent();
1019 Record
= Record
->getDefinition();
1020 if (Record
&& !Record
->isInvalidDecl() && !Record
->isDependentType()) {
1021 HI
.Align
= Ctx
.getTypeAlign(FD
->getType());
1022 const ASTRecordLayout
&Layout
= Ctx
.getASTRecordLayout(Record
);
1023 HI
.Offset
= Layout
.getFieldOffset(FD
->getFieldIndex());
1024 if (FD
->isBitField())
1025 HI
.Size
= FD
->getBitWidthValue(Ctx
);
1026 else if (auto Size
= Ctx
.getTypeSizeInCharsIfKnown(FD
->getType()))
1027 HI
.Size
= FD
->isZeroSize(Ctx
) ? 0 : Size
->getQuantity() * 8;
1029 unsigned EndOfField
= *HI
.Offset
+ *HI
.Size
;
1031 // Calculate padding following the field.
1032 if (!Record
->isUnion() &&
1033 FD
->getFieldIndex() + 1 < Layout
.getFieldCount()) {
1034 // Measure padding up to the next class field.
1035 unsigned NextOffset
= Layout
.getFieldOffset(FD
->getFieldIndex() + 1);
1036 if (NextOffset
>= EndOfField
) // next field could be a bitfield!
1037 HI
.Padding
= NextOffset
- EndOfField
;
1039 // Measure padding up to the end of the object.
1040 HI
.Padding
= Layout
.getSize().getQuantity() * 8 - EndOfField
;
1043 // Offset in a union is always zero, so not really useful to report.
1044 if (Record
->isUnion())
1051 HoverInfo::PassType::PassMode
getPassMode(QualType ParmType
) {
1052 if (ParmType
->isReferenceType()) {
1053 if (ParmType
->getPointeeType().isConstQualified())
1054 return HoverInfo::PassType::ConstRef
;
1055 return HoverInfo::PassType::Ref
;
1057 return HoverInfo::PassType::Value
;
1060 // If N is passed as argument to a function, fill HI.CalleeArgInfo with
1061 // information about that argument.
1062 void maybeAddCalleeArgInfo(const SelectionTree::Node
*N
, HoverInfo
&HI
,
1063 const PrintingPolicy
&PP
) {
1064 const auto &OuterNode
= N
->outerImplicit();
1065 if (!OuterNode
.Parent
)
1068 const FunctionDecl
*FD
= nullptr;
1069 llvm::ArrayRef
<const Expr
*> Args
;
1071 if (const auto *CE
= OuterNode
.Parent
->ASTNode
.get
<CallExpr
>()) {
1072 FD
= CE
->getDirectCallee();
1073 Args
= {CE
->getArgs(), CE
->getNumArgs()};
1074 } else if (const auto *CE
=
1075 OuterNode
.Parent
->ASTNode
.get
<CXXConstructExpr
>()) {
1076 FD
= CE
->getConstructor();
1077 Args
= {CE
->getArgs(), CE
->getNumArgs()};
1082 // For non-function-call-like operators (e.g. operator+, operator<<) it's
1083 // not immediately obvious what the "passed as" would refer to and, given
1084 // fixed function signature, the value would be very low anyway, so we choose
1085 // to not support that.
1086 // Both variadic functions and operator() (especially relevant for lambdas)
1087 // should be supported in the future.
1088 if (!FD
|| FD
->isOverloadedOperator() || FD
->isVariadic())
1091 HoverInfo::PassType PassType
;
1093 auto Parameters
= resolveForwardingParameters(FD
);
1095 // Find argument index for N.
1096 for (unsigned I
= 0; I
< Args
.size() && I
< Parameters
.size(); ++I
) {
1097 if (Args
[I
] != OuterNode
.ASTNode
.get
<Expr
>())
1100 // Extract matching argument from function declaration.
1101 if (const ParmVarDecl
*PVD
= Parameters
[I
]) {
1102 HI
.CalleeArgInfo
.emplace(toHoverInfoParam(PVD
, PP
));
1103 if (N
== &OuterNode
)
1104 PassType
.PassBy
= getPassMode(PVD
->getType());
1108 if (!HI
.CalleeArgInfo
)
1111 // If we found a matching argument, also figure out if it's a
1112 // [const-]reference. For this we need to walk up the AST from the arg itself
1113 // to CallExpr and check all implicit casts, constructor calls, etc.
1114 if (const auto *E
= N
->ASTNode
.get
<Expr
>()) {
1115 if (E
->getType().isConstQualified())
1116 PassType
.PassBy
= HoverInfo::PassType::ConstRef
;
1119 for (auto *CastNode
= N
->Parent
;
1120 CastNode
!= OuterNode
.Parent
&& !PassType
.Converted
;
1121 CastNode
= CastNode
->Parent
) {
1122 if (const auto *ImplicitCast
= CastNode
->ASTNode
.get
<ImplicitCastExpr
>()) {
1123 switch (ImplicitCast
->getCastKind()) {
1125 case CK_DerivedToBase
:
1126 case CK_UncheckedDerivedToBase
:
1127 // If it was a reference before, it's still a reference.
1128 if (PassType
.PassBy
!= HoverInfo::PassType::Value
)
1129 PassType
.PassBy
= ImplicitCast
->getType().isConstQualified()
1130 ? HoverInfo::PassType::ConstRef
1131 : HoverInfo::PassType::Ref
;
1133 case CK_LValueToRValue
:
1134 case CK_ArrayToPointerDecay
:
1135 case CK_FunctionToPointerDecay
:
1136 case CK_NullToPointer
:
1137 case CK_NullToMemberPointer
:
1138 // No longer a reference, but we do not show this as type conversion.
1139 PassType
.PassBy
= HoverInfo::PassType::Value
;
1142 PassType
.PassBy
= HoverInfo::PassType::Value
;
1143 PassType
.Converted
= true;
1146 } else if (const auto *CtorCall
=
1147 CastNode
->ASTNode
.get
<CXXConstructExpr
>()) {
1148 // We want to be smart about copy constructors. They should not show up as
1149 // type conversion, but instead as passing by value.
1150 if (CtorCall
->getConstructor()->isCopyConstructor())
1151 PassType
.PassBy
= HoverInfo::PassType::Value
;
1153 PassType
.Converted
= true;
1154 } else if (CastNode
->ASTNode
.get
<MaterializeTemporaryExpr
>()) {
1155 // Can't bind a non-const-ref to a temporary, so has to be const-ref
1156 PassType
.PassBy
= HoverInfo::PassType::ConstRef
;
1157 } else { // Unknown implicit node, assume type conversion.
1158 PassType
.PassBy
= HoverInfo::PassType::Value
;
1159 PassType
.Converted
= true;
1163 HI
.CallPassType
.emplace(PassType
);
1166 const NamedDecl
*pickDeclToUse(llvm::ArrayRef
<const NamedDecl
*> Candidates
) {
1167 if (Candidates
.empty())
1170 // This is e.g the case for
1171 // namespace ns { void foo(); }
1172 // void bar() { using ns::foo; f^oo(); }
1173 // One declaration in Candidates will refer to the using declaration,
1174 // which isn't really useful for Hover. So use the other one,
1175 // which in this example would be the actual declaration of foo.
1176 if (Candidates
.size() <= 2) {
1177 if (llvm::isa
<UsingDecl
>(Candidates
.front()))
1178 return Candidates
.back();
1179 return Candidates
.front();
1182 // For something like
1183 // namespace ns { void foo(int); void foo(char); }
1185 // template <typename T> void bar() { fo^o(T{}); }
1186 // we actually want to show the using declaration,
1187 // it's not clear which declaration to pick otherwise.
1188 auto BaseDecls
= llvm::make_filter_range(
1189 Candidates
, [](const NamedDecl
*D
) { return llvm::isa
<UsingDecl
>(D
); });
1190 if (std::distance(BaseDecls
.begin(), BaseDecls
.end()) == 1)
1191 return *BaseDecls
.begin();
1193 return Candidates
.front();
1196 void maybeAddSymbolProviders(ParsedAST
&AST
, HoverInfo
&HI
,
1197 include_cleaner::Symbol Sym
) {
1198 trace::Span
Tracer("Hover::maybeAddSymbolProviders");
1200 const SourceManager
&SM
= AST
.getSourceManager();
1201 llvm::SmallVector
<include_cleaner::Header
> RankedProviders
=
1202 include_cleaner::headersForSymbol(Sym
, SM
, &AST
.getPragmaIncludes());
1203 if (RankedProviders
.empty())
1207 include_cleaner::Includes ConvertedIncludes
= convertIncludes(AST
);
1208 for (const auto &P
: RankedProviders
) {
1209 if (P
.kind() == include_cleaner::Header::Physical
&&
1210 P
.physical() == SM
.getFileEntryForID(SM
.getMainFileID()))
1211 // Main file ranked higher than any #include'd file
1214 // Pick the best-ranked #include'd provider
1215 auto Matches
= ConvertedIncludes
.match(P
);
1216 if (!Matches
.empty()) {
1217 Result
= Matches
[0]->quote();
1222 if (!Result
.empty()) {
1223 HI
.Provider
= std::move(Result
);
1227 // Pick the best-ranked non-#include'd provider
1228 const auto &H
= RankedProviders
.front();
1229 if (H
.kind() == include_cleaner::Header::Physical
&&
1230 H
.physical() == SM
.getFileEntryForID(SM
.getMainFileID()))
1231 // Do not show main file as provider, otherwise we'll show provider info
1232 // on local variables, etc.
1235 HI
.Provider
= include_cleaner::spellHeader(
1236 {H
, AST
.getPreprocessor().getHeaderSearchInfo(),
1237 SM
.getFileEntryForID(SM
.getMainFileID())});
1240 // FIXME: similar functions are present in FindHeaders.cpp (symbolName)
1241 // and IncludeCleaner.cpp (getSymbolName). Introduce a name() method into
1242 // include_cleaner::Symbol instead.
1243 std::string
getSymbolName(include_cleaner::Symbol Sym
) {
1245 switch (Sym
.kind()) {
1246 case include_cleaner::Symbol::Declaration
:
1247 if (const auto *ND
= llvm::dyn_cast
<NamedDecl
>(&Sym
.declaration()))
1248 Name
= ND
->getDeclName().getAsString();
1250 case include_cleaner::Symbol::Macro
:
1251 Name
= Sym
.macro().Name
->getName();
1257 void maybeAddUsedSymbols(ParsedAST
&AST
, HoverInfo
&HI
, const Inclusion
&Inc
) {
1258 auto Converted
= convertIncludes(AST
);
1259 llvm::DenseSet
<include_cleaner::Symbol
> UsedSymbols
;
1260 include_cleaner::walkUsed(
1261 AST
.getLocalTopLevelDecls(), collectMacroReferences(AST
),
1262 &AST
.getPragmaIncludes(), AST
.getPreprocessor(),
1263 [&](const include_cleaner::SymbolReference
&Ref
,
1264 llvm::ArrayRef
<include_cleaner::Header
> Providers
) {
1265 if (Ref
.RT
!= include_cleaner::RefType::Explicit
||
1266 UsedSymbols
.contains(Ref
.Target
))
1269 if (isPreferredProvider(Inc
, Converted
, Providers
))
1270 UsedSymbols
.insert(Ref
.Target
);
1273 for (const auto &UsedSymbolDecl
: UsedSymbols
)
1274 HI
.UsedSymbolNames
.push_back(getSymbolName(UsedSymbolDecl
));
1275 llvm::sort(HI
.UsedSymbolNames
);
1276 HI
.UsedSymbolNames
.erase(
1277 std::unique(HI
.UsedSymbolNames
.begin(), HI
.UsedSymbolNames
.end()),
1278 HI
.UsedSymbolNames
.end());
1283 std::optional
<HoverInfo
> getHover(ParsedAST
&AST
, Position Pos
,
1284 const format::FormatStyle
&Style
,
1285 const SymbolIndex
*Index
) {
1286 static constexpr trace::Metric
HoverCountMetric(
1287 "hover", trace::Metric::Counter
, "case");
1289 getPrintingPolicy(AST
.getASTContext().getPrintingPolicy());
1290 const SourceManager
&SM
= AST
.getSourceManager();
1291 auto CurLoc
= sourceLocationInMainFile(SM
, Pos
);
1293 llvm::consumeError(CurLoc
.takeError());
1294 return std::nullopt
;
1296 const auto &TB
= AST
.getTokens();
1297 auto TokensTouchingCursor
= syntax::spelledTokensTouching(*CurLoc
, TB
);
1298 // Early exit if there were no tokens around the cursor.
1299 if (TokensTouchingCursor
.empty())
1300 return std::nullopt
;
1302 // Show full header file path if cursor is on include directive.
1303 for (const auto &Inc
: AST
.getIncludeStructure().MainFileIncludes
) {
1304 if (Inc
.Resolved
.empty() || Inc
.HashLine
!= Pos
.line
)
1306 HoverCountMetric
.record(1, "include");
1308 HI
.Name
= std::string(llvm::sys::path::filename(Inc
.Resolved
));
1309 // FIXME: We don't have a fitting value for Kind.
1311 URIForFile::canonicalize(Inc
.Resolved
, AST
.tuPath()).file().str();
1312 HI
.DefinitionLanguage
= "";
1313 maybeAddUsedSymbols(AST
, HI
, Inc
);
1317 // To be used as a backup for highlighting the selected token, we use back as
1318 // it aligns better with biases elsewhere (editors tend to send the position
1319 // for the left of the hovered token).
1320 CharSourceRange HighlightRange
=
1321 TokensTouchingCursor
.back().range(SM
).toCharRange(SM
);
1322 std::optional
<HoverInfo
> HI
;
1323 // Macros and deducedtype only works on identifiers and auto/decltype keywords
1324 // respectively. Therefore they are only trggered on whichever works for them,
1325 // similar to SelectionTree::create().
1326 for (const auto &Tok
: TokensTouchingCursor
) {
1327 if (Tok
.kind() == tok::identifier
) {
1328 // Prefer the identifier token as a fallback highlighting range.
1329 HighlightRange
= Tok
.range(SM
).toCharRange(SM
);
1330 if (auto M
= locateMacroAt(Tok
, AST
.getPreprocessor())) {
1331 HoverCountMetric
.record(1, "macro");
1332 HI
= getHoverContents(*M
, Tok
, AST
);
1333 if (auto DefLoc
= M
->Info
->getDefinitionLoc(); DefLoc
.isValid()) {
1334 include_cleaner::Macro IncludeCleanerMacro
{
1335 AST
.getPreprocessor().getIdentifierInfo(Tok
.text(SM
)), DefLoc
};
1336 maybeAddSymbolProviders(AST
, *HI
,
1337 include_cleaner::Symbol
{IncludeCleanerMacro
});
1341 } else if (Tok
.kind() == tok::kw_auto
|| Tok
.kind() == tok::kw_decltype
) {
1342 HoverCountMetric
.record(1, "keyword");
1343 if (auto Deduced
= getDeducedType(AST
.getASTContext(), Tok
.location())) {
1344 HI
= getDeducedTypeHoverContents(*Deduced
, Tok
, AST
.getASTContext(), PP
,
1346 HighlightRange
= Tok
.range(SM
).toCharRange(SM
);
1350 // If we can't find interesting hover information for this
1351 // auto/decltype keyword, return nothing to avoid showing
1352 // irrelevant or incorrect informations.
1353 return std::nullopt
;
1357 // If it wasn't auto/decltype or macro, look for decls and expressions.
1359 auto Offset
= SM
.getFileOffset(*CurLoc
);
1360 // Editors send the position on the left of the hovered character.
1361 // So our selection tree should be biased right. (Tested with VSCode).
1363 SelectionTree::createRight(AST
.getASTContext(), TB
, Offset
, Offset
);
1364 if (const SelectionTree::Node
*N
= ST
.commonAncestor()) {
1365 // FIXME: Fill in HighlightRange with range coming from N->ASTNode.
1366 auto Decls
= explicitReferenceTargets(N
->ASTNode
, DeclRelation::Alias
,
1367 AST
.getHeuristicResolver());
1368 if (const auto *DeclToUse
= pickDeclToUse(Decls
)) {
1369 HoverCountMetric
.record(1, "decl");
1370 HI
= getHoverContents(DeclToUse
, PP
, Index
, TB
);
1371 // Layout info only shown when hovering on the field/class itself.
1372 if (DeclToUse
== N
->ASTNode
.get
<Decl
>())
1373 addLayoutInfo(*DeclToUse
, *HI
);
1374 // Look for a close enclosing expression to show the value of.
1376 HI
->Value
= printExprValue(N
, AST
.getASTContext()).PrintedValue
;
1377 maybeAddCalleeArgInfo(N
, *HI
, PP
);
1379 if (!isa
<NamespaceDecl
>(DeclToUse
))
1380 maybeAddSymbolProviders(AST
, *HI
,
1381 include_cleaner::Symbol
{*DeclToUse
});
1382 } else if (const Expr
*E
= N
->ASTNode
.get
<Expr
>()) {
1383 HoverCountMetric
.record(1, "expr");
1384 HI
= getHoverContents(N
, E
, AST
, PP
, Index
);
1385 } else if (const Attr
*A
= N
->ASTNode
.get
<Attr
>()) {
1386 HoverCountMetric
.record(1, "attribute");
1387 HI
= getHoverContents(A
, AST
);
1389 // FIXME: support hovers for other nodes?
1395 return std::nullopt
;
1397 // Reformat Definition
1398 if (!HI
->Definition
.empty()) {
1399 auto Replacements
= format::reformat(
1400 Style
, HI
->Definition
, tooling::Range(0, HI
->Definition
.size()));
1401 if (auto Formatted
=
1402 tooling::applyAllReplacements(HI
->Definition
, Replacements
))
1403 HI
->Definition
= *Formatted
;
1406 HI
->DefinitionLanguage
= getMarkdownLanguage(AST
.getASTContext());
1407 HI
->SymRange
= halfOpenToRange(SM
, HighlightRange
);
1412 // Sizes (and padding) are shown in bytes if possible, otherwise in bits.
1413 static std::string
formatSize(uint64_t SizeInBits
) {
1414 uint64_t Value
= SizeInBits
% 8 == 0 ? SizeInBits
/ 8 : SizeInBits
;
1415 const char *Unit
= Value
!= 0 && Value
== SizeInBits
? "bit" : "byte";
1416 return llvm::formatv("{0} {1}{2}", Value
, Unit
, Value
== 1 ? "" : "s").str();
1419 // Offsets are shown in bytes + bits, so offsets of different fields
1420 // can always be easily compared.
1421 static std::string
formatOffset(uint64_t OffsetInBits
) {
1422 const auto Bytes
= OffsetInBits
/ 8;
1423 const auto Bits
= OffsetInBits
% 8;
1424 auto Offset
= formatSize(Bytes
* 8);
1426 Offset
+= " and " + formatSize(Bits
);
1430 markup::Document
HoverInfo::present() const {
1431 markup::Document Output
;
1433 // Header contains a text of the form:
1442 // Note that we are making use of a level-3 heading because VSCode renders
1443 // level 1 and 2 headers in a huge font, see
1444 // https://github.com/microsoft/vscode/issues/88417 for details.
1445 markup::Paragraph
&Header
= Output
.addHeading(3);
1446 if (Kind
!= index::SymbolKind::Unknown
)
1447 Header
.appendText(index::getSymbolKindString(Kind
)).appendSpace();
1448 assert(!Name
.empty() && "hover triggered on a nameless symbol");
1449 Header
.appendCode(Name
);
1451 if (!Provider
.empty()) {
1452 markup::Paragraph
&DI
= Output
.addParagraph();
1453 DI
.appendText("provided by");
1455 DI
.appendCode(Provider
);
1459 // Put a linebreak after header to increase readability.
1461 // Print Types on their own lines to reduce chances of getting line-wrapped by
1462 // editor, as they might be long.
1464 // For functions we display signature in a list form, e.g.:
1468 // - `int param2 = 5`
1469 Output
.addParagraph().appendText("→ ").appendCode(
1470 llvm::to_string(*ReturnType
));
1473 if (Parameters
&& !Parameters
->empty()) {
1474 Output
.addParagraph().appendText("Parameters: ");
1475 markup::BulletList
&L
= Output
.addBulletList();
1476 for (const auto &Param
: *Parameters
)
1477 L
.addItem().addParagraph().appendCode(llvm::to_string(Param
));
1480 // Don't print Type after Parameters or ReturnType as this will just duplicate
1482 if (Type
&& !ReturnType
&& !Parameters
)
1483 Output
.addParagraph().appendText("Type: ").appendCode(
1484 llvm::to_string(*Type
));
1487 markup::Paragraph
&P
= Output
.addParagraph();
1488 P
.appendText("Value = ");
1489 P
.appendCode(*Value
);
1493 Output
.addParagraph().appendText("Offset: " + formatOffset(*Offset
));
1495 auto &P
= Output
.addParagraph().appendText("Size: " + formatSize(*Size
));
1496 if (Padding
&& *Padding
!= 0) {
1498 llvm::formatv(" (+{0} padding)", formatSize(*Padding
)).str());
1501 P
.appendText(", alignment " + formatSize(*Align
));
1504 if (CalleeArgInfo
) {
1505 assert(CallPassType
);
1507 llvm::raw_string_ostream
OS(Buffer
);
1509 if (CallPassType
->PassBy
!= HoverInfo::PassType::Value
) {
1511 if (CallPassType
->PassBy
== HoverInfo::PassType::ConstRef
)
1515 if (CalleeArgInfo
->Name
)
1516 OS
<< "as " << CalleeArgInfo
->Name
;
1517 else if (CallPassType
->PassBy
== HoverInfo::PassType::Value
)
1519 if (CallPassType
->Converted
&& CalleeArgInfo
->Type
)
1520 OS
<< " (converted to " << CalleeArgInfo
->Type
->Type
<< ")";
1521 Output
.addParagraph().appendText(OS
.str());
1524 if (!Documentation
.empty())
1525 parseDocumentation(Documentation
, Output
);
1527 if (!Definition
.empty()) {
1531 if (!Definition
.empty()) {
1532 // Append scope comment, dropping trailing "::".
1533 // Note that we don't print anything for global namespace, to not annoy
1534 // non-c++ projects or projects that are not making use of namespaces.
1535 if (!LocalScope
.empty()) {
1536 // Container name, e.g. class, method, function.
1537 // We might want to propagate some info about container type to print
1538 // function foo, class X, method X::bar, etc.
1540 "// In " + llvm::StringRef(LocalScope
).rtrim(':').str() + '\n';
1541 } else if (NamespaceScope
&& !NamespaceScope
->empty()) {
1542 Buffer
+= "// In namespace " +
1543 llvm::StringRef(*NamespaceScope
).rtrim(':').str() + '\n';
1546 if (!AccessSpecifier
.empty()) {
1547 Buffer
+= AccessSpecifier
+ ": ";
1550 Buffer
+= Definition
;
1553 Output
.addCodeBlock(Buffer
, DefinitionLanguage
);
1556 if (!UsedSymbolNames
.empty()) {
1558 markup::Paragraph
&P
= Output
.addParagraph();
1559 P
.appendText("provides ");
1561 const std::vector
<std::string
>::size_type SymbolNamesLimit
= 5;
1562 auto Front
= llvm::ArrayRef(UsedSymbolNames
).take_front(SymbolNamesLimit
);
1565 Front
, [&](llvm::StringRef Sym
) { P
.appendCode(Sym
); },
1566 [&] { P
.appendText(", "); });
1567 if (UsedSymbolNames
.size() > Front
.size()) {
1568 P
.appendText(" and ");
1569 P
.appendText(std::to_string(UsedSymbolNames
.size() - Front
.size()));
1570 P
.appendText(" more");
1577 // If the backtick at `Offset` starts a probable quoted range, return the range
1578 // (including the quotes).
1579 std::optional
<llvm::StringRef
> getBacktickQuoteRange(llvm::StringRef Line
,
1581 assert(Line
[Offset
] == '`');
1583 // The open-quote is usually preceded by whitespace.
1584 llvm::StringRef Prefix
= Line
.substr(0, Offset
);
1585 constexpr llvm::StringLiteral BeforeStartChars
= " \t(=";
1586 if (!Prefix
.empty() && !BeforeStartChars
.contains(Prefix
.back()))
1587 return std::nullopt
;
1589 // The quoted string must be nonempty and usually has no leading/trailing ws.
1590 auto Next
= Line
.find('`', Offset
+ 1);
1591 if (Next
== llvm::StringRef::npos
)
1592 return std::nullopt
;
1593 llvm::StringRef Contents
= Line
.slice(Offset
+ 1, Next
);
1594 if (Contents
.empty() || isWhitespace(Contents
.front()) ||
1595 isWhitespace(Contents
.back()))
1596 return std::nullopt
;
1598 // The close-quote is usually followed by whitespace or punctuation.
1599 llvm::StringRef Suffix
= Line
.substr(Next
+ 1);
1600 constexpr llvm::StringLiteral AfterEndChars
= " \t)=.,;:";
1601 if (!Suffix
.empty() && !AfterEndChars
.contains(Suffix
.front()))
1602 return std::nullopt
;
1604 return Line
.slice(Offset
, Next
+ 1);
1607 void parseDocumentationLine(llvm::StringRef Line
, markup::Paragraph
&Out
) {
1608 // Probably this is appendText(Line), but scan for something interesting.
1609 for (unsigned I
= 0; I
< Line
.size(); ++I
) {
1612 if (auto Range
= getBacktickQuoteRange(Line
, I
)) {
1613 Out
.appendText(Line
.substr(0, I
));
1614 Out
.appendCode(Range
->trim("`"), /*Preserve=*/true);
1615 return parseDocumentationLine(Line
.substr(I
+ Range
->size()), Out
);
1620 Out
.appendText(Line
).appendSpace();
1623 void parseDocumentation(llvm::StringRef Input
, markup::Document
&Output
) {
1624 std::vector
<llvm::StringRef
> ParagraphLines
;
1625 auto FlushParagraph
= [&] {
1626 if (ParagraphLines
.empty())
1628 auto &P
= Output
.addParagraph();
1629 for (llvm::StringRef Line
: ParagraphLines
)
1630 parseDocumentationLine(Line
, P
);
1631 ParagraphLines
.clear();
1634 llvm::StringRef Line
, Rest
;
1635 for (std::tie(Line
, Rest
) = Input
.split('\n');
1636 !(Line
.empty() && Rest
.empty());
1637 std::tie(Line
, Rest
) = Rest
.split('\n')) {
1639 // After a linebreak remove spaces to avoid 4 space markdown code blocks.
1640 // FIXME: make FlushParagraph handle this.
1641 Line
= Line
.ltrim();
1643 ParagraphLines
.push_back(Line
);
1645 if (isParagraphBreak(Rest
) || isHardLineBreakAfter(Line
, Rest
)) {
1652 llvm::raw_ostream
&operator<<(llvm::raw_ostream
&OS
,
1653 const HoverInfo::PrintedType
&T
) {
1656 OS
<< " (aka " << *T
.AKA
<< ")";
1660 llvm::raw_ostream
&operator<<(llvm::raw_ostream
&OS
,
1661 const HoverInfo::Param
&P
) {
1665 OS
<< " " << *P
.Name
;
1667 OS
<< " = " << *P
.Default
;
1668 if (P
.Type
&& P
.Type
->AKA
)
1669 OS
<< " (aka " << *P
.Type
->AKA
<< ")";
1673 } // namespace clangd
1674 } // namespace clang