Get gingival data

dat_name <- 'HMP_2012_16S_gingival_V35'
conditions_col <- 'body_subsite'
conditions <- c(condB = 'subgingival_plaque', condA = 'supragingival_plaque')
tse <- getBenchmarkData(dat_name, dryrun = FALSE)[[1]]
col_data <- tse |>
    colData() |>
    as.data.frame() |>
    tibble::rownames_to_column("sample_name") |>
    as_tibble()
subjects <- col_data |>
    pull(subject_id) |>
    unique()
sample_names <- vector("list", length(subjects))
names(sample_names) <- subjects
for (i in seq_along(subjects))  {
    current_subject <- subjects[i]
    sub_dat <- col_data |>
        filter(subject_id == current_subject) |>
        slice_max(order_by = visit_number, with_ties = TRUE, n = 1)
    if (nrow(sub_dat) < 2) {
        next
    }
    lgl_vct <- all(sort(sub_dat[[conditions_col]]) == conditions)
    if (isFALSE(lgl_vct)) {
        next
    }
    sample_names[[i]] <- sub_dat
}
sample_names <- discard(sample_names, is.null)
col_data_subset <- bind_rows(sample_names)
selected_samples <- col_data_subset |>
    pull(sample_name)
tse_subset <- tse[, selected_samples]
tse_subset <- filterTaxa(tse_subset)
rankNames <- colnames(rowData(tse_subset))
rankNames <- stringr::str_replace(rankNames, "superkingdom", "kingdom")
colnames(rowData(tse_subset)) <- rankNames
tse_subset
#> class: TreeSummarizedExperiment 
#> dim: 1556 230 
#> metadata(0):
#> assays(1): counts
#> rownames(1556): OTU_97.10005 OTU_97.10006 ... OTU_97.9966 OTU_97.9991
#> rowData names(7): kingdom phylum ... genus taxon_annotation
#> colnames(230): 700103497 700103496 ... 700109120 700109119
#> colData names(15): dataset subject_id ... sequencing_method
#>   variable_region_16s
#> reducedDimNames(0):
#> mainExpName: NULL
#> altExpNames(0):
#> rowLinks: a LinkDataFrame (1556 rows)
#> rowTree: 1 phylo tree(s) (45364 leaves)
#> colLinks: NULL
#> colTree: NULL

Convert to phyloseq

## Annotations are lost
ps <- makePhyloseqFromTreeSE(tse_subset)
#> Warning: Tips of rowTree are renamed to match rownames.
# ps <- convertToPhyloseq(tse_subset)
colnames(tax_table(ps)) <- str_to_sentence(colnames(tax_table(ps)))
ps
#> phyloseq-class experiment-level object
#> otu_table()   OTU Table:         [ 1556 taxa and 230 samples ]
#> sample_data() Sample Data:       [ 230 samples by 15 sample variables ]
#> tax_table()   Taxonomy Table:    [ 1556 taxa by 6 taxonomic ranks ]
#> phy_tree()    Phylogenetic Tree: [ 1556 tips and 1540 internal nodes ]

Lefse parameters

kwth <- 0.01
wth <- 0.01
ldath <- 3

Run Lefse with microbiomeMarker

mmLefse <- run_lefse(
    ps = ps,
    group = "body_subsite",
    taxa_rank = "none",
    norm = "CPM", # This is the relative abundance but with a total ofset to 1e6
    kw_cutoff = kwth,
    wilcoxon_cutoff = wth,
    lda_cutoff = ldath,
    multigrp_strat = FALSE,
    bootstrap_n = 30
)
## pvalue is from the KW
mmLefseTbl <- marker_table(mmLefse)
class(mmLefseTbl) <- NULL
mmLefseTbl <- as_tibble(mmLefseTbl)
dim(mmLefseTbl)
#> [1] 50  5

Run Lefse with lefser

lefserInput <- relativeAb(tse_subset)
colData(lefserInput)$body_subsite <- factor(
    colData(lefserInput)$body_subsite,
    levels = c("supragingival_plaque", "subgingival_plaque")
)

lefserOutput <- lefser(
    relab = lefserInput,
    kruskal.threshold = kwth,
    wilcox.threshold = wth,
    lda.threshold = 3,
    groupCol = "body_subsite",
    blockCol = NULL
)
#> Warning in lefser(relab = lefserInput, kruskal.threshold = kwth,
#> wilcox.threshold = wth, : Variables in the input are collinear. Try only with
#> the terminal nodes using `get_terminal_nodes` function
lefserTbl <- as_tibble(lefserOutput)
dim(lefserTbl)
#> [1] 19  2

Features in both

intersectOTUs <- intersect(mmLefseTbl$feature, lefserTbl$features)

In both cases supragingival plaque was used as reference

Positive LDA values = increased in subgingival plaque Negative LDA values = increased in supragingival plaque

lefserTbl |> 
    filter(features %in% intersectOTUs) |> 
    arrange(features)
#> # A tibble: 19 × 2
#>    features     scores
#>    <chr>         <dbl>
#>  1 OTU_97.126     3.00
#>  2 OTU_97.131     3.11
#>  3 OTU_97.17936   3.01
#>  4 OTU_97.214     3.33
#>  5 OTU_97.35359   3.01
#>  6 OTU_97.37368   3.06
#>  7 OTU_97.38234   3.42
#>  8 OTU_97.39904   3.26
#>  9 OTU_97.39982   3.43
#> 10 OTU_97.40468   3.56
#> 11 OTU_97.40495   3.12
#> 12 OTU_97.40650   3.18
#> 13 OTU_97.41422  -3.06
#> 14 OTU_97.42356  -3.41
#> 15 OTU_97.44594  -3.37
#> 16 OTU_97.44798   3.06
#> 17 OTU_97.44941  -3.41
#> 18 OTU_97.63      3.08
#> 19 OTU_97.99      3.11
mmLefseTbl |> 
    filter(feature %in% intersectOTUs) |> 
    arrange(feature)
#> # A tibble: 19 × 5
#>    feature      enrich_group         ef_lda   pvalue     padj
#>    <chr>        <chr>                 <dbl>    <dbl>    <dbl>
#>  1 OTU_97.126   subgingival_plaque     3.27 6.08e- 4 6.08e- 4
#>  2 OTU_97.131   subgingival_plaque     3.38 1.58e- 4 1.58e- 4
#>  3 OTU_97.17936 subgingival_plaque     3.27 1.76e- 4 1.76e- 4
#>  4 OTU_97.214   subgingival_plaque     3.59 4.40e- 3 4.40e- 3
#>  5 OTU_97.35359 subgingival_plaque     3.33 2.08e- 3 2.08e- 3
#>  6 OTU_97.37368 subgingival_plaque     3.29 8.97e- 6 8.97e- 6
#>  7 OTU_97.38234 subgingival_plaque     3.76 7.86e- 7 7.86e- 7
#>  8 OTU_97.39904 subgingival_plaque     3.55 1.15e- 6 1.15e- 6
#>  9 OTU_97.39982 subgingival_plaque     3.72 8.06e- 9 8.06e- 9
#> 10 OTU_97.40468 subgingival_plaque     3.85 7.87e- 8 7.87e- 8
#> 11 OTU_97.40495 subgingival_plaque     3.43 1.57e-11 1.57e-11
#> 12 OTU_97.40650 subgingival_plaque     3.51 1.75e- 7 1.75e- 7
#> 13 OTU_97.41422 supragingival_plaque   3.39 4.94e- 3 4.94e- 3
#> 14 OTU_97.42356 supragingival_plaque   3.80 1.81e- 3 1.81e- 3
#> 15 OTU_97.44594 supragingival_plaque   3.74 5.31e- 3 5.31e- 3
#> 16 OTU_97.44798 subgingival_plaque     3.44 2.18e- 3 2.18e- 3
#> 17 OTU_97.44941 supragingival_plaque   3.79 5.17e- 3 5.17e- 3
#> 18 OTU_97.63    subgingival_plaque     3.41 1.31e- 4 1.31e- 4
#> 19 OTU_97.99    subgingival_plaque     3.39 1.60e- 5 1.60e- 5

Session information

sessioninfo::session_info()
#> ─ Session info ───────────────────────────────────────────────────────────────
#>  setting  value
#>  version  R version 4.4.1 (2024-06-14)
#>  os       Ubuntu 22.04.4 LTS
#>  system   x86_64, linux-gnu
#>  ui       X11
#>  language en
#>  collate  en_US.UTF-8
#>  ctype    en_US.UTF-8
#>  tz       Etc/UTC
#>  date     2024-09-20
#>  pandoc   3.2 @ /usr/bin/ (via rmarkdown)
#> 
#> ─ Packages ───────────────────────────────────────────────────────────────────
#>  package                         * version    date (UTC) lib source
#>  abind                             1.4-8      2024-09-12 [1] RSPM (R 4.4.0)
#>  ade4                              1.7-22     2023-02-06 [1] RSPM (R 4.4.0)
#>  ANCOMBC                           2.6.0      2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  ape                               5.8        2024-04-11 [1] RSPM (R 4.4.0)
#>  aplot                             0.2.3      2024-06-17 [1] RSPM (R 4.4.0)
#>  backports                         1.5.0      2024-05-23 [1] RSPM (R 4.4.0)
#>  base64enc                         0.1-3      2015-07-28 [1] RSPM (R 4.4.0)
#>  beachmat                          2.20.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  beeswarm                          0.4.0      2021-06-01 [1] RSPM (R 4.4.0)
#>  Biobase                         * 2.64.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  BiocFileCache                     2.12.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  BiocGenerics                    * 0.50.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  BiocNeighbors                     1.22.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  BiocParallel                      1.38.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  BiocSingular                      1.20.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  biomformat                        1.32.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  Biostrings                      * 2.72.1     2024-06-02 [1] Bioconductor 3.19 (R 4.4.1)
#>  bit                               4.0.5      2022-11-15 [1] RSPM (R 4.4.0)
#>  bit64                             4.0.5      2020-08-30 [1] RSPM (R 4.4.0)
#>  bitops                            1.0-8      2024-07-29 [1] RSPM (R 4.4.0)
#>  blob                              1.2.4      2023-03-17 [1] RSPM (R 4.4.0)
#>  bluster                           1.14.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  boot                              1.3-30     2024-02-26 [2] CRAN (R 4.4.1)
#>  brio                              1.1.5      2024-04-24 [1] RSPM (R 4.4.0)
#>  bslib                             0.8.0      2024-07-29 [1] RSPM (R 4.4.0)
#>  cachem                            1.1.0      2024-05-16 [1] RSPM (R 4.4.0)
#>  caTools                           1.18.3     2024-09-04 [1] RSPM (R 4.4.0)
#>  cellranger                        1.1.0      2016-07-27 [1] RSPM (R 4.4.0)
#>  checkmate                         2.3.2      2024-07-29 [1] RSPM (R 4.4.0)
#>  circlize                          0.4.16     2024-02-20 [1] RSPM (R 4.4.0)
#>  class                             7.3-22     2023-05-03 [2] CRAN (R 4.4.1)
#>  cli                               3.6.3      2024-06-21 [1] RSPM (R 4.4.0)
#>  clue                              0.3-65     2023-09-23 [1] RSPM (R 4.4.0)
#>  cluster                           2.1.6      2023-12-01 [2] CRAN (R 4.4.1)
#>  codetools                         0.2-20     2024-03-31 [2] CRAN (R 4.4.1)
#>  coin                              1.4-3      2023-09-27 [1] RSPM (R 4.4.0)
#>  colorspace                        2.1-1      2024-07-26 [1] RSPM (R 4.4.0)
#>  ComplexHeatmap                    2.20.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  crayon                            1.5.3      2024-06-20 [1] RSPM (R 4.4.0)
#>  curl                              5.2.2      2024-08-26 [1] RSPM (R 4.4.0)
#>  CVXR                              1.0-14     2024-06-27 [1] RSPM (R 4.4.0)
#>  data.table                        1.16.0     2024-08-27 [1] RSPM (R 4.4.0)
#>  DBI                               1.2.3      2024-06-02 [1] RSPM (R 4.4.0)
#>  dbplyr                            2.5.0      2024-03-19 [1] RSPM (R 4.4.0)
#>  DECIPHER                          3.0.0      2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  decontam                          1.24.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  DelayedArray                      0.30.1     2024-05-07 [1] Bioconductor 3.19 (R 4.4.1)
#>  DelayedMatrixStats                1.26.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  desc                              1.4.3      2023-12-10 [1] RSPM (R 4.4.0)
#>  DescTools                         0.99.56    2024-08-22 [1] RSPM (R 4.4.0)
#>  DESeq2                            1.44.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  digest                            0.6.37     2024-08-19 [1] RSPM (R 4.4.0)
#>  DirichletMultinomial              1.46.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  doParallel                        1.0.17     2022-02-07 [1] RSPM (R 4.4.0)
#>  doRNG                             1.8.6      2023-01-16 [1] RSPM (R 4.4.0)
#>  dplyr                           * 1.1.4      2023-11-17 [1] RSPM (R 4.4.0)
#>  e1071                             1.7-16     2024-09-16 [1] RSPM (R 4.4.0)
#>  energy                            1.7-12     2024-08-24 [1] RSPM (R 4.4.0)
#>  evaluate                          1.0.0      2024-09-17 [1] RSPM (R 4.4.0)
#>  Exact                             3.3        2024-07-21 [1] RSPM (R 4.4.0)
#>  expm                              1.0-0      2024-08-19 [1] RSPM (R 4.4.0)
#>  fansi                             1.0.6      2023-12-08 [1] RSPM (R 4.4.0)
#>  farver                            2.1.2      2024-05-13 [1] RSPM (R 4.4.0)
#>  fastmap                           1.2.0      2024-05-15 [1] RSPM (R 4.4.0)
#>  filelock                          1.0.3      2023-12-11 [1] RSPM (R 4.4.0)
#>  foreach                           1.5.2      2022-02-02 [1] RSPM (R 4.4.0)
#>  foreign                           0.8-86     2023-11-28 [2] CRAN (R 4.4.1)
#>  Formula                           1.2-5      2023-02-24 [1] RSPM (R 4.4.0)
#>  fs                                1.6.4      2024-04-25 [1] RSPM (R 4.4.0)
#>  generics                          0.1.3      2022-07-05 [1] RSPM (R 4.4.0)
#>  GenomeInfoDb                    * 1.40.1     2024-05-24 [1] Bioconductor 3.19 (R 4.4.1)
#>  GenomeInfoDbData                  1.2.12     2024-06-25 [1] Bioconductor
#>  GenomicRanges                   * 1.56.1     2024-06-12 [1] Bioconductor 3.19 (R 4.4.1)
#>  GetoptLong                        1.0.5      2020-12-15 [1] RSPM (R 4.4.0)
#>  ggbeeswarm                        0.7.2      2023-04-29 [1] RSPM (R 4.4.0)
#>  ggfun                             0.1.6      2024-08-28 [1] RSPM (R 4.4.0)
#>  ggplot2                           3.5.1      2024-04-23 [1] RSPM (R 4.4.0)
#>  ggplotify                         0.1.2      2023-08-09 [1] RSPM (R 4.4.0)
#>  ggrepel                           0.9.6      2024-09-07 [1] RSPM (R 4.4.0)
#>  ggtree                            3.12.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  gld                               2.6.6      2022-10-23 [1] RSPM (R 4.4.0)
#>  glmnet                            4.1-8      2023-08-22 [1] RSPM (R 4.4.0)
#>  GlobalOptions                     0.1.2      2020-06-10 [1] RSPM (R 4.4.0)
#>  glue                              1.7.0      2024-01-09 [1] RSPM (R 4.4.0)
#>  gmp                               0.7-5      2024-08-23 [1] RSPM (R 4.4.0)
#>  gplots                            3.1.3.1    2024-02-02 [1] RSPM (R 4.4.0)
#>  gridExtra                         2.3        2017-09-09 [1] RSPM (R 4.4.0)
#>  gridGraphics                      0.5-1      2020-12-13 [1] RSPM (R 4.4.0)
#>  gsl                               2.1-8      2023-01-24 [1] RSPM (R 4.4.0)
#>  gtable                            0.3.5      2024-04-22 [1] RSPM (R 4.4.0)
#>  gtools                            3.9.5      2023-11-20 [1] RSPM (R 4.4.0)
#>  Hmisc                             5.1-3      2024-05-28 [1] RSPM (R 4.4.0)
#>  htmlTable                         2.4.3      2024-07-21 [1] RSPM (R 4.4.0)
#>  htmltools                         0.5.8.1    2024-04-04 [1] RSPM (R 4.4.0)
#>  htmlwidgets                       1.6.4      2023-12-06 [1] RSPM (R 4.4.0)
#>  httr                              1.4.7      2023-08-15 [1] RSPM (R 4.4.0)
#>  igraph                            2.0.3      2024-03-13 [1] RSPM (R 4.4.0)
#>  IRanges                         * 2.38.1     2024-07-03 [1] Bioconductor 3.19 (R 4.4.1)
#>  irlba                             2.3.5.1    2022-10-03 [1] RSPM (R 4.4.0)
#>  iterators                         1.0.14     2022-02-05 [1] RSPM (R 4.4.0)
#>  jquerylib                         0.1.4      2021-04-26 [1] RSPM (R 4.4.0)
#>  jsonlite                          1.8.8      2023-12-04 [1] RSPM (R 4.4.0)
#>  KernSmooth                        2.23-24    2024-05-17 [2] CRAN (R 4.4.1)
#>  knitr                             1.48       2024-07-07 [1] RSPM (R 4.4.0)
#>  lattice                           0.22-6     2024-03-20 [2] CRAN (R 4.4.1)
#>  lazyeval                          0.2.2      2019-03-15 [1] RSPM (R 4.4.0)
#>  lefser                          * 1.15.9     2024-09-20 [1] Github (waldronlab/lefser@4412c88)
#>  libcoin                           1.0-10     2023-09-27 [1] RSPM (R 4.4.0)
#>  lifecycle                         1.0.4      2023-11-07 [1] RSPM (R 4.4.0)
#>  limma                             3.60.4     2024-07-17 [1] Bioconductor 3.19 (R 4.4.1)
#>  lme4                              1.1-35.5   2024-07-03 [1] RSPM (R 4.4.0)
#>  lmerTest                          3.1-3      2020-10-23 [1] RSPM (R 4.4.0)
#>  lmom                              3.0        2023-08-29 [1] RSPM (R 4.4.0)
#>  locfit                            1.5-9.10   2024-06-24 [1] RSPM (R 4.4.0)
#>  magrittr                          2.0.3      2022-03-30 [1] RSPM (R 4.4.0)
#>  MASS                              7.3-61     2024-06-13 [2] RSPM (R 4.4.0)
#>  Matrix                            1.7-0      2024-04-26 [2] CRAN (R 4.4.1)
#>  MatrixGenerics                  * 1.16.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  matrixStats                     * 1.4.1      2024-09-08 [1] RSPM (R 4.4.0)
#>  memoise                           2.0.1      2021-11-26 [1] RSPM (R 4.4.0)
#>  metagenomeSeq                     1.46.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  mgcv                              1.9-1      2023-12-21 [2] CRAN (R 4.4.1)
#>  mia                             * 1.12.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  MicrobiomeBenchmarkData         * 1.6.0      2024-05-02 [1] Bioconductor 3.19 (R 4.4.1)
#>  MicrobiomeBenchmarkDataAnalyses * 0.99.11    2024-09-20 [1] Github (waldronlab/MicrobiomeBenchmarkDataAnalyses@77d57d4)
#>  microbiomeMarker                * 1.10.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  minqa                             1.2.8      2024-08-17 [1] RSPM (R 4.4.0)
#>  modeltools                        0.2-23     2020-03-05 [1] RSPM (R 4.4.0)
#>  multcomp                          1.4-26     2024-07-18 [1] RSPM (R 4.4.0)
#>  MultiAssayExperiment            * 1.30.3     2024-07-10 [1] Bioconductor 3.19 (R 4.4.1)
#>  multtest                          2.60.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  munsell                           0.5.1      2024-04-01 [1] RSPM (R 4.4.0)
#>  mvtnorm                           1.3-1      2024-09-03 [1] RSPM (R 4.4.0)
#>  nlme                              3.1-165    2024-06-06 [2] RSPM (R 4.4.0)
#>  nloptr                            2.1.1      2024-06-25 [1] RSPM (R 4.4.0)
#>  nnet                              7.3-19     2023-05-03 [2] CRAN (R 4.4.1)
#>  numDeriv                          2016.8-1.1 2019-06-06 [1] RSPM (R 4.4.0)
#>  patchwork                         1.3.0      2024-09-16 [1] RSPM (R 4.4.0)
#>  permute                           0.9-7      2022-01-27 [1] RSPM (R 4.4.0)
#>  phyloseq                        * 1.48.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  pillar                            1.9.0      2023-03-22 [1] RSPM (R 4.4.0)
#>  pkgconfig                         2.0.3      2019-09-22 [1] RSPM (R 4.4.0)
#>  pkgdown                           2.1.1      2024-09-17 [1] RSPM (R 4.4.0)
#>  plotROC                           2.3.1      2023-10-06 [1] RSPM (R 4.4.0)
#>  plyr                              1.8.9      2023-10-02 [1] RSPM (R 4.4.0)
#>  png                               0.1-8      2022-11-29 [1] RSPM (R 4.4.0)
#>  proxy                             0.4-27     2022-06-09 [1] RSPM (R 4.4.0)
#>  purrr                           * 1.0.2      2023-08-10 [1] RSPM (R 4.4.0)
#>  R6                                2.5.1      2021-08-19 [1] RSPM (R 4.4.0)
#>  ragg                              1.3.3      2024-09-11 [1] RSPM (R 4.4.0)
#>  rbibutils                         2.2.16     2023-10-25 [1] RSPM (R 4.4.0)
#>  RColorBrewer                      1.1-3      2022-04-03 [1] RSPM (R 4.4.0)
#>  Rcpp                              1.0.13     2024-07-17 [1] RSPM (R 4.4.0)
#>  Rdpack                            2.6.1      2024-08-06 [1] RSPM (R 4.4.0)
#>  readxl                            1.4.3      2023-07-06 [1] RSPM (R 4.4.0)
#>  reshape2                          1.4.4      2020-04-09 [1] RSPM (R 4.4.0)
#>  rhdf5                             2.48.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  rhdf5filters                      1.16.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  Rhdf5lib                          1.26.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  rjson                             0.2.23     2024-09-16 [1] RSPM (R 4.4.0)
#>  rlang                             1.1.4      2024-06-04 [1] RSPM (R 4.4.0)
#>  rmarkdown                         2.28       2024-08-17 [1] RSPM (R 4.4.0)
#>  Rmpfr                             0.9-5      2024-01-21 [1] RSPM (R 4.4.0)
#>  rngtools                          1.5.2      2021-09-20 [1] RSPM (R 4.4.0)
#>  rootSolve                         1.8.2.4    2023-09-21 [1] RSPM (R 4.4.0)
#>  rpart                             4.1.23     2023-12-05 [2] CRAN (R 4.4.1)
#>  RSQLite                           2.3.7      2024-05-27 [1] RSPM (R 4.4.0)
#>  rstudioapi                        0.16.0     2024-03-24 [1] RSPM (R 4.4.0)
#>  rsvd                              1.0.5      2021-04-16 [1] RSPM (R 4.4.0)
#>  S4Arrays                          1.4.1      2024-05-20 [1] Bioconductor 3.19 (R 4.4.1)
#>  S4Vectors                       * 0.42.1     2024-07-03 [1] Bioconductor 3.19 (R 4.4.1)
#>  sandwich                          3.1-1      2024-09-15 [1] RSPM (R 4.4.0)
#>  sass                              0.4.9      2024-03-15 [1] RSPM (R 4.4.0)
#>  ScaledMatrix                      1.12.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  scales                            1.3.0      2023-11-28 [1] RSPM (R 4.4.0)
#>  scater                            1.32.1     2024-07-21 [1] Bioconductor 3.19 (R 4.4.1)
#>  scuttle                           1.14.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  sessioninfo                       1.2.2      2021-12-06 [1] RSPM (R 4.4.0)
#>  shape                             1.4.6.1    2024-02-23 [1] RSPM (R 4.4.0)
#>  SingleCellExperiment            * 1.26.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  SparseArray                       1.4.8      2024-05-24 [1] Bioconductor 3.19 (R 4.4.1)
#>  sparseMatrixStats                 1.16.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  statmod                           1.5.0      2023-01-06 [1] RSPM (R 4.4.0)
#>  stringi                           1.8.4      2024-05-06 [1] RSPM (R 4.4.0)
#>  stringr                         * 1.5.1      2023-11-14 [1] RSPM (R 4.4.0)
#>  SummarizedExperiment            * 1.34.0     2024-05-01 [1] Bioconductor 3.19 (R 4.4.1)
#>  survival                          3.7-0      2024-06-05 [2] RSPM (R 4.4.0)
#>  systemfonts                       1.1.0      2024-05-15 [1] RSPM (R 4.4.0)
#>  testthat                          3.2.1.1    2024-04-14 [1] RSPM (R 4.4.0)
#>  textshaping                       0.4.0      2024-05-24 [1] RSPM (R 4.4.0)
#>  TH.data                           1.1-2      2023-04-17 [1] RSPM (R 4.4.0)
#>  tibble                            3.2.1      2023-03-20 [1] RSPM (R 4.4.0)
#>  tidyr                             1.3.1      2024-01-24 [1] RSPM (R 4.4.0)
#>  tidyselect                        1.2.1      2024-03-11 [1] RSPM (R 4.4.0)
#>  tidytree                          0.4.6      2023-12-12 [1] RSPM (R 4.4.0)
#>  treeio                            1.28.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  TreeSummarizedExperiment        * 2.12.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  UCSC.utils                        1.0.0      2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  utf8                              1.2.4      2023-10-22 [1] RSPM (R 4.4.0)
#>  vctrs                             0.6.5      2023-12-01 [1] RSPM (R 4.4.0)
#>  vegan                             2.6-8      2024-08-28 [1] RSPM (R 4.4.0)
#>  vipor                             0.4.7      2023-12-18 [1] RSPM (R 4.4.0)
#>  viridis                           0.6.5      2024-01-29 [1] RSPM (R 4.4.0)
#>  viridisLite                       0.4.2      2023-05-02 [1] RSPM (R 4.4.0)
#>  withr                             3.0.1      2024-07-31 [1] RSPM (R 4.4.0)
#>  Wrench                            1.22.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  xfun                              0.47       2024-08-17 [1] RSPM (R 4.4.0)
#>  XVector                         * 0.44.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  yaml                              2.3.10     2024-07-26 [1] RSPM (R 4.4.0)
#>  yulab.utils                       0.1.7      2024-08-26 [1] RSPM (R 4.4.0)
#>  zlibbioc                          1.50.0     2024-04-30 [1] Bioconductor 3.19 (R 4.4.1)
#>  zoo                               1.8-12     2023-04-13 [1] RSPM (R 4.4.0)
#> 
#>  [1] /usr/local/lib/R/site-library
#>  [2] /usr/local/lib/R/library
#> 
#> ──────────────────────────────────────────────────────────────────────────────