Skip to content

Commit

Permalink
guard type.predict subset behind is_missing()
Browse files Browse the repository at this point in the history
related to #1216, #1218
  • Loading branch information
simonpcouch committed Sep 26, 2024
1 parent 0e5fa5c commit f479034
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/betareg-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -79,7 +79,7 @@ augment.betareg <- function(x, data = model.frame(x), newdata = NULL,
type.predict, type.residuals, ...) {
augment_columns(
x, data, newdata,
type.predict = type.predict[1],
type.predict = type.predict,
type.residuals = type.residuals
)
}
Expand Down
2 changes: 1 addition & 1 deletion R/utilities.R
Original file line number Diff line number Diff line change
Expand Up @@ -232,7 +232,7 @@ augment_columns <- function(x, data, newdata = NULL, type, type.predict = type,
args$newdata <- newdata
}
if (!missing(type.predict)) {
args$type <- type.predict
args$type <- type.predict[1]
}
if (!inherits(x, "betareg")) {
args$se.fit <- se.fit
Expand Down

0 comments on commit f479034

Please sign in to comment.