This document shows an example microViz analysis workflow using example data atlas1006 from the microbiome package.

Get example data

# get some example data
data("atlas1006", package = "microbiome")

# create a couple of numerical variables (often more useful than character strings)
ps <- atlas1006 %>%
  ps_mutate(
    weight = recode(
      .x = bmi_group, morbidobese = 5, severeobese = 4,
      obese = 3, overweight = 2, lean = 1, underweight = 0
    ),
    lean = if_else(weight < 2, true = 1, false = 0, missing = 0),
    female = if_else(sex == "female", true = 1, false = 0),
    extract_P = if_else(DNA_extraction_method == "p", true = 1, false = 0)
  ) %>%
  # only look at the baseline time point if multiple samples available
  # and drop samples with no DNA extraction method info
  ps_filter(time == 0, !is.na(DNA_extraction_method)) %>%
  # remove the sample data variables about time
  ps_select(-time)

# add a couple of missing values to show how microViz handles missing data
sample_data(ps)$female[c(3, 4)] <- NA

# look at phyloseq object description
ps
#> phyloseq-class experiment-level object
#> otu_table()   OTU Table:         [ 125 taxa and 801 samples ]
#> sample_data() Sample Data:       [ 801 samples by 13 sample variables ]
#> tax_table()   Taxonomy Table:    [ 125 taxa by 3 taxonomic ranks ]
# this example data has a slightly odd tax_table because it comes from HITChip data (instead of sequencing)
# the taxonomic assignment is done differently, so we need to ensure taxon names are not repeated across columns
# it can otherwise be used the same as sequencing data for this example
tax_table(ps) %>% head(3)
#> Taxonomy Table:     [3 taxa by 3 taxonomic ranks]:
#>                  Phylum            Family            Genus             
#> Actinomycetaceae "Actinobacteria"  "Actinobacteria"  "Actinomycetaceae"
#> Aerococcus       "Firmicutes"      "Bacilli"         "Aerococcus"      
#> Akkermansia      "Verrucomicrobia" "Verrucomicrobia" "Akkermansia"
ps <- ps %>% tax_prepend_ranks()
tax_table(ps) %>% head(3)
#> Taxonomy Table:     [3 taxa by 3 taxonomic ranks]:
#>                  Phylum               Family               Genus                
#> Actinomycetaceae "P: Actinobacteria"  "F: Actinobacteria"  "G: Actinomycetaceae"
#> Aerococcus       "P: Firmicutes"      "F: Bacilli"         "G: Aerococcus"      
#> Akkermansia      "P: Verrucomicrobia" "F: Verrucomicrobia" "G: Akkermansia"
# replace any uninformative tax_table values
ps <- ps %>% tax_fix()

# look at the effect of removing rare Genera, e.g. how many Genera are present in at least 5% of samples?
ps %>% tax_filter(min_prevalence = 5 / 100, tax_level = "Genus")
#> Proportional min_prevalence given: 0.05 --> min 41/801 samples.
#> phyloseq-class experiment-level object
#> otu_table()   OTU Table:         [ 117 taxa and 801 samples ]
#> sample_data() Sample Data:       [ 801 samples by 13 sample variables ]
#> tax_table()   Taxonomy Table:    [ 117 taxa by 3 taxonomic ranks ]
# we will use this udring other analyses, but not overwrite the original phyloseq object as the
# unfiltered set of taxa would be required if we were performing e.g. alpha diversity analyses

Exploring your data

Ordination plots

Ordination methods can help you to visualize variation in overall microbial ecosystem composition, and look at whether it might differ markedly between groups, e.g. weight.

Here is one option to try first:

  1. Filter out rare taxa (e.g. remove Genera not present in at least 5% of samples) - use tax_filter()
  2. Aggregate the taxa into bacterial families (for example) - use tax_agg()
  3. Transform the microbial data with the centered-log-ratio transformation - use tax_transform()
  4. Perform PCA with the CLR-transformed features (equivalent to Aitchison distance PCoA) - use ord_calc()
  5. Plot the first 2 axes of this PCA ordination, colouring samples by group and adding taxon loading arrows to visualise which taxa generally differ across your samples - use ord_plot()
  6. Customise the theme of the ggplot as you like and/or add features like ellipses or annotations
clr_pca <- ps %>%
  tax_filter(min_prevalence = 5 / 100, tax_level = "Genus") %>%
  tax_agg("Genus") %>% # aggregate taxa at Genus level
  tax_transform("clr") %>% # centered log ratio transformation
  ord_calc(method = "PCA") # Note: PCA is RDA without constraints (& ord_calc uses an RDA method to perform PCA)
#> Proportional min_prevalence given: 0.05 --> min 41/801 samples.
clr_pca
#> psExtra object - a phyloseq object with extra slots:
#> 
#> phyloseq-class experiment-level object
#> otu_table()   OTU Table:         [ 117 taxa and 801 samples ]
#> sample_data() Sample Data:       [ 801 samples by 13 sample variables ]
#> tax_table()   Taxonomy Table:    [ 117 taxa by 3 taxonomic ranks ]
#> 
#> otu_get(counts = TRUE)        [ 117 taxa and 801 samples ]
#> 
#> psExtra info:
#> tax_agg = "Genus" tax_trans = "clr" 
#> 
#> ordination of class: rda cca 
#> rda(formula = OTU ~ 1, data = data)
#> Ordination info:
#> method = 'PCA'   
clr_pca %>%
  ord_plot(colour = "weight", shape = "DNA_extraction_method", alpha = 0.7, size = 1.5) +
  scale_colour_viridis_c(option = "inferno", direction = -1, end = 0.8) +
  scale_shape_manual(
    values = c(o = "square open", r = "triangle open", p = "circle"),
    name = "DNA\nextraction\nmethod"
  )

Taxonomic compositions?

Using a PCA ordination allows us reliably draw biplots, showing which taxa are associated with this major variation in sample microbiota composition as represented on axes PC1 and PC2.

pca <- clr_pca %>%
  ord_plot(
    colour = "weight", shape = "DNA_extraction_method", alpha = 0.7, size = 1,
    plot_taxa = 12:1, tax_vec_length = 0.3,
    taxon_renamer = function(x) stringr::str_remove_all(x, "^G: | [ae]t rel."),
    center = TRUE,
    tax_lab_style = tax_lab_style(
      type = "label", max_angle = 90, fontface = "bold",
      alpha = 0.8, size = 2
    )
  ) +
  scale_colour_viridis_c(option = "inferno", direction = -1, end = 0.8) +
  scale_shape_manual(
    values = c(o = "square open", r = "triangle open", p = "circle"),
    name = "DNA\nextraction\nmethod"
  ) +
  # essential for correct label angles
  coord_fixed(clip = "off", xlim = c(-1.5, 1.5), ylim = c(-1.5, 1.5))
pca

What about the actual compositions of these 800 samples?

iris <- clr_pca %>%
  ord_plot_iris(
    tax_level = "Genus", n_taxa = 15,
    anno_binary = "extract_P",
    anno_binary_style = list(y = 1.1, size = 0.5, alpha = 0.3, shape = 1),
    taxon_renamer = function(x) stringr::str_remove_all(x, "^G: | [ae]t rel.")
  )

iris

You can arrange both plots together with patchwork package.

pca / iris

Testing hypotheses

PERMANOVA

What variables is the overall microbial community variation associated with?

ps %>%
  tax_filter(min_prevalence = 5 / 100, tax_level = "Genus") %>%
  tax_agg("Genus") %>%
  dist_calc("aitchison") %>%
  dist_permanova(
    variables = c("DNA_extraction_method", "weight", "female"),
    n_perms = 99, # this is a low number of permutations for speed, you should set more e.g. 9999
    seed = 12345, complete_cases = TRUE, verbose = "max"
  )
#> Proportional min_prevalence given: 0.05 --> min 41/801 samples.
#> Dropping samples with missings: 17
#> weight has NAs: 15
#> female has NAs: 2
#> 2024-04-03 12:23:23.870679 - Starting PERMANOVA with 99 perms with 1 processes
#> 2024-04-03 12:23:26.696788 - Finished PERMANOVA
#> psExtra object - a phyloseq object with extra slots:
#> 
#> phyloseq-class experiment-level object
#> otu_table()   OTU Table:         [ 117 taxa and 784 samples ]
#> sample_data() Sample Data:       [ 784 samples by 13 sample variables ]
#> tax_table()   Taxonomy Table:    [ 117 taxa by 3 taxonomic ranks ]
#> 
#> psExtra info:
#> tax_agg = "Genus" 
#> 
#> aitchison distance matrix of size 784 
#> 10.80016 12.87657 14.29766 13.91425 11.64419 ...
#> 
#> permanova:
#> Permutation test for adonis under reduced model
#> Marginal effects of terms
#> Permutation: free
#> Number of permutations: 99
#> 
#> vegan::adonis2(formula = formula, data = metadata, permutations = n_perms, by = by, parallel = parall)
#>                        Df SumOfSqs      R2       F Pr(>F)   
#> DNA_extraction_method   2     8847 0.12742 58.3201   0.01 **
#> weight                  1      259 0.00372  3.4087   0.01 **
#> female                  1      317 0.00456  4.1742   0.01 **
#> Residual              779    59084 0.85098                  
#> Total                 783    69431 1.00000                  
#> ---
#> Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Visualising significant predictors?

(Partial) Constrained ordination can be useful to show microbial variation explained by predictors significant in PERMANOVA analyses.

# constraints need to be on the same or similar scales for comparability
# so make binary variables and scale the weight variable
ps <- ps %>%
  ps_mutate(
    wt_scaled = c(scale(weight, center = TRUE, scale = TRUE)),
    P = if_else(DNA_extraction_method == "p", 1, 0),
    R = if_else(DNA_extraction_method == "r", 1, 0),
    O = if_else(DNA_extraction_method == "o", 1, 0)
  )
constr_ord <- ps %>%
  tax_filter(min_prevalence = 5 / 100, tax_level = "Genus") %>%
  tax_agg("Genus") %>%
  tax_transform("clr") %>%
  ord_calc(
    method = "RDA", constraints = c("female", "wt_scaled", "P", "R", "O")
  )
#> Proportional min_prevalence given: 0.05 --> min 41/801 samples.
#> Dropping samples with missings: 17
#> 
#> Centering (mean) and scaling (sd) the constraints and/or conditions:
#>  female
#>  wt_scaled
#>  P
#>  R
#>  O
constr_ord
#> psExtra object - a phyloseq object with extra slots:
#> 
#> phyloseq-class experiment-level object
#> otu_table()   OTU Table:         [ 117 taxa and 784 samples ]
#> sample_data() Sample Data:       [ 784 samples by 17 sample variables ]
#> tax_table()   Taxonomy Table:    [ 117 taxa by 3 taxonomic ranks ]
#> 
#> otu_get(counts = TRUE)        [ 117 taxa and 801 samples ]
#> 
#> psExtra info:
#> tax_agg = "Genus" tax_trans = "clr" 
#> 
#> ordination of class: rda cca 
#> rda(formula = OTU ~ female + wt_scaled + P + R + O, data = data)
#> Ordination info:
#> method = 'RDA'   constraints = 'female+wt_scaled+P+R+O'  
ord_plot(constr_ord, plot_taxa = 10:1, colour = "DNA_extraction_method", shape = 1) +
  scale_color_brewer(palette = "Set2", name = "DNA\nextraction\nmethod")

As DNA extraction method dominates the plot above, we could try “partialing out” the variation explained by DNA extraction method, prior to constraining on the other factors of interest.

ps %>%
  tax_filter(min_prevalence = 5 / 100, tax_level = "Genus") %>%
  tax_agg("Genus") %>%
  tax_transform("clr") %>%
  ord_calc(
    method = "RDA", conditions = c("P", "R", "O"),
    constraints = c("female", "wt_scaled")
  ) %>%
  ord_plot(plot_taxa = 10:1, colour = "DNA_extraction_method", shape = 1) +
  scale_color_brewer(palette = "Set2", name = "DNA\nextraction\nmethod")
#> Proportional min_prevalence given: 0.05 --> min 41/801 samples.
#> Dropping samples with missings: 17
#> 
#> Centering (mean) and scaling (sd) the constraints and/or conditions:
#>  female
#>  wt_scaled
#>  P
#>  R
#>  O

Taxon models

What are the effects of these factors on individual taxa? Let’s use beta binomial regression models to find out. We will skip fitting models for genera here, only for speed of generating this example. You should include all ranks (which is the default) for the best use of taxatree_plots.

See the taxon modelling article for a more comprehensive look at the taxatree_* family of functions.

library(corncob)
tt_models <- ps %>%
  tax_filter(min_prevalence = 5 / 100, tax_level = "Genus") %>%
  taxatree_models(
    ranks = c("Phylum", "Family"),
    variables = c("female", "wt_scaled", "P", "R"),
    type = "bbdml", verbose = "max"
  )
#> Proportional min_prevalence given: 0.05 --> min 41/801 samples.
#> 2024-04-03 12:23:30.401232 - modelling at rank: Phylum
#> Warning in do.call(fun, list(txt)): 2 / 801 values are NA in female
#> Warning in do.call(fun, list(txt)): 15 / 801 values are NA in wt_scaled
#> 2024-04-03 12:23:34.231279 - modelling at rank: Family
#> Warning in do.call(fun, list(txt)): 2 / 801 values are NA in female

#> Warning in do.call(fun, list(txt)): 15 / 801 values are NA in wt_scaled
tt_stats <- taxatree_models2stats(tt_models, param = "mu")

Visualize the results compactly on a microViz taxonomic association tree.

tt_stats %>%
  taxatree_plotkey(
    node_size_range = c(2, 8), size_stat = list(mean = mean),
    rank == "Phylum",
    taxon_renamer = function(x) stringr::str_remove_all(x, "^.: | [ae]t rel.")
  )

tt_stats %>%
  taxatree_plots(
    node_size_range = c(1, 5), size_stat = list(mean = mean)
  ) %>%
  .[c("P", "R", "female", "wt_scaled")] %>%
  wrap_plots(., ncol = 2, guides = "collect")

Example interpretation (illustrative only):

  • DNA extraction methods P and R are associated with significantly higher levels of Actinobacteria and lower Bacteroides, relative to the reference of extraction method O.
  • There are associations between weight and various taxa, but these are not as strong as the associations with extraction method.

Disclaimer

This document is intended only to be an example of the kind of analyses and visualization you can do with microViz. The analysis of the atlas1006 data is not intended to be considered theoretically sound or biologically interpretable.

Session info

devtools::session_info()
#> ─ Session info ───────────────────────────────────────────────────────────────────────────────────
#>  setting  value
#>  version  R version 4.3.3 (2024-02-29)
#>  os       Ubuntu 22.04.4 LTS
#>  system   x86_64, linux-gnu
#>  ui       X11
#>  language en
#>  collate  C.UTF-8
#>  ctype    C.UTF-8
#>  tz       UTC
#>  date     2024-04-03
#>  pandoc   3.1.11 @ /opt/hostedtoolcache/pandoc/3.1.11/x64/ (via rmarkdown)
#> 
#> ─ Packages ───────────────────────────────────────────────────────────────────────────────────────
#>  package            * version       date (UTC) lib source
#>  ade4                 1.7-22        2023-02-06 [1] RSPM
#>  ape                  5.7-1         2023-03-13 [1] RSPM
#>  backports            1.4.1         2021-12-13 [1] RSPM
#>  Biobase              2.62.0        2023-10-24 [1] Bioconductor
#>  BiocGenerics         0.48.1        2023-11-01 [1] Bioconductor
#>  biomformat           1.30.0        2023-10-24 [1] Bioconductor
#>  Biostrings           2.70.3        2024-03-13 [1] Bioconduc~
#>  bitops               1.0-7         2021-04-24 [1] RSPM
#>  broom                1.0.5         2023-06-09 [1] RSPM
#>  bslib                0.7.0         2024-03-29 [1] RSPM
#>  cachem               1.0.8         2023-05-01 [1] RSPM
#>  checkmate            2.3.1         2023-12-04 [1] RSPM
#>  cli                  3.6.2         2023-12-11 [1] RSPM
#>  cluster              2.1.6         2023-12-01 [3] CRAN (R 4.3.3)
#>  codetools            0.2-19        2023-02-01 [3] CRAN (R 4.3.3)
#>  colorspace           2.1-0         2023-01-23 [1] RSPM
#>  commonmark           1.9.1         2024-01-30 [1] RSPM
#>  corncob            * 0.4.1         2024-01-10 [1] RSPM
#>  crayon               1.5.2         2022-09-29 [1] RSPM
#>  data.table           1.15.4        2024-03-30 [1] RSPM
#>  desc                 1.4.3         2023-12-10 [1] RSPM
#>  detectseparation     0.3           2022-08-26 [1] RSPM
#>  devtools             2.4.5         2022-10-11 [1] RSPM
#>  digest               0.6.35        2024-03-11 [1] RSPM
#>  dplyr              * 1.1.4         2023-11-17 [1] RSPM
#>  ellipsis             0.3.2         2021-04-29 [1] RSPM
#>  evaluate             0.23          2023-11-01 [1] RSPM
#>  fansi                1.0.6         2023-12-08 [1] RSPM
#>  farver               2.1.1         2022-07-06 [1] RSPM
#>  fastmap              1.1.1         2023-02-24 [1] RSPM
#>  foreach              1.5.2         2022-02-02 [1] RSPM
#>  fs                   1.6.3         2023-07-20 [1] RSPM
#>  generics             0.1.3         2022-07-05 [1] RSPM
#>  GenomeInfoDb         1.38.8        2024-03-15 [1] Bioconduc~
#>  GenomeInfoDbData     1.2.11        2024-04-03 [1] Bioconductor
#>  ggforce              0.4.2         2024-02-19 [1] RSPM
#>  ggplot2            * 3.5.0         2024-02-23 [1] RSPM
#>  ggraph               2.2.1         2024-03-07 [1] RSPM
#>  ggrepel              0.9.5         2024-01-10 [1] RSPM
#>  ggtext               0.1.2         2022-09-16 [1] RSPM
#>  glue                 1.7.0         2024-01-09 [1] RSPM
#>  graphlayouts         1.1.1         2024-03-09 [1] RSPM
#>  gridExtra            2.3           2017-09-09 [1] RSPM
#>  gridtext             0.1.5         2022-09-16 [1] RSPM
#>  gtable               0.3.4         2023-08-21 [1] RSPM
#>  highr                0.10          2022-12-22 [1] RSPM
#>  htmltools            0.5.8         2024-03-25 [1] RSPM
#>  htmlwidgets          1.6.4         2023-12-06 [1] RSPM
#>  httpuv               1.6.15        2024-03-26 [1] RSPM
#>  igraph               2.0.3         2024-03-13 [1] RSPM
#>  IRanges              2.36.0        2023-10-24 [1] Bioconductor
#>  iterators            1.0.14        2022-02-05 [1] RSPM
#>  jquerylib            0.1.4         2021-04-26 [1] RSPM
#>  jsonlite             1.8.8         2023-12-04 [1] RSPM
#>  knitr                1.45          2023-10-30 [1] RSPM
#>  labeling             0.4.3         2023-08-29 [1] RSPM
#>  later                1.3.2         2023-12-06 [1] RSPM
#>  lattice              0.22-5        2023-10-24 [3] CRAN (R 4.3.3)
#>  lifecycle            1.0.4         2023-11-07 [1] RSPM
#>  lpSolveAPI           5.5.2.0-17.11 2023-11-28 [1] RSPM
#>  magrittr             2.0.3         2022-03-30 [1] RSPM
#>  markdown             1.12          2023-12-06 [1] RSPM
#>  MASS                 7.3-60.0.1    2024-01-13 [3] CRAN (R 4.3.3)
#>  Matrix               1.6-5         2024-01-11 [3] CRAN (R 4.3.3)
#>  memoise              2.0.1         2021-11-26 [1] RSPM
#>  mgcv                 1.9-1         2023-12-21 [3] CRAN (R 4.3.3)
#>  microbiome         * 1.24.0        2023-10-24 [1] Bioconductor
#>  microViz           * 0.12.1        2024-04-03 [1] local
#>  mime                 0.12          2021-09-28 [1] RSPM
#>  miniUI               0.1.1.1       2018-05-18 [1] RSPM
#>  multtest             2.58.0        2023-10-24 [1] Bioconductor
#>  munsell              0.5.1         2024-04-01 [1] RSPM
#>  nlme                 3.1-164       2023-11-27 [3] CRAN (R 4.3.3)
#>  numDeriv             2016.8-1.1    2019-06-06 [1] RSPM
#>  patchwork          * 1.2.0         2024-01-08 [1] RSPM
#>  permute              0.9-7         2022-01-27 [1] RSPM
#>  phyloseq           * 1.46.0        2023-10-24 [1] Bioconductor
#>  pillar               1.9.0         2023-03-22 [1] RSPM
#>  pkgbuild             1.4.4         2024-03-17 [1] RSPM
#>  pkgconfig            2.0.3         2019-09-22 [1] RSPM
#>  pkgdown              2.0.7         2022-12-14 [1] RSPM
#>  pkgload              1.3.4         2024-01-16 [1] RSPM
#>  plyr                 1.8.9         2023-10-02 [1] RSPM
#>  polyclip             1.10-6        2023-09-27 [1] RSPM
#>  profvis              0.3.8         2023-05-02 [1] RSPM
#>  promises             1.2.1         2023-08-10 [1] RSPM
#>  purrr                1.0.2         2023-08-10 [1] RSPM
#>  R6                   2.5.1         2021-08-19 [1] RSPM
#>  ragg                 1.3.0         2024-03-13 [1] RSPM
#>  RColorBrewer         1.1-3         2022-04-03 [1] RSPM
#>  Rcpp                 1.0.12        2024-01-09 [1] RSPM
#>  RCurl                1.98-1.14     2024-01-09 [1] RSPM
#>  registry             0.5-1         2019-03-05 [1] RSPM
#>  remotes              2.5.0         2024-03-17 [1] RSPM
#>  reshape2             1.4.4         2020-04-09 [1] RSPM
#>  rhdf5                2.46.1        2023-11-29 [1] Bioconduc~
#>  rhdf5filters         1.14.1        2023-11-06 [1] Bioconductor
#>  Rhdf5lib             1.24.2        2024-02-07 [1] Bioconduc~
#>  rlang                1.1.3         2024-01-10 [1] RSPM
#>  rmarkdown            2.26          2024-03-05 [1] RSPM
#>  ROI                  1.0-1         2023-04-20 [1] RSPM
#>  ROI.plugin.lpsolve   1.0-2         2023-07-07 [1] RSPM
#>  Rtsne                0.17          2023-12-07 [1] RSPM
#>  S4Vectors            0.40.2        2023-11-23 [1] Bioconduc~
#>  sass                 0.4.9         2024-03-15 [1] RSPM
#>  scales               1.3.0         2023-11-28 [1] RSPM
#>  sessioninfo          1.2.2         2021-12-06 [1] RSPM
#>  shiny                1.8.1.1       2024-04-02 [1] RSPM
#>  slam                 0.1-50        2022-01-08 [1] RSPM
#>  stringi              1.8.3         2023-12-11 [1] RSPM
#>  stringr              1.5.1         2023-11-14 [1] RSPM
#>  survival             3.5-8         2024-02-14 [3] CRAN (R 4.3.3)
#>  systemfonts          1.0.6         2024-03-07 [1] RSPM
#>  textshaping          0.3.7         2023-10-09 [1] RSPM
#>  tibble               3.2.1         2023-03-20 [1] RSPM
#>  tidygraph            1.3.1         2024-01-30 [1] RSPM
#>  tidyr                1.3.1         2024-01-24 [1] RSPM
#>  tidyselect           1.2.1         2024-03-11 [1] RSPM
#>  trust                0.1-8         2020-01-10 [1] RSPM
#>  tweenr               2.0.3         2024-02-26 [1] RSPM
#>  urlchecker           1.0.1         2021-11-30 [1] RSPM
#>  usethis              2.2.3         2024-02-19 [1] RSPM
#>  utf8                 1.2.4         2023-10-22 [1] RSPM
#>  vctrs                0.6.5         2023-12-01 [1] RSPM
#>  vegan                2.6-4         2022-10-11 [1] RSPM
#>  viridis              0.6.5         2024-01-29 [1] RSPM
#>  viridisLite          0.4.2         2023-05-02 [1] RSPM
#>  withr                3.0.0         2024-01-16 [1] RSPM
#>  xfun                 0.43          2024-03-25 [1] RSPM
#>  xml2                 1.3.6         2023-12-04 [1] RSPM
#>  xtable               1.8-4         2019-04-21 [1] RSPM
#>  XVector              0.42.0        2023-10-24 [1] Bioconductor
#>  yaml                 2.3.8         2023-12-11 [1] RSPM
#>  zlibbioc             1.48.2        2024-03-13 [1] Bioconduc~
#> 
#>  [1] /home/runner/work/_temp/Library
#>  [2] /opt/R/4.3.3/lib/R/site-library
#>  [3] /opt/R/4.3.3/lib/R/library
#> 
#> ──────────────────────────────────────────────────────────────────────────────────────────────────