Loading supporting packages

library(BiocPkgTools)
library(lubridate)

Release Download Rank

since_date <- as_date("2021-05-01")
smonth <- month(since_date, abbr = FALSE, label = TRUE)
syear <- year(since_date)
dlrank <- pkgDownloadRank(pkg = "MultiAssayExperiment", version = "3.16")
dlrank <- round(dlrank, 0)

Devel Download Rank

pkgDownloadRank(pkg = "MultiAssayExperiment", version = "3.17")
## 107/2120 
##     5.05

Average Downloads

dls <- pkgDownloadStats("MultiAssayExperiment", years = 2021:2023)
avgdls <- mean(dls[["Nb_of_distinct_IPs"]])
avgdls <- round(avgdls, 0)

Number of reverse dependencies

db <- available.packages(repos = BiocManager::repositories())
revdeps <- tools::package_dependencies(
    packages = "MultiAssayExperiment", db = db, reverse = TRUE, which = "all"
)[[1]]
totalrd <- length(revdeps)

Activity since date

Issues closed:

activity <- activitySince(
    "waldronlab/MultiAssayExperiment",
    "issues",
    "closed",
    since_date
)
nclosed <- nrow(activity)

Commits made:

commitact <- activitySince(
    "waldronlab/MultiAssayExperiment",
    "commits",
    Date = since_date
)
## ℹ Running gh query ℹ Running gh query, got 100 records of about 200
ncommits <- nrow(commitact)

MultiAssayExperiment was originally developed in the parent grant (Ramos et al. 2017) but continues undergoing active development as the most widely used software package in Bioconductor for multimodal data analysis. MultiAssayExperiment is in the top 5% most downloaded software packages in Bioconductor, averaging about 1996 downloads per month since May 2021. About 59 Bioconductor packages depend on MultiAssayExperiment in either their Depends, Imports, or Suggests fields. We have closed more than 20 issues on GitHub relating to questions and improvements to the MultiAssayExperiment infrastructure from the community and created 153 commits to the software to provide additional functionality and documentation.