15#include "llvm/ADT/MapVector.h"
16#include "llvm/ADT/SmallString.h"
17#include "llvm/ADT/StringMap.h"
18#include "llvm/ADT/TypeSwitch.h"
19#include "llvm/Support/Mutex.h"
20#include "llvm/Support/PrettyStackTrace.h"
21#include "llvm/Support/Regex.h"
22#include "llvm/Support/Signals.h"
23#include "llvm/Support/SourceMgr.h"
24#include "llvm/Support/raw_ostream.h"
37 opaqueVal(reinterpret_cast<intptr_t>(attr.getAsOpaquePointer())) {}
42 opaqueVal(reinterpret_cast<intptr_t>(val.getAsOpaquePointer())) {}
48 reinterpret_cast<const void *
>(
opaqueVal));
88 std::vector<std::unique_ptr<
char[]>> &strings) {
91 auto strRef = val.toStringRef(data);
95 strings.push_back(std::unique_ptr<
char[]>(
new char[strRef.size()]));
96 memcpy(&strings.back()[0], strRef.data(), strRef.size());
98 return StringRef(&strings.back()[0], strRef.size());
147 llvm::raw_string_ostream os(
str);
151 if (
str.find(
'\n') != std::string::npos)
159 llvm::raw_string_ostream os(
str);
173 llvm::raw_string_ostream os(
str);
184 "cannot attach a note to a note");
193 return *notes.back();
197Diagnostic::operator LogicalResult()
const {
return failure(); }
205InFlightDiagnostic::operator LogicalResult()
const {
206 return failure(isActive());
214 owner->emit(std::move(*
impl));
252 llvm::sys::SmartScopedLock<true> lock(
mutex);
257 for (
auto &handlerIt : llvm::reverse(
handlers))
258 if (succeeded(handlerIt.second(
diag)))
265 auto &os = llvm::errs();
266 if (!llvm::isa<UnknownLoc>(
diag.getLocation()))
267 os <<
diag.getLocation() <<
": ";
286 llvm::sys::SmartScopedLock<true> lock(
impl->mutex);
287 auto uniqueID =
impl->uniqueHandlerId++;
288 impl->handlers.insert({uniqueID, std::move(handler)});
294 llvm::sys::SmartScopedLock<true> lock(
impl->mutex);
295 impl->handlers.erase(handlerID);
302 "notes should not be emitted directly");
313 auto diag = diagEngine.emit(location, severity);
314 if (!message.isTriviallyEmpty())
321 llvm::raw_string_ostream stream(bt);
322 llvm::sys::PrintStackTrace(stream);
325 diag.attachNote() <<
"diagnostic emitted with trace:\n" << bt;
359 ctx->getDiagEngine().eraseHandler(handlerID);
371 StringRef filename) {
375 return bufferIt->second;
378 for (
unsigned i = 1, e = mgr.getNumBuffers() + 1; i != e; ++i) {
379 auto *buf = mgr.getMemoryBuffer(i);
380 if (buf->getBufferIdentifier() == filename)
386 unsigned id = mgr.AddIncludeFile(std::string(filename), SMLoc(), ignored);
399 if (isa<NameLoc>(loc))
401 if (
auto callLoc = dyn_cast<CallSiteLoc>(loc))
403 if (isa<FusedLoc>(loc)) {
404 for (
auto subLoc : cast<FusedLoc>(loc).getLocations()) {
418 return llvm::SourceMgr::DK_Note;
420 return llvm::SourceMgr::DK_Warning;
422 return llvm::SourceMgr::DK_Error;
424 return llvm::SourceMgr::DK_Remark;
426 llvm_unreachable(
"Unknown DiagnosticSeverity");
447 bool displaySourceLine) {
454 llvm::raw_string_ostream strOS(str);
455 if (!llvm::isa<UnknownLoc>(loc))
456 strOS << loc <<
": ";
463 if (displaySourceLine) {
464 auto smloc = convertLocToSMLoc(fileLoc);
473 llvm::raw_string_ostream locOS(locStr);
474 locOS << fileLoc.getFilename().getValue() <<
":" << fileLoc.getLine() <<
":"
475 << fileLoc.getColumn();
483 auto addLocToStack = [&](
Location loc, StringRef locContext) {
484 if (std::optional<Location> showableLoc = findLocToShow(loc))
485 locationStack.emplace_back(*showableLoc, locContext);
490 addLocToStack(loc, {});
496 loc = callLoc->getCaller();
497 for (
unsigned curDepth = 0; curDepth < callStackLimit; ++curDepth) {
498 addLocToStack(loc,
"called from");
500 loc = callLoc->getCaller();
507 if (locationStack.empty()) {
513 for (
auto &it : llvm::drop_begin(locationStack))
519 for (
auto ¬e :
diag.getNotes()) {
520 emitDiagnostic(note.getLocation(), note.str(), note.getSeverity(),
521 loc != note.getLocation());
522 loc = note.getLocation();
527 callStackLimit = limit;
531const llvm::MemoryBuffer *
533 if (
unsigned id =
impl->getSourceMgrBufferIDForFile(
mgr, filename))
534 return mgr.getMemoryBuffer(
id);
538std::optional<Location>
539SourceMgrDiagnosticHandler::findLocToShow(
Location loc) {
547 .Case([&](CallSiteLoc callLoc) -> std::optional<Location> {
550 return findLocToShow(callLoc.getCallee());
552 .Case([&](
FileLineColLoc) -> std::optional<Location> {
return loc; })
553 .Case([&](FusedLoc fusedLoc) -> std::optional<Location> {
556 for (Location childLoc : fusedLoc.getLocations())
557 if (std::optional<Location> showableLoc = findLocToShow(childLoc))
561 .Case([&](NameLoc nameLoc) -> std::optional<Location> {
562 return findLocToShow(nameLoc.getChildLoc());
564 .Case([&](OpaqueLoc opaqueLoc) -> std::optional<Location> {
566 return findLocToShow(opaqueLoc.getFallbackLocation());
568 .Case([](UnknownLoc) -> std::optional<Location> {
576SMLoc SourceMgrDiagnosticHandler::convertLocToSMLoc(
FileLineColLoc loc) {
582 unsigned bufferId = impl->getSourceMgrBufferIDForFile(
mgr, loc.
getFilename());
603 SMRange range(
fileLoc, SMLoc::getFromPointer(
fileLoc.getPointer() +
605 mgr.PrintMessage(os,
fileLoc, llvm::SourceMgr::DK_Error, msg, range);
621 std::string regexStr;
622 llvm::raw_string_ostream regexOS(regexStr);
624 while (!strToProcess.empty()) {
626 size_t regexIt = strToProcess.find(
"{{");
627 if (regexIt == StringRef::npos) {
628 regexOS << llvm::Regex::escape(strToProcess);
631 regexOS << llvm::Regex::escape(strToProcess.take_front(regexIt));
632 strToProcess = strToProcess.drop_front(regexIt + 2);
635 size_t regexEndIt = strToProcess.find(
"}}");
636 if (regexEndIt == StringRef::npos)
637 return emitError(os, mgr,
"found start of regex with no end '}}'");
638 StringRef regexStr = strToProcess.take_front(regexEndIt);
641 std::string regexError;
642 if (!llvm::Regex(regexStr).isValid(regexError))
643 return emitError(os, mgr,
"invalid regex: " + regexError);
645 regexOS <<
'(' << regexStr <<
')';
646 strToProcess = strToProcess.drop_front(regexEndIt + 2);
673 std::optional<MutableArrayRef<ExpectedDiag>>
679 const llvm::MemoryBuffer *buf);
696 llvm::Regex(
"expected-(error|note|remark|warning)(-re)? "
697 "*(@([+-][0-9]+|above|below|unknown))? *{{(.*)}}$");
718 llvm_unreachable(
"Unknown DiagnosticSeverity");
721std::optional<MutableArrayRef<ExpectedDiag>>
731 raw_ostream &os, llvm::SourceMgr &mgr,
const llvm::MemoryBuffer *buf) {
738 unsigned lastNonDesignatorLine = 0;
745 buf->getBuffer().split(lines,
'\n');
746 for (
unsigned lineNo = 0, e = lines.size(); lineNo < e; ++lineNo) {
748 if (!
expected.match(lines[lineNo].rtrim(), &matches)) {
750 if (!designatorsForNextLine.empty()) {
751 for (
unsigned diagIndex : designatorsForNextLine)
752 expectedDiags[diagIndex].lineNo = lineNo + 1;
753 designatorsForNextLine.clear();
755 lastNonDesignatorLine = lineNo;
760 SMLoc expectedStart = SMLoc::getFromPointer(matches[0].data());
763 if (matches[1] ==
"error")
765 else if (matches[1] ==
"warning")
767 else if (matches[1] ==
"remark")
770 assert(matches[1] ==
"note");
773 ExpectedDiag record(kind, lineNo + 1, expectedStart, matches[5]);
776 if (!matches[2].empty() && failed(record.
computeRegex(os, mgr))) {
781 StringRef offsetMatch = matches[3];
782 if (!offsetMatch.empty()) {
783 offsetMatch = offsetMatch.drop_front(1);
786 if (offsetMatch[0] ==
'+' || offsetMatch[0] ==
'-') {
788 offsetMatch.drop_front().getAsInteger(0, offset);
790 if (offsetMatch.front() ==
'+')
794 }
else if (offsetMatch.consume_front(
"unknown")) {
799 }
else if (offsetMatch.consume_front(
"above")) {
802 record.
lineNo = lastNonDesignatorLine + 1;
806 assert(offsetMatch.consume_front(
"below"));
807 designatorsForNextLine.push_back(expectedDiags.size());
814 expectedDiags.emplace_back(std::move(record));
816 return expectedDiags;
825 for (
unsigned i = 0, e =
mgr.getNumBuffers(); i != e; ++i)
826 (
void)
impl->computeExpectedDiags(out,
mgr,
mgr.getMemoryBuffer(i + 1));
848 err.emitError(
os,
mgr,
850 err.substring +
"\" was not produced");
852 for (
auto &expectedDiagsPair :
impl->expectedDiagsPerFile)
853 for (
auto &err : expectedDiagsPair.second)
854 checkExpectedDiags(err);
855 for (
auto &err :
impl->expectedUnknownLocDiags)
856 checkExpectedDiags(err);
857 impl->expectedDiagsPerFile.clear();
867 for (
auto ¬e :
diag.getNotes())
873void SourceMgrDiagnosticVerifierHandler::process(
Diagnostic &
diag) {
874 return process(
diag.getLocation(),
diag.str(),
diag.getSeverity());
878void SourceMgrDiagnosticVerifierHandler::process(
LocationAttr loc,
889 diags = impl->computeExpectedDiags(
894 diags = impl->expectedUnknownLocDiags;
899 ExpectedDiag *nearMiss =
nullptr;
902 for (
auto &e : diags) {
904 if (fileLoc && fileLoc.
getLine() != e.lineNo)
907 if (e.kind == kind) {
923 mgr.PrintMessage(
os, nearMiss->
fileLoc, llvm::SourceMgr::DK_Error,
925 "' diagnostic emitted when expecting a '" +
930 impl->status = failure();
956 uint64_t tid = llvm::get_threadid();
957 llvm::sys::SmartScopedLock<true> lock(
mutex);
980 return context->getDiagEngine().emit(std::move(
diag));
998 uint64_t tid = llvm::get_threadid();
999 llvm::sys::SmartScopedLock<true> lock(
mutex);
1005 uint64_t tid = llvm::get_threadid();
1006 llvm::sys::SmartScopedLock<true> lock(
mutex);
1016 os <<
"In-Flight Diagnostics:\n";
1022 if (!llvm::isa<UnknownLoc>(
diag.getLocation()))
1023 os <<
diag.getLocation() <<
": ";
1024 switch (
diag.getSeverity()) {
1066 impl->setOrderIDForThread(orderID);
1072 impl->eraseOrderIDForThread();
static OpPrintingFlags adjustPrintingFlags(OpPrintingFlags flags, DiagnosticSeverity severity)
Adjusts operation printing flags used in diagnostics for the given severity level.
static InFlightDiagnostic emitDiag(Location location, DiagnosticSeverity severity, const Twine &message)
Helper function used to emit a diagnostic with an optionally empty twine message.
static StringRef getDiagKindStr(DiagnosticSeverity kind)
Given a diagnostic kind, return a human readable string for it.
static StringRef twineToStrRef(const Twine &val, std::vector< std::unique_ptr< char[]> > &strings)
Convert a Twine to a StringRef.
static std::optional< CallSiteLoc > getCallSiteLoc(Location loc)
Return a processable CallSiteLoc from the given location.
static llvm::SourceMgr::DiagKind getDiagKind(DiagnosticSeverity kind)
Given a diagnostic kind, returns the LLVM DiagKind.
static std::string diag(const llvm::Value &value)
MLIRContext * getContext() const
Return the context this attribute belongs to.
static Attribute getFromOpaquePointer(const void *ptr)
Construct an attribute from the opaque pointer representation.
A variant type that holds a single argument for a diagnostic.
DiagnosticArgumentKind
Enum that represents the different kinds of diagnostic arguments supported.
StringRef getAsString() const
Returns this argument as a string.
double getAsDouble() const
Returns this argument as a double.
DiagnosticArgument(Attribute attr)
Note: The constructors below are only exposed due to problems accessing constructors from type traits...
Type getAsType() const
Returns this argument as a Type.
int64_t getAsInteger() const
Returns this argument as a signed integer.
DiagnosticArgumentKind getKind() const
Returns the kind of this argument.
Attribute getAsAttribute() const
Returns this argument as an Attribute.
void print(raw_ostream &os) const
Outputs this argument to a stream.
uint64_t getAsUnsigned() const
Returns this argument as an unsigned integer.
uint64_t HandlerID
A handle to a specific registered handler object.
InFlightDiagnostic emit(Location loc, DiagnosticSeverity severity)
Create a new inflight diagnostic with the given location and severity.
void eraseHandler(HandlerID id)
Erase the registered diagnostic handler with the given identifier.
llvm::unique_function< LogicalResult(Diagnostic &)> HandlerTy
The handler type for MLIR diagnostics.
HandlerID registerHandler(HandlerTy handler)
Register a new handler for diagnostics to the engine.
This class contains all of the information necessary to report a diagnostic to the DiagnosticEngine.
std::string str() const
Converts the diagnostic to a string.
Diagnostic & attachNote(std::optional< Location > noteLoc=std::nullopt)
Attaches a note to this diagnostic.
MutableArrayRef< DiagnosticArgument > getArguments()
Returns the current list of diagnostic arguments.
Diagnostic(Location loc, DiagnosticSeverity severity)
std::enable_if_t<!std::is_convertible< Arg, StringRef >::value &&std::is_constructible< DiagnosticArgument, Arg >::value, Diagnostic & > operator<<(Arg &&val)
Stream operator for inserting new diagnostic arguments.
void print(raw_ostream &os) const
Outputs this diagnostic to a stream.
Diagnostic & appendOp(Operation &op, const OpPrintingFlags &flags)
Append an operation with the given printing flags.
An instance of this location represents a tuple of file, line number, and column number.
StringAttr getFilename() const
unsigned getColumn() const
This class represents a diagnostic that is inflight and set to be reported.
void report()
Reports the diagnostic to the engine.
void abandon()
Abandons this diagnostic so that it will no longer be reported.
Location objects represent source locations information in MLIR.
T findInstanceOf()
Return an instance of the given location type if one is nested under the current location.
This class defines the main interface for locations in MLIR and acts as a non-nullable wrapper around...
MLIRContext is the top-level object for a collection of MLIR operations.
bool shouldPrintStackTraceOnDiagnostic()
Return true if we should attach the current stacktrace to diagnostics when emitted.
DiagnosticEngine & getDiagEngine()
Returns the diagnostic engine for this context.
Set of flags used to control the behavior of the various IR print methods (e.g.
OpPrintingFlags & elideLargeElementsAttrs(int64_t largeElementLimit=16)
Enables the elision of large elements attributes by printing a lexically valid but otherwise meaningl...
OpPrintingFlags & printGenericOpForm(bool enable=true)
Always print operations in the generic form.
OpPrintingFlags & useLocalScope(bool enable=true)
Use local scope when printing the operation.
A wrapper class that allows for printing an operation with a set of flags, useful to act as a "stream...
Operation * getOperation() const
OpPrintingFlags & flags()
StringRef getStringRef() const
Return the name of this operation. This always succeeds.
Operation is the basic unit of execution within MLIR.
void print(raw_ostream &os, const OpPrintingFlags &flags={})
void eraseOrderIDForThread()
Remove the order id for the current thread.
~ParallelDiagnosticHandler()
ParallelDiagnosticHandler(MLIRContext *ctx)
void setOrderIDForThread(size_t orderID)
Set the order id for the current thread.
~ScopedDiagnosticHandler()
ScopedDiagnosticHandler(MLIRContext *ctx)
void setHandler(FuncTy &&handler)
Set the handler to manage via RAII.
void setCallStackLimit(unsigned limit)
Set the maximum depth that a call stack will be printed. Defaults to 10.
void emitDiagnostic(Location loc, Twine message, DiagnosticSeverity kind, bool displaySourceLine=true)
Emit the given diagnostic information with the held source manager.
raw_ostream & os
The output stream to use when printing diagnostics.
SourceMgrDiagnosticHandler(llvm::SourceMgr &mgr, MLIRContext *ctx, raw_ostream &os, ShouldShowLocFn &&shouldShowLocFn={})
~SourceMgrDiagnosticHandler()
ShouldShowLocFn shouldShowLocFn
A functor used when determining if a location for a diagnostic should be shown.
const llvm::MemoryBuffer * getBufferForFile(StringRef filename)
Get a memory buffer for the given file, or nullptr if no file is available.
llvm::SourceMgr & mgr
The source manager that we are wrapping.
llvm::unique_function< bool(Location)> ShouldShowLocFn
This type represents a functor used to filter out locations when printing a diagnostic.
~SourceMgrDiagnosticVerifierHandler()
SourceMgrDiagnosticVerifierHandler(llvm::SourceMgr &srcMgr, MLIRContext *ctx, raw_ostream &out, Level level=Level::All)
void registerInContext(MLIRContext *ctx)
Register this handler with the given context.
LogicalResult verify()
Returns the status of the handler and verifies that all expected diagnostics were emitted.
static Type getFromOpaquePointer(const void *pointer)
This class represents an instance of an SSA value in the MLIR system, representing a computable value...
void print(raw_ostream &os) const
The OpAsmOpInterface, see OpAsmInterface.td for more details.
Include the generated interface declarations.
InFlightDiagnostic emitWarning(Location loc)
Utility method to emit a warning message using this location.
DiagnosticSeverity
Defines the different supported severity of a diagnostic.
InFlightDiagnostic emitError(Location loc)
Utility method to emit an error message using this location.
InFlightDiagnostic emitRemark(Location loc)
Utility method to emit a remark message using this location.
llvm::TypeSwitch< T, ResultT > TypeSwitch
llvm::DenseMap< KeyT, ValueT, KeyInfoT, BucketT > DenseMap
DiagnosticEngine::HandlerID uniqueHandlerId
This is a unique identifier counter for diagnostic handlers in the context.
llvm::sys::SmartMutex< true > mutex
A mutex to ensure that diagnostics emission is thread-safe.
void emit(Diagnostic &&diag)
Emit a diagnostic using the registered issue handle if present, or with the default behavior if not.
llvm::SmallMapVector< DiagnosticEngine::HandlerID, DiagnosticEngine::HandlerTy, 2 > handlers
These are the handlers used to report diagnostics.
This class represents an expected output diagnostic.
LogicalResult emitError(raw_ostream &os, llvm::SourceMgr &mgr, const Twine &msg)
Emit an error at the location referenced by this diagnostic.
unsigned lineNo
The line number the expected diagnostic should be on.
LogicalResult computeRegex(raw_ostream &os, llvm::SourceMgr &mgr)
Compute the regex matcher for this diagnostic, using the provided stream and manager to emit diagnost...
bool match(StringRef str) const
Returns true if this diagnostic matches the given string.
bool matched
A flag indicating if the expected diagnostic has been matched yet.
DiagnosticSeverity kind
The severity of the diagnosic expected.
StringRef substring
The substring that is expected to be within the diagnostic.
std::optional< llvm::Regex > substringRegex
An optional regex matcher, if the expected diagnostic sub-string was a regex string.
SMLoc fileLoc
The location of the expected diagnostic within the input file.
ExpectedDiag(DiagnosticSeverity kind, unsigned lineNo, SMLoc fileLoc, StringRef substring)
size_t id
The id for this diagnostic, this is used for ordering.
bool operator<(const ThreadDiagnostic &rhs) const
ThreadDiagnostic(size_t id, Diagnostic diag)
Diagnostic diag
The diagnostic.
void print(raw_ostream &os) const override
Dump the current diagnostics that were inflight.
MLIRContext * context
The context to emit the diagnostics to.
ParallelDiagnosticHandlerImpl(MLIRContext *ctx)
~ParallelDiagnosticHandlerImpl() override
void emitDiagnostics(llvm::function_ref< void(Diagnostic &)> emitFn) const
Utility method to emit any held diagnostics.
DiagnosticEngine::HandlerID handlerID
The unique id for the parallel handler.
DenseMap< uint64_t, size_t > threadToOrderID
A mapping between the thread id and the current order id.
void setOrderIDForThread(size_t orderID)
Set the order id for the current thread.
std::vector< ThreadDiagnostic > diagnostics
An unordered list of diagnostics that were emitted.
void eraseOrderIDForThread()
Remove the order id for the current thread.
llvm::sys::SmartMutex< true > mutex
A smart mutex to lock access to the internal state.
llvm::StringMap< unsigned > filenameToBufId
Mapping between file name and buffer ID's.
unsigned getSourceMgrBufferIDForFile(llvm::SourceMgr &mgr, StringRef filename)
Return the SrcManager buffer id for the specified file, or zero if none can be found.
llvm::StringMap< SmallVector< ExpectedDiag, 2 > > expectedDiagsPerFile
A list of expected diagnostics for each buffer of the source manager.
LogicalResult status
The current status of the verifier.
MutableArrayRef< ExpectedDiag > computeExpectedDiags(raw_ostream &os, llvm::SourceMgr &mgr, const llvm::MemoryBuffer *buf)
Computes the expected diagnostics for the given source buffer.
SourceMgrDiagnosticVerifierHandler::Level getVerifyLevel() const
llvm::Regex expected
Regex to match the expected diagnostics format.
SourceMgrDiagnosticVerifierHandler::Level level
Verification level.
SmallVector< ExpectedDiag, 2 > expectedUnknownLocDiags
A list of expected diagnostics with unknown locations.
SourceMgrDiagnosticVerifierHandlerImpl(SourceMgrDiagnosticVerifierHandler::Level level)
std::optional< MutableArrayRef< ExpectedDiag > > getExpectedDiags(StringRef bufName)
Returns the expected diagnostics for the given source file.