LLDB mainline
JSONTransport.h
Go to the documentation of this file.
1//===-- JSONTransport.h ---------------------------------------------------===//
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// Transport layer for encoding and decoding JSON protocol messages.
10//
11//===----------------------------------------------------------------------===//
12
13#ifndef LLDB_HOST_JSONTRANSPORT_H
14#define LLDB_HOST_JSONTRANSPORT_H
15
16#include "lldb/Host/MainLoop.h"
19#include "lldb/Utility/Status.h"
20#include "lldb/lldb-forward.h"
21#include "llvm/ADT/FunctionExtras.h"
22#include "llvm/ADT/StringExtras.h"
23#include "llvm/ADT/StringRef.h"
24#include "llvm/Support/Error.h"
25#include "llvm/Support/ErrorHandling.h"
26#include "llvm/Support/FormatVariadic.h"
27#include "llvm/Support/JSON.h"
28#include "llvm/Support/raw_ostream.h"
29#include <atomic>
30#include <functional>
31#include <mutex>
32#include <optional>
33#include <string>
34#include <system_error>
35#include <type_traits>
36#include <utility>
37#include <variant>
38#include <vector>
39#if __cplusplus >= 202002L
40#include <concepts>
41#endif
42
44
45/// An error to indicate that the transport reached EOF but there were still
46/// unhandled contents in the read buffer.
48 : public llvm::ErrorInfo<TransportUnhandledContentsError> {
49public:
50 static char ID;
51
52 explicit TransportUnhandledContentsError(std::string unhandled_contents);
53
54 void log(llvm::raw_ostream &OS) const override;
55 std::error_code convertToErrorCode() const override;
56
57 const std::string &getUnhandledContents() const {
59 }
60
61private:
63};
64
65/// An error to indicate that the parameters of a Req, Resp or Evt could not be
66/// deserialized.
67class InvalidParams : public llvm::ErrorInfo<InvalidParams> {
68public:
69 static char ID;
70
71 explicit InvalidParams(std::string method, std::string context)
72 : m_method(std::move(method)), m_context(std::move(context)) {}
73
74 void log(llvm::raw_ostream &OS) const override;
75 std::error_code convertToErrorCode() const override;
76
77private:
78 /// The JSONRPC remote method call.
79 std::string m_method;
80
81 /// Additional context from the parsing failure, e.g. "missing value at
82 /// (root)[1].str".
83 std::string m_context;
84};
85
86/// An error to indicate that no handler was registered for a given method.
87class MethodNotFound : public llvm::ErrorInfo<MethodNotFound> {
88public:
89 static char ID;
90
91 static constexpr int kErrorCode = -32601;
92
93 explicit MethodNotFound(std::string method) : m_method(std::move(method)) {}
94
95 void log(llvm::raw_ostream &OS) const override;
96 std::error_code convertToErrorCode() const override;
97
98private:
99 std::string m_method;
100};
101
102#if __cplusplus >= 202002L
103/// A ProtocolDescriptor details the types used in a JSONTransport for handling
104/// transport communication.
105template <typename T>
106concept ProtocolDescriptor = requires {
107 typename T::Id;
108 typename T::Req;
109 typename T::Resp;
110 typename T::Evt;
111};
112#endif
113
114/// A transport is responsible for maintaining the connection to a client
115/// application, and reading/writing structured messages to it.
116///
117/// JSONTransport have limited thread safety requirements:
118/// - Messages will not be sent concurrently.
119/// - Messages MAY be sent while Run() is reading, or its callback is active.
120///
121#if __cplusplus >= 202002L
122template <ProtocolDescriptor Proto>
123#else
124template <typename Proto>
125#endif
127public:
128 using Req = typename Proto::Req;
129 using Resp = typename Proto::Resp;
130 using Evt = typename Proto::Evt;
131 using Message = std::variant<Req, Resp, Evt>;
132
133 virtual ~JSONTransport() = default;
134
135 /// Sends an event, a message that does not require a response.
136 virtual llvm::Error Send(const Evt &) = 0;
137 /// Sends a request, a message that expects a response.
138 virtual llvm::Error Send(const Req &) = 0;
139 /// Sends a response to a specific request.
140 virtual llvm::Error Send(const Resp &) = 0;
141
142 /// Implemented to handle incoming messages. (See `RegisterMessageHandler()`
143 /// below).
145 public:
146 virtual ~MessageHandler() = default;
147 /// Called when an event is received.
148 virtual void Received(const Evt &) = 0;
149 /// Called when a request is received.
150 virtual void Received(const Req &) = 0;
151 /// Called when a response is received.
152 virtual void Received(const Resp &) = 0;
153
154 /// Called when an error occurs while reading from the transport.
155 ///
156 /// NOTE: This does *NOT* indicate that a specific request failed, but that
157 /// there was an error in the underlying transport.
158 virtual void OnError(llvm::Error) = 0;
159
160 /// Called on EOF or client disconnect.
161 virtual void OnClosed() = 0;
162 };
163
164 /// RegisterMessageHandler registers the Transport with the given MainLoop and
165 /// handles any incoming messages using the given MessageHandler.
166 ///
167 /// If an unexpected error occurs, the MainLoop will be terminated and a log
168 /// message will include additional information about the termination reason.
169 virtual llvm::Expected<MainLoop::ReadHandleUP>
170 RegisterMessageHandler(MainLoop &loop, MessageHandler &handler) = 0;
171
172protected:
173 template <typename... Ts> inline auto Logv(const char *Fmt, Ts &&...Vals) {
174 Log(llvm::formatv(Fmt, std::forward<Ts>(Vals)...).str());
175 }
176 virtual void Log(llvm::StringRef message) = 0;
177};
178
179/// An IOTransport sends and receives messages using an IOObject.
180template <typename Proto> class IOTransport : public JSONTransport<Proto> {
181public:
184
187
188 llvm::Error Send(const typename Proto::Evt &evt) override {
189 return Write(evt);
190 }
191 llvm::Error Send(const typename Proto::Req &req) override {
192 return Write(req);
193 }
194 llvm::Error Send(const typename Proto::Resp &resp) override {
195 return Write(resp);
196 }
197
198 llvm::Expected<MainLoop::ReadHandleUP>
200 Status status;
202 m_in, [this, &handler](MainLoopBase &base) { OnRead(base, handler); },
203 status);
204 if (status.Fail()) {
205 return status.takeError();
206 }
207 return read_handle;
208 }
209
210 /// Public for testing purposes, otherwise this should be an implementation
211 /// detail.
212 static constexpr size_t kReadBufferSize = 1024;
213
214protected:
215 llvm::Error Write(const llvm::json::Value &message) {
216 this->Logv("<-- {0}", message);
217 std::string output = Encode(message);
218 size_t bytes_written = output.size();
219 return m_out->Write(output.data(), bytes_written).takeError();
220 }
221
222 virtual llvm::Expected<std::vector<std::string>> Parse() = 0;
223 virtual std::string Encode(const llvm::json::Value &message) = 0;
224
225 llvm::SmallString<kReadBufferSize> m_buffer;
226
227private:
228 void OnRead(MainLoopBase &loop, MessageHandler &handler) {
229 char buf[kReadBufferSize];
230 size_t num_bytes = sizeof(buf);
231 if (Status status = m_in->Read(buf, num_bytes); status.Fail()) {
232 handler.OnError(status.takeError());
233 return;
234 }
235
236 if (num_bytes)
237 m_buffer.append(llvm::StringRef(buf, num_bytes));
238
239 // If the buffer has contents, try parsing any pending messages.
240 if (!m_buffer.empty()) {
241 llvm::Expected<std::vector<std::string>> raw_messages = Parse();
242 if (llvm::Error error = raw_messages.takeError()) {
243 handler.OnError(std::move(error));
244 return;
245 }
246
247 for (const std::string &raw_message : *raw_messages) {
248 llvm::Expected<Message> message =
249 llvm::json::parse<Message>(raw_message);
250 if (!message) {
251 handler.OnError(message.takeError());
252 return;
253 }
254
255 std::visit([&handler](auto &&msg) { handler.Received(msg); }, *message);
256 }
257 }
258
259 // Check if we reached EOF.
260 if (num_bytes == 0) {
261 // EOF reached, but there may still be unhandled contents in the buffer.
262 if (!m_buffer.empty())
263 handler.OnError(llvm::make_error<TransportUnhandledContentsError>(
264 std::string(m_buffer.str())));
265 handler.OnClosed();
266 }
267 }
268
271};
272
273/// A transport class for JSON with a HTTP header.
274#if __cplusplus >= 202002L
275template <ProtocolDescriptor Proto>
276#else
277template <typename Proto>
278#endif
280public:
281 using IOTransport<Proto>::IOTransport;
282
283protected:
284 /// Encodes messages based on
285 /// https://microsoft.github.io/debug-adapter-protocol/overview#base-protocol
286 std::string Encode(const llvm::json::Value &message) override {
287 std::string output;
288 std::string raw_message = llvm::formatv("{0}", message).str();
289 llvm::raw_string_ostream OS(output);
291 << std::to_string(raw_message.size()) << kEndOfHeader << raw_message;
292 return output;
293 }
294
295 /// Parses messages based on
296 /// https://microsoft.github.io/debug-adapter-protocol/overview#base-protocol
297 llvm::Expected<std::vector<std::string>> Parse() override {
298 std::vector<std::string> messages;
299 llvm::StringRef buffer = this->m_buffer;
300 while (buffer.contains(kEndOfHeader)) {
301 auto [headers, rest] = buffer.split(kEndOfHeader);
302 size_t content_length = 0;
303 // HTTP Headers are formatted like `<field-name> ':' [<field-value>]`.
304 for (const llvm::StringRef &header :
305 llvm::split(headers, kHeaderSeparator)) {
306 auto [key, value] = header.split(kHeaderFieldSeparator);
307 // 'Content-Length' is the only meaningful key at the moment. Others
308 // are ignored.
309 if (!key.equals_insensitive(kHeaderContentLength))
310 continue;
311
312 value = value.trim();
313 if (!llvm::to_integer(value, content_length, 10)) {
314 // Clear the buffer to avoid re-parsing this malformed message.
315 this->m_buffer.clear();
316 return llvm::createStringError(std::errc::invalid_argument,
317 "invalid content length: %s",
318 value.str().c_str());
319 }
320 }
321
322 // Check if we have enough data.
323 if (content_length > rest.size())
324 break;
325
326 llvm::StringRef body = rest.take_front(content_length);
327 buffer = rest.drop_front(content_length);
328 messages.emplace_back(body.str());
329 this->Logv("--> {0}", body);
330 }
331
332 // Store the remainder of the buffer for the next read callback.
333 this->m_buffer = buffer.str();
334
335 return std::move(messages);
336 }
337
338 static constexpr llvm::StringLiteral kHeaderContentLength = "Content-Length";
339 static constexpr llvm::StringLiteral kHeaderFieldSeparator = ":";
340 static constexpr llvm::StringLiteral kHeaderSeparator = "\r\n";
341 static constexpr llvm::StringLiteral kEndOfHeader = "\r\n\r\n";
342};
343
344/// A transport class for JSON RPC.
345#if __cplusplus >= 202002L
346template <ProtocolDescriptor Proto>
347#else
348template <typename Proto>
349#endif
350class JSONRPCTransport : public IOTransport<Proto> {
351public:
352 using IOTransport<Proto>::IOTransport;
353
354protected:
355 std::string Encode(const llvm::json::Value &message) override {
356 return llvm::formatv("{0}{1}", message, kMessageSeparator).str();
357 }
358
359 llvm::Expected<std::vector<std::string>> Parse() override {
360 std::vector<std::string> messages;
361 llvm::StringRef buf = this->m_buffer;
362 while (buf.contains(kMessageSeparator)) {
363 auto [raw_json, rest] = buf.split(kMessageSeparator);
364 buf = rest;
365 messages.emplace_back(raw_json.str());
366 this->Logv("--> {0}", raw_json);
367 }
368
369 // Store the remainder of the buffer for the next read callback.
370 this->m_buffer = buf.str();
371
372 return messages;
373 }
374
375 static constexpr llvm::StringLiteral kMessageSeparator = "\n";
376};
377
378/// A handler for the response to an outgoing request.
379template <typename T>
380using Reply =
381 std::conditional_t<std::is_void_v<T>,
382 llvm::unique_function<void(llvm::Error)>,
383 llvm::unique_function<void(llvm::Expected<T>)>>;
384
385namespace detail {
386template <typename R, typename P> struct request_t final {
387 using type = llvm::unique_function<void(const P &, Reply<R>)>;
388};
389template <typename R> struct request_t<R, void> final {
390 using type = llvm::unique_function<void(Reply<R>)>;
391};
392template <typename P> struct event_t final {
393 using type = llvm::unique_function<void(const P &)>;
394};
395template <> struct event_t<void> final {
396 using type = llvm::unique_function<void()>;
397};
398} // namespace detail
399
400template <typename R, typename P>
402
403/// A function to send an outgoing event.
404template <typename P> using OutgoingEvent = typename detail::event_t<P>::type;
405
406#if __cplusplus >= 202002L
407/// This represents a protocol description that includes additional helpers
408/// for constructing requests, responses and events to work with `Binder`.
409template <typename T>
410concept BindingBuilder =
411 ProtocolDescriptor<T> &&
412 requires(T::Id id, T::Req req, T::Resp resp, T::Evt evt,
413 llvm::StringRef method, std::optional<llvm::json::Value> params,
414 std::optional<llvm::json::Value> result, llvm::Error err) {
415 /// For initializing the unique sequence identifier;
416 { T::InitialId() } -> std::same_as<typename T::Id>;
417 /// Incrementing the sequence identifier.
418 { id++ } -> std::same_as<typename T::Id>;
419
420 /// Constructing protocol types
421 /// @{
422 /// Construct a new request.
423 { T::Make(id, method, params) } -> std::same_as<typename T::Req>;
424 /// Construct a new error response.
425 { T::Make(req, std::move(err)) } -> std::same_as<typename T::Resp>;
426 /// Construct a new success response.
427 { T::Make(req, result) } -> std::same_as<typename T::Resp>;
428 /// Construct a new event.
429 { T::Make(method, params) } -> std::same_as<typename T::Evt>;
430 /// @}
431
432 /// Keys for associated types.
433 /// @{
434 /// Looking up in flight responses.
435 { T::KeyFor(resp) } -> std::same_as<typename T::Id>;
436 /// Extract method from request.
437 { T::KeyFor(req) } -> std::same_as<std::string>;
438 /// Extract method from event.
439 { T::KeyFor(evt) } -> std::same_as<std::string>;
440 /// @}
441
442 /// Extracting information from associated types.
443 /// @{
444 /// Extract parameters from a request.
445 { T::Extract(req) } -> std::same_as<std::optional<llvm::json::Value>>;
446 /// Extract result from a response.
447 { T::Extract(resp) } -> std::same_as<llvm::Expected<llvm::json::Value>>;
448 /// Extract parameters from an event.
449 { T::Extract(evt) } -> std::same_as<std::optional<llvm::json::Value>>;
450 /// @}
451 };
452#endif
453
454/// Binder collects a table of functions that handle calls.
455///
456/// The wrapper takes care of parsing/serializing responses.
457///
458/// This allows a JSONTransport to handle incoming and outgoing requests and
459/// events.
460///
461/// A bind of an incoming request to a lambda.
462/// \code{cpp}
463/// Binder binder{transport};
464/// binder.bind<int, vector<int>>("adder", [](const vector<int> &params) {
465/// int sum = 0;
466/// for (int v : params)
467/// sum += v;
468/// return sum;
469/// });
470/// \endcode
471///
472/// A bind of an outgoing request.
473/// \code{cpp}
474/// OutgoingRequest<int, vector<int>> call_add =
475/// binder.bind<int, vector<int>>("add");
476/// call_add({1,2,3}, [](Expected<int> result) {
477/// cout << *result << "\n";
478/// });
479/// \endcode
480#if __cplusplus >= 202002L
481template <BindingBuilder Proto>
482#else
483template <typename Proto>
484#endif
486 using Req = typename Proto::Req;
487 using Resp = typename Proto::Resp;
488 using Evt = typename Proto::Evt;
489 using Id = typename Proto::Id;
492
493public:
495
496 Binder(const Binder &) = delete;
497 Binder &operator=(const Binder &) = delete;
498
499 /// Bind a handler on transport disconnect.
500 template <typename Fn, typename... Args>
501 void OnDisconnect(Fn &&fn, Args &&...args);
502
503 /// Bind a handler on error when communicating with the transport.
504 template <typename Fn, typename... Args>
505 void OnError(Fn &&fn, Args &&...args);
506
507 /// Bind a handler for an incoming request.
508 /// e.g. `bind("peek", &ThisModule::peek, this);`.
509 /// Handler should be e.g. `Expected<PeekResult> peek(const PeekParams&);`
510 /// PeekParams must be JSON parsable and PeekResult must be serializable.
511 template <typename Result, typename Params, typename Fn, typename... Args>
512 void Bind(llvm::StringLiteral method, Fn &&fn, Args &&...args);
513
514 /// Bind a handler for an incoming event.
515 /// e.g. `bind("peek", &ThisModule::peek, this);`
516 /// Handler should be e.g. `void peek(const PeekParams&);`
517 /// PeekParams must be JSON parsable.
518 template <typename Params, typename Fn, typename... Args>
519 void Bind(llvm::StringLiteral method, Fn &&fn, Args &&...args);
520
521 /// Bind a function object to be used for outgoing requests.
522 /// e.g. `OutgoingRequest<Params, Result> Edit = bind("edit");`
523 /// Params must be JSON-serializable, Result must be parsable.
524 template <typename Result, typename Params>
525 OutgoingRequest<Result, Params> Bind(llvm::StringLiteral method);
526
527 /// Bind a function object to be used for outgoing events.
528 /// e.g. `OutgoingEvent<LogParams> Log = bind("log");`
529 /// LogParams must be JSON-serializable.
530 template <typename Params>
531 OutgoingEvent<Params> Bind(llvm::StringLiteral method);
532
533 void Received(const Evt &evt) override {
534 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
535 auto it = m_event_handlers.find(Proto::KeyFor(evt));
536 if (it == m_event_handlers.end()) {
537 OnError(llvm::createStringError(
538 llvm::formatv("no handled for event {0}", toJSON(evt))));
539 return;
540 }
541 it->second(evt);
542 }
543
544 void Received(const Req &req) override {
545 ReplyOnce reply(req, &m_transport, this);
546
547 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
548 auto it = m_request_handlers.find(Proto::KeyFor(req));
549 if (it == m_request_handlers.end()) {
550 reply(Proto::Make(req, llvm::createStringError("method not found")));
551 return;
552 }
553
554 it->second(req, std::move(reply));
555 }
556
557 void Received(const Resp &resp) override {
558 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
559
560 Id id = Proto::KeyFor(resp);
561 auto it = m_pending_responses.find(id);
562 if (it == m_pending_responses.end()) {
563 OnError(llvm::createStringError(
564 llvm::formatv("no pending request for {0}", toJSON(resp))));
565 return;
566 }
567
568 it->second(resp);
569 m_pending_responses.erase(it);
570 }
571
572 void OnError(llvm::Error err) override {
573 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
574 if (m_error_handler)
575 m_error_handler(std::move(err));
576 }
577
578 void OnClosed() override {
579 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
582 }
583
584private:
585 template <typename T>
586 llvm::Expected<T> static Parse(const llvm::json::Value &raw,
587 llvm::StringRef method);
588
589 template <typename T> using Callback = llvm::unique_function<T>;
590
591 std::recursive_mutex m_mutex;
594 std::map<Id, Callback<void(const Resp &)>> m_pending_responses;
595 llvm::StringMap<Callback<void(const Req &, Callback<void(const Resp &)>)>>
597 llvm::StringMap<Callback<void(const Evt &)>> m_event_handlers;
599 Callback<void(llvm::Error)> m_error_handler;
600
601 /// Function object to reply to a call.
602 /// Each instance must be called exactly once, otherwise:
603 /// - the bug is logged, and (in debug mode) an assert will fire
604 /// - if there was no reply, an error reply is sent
605 /// - if there were multiple replies, only the first is sent
606 class ReplyOnce {
607 std::atomic<bool> replied = {false};
608 const Req req;
609 Transport *transport; // Null when moved-from.
610 MessageHandler *handler; // Null when moved-from.
611
612 public:
618 : replied(other.replied.load()), req(other.req),
619 transport(other.transport), handler(other.handler) {
620 other.transport = nullptr;
621 other.handler = nullptr;
622 }
624 ReplyOnce(const ReplyOnce &) = delete;
625 ReplyOnce &operator=(const ReplyOnce &) = delete;
626
628 if (transport && handler && !replied) {
629 assert(false && "must reply to all calls!");
630 (*this)(Proto::Make(req, llvm::createStringError("failed to reply")));
631 }
632 }
633
634 void operator()(const Resp &resp) {
635 assert(transport && handler && "moved-from!");
636 if (replied.exchange(true)) {
637 assert(false && "must reply to each call only once!");
638 return;
639 }
640
641 if (llvm::Error error = transport->Send(resp))
642 handler->OnError(std::move(error));
643 }
644 };
645};
646
647#if __cplusplus >= 202002L
648template <BindingBuilder Proto>
649#else
650template <typename Proto>
651#endif
652template <typename Fn, typename... Args>
653void Binder<Proto>::OnDisconnect(Fn &&fn, Args &&...args) {
654 m_disconnect_handler = [fn, args...]() mutable {
655 std::invoke(std::forward<Fn>(fn), std::forward<Args>(args)...);
656 };
657}
658
659#if __cplusplus >= 202002L
660template <BindingBuilder Proto>
661#else
662template <typename Proto>
663#endif
664template <typename Fn, typename... Args>
665void Binder<Proto>::OnError(Fn &&fn, Args &&...args) {
666 m_error_handler = [fn, args...](llvm::Error error) mutable {
667 std::invoke(std::forward<Fn>(fn), std::forward<Args>(args)...,
668 std::move(error));
669 };
670}
671
672#if __cplusplus >= 202002L
673template <BindingBuilder Proto>
674#else
675template <typename Proto>
676#endif
677template <typename Result, typename Params, typename Fn, typename... Args>
678void Binder<Proto>::Bind(llvm::StringLiteral method, Fn &&fn, Args &&...args) {
679 assert(m_request_handlers.find(method) == m_request_handlers.end() &&
680 "request already bound");
681 if constexpr (std::is_void_v<Result> && std::is_void_v<Params>) {
682 m_request_handlers[method] =
683 [fn, args...](const Req &req,
684 llvm::unique_function<void(const Resp &)> reply) mutable {
685 llvm::Error result =
686 std::invoke(std::forward<Fn>(fn), std::forward<Args>(args)...);
687 reply(Proto::Make(req, std::move(result)));
688 };
689 } else if constexpr (std::is_void_v<Params>) {
690 m_request_handlers[method] =
691 [fn, args...](const Req &req,
692 llvm::unique_function<void(const Resp &)> reply) mutable {
693 llvm::Expected<Result> result =
694 std::invoke(std::forward<Fn>(fn), std::forward<Args>(args)...);
695 if (!result)
696 return reply(Proto::Make(req, result.takeError()));
697 reply(Proto::Make(req, toJSON(*result)));
698 };
699 } else if constexpr (std::is_void_v<Result>) {
700 m_request_handlers[method] =
701 [method, fn,
702 args...](const Req &req,
703 llvm::unique_function<void(const Resp &)> reply) mutable {
704 llvm::Expected<Params> params =
705 Parse<Params>(Proto::Extract(req), method);
706 if (!params)
707 return reply(Proto::Make(req, params.takeError()));
708
709 llvm::Error result = std::invoke(
710 std::forward<Fn>(fn), std::forward<Args>(args)..., *params);
711 reply(Proto::Make(req, std::move(result)));
712 };
713 } else {
714 m_request_handlers[method] =
715 [method, fn,
716 args...](const Req &req,
717 llvm::unique_function<void(const Resp &)> reply) mutable {
718 llvm::Expected<Params> params =
719 Parse<Params>(Proto::Extract(req), method);
720 if (!params)
721 return reply(Proto::Make(req, params.takeError()));
722
723 llvm::Expected<Result> result = std::invoke(
724 std::forward<Fn>(fn), std::forward<Args>(args)..., *params);
725 if (!result)
726 return reply(Proto::Make(req, result.takeError()));
727
728 reply(Proto::Make(req, toJSON(*result)));
729 };
730 }
731}
732
733#if __cplusplus >= 202002L
734template <BindingBuilder Proto>
735#else
736template <typename Proto>
737#endif
738template <typename Params, typename Fn, typename... Args>
739void Binder<Proto>::Bind(llvm::StringLiteral method, Fn &&fn, Args &&...args) {
740 assert(m_event_handlers.find(method) == m_event_handlers.end() &&
741 "event already bound");
742 if constexpr (std::is_void_v<Params>) {
743 m_event_handlers[method] = [fn, args...](const Evt &) mutable {
744 std::invoke(std::forward<Fn>(fn), std::forward<Args>(args)...);
745 };
746 } else {
747 m_event_handlers[method] = [this, method, fn,
748 args...](const Evt &evt) mutable {
749 llvm::Expected<Params> params =
750 Parse<Params>(Proto::Extract(evt), method);
751 if (!params)
752 return OnError(params.takeError());
753 std::invoke(std::forward<Fn>(fn), std::forward<Args>(args)..., *params);
754 };
755 }
756}
757
758#if __cplusplus >= 202002L
759template <BindingBuilder Proto>
760#else
761template <typename Proto>
762#endif
763template <typename Result, typename Params>
765Binder<Proto>::Bind(llvm::StringLiteral method) {
766 if constexpr (std::is_void_v<Result> && std::is_void_v<Params>) {
767 return [this, method](Reply<Result> fn) {
768 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
769 Id id = ++m_seq;
770 Req req = Proto::Make(id, method, std::nullopt);
771 m_pending_responses[id] = [fn = std::move(fn)](const Resp &resp) mutable {
772 llvm::Expected<llvm::json::Value> result = Proto::Extract(resp);
773 if (!result)
774 return fn(result.takeError());
775 fn(llvm::Error::success());
776 };
777 if (llvm::Error error = m_transport.Send(req))
778 OnError(std::move(error));
779 };
780 } else if constexpr (std::is_void_v<Params>) {
781 return [this, method](Reply<Result> fn) {
782 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
783 Id id = ++m_seq;
784 Req req = Proto::Make(id, method, std::nullopt);
785 m_pending_responses[id] = [fn = std::move(fn),
786 method](const Resp &resp) mutable {
787 llvm::Expected<llvm::json::Value> result = Proto::Extract(resp);
788 if (!result)
789 return fn(result.takeError());
790 fn(Parse<Result>(*result, method));
791 };
792 if (llvm::Error error = m_transport.Send(req))
793 OnError(std::move(error));
794 };
795 } else if constexpr (std::is_void_v<Result>) {
796 return [this, method](const Params &params, Reply<Result> fn) {
797 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
798 Id id = ++m_seq;
799 Req req = Proto::Make(id, method, llvm::json::Value(params));
800 m_pending_responses[id] = [fn = std::move(fn)](const Resp &resp) mutable {
801 llvm::Expected<llvm::json::Value> result = Proto::Extract(resp);
802 if (!result)
803 return fn(result.takeError());
804 fn(llvm::Error::success());
805 };
806 if (llvm::Error error = m_transport.Send(req))
807 OnError(std::move(error));
808 };
809 } else {
810 return [this, method](const Params &params, Reply<Result> fn) {
811 std::scoped_lock<std::recursive_mutex> guard(m_mutex);
812 Id id = ++m_seq;
813 Req req = Proto::Make(id, method, llvm::json::Value(params));
814 m_pending_responses[id] = [fn = std::move(fn),
815 method](const Resp &resp) mutable {
816 llvm::Expected<llvm::json::Value> result = Proto::Extract(resp);
817 if (llvm::Error err = result.takeError())
818 return fn(std::move(err));
819 fn(Parse<Result>(*result, method));
820 };
821 if (llvm::Error error = m_transport.Send(req))
822 OnError(std::move(error));
823 };
824 }
825}
826
827#if __cplusplus >= 202002L
828template <BindingBuilder Proto>
829#else
830template <typename Proto>
831#endif
832template <typename Params>
833OutgoingEvent<Params> Binder<Proto>::Bind(llvm::StringLiteral method) {
834 if constexpr (std::is_void_v<Params>) {
835 return [this, method]() {
836 if (llvm::Error error =
837 m_transport.Send(Proto::Make(method, std::nullopt)))
838 OnError(std::move(error));
839 };
840 } else {
841 return [this, method](const Params &params) {
842 if (llvm::Error error =
843 m_transport.Send(Proto::Make(method, toJSON(params))))
844 OnError(std::move(error));
845 };
846 }
847}
848
849#if __cplusplus >= 202002L
850template <BindingBuilder Proto>
851#else
852template <typename Proto>
853#endif
854template <typename T>
855llvm::Expected<T> Binder<Proto>::Parse(const llvm::json::Value &raw,
856 llvm::StringRef method) {
857 T result;
858 llvm::json::Path::Root root;
859 if (!fromJSON(raw, result, root)) {
860 // Dump the relevant parts of the broken message.
861 std::string context;
862 llvm::raw_string_ostream OS(context);
863 root.printErrorContext(raw, OS);
864 return llvm::make_error<InvalidParams>(method.str(), context);
865 }
866 return std::move(result);
867}
868
869} // namespace lldb_private::transport
870
871#endif
static llvm::raw_ostream & error(Stream &strm)
A command line argument class.
Definition Args.h:33
std::unique_ptr< ReadHandle > ReadHandleUP
ReadHandleUP RegisterReadObject(const lldb::IOObjectSP &object_sp, const Callback &callback, Status &error) override
An error handling class.
Definition Status.h:118
llvm::Error takeError()
Definition Status.h:170
bool Fail() const
Test for error condition.
Definition Status.cpp:294
ReplyOnce & operator=(const ReplyOnce &)=delete
ReplyOnce(const Req req, Transport *transport, MessageHandler *handler)
ReplyOnce & operator=(ReplyOnce &&)=delete
void Received(const Resp &resp) override
Called when a response is received.
JSONTransport< Proto > Transport
typename Transport::MessageHandler MessageHandler
void OnDisconnect(Fn &&fn, Args &&...args)
Bind a handler on transport disconnect.
void Bind(llvm::StringLiteral method, Fn &&fn, Args &&...args)
Bind a handler for an incoming request.
void Bind(llvm::StringLiteral method, Fn &&fn, Args &&...args)
Bind a handler for an incoming event.
llvm::StringMap< Callback< void(const Req &, Callback< void(const Resp &)>)> > m_request_handlers
void OnClosed() override
Called on EOF or client disconnect.
void OnError(Fn &&fn, Args &&...args)
Bind a handler on error when communicating with the transport.
void Received(const Evt &evt) override
Called when an event is received.
OutgoingRequest< Result, Params > Bind(llvm::StringLiteral method)
Bind a function object to be used for outgoing requests.
std::map< Id, Callback< void(const Resp &)> > m_pending_responses
Binder & operator=(const Binder &)=delete
Binder(Transport &transport)
void Received(const Req &req) override
Called when a request is received.
static llvm::Expected< T > Parse(const llvm::json::Value &raw, llvm::StringRef method)
OutgoingEvent< Params > Bind(llvm::StringLiteral method)
Bind a function object to be used for outgoing events.
Binder(const Binder &)=delete
void OnError(llvm::Error err) override
Called when an error occurs while reading from the transport.
llvm::unique_function< T > Callback
llvm::StringMap< Callback< void(const Evt &)> > m_event_handlers
A transport class for JSON with a HTTP header.
static constexpr llvm::StringLiteral kHeaderFieldSeparator
static constexpr llvm::StringLiteral kEndOfHeader
static constexpr llvm::StringLiteral kHeaderSeparator
std::string Encode(const llvm::json::Value &message) override
Encodes messages based on https://microsoft.github.io/debug-adapter-protocol/overview#base-protocol.
llvm::Expected< std::vector< std::string > > Parse() override
Parses messages based on https://microsoft.github.io/debug-adapter-protocol/overview#base-protocol.
static constexpr llvm::StringLiteral kHeaderContentLength
void OnRead(MainLoopBase &loop, MessageHandler &handler)
static constexpr size_t kReadBufferSize
Public for testing purposes, otherwise this should be an implementation detail.
typename JSONTransport< Proto >::MessageHandler MessageHandler
llvm::Error Send(const typename Proto::Resp &resp) override
IOTransport(lldb::IOObjectSP in, lldb::IOObjectSP out)
typename JSONTransport< Proto >::Message Message
llvm::Error Send(const typename Proto::Evt &evt) override
virtual std::string Encode(const llvm::json::Value &message)=0
virtual llvm::Expected< std::vector< std::string > > Parse()=0
llvm::Error Write(const llvm::json::Value &message)
llvm::Error Send(const typename Proto::Req &req) override
llvm::Expected< MainLoop::ReadHandleUP > RegisterMessageHandler(MainLoop &loop, MessageHandler &handler) override
RegisterMessageHandler registers the Transport with the given MainLoop and handles any incoming messa...
llvm::SmallString< kReadBufferSize > m_buffer
std::error_code convertToErrorCode() const override
std::string m_context
Additional context from the parsing failure, e.g.
InvalidParams(std::string method, std::string context)
std::string m_method
The JSONRPC remote method call.
void log(llvm::raw_ostream &OS) const override
A transport class for JSON RPC.
llvm::Expected< std::vector< std::string > > Parse() override
static constexpr llvm::StringLiteral kMessageSeparator
std::string Encode(const llvm::json::Value &message) override
Implemented to handle incoming messages.
virtual void OnError(llvm::Error)=0
Called when an error occurs while reading from the transport.
virtual void OnClosed()=0
Called on EOF or client disconnect.
virtual void Received(const Req &)=0
Called when a request is received.
virtual void Received(const Evt &)=0
Called when an event is received.
virtual void Received(const Resp &)=0
Called when a response is received.
A transport is responsible for maintaining the connection to a client application,...
virtual llvm::Expected< MainLoop::ReadHandleUP > RegisterMessageHandler(MainLoop &loop, MessageHandler &handler)=0
RegisterMessageHandler registers the Transport with the given MainLoop and handles any incoming messa...
virtual llvm::Error Send(const Resp &)=0
Sends a response to a specific request.
std::variant< Req, Resp, Evt > Message
virtual llvm::Error Send(const Evt &)=0
Sends an event, a message that does not require a response.
auto Logv(const char *Fmt, Ts &&...Vals)
virtual llvm::Error Send(const Req &)=0
Sends a request, a message that expects a response.
virtual void Log(llvm::StringRef message)=0
std::error_code convertToErrorCode() const override
void log(llvm::raw_ostream &OS) const override
void log(llvm::raw_ostream &OS) const override
TransportUnhandledContentsError(std::string unhandled_contents)
std::conditional_t< std::is_void_v< T >, llvm::unique_function< void(llvm::Error)>, llvm::unique_function< void(llvm::Expected< T >)> > Reply
A handler for the response to an outgoing request.
typename detail::event_t< P >::type OutgoingEvent
A function to send an outgoing event.
typename detail::request_t< R, P >::type OutgoingRequest
bool fromJSON(const llvm::json::Value &value, TraceSupportedResponse &info, llvm::json::Path path)
MainLoopPosix MainLoop
Definition MainLoop.h:20
llvm::json::Value toJSON(const TraceSupportedResponse &packet)
std::shared_ptr< lldb_private::IOObject > IOObjectSP
llvm::unique_function< void(const P &)> type
llvm::unique_function< void(Reply< R >)> type
llvm::unique_function< void(const P &, Reply< R >)> type