BiocPkgTools 1.16.1
Bioconductor has a rich ecosystem of metadata around packages, usage, and build status. This package is a simple collection of functions to access that metadata from R in a tidy data format. The goal is to expose metadata for data mining and value-added functionality such as package searching, text mining, and analytics on packages.
Functionality includes access to :
The Bioconductor build reports are available online as HTML pages.
However, they are not very computable.
The biocBuildReport
function does some heroic parsing of the HTML
to produce a tidy data.frame for further processing in R.
library(BiocPkgTools)
head(biocBuildReport())
## # A tibble: 6 × 11
## pkg author version git_l…¹ git_last_commit_d…² Depre…³ Packa…⁴ node stage
## <chr> <chr> <chr> <chr> <dttm> <lgl> <chr> <chr> <chr>
## 1 ABSSeq Wentao… 1.49.0 e4e5952 2021-10-26 12:12:45 FALSE <NA> nebb… inst…
## 2 ABSSeq Wentao… 1.49.0 e4e5952 2021-10-26 12:12:45 FALSE <NA> nebb… buil…
## 3 ABSSeq Wentao… 1.49.0 e4e5952 2021-10-26 12:12:45 FALSE <NA> nebb… chec…
## 4 ABSSeq Wentao… 1.49.0 e4e5952 2021-10-26 12:12:45 FALSE <NA> palo… inst…
## 5 ABSSeq Wentao… 1.49.0 e4e5952 2021-10-26 12:12:45 FALSE <NA> palo… buil…
## 6 ABSSeq Wentao… 1.49.0 e4e5952 2021-10-26 12:12:45 FALSE <NA> palo… chec…
## # … with 2 more variables: result <chr>, bioc_version <chr>, and abbreviated
## # variable names ¹git_last_commit, ²git_last_commit_date, ³Deprecated,
## # ⁴PackageStatus
Because developers may be interested in a quick view of their own
packages, there is a simple function, problemPage
, to produce an HTML report of
the build status of packages matching a given author regex supplied to the authorPattern
argument.
The default is to report only “problem” build statuses (ERROR, WARNING).
problemPage(authorPattern = "V.*Carey")
In similar fashion, maintainers of packages that have many downstream packages that
depend on them may wish to check that a change they introduced hasn’t suddenly broken
a large number of these. You can use the dependsOn
argument to produce the summary report
of those packages that “depend on” the given package.
problemPage(dependsOn = "limma")
When run in an interactive environment, the problemPage
function
will open a browser window for user interaction. Note that if you want
to include all your package results, not just the broken ones, simply
specify includeOK = TRUE
.
Bioconductor supplies download stats for all packages. The biocDownloadStats
function grabs all available download stats for all packages in all
Experiment Data, Annotation Data, and Software packages. The results
are returned as a tidy data.frame for further analysis.
head(biocDownloadStats())
## # A tibble: 6 × 7
## pkgType Package Year Month Nb_of_distinct_IPs Nb_of_downloads Date
## <chr> <chr> <int> <chr> <int> <int> <date>
## 1 software ABarray 2022 Jan 51 78 2022-01-01
## 2 software ABarray 2022 Feb 33 68 2022-02-01
## 3 software ABarray 2022 Mar 62 99 2022-03-01
## 4 software ABarray 2022 Apr 36 56 2022-04-01
## 5 software ABarray 2022 May 0 0 2022-05-01
## 6 software ABarray 2022 Jun 0 0 2022-06-01
The download statistics reported are for all available versions of a package. There are no separate, publicly available statistics broken down by version.
The majority of Bioconductor Software packages are also available through other channels
such as Anaconda, who also provided download statistics for packages installed from
their repositories. Access to these counts is provided by the anacondaDownloadStats
function:
head(anacondaDownloadStats())
## # A tibble: 6 × 7
## Package Year Month Nb_of_distinct_IPs Nb_of_downloads repo Date
## <chr> <chr> <chr> <int> <dbl> <chr> <date>
## 1 ABAData 2018 Apr NA 8 Anaconda 2018-04-01
## 2 ABAData 2018 Aug NA 5 Anaconda 2018-08-01
## 3 ABAData 2018 Dec NA 133 Anaconda 2018-12-01
## 4 ABAData 2018 Jul NA 6 Anaconda 2018-07-01
## 5 ABAData 2018 Jun NA 18 Anaconda 2018-06-01
## 6 ABAData 2018 Mar NA 13 Anaconda 2018-03-01
Note that Anaconda do not provide counts for distinct IP addresses, but this column is included for compatibility with the Bioconductor count tables.
The R DESCRIPTION
file contains a plethora of information regarding package
authors, dependencies, versions, etc. In a repository such as Bioconductor, these
details are available in bulk for all included packages. The biocPkgList
returns
a data.frame with a row for each package. Tons of information are available, as
evidenced by the column names of the results.
bpi = biocPkgList()
colnames(bpi)
## [1] "Package" "Version"
## [3] "Depends" "Suggests"
## [5] "License" "MD5sum"
## [7] "NeedsCompilation" "Title"
## [9] "Description" "biocViews"
## [11] "Author" "Maintainer"
## [13] "git_url" "git_branch"
## [15] "git_last_commit" "git_last_commit_date"
## [17] "Date/Publication" "source.ver"
## [19] "win.binary.ver" "mac.binary.ver"
## [21] "mac.binary.big-sur-arm64.ver" "vignettes"
## [23] "vignetteTitles" "hasREADME"
## [25] "hasNEWS" "hasINSTALL"
## [27] "hasLICENSE" "Rfiles"
## [29] "dependencyCount" "Imports"
## [31] "Enhances" "dependsOnMe"
## [33] "suggestsMe" "VignetteBuilder"
## [35] "URL" "SystemRequirements"
## [37] "BugReports" "importsMe"
## [39] "Archs" "LinkingTo"
## [41] "PackageStatus" "Video"
## [43] "linksToMe" "License_restricts_use"
## [45] "OS_type" "organism"
## [47] "License_is_FOSS"
Some of the variables are parsed to produce list
columns.
head(bpi)
## # A tibble: 6 × 47
## Package Version Depends Sugge…¹ License MD5sum Needs…² Title Descr…³ biocV…⁴
## <chr> <chr> <list> <list> <chr> <chr> <chr> <chr> <chr> <list>
## 1 a4 1.46.0 <chr> <chr> GPL-3 4fe28… no Auto… "Umbre… <chr>
## 2 a4Base 1.46.0 <chr> <chr> GPL-3 86bfc… no Auto… "Base … <chr>
## 3 a4Classif 1.46.0 <chr> <chr> GPL-3 4caa1… no Auto… "Funct… <chr>
## 4 a4Core 1.46.0 <chr> <chr> GPL-3 aee4c… no Auto… "Utili… <chr>
## 5 a4Preproc 1.46.0 <chr> <chr> GPL-3 31a1f… no Auto… "Utili… <chr>
## 6 a4Report… 1.46.0 <chr> <chr> GPL-3 386cb… no Auto… "Utili… <chr>
## # … with 37 more variables: Author <list>, Maintainer <list>, git_url <chr>,
## # git_branch <chr>, git_last_commit <chr>, git_last_commit_date <chr>,
## # `Date/Publication` <chr>, source.ver <chr>, win.binary.ver <chr>,
## # mac.binary.ver <chr>, `mac.binary.big-sur-arm64.ver` <chr>,
## # vignettes <list>, vignetteTitles <list>, hasREADME <chr>, hasNEWS <chr>,
## # hasINSTALL <chr>, hasLICENSE <chr>, Rfiles <list>, dependencyCount <chr>,
## # Imports <list>, Enhances <list>, dependsOnMe <list>, suggestsMe <list>, …
As a simple example of how these columns can be used, extracting
the importsMe
column to find the packages that import the
GEOquery package.
require(dplyr)
bpi = biocPkgList()
bpi %>%
filter(Package=="GEOquery") %>%
pull(importsMe) %>%
unlist()
## [1] "bigmelon" "ChIPXpress"
## [3] "coexnet" "conclus"
## [5] "crossmeta" "DExMA"
## [7] "EGAD" "EpiMix"
## [9] "GEOexplorer" "minfi"
## [11] "MoonlightR" "phantasus"
## [13] "recount" "SRAdb"
## [15] "BeadArrayUseCases" "BioPlex"
## [17] "GSE13015" "healthyControlsPresenceChecker"
## [19] "easyDifferentialGeneCoexpression" "geneExpressionFromGEO"
## [21] "MetaIntegrator" "seeker"
For the end user of Bioconductor, an analysis often starts with finding a
package or set of packages that perform required tasks or are tailored
to a specific operation or data type. The biocExplore()
function
implements an interactive bubble visualization with filtering based on
biocViews terms. Bubbles are sized based on download statistics. Tooltip
and detail-on-click capabilities are included. To start a local session:
biocExplore()
The Bioconductor ecosystem is built around the concept of interoperability
and dependencies. These interdependencies are available as part of the
biocPkgList()
output. The BiocPkgTools
provides some convenience
functions to convert package dependencies to R graphs. A modular approach leads
to the following workflow.
data.frame
of dependencies using buildPkgDependencyDataFrame
.igraph
object from the dependency data frame using buildPkgDependencyIgraph
igraph
functionality to perform arbitrary network operations.
Convenience functions, inducedSubgraphByPkgs
and subgraphByDegree
are available.A dependency graph for all of Bioconductor is a starting place.
library(BiocPkgTools)
dep_df = buildPkgDependencyDataFrame()
g = buildPkgDependencyIgraph(dep_df)
g
## IGRAPH 824bfbb DN-- 3435 26535 --
## + attr: name (v/c), edgetype (e/c)
## + edges from 824bfbb (vertex names):
## [1] a4 ->a4Base a4 ->a4Preproc a4 ->a4Classif
## [4] a4 ->a4Core a4 ->a4Reporting a4Base ->a4Preproc
## [7] a4Base ->a4Core a4Classif->a4Core a4Classif->a4Preproc
## [10] ABSSeq ->methods acde ->boot aCGH ->cluster
## [13] aCGH ->survival aCGH ->multtest ACME ->Biobase
## [16] ACME ->methods ACME ->BiocGenerics ADaCGH2 ->parallel
## [19] ADaCGH2 ->ff ADaCGH2 ->GLAD ADAM ->stats
## [22] ADAM ->utils ADAM ->methods ADAMgui ->stats
## + ... omitted several edges
library(igraph)
head(V(g))
## + 6/3435 vertices, named, from 824bfbb:
## [1] a4 a4Base a4Classif ABSSeq acde aCGH
head(E(g))
## + 6/26535 edges from 824bfbb (vertex names):
## [1] a4 ->a4Base a4 ->a4Preproc a4 ->a4Classif
## [4] a4 ->a4Core a4 ->a4Reporting a4Base->a4Preproc
See inducedSubgraphByPkgs
and subgraphByDegree
to produce
subgraphs based on a subset of packages.
See the igraph documentation for more detail on graph analytics, setting vertex and edge attributes, and advanced subsetting.
The visNetwork package is a nice interactive visualization tool that implements graph plotting in a browser. It can be integrated into shiny applications. Interactive graphs can also be included in Rmarkdown documents (see vignette)
igraph_network = buildPkgDependencyIgraph(buildPkgDependencyDataFrame())
The full dependency graph is really not that informative to look at, though doing so is possible. A common use case is to visualize the graph of dependencies “centered” on a package of interest. In this case, I will focus on the GEOquery package.
igraph_geoquery_network = subgraphByDegree(igraph_network, "GEOquery")
The subgraphByDegree()
function returns all nodes and connections within
degree
of the named package; the default degree
is 1
.
The visNework package can plot igraph
objects directly, but more flexibility
is offered by first converting the graph to visNetwork form.
library(visNetwork)
data <- toVisNetworkData(igraph_geoquery_network)
The next few code chunks highlight just a few examples of the visNetwork capabilities, starting with a basic plot.
visNetwork(nodes = data$nodes, edges = data$edges, height = "500px")
For fun, we can watch the graph stabilize during drawing, best viewed interactively.
visNetwork(nodes = data$nodes, edges = data$edges, height = "500px") %>%
visPhysics(stabilization=FALSE)
Add arrows and colors to better capture dependencies.
data$edges$color='lightblue'
data$edges[data$edges$edgetype=='Imports','color']= 'red'
data$edges[data$edges$edgetype=='Depends','color']= 'green'
visNetwork(nodes = data$nodes, edges = data$edges, height = "500px") %>%
visEdges(arrows='from')
Add a legend.
ledges <- data.frame(color = c("green", "lightblue", "red"),
label = c("Depends", "Suggests", "Imports"), arrows =c("from", "from", "from"))
visNetwork(nodes = data$nodes, edges = data$edges, height = "500px") %>%
visEdges(arrows='from') %>%
visLegend(addEdges=ledges)
[Work in progress]
The biocViews package is a small ontology of terms describing Bioconductor packages. This is a work-in-progress section, but here is a small example of plotting the biocViews graph.
library(biocViews)
data(biocViewsVocab)
biocViewsVocab
## A graphNEL graph with directed edges
## Number of Nodes = 495
## Number of Edges = 494
library(igraph)
g = igraph.from.graphNEL(biocViewsVocab)
library(visNetwork)
gv = toVisNetworkData(g)
visNetwork(gv$nodes, gv$edges, width="100%") %>%
visIgraphLayout(layout = "layout_as_tree", circular=TRUE) %>%
visNodes(size=20) %>%
visPhysics(stabilization=FALSE)
The dependency burden of a package, namely the amount of functionality that
a given package is importing, is an important parameter to take into account
during package development. A package may break because one or more of its
dependencies have changed the part of the API our package is importing or
this part has even broken. For this reason, it may be useful for package
developers to quantify the dependency burden of a given package. To do that
we should first gather all dependency information using the function
buildPkgDependencyDataFrame()
but setting the arguments to work with
packages in Bioconductor and CRAN and dependencies categorised as Depends
or Imports
, which are the ones installed by default for a given package.
library(BiocPkgTools)
depdf <- buildPkgDependencyDataFrame(repo=c("BioCsoft", "CRAN"),
dependencies=c("Depends", "Imports"))
dim(depdf)
## [1] 126676 3
head(depdf) # too big to show all
## Package dependency edgetype
## 1 a4 a4Base Depends
## 2 a4 a4Preproc Depends
## 3 a4 a4Classif Depends
## 4 a4 a4Core Depends
## 5 a4 a4Reporting Depends
## 6 a4Base a4Preproc Depends
Finally, we call the function pkgDepMetrics()
to obtain different metrics
on the dependency burden of a package we want to analyze, in the case below,
the package BiocPkgTools
itself:
pkgDepMetrics("BiocPkgTools", depdf)
## ImportedAndUsed Exported Usage DepOverlap DepGainIfExcluded
## utils 1 227 0.44 0.01 0
## graph 1 116 0.86 0.06 0
## rlang 4 437 0.92 0.02 0
## igraph 9 810 1.11 0.11 4
## RBGL 1 77 1.30 0.07 0
## htmltools 1 76 1.32 0.08 0
## xml2 1 66 1.52 0.01 0
## stringr 1 59 1.69 0.11 0
## tools 2 118 1.69 0.01 0
## tibble 1 46 2.17 0.13 0
## DT 1 42 2.38 0.40 5
## magrittr 1 42 2.38 0.01 0
## dplyr 8 292 2.74 0.19 0
## rorcid 1 32 3.12 0.31 8
## httr 5 91 5.49 0.09 0
## htmlwidgets 1 14 7.14 0.34 0
## rvest 3 40 7.50 0.29 2
## jsonlite 2 23 8.70 0.01 0
## gh 1 11 9.09 0.19 4
## BiocFileCache 4 29 13.79 0.43 8
## BiocManager 2 6 33.33 0.02 0
## biocViews NA 31 NA 0.15 6
## readr NA 115 NA 0.26 6
In this resulting table, rows correspond to dependencies and columns provide the following information:
ImportedAndUsed
: number of functionality calls imported and used in
the package.Exported
: number of functionality calls exported by the dependency.Usage
: (ImportedAndUsed
x 100) / Exported
. This value provides an
estimate of what fraction of the functionality of the dependency is
actually used in the given package.DepOverlap
: Similarity between the dependency graph structure of the
given package and the one of the dependency in the corresponding row,
estimated as the Jaccard index
between the two sets of vertices of the corresponding graphs. Its values
goes between 0 and 1, where 0 indicates that no dependency is shared, while
1 indicates that the given package and the corresponding dependency depend
on an identical subset of packages.DepGainIfExcluded
: The ‘dependency gain’ (decrease in the total number
of dependencies) that would be obtained if this package was excluded
from the list of direct dependencies.The reported information is ordered by the Usage
column to facilitate the
identification of dependencies for which the analyzed package is using a small
fraction of their functionality and therefore, it could be easier remove them.
To aid in that decision, the column DepOverlap
reports the overlap of the
dependency graph of each dependency with the one of the analyzed package. Here
a value above, e.g., 0.5, could, albeit not necessarily, imply that removing
that dependency could substantially lighten the dependency burden of the analyzed
package.
An NA
value in the ImportedAndUsed
column indicates that the function
pkgDepMetrics()
could not identify what functionality calls in the analyzed
package are made to the dependency. This may happen because pkgDepMetrics()
has failed to identify the corresponding calls, as it happens with imported
built-in constants such as DNA_BASES
from Biostrings
, or that although the
given package is importing that dependency, none of its functionality is actually
being used. In such a case, this dependency could be safely removed without
any further change in the analyzed package.
We can find out what actually functionality calls are we importing as follows:
imp <- pkgDepImports("BiocPkgTools")
imp %>% filter(pkg == "DT")
## # A tibble: 1 × 2
## pkg fun
## <chr> <chr>
## 1 DT datatable
It is important to be able to identify the maintainer of a package in
a reliable way. The DESCRIPTION file for a package can include an Authors@R
field. This field can capture metadata about maintainers and contributors
in a programmatically accessible way. Each element of the role
field of a person
(see ?person
) in the Authors@R
field comes
from a subset of the
relations vocabulary of the Library of Congress.
Metadata about maintainers can be extracted from DESCRIPTION in various ways.
As of October 2022, we focus on the use of the ORCID field which is
an optional comment
component in a person
element. For example,
in the DESCRIPTION for the AnVIL package we have
Authors@R:
c(person(
"Martin", "Morgan", role = c("aut", "cre"),
email = "mtmorgan.bioc@gmail.com",
comment = c(ORCID = "0000-0002-5874-8148")
),
This convention is used for a fair number of Bioconductor and CRAN packages.
We’ll demonstrate the use of get_cre_orcids
with some packages.
inst = rownames(installed.packages())
cands = c("devtools", "evaluate", "ggplot2", "GEOquery", "gert", "utils")
totry = intersect(cands, inst)
oids = get_cre_orcids(totry)
oids
## devtools evaluate ggplot2
## "0000-0002-6983-2759" "0000-0003-0645-5666" "0000-0002-5147-4711"
## GEOquery gert utils
## "0000-0002-8991-6458" "0000-0002-4035-0289" NA
We use the ORCID API to tabulate metadata about the holders of these IDs. We’ll avoid evaluating this because a token must be refreshed for the query to succeed.
orcid_table(oids)
In October 2022 the result is
> orcid_table(.Last.value)
name org
devtools Jennifer Bryan RStudio
evaluate Yihui Xie RStudio, Inc.
ggplot2 Thomas Lin Pedersen RStudio
GEOquery Sean Davis University of Colorado Anschutz Medical Campus
gert Jeroen Ooms Berkeley Institute for Data Science
utils <NA> <NA>
city region country orcid
devtools Boston MA US 0000-0002-6983-2759
evaluate Elkhorn NE US 0000-0003-0645-5666
ggplot2 Copenhagen <NA> DK 0000-0002-5147-4711
GEOquery Aurora Colorado US 0000-0002-8991-6458
gert Berkeley CA US 0000-0002-4035-0289
utils <NA> <NA> <NA> <NA>
sessionInfo()
## R version 4.2.2 (2022-10-31)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.5 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.16-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.16-bioc/R/lib/libRlapack.so
##
## locale:
## [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C
## [3] LC_TIME=en_GB LC_COLLATE=C
## [5] LC_MONETARY=en_US.UTF-8 LC_MESSAGES=en_US.UTF-8
## [7] LC_PAPER=en_US.UTF-8 LC_NAME=C
## [9] LC_ADDRESS=C LC_TELEPHONE=C
## [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] biocViews_1.66.2 visNetwork_2.1.2 igraph_1.4.1
## [4] dplyr_1.1.0 BiocPkgTools_1.16.1 htmlwidgets_1.6.1
## [7] knitr_1.42 BiocStyle_2.26.0
##
## loaded via a namespace (and not attached):
## [1] digest_0.6.31 utf8_1.2.3 BiocFileCache_2.6.1
## [4] R6_2.5.1 stats4_4.2.2 RSQLite_2.3.0
## [7] evaluate_0.20 httr_1.4.5 pillar_1.8.1
## [10] rlang_1.0.6 curl_5.0.0 whisker_0.4.1
## [13] jquerylib_0.1.4 blob_1.2.3 DT_0.27
## [16] RUnit_0.4.32 rmarkdown_2.20 readr_2.1.4
## [19] stringr_1.5.0 RCurl_1.98-1.10 bit_4.0.5
## [22] compiler_4.2.2 xfun_0.37 pkgconfig_2.0.3
## [25] BiocGenerics_0.44.0 rorcid_0.7.0 htmltools_0.5.4
## [28] tidyselect_1.2.0 tibble_3.1.8 httpcode_0.3.0
## [31] bookdown_0.32 XML_3.99-0.13 fansi_1.0.4
## [34] tzdb_0.3.0 dbplyr_2.3.1 withr_2.5.0
## [37] bitops_1.0-7 rappdirs_0.3.3 crul_1.3
## [40] RBGL_1.74.0 jsonlite_1.8.4 lifecycle_1.0.3
## [43] DBI_1.1.3 magrittr_2.0.3 graph_1.76.0
## [46] cli_3.6.0 stringi_1.7.12 cachem_1.0.7
## [49] fauxpas_0.5.0 xml2_1.3.3 bslib_0.4.2
## [52] ellipsis_0.3.2 filelock_1.0.2 generics_0.1.3
## [55] vctrs_0.5.2 gh_1.4.0 tools_4.2.2
## [58] bit64_4.0.5 Biobase_2.58.0 glue_1.6.2
## [61] purrr_1.0.1 hms_1.1.2 fastmap_1.1.1
## [64] yaml_2.3.7 BiocManager_1.30.20 rvest_1.0.3
## [67] memoise_2.0.1 sass_0.4.5