diff --git a/DESCRIPTION b/DESCRIPTION index b0c88e99..50947713 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Encoding: UTF-8 Package: covr Title: Test Coverage for Packages -Version: 2.2.2.9000 +Version: 3.0.0 Authors@R: c( person("Jim", "Hester", email = "james.f.hester@gmail.com", role = c("aut", "cre")), person("Willem", "Ligtenberg", role = "ctb"), @@ -26,8 +26,8 @@ Authors@R: c( person("David", "Hugh-Jones", role = "ctb"), person("Qin", "Wang", role = "ctb")) Description: Track and report code coverage for your package and (optionally) - upload the results to a coverage service like 'Codecov' (http://codecov.io) or - 'Coveralls' (http://coveralls.io). Code coverage is a measure of the amount of + upload the results to a coverage service like 'Codecov' or + 'Coveralls' . Code coverage is a measure of the amount of code being exercised by a set of tests. It is an indirect measure of test quality and completeness. This package is compatible with any testing methodology or framework and tracks coverage of both R code and compiled diff --git a/Makefile b/Makefile index 42e6e622..f9c81556 100644 --- a/Makefile +++ b/Makefile @@ -13,7 +13,7 @@ build-docker-checker: run-rocker: build-docker-checker -docker rm $(RCHECKER) - docker run --rm -ti -v $(PWD)/..:/home/docker $(RCHECKER) bash + docker run --rm -ti -v $(PWD)/..:/home/docker $(RCHECKER) bash test: build-docker-checker fix-permission-tests docker run --rm -ti -v $(PWD)/..:/home/docker $(RCHECKER) Rscript -e 'library(devtools);install("covr");test("covr", "$(FILTER)")' @@ -24,4 +24,4 @@ check: build-docker-checker fix-permission-tests rox: build-docker-checker - docker run --rm -ti -v $(PWD)/..:/home/docker $(RCHECKER) Rscript -e 'devtools::document("covr")' \ No newline at end of file + docker run --rm -ti -v $(PWD)/..:/home/docker $(RCHECKER) Rscript -e 'devtools::document("covr")' diff --git a/NAMESPACE b/NAMESPACE index 6cd48586..9c3f7d01 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -31,5 +31,4 @@ importFrom(utils,getSrcFilename) importFrom(utils,head) importFrom(utils,relist) importFrom(utils,str) -useDynLib(covr,covr_duplicate_) -useDynLib(covr,covr_reassign_function) +useDynLib(covr, .registration = TRUE) diff --git a/NEWS.md b/NEWS.md index 1768a523..b274aa01 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,4 +1,6 @@ -## 2.2.2-9000 ## +## 3.0.0 ## +* The covr license has been changed to GPL-3. +* Set environment variable `R_COVR=true` when covr is running (#236, #268). * Made the gather-and-merge-results step at the end of package_coverage() more memory efficient (#226, @HenrikBengtsson). * Support code coverage with icc (#247, @QinWang). diff --git a/R/covr.R b/R/covr.R index 16313c3d..79a8721a 100644 --- a/R/covr.R +++ b/R/covr.R @@ -236,7 +236,7 @@ package_coverage <- function(path = ".", stop("icc is not available") } } - + if (isTRUE(clean)) { on.exit({ clean_objects(pkg$path) @@ -269,7 +269,8 @@ package_coverage <- function(path = ".", c(R_DEFAULT_PACKAGES = "datasets,utils,grDevices,graphics,stats,methods", R_LIBS = libs, R_LIBS_USER = libs, - R_LIBS_SITE = libs), { + R_LIBS_SITE = libs, + R_COVR = "true"), { withCallingHandlers({ @@ -313,7 +314,7 @@ package_coverage <- function(path = ".", } else { res <- run_icov(pkg$path, quiet = quiet) } - + coverage <- structure(c(coverage, res), class = "coverage", package = pkg, @@ -364,7 +365,7 @@ merge_coverage <- function(files) { } y <- NULL } - + x } diff --git a/R/icc.R b/R/icc.R index 3945b0b1..2c1fcbd0 100644 --- a/R/icc.R +++ b/R/icc.R @@ -37,7 +37,7 @@ parse_icov <- function(lines, package_path = "") { nums <- c(idx1[2L:length(idx1)]-1L, length(r1)) - idx1 stopifnot(sum(nums) == nrow(m1)) m1$functions <- unlist(mapply(rep, r1[idx1], nums, - SIMPLIFY=FALSE, USE.NAMES=FALSE)) + SIMPLIFY=FALSE, USE.NAMES=FALSE)) } } } @@ -65,7 +65,7 @@ parse_icov <- function(lines, package_path = "") { run_icov <- function(path, quiet = TRUE, icov_path = getOption("covr.icov", ""), icov_args = getOption("covr.icov_args", NULL)) { - + src_path <- normalize_path(file.path(path, "src")) if (!file.exists(src_path)) { return() @@ -85,7 +85,7 @@ run_icov <- function(path, quiet = TRUE, icov_inputs <- list.files(path, pattern = rex::rex(".dyn", end), recursive = TRUE, full.names = TRUE) if (length(icov_inputs) == 0L) { - warning("no icc .dyn files are generated") + warning("no icc .dyn files are generated") return() } @@ -97,11 +97,11 @@ run_icov <- function(path, quiet = TRUE, system_check(icov_path, args = c("-prj", "tmp", "-spi", file.path(src_path, "pgopti.spi"), "-dpi", file.path(src_path, "pgopti.dpi"), - "-include-nonexec", + "-include-nonexec", "-txtbcvrg", "bcovg.log"), quiet = quiet, echo = !quiet) }) - + lines <- readLines(file.path(src_path, "bcovg.log")) # generate line coverage diff --git a/R/replace.R b/R/replace.R index ffd0b8df..8c982692 100644 --- a/R/replace.R +++ b/R/replace.R @@ -1,4 +1,4 @@ -#' @useDynLib covr covr_duplicate_ +#' @useDynLib covr, .registration = TRUE replacement <- function(name, env = as.environment(-1), target_value = get(name, envir = env)) { if (is.function(target_value) && !is.primitive(target_value)) { if (is_vectorized(target_value)) { @@ -26,12 +26,10 @@ replacement <- function(name, env = as.environment(-1), target_value = get(name, } } -#' @useDynLib covr covr_reassign_function replace <- function(replacement) { .Call(covr_reassign_function, replacement$name, replacement$env, replacement$target_value, replacement$new_value) } -#' @useDynLib covr covr_reassign_function reset <- function(replacement) { .Call(covr_reassign_function, replacement$name, replacement$env, replacement$target_value, replacement$orig_value) } diff --git a/cran-comments.md b/cran-comments.md index f649e3a1..f2ef916a 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -1,5 +1,5 @@ -This release fixes a test error when run with the soon to be submitted xml2 -1.1.0 release. +This release changes the package license from MIT to GPL-3. I obtained approval +from all contributors for the license change. ## Test environments * OS X El Capitan, R 3.3.0 @@ -17,7 +17,14 @@ There were no NOTEs, ERRORs or WARNINGs. ## Reverse dependencies Covr is a development tool only so its code is not actually run when building -any downstream dependencies. Nonetheless I have run R CMD check on the 151 -downstream dependencies. There were no relevant Errors. +any downstream dependencies. Nonetheless I have run R CMD check on the 262 +downstream dependencies. + +The errors in biolink, geofacet, Wmisc are due to `lintr::expect_lint_free()` +not working properly when it is used while running `devtools::revdep_check()`. +I opened issue [#251](https://github.com/jimhester/lintr/issues/251) to track +this bug in lintr. + +I did not see any other errors that were relevant to the covr changes. Summary at: https://github.com/jimhester/covr/tree/master/revdep diff --git a/revdep/README.md b/revdep/README.md index 65059f1f..3cbf33fd 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -2,84 +2,414 @@ ## Platform -|setting |value | -|:--------|:--------------------------------------| -|version |R version 3.3.2 RC (2016-10-26 r71594) | -|system |x86_64, darwin13.4.0 | -|ui |X11 | -|language |(EN) | -|collate |en_US.UTF-8 | -|tz |America/New_York | -|date |2016-12-30 | +|setting |value | +|:--------|:-------------------------------------------| +|version |R version 3.4.0 Patched (2017-05-10 r72669) | +|system |x86_64, darwin15.6.0 | +|ui |X11 | +|language |(EN) | +|collate |en_US.UTF-8 | +|tz |America/New_York | +|date |2017-06-26 | ## Packages -|package |* |version |date |source | -|:-----------|:--|:----------|:----------|:--------------------------------| -|covr | |2.2.1 |2016-12-30 |local (jimhester/covr@NA) | -|crayon | |1.3.2 |2016-06-28 |cran (@1.3.2) | -|devtools |* |1.12.0 |2016-06-24 |cran (@1.12.0) | -|DT | |0.2 |2016-08-09 |cran (@0.2) | -|htmltools | |0.3.5 |2016-03-21 |cran (@0.3.5) | -|htmlwidgets | |0.8 |2016-11-09 |cran (@0.8) | -|httr | |1.2.1 |2016-07-03 |cran (@1.2.1) | -|jsonlite | |1.1 |2016-09-14 |cran (@1.1) | -|knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | -|memoise | |1.0.0 |2016-01-29 |cran (@1.0.0) | -|R6 | |2.2.0 |2016-10-05 |cran (@2.2.0) | -|rex | |1.1.1 |2016-03-11 |cran (@1.1.1) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | -|rstudioapi | |0.6 |2016-06-27 |cran (@0.6) | -|shiny | |0.14.2 |2016-11-01 |cran (@0.14.2) | -|testthat | |1.0.2.9000 |2016-12-30 |Github (hadley/testthat@3b2f225) | -|withr | |1.0.2 |2016-06-20 |cran (@1.0.2) | -|xml2 | |1.0.0 |2016-06-24 |cran (@1.0.0) | +|package |* |version |date |source | +|:-----------|:--|:-------|:----------|:--------------| +|covr | |2.2.2 |2017-01-05 |cran (@2.2.2) | +|crayon | |1.3.2 |2016-06-28 |cran (@1.3.2) | +|devtools |* |1.13.2 |2017-06-02 |cran (@1.13.2) | +|DT | |0.2 |2016-08-09 |cran (@0.2) | +|htmltools | |0.3.6 |2017-04-28 |cran (@0.3.6) | +|htmlwidgets | |0.8 |2016-11-09 |cran (@0.8) | +|httr | |1.2.1 |2016-07-03 |CRAN (R 3.4.0) | +|jsonlite | |1.5 |2017-06-01 |cran (@1.5) | +|knitr | |1.16 |2017-05-18 |cran (@1.16) | +|memoise | |1.1.0 |2017-04-21 |CRAN (R 3.4.0) | +|R6 | |2.2.2 |2017-06-17 |cran (@2.2.2) | +|rex | |1.1.1 |2016-12-05 |cran (@1.1.1) | +|rmarkdown | |1.6 |2017-06-15 |cran (@1.6) | +|rstudioapi | |0.6 |2016-06-27 |CRAN (R 3.4.0) | +|shiny | |1.0.3 |2017-04-26 |cran (@1.0.3) | +|testthat | |1.0.2 |2016-04-23 |cran (@1.0.2) | +|withr | |1.0.2 |2016-06-20 |CRAN (R 3.4.0) | +|xml2 | |1.1.1 |2017-01-24 |cran (@1.1.1) | # Check results -151 packages + +260 packages + +|package |version | errors| warnings| notes| +|:--------------------|:-------|------:|--------:|-----:| +|ABCoptim |0.14.0 | 0| 0| 1| +|aemo |0.2.0 | 0| 0| 0| +|ALA4R |1.5.6 | 0| 0| 0| +|alfred |0.1.1 | 0| 0| 0| +|analogsea |0.5.0 | 0| 0| 0| +|angstroms |0.0.1 | 0| 0| 0| +|antaresProcessing |0.10.2 | 0| 0| 0| +|antaresViz |0.10 | 1| 0| 0| +|ashr |2.0.5 | 0| 0| 2| +|autothresholdr |0.5.0 | 1| 0| 0| +|awsjavasdk |0.2.0 | 0| 0| 0| +|betalink |2.2.1 | 0| 0| 1| +|bgmfiles |0.0.6 | 0| 0| 0| +|binman |0.1.0 | 0| 0| 0| +|binomen |0.1.2 | 0| 0| 0| +|biolink |0.1.2 | 1| 0| 0| +|blob |1.1.0 | 0| 0| 0| +|bold |0.4.0 | 0| 0| 1| +|breathtestcore |0.3.0 | 0| 0| 0| +|breathteststan |0.3.0 | 0| 0| 0| +|broom |0.4.2 | 2| 0| 0| +|brranching |0.2.0 | 0| 0| 0| +|bsplus |0.1.0 | 0| 0| 0| +|BTYDplus |1.0.1 | 0| 0| 1| +|callr |1.0.0 | 0| 0| 0| +|canvasXpress |0.16.2 | 0| 0| 1| +|ccafs |0.1.0 | 0| 0| 0| +|cellranger |1.1.0 | 0| 0| 0| +|cleanNLP |1.9.0 | 0| 0| 0| +|ClusterR |1.0.5 | 1| 0| 0| +|colorplaner |0.1.3 | 0| 0| 0| +|congressbr |0.1.1 | 0| 0| 0| +|cpr |0.2.3 | 0| 0| 0| +|cranlike |1.0.0 | 0| 0| 0| +|crplyr |0.1.2 | 0| 0| 0| +|crunch |1.17.0 | 0| 0| 0| +|crunchy |0.2.0 | 0| 0| 0| +|cvequality |0.1.1 | 0| 0| 0| +|DataExplorer |0.4.0 | 0| 0| 0| +|datasauRus |0.1.2 | 0| 0| 0| +|datastepr |0.0.2 | 0| 0| 0| +|DBI |0.7 | 0| 0| 1| +|dbplyr |1.0.0 | 1| 0| 0| +|debugme |1.0.2 | 0| 0| 0| +|dendextend |1.5.2 | 0| 0| 2| +|DepthProc |2.0.1 | 1| 0| 1| +|desc |1.1.0 | 0| 0| 0| +|descriptr |0.1.1 | 0| 0| 0| +|devtools |1.13.2 | 0| 0| 0| +|diceR |0.1.0 | 1| 0| 0| +|diffobj |0.1.6 | 0| 0| 1| +|discgolf |0.1.0 | 0| 0| 0| +|disposables |1.0.3 | 0| 0| 0| +|document |1.2.0 | 0| 0| 0| +|docuSignr |0.0.2 | 0| 0| 0| +|dparser |0.1.3 | 0| 0| 0| +|dplyr |0.7.1 | 1| 0| 0| +|dsrTest |0.2.1 | 0| 0| 0| +|dtplyr |0.0.2 | 0| 0| 0| +|duckduckr |1.0.0 | 0| 0| 0| +|easyml |0.1.0 | 1| 0| 0| +|elastic |0.7.8 | 0| 0| 1| +|EML |1.0.3 | 0| 0| 1| +|enigma |0.3.0 | 0| 0| 0| +|epicontacts |1.0.1 | 0| 0| 0| +|EpiModel |1.5.0 | 0| 0| 0| +|errorlocate |0.1.2 | 0| 0| 0| +|errors |0.0.2 | 0| 0| 0| +|exampletestr |0.4.0 | 0| 0| 0| +|fauxpas |0.1.0 | 0| 0| 0| +|FedData |2.4.5 | 1| 0| 0| +|fiery |0.2.2 | 0| 0| 0| +|filesstrings |1.0.0 | 0| 0| 0| +|finch |0.1.0 | 0| 0| 0| +|FLightR |0.4.6 | 0| 0| 0| +|fmbasics |0.2.0 | 0| 0| 0| +|fmdates |0.1.2 | 0| 0| 0| +|foghorn |0.4.4 | 0| 0| 0| +|forcats |0.2.0 | 0| 0| 0| +|formattable |0.2.0.1 | 0| 0| 0| +|FRK |0.1.4 | 0| 0| 2| +|FSelectorRcpp |0.1.3 | 1| 0| 1| +|FTRLProximal |0.3.0 | 0| 0| 1| +|funData |1.1 | 0| 0| 0| +|fuzzyjoin |0.1.3 | 0| 0| 0| +|fuzzywuzzyR |1.0.0 | 0| 0| 0| +|gastempt |0.4.01 | 0| 0| 1| +|geofacet |0.1.4 | 1| 0| 0| +|geojson |0.1.2 | 0| 0| 0| +|geojsonlint |0.2.0 | 0| 0| 0| +|geojsonR |1.0.1 | 0| 0| 0| +|getCRUCLdata |0.1.7 | 0| 0| 0| +|getlandsat |0.1.0 | 0| 0| 0| +|gghalfnorm |1.1.2 | 0| 0| 0| +|GGIR |1.5-9 | 0| 0| 1| +|ggplot2 |2.2.1 | 0| 0| 1| +|glue |1.1.1 | 0| 0| 0| +|googleAnalyticsR |0.4.1 | 0| 0| 0| +|googleAuthR |0.5.1 | 0| 0| 0| +|googleCloudStorageR |0.3.0 | 0| 0| 0| +|googleComputeEngineR |0.1.0 | 0| 0| 0| +|googlesheets |0.2.2 | 0| 0| 0| +|GSODR |1.0.3 | 0| 0| 0| +|gtable |0.2.0 | 0| 0| 0| +|hansard |0.4.6 | 0| 0| 0| +|HARtools |0.0.5 | 0| 0| 0| +|haven |1.0.0 | 0| 0| 2| +|heatmaply |0.10.1 | 0| 0| 1| +|huxtable |0.3.0 | 0| 0| 0| +|incidence |1.2.0 | 0| 0| 0| +|inferr |0.1.1 | 0| 0| 0| +|isdparser |0.2.0 | 0| 0| 0| +|joineR |1.2.0 | 0| 0| 0| +|jqr |0.2.4 | 0| 0| 1| +|kerasR |0.6.1 | 0| 0| 0| +|kernelboot |0.1.1 | 0| 0| 0| +|KernelKnn |1.0.5 | 1| 0| 0| +|lans2r |1.0.5 | 0| 0| 0| +|lawn |0.3.0 | 1| 0| 0| +|lazyeval |0.2.0 | 0| 0| 1| +|lexRankr |0.4.1 | 0| 0| 0| +|lingtypology |1.0.5 | 0| 0| 0| +|listWithDefaults |1.2.0 | 0| 0| 0| +|liteq |1.0.0 | 0| 0| 0| +|lubridate |1.6.0 | 0| 0| 2| +|manipulateWidget |0.7.0 | 0| 0| 0| +|mcparallelDo |1.1.0 | 0| 0| 0| +|Meiosis |1.0.2 | 0| 0| 0| +|memoise |1.1.0 | 0| 0| 0| +|MFPCA |1.1 | 0| 0| 1| +|mljar |0.1.1 | 0| 0| 0| +|mlrMBO |1.1.0 | 0| 1| 0| +|mockr |0.1 | 0| 0| 0| +|modelr |0.1.0 | 0| 0| 0| +|Momocs |1.1.6 | 0| 0| 1| +|mregions |0.1.4 | 0| 0| 0| +|nandb |0.2.0 | 1| 0| 0| +|naptime |1.3.0 | 0| 0| 0| +|natserv |0.1.4 | 0| 0| 0| +|ncdump |0.0.3 | 0| 0| 0| +|net.security |0.3.0 | 0| 0| 0| +|netdiffuseR |1.17.0 | 0| 0| 1| +|normalr |0.0.3 | 0| 0| 0| +|oai |0.2.2 | 0| 0| 1| +|odbc |1.1.0 | 0| 0| 0| +|olsrr |0.2.0 | 0| 0| 0| +|openadds |0.2.0 | 0| 0| 0| +|OpenImageR |1.0.6 | 1| 0| 0| +|optim.functions |0.1 | 0| 0| 0| +|optiRum |0.37.3 | 0| 0| 0| +|originr |0.2.0 | 0| 0| 0| +|outbreaks |1.3.0 | 0| 0| 0| +|owmr |0.7.2 | 0| 0| 0| +|pacotest |0.2.2 | 0| 0| 0| +|palr |0.0.6 | 0| 0| 0| +|pangaear |0.3.0 | 0| 0| 0| +|parlitools |0.0.4 | 0| 0| 0| +|parsedate |1.1.3 | 0| 0| 0| +|pkgconfig |2.0.1 | 0| 0| 0| +|plyr |1.8.4 | 0| 0| 1| +|pmc |1.0.2 | 0| 0| 0| +|preference |0.1.0 | 0| 0| 0| +|prettycode |1.0.0 | 0| 0| 0| +|primefactr |0.1.0 | 0| 0| 0| +|processx |2.0.0 | 0| 0| 0| +|productplots |0.1.1 | 0| 0| 0| +|prof.tree |0.1.0 | 0| 0| 0| +|PROscorer |0.0.1 | 0| 0| 0| +|PROscorerTools |0.0.1 | 0| 0| 0| +|proto |1.0.0 | 0| 0| 0| +|ptstem |0.0.3 | 0| 0| 1| +|purrr |0.2.2.2 | 0| 0| 0| +|purrrlyr |0.0.2 | 0| 0| 1| +|qwraps2 |0.2.4 | 0| 0| 1| +|rAltmetric |0.7.0 | 0| 0| 0| +|randgeo |0.2.0 | 0| 0| 0| +|ratelimitr |0.3.9 | 0| 0| 0| +|rbgm |0.0.4 | 0| 0| 0| +|rdpla |0.1.0 | 0| 0| 0| +|readr |1.1.1 | 0| 0| 0| +|readxl |1.0.0 | 0| 0| 0| +|rebird |0.4.0 | 0| 0| 0| +|rematch |1.0.1 | 0| 0| 0| +|rematch2 |2.0.1 | 0| 0| 0| +|reprex |0.1.1 | 0| 0| 0| +|rintrojs |0.1.2 | 0| 0| 0| +|ritis |0.5.4 | 0| 0| 0| +|rjsonapi |0.1.0 | 0| 0| 0| +|rlang |0.1.1 | 0| 0| 0| +|rnpn |0.1.0 | 0| 0| 0| +|roadoi |0.2 | 0| 0| 0| +|rodham |0.0.3 | 0| 0| 0| +|roxygen2 |6.0.1 | 0| 0| 1| +|rpdo |0.2.2 | 0| 0| 0| +|rplos |0.6.4 | 0| 0| 0| +|rrecsys |0.9.5.4 | 0| 0| 0| +|rredlist |0.3.0 | 0| 0| 0| +|RSauceLabs |0.1.6 | 0| 0| 0| +|RSelenium |1.7.1 | 0| 0| 1| +|rslp |0.1.0 | 0| 0| 0| +|rsnps |0.2.0 | 0| 0| 0| +|RSQLServer |0.3.0 | 1| 0| 0| +|rstack |1.0.0 | 0| 0| 0| +|rstantools |1.2.0 | 0| 0| 0| +|rvertnet |0.5.0 | 0| 0| 0| +|rvest |0.3.2 | 0| 0| 0| +|rvg |0.1.4 | 0| 0| 0| +|scales |0.4.1 | 0| 0| 1| +|secret |1.0.0 | 0| 0| 0| +|seleniumPipes |0.3.7 | 0| 0| 0| +|semver |0.2.0 | 0| 0| 1| +|sessioninfo |1.0.0 | 0| 0| 0| +|sfdct |0.0.3 | 0| 0| 0| +|shinyShortcut |0.1.0 | 0| 0| 0| +|sigmoid |0.2.1 | 0| 0| 0| +|simmer.plot |0.1.9 | 0| 0| 0| +|simmer |3.6.2 | 0| 0| 0| +|skeletor |1.0.4 | 0| 0| 0| +|snakecase |0.4.0 | 0| 0| 1| +|sofa |0.2.0 | 0| 0| 0| +|solrium |0.4.0 | 0| 0| 0| +|SpaDES |1.3.1 | 0| 0| 2| +|spbabel |0.4.7 | 0| 0| 0| +|spdplyr |0.1.3 | 0| 0| 0| +|spduration |0.16.0 | 0| 0| 0| +|spex |0.3.0 | 0| 0| 0| +|sss |0.1-0 | 0| 0| 0| +|stringr |1.2.0 | 0| 0| 0| +|svglite |1.2.0 | 0| 0| 1| +|taxize |0.8.4 | 0| 0| 0| +|templates |0.2.0 | 0| 0| 0| +|tensorr |0.1.0 | 0| 0| 0| +|testthat |1.0.2 | 0| 0| 1| +|text2vec |0.4.0 | 0| 0| 3| +|textreuse |0.1.4 | 0| 0| 1| +|textTinyR |1.0.7 | 1| 0| 0| +|thankr |1.0.0 | 0| 0| 0| +|themetagenomics |0.1.0 | 0| 0| 0| +|tibble |1.3.3 | 0| 0| 0| +|tidyr |0.6.3 | 0| 0| 0| +|tokenizers |0.1.4 | 0| 0| 1| +|toxboot |0.1.1 | 0| 0| 1| +|tracer |1.0.0 | 0| 0| 0| +|traits |0.2.0 | 0| 0| 0| +|trip |1.5.0 | 0| 0| 0| +|unitizer |1.4.3 | 0| 0| 0| +|units |0.4-5 | 0| 0| 0| +|useful |1.2.3 | 0| 0| 0| +|valr |0.3.0 | 1| 0| 0| +|vembedr |0.1.2 | 0| 0| 0| +|viridis |0.4.0 | 0| 0| 0| +|viridisLite |0.2.0 | 0| 0| 0| +|vqtl |1.2.0 | 0| 0| 1| +|wdman |0.2.2 | 0| 0| 0| +|Wmisc |0.3.2 | 1| 0| 2| +|worrms |0.1.0 | 0| 0| 0| +|xml2 |1.1.1 | 0| 0| 1| +|xmlparsedata |1.0.1 | 0| 0| 0| +|yesno |0.0.2 | 0| 0| 0| +|zip |1.0.0 | 0| 0| 0| ## ABCoptim (0.14.0) Maintainer: George Vega Yon -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘ABCoptim/libs/ABCoptim.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` ## aemo (0.2.0) Maintainer: Imanuel Costigan 0 errors | 0 warnings | 0 notes -## after (1.0.0) -Maintainer: Gábor Csárdi -Bug reports: https://github.com/gaborcsardi/after/issues +## ALA4R (1.5.6) +Maintainer: Ben Raymond 0 errors | 0 warnings | 0 notes -## ALA4R (1.5.3) -Maintainer: Ben Raymond +## alfred (0.1.1) +Maintainer: Onno Kleen +Bug reports: https://github.com/onnokleen/alfred/issues 0 errors | 0 warnings | 0 notes ## analogsea (0.5.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: http://www.github.com/sckott/analogsea/issues 0 errors | 0 warnings | 0 notes +## angstroms (0.0.1) +Maintainer: Michael D. Sumner +Bug reports: https://github.com/mdsumner/angstroms/issues + +0 errors | 0 warnings | 0 notes + +## antaresProcessing (0.10.2) +Maintainer: Francois Guillem +Bug reports: https://github.com/rte-antares-rpackage/antaresProcessing/issues + +0 errors | 0 warnings | 0 notes + +## antaresViz (0.10) +Maintainer: Francois Guillem +Bug reports: https://github.com/rte-antares-rpackage/antaresViz/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘leaflet.minicharts’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## ashr (2.0.5) Maintainer: Peter Carbonetto -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 2 notes ``` checking package dependencies ... NOTE Packages which this enhances but not available for checking: ‘REBayes’ ‘Rmosek’ + +checking compiled code ... NOTE +File ‘ashr/libs/ashr.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## autothresholdr (0.5.0) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/autothresholdr/issues + +1 error | 0 warnings | 0 notes + ``` +checking package dependencies ... ERROR +Package required but not available: ‘EBImage’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## awsjavasdk (0.2.0) +Maintainer: Russell Pierce +Bug reports: https://github.com/zapier/awsjavasdk/issues + +0 errors | 0 warnings | 0 notes ## betalink (2.2.1) Maintainer: Timothee Poisot -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking DESCRIPTION meta-information ... NOTE @@ -87,40 +417,82 @@ Checking should be performed on sources prepared by ‘R CMD build’. ``` ## bgmfiles (0.0.6) -Maintainer: Michael D. Sumner -Bug reports: - https://github.com/AustralianAntarcticDivision/bgmfiles/issues/ +Maintainer: Michael D. Sumner +Bug reports: https://github.com/AustralianAntarcticDivision/bgmfiles/issues/ 0 errors | 0 warnings | 0 notes -## binman (0.0.7) -Maintainer: John Harrison +## binman (0.1.0) +Maintainer: John Harrison Bug reports: https://github.com/johndharrison/binman/issues 0 errors | 0 warnings | 0 notes -## blob (1.0.0) -Maintainer: Hadley Wickham +## binomen (0.1.2) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/binomen/issues + +0 errors | 0 warnings | 0 notes + +## biolink (0.1.2) +Maintainer: Aaron Wolen + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [46s/68s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-utils.R:27:52: style: Opening curly braces should never go on their own line and should always be followed by a new line. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + tests/testthat/test-utils.R:27:67: style: Closing curly-braces should always be on their own line, unless it's followed by an else. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + + + testthat results ================================================================ + OK: 118 SKIPPED: 0 FAILED: 1 + 1. Failure: Package Style (@test-style.r#4) + + Error: testthat unit tests failed + Execution halted +``` + +## blob (1.1.0) +Maintainer: Kirill Müller Bug reports: https://github.com/hadley/blob/issues 0 errors | 0 warnings | 0 notes -## bold (0.3.5) -Maintainer: Scott Chamberlain +## bold (0.4.0) +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/bold/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking package dependencies ... NOTE Package suggested but not available for checking: ‘sangerseqR’ ``` -## broom (0.4.1) -Maintainer: David Robinson -Bug reports: http://github.com/dgrtwo/broom/issues +## breathtestcore (0.3.0) +Maintainer: Dieter Menne + +0 errors | 0 warnings | 0 notes -1 error | 0 warnings | 1 note +## breathteststan (0.3.0) +Maintainer: Dieter Menne + +0 errors | 0 warnings | 0 notes + +## broom (0.4.2) +Maintainer: David Robinson +Bug reports: http://github.com/tidyverse/broom/issues + +2 errors | 0 warnings | 0 notes ``` checking examples ... ERROR @@ -128,129 +500,186 @@ Running examples in ‘broom-Ex.R’ failed The error most likely occurred in: > base::assign(".ptime", proc.time(), pos = "CheckExEnv") -> ### Name: survfit_tidiers -> ### Title: tidy survival curve fits -> ### Aliases: glance.survfit survfit_tidiers tidy.survfit -> +> ### Name: gmm_tidiers +> ### Title: Tidying methods for generalized method of moments "gmm" objects +> ### Aliases: glance.gmm gmm_tidiers tidy.gmm +> > ### ** Examples -... 43 lines ... -+ do(glance(survfit(coxph(Surv(time, status) ~ age + sex, .)))) -+ -+ glances -+ -+ qplot(glances$median, binwidth = 15) -+ quantile(glances$median, c(.025, .975)) +... 58 lines ... ++ mutate(variable = reorder(variable, estimate)) %>% ++ ggplot(aes(estimate, variable)) + ++ geom_point() + ++ geom_errorbarh(aes(xmin = conf.low, xmax = conf.high)) + ++ facet_wrap(~ term) + ++ geom_vline(xintercept = 0, color = "red", lty = 2) + } -Error in data.frame(..., check.names = FALSE) : - arguments imply differing number of rows: 237, 0, 711 -Calls: tidy -> tidy.survfit -> cbind -> cbind -> data.frame +Error in `colnames<-`(`*tmp*`, value = c("conf.low", "conf.high")) : + attempt to set 'colnames' on an object with less than two dimensions +Calls: tidy -> tidy.gmm -> process_lm -> colnames<- Execution halted -checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘akima’ +checking tests ... ERROR + Running ‘test-all.R’ [16s/24s] +Running the tests in ‘tests/test-all.R’ failed. +Complete output: + > library(testthat) + > test_check("broom") + Loading required package: broom + Loading required namespace: gam + error occurred during calling the sampler; sampling not done + Error in check_stanfit(stanfit) : + Invalid stanfit object produced please report bug + Calls: test_check ... eval -> stan_glmer -> stan_glm.fit -> check_stanfit + testthat results ================================================================ + OK: 451 SKIPPED: 0 FAILED: 0 + Execution halted ``` ## brranching (0.2.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropensci/brranching/issues 0 errors | 0 warnings | 0 notes +## bsplus (0.1.0) +Maintainer: Ian Lyttle +Bug reports: https://github.com/ijlyttle/bsplus/issues + +0 errors | 0 warnings | 0 notes + ## BTYDplus (1.0.1) -Maintainer: Michael Platzer +Maintainer: Michael Platzer Bug reports: https://github.com/mplatzer/BTYDplus/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘BTYDplus/libs/BTYDplus.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` ## callr (1.0.0) -Maintainer: Gábor Csárdi +Maintainer: Gábor Csárdi Bug reports: https://github.com/MangoTheCat/callr/issues 0 errors | 0 warnings | 0 notes +## canvasXpress (0.16.2) +Maintainer: Connie Brett + +0 errors | 0 warnings | 1 note + +``` +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘limma’ +``` + +## ccafs (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/ccafs/issues + +0 errors | 0 warnings | 0 notes + ## cellranger (1.1.0) -Maintainer: Jennifer Bryan +Maintainer: Jennifer Bryan Bug reports: https://github.com/rsheets/cellranger/issues 0 errors | 0 warnings | 0 notes -## ClusterR (1.0.3) -Maintainer: Lampros Mouselimis -Bug reports: https://github.com/mlampros/ClusterR/issues +## cleanNLP (1.9.0) +Maintainer: Taylor B. Arnold +Bug reports: http://github.com/statsmaths/cleanNLP/issues 0 errors | 0 warnings | 0 notes +## ClusterR (1.0.5) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/ClusterR/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: ‘gmp’ ‘FD’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## colorplaner (0.1.3) -Maintainer: William Murphy +Maintainer: William Murphy Bug reports: https://github.com/wmurphyrd/colorplaner/issues 0 errors | 0 warnings | 0 notes -## crul (0.1.6) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/crul/issues +## congressbr (0.1.1) +Maintainer: Robert Myles McDonnell 0 errors | 0 warnings | 0 notes -## cvequality (0.1.1) -Maintainer: Ben Marwick +## cpr (0.2.3) +Maintainer: Peter DeWitt 0 errors | 0 warnings | 0 notes -## d3r (0.6.0) -Maintainer: Kent Russell -Bug reports: https://github.com/timelyportfolio/d3r/issues +## cranlike (1.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/r-hub/cranlike/issues -1 error | 0 warnings | 1 note +0 errors | 0 warnings | 0 notes -``` -checking examples ... ERROR -Running examples in ‘d3r-Ex.R’ failed -The error most likely occurred in: +## crplyr (0.1.2) +Maintainer: Neal Richardson +Bug reports: https://github.com/Crunch-io/crplyr/issues -> base::assign(".ptime", proc.time(), pos = "CheckExEnv") -> ### Name: d3_nest -> ### Title: Convert a 'data.frame' to a 'd3.js' Hierarchy -> ### Aliases: d3_nest -> -> ### ** Examples -... 31 lines ... -# A tibble: 1 × 2 - children name - -1 titanic -> -> # see the structure with listviewer -> tit_tb %>% -+ listviewer::jsonedit() -Error in loadNamespace(name) : there is no package called ‘listviewer’ -Calls: %>% ... tryCatch -> tryCatchList -> tryCatchOne -> -Execution halted +0 errors | 0 warnings | 0 notes -checking package dependencies ... NOTE -Package suggested but not available for checking: ‘listviewer’ +## crunch (1.17.0) +Maintainer: Neal Richardson +Bug reports: https://github.com/Crunch-io/rcrunch/issues -Packages which this enhances but not available for checking: - ‘partykit’ ‘treemap’ -``` +0 errors | 0 warnings | 0 notes + +## crunchy (0.2.0) +Maintainer: Neal Richardson +Bug reports: https://github.com/Crunch-io/crunchy/issues + +0 errors | 0 warnings | 0 notes -## DataExplorer (0.3.0) -Maintainer: Boxuan Cui +## cvequality (0.1.1) +Maintainer: Ben Marwick + +0 errors | 0 warnings | 0 notes + +## DataExplorer (0.4.0) +Maintainer: Boxuan Cui Bug reports: https://github.com/boxuancui/DataExplorer/issues 0 errors | 0 warnings | 0 notes +## datasauRus (0.1.2) +Maintainer: Steph Locke +Bug reports: https://github.com/stephlocke/datasauRus/issues + +0 errors | 0 warnings | 0 notes + ## datastepr (0.0.2) -Maintainer: Brandon Taylor +Maintainer: Brandon Taylor Bug reports: https://github.com/bramtayl/datastepr/issues 0 errors | 0 warnings | 0 notes -## DBI (0.5-1) -Maintainer: Kirill Müller +## DBI (0.7) +Maintainer: Kirill Müller Bug reports: https://github.com/rstats-db/DBI/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking S3 generic/method consistency ... NOTE @@ -260,14 +689,28 @@ See section ‘Registering S3 methods’ in the ‘Writing R Extensions’ manual. ``` -## debugme (1.0.1) -Maintainer: Gábor Csárdi +## dbplyr (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/dplyr/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘dplyr’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## debugme (1.0.2) +Maintainer: Gábor Csárdi Bug reports: https://github.com/gaborcsardi/debugme/issues 0 errors | 0 warnings | 0 notes -## dendextend (1.3.0) -Maintainer: Tal Galili +## dendextend (1.5.2) +Maintainer: Tal Galili Bug reports: https://github.com/talgalili/dendextend/issues 0 errors | 0 warnings | 2 notes @@ -281,47 +724,149 @@ checking Rd cross-references ... NOTE Packages unavailable to check Rd xrefs: ‘WGCNA’, ‘dendroextras’, ‘moduleColor’, ‘distory’, ‘ggdendro’ ``` -## descriptr (0.1.0) -Maintainer: Aravind Hebbali +## DepthProc (2.0.1) +Maintainer: Zygmunt Zawadzki + +1 error | 0 warnings | 1 note + +``` +checking whether package ‘DepthProc’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/DepthProc.Rcheck/00install.out’ for details. + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘fda’ +``` + +## desc (1.1.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/r-pkgs/desc/issues + +0 errors | 0 warnings | 0 notes + +## descriptr (0.1.1) +Maintainer: Aravind Hebbali Bug reports: https://github.com/rsquaredacademy/descriptr/issues 0 errors | 0 warnings | 0 notes -## devtools (1.12.0) -Maintainer: Hadley Wickham +## devtools (1.13.2) +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/devtools/issues 0 errors | 0 warnings | 0 notes +## diceR (0.1.0) +Maintainer: Derek Chiu +Bug reports: https://github.com/AlineTalhouk/diceR/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: + ‘flux’ ‘apcluster’ ‘infotheo’ ‘blockcluster’ ‘clue’ ‘clusterCrit’ + ‘clValid’ ‘klaR’ ‘quantable’ ‘RankAggreg’ ‘sigclust’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## diffobj (0.1.6) -Maintainer: Brodie Gaslam +Maintainer: Brodie Gaslam Bug reports: https://github.com/brodieG/diffobj/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘diffobj/libs/diffobj.so’: + Found no call to: ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` ## discgolf (0.1.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/sckott/discgolf/issues 0 errors | 0 warnings | 0 notes -## dplyr (0.5.0) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/dplyr/issues +## disposables (1.0.3) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/disposables/issues + +0 errors | 0 warnings | 0 notes + +## document (1.2.0) +Maintainer: Andreas Dominik Cullmann + +0 errors | 0 warnings | 0 notes + +## docuSignr (0.0.2) +Maintainer: Carl Ganz +Bug reports: https://github.com/CannaData/docuSignr/issues + +0 errors | 0 warnings | 0 notes + +## dparser (0.1.3) +Maintainer: Matthew Fidler + +0 errors | 0 warnings | 0 notes + +## dplyr (0.7.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/dplyr/issues + +1 error | 0 warnings | 0 notes + +``` +checking whether package ‘dplyr’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/dplyr.Rcheck/00install.out’ for details. +``` + +## dsrTest (0.2.1) +Maintainer: Michael Nelson +Bug reports: http://github.com/mnel/dsrTest/issues 0 errors | 0 warnings | 0 notes -## dtplyr (0.0.1) -Maintainer: Hadley Wickham +## dtplyr (0.0.2) +Maintainer: Lionel Henry Bug reports: https://github.com/hadley/dtplyr/issues 0 errors | 0 warnings | 0 notes +## duckduckr (1.0.0) +Maintainer: Schumacher Dirk +Bug reports: https://github.com/dirkschumacher/duckduckr/issues + +0 errors | 0 warnings | 0 notes + +## easyml (0.1.0) +Maintainer: Woo-Young Ahn +Bug reports: https://github.com/CCS-Lab/easyml/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: + ‘darch’ ‘dummies’ ‘glinternet’ ‘pbmcapply’ ‘scorer’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## elastic (0.7.8) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/elastic/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE @@ -330,8 +875,34 @@ checking installed package size ... NOTE examples 4.6Mb ``` -## EpiModel (1.2.8) -Maintainer: Samuel Jenness +## EML (1.0.3) +Maintainer: Carl Boettiger +Bug reports: https://github.com/ropensci/EML/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 7.7Mb + sub-directories of 1Mb or more: + R 1.3Mb + xsd 5.4Mb +``` + +## enigma (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropengov/enigma/issues + +0 errors | 0 warnings | 0 notes + +## epicontacts (1.0.1) +Maintainer: VP Nagraj +Bug reports: http://github.com/reconhub/epicontacts/issues + +0 errors | 0 warnings | 0 notes + +## EpiModel (1.5.0) +Maintainer: Samuel Jenness Bug reports: https://github.com/statnet/EpiModel/issues 0 errors | 0 warnings | 0 notes @@ -341,90 +912,268 @@ Maintainer: Edwin de Jonge 0 errors | 0 warnings | 0 notes +## errors (0.0.2) +Maintainer: Iñaki Ucar +Bug reports: https://github.com/Enchufa2/errors/issues + +0 errors | 0 warnings | 0 notes + +## exampletestr (0.4.0) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/autothresholdr/issues + +0 errors | 0 warnings | 0 notes + ## fauxpas (0.1.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropenscilabs/fauxpas/issues 0 errors | 0 warnings | 0 notes -## fiery (0.2.1) -Maintainer: Thomas Lin Pedersen +## FedData (2.4.5) +Maintainer: R. Kyle Bocinsky +Bug reports: https://github.com/bocinsky/FedData/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [6s/51s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + Attaching package: 'raster' + + The following objects are masked from 'package:aqp': + + metadata, metadata<- + + testthat results ================================================================ + OK: 24 SKIPPED: 0 FAILED: 1 + 1. Failure: The Daymet tiles are available at the correct URL (@test.DAYMET.R#10) + + Error: testthat unit tests failed + In addition: Warning message: + In .Internal(get(x, envir, mode, inherits)) : + closing unused connection 3 (ftp://ftp.ncdc.noaa.gov/pub/data/paleo/treering/chronologies/) + Execution halted +``` + +## fiery (0.2.2) +Maintainer: Thomas Lin Pedersen Bug reports: https://github.com/thomasp85/fiery/issues 0 errors | 0 warnings | 0 notes +## filesstrings (1.0.0) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/filesstrings/issues + +0 errors | 0 warnings | 0 notes + ## finch (0.1.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/finch/issues 0 errors | 0 warnings | 0 notes -## FLightR (0.4.5) -Maintainer: Eldar Rakhimberdiev +## FLightR (0.4.6) +Maintainer: Eldar Rakhimberdiev Bug reports: http://github.com/eldarrak/FLightR/issues -1 error | 0 warnings | 0 notes +0 errors | 0 warnings | 0 notes -``` -checking package dependencies ... ERROR -Packages required but not available: ‘ggsn’ ‘GeoLight’ +## fmbasics (0.2.0) +Maintainer: Imanuel Costigan +Bug reports: https://github.com/imanuelcostigan/fmbasics/issues -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` +0 errors | 0 warnings | 0 notes + +## fmdates (0.1.2) +Maintainer: Imanuel Costigan +Bug reports: https://github.com/imanuelcostigan/fmdates/issues + +0 errors | 0 warnings | 0 notes + +## foghorn (0.4.4) +Maintainer: Francois Michonneau +Bug reports: https://github.com/fmichonneau/foghorn/issues -## forcats (0.1.1) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/forcats/issues +0 errors | 0 warnings | 0 notes + +## forcats (0.2.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/forcats/issues 0 errors | 0 warnings | 0 notes ## formattable (0.2.0.1) -Maintainer: Kun Ren +Maintainer: Kun Ren Bug reports: https://github.com/renkun-ken/formattable/issues 0 errors | 0 warnings | 0 notes -## fuzzyjoin (0.1.2) -Maintainer: David Robinson +## FRK (0.1.4) +Maintainer: Andrew Zammit-Mangion +Bug reports: http://github.com/andrewzm/FRK/issues + +0 errors | 0 warnings | 2 notes + +``` +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘INLA’ + +Package which this enhances but not available for checking: ‘dggrids’ + +checking installed package size ... NOTE + installed size is 7.6Mb + sub-directories of 1Mb or more: + data 4.8Mb + doc 1.6Mb +``` + +## FSelectorRcpp (0.1.3) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues + +1 error | 0 warnings | 1 note + +``` +checking whether package ‘FSelectorRcpp’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/FSelectorRcpp.Rcheck/00install.out’ for details. + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ +``` + +## FTRLProximal (0.3.0) +Maintainer: Vilhelm von Ehrenheim +Bug reports: https://github.com/while/FTRLProximal/issues + +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘FTRLProximal/libs/FTRLProximal.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## funData (1.1) +Maintainer: Clara Happ + +0 errors | 0 warnings | 0 notes + +## fuzzyjoin (0.1.3) +Maintainer: David Robinson + +0 errors | 0 warnings | 0 notes + +## fuzzywuzzyR (1.0.0) +Maintainer: Lampros Mouselimis 0 errors | 0 warnings | 0 notes -## GeneralTree (0.0.1) -Maintainer: Anton Bossenbroek +## gastempt (0.4.01) +Maintainer: Dieter Menne +Bug reports: http://github.com/dmenne/gastempt/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE - installed size is 5.2Mb + installed size is 6.9Mb sub-directories of 1Mb or more: - doc 4.9Mb + libs 6.4Mb +``` + +## geofacet (0.1.4) +Maintainer: Ryan Hafen + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [129s/152s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-utils.R:27:52: style: Opening curly braces should never go on their own line and should always be followed by a new line. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + tests/testthat/test-utils.R:27:67: style: Closing curly-braces should always be on their own line, unless it's followed by an else. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + + + testthat results ================================================================ + OK: 17 SKIPPED: 0 FAILED: 1 + 1. Failure: package Style (@test-zzz-lintr.R#5) + + Error: testthat unit tests failed + Execution halted ``` -## geojson (0.1.0) -Maintainer: Scott Chamberlain +## geojson (0.1.2) +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/geojson/issues 0 errors | 0 warnings | 0 notes ## geojsonlint (0.2.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropenscilabs/geojsonlint/issues 0 errors | 0 warnings | 0 notes +## geojsonR (1.0.1) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/geojsonR/issues + +0 errors | 0 warnings | 0 notes + +## getCRUCLdata (0.1.7) +Maintainer: Adam Sparks +Bug reports: https://github.com/ropensci/getCRUCLdata/issues + +0 errors | 0 warnings | 0 notes + ## getlandsat (0.1.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropenscilabs/getlandsat/issues 0 errors | 0 warnings | 0 notes -## ggplot2 (2.2.0) -Maintainer: Hadley Wickham +## gghalfnorm (1.1.2) +Maintainer: Nathan Eastwood +Bug reports: https://github.com/nathaneastwood/gghalfnorm/issues + +0 errors | 0 warnings | 0 notes + +## GGIR (1.5-9) +Maintainer: Vincent T van Hees +Bug reports: https://github.com/wadpac/GGIR/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 5.4Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.4Mb + doc 1.2Mb +``` + +## ggplot2 (2.2.1) +Maintainer: Hadley Wickham Bug reports: https://github.com/tidyverse/ggplot2/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE @@ -434,284 +1183,622 @@ checking installed package size ... NOTE doc 1.5Mb ``` -## goldi (1.0.0) -Maintainer: Christopher B. Cole -Bug reports: https://github.com/Chris1221/goldi/issues +## glue (1.1.1) +Maintainer: Jim Hester +Bug reports: https://github.com/tidyverse/glue/issues 0 errors | 0 warnings | 0 notes -## googleAnalyticsR (0.3.0) -Maintainer: Mark Edmondson -Bug reports: - https://github.com/MarkEdmondson1234/googleAnalyticsR/issues +## googleAnalyticsR (0.4.1) +Maintainer: Mark Edmondson +Bug reports: https://github.com/MarkEdmondson1234/googleAnalyticsR/issues 0 errors | 0 warnings | 0 notes -## googleAuthR (0.4.0) -Maintainer: Mark Edmondson +## googleAuthR (0.5.1) +Maintainer: Mark Edmondson Bug reports: https://github.com/MarkEdmondson1234/googleAuthR/issues 0 errors | 0 warnings | 0 notes -## googleCloudStorageR (0.2.0) -Maintainer: Mark Edmondson +## googleCloudStorageR (0.3.0) +Maintainer: Mark Edmondson Bug reports: https://github.com/cloudyr/googleCloudStorageR/issues 0 errors | 0 warnings | 0 notes ## googleComputeEngineR (0.1.0) -Maintainer: Mark Edmondson +Maintainer: Mark Edmondson Bug reports: https://github.com/cloudyr/googleComputeEngineR/issues 0 errors | 0 warnings | 0 notes -## googlesheets (0.2.1) -Maintainer: Jennifer Bryan +## googlesheets (0.2.2) +Maintainer: Jennifer Bryan Bug reports: https://github.com/jennybc/googlesheets/issues 0 errors | 0 warnings | 0 notes +## GSODR (1.0.3) +Maintainer: Adam Sparks +Bug reports: https://github.com/ropensci/GSODR/issues + +0 errors | 0 warnings | 0 notes + ## gtable (0.2.0) Maintainer: Hadley Wickham 0 errors | 0 warnings | 0 notes +## hansard (0.4.6) +Maintainer: Evan Odell +Bug reports: https://github.com/EvanOdell/hansard/issues + +0 errors | 0 warnings | 0 notes + ## HARtools (0.0.5) -Maintainer: John Harrison +Maintainer: John Harrison Bug reports: https://github.com/johndharrison/HARtools/issues 0 errors | 0 warnings | 0 notes ## haven (1.0.0) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/haven/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 2 notes ``` checking for GNU extensions in Makefiles ... NOTE GNU make is a SystemRequirements. + +checking compiled code ... NOTE +File ‘haven/libs/haven.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. ``` -## incidence (1.1.0) -Maintainer: Thibaut Jombart +## heatmaply (0.10.1) +Maintainer: Tal Galili +Bug reports: https://github.com/talgalili/heatmaply/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 5.1Mb + sub-directories of 1Mb or more: + doc 4.6Mb +``` + +## huxtable (0.3.0) +Maintainer: David Hugh-Jones +Bug reports: https://github.com/hughjonesd/huxtable/issues + +0 errors | 0 warnings | 0 notes + +## incidence (1.2.0) +Maintainer: Thibaut Jombart Bug reports: http://github.com/reconhub/incidence/issues 0 errors | 0 warnings | 0 notes -## isdparser (0.1.0) -Maintainer: Scott Chamberlain -Bug reports: http://www.github.com/ropenscilabs/isdparser/issues +## inferr (0.1.1) +Maintainer: Aravind Hebbali +Bug reports: https://github.com/rsquaredacademy/inferr/issues + +0 errors | 0 warnings | 0 notes + +## isdparser (0.2.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/isdparser/issues + +0 errors | 0 warnings | 0 notes + +## joineR (1.2.0) +Maintainer: Graeme L. Hickey +Bug reports: https://github.com/graemeleehickey/joineR/issues 0 errors | 0 warnings | 0 notes ## jqr (0.2.4) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/jqr/issues +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘jqr/libs/jqr.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## kerasR (0.6.1) +Maintainer: Taylor Arnold +Bug reports: http://github.com/statsmaths/kerasR/issues + 0 errors | 0 warnings | 0 notes -## KernelKnn (1.0.3) -Maintainer: Lampros Mouselimis -Bug reports: https://github.com/mlampros/KernelKnn/issues +## kernelboot (0.1.1) +Maintainer: Tymoteusz Wolodzko +Bug reports: https://github.com/twolodzko/kernelboot/issues 0 errors | 0 warnings | 0 notes -## largeVis (0.1.10.2) -Maintainer: Amos Elberg -Bug reports: https://github.com/elbamos/largeVis/issues +## KernelKnn (1.0.5) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/KernelKnn/issues -0 errors | 0 warnings | 1 note +1 error | 0 warnings | 0 notes ``` -checking installed package size ... NOTE - installed size is 6.5Mb - sub-directories of 1Mb or more: - doc 1.0Mb - libs 1.2Mb - testdata 1.9Mb - vignettedata 2.0Mb +checking whether package ‘KernelKnn’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/KernelKnn.Rcheck/00install.out’ for details. ``` +## lans2r (1.0.5) +Maintainer: Sebastian Kopf +Bug reports: https://github.com/KopfLab/lans2r/issues + +0 errors | 0 warnings | 0 notes + ## lawn (0.3.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropensci/lawn/issues -0 errors | 0 warnings | 0 notes +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘test-all.R’ +Running the tests in ‘tests/test-all.R’ failed. +Last 13 lines of output: + Actual value: "c++ exception (unknown reason)" + + + 2. Failure: lawn_centroid fails correctly (@test-centroid.R#50) ---------------- + error$message does not match "Unexpected number". + Actual value: "c++ exception (unknown reason)" + + + testthat results ================================================================ + OK: 805 SKIPPED: 0 FAILED: 2 + 1. Failure: lawn_centroid fails correctly (@test-centroid.R#47) + 2. Failure: lawn_centroid fails correctly (@test-centroid.R#50) + + Error: testthat unit tests failed + Execution halted +``` ## lazyeval (0.2.0) Maintainer: Hadley Wickham -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘lazyeval/libs/lazyeval.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` -## lexRankr (0.3.0) +## lexRankr (0.4.1) Maintainer: Adam Spannbauer +Bug reports: https://github.com/AdamSpannbauer/lexRankr/issues/ + +0 errors | 0 warnings | 0 notes + +## lingtypology (1.0.5) +Maintainer: George Moroz +Bug reports: https://github.com/ropensci/lingtypology/issues + +0 errors | 0 warnings | 0 notes + +## listWithDefaults (1.2.0) +Maintainer: Russell S. Pierce +Bug reports: https://github.com/drknexus/listWithDefaults + +0 errors | 0 warnings | 0 notes + +## liteq (1.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/liteq/issues 0 errors | 0 warnings | 0 notes ## lubridate (1.6.0) -Maintainer: Vitalie Spinu +Maintainer: Vitalie Spinu Bug reports: https://github.com/hadley/lubridate/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 2 notes ``` checking package dependencies ... NOTE Packages which this enhances but not available for checking: - ‘timeDate’ ‘its’ ‘tis’ ‘timeSeries’ ‘fts’ ‘tseries’ + ‘its’ ‘tis’ ‘fts’ + +checking compiled code ... NOTE +File ‘lubridate/libs/lubridate.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. ``` -## mapr (0.3.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/mapr/issues +## manipulateWidget (0.7.0) +Maintainer: Francois Guillem +Bug reports: https://goo.gl/pV7o5c 0 errors | 0 warnings | 0 notes ## mcparallelDo (1.1.0) -Maintainer: Russell S. Pierce +Maintainer: Russell S. Pierce Bug reports: https://github.com/drknexus/mcparallelDo/issues 0 errors | 0 warnings | 0 notes +## Meiosis (1.0.2) +Maintainer: Dominik Mueller +Bug reports: https://github.com/DominikMueller64/Meiosis/issues + +0 errors | 0 warnings | 0 notes + +## memoise (1.1.0) +Maintainer: Jim Hester +Bug reports: https://github.com/hadley/memoise/issues + +0 errors | 0 warnings | 0 notes + +## MFPCA (1.1) +Maintainer: Clara Happ + +0 errors | 0 warnings | 1 note + +``` +checking Rd cross-references ... NOTE +Package unavailable to check Rd xrefs: ‘refund’ +``` + +## mljar (0.1.1) +Maintainer: Piotr Płoński +Bug reports: https://github.com/mljar/mljar-api-R/issues + +0 errors | 0 warnings | 0 notes + +## mlrMBO (1.1.0) +Maintainer: Jakob Richter +Bug reports: https://github.com/mlr-org/mlrMBO/issues + +0 errors | 1 warning | 0 notes + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + unable to load shared object '/Library/Frameworks/R.framework/Resources/library/grDevices/libs//cairo.so': + dlopen(/Library/Frameworks/R.framework/Resources/library/grDevices/libs//cairo.so, 6): Library not loaded: /opt/X11/lib/libfontconfig.1.dylib + Referenced from: /Library/Frameworks/R.framework/Resources/library/grDevices/libs//cairo.so + Reason: Incompatible library version: cairo.so requires version 11.0.0 or later, but libfontconfig.1.dylib provides version 10.0.0 +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +pandoc: Could not fetch mlrMBO_files/figure-html/cosine_fun-1.svg +mlrMBO_files/figure-html/cosine_fun-1.svg: openBinaryFile: does not exist (No such file or directory) +Error: processing vignette 'mlrMBO.Rmd' failed with diagnostics: +pandoc document conversion failed with error 67 +Execution halted + +``` + +## mockr (0.1) +Maintainer: Kirill Müller +Bug reports: https://github.com/krlmlr/mockr/issues + +0 errors | 0 warnings | 0 notes + ## modelr (0.1.0) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/modelr/issues 0 errors | 0 warnings | 0 notes -## Momocs (1.1.0) -Maintainer: Vincent Bonhomme +## Momocs (1.1.6) +Maintainer: Vincent Bonhomme Bug reports: https://github.com/vbonhomme/Momocs/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE - installed size is 5.8Mb + installed size is 6.0Mb sub-directories of 1Mb or more: - R 1.7Mb + R 1.8Mb data 1.1Mb doc 2.2Mb ``` ## mregions (0.1.4) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropenscilabs/mregions/issues 0 errors | 0 warnings | 0 notes -## naptime (1.2.0) -Maintainer: Russell Pierce +## nandb (0.2.0) +Maintainer: Rory Nolan +Bug reports: https://github.com/rorynolan/nandb/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: + ‘autothresholdr’ ‘BiocParallel’ ‘EBImage’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## naptime (1.3.0) +Maintainer: Russell S. Pierce Bug reports: https://github.com/drknexus/naptime/issues 0 errors | 0 warnings | 0 notes -## natserv (0.1.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/natserv/issues +## natserv (0.1.4) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/natserv/issues + +0 errors | 0 warnings | 0 notes + +## ncdump (0.0.3) +Maintainer: Michael D. Sumner +Bug reports: https://github.com/r-gris/ncdump/issues + +0 errors | 0 warnings | 0 notes + +## net.security (0.3.0) +Maintainer: Humbert Costas + +0 errors | 0 warnings | 0 notes + +## netdiffuseR (1.17.0) +Maintainer: George Vega Yon +Bug reports: https://github.com/USCCANA/netdiffuseR/issues + +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘netdiffuseR/libs/netdiffuseR.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## normalr (0.0.3) +Maintainer: Kevin Chang +Bug reports: https://github.com/kcha193/normalr/issues + +0 errors | 0 warnings | 0 notes + +## oai (0.2.2) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/oai/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note -## netdiffuseR (1.17.0) -Maintainer: George Vega Yon -Bug reports: https://github.com/USCCANA/netdiffuseR/issues +``` +checking compiled code ... NOTE +File ‘oai/libs/oai.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ -0 errors | 0 warnings | 0 notes +It is good practice to register native routines and to disable symbol +search. -## normalr (0.0.1) -Maintainer: Kevin Chang -Bug reports: https://github.com/kcha193/normalr/issues +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## odbc (1.1.0) +Maintainer: Jim Hester +Bug reports: https://github.com/rstats-db/odbc/issues 0 errors | 0 warnings | 0 notes -## oai (0.2.2) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/oai/issues +## olsrr (0.2.0) +Maintainer: Aravind Hebbali +Bug reports: https://github.com/rsquaredacademy/olsrr/issues 0 errors | 0 warnings | 0 notes -## openadds (0.1.0) -Maintainer: Scott Chamberlain +## openadds (0.2.0) +Maintainer: Scott Chamberlain Bug reports: https://github.com/sckott/openadds/issues 0 errors | 0 warnings | 0 notes -## OpenImageR (1.0.2) -Maintainer: Lampros Mouselimis +## OpenImageR (1.0.6) +Maintainer: Lampros Mouselimis Bug reports: https://github.com/mlampros/OpenImageR/issues +1 error | 0 warnings | 0 notes + +``` +checking whether package ‘OpenImageR’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/OpenImageR.Rcheck/00install.out’ for details. +``` + +## optim.functions (0.1) +Maintainer: Thomas Torsney-Weir + 0 errors | 0 warnings | 0 notes ## optiRum (0.37.3) -Maintainer: Stephanie Locke +Maintainer: Stephanie Locke Bug reports: https://github.com/stephlocke/optiRum/issues 0 errors | 0 warnings | 0 notes ## originr (0.2.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/originr/issues 0 errors | 0 warnings | 0 notes -## outbreaks (1.1.0) -Maintainer: Finlay Campbell +## outbreaks (1.3.0) +Maintainer: Finlay Campbell Bug reports: https://github.com/reconhub/outbreaks/issues 0 errors | 0 warnings | 0 notes +## owmr (0.7.2) +Maintainer: Stefan Kuethe +Bug reports: https://github.com/crazycapivara/owmr/issues/ + +0 errors | 0 warnings | 0 notes + +## pacotest (0.2.2) +Maintainer: Malte S. Kurz +Bug reports: http://github.com/MalteKurz/pacotest/issues + +0 errors | 0 warnings | 0 notes + ## palr (0.0.6) -Maintainer: Michael D. Sumner +Maintainer: Michael D. Sumner Bug reports: https://github.com/AustralianAntarcticDivision/palr/issues 0 errors | 0 warnings | 0 notes -## pangaear (0.2.4) -Maintainer: Scott Chamberlain +## pangaear (0.3.0) +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/pangaear/issues 0 errors | 0 warnings | 0 notes +## parlitools (0.0.4) +Maintainer: Evan Odell +Bug reports: https://github.com/EvanOdell/parlitools/issues + +0 errors | 0 warnings | 0 notes + +## parsedate (1.1.3) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/parsedate/issues + +0 errors | 0 warnings | 0 notes + +## pkgconfig (2.0.1) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/pkgconfig/issues + +0 errors | 0 warnings | 0 notes + ## plyr (1.8.4) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/plyr/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘plyr/libs/plyr.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` ## pmc (1.0.2) -Maintainer: Carl Boettiger +Maintainer: Carl Boettiger Bug reports: https://github.com/cboettig/pmc/issues 0 errors | 0 warnings | 0 notes +## preference (0.1.0) +Maintainer: Briana Cameron +Bug reports: https://github.com/kaneplusplus/preference/issues + +0 errors | 0 warnings | 0 notes + +## prettycode (1.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/prettycode/issues + +0 errors | 0 warnings | 0 notes + ## primefactr (0.1.0) -Maintainer: Florian Privé +Maintainer: Florian Privé Bug reports: https://github.com/privefl/primefactr/issues 0 errors | 0 warnings | 0 notes +## processx (2.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/r-pkgs/processx/issues + +0 errors | 0 warnings | 0 notes + ## productplots (0.1.1) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/productplots/issues 0 errors | 0 warnings | 0 notes ## prof.tree (0.1.0) -Maintainer: Artem Kelvtsov +Maintainer: Artem Kelvtsov Bug reports: https://github.com/artemklevtsov/prof.tree/issues 0 errors | 0 warnings | 0 notes +## PROscorer (0.0.1) +Maintainer: Ray Baser +Bug reports: http://github.com/raybaser/PROscorer/issues + +0 errors | 0 warnings | 0 notes + +## PROscorerTools (0.0.1) +Maintainer: Ray Baser +Bug reports: http://github.com/raybaser/PROscorerTools/issues + +0 errors | 0 warnings | 0 notes + ## proto (1.0.0) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/proto/issues 0 errors | 0 warnings | 0 notes -## ptstem (0.0.2) +## ptstem (0.0.3) Maintainer: Daniel Falbel -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE @@ -720,124 +1807,126 @@ checking installed package size ... NOTE dict 5.1Mb ``` -## purrr (0.2.2) -Maintainer: Hadley Wickham +## purrr (0.2.2.2) +Maintainer: Lionel Henry Bug reports: https://github.com/hadley/purrr/issues 0 errors | 0 warnings | 0 notes -## qwraps2 (0.2.4) -Maintainer: Peter DeWitt - -0 errors | 0 warnings | 0 notes - -## radiant.basics (0.6.0) -Maintainer: Vincent Nijs -Bug reports: https://github.com/radiant-rstats/radiant.basics/issues +## purrrlyr (0.0.2) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/purrrlyr/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` -checking installed package size ... NOTE - installed size is 5.2Mb - sub-directories of 1Mb or more: - app 4.5Mb +checking dependencies in R code ... NOTE +Missing or unexported object: ‘purrr::as_mapper’ ``` -## radiant.data (0.6.0) -Maintainer: Vincent Nijs -Bug reports: https://github.com/radiant-rstats/radiant.data/issues +## qwraps2 (0.2.4) +Maintainer: Peter DeWitt -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘qwraps2/libs/qwraps2.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ -## radiant.model (0.6.0) -Maintainer: Vincent Nijs -Bug reports: https://github.com/radiant-rstats/radiant.model/issues +It is good practice to register native routines and to disable symbol +search. -0 errors | 0 warnings | 0 notes +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` -## radiant.multivariate (0.6.0) -Maintainer: Vincent Nijs -Bug reports: - https://github.com/radiant-rstats/radiant.multivariate/issues +## rAltmetric (0.7.0) +Maintainer: Karthik Ram +Bug reports: https://github.com/ropensci/rAltmetric/issues 0 errors | 0 warnings | 0 notes -## radiant (0.6.0) -Maintainer: Vincent Nijs -Bug reports: https://github.com/radiant-rstats/radiant/issues +## randgeo (0.2.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/randgeo/issues 0 errors | 0 warnings | 0 notes -## ratelimitr (0.3.7) -Maintainer: Tarak Shah +## ratelimitr (0.3.9) +Maintainer: Tarak Shah Bug reports: https://github.com/tarakc02/ratelimitr/issues 0 errors | 0 warnings | 0 notes ## rbgm (0.0.4) -Maintainer: Michael D. Sumner +Maintainer: Michael D. Sumner Bug reports: https://github.com/AustralianAntarcticDivision/rbgm/issues/ 0 errors | 0 warnings | 0 notes -## rbhl (0.3.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/rbhl/issues +## rdpla (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rdpla/issues 0 errors | 0 warnings | 0 notes -## rbison (0.5.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/rbison/issues +## readr (1.1.1) +Maintainer: Jim Hester +Bug reports: https://github.com/tidyverse/readr/issues 0 errors | 0 warnings | 0 notes -## rcrossref (0.6.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/rcrossref/issues +## readxl (1.0.0) +Maintainer: Jennifer Bryan +Bug reports: https://github.com/tidyverse/readxl/issues 0 errors | 0 warnings | 0 notes -## rdpla (0.1.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/rdpla/issues +## rebird (0.4.0) +Maintainer: Sebastian Pardo +Bug reports: http://github.com/ropensci/rebird/issues 0 errors | 0 warnings | 0 notes -## readr (1.0.0) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/readr/issues +## rematch (1.0.1) +Maintainer: Gabor Csardi +Bug reports: https://github.com/MangoTheCat/rematch/issues 0 errors | 0 warnings | 0 notes -## rematch (1.0.1) -Maintainer: Gabor Csardi -Bug reports: https://github.com/MangoTheCat/rematch/issues +## rematch2 (2.0.1) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/r-lib/rematch2/issues 0 errors | 0 warnings | 0 notes -## rgeospatialquality (0.3.2) -Maintainer: Javier Otegui -Bug reports: https://github.com/ropenscilabs/rgeospatialquality/issues +## reprex (0.1.1) +Maintainer: Jennifer Bryan +Bug reports: https://github.com/jennybc/reprex/issues 0 errors | 0 warnings | 0 notes ## rintrojs (0.1.2) -Maintainer: Carl Ganz +Maintainer: Carl Ganz Bug reports: https://github.com/carlganz/rintrojs/issues 0 errors | 0 warnings | 0 notes ## ritis (0.5.4) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/ritis/issues 0 errors | 0 warnings | 0 notes -## rnoaa (0.6.6) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/rnoaa/issues +## rjsonapi (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rjsonapi/issues + +0 errors | 0 warnings | 0 notes + +## rlang (0.1.1) +Maintainer: Lionel Henry +Bug reports: https://github.com/tidyverse/rlang/issues 0 errors | 0 warnings | 0 notes @@ -846,40 +1935,69 @@ Maintainer: Scott Chamberlain 0 errors | 0 warnings | 0 notes -## rodham (0.0.2) +## roadoi (0.2) +Maintainer: Najko Jahn +Bug reports: https://github.com/njahn82/roadoi/issues + +0 errors | 0 warnings | 0 notes + +## rodham (0.0.3) Maintainer: John Coene +Bug reports: https://github.com/JohnCoene/rodham/issues + +0 errors | 0 warnings | 0 notes + +## roxygen2 (6.0.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/klutometis/roxygen/issues + +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘roxygen2/libs/roxygen2.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## rpdo (0.2.2) +Maintainer: Joe Thorley 0 errors | 0 warnings | 0 notes ## rplos (0.6.4) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rplos/issues 0 errors | 0 warnings | 0 notes ## rrecsys (0.9.5.4) -Maintainer: Ludovik Çoba +Maintainer: Ludovik Çoba Bug reports: https://github.com/ludovikcoba/rrecsys/issues 0 errors | 0 warnings | 0 notes -## rredlist (0.2.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropenscilabs/rredlist/issues +## rredlist (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rredlist/issues 0 errors | 0 warnings | 0 notes ## RSauceLabs (0.1.6) -Maintainer: John Harrison +Maintainer: John Harrison Bug reports: https://github.com/johndharrison/RSauceLabs/issues 0 errors | 0 warnings | 0 notes -## RSelenium (1.6.2) -Maintainer: John Harrison +## RSelenium (1.7.1) +Maintainer: John Harrison Bug reports: http://github.com/ropensci/RSelenium/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking package dependencies ... NOTE @@ -892,84 +2010,166 @@ Maintainer: Daniel Falbel 0 errors | 0 warnings | 0 notes ## rsnps (0.2.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rsnps/issues 0 errors | 0 warnings | 0 notes +## RSQLServer (0.3.0) +Maintainer: Imanuel Costigan +Bug reports: https://github.com/imanuelcostigan/RSQLServer/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘dplyr’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## rstack (1.0.0) -Maintainer: Gábor Csárdi +Maintainer: Gábor Csárdi Bug reports: https://github.com/MangoTheCat/rstack/issues 0 errors | 0 warnings | 0 notes -## rstantools (1.1.0) -Maintainer: Jonah Gabry +## rstantools (1.2.0) +Maintainer: Jonah Gabry Bug reports: https://github.com/stan-dev/rstantools/issues 0 errors | 0 warnings | 0 notes ## rvertnet (0.5.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rvertnet/issues 0 errors | 0 warnings | 0 notes ## rvest (0.3.2) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/rvest/issues 0 errors | 0 warnings | 0 notes -## rvg (0.1.1) -Maintainer: David Gohel +## rvg (0.1.4) +Maintainer: David Gohel Bug reports: https://github.com/davidgohel/rvg/issues 0 errors | 0 warnings | 0 notes ## scales (0.4.1) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/scales/issues +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘scales/libs/scales.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## secret (1.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/secret/issues + 0 errors | 0 warnings | 0 notes ## seleniumPipes (0.3.7) -Maintainer: John Harrison +Maintainer: John Harrison Bug reports: https://github.com/johndharrison/seleniumPipes/issues 0 errors | 0 warnings | 0 notes -## sigmoid (0.2.0) +## semver (0.2.0) +Maintainer: John Harrison +Bug reports: https://github.com/johndharrison/semver/issues + +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘semver/libs/semver.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## sessioninfo (1.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/r-lib/sessioninfo/issues + +0 errors | 0 warnings | 0 notes + +## sfdct (0.0.3) +Maintainer: Michael D. Sumner +Bug reports: https://github.com/r-gris/sfdct/issues + +0 errors | 0 warnings | 0 notes + +## shinyShortcut (0.1.0) +Maintainer: Ewan Keith + +0 errors | 0 warnings | 0 notes + +## sigmoid (0.2.1) Maintainer: Bastiaan Quast 0 errors | 0 warnings | 0 notes -## simmer.plot (0.1.4) -Maintainer: Iñaki Ucar +## simmer.plot (0.1.9) +Maintainer: Iñaki Ucar Bug reports: https://github.com/r-simmer/simmer.plot/issues 0 errors | 0 warnings | 0 notes -## simmer (3.6.0) -Maintainer: Iñaki Ucar +## simmer (3.6.2) +Maintainer: Iñaki Ucar Bug reports: https://github.com/r-simmer/simmer/issues 0 errors | 0 warnings | 0 notes +## skeletor (1.0.4) +Maintainer: Neal Richardson +Bug reports: https://github.com/nealrichardson/skeletor/issues + +0 errors | 0 warnings | 0 notes + +## snakecase (0.4.0) +Maintainer: Malte Grosser + +0 errors | 0 warnings | 1 note + +``` +checking for unstated dependencies in vignettes ... NOTE +Warning: parse error in file '/Users/jhester/Dropbox/projects/covr/revdep/checks/snakecase.Rcheck/snakecase/doc/caseconverters.R': +invalid multibyte character in parser at line 28 +``` + ## sofa (0.2.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/sofa/issues 0 errors | 0 warnings | 0 notes ## solrium (0.4.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropensci/solrium/issues 0 errors | 0 warnings | 0 notes ## SpaDES (1.3.1) -Maintainer: Alex M Chubaty +Maintainer: Alex M Chubaty Bug reports: https://github.com/PredictiveEcology/SpaDES/issues 0 errors | 0 warnings | 2 notes @@ -979,173 +2179,366 @@ checking package dependencies ... NOTE Package suggested but not available for checking: ‘fastshp’ checking installed package size ... NOTE - installed size is 6.5Mb + installed size is 7.1Mb sub-directories of 1Mb or more: - R 3.5Mb + R 4.0Mb doc 2.1Mb ``` -## spbabel (0.4.5) -Maintainer: Michael D. Sumner +## spbabel (0.4.7) +Maintainer: Michael D. Sumner Bug reports: https://github.com/mdsumner/spbabel/issues 0 errors | 0 warnings | 0 notes -## spdplyr (0.1.2) -Maintainer: Michael D. Sumner +## spdplyr (0.1.3) +Maintainer: Michael D. Sumner Bug reports: https://github.com/mdsumner/spdplyr/issues 0 errors | 0 warnings | 0 notes -## spex (0.1.0) -Maintainer: Michael D. Sumner +## spduration (0.16.0) +Maintainer: Andreas Beger + +0 errors | 0 warnings | 0 notes + +## spex (0.3.0) +Maintainer: Michael D. Sumner Bug reports: https://github.com/mdsumner/spex/issues 0 errors | 0 warnings | 0 notes -## spocc (0.6.0) -Maintainer: Scott Chamberlain -Bug reports: https://github.com/ropensci/spocc/issues +## sss (0.1-0) +Maintainer: Andrie de Vries +Bug reports: https://github.com/andrie/sss/issues 0 errors | 0 warnings | 0 notes -## stringr (1.1.0) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/stringr/issues +## stringr (1.2.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/stringr/issues 0 errors | 0 warnings | 0 notes ## svglite (1.2.0) -Maintainer: Lionel Henry +Maintainer: Lionel Henry Bug reports: https://github.com/hadley/svglite/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘svglite/libs/svglite.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` -## taxize (0.8.0) -Maintainer: Scott Chamberlain +## taxize (0.8.4) +Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/taxize/issues 0 errors | 0 warnings | 0 notes +## templates (0.2.0) +Maintainer: Sebastian Warnholz + +0 errors | 0 warnings | 0 notes + +## tensorr (0.1.0) +Maintainer: Robert Zamora +Bug reports: https://github.com/zamorarr/tensorr/issues + +0 errors | 0 warnings | 0 notes + ## testthat (1.0.2) -Maintainer: Hadley Wickham +Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/testthat/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘testthat/libs/testthat.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` ## text2vec (0.4.0) -Maintainer: Dmitriy Selivanov +Maintainer: Dmitriy Selivanov Bug reports: https://github.com/dselivanov/text2vec/issues -0 errors | 0 warnings | 2 notes +0 errors | 0 warnings | 3 notes ``` checking installed package size ... NOTE - installed size is 7.2Mb + installed size is 7.3Mb sub-directories of 1Mb or more: data 2.7Mb doc 3.5Mb checking for GNU extensions in Makefiles ... NOTE GNU make is a SystemRequirements. + +checking compiled code ... NOTE +File ‘text2vec/libs/text2vec.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. ``` ## textreuse (0.1.4) -Maintainer: Lincoln Mullen +Maintainer: Lincoln Mullen Bug reports: https://github.com/ropensci/textreuse/issues +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘textreuse/libs/textreuse.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` + +## textTinyR (1.0.7) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/textTinyR/issues + 1 error | 0 warnings | 0 notes ``` -checking whether package ‘textreuse’ can be installed ... ERROR +checking whether package ‘textTinyR’ can be installed ... ERROR Installation failed. -See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/textreuse.Rcheck/00install.out’ for details. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/textTinyR.Rcheck/00install.out’ for details. ``` -## tidyr (0.6.0) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/tidyr/issues +## thankr (1.0.0) +Maintainer: Dirk Schumacher + +0 errors | 0 warnings | 0 notes + +## themetagenomics (0.1.0) +Maintainer: Stephen Woloszynek +Bug reports: http://github.com/EESI/themetagenomics/issues + +0 errors | 0 warnings | 0 notes + +## tibble (1.3.3) +Maintainer: Kirill Müller +Bug reports: https://github.com/tidyverse/tibble/issues + +0 errors | 0 warnings | 0 notes + +## tidyr (0.6.3) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/tidyr/issues 0 errors | 0 warnings | 0 notes ## tokenizers (0.1.4) -Maintainer: Lincoln Mullen +Maintainer: Lincoln Mullen Bug reports: https://github.com/ropensci/tokenizers/issues -0 errors | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note + +``` +checking compiled code ... NOTE +File ‘tokenizers/libs/tokenizers.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. +``` ## toxboot (0.1.1) -Maintainer: Eric D. Watt +Maintainer: Eric D. Watt Bug reports: https://github.com/ericwatt/toxboot/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` checking package dependencies ... NOTE Package suggested but not available for checking: ‘rmongodb’ ``` +## tracer (1.0.0) +Maintainer: Gabor Csardi +Bug reports: https://github.com/mangothecat/tracer/issues + +0 errors | 0 warnings | 0 notes + ## traits (0.2.0) -Maintainer: Scott Chamberlain +Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropensci/traits/issues 0 errors | 0 warnings | 0 notes ## trip (1.5.0) -Maintainer: Michael D. Sumner +Maintainer: Michael D. Sumner Bug reports: https://github.com/mdsumner/trip/issues 0 errors | 0 warnings | 0 notes -## units (0.4-1) -Maintainer: Edzer Pebesma +## unitizer (1.4.3) +Maintainer: Brodie Gaslam +Bug reports: https://github.com/brodieG/unitizer/issues + +0 errors | 0 warnings | 0 notes + +## units (0.4-5) +Maintainer: Edzer Pebesma Bug reports: https://github.com/edzer/units/issues/ 0 errors | 0 warnings | 0 notes -## valr (0.1.1) -Maintainer: Jay Hesselberth -Bug reports: https://github.com/jayhesselberth/valr/issues +## useful (1.2.3) +Maintainer: Jared P. Lander 0 errors | 0 warnings | 0 notes -## vembedr (0.1.1) -Maintainer: Ian Lyttle +## valr (0.3.0) +Maintainer: Jay Hesselberth +Bug reports: https://github.com/rnabioco/valr/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘dplyr’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## vembedr (0.1.2) +Maintainer: Ian Lyttle Bug reports: https://github.com/ijlyttle/vembedr/issues 0 errors | 0 warnings | 0 notes -## Wmisc (0.3.1) -Maintainer: Markus S. Wamser +## viridis (0.4.0) +Maintainer: Simon Garnier +Bug reports: https://github.com/sjmgarnier/viridis/issues + +0 errors | 0 warnings | 0 notes + +## viridisLite (0.2.0) +Maintainer: Simon Garnier +Bug reports: https://github.com/sjmgarnier/viridisLite/issues + +0 errors | 0 warnings | 0 notes + +## vqtl (1.2.0) +Maintainer: Robert Corty + +0 errors | 0 warnings | 1 note + +``` +checking dependencies in R code ... NOTE +Missing or unexported object: ‘dplyr::pull’ +``` + +## wdman (0.2.2) +Maintainer: John Harrison +Bug reports: https://github.com/johndharrison/wdman/issues + +0 errors | 0 warnings | 0 notes + +## Wmisc (0.3.2) +Maintainer: Markus S. Wamser Bug reports: https://github.com/wamserma/R-Wmisc/issues -0 errors | 0 warnings | 1 note +1 error | 0 warnings | 2 notes ``` +checking tests ... ERROR + Running ‘testthat.R’ [55s/63s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-utils.R:27:52: style: Opening curly braces should never go on their own line and should always be followed by a new line. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + tests/testthat/test-utils.R:27:67: style: Closing curly-braces should always be on their own line, unless it's followed by an else. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + + + testthat results ================================================================ + OK: 147 SKIPPED: 0 FAILED: 1 + 1. Failure: Package has good style (no lints) (@test-lints.R#5) + + Error: testthat unit tests failed + Execution halted + checking installed package size ... NOTE installed size is 5.2Mb sub-directories of 1Mb or more: doc 5.0Mb + +checking compiled code ... NOTE +File ‘Wmisc/libs/Wmisc.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. ``` -## xml2 (1.0.0) -Maintainer: Hadley Wickham +## worrms (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/worrms/issues + +0 errors | 0 warnings | 0 notes + +## xml2 (1.1.1) +Maintainer: James Hester Bug reports: https://github.com/hadley/xml2/issues/ -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` -checking compilation flags in Makevars ... NOTE -Package has both ‘src/Makevars.in’ and ‘src/Makevars’. -Installation with --no-configure' is unlikely to work. If you intended -‘src/Makevars’ to be used on Windows, rename it to ‘src/Makevars.win’ -otherwise remove it. If ‘configure’ created ‘src/Makevars’, you need a -‘cleanup’ script. +checking compiled code ... NOTE +File ‘xml2/libs/xml2.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. ``` ## xmlparsedata (1.0.1) -Maintainer: Gábor Csárdi +Maintainer: Gábor Csárdi Bug reports: https://github.com/MangoTheCat/xmlparsedata/issues 0 errors | 0 warnings | 0 notes +## yesno (0.0.2) +Maintainer: Joe Thorley + +0 errors | 0 warnings | 0 notes + +## zip (1.0.0) +Maintainer: Gábor Csárdi +Bug reports: https://github.com/gaborcsardi/zip/issues + +0 errors | 0 warnings | 0 notes + diff --git a/revdep/checks.rds b/revdep/checks.rds index 95907c11..016db092 100644 Binary files a/revdep/checks.rds and b/revdep/checks.rds differ diff --git a/revdep/problems.md b/revdep/problems.md index a87c5ef6..7a40aa4d 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -2,47 +2,128 @@ ## Platform -|setting |value | -|:--------|:--------------------------------------| -|version |R version 3.3.2 RC (2016-10-26 r71594) | -|system |x86_64, darwin13.4.0 | -|ui |X11 | -|language |(EN) | -|collate |en_US.UTF-8 | -|tz |America/New_York | -|date |2016-12-30 | +|setting |value | +|:--------|:-------------------------------------------| +|version |R version 3.4.0 Patched (2017-05-10 r72669) | +|system |x86_64, darwin15.6.0 | +|ui |X11 | +|language |(EN) | +|collate |en_US.UTF-8 | +|tz |America/New_York | +|date |2017-06-26 | ## Packages -|package |* |version |date |source | -|:-----------|:--|:----------|:----------|:--------------------------------| -|covr | |2.2.1 |2016-12-30 |local (jimhester/covr@NA) | -|crayon | |1.3.2 |2016-06-28 |cran (@1.3.2) | -|devtools |* |1.12.0 |2016-06-24 |cran (@1.12.0) | -|DT | |0.2 |2016-08-09 |cran (@0.2) | -|htmltools | |0.3.5 |2016-03-21 |cran (@0.3.5) | -|htmlwidgets | |0.8 |2016-11-09 |cran (@0.8) | -|httr | |1.2.1 |2016-07-03 |cran (@1.2.1) | -|jsonlite | |1.1 |2016-09-14 |cran (@1.1) | -|knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | -|memoise | |1.0.0 |2016-01-29 |cran (@1.0.0) | -|R6 | |2.2.0 |2016-10-05 |cran (@2.2.0) | -|rex | |1.1.1 |2016-03-11 |cran (@1.1.1) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | -|rstudioapi | |0.6 |2016-06-27 |cran (@0.6) | -|shiny | |0.14.2 |2016-11-01 |cran (@0.14.2) | -|testthat | |1.0.2.9000 |2016-12-30 |Github (hadley/testthat@3b2f225) | -|withr | |1.0.2 |2016-06-20 |cran (@1.0.2) | -|xml2 | |1.0.0 |2016-06-24 |cran (@1.0.0) | +|package |* |version |date |source | +|:-----------|:--|:-------|:----------|:--------------| +|covr | |2.2.2 |2017-01-05 |cran (@2.2.2) | +|crayon | |1.3.2 |2016-06-28 |cran (@1.3.2) | +|devtools |* |1.13.2 |2017-06-02 |cran (@1.13.2) | +|DT | |0.2 |2016-08-09 |cran (@0.2) | +|htmltools | |0.3.6 |2017-04-28 |cran (@0.3.6) | +|htmlwidgets | |0.8 |2016-11-09 |cran (@0.8) | +|httr | |1.2.1 |2016-07-03 |CRAN (R 3.4.0) | +|jsonlite | |1.5 |2017-06-01 |cran (@1.5) | +|knitr | |1.16 |2017-05-18 |cran (@1.16) | +|memoise | |1.1.0 |2017-04-21 |CRAN (R 3.4.0) | +|R6 | |2.2.2 |2017-06-17 |cran (@2.2.2) | +|rex | |1.1.1 |2016-12-05 |cran (@1.1.1) | +|rmarkdown | |1.6 |2017-06-15 |cran (@1.6) | +|rstudioapi | |0.6 |2016-06-27 |CRAN (R 3.4.0) | +|shiny | |1.0.3 |2017-04-26 |cran (@1.0.3) | +|testthat | |1.0.2 |2016-04-23 |cran (@1.0.2) | +|withr | |1.0.2 |2016-06-20 |CRAN (R 3.4.0) | +|xml2 | |1.1.1 |2017-01-24 |cran (@1.1.1) | # Check results -4 packages with problems -## broom (0.4.1) -Maintainer: David Robinson -Bug reports: http://github.com/dgrtwo/broom/issues +22 packages with problems -1 error | 0 warnings | 1 note +|package |version | errors| warnings| notes| +|:--------------|:-------|------:|--------:|-----:| +|antaresViz |0.10 | 1| 0| 0| +|autothresholdr |0.5.0 | 1| 0| 0| +|biolink |0.1.2 | 1| 0| 0| +|broom |0.4.2 | 2| 0| 0| +|ClusterR |1.0.5 | 1| 0| 0| +|dbplyr |1.0.0 | 1| 0| 0| +|DepthProc |2.0.1 | 1| 0| 1| +|diceR |0.1.0 | 1| 0| 0| +|dplyr |0.7.1 | 1| 0| 0| +|easyml |0.1.0 | 1| 0| 0| +|FedData |2.4.5 | 1| 0| 0| +|FSelectorRcpp |0.1.3 | 1| 0| 1| +|geofacet |0.1.4 | 1| 0| 0| +|KernelKnn |1.0.5 | 1| 0| 0| +|lawn |0.3.0 | 1| 0| 0| +|mlrMBO |1.1.0 | 0| 1| 0| +|nandb |0.2.0 | 1| 0| 0| +|OpenImageR |1.0.6 | 1| 0| 0| +|RSQLServer |0.3.0 | 1| 0| 0| +|textTinyR |1.0.7 | 1| 0| 0| +|valr |0.3.0 | 1| 0| 0| +|Wmisc |0.3.2 | 1| 0| 2| + +## antaresViz (0.10) +Maintainer: Francois Guillem +Bug reports: https://github.com/rte-antares-rpackage/antaresViz/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘leaflet.minicharts’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## autothresholdr (0.5.0) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/autothresholdr/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required but not available: ‘EBImage’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## biolink (0.1.2) +Maintainer: Aaron Wolen + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [46s/68s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-utils.R:27:52: style: Opening curly braces should never go on their own line and should always be followed by a new line. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + tests/testthat/test-utils.R:27:67: style: Closing curly-braces should always be on their own line, unless it's followed by an else. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + + + testthat results ================================================================ + OK: 118 SKIPPED: 0 FAILED: 1 + 1. Failure: Package Style (@test-style.r#4) + + Error: testthat unit tests failed + Execution halted +``` + +## broom (0.4.2) +Maintainer: David Robinson +Bug reports: http://github.com/tidyverse/broom/issues + +2 errors | 0 warnings | 0 notes ``` checking examples ... ERROR @@ -50,88 +131,373 @@ Running examples in ‘broom-Ex.R’ failed The error most likely occurred in: > base::assign(".ptime", proc.time(), pos = "CheckExEnv") -> ### Name: survfit_tidiers -> ### Title: tidy survival curve fits -> ### Aliases: glance.survfit survfit_tidiers tidy.survfit -> +> ### Name: gmm_tidiers +> ### Title: Tidying methods for generalized method of moments "gmm" objects +> ### Aliases: glance.gmm gmm_tidiers tidy.gmm +> > ### ** Examples -... 43 lines ... -+ do(glance(survfit(coxph(Surv(time, status) ~ age + sex, .)))) -+ -+ glances -+ -+ qplot(glances$median, binwidth = 15) -+ quantile(glances$median, c(.025, .975)) +... 58 lines ... ++ mutate(variable = reorder(variable, estimate)) %>% ++ ggplot(aes(estimate, variable)) + ++ geom_point() + ++ geom_errorbarh(aes(xmin = conf.low, xmax = conf.high)) + ++ facet_wrap(~ term) + ++ geom_vline(xintercept = 0, color = "red", lty = 2) + } -Error in data.frame(..., check.names = FALSE) : - arguments imply differing number of rows: 237, 0, 711 -Calls: tidy -> tidy.survfit -> cbind -> cbind -> data.frame +Error in `colnames<-`(`*tmp*`, value = c("conf.low", "conf.high")) : + attempt to set 'colnames' on an object with less than two dimensions +Calls: tidy -> tidy.gmm -> process_lm -> colnames<- Execution halted -checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘akima’ +checking tests ... ERROR + Running ‘test-all.R’ [16s/24s] +Running the tests in ‘tests/test-all.R’ failed. +Complete output: + > library(testthat) + > test_check("broom") + Loading required package: broom + Loading required namespace: gam + error occurred during calling the sampler; sampling not done + Error in check_stanfit(stanfit) : + Invalid stanfit object produced please report bug + Calls: test_check ... eval -> stan_glmer -> stan_glm.fit -> check_stanfit + testthat results ================================================================ + OK: 451 SKIPPED: 0 FAILED: 0 + Execution halted ``` -## d3r (0.6.0) -Maintainer: Kent Russell -Bug reports: https://github.com/timelyportfolio/d3r/issues +## ClusterR (1.0.5) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/ClusterR/issues -1 error | 0 warnings | 1 note +1 error | 0 warnings | 0 notes ``` -checking examples ... ERROR -Running examples in ‘d3r-Ex.R’ failed -The error most likely occurred in: +checking package dependencies ... ERROR +Packages required but not available: ‘gmp’ ‘FD’ -> base::assign(".ptime", proc.time(), pos = "CheckExEnv") -> ### Name: d3_nest -> ### Title: Convert a 'data.frame' to a 'd3.js' Hierarchy -> ### Aliases: d3_nest -> -> ### ** Examples -... 31 lines ... -# A tibble: 1 × 2 - children name - -1 titanic -> -> # see the structure with listviewer -> tit_tb %>% -+ listviewer::jsonedit() -Error in loadNamespace(name) : there is no package called ‘listviewer’ -Calls: %>% ... tryCatch -> tryCatchList -> tryCatchOne -> -Execution halted +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## dbplyr (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/dplyr/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘dplyr’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## DepthProc (2.0.1) +Maintainer: Zygmunt Zawadzki + +1 error | 0 warnings | 1 note + +``` +checking whether package ‘DepthProc’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/DepthProc.Rcheck/00install.out’ for details. checking package dependencies ... NOTE -Package suggested but not available for checking: ‘listviewer’ +Package suggested but not available for checking: ‘fda’ +``` + +## diceR (0.1.0) +Maintainer: Derek Chiu +Bug reports: https://github.com/AlineTalhouk/diceR/issues + +1 error | 0 warnings | 0 notes -Packages which this enhances but not available for checking: - ‘partykit’ ‘treemap’ ``` +checking package dependencies ... ERROR +Packages required but not available: + ‘flux’ ‘apcluster’ ‘infotheo’ ‘blockcluster’ ‘clue’ ‘clusterCrit’ + ‘clValid’ ‘klaR’ ‘quantable’ ‘RankAggreg’ ‘sigclust’ -## FLightR (0.4.5) -Maintainer: Eldar Rakhimberdiev -Bug reports: http://github.com/eldarrak/FLightR/issues +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## dplyr (0.7.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/dplyr/issues + +1 error | 0 warnings | 0 notes + +``` +checking whether package ‘dplyr’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/dplyr.Rcheck/00install.out’ for details. +``` + +## easyml (0.1.0) +Maintainer: Woo-Young Ahn +Bug reports: https://github.com/CCS-Lab/easyml/issues 1 error | 0 warnings | 0 notes ``` checking package dependencies ... ERROR -Packages required but not available: ‘ggsn’ ‘GeoLight’ +Packages required but not available: + ‘darch’ ‘dummies’ ‘glinternet’ ‘pbmcapply’ ‘scorer’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. ``` -## textreuse (0.1.4) -Maintainer: Lincoln Mullen -Bug reports: https://github.com/ropensci/textreuse/issues +## FedData (2.4.5) +Maintainer: R. Kyle Bocinsky +Bug reports: https://github.com/bocinsky/FedData/issues 1 error | 0 warnings | 0 notes ``` -checking whether package ‘textreuse’ can be installed ... ERROR +checking tests ... ERROR + Running ‘testthat.R’ [6s/51s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + Attaching package: 'raster' + + The following objects are masked from 'package:aqp': + + metadata, metadata<- + + testthat results ================================================================ + OK: 24 SKIPPED: 0 FAILED: 1 + 1. Failure: The Daymet tiles are available at the correct URL (@test.DAYMET.R#10) + + Error: testthat unit tests failed + In addition: Warning message: + In .Internal(get(x, envir, mode, inherits)) : + closing unused connection 3 (ftp://ftp.ncdc.noaa.gov/pub/data/paleo/treering/chronologies/) + Execution halted +``` + +## FSelectorRcpp (0.1.3) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues + +1 error | 0 warnings | 1 note + +``` +checking whether package ‘FSelectorRcpp’ can be installed ... ERROR Installation failed. -See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/textreuse.Rcheck/00install.out’ for details. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/FSelectorRcpp.Rcheck/00install.out’ for details. + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ +``` + +## geofacet (0.1.4) +Maintainer: Ryan Hafen + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [129s/152s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-utils.R:27:52: style: Opening curly braces should never go on their own line and should always be followed by a new line. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + tests/testthat/test-utils.R:27:67: style: Closing curly-braces should always be on their own line, unless it's followed by an else. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + + + testthat results ================================================================ + OK: 17 SKIPPED: 0 FAILED: 1 + 1. Failure: package Style (@test-zzz-lintr.R#5) + + Error: testthat unit tests failed + Execution halted +``` + +## KernelKnn (1.0.5) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/KernelKnn/issues + +1 error | 0 warnings | 0 notes + +``` +checking whether package ‘KernelKnn’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/KernelKnn.Rcheck/00install.out’ for details. +``` + +## lawn (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: http://www.github.com/ropensci/lawn/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘test-all.R’ +Running the tests in ‘tests/test-all.R’ failed. +Last 13 lines of output: + Actual value: "c++ exception (unknown reason)" + + + 2. Failure: lawn_centroid fails correctly (@test-centroid.R#50) ---------------- + error$message does not match "Unexpected number". + Actual value: "c++ exception (unknown reason)" + + + testthat results ================================================================ + OK: 805 SKIPPED: 0 FAILED: 2 + 1. Failure: lawn_centroid fails correctly (@test-centroid.R#47) + 2. Failure: lawn_centroid fails correctly (@test-centroid.R#50) + + Error: testthat unit tests failed + Execution halted +``` + +## mlrMBO (1.1.0) +Maintainer: Jakob Richter +Bug reports: https://github.com/mlr-org/mlrMBO/issues + +0 errors | 1 warning | 0 notes + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + unable to load shared object '/Library/Frameworks/R.framework/Resources/library/grDevices/libs//cairo.so': + dlopen(/Library/Frameworks/R.framework/Resources/library/grDevices/libs//cairo.so, 6): Library not loaded: /opt/X11/lib/libfontconfig.1.dylib + Referenced from: /Library/Frameworks/R.framework/Resources/library/grDevices/libs//cairo.so + Reason: Incompatible library version: cairo.so requires version 11.0.0 or later, but libfontconfig.1.dylib provides version 10.0.0 +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +Warning in (function (filename = if (onefile) "Rplots.svg" else "Rplot%03d.svg", : + failed to load cairo DLL +pandoc: Could not fetch mlrMBO_files/figure-html/cosine_fun-1.svg +mlrMBO_files/figure-html/cosine_fun-1.svg: openBinaryFile: does not exist (No such file or directory) +Error: processing vignette 'mlrMBO.Rmd' failed with diagnostics: +pandoc document conversion failed with error 67 +Execution halted + +``` + +## nandb (0.2.0) +Maintainer: Rory Nolan +Bug reports: https://github.com/rorynolan/nandb/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: + ‘autothresholdr’ ‘BiocParallel’ ‘EBImage’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## OpenImageR (1.0.6) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/OpenImageR/issues + +1 error | 0 warnings | 0 notes + +``` +checking whether package ‘OpenImageR’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/OpenImageR.Rcheck/00install.out’ for details. +``` + +## RSQLServer (0.3.0) +Maintainer: Imanuel Costigan +Bug reports: https://github.com/imanuelcostigan/RSQLServer/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘dplyr’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## textTinyR (1.0.7) +Maintainer: Lampros Mouselimis +Bug reports: https://github.com/mlampros/textTinyR/issues + +1 error | 0 warnings | 0 notes + +``` +checking whether package ‘textTinyR’ can be installed ... ERROR +Installation failed. +See ‘/Users/jhester/Dropbox/projects/covr/revdep/checks/textTinyR.Rcheck/00install.out’ for details. +``` + +## valr (0.3.0) +Maintainer: Jay Hesselberth +Bug reports: https://github.com/rnabioco/valr/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘dplyr’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## Wmisc (0.3.2) +Maintainer: Markus S. Wamser +Bug reports: https://github.com/wamserma/R-Wmisc/issues + +1 error | 0 warnings | 2 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [55s/63s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-utils.R:27:52: style: Opening curly braces should never go on their own line and should always be followed by a new line. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + tests/testthat/test-utils.R:27:67: style: Closing curly-braces should always be on their own line, unless it's followed by an else. + with_mock(`covr:::system_output` = function(...) { " test_hash" }, { + ^ + + + testthat results ================================================================ + OK: 147 SKIPPED: 0 FAILED: 1 + 1. Failure: Package has good style (no lints) (@test-lints.R#5) + + Error: testthat unit tests failed + Execution halted + +checking installed package size ... NOTE + installed size is 5.2Mb + sub-directories of 1Mb or more: + doc 5.0Mb + +checking compiled code ... NOTE +File ‘Wmisc/libs/Wmisc.so’: + Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’ + +It is good practice to register native routines and to disable symbol +search. + +See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. ``` diff --git a/revdep/timing.md b/revdep/timing.md new file mode 100644 index 00000000..1de80e7e --- /dev/null +++ b/revdep/timing.md @@ -0,0 +1,264 @@ +# Check times + +| |package |version | check_time| +|:---|:--------------------|:-------|----------:| +|161 |pmc |1.0.2 | 1869.3| +|157 |parlitools |0.0.4 | 1003.9| +|222 |SpaDES |1.3.1 | 643.1| +|81 |FRK |0.1.4 | 561.1| +|45 |dendextend |1.5.2 | 499.3| +|63 |EML |1.0.3 | 461.4| +|238 |themetagenomics |0.1.0 | 427.4| +|24 |BTYDplus |1.0.1 | 412.6| +|154 |pacotest |0.2.2 | 363.6| +|142 |netdiffuseR |1.17.0 | 362.5| +|87 |gastempt |0.4.01 | 336.5| +|178 |rbgm |0.0.4 | 335.6| +|96 |ggplot2 |2.2.1 | 291.5| +|135 |Momocs |1.1.6 | 288.9| +|72 |fiery |0.2.2 | 269.2| +|113 |joineR |1.2.0 | 265.3| +|32 |congressbr |0.1.1 | 249.2| +|234 |text2vec |0.4.0 | 245.9| +|130 |MFPCA |1.1 | 245.3| +|108 |heatmaply |0.10.1 | 236.1| +|246 |unitizer |1.4.3 | 232.1| +|66 |EpiModel |1.5.0 | 222.7| +|54 |document |1.2.0 | 195.7| +|132 |mlrMBO |1.1.0 | 194.5| +|146 |olsrr |0.2.0 | 192.5| +|105 |hansard |0.4.6 | 187.7| +|75 |FLightR |0.4.6 | 187.1| +|88 |geofacet |0.1.4 | 184.2| +|20 |breathteststan |0.3.0 | 166| +|51 |diffobj |0.1.6 | 162.6| +|223 |spbabel |0.4.7 | 162.4| +|49 |devtools |1.13.2 | 161.2| +|245 |trip |1.5.0 | 157.5| +|39 |DataExplorer |0.4.0 | 146.3| +|71 |FedData |2.4.5 | 134.3| +|21 |broom |0.4.2 | 132.5| +|255 |Wmisc |0.3.2 | 126.1| +|33 |cpr |0.2.3 | 124.9| +|109 |huxtable |0.3.0 | 124| +|36 |crunch |1.17.0 | 122.4| +|3 |ALA4R |1.5.6 | 121.9| +|58 |dsrTest |0.2.1 | 118.2| +|11 |awsjavasdk |0.2.0 | 116.9| +|217 |simmer |3.6.2 | 116.6| +|180 |readr |1.1.1 | 115.8| +|85 |fuzzyjoin |0.1.3 | 113.8| +|196 |rrecsys |0.9.5.4 | 112.4| +|185 |reprex |0.1.1 | 112| +|230 |taxize |0.8.4 | 111| +|118 |lans2r |1.0.5 | 108.3| +|95 |GGIR |1.5-9 | 103.8| +|171 |ptstem |0.0.3 | 101.3| +|232 |tensorr |0.1.0 | 100.9| +|253 |vqtl |1.2.0 | 98.8| +|31 |colorplaner |0.1.3 | 98.3| +|57 |dplyr |0.7.1 | 96.1| +|191 |roadoi |0.2 | 94.9| +|233 |testthat |1.0.2 | 94.5| +|16 |biolink |0.1.2 | 93.3| +|6 |angstroms |0.0.1 | 93.1| +|213 |sfdct |0.0.3 | 90.8| +|74 |finch |0.1.0 | 90.2| +|242 |toxboot |0.1.1 | 87.6| +|207 |rvg |0.1.4 | 87| +|225 |spduration |0.16.0 | 84.2| +|122 |lingtypology |1.0.5 | 81.3| +|19 |breathtestcore |0.3.0 | 80| +|9 |ashr |2.0.5 | 78| +|112 |isdparser |0.2.0 | 76.7| +|125 |lubridate |1.6.0 | 76.4| +|216 |simmer.plot |0.1.9 | 75.5| +|235 |textreuse |0.1.4 | 74.8| +|224 |spdplyr |0.1.3 | 74.7| +|181 |readxl |1.0.0 | 73.1| +|22 |brranching |0.2.0 | 71| +|7 |antaresProcessing |0.10.2 | 70.3| +|4 |alfred |0.1.1 | 70.1| +|27 |ccafs |0.1.0 | 69.7| +|248 |useful |1.2.3 | 68.9| +|138 |naptime |1.3.0 | 66.9| +|29 |cleanNLP |1.9.0 | 66.7| +|119 |lawn |0.3.0 | 66.2| +|174 |qwraps2 |0.2.4 | 66.2| +|160 |plyr |1.8.4 | 66.1| +|226 |spex |0.3.0 | 65.9| +|103 |GSODR |1.0.3 | 64.5| +|48 |descriptr |0.1.1 | 62.7| +|84 |funData |1.1 | 62.7| +|193 |roxygen2 |6.0.1 | 62.3| +|59 |dtplyr |0.0.2 | 61.4| +|251 |viridis |0.4.0 | 59.9| +|221 |solrium |0.4.0 | 58.9| +|65 |epicontacts |1.0.1 | 58.5| +|257 |xml2 |1.1.1 | 57.5| +|182 |rebird |0.4.0 | 56.6| +|111 |inferr |0.1.1 | 56| +|110 |incidence |1.2.0 | 55.9| +|206 |rvest |0.3.2 | 55.5| +|240 |tidyr |0.6.3 | 55.3| +|239 |tibble |1.3.3 | 55.2| +|101 |googleComputeEngineR |0.1.0 | 52.2| +|78 |foghorn |0.4.4 | 52.1| +|256 |worrms |0.1.0 | 51.8| +|35 |crplyr |0.1.2 | 51.3| +|189 |rlang |0.1.1 | 51| +|126 |manipulateWidget |0.7.0 | 50.9| +|145 |odbc |1.1.0 | 50.7| +|69 |exampletestr |0.4.0 | 50.5| +|244 |traits |0.2.0 | 50.5| +|208 |scales |0.4.1 | 50.4| +|128 |Meiosis |1.0.2 | 50| +|83 |FTRLProximal |0.3.0 | 49.7| +|195 |rplos |0.6.4 | 49.1| +|102 |googlesheets |0.2.2 | 48.9| +|199 |RSelenium |1.7.1 | 48.6| +|205 |rvertnet |0.5.0 | 48.6| +|229 |svglite |1.2.0 | 48.4| +|76 |fmbasics |0.2.0 | 47.6| +|98 |googleAnalyticsR |0.4.1 | 47.6| +|73 |filesstrings |1.0.0 | 47.3| +|1 |ABCoptim |0.14.0 | 45.5| +|56 |dparser |0.1.3 | 45.5| +|99 |googleAuthR |0.5.1 | 45.3| +|116 |kernelboot |0.1.1 | 44.9| +|231 |templates |0.2.0 | 44.9| +|107 |haven |1.0.0 | 44.8| +|42 |DBI |0.7 | 44| +|115 |kerasR |0.6.1 | 43.5| +|100 |googleCloudStorageR |0.3.0 | 43| +|62 |elastic |0.7.8 | 42.8| +|177 |ratelimitr |0.3.9 | 42.5| +|192 |rodham |0.0.3 | 41.8| +|5 |analogsea |0.5.0 | 41.6| +|93 |getlandsat |0.1.0 | 41.6| +|167 |prof.tree |0.1.0 | 41.5| +|80 |formattable |0.2.0.1 | 41.4| +|150 |optiRum |0.37.3 | 41.1| +|77 |fmdates |0.1.2 | 41| +|37 |crunchy |0.2.0 | 40.8| +|247 |units |0.4-5 | 40.8| +|210 |seleniumPipes |0.3.7 | 40.6| +|67 |errorlocate |0.1.2 | 40.4| +|121 |lexRankr |0.4.1 | 40.4| +|89 |geojson |0.1.2 | 40.1| +|91 |geojsonR |1.0.1 | 40.1| +|241 |tokenizers |0.1.4 | 39.9| +|173 |purrrlyr |0.0.2 | 38.1| +|90 |geojsonlint |0.2.0 | 37.7| +|34 |cranlike |1.0.0 | 37.1| +|40 |datasauRus |0.1.2 | 36.9| +|166 |productplots |0.1.1 | 36.9| +|201 |rsnps |0.2.0 | 36.7| +|211 |semver |0.2.0 | 36.7| +|219 |snakecase |0.4.0 | 36.6| +|228 |stringr |1.2.0 | 36.2| +|15 |binomen |0.1.2 | 36| +|114 |jqr |0.2.4 | 36| +|155 |palr |0.0.6 | 34.8| +|47 |desc |1.1.0 | 34.7| +|127 |mcparallelDo |1.1.0 | 34.5| +|165 |processx |2.0.0 | 34.1| +|254 |wdman |0.2.2 | 34.1| +|140 |ncdump |0.0.3 | 34| +|106 |HARtools |0.0.5 | 32.9| +|227 |sss |0.1-0 | 32.9| +|38 |cvequality |0.1.1 | 32.8| +|144 |oai |0.2.2 | 32.4| +|162 |preference |0.1.0 | 32.2| +|124 |liteq |1.0.0 | 31.7| +|204 |rstantools |1.2.0 | 31.7| +|64 |enigma |0.3.0 | 31.1| +|172 |purrr |0.2.2.2 | 30.7| +|151 |originr |0.2.0 | 30.5| +|170 |proto |1.0.0 | 30.4| +|209 |secret |1.0.0 | 30.3| +|2 |aemo |0.2.0 | 30.2| +|147 |openadds |0.2.0 | 30.2| +|184 |rematch2 |2.0.1 | 30.2| +|215 |sigmoid |0.2.1 | 30.1| +|143 |normalr |0.0.3 | 29.7| +|220 |sofa |0.2.0 | 29.6| +|86 |fuzzywuzzyR |1.0.0 | 29.4| +|70 |fauxpas |0.1.0 | 29.1| +|136 |mregions |0.1.4 | 29| +|190 |rnpn |0.1.0 | 29| +|134 |modelr |0.1.0 | 28.9| +|14 |binman |0.1.0 | 28.8| +|120 |lazyeval |0.2.0 | 28.8| +|28 |cellranger |1.1.0 | 28.6| +|156 |pangaear |0.3.0 | 28.2| +|141 |net.security |0.3.0 | 27.9| +|23 |bsplus |0.1.0 | 27.7| +|18 |bold |0.4.0 | 27.5| +|94 |gghalfnorm |1.1.2 | 27.2| +|198 |RSauceLabs |0.1.6 | 27| +|250 |vembedr |0.1.2 | 26.9| +|52 |discgolf |0.1.0 | 26.8| +|92 |getCRUCLdata |0.1.7 | 26.6| +|153 |owmr |0.7.2 | 26.4| +|188 |rjsonapi |0.1.0 | 26.2| +|25 |callr |1.0.0 | 26.1| +|12 |betalink |2.2.1 | 26| +|183 |rematch |1.0.1 | 24.9| +|175 |rAltmetric |0.7.0 | 24.2| +|187 |ritis |0.5.4 | 24.2| +|41 |datastepr |0.0.2 | 24.1| +|159 |pkgconfig |2.0.1 | 23.5| +|186 |rintrojs |0.1.2 | 23.5| +|218 |skeletor |1.0.4 | 23.4| +|53 |disposables |1.0.3 | 22.9| +|104 |gtable |0.2.0 | 22.9| +|13 |bgmfiles |0.0.6 | 22.7| +|26 |canvasXpress |0.16.2 | 22.7| +|176 |randgeo |0.2.0 | 22.5| +|55 |docuSignr |0.0.2 | 22.2| +|179 |rdpla |0.1.0 | 22| +|252 |viridisLite |0.2.0 | 22| +|168 |PROscorer |0.0.1 | 21.6| +|243 |tracer |1.0.0 | 21.6| +|169 |PROscorerTools |0.0.1 | 21.5| +|131 |mljar |0.1.1 | 21.4| +|236 |textTinyR |1.0.7 | 21.4| +|17 |blob |1.1.0 | 21| +|237 |thankr |1.0.0 | 21| +|194 |rpdo |0.2.2 | 20.5| +|197 |rredlist |0.3.0 | 20.5| +|200 |rslp |0.1.0 | 20.5| +|212 |sessioninfo |1.0.0 | 20.4| +|163 |prettycode |1.0.0 | 20.3| +|79 |forcats |0.2.0 | 19.9| +|129 |memoise |1.1.0 | 19.9| +|158 |parsedate |1.1.3 | 19.8| +|260 |zip |1.0.0 | 19.5| +|97 |glue |1.1.1 | 19.3| +|139 |natserv |0.1.4 | 19.3| +|44 |debugme |1.0.2 | 19.2| +|60 |duckduckr |1.0.0 | 18.8| +|164 |primefactr |0.1.0 | 18.8| +|68 |errors |0.0.2 | 18.6| +|203 |rstack |1.0.0 | 18.2| +|258 |xmlparsedata |1.0.1 | 18.2| +|152 |outbreaks |1.3.0 | 16.9| +|259 |yesno |0.0.2 | 16.1| +|133 |mockr |0.1 | 15.9| +|214 |shinyShortcut |0.1.0 | 15.9| +|149 |optim.functions |0.1 | 15.8| +|123 |listWithDefaults |1.2.0 | 15.3| +|117 |KernelKnn |1.0.5 | 7.7| +|46 |DepthProc |2.0.1 | 7.2| +|249 |valr |0.3.0 | 6.4| +|148 |OpenImageR |1.0.6 | 6.3| +|8 |antaresViz |0.10 | 5.6| +|30 |ClusterR |1.0.5 | 5.6| +|50 |diceR |0.1.0 | 5.5| +|82 |FSelectorRcpp |0.1.3 | 5.3| +|10 |autothresholdr |0.5.0 | 5.2| +|43 |dbplyr |1.0.0 | 4.9| +|61 |easyml |0.1.0 | 4.8| +|137 |nandb |0.2.0 | 4.7| +|202 |RSQLServer |0.3.0 | 4.6| diff --git a/src/reassign.c b/src/reassign.c index db66be8a..db01f307 100644 --- a/src/reassign.c +++ b/src/reassign.c @@ -1,11 +1,11 @@ #define USE_RINTERNALS #include -#include #include +#include +#include +#include // for NULL - -SEXP covr_reassign_function(SEXP name, SEXP env, SEXP old_fun, SEXP new_fun) -{ +SEXP covr_reassign_function(SEXP name, SEXP env, SEXP old_fun, SEXP new_fun) { if (TYPEOF(name) != SYMSXP) error("name must be a symbol"); if (TYPEOF(env) != ENVSXP) error("env must be an environment"); if (TYPEOF(old_fun) != CLOSXP) error("old_fun must be a function"); @@ -19,6 +19,18 @@ SEXP covr_reassign_function(SEXP name, SEXP env, SEXP old_fun, SEXP new_fun) return R_NilValue; } -SEXP covr_duplicate_(SEXP x) { - return duplicate(x); +SEXP covr_duplicate_(SEXP x) { return duplicate(x); } + +/* .Call calls */ +extern SEXP covr_duplicate_(SEXP); +extern SEXP covr_reassign_function(SEXP, SEXP, SEXP, SEXP); + +static const R_CallMethodDef CallEntries[] = { + {"covr_duplicate_", (DL_FUNC)&covr_duplicate_, 1}, + {"covr_reassign_function", (DL_FUNC)&covr_reassign_function, 4}, + {NULL, NULL, 0}}; + +void R_init_covr(DllInfo *dll) { + R_registerRoutines(dll, NULL, CallEntries, NULL, NULL); + R_useDynamicSymbols(dll, FALSE); }