riskmetric
is designed to be readily extensible. This is done through use of the S3 method dispatch system and a conscious acknowledgement of the varying needs that someone may have when assessing package risk. With this in mind, every user-facing function is designed first and foremost to be flexible.
Here we’ll walk through a trivial example where we’ll extend riskmetric
to add a new assessment, scoring and risk summary function to determine the risk associated with a package given its name starts with the letter “r”.
Before we can assess a package we first need to represent a package as data. We refer to this collection of package metadata as a “package reference” - a way of referring to the related information we’ve been able to pull together about a package. This is represented as a pkg_ref
class object. As dimensions of risk are assessed, the data needed to evaluate it in those terms is cached within this object, building up a small store of information about the package which other assessments can refer to or build off of.
Importantly, not all references to packages are equal. We can collect information given the source code, a locally installed package or by scraping data about a package from the web. There’s a hierarchy of subclasses that encapsulate these disparate use cases.
pkg_ref
├─ pkg_source
├─ pkg_install
└─ pkg_remote
├─ pkg_cran_remote
└─ pkg_bioc_remote
These subclasses direct the behavior of all downstream operations and provides flexibility about how to bucket the implementations of how similar data can be collected from a number of potential sources. For example, to determine the author of a package it would be easiest to look at a package’s DESCRIPTION
file where this content is maintained. However, without access to the source or installed files, one could find the same information on the CRAN package webpage. Using these subclasses, the appropriate method of collecting this data can be selected.
Assessments are the atomic unit of the riskmetric
package, and are used to kick off an individual metric evaluation. Each assessment is a generic function starting with an assess_
prefix, which can dispatch based on the subclass of the pkg_ref
object.
As an example, take a look at how assess_has_news
has been implemented. We’ll focus on just the generic and the pkg_install
functions:
#> assess_has_news <- function (x, ...)
#> {
#> UseMethod("assess_has_news")
#> }
#> attr(,"column_name")
#> [1] "has_news"
#> attr(,"label")
#> [1] "number of discovered NEWS files"
#>
#> assess_has_news.pkg_install <- NULL
There are a couple things to note. First, the S3 system is used to dispatch functionality for the appropriate package reference class. Since the way we’d assess the inclusion of a NEWS file might be different for an installed package or remotely sourced metadata, we may have separate functions to process these datatypes in distinct ways.
Second, for each assessment, a pkg_metric
object is returned. This stores the atomic data pertaining to the metric and importantly adopts a unique subclass for the assessment function.
Finally, a cosmetic "column_name"
attribute is tagged to the function. This is used when calling the assess
function. The assess
verb is a convenience function which steps through all available assessments returning a tibble
of assessment outputs. The "column_name"
provides a more user-friendly label for the assessment in this tibble
.
Now we’ll write our assessment. Eventually we want to consider a package high risk if the name does not start with “r”. We’ll need to make a pkg_metric
object containing the first letter of the name.
<- function(x, ...) {
assess_name_first_letter UseMethod("assess_name_first_letter")
}attr(assess_name_first_letter, "column_name") <- "name_first_letter"
<- function(x, ...) {
assess_name_first_letter.pkg_ref pkg_metric(substr(x$name, 0, 1), class = "pkg_metric_name_first_letter")
}
pkg_ref
MetadataPerhaps we want to reuse metadata used when assessing the first letter so that it can be reused by other assessments. For particularly taxing metadata, such as metadata that requires a query against a public API, scraping a web page or a large data download, it’s important to store it for other assessment functions to reuse.
To handle this, we define a function for pkg_ref_cache
to dispatch to.
This is how the riskmetric
package handles parsing the DESCRIPTION file so that it can feed into all downstream assessments without having to re-parse the file each time or copy the code to do so.
#> pkg_ref_cache.description <- function (x, name, ...)
#> {
#> UseMethod("pkg_ref_cache.description")
#> }
#>
#> pkg_ref_cache.description.pkg_install <- function (x, name, ...)
#> {
#> read.dcf(file.path(x$path, "DESCRIPTION"))
#> }
Once these are defined, they’ll be automatically called when the field is first accessed by the pkg_ref
object, and then stored for any downstream uses.
library(riskmetric)
<- pkg_ref("riskmetric") package
#> <pkg_install, pkg_ref> riskmetric v0.1.2
#> $path
#> [1] "/home/user/username/R/3.6/Resources/library/riskmetric"
#> $source
#> [1] "pkg_install"
#> $version
#> [1] '0.1.2'
#> $name
#> [1] "riskmetric"
#> $bug_reports...
#> $bug_reports_host...
#> $bug_reports_url...
#> $description...
#> $downloads...
#> $help...
#> $help_aliases...
#> $license...
#> $maintainer...
#> $news...
#> $r_cmd_check...
#> $release_date...
#> $remote_checks...
#> $source_control_url...
#> $vignettes...
#> $website_urls...
Notice that upon initialization, the description
field indicates that it hasn’t yet been evaluated with a trailing ...
in the name. When accessed, the object will call a caching function to go out and grab the package metadata and return the newly derived value.
$description package
Because the pkg_ref
object stores an environment, caching this value once makes them available for any future attempts to access the field. This is helpful because we, as developers of the package, don’t need to think critically about the order that assessments are performed, and allows users to redefine the order of assessments without worry about how metadata is acquired.
Now, for our new metric, we want to cache the package name’s first letter. We need to add a new pkg_ref_cache
function for our field. Thankfully, any subclass of pkg_ref
can access the first letter the same way, so we just need the one function.
<- function(x, name, ...) {
pkg_ref_cache.name_first_letter substr(x$name, 0, 1)
}
After adding this caching function, we need to make a small modification to assess_name_first_letter.pkg_ref
in order use our newly cached value.
<- function(x, ...) {
assess_name_first_letter.pkg_ref pkg_metric(x$name_first_letter, class = "pkg_metric_name_first_letter")
}
Let’s try it out!
$name
package#> [1] "riskmetric"
$name_first_letter
package#> [1] "r"
Next, we need a function for scoring our assessment output. In this case, our output is a pkg_metric
object whose data is the first letter of the package name.
We’ll add a dispatched function for the score
function. As a convention, these functions return a numeric value representing how well the package conforms to best practices with values between 0 (poor practice) and 1 (best practice).
<- function(x, ...) {
metric_score.pkg_metric_name_first_letter as.numeric(x == "r")
}
pkg_assess()
VerbThe assess
function accepts a list of functions to apply. riskmetric
provides a shorthand, all_assessments()
, to collect all the included assessment functions, and you’re free to add to that list to customize your own assessment toolkit.
library(dplyr)
pkg_ref(c("riskmetric", "utils", "tools")) %>%
as_tibble() %>%
pkg_assess(c(all_assessments(), assess_name_first_letter))
#> # A tibble: 3 x 19
#> package version pkg_ref news_current has_vignettes
#> <chr> <chr> <list<pkg_ref>> <list<pkg_metric>> <list<pkg_metric>>
#> 1 riskmetric 0.1.2 riskmetric<install> TRUE 0
#> 2 utils 3.6.2 utils<install> <lgl [0]> 1
#> 3 tools 3.6.2 tools<install> <lgl [0]> 0
#> # … with 14 more variables: has_bug_reports_url <list<pkg_metric>>,
#> # bugs_status <list<pkg_metric>>, license <list<pkg_metric>>,
#> # export_help <list<pkg_metric>>, downloads_1yr <list<pkg_metric>>,
#> # has_website <list<pkg_metric>>, r_cmd_check <list<pkg_metric>>,
#> # remote_checks <list<pkg_metric>>, has_maintainer <list<pkg_metric>>,
#> # exported_namespace <list<pkg_metric>>, has_news <list<pkg_metric>>,
#> # has_source_control <list<pkg_metric>>, covr_coverage <list<pkg_metric>>, …
Our scoring function will automatically get picked up and used by the score method.
pkg_ref(c("riskmetric", "utils", "tools")) %>%
as_tibble() %>%
pkg_assess(c(all_assessments(), assess_name_first_letter)) %>%
pkg_score()
#> # A tibble: 3 x 20
#> package version pkg_ref pkg_score news_current has_vignettes
#> <chr> <chr> <list<pkg_ref>> <dbl> <pkg_scor> <pkg_scor>
#> 1 riskmetric 0.1.2 riskmetric<install> -1.38 1 0
#> 2 utils 3.6.2 utils<install> -12.9 0 1
#> 3 tools 3.6.2 tools<install> -6.56 0 0
#> # … with 14 more variables: has_bug_reports_url <pkg_scor>,
#> # bugs_status <pkg_scor>, license <pkg_scor>, export_help <pkg_scor>,
#> # downloads_1yr <pkg_scor>, has_website <pkg_scor>, r_cmd_check <pkg_scor>,
#> # remote_checks <pkg_scor>, has_maintainer <pkg_scor>,
#> # exported_namespace <pkg_scor>, has_news <pkg_scor>,
#> # has_source_control <pkg_scor>, covr_coverage <pkg_scor>,
#> # name_first_letter <pkg_scor>
and we can define our own summarizing weights by passing a named list to pkg_score
.
pkg_ref(c("riskmetric", "utils", "tools")) %>%
as_tibble() %>%
pkg_assess(c(all_assessments(), assess_name_first_letter)) %>%
pkg_score(weights = c(has_news = 1, name_first_letter = 1))
#> # A tibble: 3 x 20
#> package version pkg_ref pkg_score news_current has_vignettes
#> <chr> <chr> <list<pkg_ref>> <dbl> <pkg_scor> <pkg_scor>
#> 1 riskmetric 0.1.2 riskmetric<install> 0 1 0
#> 2 utils 3.6.2 utils<install> 1 0 1
#> 3 tools 3.6.2 tools<install> 1 0 0
#> # … with 14 more variables: has_bug_reports_url <pkg_scor>,
#> # bugs_status <pkg_scor>, license <pkg_scor>, export_help <pkg_scor>,
#> # downloads_1yr <pkg_scor>, has_website <pkg_scor>, r_cmd_check <pkg_scor>,
#> # remote_checks <pkg_scor>, has_maintainer <pkg_scor>,
#> # exported_namespace <pkg_scor>, has_news <pkg_scor>,
#> # has_source_control <pkg_scor>, covr_coverage <pkg_scor>,
#> # name_first_letter <pkg_scor>
Of course you can do any downstream processing of the resulting tibble
if you’d like to further fine-tune your summarization using a nonlinear function.
The riskmetric
package was designed to be easily extensible. You can develop dispatched functions in your development environment, hone them into well formed assessments and contribute them back to the core riskmetric
package once you’re done.
If you’d like feedback before embarking on developing a new metric, please feel free to file an issue on the riskmetric GitHub.