Skip to content

Commit

Permalink
Remove unneeded inheritParams statements
Browse files Browse the repository at this point in the history
They are documented in the same rd, so don't need to inherit any params
  • Loading branch information
jimhester committed Apr 23, 2020
1 parent 533fe4f commit 07118dd
Showing 1 changed file with 0 additions and 3 deletions.
3 changes: 0 additions & 3 deletions R/xml_name.R
Original file line number Diff line number Diff line change
Expand Up @@ -38,7 +38,6 @@ xml_name.xml_node <- function(x, ns = character()) {

#' Modify the (tag) name of an element
#'
#' @inheritParams xml_name
#' @param value a character vector with replacement name.
#' @rdname xml_name
#' @export
Expand Down Expand Up @@ -75,8 +74,6 @@ set_name <- function(x, value, ns = character()) {
}

#' @rdname xml_name
#' @inheritParams xml_name
#' @export
#' @export
xml_set_name <- function(x, value, ns = character()) {
UseMethod("xml_set_name")
Expand Down

0 comments on commit 07118dd

Please sign in to comment.