Skip to content

Commit

Permalink
fix docu
Browse files Browse the repository at this point in the history
  • Loading branch information
wolski committed Apr 30, 2024
1 parent d0dd6fa commit f063261
Show file tree
Hide file tree
Showing 8 changed files with 18 additions and 18 deletions.
18 changes: 9 additions & 9 deletions R/tidyMS_R6_Modelling.R
Original file line number Diff line number Diff line change
Expand Up @@ -603,7 +603,7 @@ make_model <- function(model = c("factors", "interaction")){
#' @keywords internal
#' @examples
#'
#' m <- make_model( " ~ Treatment + Background")
#' m <- make_model( "factors")
#' Contr <- c("TreatmentA_vs_B" = "TreatmentA - TreatmentB",
#' "BackgroundX_vs_Z" = "BackgroundX - BackgroundZ",
#' "IntoflintoA" = "`TreatmentA:BackgroundX` - `TreatmentA:BackgroundZ`",
Expand All @@ -618,7 +618,7 @@ make_model <- function(model = c("factors", "interaction")){
#' stopifnot(sum(x["interactXZ",]) ==0 )
#' stopifnot(sum(x["interactAB",]) ==0 )
#'
#' m <- make_model( " ~ Treatment * Background")
#' m <- make_model( "interaction")
#' linfct <- linfct_from_model(m, as_list = FALSE)
#' x<- linfct_matrix_contrasts(linfct, Contr )
#' stopifnot(sum(x["interactXZ",]) ==1 )
Expand Down Expand Up @@ -656,7 +656,7 @@ linfct_matrix_contrasts <- function(linfct , contrasts, p.message = FALSE){
#' @keywords internal
#' @family modelling
#' @examples
#' m <- make_model( " ~ Treatment * Background")
#' m <- make_model( "interaction")
#' linfct <- linfct_from_model(m)
#' xl <- prolfqua::linfct_all_possible_contrasts(linfct$linfct_factors)
#' xx <- prolfqua::linfct_all_possible_contrasts(linfct$linfct_interactions)
Expand All @@ -681,7 +681,7 @@ linfct_all_possible_contrasts <- function(lin_int ){
#' @keywords internal
#' @examples
#'
#' m <- make_model( " ~ Treatment * Background")
#' m <- make_model( "interaction")
#' xl <- linfct_factors_contrasts(m)
#' m <- lm(Petal.Width ~ Species, data = iris)
#' linfct_factors_contrasts(m)
Expand Down Expand Up @@ -711,12 +711,12 @@ linfct_factors_contrasts <- function(m){
#' @keywords internal
#' @examples
#'
#' mb <- make_model( " ~ Treatment * Background")
#' mb <- make_model( "interaction")
#' linfct <- linfct_from_model(mb)
#' names(linfct)
#' my_glht(mb, linfct$linfct_factors)
#'
#' m <- make_model( " ~ Treatment + Background")
#' m <- make_model( "factors")
#' linfct <- linfct_from_model(m)$linfct_factors
#' my_glht(m, linfct)
#'
Expand Down Expand Up @@ -770,7 +770,7 @@ my_glht <- function(model, linfct , sep = TRUE ) {
#' @keywords internal
#' @examples
#'
#' m <- make_model( " ~ Treatment + Background")
#' m <- make_model( "factors")
#' linfct <- linfct_from_model(m)$linfct_factors
#' my_glht(m, linfct)
#' my_contrast(m, linfct, confint = 0.95)
Expand Down Expand Up @@ -828,7 +828,7 @@ my_contrast <- function(m,
#' @family modelling
#' @keywords internal
#' @examples
#' m <- make_model( " ~ Treatment + Background")
#' m <- make_model( "factors")
#' linfct <- linfct_from_model(m)$linfct_factors
#' my_contrast_V1(m, linfct, confint = 0.95)
#' my_contrast_V1(m, linfct, confint = 0.99)
Expand Down Expand Up @@ -856,7 +856,7 @@ my_contrast_V1 <- function(incomplete, linfct, confint = 0.95){
#' @family modelling
#' @keywords internal
#' @examples
#' m <- make_model( " ~ Treatment + Background")
#' m <- make_model( "factors")
#' linfct <- linfct_from_model(m)$linfct_factors
#' my_contrast_V2(m, linfct, confint = 0.95)
#' my_contrast_V2(m, linfct, confint = 0.99)
Expand Down
2 changes: 1 addition & 1 deletion man/linfct_all_possible_contrasts.Rd

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

2 changes: 1 addition & 1 deletion man/linfct_factors_contrasts.Rd

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

4 changes: 2 additions & 2 deletions man/linfct_matrix_contrasts.Rd

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

2 changes: 1 addition & 1 deletion man/my_contrast.Rd

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

2 changes: 1 addition & 1 deletion man/my_contrast_V1.Rd

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

2 changes: 1 addition & 1 deletion man/my_contrast_V2.Rd

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

4 changes: 2 additions & 2 deletions man/my_glht.Rd

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

0 comments on commit f063261

Please sign in to comment.