Skip to content

Commit

Permalink
remove p1807 example data by replacing with simulated data.
Browse files Browse the repository at this point in the history
  • Loading branch information
wolski committed May 22, 2024
1 parent 93c5831 commit eb7369d
Show file tree
Hide file tree
Showing 23 changed files with 12 additions and 141 deletions.
17 changes: 0 additions & 17 deletions R/A_dataset_docu.R
Original file line number Diff line number Diff line change
Expand Up @@ -59,9 +59,6 @@ NULL
#' @name PACKAGE_DATA
NULL

# data_basicModel_p1807 <- prolfqua::basicModel_p1807
# usethis::use_data(data_basicModel_p1807, compress = TRUE, overwrite = TRUE)
# file.remove("data/basicModel_p1807.rda")

#' SAINT express output
#'
Expand All @@ -77,14 +74,7 @@ NULL



#' Model for debugging
#' @family data
#' @keywords internal
#' @docType data
#' @format a linear model
"data_basicModel_p1807"

# #@usage data_basicModel_p1807 <- prolfqua_data("data_basicModel_p1807")

# data_benchmarkExample <- prolfqua::benchmarkDataExample
# usethis::use_data(data_benchmarkExample, compress = TRUE, overwrite = TRUE)
Expand Down Expand Up @@ -167,13 +157,6 @@ NULL




#' example data for check
#' @family data
#' @docType data
#' @keywords internal
'data_interactionModel_p1807'

# #@usage data_interactionModel_p1807 <- prolfqua_data("data_interactionModel_p1807")


Expand Down
17 changes: 6 additions & 11 deletions R/tidyMS_R6_Modelling.R
Original file line number Diff line number Diff line change
Expand Up @@ -359,7 +359,6 @@ model_analyse <- function(pepIntensity,
#' @family modelling
#' @keywords internal
#' @examples
#' # m <- prolfqua_data('data_interactionModel_p1807')
#' m <- sim_make_model_lmer()
#' plot_lmer_peptide_predictions(m, intensity = "abundance")
#' m <- sim_make_model_lmer("interaction")
Expand Down Expand Up @@ -823,25 +822,21 @@ my_contrast_V2 <- function(m, linfct,confint = 0.95){
#' @keywords internal
#' @examples
#'
#' mb <- prolfqua_data('data_basicModel_p1807')
#' mb <- sim_make_model_lmer("interaction")
#' summary(mb)
#'
#' linfct <- linfct_from_model(mb)
#' names(linfct)
#' my_contest(mb, linfct$linfct_factors)
#' my_contest(mb, linfct$linfct_interactions)
#'
#' # my_glht(mb, linfct$linfct_factors)
#' # my_glht(mb, linfct$linfct_interactions)
#' if(require(multcomp)){
#' my_glht(mb, linfct$linfct_factors)
#' my_glht(mb, linfct$linfct_interactions)
#' }
#' length(mb@beta)
#' lmerTest::contest(mb, c( 0 ,1 , 0 , 0),joint = FALSE)
#' summary(mb)
#'
#'
#' #library(pbkrtest)
#' #(fm1 <- lme4::lmer(Reaction ~ Days + (Days | Subject), sleepstudy))
#' #class(fm1)
#' #pbkrtest::get_ddf_Lb.lmerMod(fm1)
#'
my_contest <- function(model, linfct, ddf = c("Satterthwaite", "Kenward-Roger")){
ddf <- match.arg(ddf)
if (length(lme4::fixef(model)) != ncol(linfct) ) {
Expand Down
Binary file removed data/data_basicModel_p1807.rda
Binary file not shown.
Binary file removed data/data_interactionModel_p1807.rda
Binary file not shown.
2 changes: 0 additions & 2 deletions man/PACKAGE_DATA.Rd

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

2 changes: 0 additions & 2 deletions man/data_IonstarProtein_subsetNorm.Rd

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

2 changes: 0 additions & 2 deletions man/data_SAINTe_output.Rd

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

36 changes: 0 additions & 36 deletions man/data_basicModel_p1807.Rd

This file was deleted.

2 changes: 0 additions & 2 deletions man/data_benchmarkExample.Rd

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

2 changes: 0 additions & 2 deletions man/data_checksummarizationrobust87.Rd

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

2 changes: 0 additions & 2 deletions man/data_checksummarizerobust.Rd

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

2 changes: 0 additions & 2 deletions man/data_checksummarizerobust69.Rd

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

2 changes: 0 additions & 2 deletions man/data_correlatedPeptideList.Rd

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

36 changes: 0 additions & 36 deletions man/data_interactionModel_p1807.Rd

This file was deleted.

2 changes: 0 additions & 2 deletions man/data_ionstar.Rd

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

2 changes: 0 additions & 2 deletions man/data_multigroupFC.Rd

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

2 changes: 0 additions & 2 deletions man/data_skylinePRMSample_A.Rd

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

2 changes: 0 additions & 2 deletions man/data_skylineSRM_HL_A.Rd

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

2 changes: 0 additions & 2 deletions man/data_spectronautDIA250_A.Rd

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

2 changes: 0 additions & 2 deletions man/data_test_confusion_matrix_scores.Rd

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

16 changes: 6 additions & 10 deletions man/my_contest.Rd

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

1 change: 0 additions & 1 deletion man/plot_lmer_peptide_predictions.Rd

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

2 changes: 0 additions & 2 deletions man/prolfqua_data.Rd

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

0 comments on commit eb7369d

Please sign in to comment.