Skip to content
Open
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
4 changes: 2 additions & 2 deletions DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
Package: roxygen2
Title: In-Line Documentation for R
Version: 7.3.2.9000
Version: 7.3.2.9002
Authors@R: c(
person("Hadley", "Wickham", , "[email protected]", role = c("aut", "cre", "cph"),
comment = c(ORCID = "0000-0003-4757-117X")),
Expand Down Expand Up @@ -53,4 +53,4 @@ Config/testthat/parallel: TRUE
Encoding: UTF-8
Language: en-GB
Roxygen: list(markdown = TRUE, load = "installed")
RoxygenNote: 7.3.2.9000
RoxygenNote: 7.3.2.9001
2 changes: 2 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -142,6 +142,7 @@ S3method(roxy_tag_parse,roxy_tag_importMethodsFrom)
S3method(roxy_tag_parse,roxy_tag_include)
S3method(roxy_tag_parse,roxy_tag_includeRmd)
S3method(roxy_tag_parse,roxy_tag_inherit)
S3method(roxy_tag_parse,roxy_tag_inheritAllDotParams)
S3method(roxy_tag_parse,roxy_tag_inheritDotParams)
S3method(roxy_tag_parse,roxy_tag_inheritParams)
S3method(roxy_tag_parse,roxy_tag_inheritSection)
Expand Down Expand Up @@ -190,6 +191,7 @@ S3method(roxy_tag_rd,roxy_tag_field)
S3method(roxy_tag_rd,roxy_tag_format)
S3method(roxy_tag_rd,roxy_tag_includeRmd)
S3method(roxy_tag_rd,roxy_tag_inherit)
S3method(roxy_tag_rd,roxy_tag_inheritAllDotParams)
S3method(roxy_tag_rd,roxy_tag_inheritDotParams)
S3method(roxy_tag_rd,roxy_tag_inheritParams)
S3method(roxy_tag_rd,roxy_tag_inheritSection)
Expand Down
151 changes: 115 additions & 36 deletions R/rd-inherit.R
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,17 @@ roxy_tag_rd.roxy_tag_inheritDotParams <- function(x, base_path, env) {
rd_section_inherit_dot_params(x$val$name, x$val$description)
}

# Fix for issues #1670 and #1671 by implementing a new tag for backward compatibility.
# @inheritAllDotParams will also pick up `...` documentation from parent.
#' @export
roxy_tag_parse.roxy_tag_inheritAllDotParams <- function(x) {
tag_two_part(x, "a source", "an argument list", required = FALSE, markdown = FALSE)
}
#' @export
roxy_tag_rd.roxy_tag_inheritAllDotParams <- function(x, base_path, env) {
rd_section_inherit_dot_params(x$val$name, x$val$description, recurse = TRUE)
}

#' @export
roxy_tag_parse.roxy_tag_inheritSection <- function(x) {
tag_two_part(x, "a topic name", "a section title")
Expand Down Expand Up @@ -76,11 +87,12 @@ merge.rd_section_inherit_section <- function(x, y, ...) {
rd_section_inherit_section(c(x$value$source, y$value$source), c(x$value$title, y$value$title))
}

rd_section_inherit_dot_params <- function(source, args) {
# set recurse to true to make it default of @inheritDotParams (and @interitAllDotParams)
rd_section_inherit_dot_params <- function(source, args, recurse = FALSE) {
stopifnot(is.character(source), is.character(args))
stopifnot(length(source) == length(args))

rd_section("inherit_dot_params", list(source = source, args = args))
rd_section("inherit_dot_params", list(source = source, args = args, recurse=recurse))
}

#' @export
Expand All @@ -89,7 +101,7 @@ format.rd_section_inherit_dot_params <- function(x, ...) NULL
#' @export
merge.rd_section_inherit_dot_params <- function(x, y, ...) {
stopifnot(identical(class(x), class(y)))
rd_section_inherit_dot_params(c(x$value$source, y$value$source), c(x$value$args, y$value$args))
rd_section_inherit_dot_params(c(x$value$source, y$value$source), c(x$value$args, y$value$args), all(c(x$value$recurse, y$value$recurse)))
}


Expand Down Expand Up @@ -183,49 +195,116 @@ match_param <- function(from, to) {
}

inherit_dot_params <- function(topic, topics, env) {

inheritors <- topic$get_value("inherit_dot_params")
if (is.null(inheritors))
return()

# Need to find formals for each source
funs <- lapply(inheritors$source, function(x) eval(parse(text = x), envir = env))
args <- map2(funs, inheritors$args, select_args_text, topic = topic)

# Then pull out the ones we need
docs <- lapply(inheritors$source, find_params, topics = topics)
arg_matches <- function(args, docs) {
match <- map_lgl(docs, function(x) all(x$name %in% args))
matched <- docs[match]
setNames(
lapply(matched, "[[", "value"),
map_chr(matched, function(x) paste(x$name, collapse = ","))
)
}
docs_selected <- unlist(map2(args, docs, arg_matches))

# Only document params under "..." that aren't otherwise documented
documented <- get_documented_params(topic)
non_documented_params <- setdiff(names(docs_selected), documented)
docs_selected <- docs_selected[non_documented_params]

# Build the Rd
# (1) Link to function(s) that was inherited from
src <- inheritors$source
dest <- map_chr(src, resolve_qualified_link)
from <- paste0("\\code{\\link[", dest, "]{", src, "}}", collapse = ", ")

# (2) Show each inherited argument
arg_names <- paste0("\\code{", names(docs_selected), "}")
args <- paste0(" \\item{", arg_names, "}{", docs_selected, "}", collapse = "\n")

rd <- paste0(
"\n",
" Arguments passed on to ", from, "\n",
" \\describe{\n",
args, "\n",
" }"
)
topic$add(rd_section("param", c("..." = rd)))
if (!inheritors$recurse) {

# Original behaviour, with output modified to prevent empty blocks.
arg_matches <- function(args, docs) {
match <- map_lgl(docs, function(x) all(x$name %in% args))
matched <- docs[match]
setNames(
lapply(matched, "[[", "value"),
map_chr(matched, function(x) paste(x$name, collapse = ","))
)
}
docs_selected <- unlist(map2(args, docs, arg_matches))

# Only document params under "..." that aren't otherwise documented
documented <- get_documented_params(topic)
non_documented_params <- setdiff(names(docs_selected), documented)
docs_selected <- docs_selected[non_documented_params]

# Build the Rd
# (1) Link to function(s) that was inherited from
src <- inheritors$source
dest <- map_chr(src, resolve_qualified_link)
from <- paste0("\\code{\\link[", dest, "]{", src, "}}", collapse = ", ")

# (2) Show each inherited argument
arg_names <- paste0("\\code{", names(docs_selected), "}")
args <- paste0(" \\item{", arg_names, "}{", docs_selected, "}", collapse = "\n")

# fix for issue #1671:
# stop empty block being generated
if (length(docs_selected>0)) {
rd <- paste0(
"\n",
" Arguments passed on to ", from, "\n",
" \\describe{\n",
args, "\n",
" }"
)
topic$add(rd_section("param", c("..." = rd)))
} else {
# you are inheriting dots from a function, and nothing matches
# This is potentially a code error and maybe should be thrown here.
# with fix 1670 this should really happen any more, except possibly if
# someone has documented `...` and also tries to inherit it.
}
return()

} else {

# Transitive inheritance of paramater documentation
# Basically this looks into parent documentation
# and finds anything that has not been documented already

sources = inheritors$source
dests = map_chr(sources, resolve_qualified_link)
defined_params = get_documented_params(topic)

# docs is a complex list of stuff. within it we need to find stuff that
# we have not already documented. We have to match by name with the
# complication that the names might be vectors themselves

i=1
# to_include = list()
dots_rd = character()
for (doc in docs) {
source = sources[[i]]
dest = dests[[i]]

# source_entries = list()
doc_rd = character()
for (entry in doc) {

# extras are the documented entries that are not already defined
# entry$name can be multiple names
extras = entry$name[!entry$name %in% defined_params]
if (length(extras) > 0) {
# keep the documentation for these extra parameters
# this is formatted as a csv for ease
extras = paste0(extras,collapse=",")
# source_entries[[extras]] = entry$value
doc_rd = c(doc_rd, sprintf("\\item{\\code{%s}}{%s}\n",extras,entry$value))
}
}
# to_include[[source]] = source_entries
if (length(doc_rd)>0) {
dots_rd = c(dots_rd, sprintf("\n Named arguments passed on to \\code{\\link[%s]{%s}}\\describe{\n %s}",dest,source,paste0(doc_rd,collapse="")))
}
i=i+1
}

if ("..." %in% names(topic$get_value("param"))) dots_rd = c(topic$get_value("param")["..."], dots_rd)
dots_rd = paste0(dots_rd,collapse="")
if (dots_rd != "") {
topic$add(rd_section("param", c("..." = dots_rd)))
}



}
}


Expand Down
8 changes: 8 additions & 0 deletions inst/roxygen2-tags.yml
Original file line number Diff line number Diff line change
Expand Up @@ -223,6 +223,14 @@
vignette: reuse
recommend: true

- name: inheritAllDotParams
description: >
Automatically generate documentation for `...` when you're passing dots
along to another function, including transitive `...` documentation.
template: ' ${1:source} ${2:arg1 arg2 arg3}'
vignette: reuse
recommend: true

- name: inheritParams
description: >
Inherit argument documentation from another function. Only inherits
Expand Down
Binary file modified man/figures/test-figure-1.png
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
3 changes: 3 additions & 0 deletions man/tags-reuse.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

29 changes: 0 additions & 29 deletions tests/testthat/_snaps/markdown-link.md
Original file line number Diff line number Diff line change
Expand Up @@ -36,35 +36,6 @@
Message
x <text>:4: @description refers to unavailable topic stringr::bar111.

# resolve_link_package

Code
resolve_link_package("roxygenize", "roxygen2", test_path("testMdLinks2"))
Output
[1] NA
Code
resolve_link_package("UseMethod", "roxygen2", test_path("testMdLinks2"))
Output
[1] NA
Code
resolve_link_package("cli_abort", "roxygen2", test_path("testMdLinks2"))
Output
[1] "cli"

---

Code
resolve_link_package("aa3bc042880aa3b64fef1a9", "roxygen2", test_path(
"testMdLinks2"), list(tag = tag))
Message
x foo.R:10: @title (automatically generated) Could not resolve link to topic "aa3bc042880aa3b64fef1a9" in the dependencies or base packages.
i If you haven't documented "aa3bc042880aa3b64fef1a9" yet, or just changed its name, this is normal. Once "aa3bc042880aa3b64fef1a9" is documented, this warning goes away.
i Make sure that the name of the topic is spelled correctly.
i Always list the linked package as a dependency.
i Alternatively, you can fully qualify the link with a package name.
Output
[1] NA

# resolve_link_package name clash

Code
Expand Down
Loading
Loading