Skip to content

Commit

Permalink
rerun internal example models
Browse files Browse the repository at this point in the history
  • Loading branch information
paul-buerkner committed Feb 28, 2024
1 parent 2d02088 commit 81d9233
Show file tree
Hide file tree
Showing 3 changed files with 2 additions and 1 deletion.
1 change: 1 addition & 0 deletions R/predictor.R
Original file line number Diff line number Diff line change
Expand Up @@ -42,6 +42,7 @@ predictor.bprepl <- function(prep, i = NULL, fprep = NULL, ...) {
# and N is the number of observations or length of i if specified.
#' @export
predictor.bprepnl <- function(prep, i = NULL, fprep = NULL, ...) {
# TODO: add the brms namespace to the search path of the eval calls below
stopifnot(!is.null(fprep))
nlpars <- prep$used_nlpars
covars <- names(prep$C)
Expand Down
Binary file modified R/sysdata.rda
Binary file not shown.
2 changes: 1 addition & 1 deletion tests/brmsfit_examples.R
Original file line number Diff line number Diff line change
Expand Up @@ -40,7 +40,7 @@ brmsfit_example1 <- brm(
)

brmsfit_example2 <- brm(
bf(count | weights(AgeSD) ~ inv_logit(a) * exp(b * Trt),
bf(count | weights(AgeSD) ~ 1 / (1 + exp(-a)) * exp(b * Trt),
a + b ~ Age + (1|ID1|patient), nl = TRUE),
data = dat, family = Gamma("identity"),
prior = set_prior("normal(2,2)", nlpar = "a") +
Expand Down

0 comments on commit 81d9233

Please sign in to comment.