Skip to content

Commit

Permalink
pass conf.level in tidy.multinom() (#1131)
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch authored Jan 20, 2023
1 parent 8ac8f35 commit be67b24
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/nnet-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -93,7 +93,7 @@ tidy.multinom <- function(x, conf.int = FALSE, conf.level = .95,
ret$p.value <- stats::pnorm(abs(ret$statistic), 0, 1, lower.tail = FALSE) * 2

if (conf.int) {
ci <- apply(stats::confint(x), 2, function(a) unlist(as.data.frame(a)))
ci <- apply(stats::confint(x, level = conf.level), 2, function(a) unlist(as.data.frame(a)))
ci <- as.data.frame(ci)
names(ci) <- c("conf.low", "conf.high")
ret <- cbind(ret, ci)
Expand Down

0 comments on commit be67b24

Please sign in to comment.