Skip to content

Commit

Permalink
Merge pull request #302 from fweber144/docs_internal
Browse files Browse the repository at this point in the history
Use `#' @noRd` for internal function documentation
  • Loading branch information
fweber144 authored Apr 20, 2022
2 parents dd4023a + 445c046 commit 7018ab0
Showing 1 changed file with 7 additions and 7 deletions.
14 changes: 7 additions & 7 deletions R/methods.R
Original file line number Diff line number Diff line change
Expand Up @@ -927,7 +927,7 @@ mknms_ranef <- function(nms, nm_scheme, coef_nms) {
return(nms)
}

#' @keywords internal
#' @noRd
#' @export
coef.subfit <- function(object, ...) {
return(with(object, c(
Expand All @@ -942,26 +942,26 @@ get_subparams <- function(x, ...) {
UseMethod("get_subparams")
}

#' @keywords internal
#' @noRd
#' @export
get_subparams.lm <- function(x, ...) {
return(coef(x) %>%
replace_population_names(...))
}

#' @keywords internal
#' @noRd
#' @export
get_subparams.subfit <- function(x, ...) {
return(get_subparams.lm(x, ...))
}

#' @keywords internal
#' @noRd
#' @export
get_subparams.glm <- function(x, ...) {
return(get_subparams.lm(x, ...))
}

#' @keywords internal
#' @noRd
#' @export
get_subparams.lmerMod <- function(x, ...) {
population_effects <- lme4::fixef(x) %>%
Expand Down Expand Up @@ -1026,13 +1026,13 @@ get_subparams.lmerMod <- function(x, ...) {
return(c(population_effects, group_vc, group_ef))
}

#' @keywords internal
#' @noRd
#' @export
get_subparams.glmerMod <- function(x, ...) {
return(get_subparams.lmerMod(x, ...))
}

#' @keywords internal
#' @noRd
#' @export
get_subparams.gamm4 <- function(x, ...) {
return(get_subparams.lm(x, ...))
Expand Down

0 comments on commit 7018ab0

Please sign in to comment.