diff --git a/R/call_hierarchy.R b/R/call_hierarchy.R
index 9edf7e8d..199966eb 100644
--- a/R/call_hierarchy.R
+++ b/R/call_hierarchy.R
@@ -1,4 +1,4 @@
-#' @keywords internal
+#' @noRd
prepare_call_hierarchy_reply <- function(id, uri, workspace, document, point) {
token <- document$detect_token(point)
diff --git a/R/color.R b/R/color.R
index b405612c..a7099ca1 100644
--- a/R/color.R
+++ b/R/color.R
@@ -1,6 +1,6 @@
#' The response to a textDocument/documentColor Request
#'
-#' @keywords internal
+#' @noRd
document_color_reply <- function(id, uri, workspace, document) {
result <- NULL
@@ -50,7 +50,7 @@ document_color_reply <- function(id, uri, workspace, document) {
#' The response to a textDocument/colorPresentation Request
#'
-#' @keywords internal
+#' @noRd
color_presentation_reply <- function(id, uri, workspace, document, color) {
if (color$alpha == 1) {
hex_color <- grDevices::rgb(color$red, color$green, color$blue)
diff --git a/R/completion.R b/R/completion.R
index 08d8029f..b2ba3c75 100644
--- a/R/completion.R
+++ b/R/completion.R
@@ -48,7 +48,7 @@ constants <- c("TRUE", "FALSE", "NULL",
"Inf", "NaN")
#' Complete language constants
-#' @keywords internal
+#' @noRd
constant_completion <- function(token) {
consts <- constants[match_with(constants, token)]
completions <- lapply(consts, function(const) {
@@ -61,7 +61,7 @@ constant_completion <- function(token) {
}
#' Complete a package name
-#' @keywords internal
+#' @noRd
package_completion <- function(token) {
installed_packages <- .packages(all.available = TRUE)
token_packages <- installed_packages[match_with(installed_packages, token)]
@@ -76,7 +76,7 @@ package_completion <- function(token) {
}
#' Complete a function argument
-#' @keywords internal
+#' @noRd
arg_completion <- function(uri, workspace, point, token, funct, package = NULL, exported_only = TRUE) {
token_args <- NULL
token_data <- NULL
@@ -222,7 +222,7 @@ imported_object_completion <- function(workspace, token, snippet_support) {
#' Complete any object in the workspace
-#' @keywords internal
+#' @noRd
workspace_completion <- function(workspace, token,
package = NULL, exported_only = TRUE, snippet_support = NULL) {
completions <- list()
@@ -445,7 +445,7 @@ token_completion <- function(uri, workspace, token, exclude = NULL) {
}
#' The response to a textDocument/completion request
-#' @keywords internal
+#' @noRd
completion_reply <- function(id, uri, workspace, document, point, capabilities) {
if (!check_scope(uri, document, point)) {
return(Response$new(
@@ -458,7 +458,7 @@ completion_reply <- function(id, uri, workspace, document, point, capabilities)
t0 <- Sys.time()
snippet_support <- isTRUE(capabilities$completionItem$snippetSupport) &&
- getOption("languageserver.snippet_support", TRUE)
+ lsp_settings$get("snippet_support")
token_result <- document$detect_token(point, forward = FALSE)
@@ -502,7 +502,7 @@ completion_reply <- function(id, uri, workspace, document, point, capabilities)
}
init_count <- length(completions)
- nmax <- getOption("languageserver.max_completions", 200)
+ nmax <- lsp_settings$get("max_completions")
if (init_count > nmax) {
isIncomplete <- TRUE
@@ -533,7 +533,7 @@ completion_reply <- function(id, uri, workspace, document, point, capabilities)
}
#' The response to a completionItem/resolve request
-#' @keywords internal
+#' @noRd
completion_item_resolve_reply <- function(id, workspace, params) {
resolved <- FALSE
if (is.null(params$data) || is.null(params$data$type)) {
diff --git a/R/definition.R b/R/definition.R
index ce7b9ae2..108c63a8 100644
--- a/R/definition.R
+++ b/R/definition.R
@@ -11,7 +11,7 @@ definition_xpath <- paste(
#' If the function is not found in a file but is found in a loaded package,
#' writes the function definition to a temporary file and returns that
#' as the location.
-#' @keywords internal
+#' @noRd
definition_reply <- function(id, uri, workspace, document, point, rootPath) {
token_result <- document$detect_token(point)
diff --git a/R/diagnostics.R b/R/diagnostics.R
index 76abdb62..76cecf47 100644
--- a/R/diagnostics.R
+++ b/R/diagnostics.R
@@ -24,7 +24,7 @@ DiagnosticSeverity <- list(
)
#' @rdname diagnostics
-#' @keywords internal
+#' @noRd
diagnostic_range <- function(result, content) {
line <- result$line_number - 1
column <- result$column_number - 1
@@ -45,7 +45,7 @@ diagnostic_range <- function(result, content) {
}
#' @rdname diagnostics
-#' @keywords internal
+#' @noRd
diagnostic_severity <- function(result) {
switch(result$type,
error = DiagnosticSeverity$Error,
@@ -55,7 +55,7 @@ diagnostic_severity <- function(result) {
}
#' @rdname diagnostics
-#' @keywords internal
+#' @noRd
diagnostic_from_lint <- function(result, content) {
list(
range = diagnostic_range(result, content),
@@ -66,7 +66,7 @@ diagnostic_from_lint <- function(result, content) {
}
#' Find the lintr config file
-#' @keywords internal
+#' @noRd
find_config <- function(filename) {
# instead of calling `lintr:::find_config` directly
# since CRAN doesn't like :::.
@@ -76,8 +76,8 @@ find_config <- function(filename) {
#' Run diagnostic on a file
#'
#' Lint and diagnose problems in a file.
-#' @keywords internal
-diagnose_file <- function(uri, content) {
+#' @noRd
+diagnose_file <- function(uri, content, cache = FALSE) {
if (length(content) == 0) {
return(list())
}
@@ -95,9 +95,8 @@ diagnose_file <- function(uri, content) {
content <- c(content, "")
}
- lint_cache <- getOption("languageserver.lint_cache", TRUE)
if (lintr_is_new_enough()) {
- lints <- lintr::lint(path, cache = lint_cache, text = content)
+ lints <- lintr::lint(path, cache = cache, text = content)
} else {
# TODO: remove it once new version of lintr is released
linter_file <- find_config(path)
@@ -106,7 +105,7 @@ diagnose_file <- function(uri, content) {
on.exit(options(op))
}
text <- paste0(content, collapse = "\n")
- lints <- lintr::lint(text, cache = lint_cache)
+ lints <- lintr::lint(text, cache = cache)
}
diagnostics <- lapply(lints, diagnostic_from_lint, content = content)
@@ -135,7 +134,7 @@ diagnostics_task <- function(self, uri, document, delay = 0) {
content <- document$content
create_task(
target = package_call(diagnose_file),
- args = list(uri = uri, content = content),
+ args = list(uri = uri, content = content, cache = lsp_settings$get("lint_cache")),
callback = function(result) diagnostics_callback(self, uri, version, result),
error = function(e) {
logger$info("diagnostics_task:", e)
diff --git a/R/document.R b/R/document.R
index da7f7fde..72ac3ee4 100644
--- a/R/document.R
+++ b/R/document.R
@@ -132,7 +132,7 @@ Document <- R6::R6Class(
#' Search backwards in a document content for a specific character
-#' @keywords internal
+#' @noRd
find_unbalanced_bracket <- function(content, row, column, skip_empty_line = FALSE) {
.Call("find_unbalanced_bracket",
PACKAGE = "languageserver",
@@ -141,7 +141,7 @@ find_unbalanced_bracket <- function(content, row, column, skip_empty_line = FALS
}
#' check if a position is inside quotes
-#' @keywords internal
+#' @noRd
enclosed_by_quotes <- function(document, point) {
text <- document$line0(point$row)
col <- point$col
@@ -154,7 +154,7 @@ detect_comments <- function(content, row) {
}
#' Expression range in UTF-16 code units
-#' @keywords internal
+#' @noRd
expr_range <- function(srcref) {
lines <- attr(srcref, "srcfile")$lines
# R is 1-indexed, language server is 0-indexed
@@ -303,7 +303,7 @@ parse_expr <- function(content, expr, env, level = 0L, srcref = attr(expr, "srcr
#' Build the list of called packages, functions, variables, formals and
#' signatures in the document in order to add them to the current [Workspace].
#'
-#' @keywords internal
+#' @noRd
parse_document <- function(uri, content) {
if (length(content) == 0) {
content <- ""
diff --git a/R/folding.R b/R/folding.R
index 6d6a9e82..e0903a82 100644
--- a/R/folding.R
+++ b/R/folding.R
@@ -80,7 +80,7 @@ get_section_folding_ranges <- function(uri, document) {
}
#' Get all the folding ranges in the document
-#' @keywords internal
+#' @noRd
document_folding_range_reply <- function(id, uri, workspace, document) {
result <- NULL
diff --git a/R/formatting.R b/R/formatting.R
index ab19a65f..8612b2ac 100644
--- a/R/formatting.R
+++ b/R/formatting.R
@@ -13,7 +13,7 @@ get_style <- function(options) {
#' This functions formats a list of text using [styler::style_text()] with the
#' specified style.
#'
-#' @keywords internal
+#' @noRd
style_text <- function(text, style, indention = 0L) {
new_text <- tryCatch(
styler::style_text(
@@ -32,7 +32,7 @@ style_text <- function(text, style, indention = 0L) {
#' Format a document
-#' @keywords internal
+#' @noRd
formatting_reply <- function(id, uri, document, options) {
style <- get_style(options)
nline <- document$nline
@@ -79,7 +79,7 @@ formatting_reply <- function(id, uri, document, options) {
#' Format a part of a document
-#' @keywords internal
+#' @noRd
range_formatting_reply <- function(id, uri, document, range, options) {
row1 <- range$start$row
col1 <- range$start$col
@@ -122,7 +122,7 @@ range_formatting_reply <- function(id, uri, document, range, options) {
}
#' Format on type
-#' @keywords internal
+#' @noRd
on_type_formatting_reply <- function(id, uri, document, point, ch, options) {
content <- document$content
end_line <- point$row + 1
diff --git a/R/handlers-general.R b/R/handlers-general.R
index 5141beee..fe100a99 100644
--- a/R/handlers-general.R
+++ b/R/handlers-general.R
@@ -2,11 +2,11 @@
#'
#' Handler to the `initialize` [Request].
#'
-#' @keywords internal
+#' @noRd
on_initialize <- function(self, id, params) {
trace <- params$trace
if (!is.null(trace) && trace %in% c("messages", "verbose")) {
- logger$enable_debug()
+ lsp_settings$set("debug", TRUE)
}
logger$info("session: ", list(
@@ -36,7 +36,7 @@ on_initialize <- function(self, id, params) {
ServerCapabilities, self$ClientCapabilities)
server_capabilities <- merge_list(
server_capabilities,
- getOption("languageserver.server_capabilities"))
+ lsp_settings$get("server_capabilities"))
self$ServerCapabilities <- server_capabilities
self$deliver(Response$new(id = id, result = list(capabilities = server_capabilities)))
}
@@ -45,7 +45,7 @@ on_initialize <- function(self, id, params) {
#'
#' Handler to the `initialized` [Notification].
#'
-#' @keywords internal
+#' @noRd
on_initialized <- function(self, params) {
logger$info("on_initialized")
project_root <- self$rootPath
@@ -60,7 +60,7 @@ on_initialized <- function(self, params) {
#' `shutdown` request handler
#'
#' Handler to the `shutdown` [Request].
-#' @keywords internal
+#' @noRd
on_shutdown <- function(self, id, params) {
self$exit_flag <- TRUE
self$deliver(Response$new(id = id, result = list()))
@@ -70,7 +70,7 @@ on_shutdown <- function(self, id, params) {
#' `exit` notification handler
#'
#' Handler to the `exit` [Notification].
-#' @keywords internal
+#' @noRd
on_exit <- function(self, params) {
self$exit_flag <- TRUE
}
@@ -78,7 +78,7 @@ on_exit <- function(self, params) {
#' `cancel` request notification handler
#'
#' Handler to the `cancelRequest` [Notification].
-#' @keywords internal
+#' @noRd
cancel_request <- function(self, params) {
}
diff --git a/R/handlers-langfeatures.R b/R/handlers-langfeatures.R
index 5cf02734..9ad2abec 100644
--- a/R/handlers-langfeatures.R
+++ b/R/handlers-langfeatures.R
@@ -1,7 +1,7 @@
#' `textDocument/completion` request handler
#'
#' Handler to the `textDocument/completion` [Request].
-#' @keywords internal
+#' @noRd
text_document_completion <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -14,7 +14,7 @@ text_document_completion <- function(self, id, params) {
#' `completionItem/resolve` request handler
#'
#' Handler to the `completionItem/resolve` [Request].
-#' @keywords internal
+#' @noRd
completion_item_resolve <- function(self, id, params) {
self$deliver(completion_item_resolve_reply(
id, self$workspace, params))
@@ -24,7 +24,7 @@ completion_item_resolve <- function(self, id, params) {
#'
#' Handler to the `textDocument/hover` [Request].
#'
-#' @keywords internal
+#' @noRd
text_document_hover <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -37,7 +37,7 @@ text_document_hover <- function(self, id, params) {
#'
#' Handler to the `textDocument/signatureHelp` [Request].
#'
-#' @keywords internal
+#' @noRd
text_document_signature_help <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -49,7 +49,7 @@ text_document_signature_help <- function(self, id, params) {
#' `textDocument/definition` request handler
#'
#' Handler to the `textDocument/definition` [Request].
-#' @keywords internal
+#' @noRd
text_document_definition <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -63,7 +63,7 @@ text_document_definition <- function(self, id, params) {
#'
#' Handler to the `textDocument/typeDefinition` [Request].
#'
-#' @keywords internal
+#' @noRd
text_document_type_definition <- function(self, id, params) {
}
@@ -71,7 +71,7 @@ text_document_type_definition <- function(self, id, params) {
#' `textDocument/implementation` request handler
#'
#' Handler to the `textDocument/implementation` [Request].
-#' @keywords internal
+#' @noRd
text_document_implementation <- function(self, id, params) {
}
@@ -79,7 +79,7 @@ text_document_implementation <- function(self, id, params) {
#' `textDocument/references` request handler
#'
#' Handler to the `textDocument/references` [Request].
-#' @keywords internal
+#' @noRd
text_document_references <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -91,7 +91,7 @@ text_document_references <- function(self, id, params) {
#' `textDocument/documentHighlight` request handler
#'
#' Handler to the `textDocument/documentHighlight` [Request].
-#' @keywords internal
+#' @noRd
text_document_document_highlight <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -103,7 +103,7 @@ text_document_document_highlight <- function(self, id, params) {
#' `textDocument/documentSymbol` request handler
#'
#' Handler to the `textDocument/documentSymbol` [Request].
-#' @keywords internal
+#' @noRd
text_document_document_symbol <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -125,7 +125,7 @@ text_document_document_symbol <- function(self, id, params) {
#' `textDocument/codeAction` request handler
#'
#' Handler to the `textDocument/codeAction` [Request].
-#' @keywords internal
+#' @noRd
text_document_code_action <- function(self, id, params) {
}
@@ -133,7 +133,7 @@ text_document_code_action <- function(self, id, params) {
#' `textDocument/codeLens` request handler
#'
#' Handler to the `textDocument/codeLens` [Request].
-#' @keywords internal
+#' @noRd
text_document_code_lens <- function(self, id, params) {
}
@@ -141,7 +141,7 @@ text_document_code_lens <- function(self, id, params) {
#' `codeLens/resolve` request handler
#'
#' Handler to the `codeLens/resolve` [Request].
-#' @keywords internal
+#' @noRd
code_lens_resolve <- function(self, id, params) {
}
@@ -150,7 +150,7 @@ code_lens_resolve <- function(self, id, params) {
#' `textDocument/documentLink` request handler
#'
#' Handler to the `textDocument/documentLink` [Request].
-#' @keywords internal
+#' @noRd
text_document_document_link <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -172,7 +172,7 @@ text_document_document_link <- function(self, id, params) {
#' `documentLink/resolve` request handler
#'
#' Handler to the `documentLink/resolve` [Request].
-#' @keywords internal
+#' @noRd
document_link_resolve <- function(self, id, params) {
reply <- document_link_resolve_reply(id, self$workspace, params)
self$deliver(reply)
@@ -193,7 +193,7 @@ document_link_resolve <- function(self, id, params) {
#' `textDocument/documentColor` request handler
#'
#' Handler to the `textDocument/documentColor` [Request].
-#' @keywords internal
+#' @noRd
text_document_document_color <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -214,7 +214,7 @@ text_document_document_color <- function(self, id, params) {
#' `textDocument/colorPresentation` request handler
#'
#' Handler to the `textDocument/colorPresentation` [Request].
-#' @keywords internal
+#' @noRd
text_document_color_presentation <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -226,7 +226,7 @@ text_document_color_presentation <- function(self, id, params) {
#' `textDocument/formatting` request handler
#'
#' Handler to the `textDocument/formatting` [Request].
-#' @keywords internal
+#' @noRd
text_document_formatting <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -237,7 +237,7 @@ text_document_formatting <- function(self, id, params) {
#' `textDocument/rangeFormatting` request handler
#'
#' Handler to the `textDocument/rangeFormatting` [Request].
-#' @keywords internal
+#' @noRd
text_document_range_formatting <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -254,7 +254,7 @@ text_document_range_formatting <- function(self, id, params) {
#' `textDocument/onTypeFormatting` request handler
#'
#' Handler to the `textDocument/onTypeFormatting` [Request].
-#' @keywords internal
+#' @noRd
text_document_on_type_formatting <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -269,7 +269,7 @@ text_document_on_type_formatting <- function(self, id, params) {
#' `textDocument/rename` request handler
#'
#' Handler to the `textDocument/rename` [Request].
-#' @keywords internal
+#' @noRd
text_document_rename <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -282,7 +282,7 @@ text_document_rename <- function(self, id, params) {
#' `textDocument/prepareRename` request handler
#'
#' Handler to the `textDocument/prepareRename` [Request].
-#' @keywords internal
+#' @noRd
text_document_prepare_rename <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -294,7 +294,7 @@ text_document_prepare_rename <- function(self, id, params) {
#' `textDocument/foldingRange` request handler
#'
#' Handler to the `textDocument/foldingRange` [Request].
-#' @keywords internal
+#' @noRd
text_document_folding_range <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -315,7 +315,7 @@ text_document_folding_range <- function(self, id, params) {
#' `textDocument/selectionRange` request handler
#'
#' Handler to the `textDocument/selectionRange` [Request].
-#' @keywords internal
+#' @noRd
text_document_selection_range <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -327,7 +327,7 @@ text_document_selection_range <- function(self, id, params) {
#' `textDocument/prepareCallHierarchy` request handler
#'
#' Handler to the `textDocument/prepareCallHierarchy` [Request].
-#' @keywords internal
+#' @noRd
text_document_prepare_call_hierarchy <- function(self, id, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -339,7 +339,7 @@ text_document_prepare_call_hierarchy <- function(self, id, params) {
#' `callHierarchy/incomingCalls` request handler
#'
#' Handler to the `callHierarchy/incomingCalls` [Request].
-#' @keywords internal
+#' @noRd
call_hierarchy_incoming_calls <- function(self, id, params) {
self$deliver(
call_hierarchy_incoming_calls_reply(id, self$workspace, params$item)
@@ -349,7 +349,7 @@ call_hierarchy_incoming_calls <- function(self, id, params) {
#' `callHierarchy/outgoingCalls` request handler
#'
#' Handler to the `callHierarchy/outgoingCalls` [Request].
-#' @keywords internal
+#' @noRd
call_hierarchy_outgoing_calls <- function(self, id, params) {
self$deliver(
call_hierarchy_outgoing_calls_reply(id, self$workspace, params$item)
@@ -359,7 +359,7 @@ call_hierarchy_outgoing_calls <- function(self, id, params) {
#' `textDocument/linkedEditingRange` request handler
#'
#' Handler to the `textDocument/linkedEditingRange` [Request].
-#' @keywords internal
+#' @noRd
text_document_linked_editing_range <- function(self, id, params) {
}
diff --git a/R/handlers-protocol.R b/R/handlers-protocol.R
index 2fc5e3f8..b16ba0ff 100644
--- a/R/handlers-protocol.R
+++ b/R/handlers-protocol.R
@@ -1,8 +1,8 @@
protocol_set_trace <- function(self, id, params) {
value <- params$value
if (value == "off") {
- logger$disable_debug()
+ lsp_settings$set("debug", FALSE)
} else {
- logger$enable_debug()
+ lsp_settings$set("debug", TRUE)
}
}
diff --git a/R/handlers-textsync.R b/R/handlers-textsync.R
index 0dfdd7fa..57646a61 100644
--- a/R/handlers-textsync.R
+++ b/R/handlers-textsync.R
@@ -1,7 +1,7 @@
#' `textDocument/didOpen` notification handler
#'
#' Handler to the `textDocument/didOpen` [Notification].
-#' @keywords internal
+#' @noRd
text_document_did_open <- function(self, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -29,7 +29,7 @@ text_document_did_open <- function(self, params) {
#' `textDocument/didChange` notification handler
#'
#' Handler to the `textDocument/didChange` [Notification].
-#' @keywords internal
+#' @noRd
text_document_did_change <- function(self, params) {
textDocument <- params$textDocument
contentChanges <- params$contentChanges
@@ -51,7 +51,7 @@ text_document_did_change <- function(self, params) {
#' `textDocument/willSave` notification handler
#'
#' Handler to the `textDocument/willSave` [Notification].
-#' @keywords internal
+#' @noRd
text_document_will_save <- function(self, params) {
}
@@ -59,7 +59,7 @@ text_document_will_save <- function(self, params) {
#' `textDocument/didSave` notification handler
#'
#' Handler to the `textDocument/didSave` [Notification].
-#' @keywords internal
+#' @noRd
text_document_did_save <- function(self, params) {
textDocument <- params[["textDocument"]]
text <- params[["text"]]
@@ -86,7 +86,7 @@ text_document_did_save <- function(self, params) {
#' `textDocument/didClose` notification handler
#'
#' Handler to the `textDocument/didClose` [Notification].
-#' @keywords internal
+#' @noRd
text_document_did_close <- function(self, params) {
textDocument <- params$textDocument
uri <- uri_escape_unicode(textDocument$uri)
@@ -111,7 +111,7 @@ text_document_did_close <- function(self, params) {
#' `textDocument/willSaveWaitUntil` notification handler
#'
#' Handler to the `textDocument/willSaveWaitUntil` [Request].
-#' @keywords internal
+#' @noRd
text_document_will_save_wait_until <- function(self, id, params) {
}
diff --git a/R/handlers-workspace.R b/R/handlers-workspace.R
index 8e405087..8321dd8b 100644
--- a/R/handlers-workspace.R
+++ b/R/handlers-workspace.R
@@ -1,7 +1,7 @@
#' `workspace/didChangeWorkspaceFolders` notification handler
#'
#' Handler to the `workspace/didChangeWorkspaceFolders` [Notification].
-#' @keywords internal
+#' @noRd
workspace_did_change_workspace_folder_params <- function(self, params) {
}
@@ -9,7 +9,7 @@ workspace_did_change_workspace_folder_params <- function(self, params) {
#' `workspace/didChangeConfiguration` notification handler
#'
#' Handler to the `workspace/didChangeConfiguration` [Notification]
-#' @keywords internal
+#' @noRd
workspace_did_change_configuration <- function(self, params) {
settings <- params$settings
@@ -19,22 +19,13 @@ workspace_did_change_configuration <- function(self, params) {
logger$info("settings ", settings)
- debug <- settings$debug
- if (isTRUE(debug) || is.character(debug)) {
- log_file <- if (is.character(debug)) debug else NULL
- logger$enable_debug(file = log_file)
- }
-
- if (!is.null(settings$diagnostics) && !isTRUE(settings$diagnostics)) {
- logger$info("disable diagnostics")
- self$run_lintr <- FALSE
- }
+ lsp_settings$update_from_workspace(settings)
}
#' `workspace/didChangeWatchedFiles` notification handler
#'
#' Handler to the `workspace/didChangeWatchedFiles` [Notification].
-#' @keywords internal
+#' @noRd
workspace_did_change_watched_files <- function(self, params) {
}
@@ -42,7 +33,7 @@ workspace_did_change_watched_files <- function(self, params) {
#' `workspace/symbol` request handler
#'
#' Handler to the `workspace/symbol` [Request].
-#' @keywords internal
+#' @noRd
workspace_symbol <- function(self, id, params) {
self$deliver(workspace_symbol_reply(
id, self$workspace, params$query))
@@ -51,7 +42,7 @@ workspace_symbol <- function(self, id, params) {
#' `workspace/executeCommand` request handler
#'
#' Handler to the `workspace/executeCommand` [Request].
-#' @keywords internal
+#' @noRd
workspace_execute_command <- function(self, id, params) {
}
diff --git a/R/highlight.R b/R/highlight.R
index bd4586c9..395619d0 100644
--- a/R/highlight.R
+++ b/R/highlight.R
@@ -8,7 +8,7 @@ document_highlight_xpath <- "//*[(self::SYMBOL or self::SYMBOL_FUNCTION_CALL or
#' The response to a textDocument/documentHighlight Request
#'
-#' @keywords internal
+#' @noRd
document_highlight_reply <- function(id, uri, workspace, document, point) {
result <- NULL
xdoc <- workspace$get_parse_data(uri)$xml_doc
diff --git a/R/hover.R b/R/hover.R
index 3d5335f9..a134fa84 100644
--- a/R/hover.R
+++ b/R/hover.R
@@ -10,7 +10,7 @@ hover_xpath <- paste(
#'
#' When hovering on a symbol, if it is a function, return its help text
#' if it exists in the current [Workspace].
-#' @keywords internal
+#' @noRd
hover_reply <- function(id, uri, workspace, document, point) {
if (!check_scope(uri, document, point)) {
return(Response$new(id))
diff --git a/R/interfaces.R b/R/interfaces.R
index 81f63e82..349990c0 100644
--- a/R/interfaces.R
+++ b/R/interfaces.R
@@ -7,7 +7,7 @@
#'
#' @param line an integer
#' @param character an integer
-#' @keywords internal
+#' @noRd
position <- function(line, character) {
if (!is.numeric(line) | !is.numeric(character)) {
@@ -34,7 +34,7 @@ print.position <- function(x, start_char = "", ...) {
#'
#' @param start a [position]
#' @param end a [position]
-#' @keywords internal
+#' @noRd
range <- function(start, end) {
if (!inherits(start, "position") | !inherits(end, "position")) {
@@ -64,7 +64,7 @@ print.range <- function(x, start_char = "", ...) {
#'
#' @template uri
#' @param range a [range]
-#' @keywords internal
+#' @noRd
location <- function(uri, range) {
if (!inherits(range, "range")) {
@@ -97,7 +97,7 @@ print.location <- function(x, ...) {
#' A Uniform Resource Identifier as defined by [RFC 3986](https://tools.ietf.org/html/rfc3986).
#'
#' @param uri a character
-#' @keywords internal
+#' @noRd
document_uri <- function(uri) {
if (!is.character(uri)) {
@@ -119,7 +119,7 @@ print.document_uri <- function(x, start_char = "", ...) {
#' @param name a character
#' @param kind an integer
#' @param location a [location]
-#' @keywords internal
+#' @noRd
symbol_information <- function(name, kind, location) {
structure(
list(
@@ -133,7 +133,7 @@ symbol_information <- function(name, kind, location) {
#'
#' @param range a [range], the part of the document to replace
#' @param new_text a character, the text to replace
-#' @keywords internal
+#' @noRd
text_edit <- function(range, new_text) {
structure(
list(
@@ -148,7 +148,7 @@ text_edit <- function(range, new_text) {
#'
#' @template uri
#' @template position
-#' @keywords internal
+#' @noRd
text_document_position_params <- function(uri, position) {
structure(
list(
@@ -166,7 +166,7 @@ text_document_position_params <- function(uri, position) {
#' @template uri
#' @template position
#' @param context a named list
-#' @keywords internal
+#' @noRd
completion_params <- function(uri, position, context = NULL) {
structure(
list(
@@ -183,7 +183,7 @@ completion_params <- function(uri, position, context = NULL) {
#' @template uri
#' @template position
#' @param context a named list
-#' @keywords internal
+#' @noRd
reference_params <- function(uri, position, context = NULL) {
structure(
list(
@@ -198,7 +198,7 @@ reference_params <- function(uri, position, context = NULL) {
#' Parameters for document symbol requests
#'
#' @template uri
-#' @keywords internal
+#' @noRd
document_symbol_params <- function(uri) {
structure(
list(
@@ -213,7 +213,7 @@ document_symbol_params <- function(uri) {
#' @template uri
#' @param range a [range] object
#' @param context a named list
-#' @keywords internal
+#' @noRd
code_action_params <- function(uri, range, context = NULL) {
structure(
list(
@@ -228,7 +228,7 @@ code_action_params <- function(uri, range, context = NULL) {
#' Parameters for code lens requests
#'
#' @template uri
-#' @keywords internal
+#' @noRd
code_lens_params <- function(uri) {
structure(
list(
@@ -241,7 +241,7 @@ code_lens_params <- function(uri) {
#' Parameters for document link requests
#'
#' @template uri
-#' @keywords internal
+#' @noRd
document_link_params <- function(uri) {
structure(
list(
@@ -255,7 +255,7 @@ document_link_params <- function(uri) {
#'
#' @template uri
#' @param options a named list
-#' @keywords internal
+#' @noRd
document_formatting_params <- function(uri, options) {
structure(
list(
@@ -271,7 +271,7 @@ document_formatting_params <- function(uri, options) {
#' @template uri
#' @param range a [range] object
#' @param options a named list
-#' @keywords internal
+#' @noRd
document_range_formatting_params <- function(uri, range, options) {
structure(
list(
@@ -289,7 +289,7 @@ document_range_formatting_params <- function(uri, range, options) {
#' @template position
#' @param character a single character
#' @param options a named list
-#' @keywords internal
+#' @noRd
document_on_type_formatting_params <- function(uri, position, character, options) {
structure(
list(
@@ -307,7 +307,7 @@ document_on_type_formatting_params <- function(uri, position, character, options
#' @template uri
#' @template position
#' @param new_name a character
-#' @keywords internal
+#' @noRd
rename_params <- function(uri, position, new_name) {
structure(
list(
@@ -324,7 +324,7 @@ rename_params <- function(uri, position, new_name) {
#' Parameters for didOpen notifications
#'
#' @template uri
-#' @keywords internal
+#' @noRd
did_open_text_document_params <- function(uri) {
structure(
list(
@@ -338,7 +338,7 @@ did_open_text_document_params <- function(uri) {
#'
#' @template uri
#' @param changes a list of text_document_content_change_event
-#' @keywords internal
+#' @noRd
did_change_text_document_params <- function(uri, changes) {
structure(
list(
@@ -353,7 +353,7 @@ did_change_text_document_params <- function(uri, changes) {
#'
#' @template uri
#' @param reason an integer, see TextDocumentSaveReason
-#' @keywords internal
+#' @noRd
will_save_text_document_params <- function(uri, reason) {
structure(
list(
@@ -374,7 +374,7 @@ TextDocumentSaveReason <- list(
#'
#' @template uri
#' @param text a character
-#' @keywords internal
+#' @noRd
did_save_text_document_params <- function(uri, text) {
structure(
list(
@@ -388,7 +388,7 @@ did_save_text_document_params <- function(uri, text) {
#' Parameters for didClose notifications
#'
#' @template uri
-#' @keywords internal
+#' @noRd
did_close_text_document_params <- function(uri) {
structure(
list(
@@ -401,7 +401,7 @@ did_close_text_document_params <- function(uri) {
#' Parameters for workspace/didChangeConfiguration notifications
#'
#' @param settings a named list
-#' @keywords internal
+#' @noRd
did_change_configuration_params <- function(settings) {
structure(
settings,
diff --git a/R/languageclient.R b/R/languageclient.R
index 28927489..45ad3630 100644
--- a/R/languageclient.R
+++ b/R/languageclient.R
@@ -15,7 +15,7 @@ LanguageClient <- R6::R6Class("LanguageClient",
initialize = function(cmd = NULL, args = NULL) {
if (!is.null(cmd)) {
self$process <- processx::process$new(cmd, args,
- stdin = "|", stdout = "|", supervise = TRUE)
+ stdin = "|", stdout = "|")
}
self$diagnostics <- collections::dict()
super$initialize()
diff --git a/R/languageserver.R b/R/languageserver.R
index 9f9f3415..9a08db5a 100644
--- a/R/languageserver.R
+++ b/R/languageserver.R
@@ -8,7 +8,7 @@
#' The language server
#'
#' Describe the language server and how it interacts with clients.
-#' @keywords internal
+#' @noRd
LanguageServer <- R6::R6Class("LanguageServer",
inherit = LanguageBase,
public = list(
@@ -20,8 +20,6 @@ LanguageServer <- R6::R6Class("LanguageServer",
documents = NULL,
workspace = NULL,
- run_lintr = TRUE,
-
processId = NULL,
rootUri = NULL,
rootPath = NULL,
@@ -104,7 +102,7 @@ LanguageServer <- R6::R6Class("LanguageServer",
))
}
- if (run_lintr && self$run_lintr) {
+ if (run_lintr && lsp_settings$get("diagnostics")) {
temp_root <- dirname(tempdir())
if (path_has_parent(self$rootPath, temp_root) ||
!path_has_parent(path_from_uri(uri), temp_root)) {
@@ -249,9 +247,13 @@ LanguageServer$set("public", "register_handlers", function() {
run <- function(debug = FALSE, host = "localhost", port = NULL) {
tools::Rd2txt_options(underline_titles = FALSE)
tools::Rd2txt_options(itemBullet = "* ")
- if (isTRUE(debug) || is.character(debug)) {
- log_file <- if (is.character(debug)) debug else NULL
- logger$enable_debug(file = log_file)
+ lsp_settings$update_from_options()
+ if (isTRUE(debug)) {
+ lsp_settings$set("debug", TRUE)
+ lsp_settings$set("log_file", NULL)
+ } else if (is.character(debug)) {
+ lsp_settings$set("debug", TRUE)
+ lsp_settings$set("log_file", debug)
}
langserver <- LanguageServer$new(host, port)
langserver$run()
diff --git a/R/link.R b/R/link.R
index 02638fce..6a591a7e 100644
--- a/R/link.R
+++ b/R/link.R
@@ -1,6 +1,6 @@
#' The response to a textDocument/documentLink Request
#' @param rootPath Path of workspace folder
-#' @keywords internal
+#' @noRd
document_link_reply <- function(id, uri, workspace, document, rootPath) {
result <- NULL
@@ -55,7 +55,7 @@ document_link_resolve_reply <- function(id, workspace, params) {
path <- params$data$path
file_size <- file.size(path)
if (is.finite(file_size)) {
- link_file_size_limit <- getOption("languageserver.link_file_size_limit", 16 * 1024^2)
+ link_file_size_limit <- lsp_settings$get("link_file_size_limit")
if (file_size <= link_file_size_limit) {
params$target <- path_to_uri(path)
params$data <- NULL
diff --git a/R/log.R b/R/log.R
index 3a22bf60..d0602ba2 100644
--- a/R/log.R
+++ b/R/log.R
@@ -2,7 +2,7 @@
#'
#' @param ... anything
#'
-#' @keywords internal
+#' @noRd
to_string <- function(...) {
dots <- list(...)
if (length(dots) > 0) {
@@ -34,35 +34,27 @@ to_string <- function(...) {
#'
#' @param ... anything
#'
-#' @keywords internal
-log_write <- function(..., file = stderr()) {
+#' @noRd
+log_write <- function(..., log_file = NULL) {
+ if (is.null(log_file)) {
+ log_file <- stderr()
+ }
txt <- paste0("[", format(Sys.time(), "%Y-%m-%d %H:%M:%OS3"), "] ", to_string(...))
- writeLines(txt, file, sep = "", useBytes = TRUE)
+ # writeLines doesn't support `append`
+ # writeLines(txt, log_file, sep = "", useBytes = TRUE)
+ cat(txt, file = log_file, append = TRUE)
}
#' A basic logger class
#'
-#' @keywords internal
+#' @noRd
Logger <- R6::R6Class("Logger",
- private = list(
- debug = FALSE,
- file = stderr()
- ),
public = list(
- enable_debug = function(file = NULL) {
- private$debug <- TRUE
- if (!is.null(file)) {
- private$file <- file
- }
- },
- disable_debug = function() {
- private$debug <- FALSE
- },
error = function(...) {
- log_write(..., file = private$file)
+ log_write(..., log_file = lsp_settings$get("log_file"))
},
info = function(...) {
- if (private$debug) log_write(..., file = private$file)
+ if (lsp_settings$get("debug")) log_write(..., log_file = lsp_settings$get("log_file"))
}
)
)
diff --git a/R/namespace.R b/R/namespace.R
index ee558666..f5b665a7 100644
--- a/R/namespace.R
+++ b/R/namespace.R
@@ -1,5 +1,5 @@
#' A class for storing package information
-#' @keywords internal
+#' @noRd
PackageNamespace <- R6::R6Class("PackageNamespace",
private = list(
documentation = NULL,
@@ -176,7 +176,7 @@ PackageNamespace <- R6::R6Class("PackageNamespace",
WORKSPACE <- "_workspace_"
#' A class for storing global environment information
-#' @keywords internal
+#' @noRd
GlobalEnv <- R6::R6Class("GlobalEnv",
public = list(
documents = NULL,
diff --git a/R/protocol.R b/R/protocol.R
index 094b415b..8bc6f9c6 100644
--- a/R/protocol.R
+++ b/R/protocol.R
@@ -1,5 +1,5 @@
#' Base Message class
-#' @keywords internal
+#' @noRd
Message <- R6::R6Class("Message",
public = list(
jsonrpc = "2.0",
@@ -16,7 +16,7 @@ Message <- R6::R6Class("Message",
#' Request Message class
#'
#' Describe a request between the client and the server.
-#' @keywords internal
+#' @noRd
Request <- R6::R6Class("Request",
inherit = Message,
public = list(
@@ -44,7 +44,7 @@ Request <- R6::R6Class("Request",
#' Notification Message class
-#' @keywords internal
+#' @noRd
Notification <- R6::R6Class("Notification",
inherit = Message,
public = list(
@@ -70,7 +70,7 @@ Notification <- R6::R6Class("Notification",
#' Response Message class
#'
#' Message sent as the result of a [Request]
-#' @keywords internal
+#' @noRd
Response <- R6::R6Class("Response",
inherit = Message,
public = list(
@@ -114,7 +114,7 @@ ErrorCodes <- list(
#' Response Error Message class
#'
#' Message sent as the result of a [Request] in case of an error.
-#' @keywords internal
+#' @noRd
ResponseErrorMessage <- R6::R6Class(
"Response",
inherit = Response,
diff --git a/R/references.R b/R/references.R
index 97fd29d0..84e677f3 100644
--- a/R/references.R
+++ b/R/references.R
@@ -1,6 +1,6 @@
references_xpath <- "//*[(self::SYMBOL or self::SYMBOL_FUNCTION_CALL or self::SYMBOL_FORMALS) and text() = '{token_quote}']"
-#' @keywords internal
+#' @noRd
references_reply <- function(id, uri, workspace, document, point) {
token <- document$detect_token(point)
diff --git a/R/rename.R b/R/rename.R
index 51fea219..f247caa9 100644
--- a/R/rename.R
+++ b/R/rename.R
@@ -28,7 +28,7 @@ prepare_rename_reply <- function(id, uri, workspace, document, point) {
}
}
-#' @keywords internal
+#' @noRd
rename_reply <- function(id, uri, workspace, document, point, newName) {
refs <- references_reply(NULL, uri, workspace, document, point)
result <- list()
diff --git a/R/selection.R b/R/selection.R
index 191b717f..580a3f3e 100644
--- a/R/selection.R
+++ b/R/selection.R
@@ -1,6 +1,6 @@
#' The response to a textDocument/selectionRange Request
#'
-#' @keywords internal
+#' @noRd
selection_range_reply <- function(id, uri, workspace, document, points) {
result <- NULL
diff --git a/R/session.R b/R/session.R
index 3d05b71d..2c9765fe 100644
--- a/R/session.R
+++ b/R/session.R
@@ -36,7 +36,7 @@
#' # session will be restarted on error
#' # you can manually “kill” the process in bash to test this behavior
#' }
-#' @keywords internal
+#' @noRd
Session <- R6::R6Class("Session",
private = list(
# parent session poll - dependency injection
@@ -201,7 +201,7 @@ Session <- R6::R6Class("Session",
#' # please read R6 Class `Session` documentation
#'
#' }
-#' @keywords internal
+#' @noRd
SessionPool <- R6::R6Class("SessionPool",
private = list(
pool_name = NULL,
diff --git a/R/settings.R b/R/settings.R
new file mode 100644
index 00000000..961285dd
--- /dev/null
+++ b/R/settings.R
@@ -0,0 +1,52 @@
+Settings <- R6::R6Class("Settings",
+ private = list(
+ settings = list(
+ debug = FALSE,
+ log_file = NULL,
+ diagnostics = TRUE,
+ rich_documentation = TRUE,
+ snippet_support = TRUE,
+ max_completions = 200,
+ lint_cache = FALSE,
+ server_capabilities = list(),
+ link_file_size_limit = 16L * 1024L^2
+ )
+ ),
+ public = list(
+ update_from_options = function() {
+ # update default settings
+ for (key in names(private$settings)) {
+ prefixed_key <- paste0("languageserver.", key)
+ if (hasName(options(), prefixed_key)) {
+ value <- getOption(prefixed_key)
+ logger$info("Update setting", key, "to", value)
+ self$set(key, value)
+ }
+ }
+ },
+ update_from_workspace = function(settings) {
+ setting_keys <- names(settings)
+ for (key in setting_keys) {
+ prefixed_key <- paste0("languageserver.", key)
+ if (hasName(options(), prefixed_key)) {
+ logger$info("Setting", key, "is masked by options(...).")
+ } else {
+ self$set(key, settings[[key]])
+ }
+ }
+ },
+ get = function(key) {
+ return(private$settings[[key]])
+ },
+ set = function(key, value) {
+ private$settings[[key]] <- value
+ return(self)
+ }
+ )
+)
+
+
+# create the settings object
+# note that this object should not be used in sessions created by callr because
+# settings may be updated from the lsp configuration
+lsp_settings <- Settings$new()
diff --git a/R/signature.R b/R/signature.R
index 500f23d1..cb9db0fd 100644
--- a/R/signature.R
+++ b/R/signature.R
@@ -8,7 +8,7 @@ signature_xpath <- paste(
#' If the symbol at the current position is a function, return its arguments
#' (as with [base::args()]).
#'
-#' @keywords internal
+#' @noRd
signature_reply <- function(id, uri, workspace, document, point) {
if (!check_scope(uri, document, point)) {
diff --git a/R/symbol.R b/R/symbol.R
index 672c25c8..7b40e3d9 100644
--- a/R/symbol.R
+++ b/R/symbol.R
@@ -49,7 +49,7 @@ get_document_symbol_kind <- function(type) {
}
#' Get all the symbols in the document
-#' @keywords internal
+#' @noRd
document_symbol_reply <- function(id, uri, workspace, document, capabilities) {
parse_data <- workspace$get_parse_data(uri)
if (is.null(parse_data) ||
@@ -106,7 +106,7 @@ document_symbol_reply <- function(id, uri, workspace, document, capabilities) {
}
#' Get all the symbols in the workspace matching a query
-#' @keywords internal
+#' @noRd
workspace_symbol_reply <- function(id, workspace, query) {
defns <- workspace$get_definitions_for_query(query)
logger$info("workspace symbols found: ", length(defns))
diff --git a/R/task.R b/R/task.R
index 13f619c6..82cdafd6 100644
--- a/R/task.R
+++ b/R/task.R
@@ -155,4 +155,4 @@ create_task <- function(target, args, callback = NULL, error = NULL, delay = 0)
error = error,
delay = delay
)
-}
\ No newline at end of file
+}
diff --git a/R/utils.R b/R/utils.R
index f165c935..246dbfd3 100644
--- a/R/utils.R
+++ b/R/utils.R
@@ -1,6 +1,6 @@
#' Merge two lists
#'
-#' @keywords internal
+#' @noRd
merge_list <- function(x, y) {
x[names(y)] <- y
x
@@ -8,7 +8,7 @@ merge_list <- function(x, y) {
#' tryCatch with stack captured
#'
-#' @keywords internal
+#' @noRd
tryCatchStack <- function(expr, ...) {
expr <- substitute(expr)
env <- parent.frame()
@@ -88,7 +88,7 @@ uri_escape_unicode <- function(uri) {
}
#' Paths and uris
-#' @keywords internal
+#' @noRd
path_from_uri <- function(uri) {
if (length(uri) == 0) {
return(character())
@@ -103,7 +103,7 @@ path_from_uri <- function(uri) {
path
}
-#' @keywords internal
+#' @noRd
#' @rdname path_from_uri
path_to_uri <- function(path) {
if (length(path) == 0) {
@@ -148,7 +148,7 @@ equal_definition <- function(x, y) {
}
#' Check if a file is an RMarkdown file
-#' @keywords internal
+#' @noRd
is_rmarkdown <- function(uri) {
filename <- path_from_uri(uri)
endsWith(tolower(filename), ".rmd") || endsWith(tolower(filename), ".rmarkdown")
@@ -160,7 +160,7 @@ is_rmarkdown <- function(uri) {
#' in the text. This function will return `FALSE` if the token is in the text
#' and `TRUE` if it is in a code block. For any other files, it always returns `TRUE`.
#'
-#' @keywords internal
+#' @noRd
check_scope <- function(uri, document, point) {
if (is_rmarkdown(uri)) {
row <- point$row
@@ -191,14 +191,14 @@ fuzzy_find <- function(x, pattern) {
#' Safer version of `seq` which returns empty vector if b < a
-#' @keywords internal
+#' @noRd
seq_safe <- function(a, b) {
seq(a, b, length = max(0, b - a + 1))
}
#' Extract the R code blocks of a Rmarkdown file
-#' @keywords internal
+#' @noRd
extract_blocks <- function(content) {
begins_or_ends <- which(stringi::stri_detect_fixed(content, "```"))
begins <- which(stringi::stri_detect_regex(content, "```+\\s*\\{[rR][ ,\\}]"))
@@ -368,7 +368,7 @@ get_document_sections <- function(uri, document,
#' Strip out all the non R blocks in a R markdown file
#' @param content a character vector
-#' @keywords internal
+#' @noRd
purl <- function(content) {
blocks <- extract_blocks(content)
rmd_content <- rep("", length(content))
@@ -380,7 +380,7 @@ purl <- function(content) {
#' Calculate character offset based on the protocol
-#' @keywords internal
+#' @noRd
ncodeunit <- function(s) {
lengths(iconv(s, from = "UTF-8", to = "UTF-16BE", toRaw = TRUE)) / 2
}
@@ -391,7 +391,7 @@ ncodeunit <- function(s) {
#' @param line a character of text
#' @param units 0-indexed code points
#'
-#' @keywords internal
+#' @noRd
code_point_from_unit <- function(line, units) {
if (!nzchar(line)) return(units)
offsets <- cumsum(ncodeunit(strsplit(line, "")[[1]]))
@@ -408,7 +408,7 @@ code_point_from_unit <- function(line, units) {
#' @param line a character of text
#' @param units 0-indexed code units
#'
-#' @keywords internal
+#' @noRd
code_point_to_unit <- function(line, pts) {
if (!nzchar(line)) return(pts)
offsets <- c(0, cumsum(ncodeunit(strsplit(line, "")[[1]])))
@@ -422,7 +422,7 @@ code_point_to_unit <- function(line, pts) {
#' Check if a path is a directory
-#' @keywords internal
+#' @noRd
is_directory <- function(path) {
is_dir <- file.info(path)$isdir
!is.na(is_dir) && is_dir
@@ -433,7 +433,7 @@ is_directory <- function(path) {
#' This function searches backwards in the folder structure until it finds
#' a DESCRIPTION file or it reaches the top-level directory.
#'
-#' @keywords internal
+#' @noRd
find_package <- function(path = getwd()) {
start_path <- getwd()
on.exit(setwd(start_path))
@@ -456,7 +456,7 @@ find_package <- function(path = getwd()) {
#'
#' @param rootPath a character representing a path
#'
-#' @keywords internal
+#' @noRd
is_package <- function(rootPath) {
file <- file.path(rootPath, "DESCRIPTION")
file.exists(file) && !dir.exists(file)
@@ -464,21 +464,21 @@ is_package <- function(rootPath) {
#' read a character from stdin
#'
-#' @keywords internal
+#' @noRd
stdin_read_char <- function(n) {
.Call("stdin_read_char", PACKAGE = "languageserver", n)
}
#' read a line from stdin
#'
-#' @keywords internal
+#' @noRd
stdin_read_line <- function() {
.Call("stdin_read_line", PACKAGE = "languageserver")
}
#' check if the current process becomes an orphan
#'
-#' @keywords internal
+#' @noRd
process_is_detached <- function() {
.Call("process_is_detached", PACKAGE = "languageserver")
}
@@ -491,7 +491,7 @@ process_is_detached <- function() {
#' @param fun the function to execute
#' @param t an integer, the threshold in seconds
#'
-#' @keywords internal
+#' @noRd
throttle <- function(fun, t = 1) {
last_execution_time <- 0
function(...) {
@@ -506,7 +506,7 @@ throttle <- function(fun, t = 1) {
#'
#' Remove unwanted objects, _e.g._ `names<-`, `%>%`, `.__C_` etc.
#'
-#' @keywords internal
+#' @noRd
sanitize_names <- function(objects) {
objects[stringi::stri_detect_regex(objects, "^([^\\W_]|\\.(?!_))(\\w|\\.)*$")]
}
diff --git a/R/workspace.R b/R/workspace.R
index 1e0f756e..05ddf3d7 100644
--- a/R/workspace.R
+++ b/R/workspace.R
@@ -5,7 +5,7 @@ startup_packages <- c("base", "methods", "datasets", "utils", "grDevices", "grap
#' A `Workspace` is initialized at the start of a session, when the language
#' server is started. Its goal is to contain the `Namespace`s of the packages
#' that are loaded during the session for quick reference.
-#' @keywords internal
+#' @noRd
Workspace <- R6::R6Class("Workspace",
public = list(
root = NULL,
@@ -154,8 +154,9 @@ Workspace <- R6::R6Class("Workspace",
} else {
result <- NULL
- if (requireNamespace("rmarkdown", quietly = TRUE) &&
- rmarkdown::pandoc_available()) {
+ if (lsp_settings$get("rich_documentation") &&
+ requireNamespace("rmarkdown", quietly = TRUE) &&
+ rmarkdown::pandoc_available()) {
html <- enc2utf8(repr::repr_html(hfile))
# Make header look prettier:
pattern <- "
(.*?)\\s*{(.*?)}<\\/td>.*?<\\/table>\\n*\\s*(.*?)\\s*<\\/h2>"
diff --git a/README.md b/README.md
index 04fda2f6..eca54f6b 100644
--- a/README.md
+++ b/README.md
@@ -109,22 +109,27 @@ These editors are supported by installing the corresponding package.
## Settings
-`languageserver` exposes the following settings via `workspace/didChangeConfiguration`
+`languageserver` exposes the following settings via LSP configuration.
+
+settings | default | description
+---- | ----- | -----
+`debug` | `false` | increase verbosity for debug purpose
+`log_file` | `nil` | file to log debug messages, fallback to stderr if empty
+`diagnostics` | `true` | enable file diagnostics via [lintr](https://github.com/jimhester/lintr)
+`rich_documentation` | `true` | rich documentation with enhanced markdown features
+`snippet_support` | `true` | enable snippets in auto completion
+`max_completions` | 200 | maximum number of completion items
+`lint_cache` | `true` | toggle caching of lint results
+`server_capabilities` | `{}` | override server capabilities defined in [capabilities.R](https://github.com/REditorSupport/languageserver/blob/master/R/capabilities.R). See FAQ below.
+`link_file_size_limit` | 16384 | maximum file size (in bytes) that supports document links
+
+These settings could also specified in `.Rprofile` file via `options(languageserver. = )`. For example,
-```json
-{
- "r.lsp.debug": {
- "type": "boolean",
- "default": false,
- "description": "Debug R Language Server"
- },
- "r.lsp.diagnostics": {
- "type": "boolean",
- "default": true,
- "description": "Enable Diagnostics"
- }
-}
+```r
+options(languageserver.snippet_support = FALSE)
```
+will turn off snippet support globally. LSP configuration settings are always overriden by `options()`.
+
## FAQ
@@ -134,9 +139,17 @@ With [lintr](https://github.com/jimhester/lintr) v2.0.0, the linters can be spec
### Customizing server capbabilities
-Server capabilities are defined in [capabilities.R](https://github.com/REditorSupport/languageserver/blob/master/R/capabilities.R). Users could override the settings by specifiying `languageserver.server_capabilities` option in `.Rprofile`. For example,
-the following code will turn off `definitionProvider`,
-
+Server capabilities are defined in
+[capabilities.R](https://github.com/REditorSupport/languageserver/blob/master/R/capabilities.R).
+Users could override the capabilities by specifying the LSP configuration setting
+`server_capabilities` or
+`options(languageserver.server_capabilities)` in `.Rprofile`. For example, to turn off `definitionProvider`, one could either use LSP configuration
+```json
+"server_capabilities": {
+ "definitionProvider": false
+}
+```
+or R options
```r
options(
languageserver.server_capabilities = list(
@@ -145,8 +158,6 @@ options(
)
```
-Please only use this option to disable providers and do not enable any providers that have not been implemented. Changing any other entries may cause unexpected behaviors on the server.
-
### Customizing formatting style
The language server uses [`styler`](https://github.com/r-lib/styler) to perform code formatting. It uses `styler::tidyverse_style(indent_by = options$tabSize)` as the default style where `options` is the [formatting
diff --git a/man/GlobalEnv.Rd b/man/GlobalEnv.Rd
deleted file mode 100644
index c65db514..00000000
--- a/man/GlobalEnv.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/namespace.R
-\name{GlobalEnv}
-\alias{GlobalEnv}
-\title{A class for storing global environment information}
-\description{
-A class for storing global environment information
-}
-\keyword{internal}
diff --git a/man/LanguageServer.Rd b/man/LanguageServer.Rd
deleted file mode 100644
index 3f4ef8f7..00000000
--- a/man/LanguageServer.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/languageserver.R
-\name{LanguageServer}
-\alias{LanguageServer}
-\title{The language server}
-\description{
-Describe the language server and how it interacts with clients.
-}
-\keyword{internal}
diff --git a/man/Logger.Rd b/man/Logger.Rd
deleted file mode 100644
index 12da3282..00000000
--- a/man/Logger.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/log.R
-\name{Logger}
-\alias{Logger}
-\title{A basic logger class}
-\description{
-A basic logger class
-}
-\keyword{internal}
diff --git a/man/Message.Rd b/man/Message.Rd
deleted file mode 100644
index ada6dff6..00000000
--- a/man/Message.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/protocol.R
-\name{Message}
-\alias{Message}
-\title{Base Message class}
-\description{
-Base Message class
-}
-\keyword{internal}
diff --git a/man/Notification.Rd b/man/Notification.Rd
deleted file mode 100644
index 268900ab..00000000
--- a/man/Notification.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/protocol.R
-\name{Notification}
-\alias{Notification}
-\title{Notification Message class}
-\description{
-Notification Message class
-}
-\keyword{internal}
diff --git a/man/PackageNamespace.Rd b/man/PackageNamespace.Rd
deleted file mode 100644
index 6b55c40c..00000000
--- a/man/PackageNamespace.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/namespace.R
-\name{PackageNamespace}
-\alias{PackageNamespace}
-\title{A class for storing package information}
-\description{
-A class for storing package information
-}
-\keyword{internal}
diff --git a/man/Request.Rd b/man/Request.Rd
deleted file mode 100644
index d4ab7143..00000000
--- a/man/Request.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/protocol.R
-\name{Request}
-\alias{Request}
-\title{Request Message class}
-\description{
-Describe a request between the client and the server.
-}
-\keyword{internal}
diff --git a/man/Response.Rd b/man/Response.Rd
deleted file mode 100644
index 155c7bd5..00000000
--- a/man/Response.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/protocol.R
-\name{Response}
-\alias{Response}
-\title{Response Message class}
-\description{
-Message sent as the result of a \link{Request}
-}
-\keyword{internal}
diff --git a/man/ResponseErrorMessage.Rd b/man/ResponseErrorMessage.Rd
deleted file mode 100644
index d210b7e9..00000000
--- a/man/ResponseErrorMessage.Rd
+++ /dev/null
@@ -1,9 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/protocol.R
-\name{ResponseErrorMessage}
-\alias{ResponseErrorMessage}
-\title{Response Error Message class}
-\description{
-Message sent as the result of a \link{Request} in case of an error.
-}
-\keyword{internal}
diff --git a/man/Session.Rd b/man/Session.Rd
deleted file mode 100644
index 5513a577..00000000
--- a/man/Session.Rd
+++ /dev/null
@@ -1,46 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/session.R
-\name{Session}
-\alias{Session}
-\title{Single R Session for Session Pool}
-\description{
-Single R Session for Session Pool
-}
-\examples{
-\dontrun{
-# create a session and bind to a session pool
-# this step is done in SessionPool$new()
-session <- Session$new("session id", parent_pool_ptr, pool_name)
-
-# task acquire a session from session pool
-# this step is done in SessionPool$acquire()
-
-# start task
-session$start(target, args)
-
-# check session result with is_alive
-session$is_alive()
-
-# when task is running
-session$is_alive() == TRUE
-
-# when task is done
-session$is_alive() == FALSE
-
-# get result when task is done
-session$get_result()
-
-# session must be released when task is done
-session$release()
-
-#' # use restart() to restart session
-session$restart()
-
-# use kill() to restart and release session
-session$kill()
-
-# session will be restarted on error
-# you can manually “kill” the process in bash to test this behavior
-}
-}
-\keyword{internal}
diff --git a/man/SessionPool.Rd b/man/SessionPool.Rd
deleted file mode 100644
index d4ba4ab3..00000000
--- a/man/SessionPool.Rd
+++ /dev/null
@@ -1,30 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/session.R
-\name{SessionPool}
-\alias{SessionPool}
-\title{Session Pool with Many R Sessions}
-\description{
-Session Pool with Many R Sessions
-}
-\examples{
-\dontrun{
-# create 3 cached r sessions in the pool
-pool_size <- 3
-pool_name <- "common"
-pool <- SessionPool$new(pool_size, pool_name)
-
-# check idle_size before acquiring session
-n <- pool$get_idle_size()
-
-# if there are idle sessions, acquire session
-session <- pool$acquire()
-
-# check session is not null and then use session
-is.null(session)
-
-# use session
-# please read R6 Class `Session` documentation
-
-}
-}
-\keyword{internal}
diff --git a/man/Workspace.Rd b/man/Workspace.Rd
deleted file mode 100644
index 10c2be22..00000000
--- a/man/Workspace.Rd
+++ /dev/null
@@ -1,11 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/workspace.R
-\name{Workspace}
-\alias{Workspace}
-\title{A data structure for a session workspace}
-\description{
-A \code{Workspace} is initialized at the start of a session, when the language
-server is started. Its goal is to contain the \code{Namespace}s of the packages
-that are loaded during the session for quick reference.
-}
-\keyword{internal}
diff --git a/man/arg_completion.Rd b/man/arg_completion.Rd
deleted file mode 100644
index 64bb7815..00000000
--- a/man/arg_completion.Rd
+++ /dev/null
@@ -1,20 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/completion.R
-\name{arg_completion}
-\alias{arg_completion}
-\title{Complete a function argument}
-\usage{
-arg_completion(
- uri,
- workspace,
- point,
- token,
- funct,
- package = NULL,
- exported_only = TRUE
-)
-}
-\description{
-Complete a function argument
-}
-\keyword{internal}
diff --git a/man/call_hierarchy_incoming_calls.Rd b/man/call_hierarchy_incoming_calls.Rd
deleted file mode 100644
index 58ac97fd..00000000
--- a/man/call_hierarchy_incoming_calls.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{call_hierarchy_incoming_calls}
-\alias{call_hierarchy_incoming_calls}
-\title{\code{callHierarchy/incomingCalls} request handler}
-\usage{
-call_hierarchy_incoming_calls(self, id, params)
-}
-\description{
-Handler to the \code{callHierarchy/incomingCalls} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/call_hierarchy_outgoing_calls.Rd b/man/call_hierarchy_outgoing_calls.Rd
deleted file mode 100644
index e5d7c352..00000000
--- a/man/call_hierarchy_outgoing_calls.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{call_hierarchy_outgoing_calls}
-\alias{call_hierarchy_outgoing_calls}
-\title{\code{callHierarchy/outgoingCalls} request handler}
-\usage{
-call_hierarchy_outgoing_calls(self, id, params)
-}
-\description{
-Handler to the \code{callHierarchy/outgoingCalls} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/cancel_request.Rd b/man/cancel_request.Rd
deleted file mode 100644
index da3020ae..00000000
--- a/man/cancel_request.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-general.R
-\name{cancel_request}
-\alias{cancel_request}
-\title{\code{cancel} request notification handler}
-\usage{
-cancel_request(self, params)
-}
-\description{
-Handler to the \code{cancelRequest} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/check_scope.Rd b/man/check_scope.Rd
deleted file mode 100644
index e40765a2..00000000
--- a/man/check_scope.Rd
+++ /dev/null
@@ -1,14 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{check_scope}
-\alias{check_scope}
-\title{Check if a token is in a R code block in an Rmarkdown file}
-\usage{
-check_scope(uri, document, point)
-}
-\description{
-In an RMarkdown document, tokens can be either inside an R code block or
-in the text. This function will return \code{FALSE} if the token is in the text
-and \code{TRUE} if it is in a code block. For any other files, it always returns \code{TRUE}.
-}
-\keyword{internal}
diff --git a/man/code_action_params.Rd b/man/code_action_params.Rd
deleted file mode 100644
index 5ace9ac9..00000000
--- a/man/code_action_params.Rd
+++ /dev/null
@@ -1,19 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{code_action_params}
-\alias{code_action_params}
-\title{Parameters for code action requests}
-\usage{
-code_action_params(uri, range, context = NULL)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{range}{a \link{range} object}
-
-\item{context}{a named list}
-}
-\description{
-Parameters for code action requests
-}
-\keyword{internal}
diff --git a/man/code_lens_params.Rd b/man/code_lens_params.Rd
deleted file mode 100644
index 6d32c32d..00000000
--- a/man/code_lens_params.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{code_lens_params}
-\alias{code_lens_params}
-\title{Parameters for code lens requests}
-\usage{
-code_lens_params(uri)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-}
-\description{
-Parameters for code lens requests
-}
-\keyword{internal}
diff --git a/man/code_lens_resolve.Rd b/man/code_lens_resolve.Rd
deleted file mode 100644
index b3385bb1..00000000
--- a/man/code_lens_resolve.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{code_lens_resolve}
-\alias{code_lens_resolve}
-\title{\code{codeLens/resolve} request handler}
-\usage{
-code_lens_resolve(self, id, params)
-}
-\description{
-Handler to the \code{codeLens/resolve} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/code_point_from_unit.Rd b/man/code_point_from_unit.Rd
deleted file mode 100644
index b74217c3..00000000
--- a/man/code_point_from_unit.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{code_point_from_unit}
-\alias{code_point_from_unit}
-\title{Determine code points given code units}
-\usage{
-code_point_from_unit(line, units)
-}
-\arguments{
-\item{line}{a character of text}
-
-\item{units}{0-indexed code points}
-}
-\description{
-Determine code points given code units
-}
-\keyword{internal}
diff --git a/man/code_point_to_unit.Rd b/man/code_point_to_unit.Rd
deleted file mode 100644
index 36499f03..00000000
--- a/man/code_point_to_unit.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{code_point_to_unit}
-\alias{code_point_to_unit}
-\title{Determine code units given code points}
-\usage{
-code_point_to_unit(line, pts)
-}
-\arguments{
-\item{line}{a character of text}
-
-\item{units}{0-indexed code units}
-}
-\description{
-Determine code units given code points
-}
-\keyword{internal}
diff --git a/man/color_presentation_reply.Rd b/man/color_presentation_reply.Rd
deleted file mode 100644
index f479acb6..00000000
--- a/man/color_presentation_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/color.R
-\name{color_presentation_reply}
-\alias{color_presentation_reply}
-\title{The response to a textDocument/colorPresentation Request}
-\usage{
-color_presentation_reply(id, uri, workspace, document, color)
-}
-\description{
-The response to a textDocument/colorPresentation Request
-}
-\keyword{internal}
diff --git a/man/completion_item_resolve.Rd b/man/completion_item_resolve.Rd
deleted file mode 100644
index eeb7c83d..00000000
--- a/man/completion_item_resolve.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{completion_item_resolve}
-\alias{completion_item_resolve}
-\title{\code{completionItem/resolve} request handler}
-\usage{
-completion_item_resolve(self, id, params)
-}
-\description{
-Handler to the \code{completionItem/resolve} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/completion_item_resolve_reply.Rd b/man/completion_item_resolve_reply.Rd
deleted file mode 100644
index 24cafee3..00000000
--- a/man/completion_item_resolve_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/completion.R
-\name{completion_item_resolve_reply}
-\alias{completion_item_resolve_reply}
-\title{The response to a completionItem/resolve request}
-\usage{
-completion_item_resolve_reply(id, workspace, params)
-}
-\description{
-The response to a completionItem/resolve request
-}
-\keyword{internal}
diff --git a/man/completion_params.Rd b/man/completion_params.Rd
deleted file mode 100644
index d7d6ae5f..00000000
--- a/man/completion_params.Rd
+++ /dev/null
@@ -1,19 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{completion_params}
-\alias{completion_params}
-\title{Parameters for completion requests}
-\usage{
-completion_params(uri, position, context = NULL)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{position}{a \link{position} object}
-
-\item{context}{a named list}
-}
-\description{
-Parameters for completion requests
-}
-\keyword{internal}
diff --git a/man/completion_reply.Rd b/man/completion_reply.Rd
deleted file mode 100644
index 297eeebb..00000000
--- a/man/completion_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/completion.R
-\name{completion_reply}
-\alias{completion_reply}
-\title{The response to a textDocument/completion request}
-\usage{
-completion_reply(id, uri, workspace, document, point, capabilities)
-}
-\description{
-The response to a textDocument/completion request
-}
-\keyword{internal}
diff --git a/man/constant_completion.Rd b/man/constant_completion.Rd
deleted file mode 100644
index 52e13109..00000000
--- a/man/constant_completion.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/completion.R
-\name{constant_completion}
-\alias{constant_completion}
-\title{Complete language constants}
-\usage{
-constant_completion(token)
-}
-\description{
-Complete language constants
-}
-\keyword{internal}
diff --git a/man/definition_reply.Rd b/man/definition_reply.Rd
deleted file mode 100644
index 4e7b904f..00000000
--- a/man/definition_reply.Rd
+++ /dev/null
@@ -1,14 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/definition.R
-\name{definition_reply}
-\alias{definition_reply}
-\title{Get the location of a specified function definition}
-\usage{
-definition_reply(id, uri, workspace, document, point, rootPath)
-}
-\description{
-If the function is not found in a file but is found in a loaded package,
-writes the function definition to a temporary file and returns that
-as the location.
-}
-\keyword{internal}
diff --git a/man/diagnose_file.Rd b/man/diagnose_file.Rd
deleted file mode 100644
index 183d9869..00000000
--- a/man/diagnose_file.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/diagnostics.R
-\name{diagnose_file}
-\alias{diagnose_file}
-\title{Run diagnostic on a file}
-\usage{
-diagnose_file(uri, content)
-}
-\description{
-Lint and diagnose problems in a file.
-}
-\keyword{internal}
diff --git a/man/diagnostics.Rd b/man/diagnostics.Rd
index c0722b75..e538bc9a 100644
--- a/man/diagnostics.Rd
+++ b/man/diagnostics.Rd
@@ -2,18 +2,7 @@
% Please edit documentation in R/diagnostics.R
\name{diagnostics}
\alias{diagnostics}
-\alias{diagnostic_range}
-\alias{diagnostic_severity}
-\alias{diagnostic_from_lint}
\title{diagnostics}
-\usage{
-diagnostic_range(result, content)
-
-diagnostic_severity(result)
-
-diagnostic_from_lint(result, content)
-}
\description{
Diagnose problems in files after linting.
}
-\keyword{internal}
diff --git a/man/did_change_configuration_params.Rd b/man/did_change_configuration_params.Rd
deleted file mode 100644
index 1adb4854..00000000
--- a/man/did_change_configuration_params.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{did_change_configuration_params}
-\alias{did_change_configuration_params}
-\title{Parameters for workspace/didChangeConfiguration notifications}
-\usage{
-did_change_configuration_params(settings)
-}
-\arguments{
-\item{settings}{a named list}
-}
-\description{
-Parameters for workspace/didChangeConfiguration notifications
-}
-\keyword{internal}
diff --git a/man/did_change_text_document_params.Rd b/man/did_change_text_document_params.Rd
deleted file mode 100644
index 79b5abfa..00000000
--- a/man/did_change_text_document_params.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{did_change_text_document_params}
-\alias{did_change_text_document_params}
-\title{Parameters for didChange notifications}
-\usage{
-did_change_text_document_params(uri, changes)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{changes}{a list of text_document_content_change_event}
-}
-\description{
-Parameters for didChange notifications
-}
-\keyword{internal}
diff --git a/man/did_close_text_document_params.Rd b/man/did_close_text_document_params.Rd
deleted file mode 100644
index c0293574..00000000
--- a/man/did_close_text_document_params.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{did_close_text_document_params}
-\alias{did_close_text_document_params}
-\title{Parameters for didClose notifications}
-\usage{
-did_close_text_document_params(uri)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-}
-\description{
-Parameters for didClose notifications
-}
-\keyword{internal}
diff --git a/man/did_open_text_document_params.Rd b/man/did_open_text_document_params.Rd
deleted file mode 100644
index e214f9db..00000000
--- a/man/did_open_text_document_params.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{did_open_text_document_params}
-\alias{did_open_text_document_params}
-\title{Parameters for didOpen notifications}
-\usage{
-did_open_text_document_params(uri)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-}
-\description{
-Parameters for didOpen notifications
-}
-\keyword{internal}
diff --git a/man/did_save_text_document_params.Rd b/man/did_save_text_document_params.Rd
deleted file mode 100644
index 3f28c35b..00000000
--- a/man/did_save_text_document_params.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{did_save_text_document_params}
-\alias{did_save_text_document_params}
-\title{Parameters for didSave notifications}
-\usage{
-did_save_text_document_params(uri, text)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{text}{a character}
-}
-\description{
-Parameters for didSave notifications
-}
-\keyword{internal}
diff --git a/man/document_color_reply.Rd b/man/document_color_reply.Rd
deleted file mode 100644
index db2d1977..00000000
--- a/man/document_color_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/color.R
-\name{document_color_reply}
-\alias{document_color_reply}
-\title{The response to a textDocument/documentColor Request}
-\usage{
-document_color_reply(id, uri, workspace, document)
-}
-\description{
-The response to a textDocument/documentColor Request
-}
-\keyword{internal}
diff --git a/man/document_folding_range_reply.Rd b/man/document_folding_range_reply.Rd
deleted file mode 100644
index 09279d18..00000000
--- a/man/document_folding_range_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/folding.R
-\name{document_folding_range_reply}
-\alias{document_folding_range_reply}
-\title{Get all the folding ranges in the document}
-\usage{
-document_folding_range_reply(id, uri, workspace, document)
-}
-\description{
-Get all the folding ranges in the document
-}
-\keyword{internal}
diff --git a/man/document_formatting_params.Rd b/man/document_formatting_params.Rd
deleted file mode 100644
index 23d2f99b..00000000
--- a/man/document_formatting_params.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{document_formatting_params}
-\alias{document_formatting_params}
-\title{Parameters for document formatting requests}
-\usage{
-document_formatting_params(uri, options)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{options}{a named list}
-}
-\description{
-Parameters for document formatting requests
-}
-\keyword{internal}
diff --git a/man/document_highlight_reply.Rd b/man/document_highlight_reply.Rd
deleted file mode 100644
index f5cedafb..00000000
--- a/man/document_highlight_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/highlight.R
-\name{document_highlight_reply}
-\alias{document_highlight_reply}
-\title{The response to a textDocument/documentHighlight Request}
-\usage{
-document_highlight_reply(id, uri, workspace, document, point)
-}
-\description{
-The response to a textDocument/documentHighlight Request
-}
-\keyword{internal}
diff --git a/man/document_link_params.Rd b/man/document_link_params.Rd
deleted file mode 100644
index 8a6263af..00000000
--- a/man/document_link_params.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{document_link_params}
-\alias{document_link_params}
-\title{Parameters for document link requests}
-\usage{
-document_link_params(uri)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-}
-\description{
-Parameters for document link requests
-}
-\keyword{internal}
diff --git a/man/document_link_reply.Rd b/man/document_link_reply.Rd
deleted file mode 100644
index d1481ed1..00000000
--- a/man/document_link_reply.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/link.R
-\name{document_link_reply}
-\alias{document_link_reply}
-\title{The response to a textDocument/documentLink Request}
-\usage{
-document_link_reply(id, uri, workspace, document, rootPath)
-}
-\arguments{
-\item{rootPath}{Path of workspace folder}
-}
-\description{
-The response to a textDocument/documentLink Request
-}
-\keyword{internal}
diff --git a/man/document_link_resolve.Rd b/man/document_link_resolve.Rd
deleted file mode 100644
index 7397af23..00000000
--- a/man/document_link_resolve.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{document_link_resolve}
-\alias{document_link_resolve}
-\title{\code{documentLink/resolve} request handler}
-\usage{
-document_link_resolve(self, id, params)
-}
-\description{
-Handler to the \code{documentLink/resolve} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/document_on_type_formatting_params.Rd b/man/document_on_type_formatting_params.Rd
deleted file mode 100644
index 8f3c604f..00000000
--- a/man/document_on_type_formatting_params.Rd
+++ /dev/null
@@ -1,21 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{document_on_type_formatting_params}
-\alias{document_on_type_formatting_params}
-\title{Parameters for document on type formatting requests}
-\usage{
-document_on_type_formatting_params(uri, position, character, options)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{position}{a \link{position} object}
-
-\item{character}{a single character}
-
-\item{options}{a named list}
-}
-\description{
-Parameters for document on type formatting requests
-}
-\keyword{internal}
diff --git a/man/document_range_formatting_params.Rd b/man/document_range_formatting_params.Rd
deleted file mode 100644
index 28b7d796..00000000
--- a/man/document_range_formatting_params.Rd
+++ /dev/null
@@ -1,19 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{document_range_formatting_params}
-\alias{document_range_formatting_params}
-\title{Parameters for document range formatting requests}
-\usage{
-document_range_formatting_params(uri, range, options)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{range}{a \link{range} object}
-
-\item{options}{a named list}
-}
-\description{
-Parameters for document range formatting requests
-}
-\keyword{internal}
diff --git a/man/document_symbol_params.Rd b/man/document_symbol_params.Rd
deleted file mode 100644
index 2cba437c..00000000
--- a/man/document_symbol_params.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{document_symbol_params}
-\alias{document_symbol_params}
-\title{Parameters for document symbol requests}
-\usage{
-document_symbol_params(uri)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-}
-\description{
-Parameters for document symbol requests
-}
-\keyword{internal}
diff --git a/man/document_symbol_reply.Rd b/man/document_symbol_reply.Rd
deleted file mode 100644
index ed1be8bd..00000000
--- a/man/document_symbol_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/symbol.R
-\name{document_symbol_reply}
-\alias{document_symbol_reply}
-\title{Get all the symbols in the document}
-\usage{
-document_symbol_reply(id, uri, workspace, document, capabilities)
-}
-\description{
-Get all the symbols in the document
-}
-\keyword{internal}
diff --git a/man/document_uri.Rd b/man/document_uri.Rd
deleted file mode 100644
index 930a896d..00000000
--- a/man/document_uri.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{document_uri}
-\alias{document_uri}
-\title{A document URI}
-\usage{
-document_uri(uri)
-}
-\arguments{
-\item{uri}{a character}
-}
-\description{
-A Uniform Resource Identifier as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}.
-}
-\keyword{internal}
diff --git a/man/enclosed_by_quotes.Rd b/man/enclosed_by_quotes.Rd
deleted file mode 100644
index 4af2365b..00000000
--- a/man/enclosed_by_quotes.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/document.R
-\name{enclosed_by_quotes}
-\alias{enclosed_by_quotes}
-\title{check if a position is inside quotes}
-\usage{
-enclosed_by_quotes(document, point)
-}
-\description{
-check if a position is inside quotes
-}
-\keyword{internal}
diff --git a/man/expr_range.Rd b/man/expr_range.Rd
deleted file mode 100644
index 67cb8bd7..00000000
--- a/man/expr_range.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/document.R
-\name{expr_range}
-\alias{expr_range}
-\title{Expression range in UTF-16 code units}
-\usage{
-expr_range(srcref)
-}
-\description{
-Expression range in UTF-16 code units
-}
-\keyword{internal}
diff --git a/man/extract_blocks.Rd b/man/extract_blocks.Rd
deleted file mode 100644
index 90e62209..00000000
--- a/man/extract_blocks.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{extract_blocks}
-\alias{extract_blocks}
-\title{Extract the R code blocks of a Rmarkdown file}
-\usage{
-extract_blocks(content)
-}
-\description{
-Extract the R code blocks of a Rmarkdown file
-}
-\keyword{internal}
diff --git a/man/find_config.Rd b/man/find_config.Rd
deleted file mode 100644
index 78ca5a20..00000000
--- a/man/find_config.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/diagnostics.R
-\name{find_config}
-\alias{find_config}
-\title{Find the lintr config file}
-\usage{
-find_config(filename)
-}
-\description{
-Find the lintr config file
-}
-\keyword{internal}
diff --git a/man/find_package.Rd b/man/find_package.Rd
deleted file mode 100644
index f1862802..00000000
--- a/man/find_package.Rd
+++ /dev/null
@@ -1,13 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{find_package}
-\alias{find_package}
-\title{Find the root package folder}
-\usage{
-find_package(path = getwd())
-}
-\description{
-This function searches backwards in the folder structure until it finds
-a DESCRIPTION file or it reaches the top-level directory.
-}
-\keyword{internal}
diff --git a/man/find_unbalanced_bracket.Rd b/man/find_unbalanced_bracket.Rd
deleted file mode 100644
index 4a1ad276..00000000
--- a/man/find_unbalanced_bracket.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/document.R
-\name{find_unbalanced_bracket}
-\alias{find_unbalanced_bracket}
-\title{Search backwards in a document content for a specific character}
-\usage{
-find_unbalanced_bracket(content, row, column, skip_empty_line = FALSE)
-}
-\description{
-Search backwards in a document content for a specific character
-}
-\keyword{internal}
diff --git a/man/formatting_reply.Rd b/man/formatting_reply.Rd
deleted file mode 100644
index 89e6980a..00000000
--- a/man/formatting_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/formatting.R
-\name{formatting_reply}
-\alias{formatting_reply}
-\title{Format a document}
-\usage{
-formatting_reply(id, uri, document, options)
-}
-\description{
-Format a document
-}
-\keyword{internal}
diff --git a/man/hover_reply.Rd b/man/hover_reply.Rd
deleted file mode 100644
index 5962899a..00000000
--- a/man/hover_reply.Rd
+++ /dev/null
@@ -1,13 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/hover.R
-\name{hover_reply}
-\alias{hover_reply}
-\title{The response to a textDocument/hover Request}
-\usage{
-hover_reply(id, uri, workspace, document, point)
-}
-\description{
-When hovering on a symbol, if it is a function, return its help text
-if it exists in the current \link{Workspace}.
-}
-\keyword{internal}
diff --git a/man/is_directory.Rd b/man/is_directory.Rd
deleted file mode 100644
index 4a7cb865..00000000
--- a/man/is_directory.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{is_directory}
-\alias{is_directory}
-\title{Check if a path is a directory}
-\usage{
-is_directory(path)
-}
-\description{
-Check if a path is a directory
-}
-\keyword{internal}
diff --git a/man/is_package.Rd b/man/is_package.Rd
deleted file mode 100644
index f38fd23e..00000000
--- a/man/is_package.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{is_package}
-\alias{is_package}
-\title{check if a path is a package folder}
-\usage{
-is_package(rootPath)
-}
-\arguments{
-\item{rootPath}{a character representing a path}
-}
-\description{
-check if a path is a package folder
-}
-\keyword{internal}
diff --git a/man/is_rmarkdown.Rd b/man/is_rmarkdown.Rd
deleted file mode 100644
index 5ccb3227..00000000
--- a/man/is_rmarkdown.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{is_rmarkdown}
-\alias{is_rmarkdown}
-\title{Check if a file is an RMarkdown file}
-\usage{
-is_rmarkdown(uri)
-}
-\description{
-Check if a file is an RMarkdown file
-}
-\keyword{internal}
diff --git a/man/location.Rd b/man/location.Rd
deleted file mode 100644
index f8ffb295..00000000
--- a/man/location.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{location}
-\alias{location}
-\title{A location inside a resource}
-\usage{
-location(uri, range)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{range}{a \link{range}}
-}
-\description{
-Represents a location inside a resource, such as a line inside a text file.
-}
-\keyword{internal}
diff --git a/man/log_write.Rd b/man/log_write.Rd
deleted file mode 100644
index dc4b356b..00000000
--- a/man/log_write.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/log.R
-\name{log_write}
-\alias{log_write}
-\title{Write to log}
-\usage{
-log_write(..., file = stderr())
-}
-\arguments{
-\item{...}{anything}
-}
-\description{
-Write to log
-}
-\keyword{internal}
diff --git a/man/merge_list.Rd b/man/merge_list.Rd
deleted file mode 100644
index 543644f5..00000000
--- a/man/merge_list.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{merge_list}
-\alias{merge_list}
-\title{Merge two lists}
-\usage{
-merge_list(x, y)
-}
-\description{
-Merge two lists
-}
-\keyword{internal}
diff --git a/man/ncodeunit.Rd b/man/ncodeunit.Rd
deleted file mode 100644
index 8037d655..00000000
--- a/man/ncodeunit.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{ncodeunit}
-\alias{ncodeunit}
-\title{Calculate character offset based on the protocol}
-\usage{
-ncodeunit(s)
-}
-\description{
-Calculate character offset based on the protocol
-}
-\keyword{internal}
diff --git a/man/on_exit.Rd b/man/on_exit.Rd
deleted file mode 100644
index 45550805..00000000
--- a/man/on_exit.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-general.R
-\name{on_exit}
-\alias{on_exit}
-\title{\code{exit} notification handler}
-\usage{
-on_exit(self, params)
-}
-\description{
-Handler to the \code{exit} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/on_initialize.Rd b/man/on_initialize.Rd
deleted file mode 100644
index d54ac331..00000000
--- a/man/on_initialize.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-general.R
-\name{on_initialize}
-\alias{on_initialize}
-\title{\code{initialize} handler}
-\usage{
-on_initialize(self, id, params)
-}
-\description{
-Handler to the \code{initialize} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/on_initialized.Rd b/man/on_initialized.Rd
deleted file mode 100644
index ba47b5c3..00000000
--- a/man/on_initialized.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-general.R
-\name{on_initialized}
-\alias{on_initialized}
-\title{\code{initialized} handler}
-\usage{
-on_initialized(self, params)
-}
-\description{
-Handler to the \code{initialized} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/on_shutdown.Rd b/man/on_shutdown.Rd
deleted file mode 100644
index 9d741b33..00000000
--- a/man/on_shutdown.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-general.R
-\name{on_shutdown}
-\alias{on_shutdown}
-\title{\code{shutdown} request handler}
-\usage{
-on_shutdown(self, id, params)
-}
-\description{
-Handler to the \code{shutdown} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/on_type_formatting_reply.Rd b/man/on_type_formatting_reply.Rd
deleted file mode 100644
index 72570328..00000000
--- a/man/on_type_formatting_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/formatting.R
-\name{on_type_formatting_reply}
-\alias{on_type_formatting_reply}
-\title{Format on type}
-\usage{
-on_type_formatting_reply(id, uri, document, point, ch, options)
-}
-\description{
-Format on type
-}
-\keyword{internal}
diff --git a/man/package_completion.Rd b/man/package_completion.Rd
deleted file mode 100644
index 8bd39042..00000000
--- a/man/package_completion.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/completion.R
-\name{package_completion}
-\alias{package_completion}
-\title{Complete a package name}
-\usage{
-package_completion(token)
-}
-\description{
-Complete a package name
-}
-\keyword{internal}
diff --git a/man/parse_document.Rd b/man/parse_document.Rd
deleted file mode 100644
index f76e1b74..00000000
--- a/man/parse_document.Rd
+++ /dev/null
@@ -1,13 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/document.R
-\name{parse_document}
-\alias{parse_document}
-\title{Parse a document}
-\usage{
-parse_document(uri, content)
-}
-\description{
-Build the list of called packages, functions, variables, formals and
-signatures in the document in order to add them to the current \link{Workspace}.
-}
-\keyword{internal}
diff --git a/man/path_from_uri.Rd b/man/path_from_uri.Rd
deleted file mode 100644
index 793fd9f2..00000000
--- a/man/path_from_uri.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{path_from_uri}
-\alias{path_from_uri}
-\alias{path_to_uri}
-\title{Paths and uris}
-\usage{
-path_from_uri(uri)
-
-path_to_uri(path)
-}
-\description{
-Paths and uris
-}
-\keyword{internal}
diff --git a/man/position.Rd b/man/position.Rd
deleted file mode 100644
index 4b6d2dfd..00000000
--- a/man/position.Rd
+++ /dev/null
@@ -1,18 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{position}
-\alias{position}
-\title{A position in a text document}
-\usage{
-position(line, character)
-}
-\arguments{
-\item{line}{an integer}
-
-\item{character}{an integer}
-}
-\description{
-Position in a text document expressed as zero-based line and zero-based
-character offset.
-}
-\keyword{internal}
diff --git a/man/process_is_detached.Rd b/man/process_is_detached.Rd
deleted file mode 100644
index d278dab5..00000000
--- a/man/process_is_detached.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{process_is_detached}
-\alias{process_is_detached}
-\title{check if the current process becomes an orphan}
-\usage{
-process_is_detached()
-}
-\description{
-check if the current process becomes an orphan
-}
-\keyword{internal}
diff --git a/man/purl.Rd b/man/purl.Rd
deleted file mode 100644
index bfef6fcf..00000000
--- a/man/purl.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{purl}
-\alias{purl}
-\title{Strip out all the non R blocks in a R markdown file}
-\usage{
-purl(content)
-}
-\arguments{
-\item{content}{a character vector}
-}
-\description{
-Strip out all the non R blocks in a R markdown file
-}
-\keyword{internal}
diff --git a/man/range.Rd b/man/range.Rd
deleted file mode 100644
index d2870776..00000000
--- a/man/range.Rd
+++ /dev/null
@@ -1,18 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{range}
-\alias{range}
-\title{A range in a text document}
-\usage{
-range(start, end)
-}
-\arguments{
-\item{start}{a \link{position}}
-
-\item{end}{a \link{position}}
-}
-\description{
-A range in a text document expressed as start and end \link{position}s.
-A range is comparable to a selection in an editor.
-}
-\keyword{internal}
diff --git a/man/range_formatting_reply.Rd b/man/range_formatting_reply.Rd
deleted file mode 100644
index 7e8d80b1..00000000
--- a/man/range_formatting_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/formatting.R
-\name{range_formatting_reply}
-\alias{range_formatting_reply}
-\title{Format a part of a document}
-\usage{
-range_formatting_reply(id, uri, document, range, options)
-}
-\description{
-Format a part of a document
-}
-\keyword{internal}
diff --git a/man/reference_params.Rd b/man/reference_params.Rd
deleted file mode 100644
index b52c6bf5..00000000
--- a/man/reference_params.Rd
+++ /dev/null
@@ -1,19 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{reference_params}
-\alias{reference_params}
-\title{Parameters for reference requests}
-\usage{
-reference_params(uri, position, context = NULL)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{position}{a \link{position} object}
-
-\item{context}{a named list}
-}
-\description{
-Parameters for reference requests
-}
-\keyword{internal}
diff --git a/man/rename_params.Rd b/man/rename_params.Rd
deleted file mode 100644
index 1a92d198..00000000
--- a/man/rename_params.Rd
+++ /dev/null
@@ -1,19 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{rename_params}
-\alias{rename_params}
-\title{Parameters for rename requests}
-\usage{
-rename_params(uri, position, new_name)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{position}{a \link{position} object}
-
-\item{new_name}{a character}
-}
-\description{
-Parameters for rename requests
-}
-\keyword{internal}
diff --git a/man/sanitize_names.Rd b/man/sanitize_names.Rd
deleted file mode 100644
index 5e4ba26f..00000000
--- a/man/sanitize_names.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{sanitize_names}
-\alias{sanitize_names}
-\title{sanitize package objects names}
-\usage{
-sanitize_names(objects)
-}
-\description{
-Remove unwanted objects, \emph{e.g.} \verb{names<-}, \verb{\%>\%}, \code{.__C_} etc.
-}
-\keyword{internal}
diff --git a/man/selection_range_reply.Rd b/man/selection_range_reply.Rd
deleted file mode 100644
index 03adef21..00000000
--- a/man/selection_range_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/selection.R
-\name{selection_range_reply}
-\alias{selection_range_reply}
-\title{The response to a textDocument/selectionRange Request}
-\usage{
-selection_range_reply(id, uri, workspace, document, points)
-}
-\description{
-The response to a textDocument/selectionRange Request
-}
-\keyword{internal}
diff --git a/man/seq_safe.Rd b/man/seq_safe.Rd
deleted file mode 100644
index 9b4e6d5b..00000000
--- a/man/seq_safe.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{seq_safe}
-\alias{seq_safe}
-\title{Safer version of \code{seq} which returns empty vector if b < a}
-\usage{
-seq_safe(a, b)
-}
-\description{
-Safer version of \code{seq} which returns empty vector if b < a
-}
-\keyword{internal}
diff --git a/man/signature_reply.Rd b/man/signature_reply.Rd
deleted file mode 100644
index 54d5e1f3..00000000
--- a/man/signature_reply.Rd
+++ /dev/null
@@ -1,13 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/signature.R
-\name{signature_reply}
-\alias{signature_reply}
-\title{the response to a textDocument/signatureHelp Request}
-\usage{
-signature_reply(id, uri, workspace, document, point)
-}
-\description{
-If the symbol at the current position is a function, return its arguments
-(as with \code{\link[base:args]{base::args()}}).
-}
-\keyword{internal}
diff --git a/man/stdin_read_char.Rd b/man/stdin_read_char.Rd
deleted file mode 100644
index 163078c1..00000000
--- a/man/stdin_read_char.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{stdin_read_char}
-\alias{stdin_read_char}
-\title{read a character from stdin}
-\usage{
-stdin_read_char(n)
-}
-\description{
-read a character from stdin
-}
-\keyword{internal}
diff --git a/man/stdin_read_line.Rd b/man/stdin_read_line.Rd
deleted file mode 100644
index 1eb03c3e..00000000
--- a/man/stdin_read_line.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{stdin_read_line}
-\alias{stdin_read_line}
-\title{read a line from stdin}
-\usage{
-stdin_read_line()
-}
-\description{
-read a line from stdin
-}
-\keyword{internal}
diff --git a/man/style_text.Rd b/man/style_text.Rd
deleted file mode 100644
index 4329303a..00000000
--- a/man/style_text.Rd
+++ /dev/null
@@ -1,13 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/formatting.R
-\name{style_text}
-\alias{style_text}
-\title{Edit code style}
-\usage{
-style_text(text, style, indention = 0L)
-}
-\description{
-This functions formats a list of text using \code{\link[styler:style_text]{styler::style_text()}} with the
-specified style.
-}
-\keyword{internal}
diff --git a/man/symbol_information.Rd b/man/symbol_information.Rd
deleted file mode 100644
index 9a81ad68..00000000
--- a/man/symbol_information.Rd
+++ /dev/null
@@ -1,19 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{symbol_information}
-\alias{symbol_information}
-\title{Non-hierarchical symbol information}
-\usage{
-symbol_information(name, kind, location)
-}
-\arguments{
-\item{name}{a character}
-
-\item{kind}{an integer}
-
-\item{location}{a \link{location}}
-}
-\description{
-Non-hierarchical symbol information
-}
-\keyword{internal}
diff --git a/man/text_document_code_action.Rd b/man/text_document_code_action.Rd
deleted file mode 100644
index 0266feaa..00000000
--- a/man/text_document_code_action.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_code_action}
-\alias{text_document_code_action}
-\title{\code{textDocument/codeAction} request handler}
-\usage{
-text_document_code_action(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/codeAction} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_code_lens.Rd b/man/text_document_code_lens.Rd
deleted file mode 100644
index 6ffe91d7..00000000
--- a/man/text_document_code_lens.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_code_lens}
-\alias{text_document_code_lens}
-\title{\code{textDocument/codeLens} request handler}
-\usage{
-text_document_code_lens(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/codeLens} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_color_presentation.Rd b/man/text_document_color_presentation.Rd
deleted file mode 100644
index 14916bf7..00000000
--- a/man/text_document_color_presentation.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_color_presentation}
-\alias{text_document_color_presentation}
-\title{\code{textDocument/colorPresentation} request handler}
-\usage{
-text_document_color_presentation(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/colorPresentation} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_completion.Rd b/man/text_document_completion.Rd
deleted file mode 100644
index cf24fec3..00000000
--- a/man/text_document_completion.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_completion}
-\alias{text_document_completion}
-\title{\code{textDocument/completion} request handler}
-\usage{
-text_document_completion(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/completion} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_definition.Rd b/man/text_document_definition.Rd
deleted file mode 100644
index 7db950aa..00000000
--- a/man/text_document_definition.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_definition}
-\alias{text_document_definition}
-\title{\code{textDocument/definition} request handler}
-\usage{
-text_document_definition(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/definition} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_did_change.Rd b/man/text_document_did_change.Rd
deleted file mode 100644
index ae318e3a..00000000
--- a/man/text_document_did_change.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-textsync.R
-\name{text_document_did_change}
-\alias{text_document_did_change}
-\title{\code{textDocument/didChange} notification handler}
-\usage{
-text_document_did_change(self, params)
-}
-\description{
-Handler to the \code{textDocument/didChange} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/text_document_did_close.Rd b/man/text_document_did_close.Rd
deleted file mode 100644
index 889f63f8..00000000
--- a/man/text_document_did_close.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-textsync.R
-\name{text_document_did_close}
-\alias{text_document_did_close}
-\title{\code{textDocument/didClose} notification handler}
-\usage{
-text_document_did_close(self, params)
-}
-\description{
-Handler to the \code{textDocument/didClose} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/text_document_did_open.Rd b/man/text_document_did_open.Rd
deleted file mode 100644
index d6ba3331..00000000
--- a/man/text_document_did_open.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-textsync.R
-\name{text_document_did_open}
-\alias{text_document_did_open}
-\title{\code{textDocument/didOpen} notification handler}
-\usage{
-text_document_did_open(self, params)
-}
-\description{
-Handler to the \code{textDocument/didOpen} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/text_document_did_save.Rd b/man/text_document_did_save.Rd
deleted file mode 100644
index ba758a4b..00000000
--- a/man/text_document_did_save.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-textsync.R
-\name{text_document_did_save}
-\alias{text_document_did_save}
-\title{\code{textDocument/didSave} notification handler}
-\usage{
-text_document_did_save(self, params)
-}
-\description{
-Handler to the \code{textDocument/didSave} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/text_document_document_color.Rd b/man/text_document_document_color.Rd
deleted file mode 100644
index 01b62bd0..00000000
--- a/man/text_document_document_color.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_document_color}
-\alias{text_document_document_color}
-\title{\code{textDocument/documentColor} request handler}
-\usage{
-text_document_document_color(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/documentColor} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_document_highlight.Rd b/man/text_document_document_highlight.Rd
deleted file mode 100644
index f038d23a..00000000
--- a/man/text_document_document_highlight.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_document_highlight}
-\alias{text_document_document_highlight}
-\title{\code{textDocument/documentHighlight} request handler}
-\usage{
-text_document_document_highlight(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/documentHighlight} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_document_link.Rd b/man/text_document_document_link.Rd
deleted file mode 100644
index 01e189b6..00000000
--- a/man/text_document_document_link.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_document_link}
-\alias{text_document_document_link}
-\title{\code{textDocument/documentLink} request handler}
-\usage{
-text_document_document_link(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/documentLink} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_document_symbol.Rd b/man/text_document_document_symbol.Rd
deleted file mode 100644
index 2d5794d0..00000000
--- a/man/text_document_document_symbol.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_document_symbol}
-\alias{text_document_document_symbol}
-\title{\code{textDocument/documentSymbol} request handler}
-\usage{
-text_document_document_symbol(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/documentSymbol} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_folding_range.Rd b/man/text_document_folding_range.Rd
deleted file mode 100644
index e1e74cd9..00000000
--- a/man/text_document_folding_range.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_folding_range}
-\alias{text_document_folding_range}
-\title{\code{textDocument/foldingRange} request handler}
-\usage{
-text_document_folding_range(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/foldingRange} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_formatting.Rd b/man/text_document_formatting.Rd
deleted file mode 100644
index f86e9004..00000000
--- a/man/text_document_formatting.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_formatting}
-\alias{text_document_formatting}
-\title{\code{textDocument/formatting} request handler}
-\usage{
-text_document_formatting(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/formatting} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_hover.Rd b/man/text_document_hover.Rd
deleted file mode 100644
index 8f154e52..00000000
--- a/man/text_document_hover.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_hover}
-\alias{text_document_hover}
-\title{\code{textDocument/hover} request handler}
-\usage{
-text_document_hover(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/hover} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_implementation.Rd b/man/text_document_implementation.Rd
deleted file mode 100644
index 716a40e2..00000000
--- a/man/text_document_implementation.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_implementation}
-\alias{text_document_implementation}
-\title{\code{textDocument/implementation} request handler}
-\usage{
-text_document_implementation(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/implementation} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_linked_editing_range.Rd b/man/text_document_linked_editing_range.Rd
deleted file mode 100644
index 50ac1857..00000000
--- a/man/text_document_linked_editing_range.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_linked_editing_range}
-\alias{text_document_linked_editing_range}
-\title{\code{textDocument/linkedEditingRange} request handler}
-\usage{
-text_document_linked_editing_range(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/linkedEditingRange} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_on_type_formatting.Rd b/man/text_document_on_type_formatting.Rd
deleted file mode 100644
index 39142ebe..00000000
--- a/man/text_document_on_type_formatting.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_on_type_formatting}
-\alias{text_document_on_type_formatting}
-\title{\code{textDocument/onTypeFormatting} request handler}
-\usage{
-text_document_on_type_formatting(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/onTypeFormatting} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_position_params.Rd b/man/text_document_position_params.Rd
deleted file mode 100644
index b27daa72..00000000
--- a/man/text_document_position_params.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{text_document_position_params}
-\alias{text_document_position_params}
-\title{A text document and a position inside that document}
-\usage{
-text_document_position_params(uri, position)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{position}{a \link{position} object}
-}
-\description{
-A text document and a position inside that document
-}
-\keyword{internal}
diff --git a/man/text_document_prepare_call_hierarchy.Rd b/man/text_document_prepare_call_hierarchy.Rd
deleted file mode 100644
index 5cc5b548..00000000
--- a/man/text_document_prepare_call_hierarchy.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_prepare_call_hierarchy}
-\alias{text_document_prepare_call_hierarchy}
-\title{\code{textDocument/prepareCallHierarchy} request handler}
-\usage{
-text_document_prepare_call_hierarchy(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/prepareCallHierarchy} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_prepare_rename.Rd b/man/text_document_prepare_rename.Rd
deleted file mode 100644
index ea43cc82..00000000
--- a/man/text_document_prepare_rename.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_prepare_rename}
-\alias{text_document_prepare_rename}
-\title{\code{textDocument/prepareRename} request handler}
-\usage{
-text_document_prepare_rename(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/prepareRename} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_range_formatting.Rd b/man/text_document_range_formatting.Rd
deleted file mode 100644
index fbe5890e..00000000
--- a/man/text_document_range_formatting.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_range_formatting}
-\alias{text_document_range_formatting}
-\title{\code{textDocument/rangeFormatting} request handler}
-\usage{
-text_document_range_formatting(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/rangeFormatting} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_references.Rd b/man/text_document_references.Rd
deleted file mode 100644
index 099ba590..00000000
--- a/man/text_document_references.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_references}
-\alias{text_document_references}
-\title{\code{textDocument/references} request handler}
-\usage{
-text_document_references(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/references} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_rename.Rd b/man/text_document_rename.Rd
deleted file mode 100644
index 7d10344f..00000000
--- a/man/text_document_rename.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_rename}
-\alias{text_document_rename}
-\title{\code{textDocument/rename} request handler}
-\usage{
-text_document_rename(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/rename} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_selection_range.Rd b/man/text_document_selection_range.Rd
deleted file mode 100644
index f4517f11..00000000
--- a/man/text_document_selection_range.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_selection_range}
-\alias{text_document_selection_range}
-\title{\code{textDocument/selectionRange} request handler}
-\usage{
-text_document_selection_range(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/selectionRange} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_signature_help.Rd b/man/text_document_signature_help.Rd
deleted file mode 100644
index 6851d38e..00000000
--- a/man/text_document_signature_help.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_signature_help}
-\alias{text_document_signature_help}
-\title{\code{textDocument/signatureHelp} request handler}
-\usage{
-text_document_signature_help(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/signatureHelp} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_type_definition.Rd b/man/text_document_type_definition.Rd
deleted file mode 100644
index 48ab01a3..00000000
--- a/man/text_document_type_definition.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-langfeatures.R
-\name{text_document_type_definition}
-\alias{text_document_type_definition}
-\title{\code{textDocument/typeDefinition} request handler}
-\usage{
-text_document_type_definition(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/typeDefinition} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_document_will_save.Rd b/man/text_document_will_save.Rd
deleted file mode 100644
index 926cbaf2..00000000
--- a/man/text_document_will_save.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-textsync.R
-\name{text_document_will_save}
-\alias{text_document_will_save}
-\title{\code{textDocument/willSave} notification handler}
-\usage{
-text_document_will_save(self, params)
-}
-\description{
-Handler to the \code{textDocument/willSave} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/text_document_will_save_wait_until.Rd b/man/text_document_will_save_wait_until.Rd
deleted file mode 100644
index 2fdd6ad7..00000000
--- a/man/text_document_will_save_wait_until.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-textsync.R
-\name{text_document_will_save_wait_until}
-\alias{text_document_will_save_wait_until}
-\title{\code{textDocument/willSaveWaitUntil} notification handler}
-\usage{
-text_document_will_save_wait_until(self, id, params)
-}
-\description{
-Handler to the \code{textDocument/willSaveWaitUntil} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/text_edit.Rd b/man/text_edit.Rd
deleted file mode 100644
index 5cbd016d..00000000
--- a/man/text_edit.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{text_edit}
-\alias{text_edit}
-\title{A textual edit applicable to a text document}
-\usage{
-text_edit(range, new_text)
-}
-\arguments{
-\item{range}{a \link{range}, the part of the document to replace}
-
-\item{new_text}{a character, the text to replace}
-}
-\description{
-A textual edit applicable to a text document
-}
-\keyword{internal}
diff --git a/man/throttle.Rd b/man/throttle.Rd
deleted file mode 100644
index f5003aa3..00000000
--- a/man/throttle.Rd
+++ /dev/null
@@ -1,18 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{throttle}
-\alias{throttle}
-\title{throttle a function execution}
-\usage{
-throttle(fun, t = 1)
-}
-\arguments{
-\item{fun}{the function to execute}
-
-\item{t}{an integer, the threshold in seconds}
-}
-\description{
-Execute a function if the last execution time is older than a specified
-value.
-}
-\keyword{internal}
diff --git a/man/to_string.Rd b/man/to_string.Rd
deleted file mode 100644
index e8810150..00000000
--- a/man/to_string.Rd
+++ /dev/null
@@ -1,15 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/log.R
-\name{to_string}
-\alias{to_string}
-\title{Transform any object to a string}
-\usage{
-to_string(...)
-}
-\arguments{
-\item{...}{anything}
-}
-\description{
-Transform any object to a string
-}
-\keyword{internal}
diff --git a/man/tryCatchStack.Rd b/man/tryCatchStack.Rd
deleted file mode 100644
index a2f362d1..00000000
--- a/man/tryCatchStack.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/utils.R
-\name{tryCatchStack}
-\alias{tryCatchStack}
-\title{tryCatch with stack captured}
-\usage{
-tryCatchStack(expr, ...)
-}
-\description{
-tryCatch with stack captured
-}
-\keyword{internal}
diff --git a/man/will_save_text_document_params.Rd b/man/will_save_text_document_params.Rd
deleted file mode 100644
index 6af65277..00000000
--- a/man/will_save_text_document_params.Rd
+++ /dev/null
@@ -1,17 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/interfaces.R
-\name{will_save_text_document_params}
-\alias{will_save_text_document_params}
-\title{Parameters for willSave notifications}
-\usage{
-will_save_text_document_params(uri, reason)
-}
-\arguments{
-\item{uri}{a character, the path to a file as defined by \href{https://tools.ietf.org/html/rfc3986}{RFC 3986}}
-
-\item{reason}{an integer, see TextDocumentSaveReason}
-}
-\description{
-Parameters for willSave notifications
-}
-\keyword{internal}
diff --git a/man/workspace_completion.Rd b/man/workspace_completion.Rd
deleted file mode 100644
index f9fb5aed..00000000
--- a/man/workspace_completion.Rd
+++ /dev/null
@@ -1,18 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/completion.R
-\name{workspace_completion}
-\alias{workspace_completion}
-\title{Complete any object in the workspace}
-\usage{
-workspace_completion(
- workspace,
- token,
- package = NULL,
- exported_only = TRUE,
- snippet_support = NULL
-)
-}
-\description{
-Complete any object in the workspace
-}
-\keyword{internal}
diff --git a/man/workspace_did_change_configuration.Rd b/man/workspace_did_change_configuration.Rd
deleted file mode 100644
index f1459fac..00000000
--- a/man/workspace_did_change_configuration.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-workspace.R
-\name{workspace_did_change_configuration}
-\alias{workspace_did_change_configuration}
-\title{\code{workspace/didChangeConfiguration} notification handler}
-\usage{
-workspace_did_change_configuration(self, params)
-}
-\description{
-Handler to the \code{workspace/didChangeConfiguration} \link{Notification}
-}
-\keyword{internal}
diff --git a/man/workspace_did_change_watched_files.Rd b/man/workspace_did_change_watched_files.Rd
deleted file mode 100644
index a5b93a1d..00000000
--- a/man/workspace_did_change_watched_files.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-workspace.R
-\name{workspace_did_change_watched_files}
-\alias{workspace_did_change_watched_files}
-\title{\code{workspace/didChangeWatchedFiles} notification handler}
-\usage{
-workspace_did_change_watched_files(self, params)
-}
-\description{
-Handler to the \code{workspace/didChangeWatchedFiles} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/workspace_did_change_workspace_folder_params.Rd b/man/workspace_did_change_workspace_folder_params.Rd
deleted file mode 100644
index b5bf256c..00000000
--- a/man/workspace_did_change_workspace_folder_params.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-workspace.R
-\name{workspace_did_change_workspace_folder_params}
-\alias{workspace_did_change_workspace_folder_params}
-\title{\code{workspace/didChangeWorkspaceFolders} notification handler}
-\usage{
-workspace_did_change_workspace_folder_params(self, params)
-}
-\description{
-Handler to the \code{workspace/didChangeWorkspaceFolders} \link{Notification}.
-}
-\keyword{internal}
diff --git a/man/workspace_execute_command.Rd b/man/workspace_execute_command.Rd
deleted file mode 100644
index a0f69742..00000000
--- a/man/workspace_execute_command.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-workspace.R
-\name{workspace_execute_command}
-\alias{workspace_execute_command}
-\title{\code{workspace/executeCommand} request handler}
-\usage{
-workspace_execute_command(self, id, params)
-}
-\description{
-Handler to the \code{workspace/executeCommand} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/workspace_symbol.Rd b/man/workspace_symbol.Rd
deleted file mode 100644
index ed20b8ae..00000000
--- a/man/workspace_symbol.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/handlers-workspace.R
-\name{workspace_symbol}
-\alias{workspace_symbol}
-\title{\code{workspace/symbol} request handler}
-\usage{
-workspace_symbol(self, id, params)
-}
-\description{
-Handler to the \code{workspace/symbol} \link{Request}.
-}
-\keyword{internal}
diff --git a/man/workspace_symbol_reply.Rd b/man/workspace_symbol_reply.Rd
deleted file mode 100644
index 5bab3ee8..00000000
--- a/man/workspace_symbol_reply.Rd
+++ /dev/null
@@ -1,12 +0,0 @@
-% Generated by roxygen2: do not edit by hand
-% Please edit documentation in R/symbol.R
-\name{workspace_symbol_reply}
-\alias{workspace_symbol_reply}
-\title{Get all the symbols in the workspace matching a query}
-\usage{
-workspace_symbol_reply(id, workspace, query)
-}
-\description{
-Get all the symbols in the workspace matching a query
-}
-\keyword{internal}