Skip to content

Commit

Permalink
address augment.betareg() failure (closes #1216)
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Sep 26, 2024
1 parent 42b6ad5 commit 5a85efa
Show file tree
Hide file tree
Showing 3 changed files with 10 additions and 3 deletions.
3 changes: 3 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,5 +1,8 @@
# broom (development version)

* Addressed "arguments imply differing number of rows" error in
`augment.betareg()` with `data = NULL` and non-null `newdata` (#1216).

* `glance.lm()` now returns non-`NA` values for `statistic`, `p.value`, and `df`
for models fitted with a single predictor and no intercept (@jrob95, #1209).

Expand Down
7 changes: 5 additions & 2 deletions R/utilities.R
Original file line number Diff line number Diff line change
Expand Up @@ -209,7 +209,8 @@ unrowname <- function(x) {
#' @param type.residuals Type of residuals to compute; by default
#' same as `type`
#' @param se.fit Value to pass to predict's `se.fit`, or NULL for
#' no value
#' no value. Ignored for model types that do not accept an `se.fit`
#' argument
#' @param ... extra arguments (not used)
#'
#' @export
Expand All @@ -233,7 +234,9 @@ augment_columns <- function(x, data, newdata = NULL, type, type.predict = type,
if (!missing(type.predict)) {
args$type <- type.predict
}
args$se.fit <- se.fit
if (!inherits(x, "betareg")) {
args$se.fit <- se.fit
}
args <- c(args, list(...))


Expand Down
3 changes: 2 additions & 1 deletion man/augment_columns.Rd

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

0 comments on commit 5a85efa

Please sign in to comment.