Skip to content

Commit

Permalink
docs
Browse files Browse the repository at this point in the history
  • Loading branch information
strengejacke committed Jan 30, 2024
1 parent bd316bb commit 22e2d58
Show file tree
Hide file tree
Showing 3 changed files with 21 additions and 6 deletions.
6 changes: 6 additions & 0 deletions R/apply_table_theme.R
Original file line number Diff line number Diff line change
@@ -1,3 +1,9 @@
#' @param out A `tinytable` object.
#' @param x The underlying data frame, used to create `out`.
#' @param theme The theme to apply to the table. One of `"default"`, `"grid"`,
#' `"striped"`, `"bootstrap"`, or `"darklines"`.
#' @param sub_header_positions A vector of row positions to apply a border to.
#' Currently particular for internal use of other _easystats_ packages.
#' @rdname export_table
#' @export
apply_table_theme <- function(out, x, theme = "default", sub_header_positions = NULL) {
Expand Down
13 changes: 7 additions & 6 deletions R/get_auxiliary.R
Original file line number Diff line number Diff line change
Expand Up @@ -78,17 +78,17 @@ get_auxiliary <- function(x,

# dispersion parameter -----------------------


#' @keywords internal
get_dispersion <- function(x, ...) {
UseMethod("get_dispersion")
}


#' @keywords internal
get_dispersion.model_fit <- function(x, ...) {
get_dispersion(x$fit, ...)
}


#' @keywords internal
get_dispersion.glm <- function(x, verbose = TRUE, ...) {
info <- model_info(x, verbose = verbose)
disp <- NULL
Expand All @@ -103,7 +103,7 @@ get_dispersion.glm <- function(x, verbose = TRUE, ...) {
disp
}


#' @keywords internal
get_dispersion.glmerMod <- function(x, verbose = TRUE, ...) {
info <- model_info(x, verbose = verbose)
disp <- NULL
Expand All @@ -122,7 +122,7 @@ get_dispersion.glmerMod <- function(x, verbose = TRUE, ...) {
disp
}


#' @keywords internal
get_dispersion.glmmTMB <- function(x, verbose = TRUE, ...) {
info <- model_info(x, verbose = verbose)
disp <- NULL
Expand All @@ -135,13 +135,14 @@ get_dispersion.glmmTMB <- function(x, verbose = TRUE, ...) {
disp
}


#' @keywords internal
get_dispersion.brmsfit <- get_dispersion.glmmTMB



# special ------------------

#' @keywords internal
.get_generic_aux <- function(x,
param,
summary = TRUE,
Expand Down
8 changes: 8 additions & 0 deletions man/export_table.Rd

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

0 comments on commit 22e2d58

Please sign in to comment.