Skip to content

Using @inheritParams to inherit from a @noRd block #1159

@nlneas1

Description

@nlneas1

@hadley and @kevinushey I have read through #641, as well as the subsequent issue and PR. However it would appear that it is not possible to use @inheritParams to inherit parameters from a function documented with the @noRd tag. I have tested this and it doesn't work in versions 6.1.1 and 7.1.1 unless I am misunderstanding. Let's say we have the following.

#' Function A
#' @param A `character` string, `NULL` by default.
#' @noRd
functionA <- function(a = NULL) {
  print(a)
}

#' Function B
#' @inheritParams functionA
#' @export
functionB <- function(a = NULL) {
  functionA(a = a)
}

This will just give me

Can't find help topic 'functionA' in current package

Metadata

Metadata

Assignees

No one assigned

    Labels

    No labels
    No labels

    Type

    No type

    Projects

    No projects

    Milestone

    No milestone

    Relationships

    None yet

    Development

    No branches or pull requests

    Issue actions