Skip to content

Commit

Permalink
document additional cases when dots are used (closes #1214)
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Sep 26, 2024
1 parent 82d3ab2 commit 0c6c941
Show file tree
Hide file tree
Showing 9 changed files with 20 additions and 52 deletions.
4 changes: 4 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,5 +1,9 @@
# broom (development version)

* Clarified documentation for a number of cases where dots were
documented as unused but actually passed to internal functions
(#1214).

* Addressed error in `augment.betareg()` and `augment.betamfx()`
with `data = NULL` and non-null `newdata` (#1216, #1218).

Expand Down
3 changes: 2 additions & 1 deletion R/mass-negbin-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -58,7 +58,8 @@ glance.negbin <- function(x, ...) {
#'
#' @param x A `glm.nb` object returned by [MASS::glm.nb()].
#' @template param_confint
#' @template param_unused_dots
#' @param ... For `tidy()`, additional arguments passed to [summary()].
#' Otherwise ignored.
#'
#' @family glm.nb tidiers
#' @seealso [MASS::glm.nb()]
Expand Down
3 changes: 2 additions & 1 deletion R/multcomp-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,8 @@
#'
#' @param x A `glht` object returned by [multcomp::glht()].
#' @template param_confint
#' @template param_unused_dots
#' @param ... Additional arguments passed to [summary()] and
#' [tidy.summary.glht()].
#'
#' @evalRd return_tidy("contrast", "null.value", "estimate")
#'
Expand Down
3 changes: 2 additions & 1 deletion R/survival-survfit-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,8 @@
#' @template title_desc_tidy
#'
#' @param x An `survfit` object returned from [survival::survfit()].
#' @template param_unused_dots
#' @param ... For `glance.survfit()`, additional arguments passed
#' to [summary()]. Otherwise ignored.
#'
#' @evalRd return_tidy(
#' "time",
Expand Down
3 changes: 2 additions & 1 deletion R/vars-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,8 @@
#'
#' @param x A `varest` object produced by a call to [vars::VAR()].
#' @template param_confint
#' @template param_unused_dots
#' @param ... For `glance()`, additional arguments passed to [summary()].
#' Otherwise ignored.
#'
#' @evalRd return_tidy(regression = TRUE,
#' component = "Whether a particular term was used to model the mean or the
Expand Down
14 changes: 2 additions & 12 deletions man/tidy.glht.Rd

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

14 changes: 2 additions & 12 deletions man/tidy.negbin.Rd

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

14 changes: 2 additions & 12 deletions man/tidy.survfit.Rd

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

14 changes: 2 additions & 12 deletions man/tidy.varest.Rd

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

0 comments on commit 0c6c941

Please sign in to comment.