Skip to content

Commit

Permalink
more update documentation
Browse files Browse the repository at this point in the history
  • Loading branch information
florale committed Mar 1, 2024
1 parent 41647ea commit d74b7d6
Show file tree
Hide file tree
Showing 3 changed files with 1 addition and 29 deletions.
14 changes: 0 additions & 14 deletions R/posterior.R
Original file line number Diff line number Diff line change
Expand Up @@ -442,20 +442,6 @@ residuals.brmcoda <- function(object, ...) {
#'
#' @importFrom loo loo is.loo
#' @method loo brmcoda
#'
#' @examples
#' \donttest{
#' if(requireNamespace("cmdstanr")){
#' m <- brmcoda(compilr = compilr(data = mcompd, sbp = sbp,
#' parts = c("TST", "WAKE", "MVPA", "LPA", "SB"),
#' idvar = "ID", total = 1440),
#' formula = Stress ~ bilr1 + bilr2 + bilr3 + bilr4 +
#' wilr1 + wilr2 + wilr3 + wilr4 + (1 | ID),
#' chain = 1, iter = 500,
#' backend = "cmdstanr")
#'
#' (loo1 <- loo(m))
#' }}
#' @export
loo.brmcoda <- function(x, ...) {
loo(x$Model, ...)
Expand Down
2 changes: 1 addition & 1 deletion R/shiny.R
Original file line number Diff line number Diff line change
Expand Up @@ -61,7 +61,7 @@ launch_shinystan.brmcoda <- function(object, ...) {
multilevelcoda_sim <- function() {

# shiny input
data(sim)
sim <- data(sim, envir = environment())

brmcoda_tab <- sim[["brmcoda_tab"]]
sub_tab <- sim[["sub_tab"]]
Expand Down
14 changes: 0 additions & 14 deletions man/loo.brmcoda.Rd

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

0 comments on commit d74b7d6

Please sign in to comment.