From b515da21c479971003d3a97616bd4df8da5abc39 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 10 Jan 2017 16:17:35 +0100 Subject: [PATCH 01/37] bump version to 1.3.0 --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index c04197184..692553207 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: tibble Encoding: UTF-8 -Version: 1.2-15 +Version: 1.3.0 Title: Simple Data Frames Description: Provides a 'tbl_df' class that offers better checking and printing capabilities than traditional data frames. From fce1e86807dd1ba1f8634a2db1c7b06bd78ecedd Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 10 Jan 2017 16:27:03 +0100 Subject: [PATCH 02/37] NEWS --- NEWS.md | 48 ++++++++++++++++++++++-------------------------- 1 file changed, 22 insertions(+), 26 deletions(-) diff --git a/NEWS.md b/NEWS.md index 02d146100..d4ea1d93f 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,45 +1,41 @@ -## tibble 1.2-15 (2017-01-10) +# tibble 1.3.0 (2017-01-10) + +## Bug fixes -- Test R 3.1.3 and later in AppVeyor, using `Depends: R (>= 3.1.0)` in `DESCRIPTION`. Support for R 3.0.0 requires a `lazyeval` update (#189). -- An attempt to partially update a missing column now throws a clearer warning (#199). - Time series matrices (objects of class `mts` and `ts`) are now supported in `as_tibble()` (#184). -- An attempt to call `add_row()` for a grouped data frame results in a helpful error message (#179). - The `all_equal()` function (called by `all.equal.tbl_df()`) now forwards to `dplyr` and fails with a helpful message if not installed. Data frames with list columns cannot be compared anymore, and differences in the declard class (`data.frame` vs. `tbl_df`) are ignored. This ensures consistent behavior of this function, regardless if `dplyr` is loaded or not (#198). -- Backtick `NA` names in printing (#206, #207, @jennybc). +## Interface changes -## tibble 1.2-14 (2017-01-04) - -- `glimpse()` now uses `type_sum()` also for S3 objects (#185, #186, @holstius). -- Reword documentation for `tribble()` (#191, @kwstat). -- Unicode multiplication sign is rendered as `x` if it cannot be represented in the current locale (#192, @ncarchedi). - - -## tibble 1.2-13 (2016-11-30) - +- Now requiring R 3.1.0 instead of R 3.1.3 (#189). +- Add `as.tibble()` as an alias to `as_tibble()` (#160, @LaDilettante). - New `frame_matrix()` (#140, #168, @LaDilettante). -- The `max.print` option is ignored when printing a tibble (#194, #195, @t-kalinowski). -- Fix typo in `obj_sum` documentation (#193, @etiennebr). -- Keep column classes when adding row to empty tibble (#171, #177, @LaDilettante). -- Now explicitly stating minimum Rcpp version 0.12.3. +## Features -## tibble 1.2-12 (2016-08-30) +### General -- Simplify tests for `add_row()` and `add_column()` (#165, #166, @LaDilettante). -- `add_column()` can add columns of length 1 (#162, #164, @LaDilettante). +- Keep column classes when adding row to empty tibble (#171, #177, @LaDilettante). - Singular and plural variants for error messages that mention a list of objects (#116, #138, @LaDilettante). +- `add_column()` can add columns of length 1 (#162, #164, @LaDilettante). +### Input validation -## tibble 1.2-11 (2016-08-29) +- An attempt to read or update a missing column now throws a clearer warning (#199). +- An attempt to call `add_row()` for a grouped data frame results in a helpful error message (#179). -- Add `as.tibble()` as an alias to `as_tibble()` (#160, @LaDilettante). -- Added tests for `tibble_width()` and `tibble_glimpse_width()` (#163, @LaDilettante). +### Printing +- Render Unicode multiplication sign as `x` if it cannot be represented in the current locale (#192, @ncarchedi). +- Backtick `NA` names in printing (#206, #207, @jennybc). +- `glimpse()` now uses `type_sum()` also for S3 objects (#185, #186, @holstius). +- The `max.print` option is ignored when printing a tibble (#194, #195, @t-kalinowski). -## tibble 1.2-10 (2016-08-29) +## Documentation -- Same as 1.2. +- Fix typo in `obj_sum` documentation (#193, @etiennebr). +- Reword documentation for `tribble()` (#191, @kwstat). +- Now explicitly stating minimum Rcpp version 0.12.3. # tibble 1.2 (2016-08-26) From 0d69cbb3caad4386bd585a008ae59d36f89d2073 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 10 Jan 2017 16:28:46 +0100 Subject: [PATCH 03/37] also test R 3.1.0 --- appveyor.yml | 4 ++++ 1 file changed, 4 insertions(+) diff --git a/appveyor.yml b/appveyor.yml index f513d8b71..20a54956f 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -45,6 +45,10 @@ environment: RTOOLS_VERSION: 32 CRAN: http://cran.rstudio.com + - R_VERSION: 3.1.0 + RTOOLS_VERSION: 32 + CRAN: http://cran.rstudio.com + build_script: - travis-tool.sh install_deps From 0e3475596fb98893eb9bda00e24ef665b1936070 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 10 Jan 2017 16:33:09 +0100 Subject: [PATCH 04/37] get rid of mocking in tests --- tests/testthat/helper-output.R | 9 --------- 1 file changed, 9 deletions(-) diff --git a/tests/testthat/helper-output.R b/tests/testthat/helper-output.R index 93f1d4fe3..ac1daba2c 100644 --- a/tests/testthat/helper-output.R +++ b/tests/testthat/helper-output.R @@ -5,14 +5,5 @@ expect_output_file_rel <- function(x, filename) { } expect_output_knit <- function(knit, filename, envir = parent.frame()) { - expect_asis_output_with_cacheable(substitute(knit), envir) expect_output_file_rel(cat(knit), filename) } - -expect_asis_output_with_cacheable <- function(knit_call, envir) { - asis_output_args <- with_mock( - `knitr::asis_output` = function(...) list(...), - eval(knit_call, envir = envir) - ) - expect_true(asis_output_args[["cacheable"]]) -} From 158bfa40d4eb7cbc15bca4643023ba0af81cb968 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 10 Jan 2017 18:07:57 +0100 Subject: [PATCH 05/37] add v1.2 API --- .Rbuildignore | 1 + API | 86 +++++++++++++++++++++++++++++++++++++++++++++++++++ 2 files changed, 87 insertions(+) create mode 100644 API diff --git a/.Rbuildignore b/.Rbuildignore index caedeefb2..d1f01f0a5 100644 --- a/.Rbuildignore +++ b/.Rbuildignore @@ -10,3 +10,4 @@ ^appveyor\.yml$ ^\.deploy_key\.pub$ ^\.deploy_key\.enc$ +^API$ diff --git a/API b/API new file mode 100644 index 000000000..9ef0b9f5a --- /dev/null +++ b/API @@ -0,0 +1,86 @@ +# API for tibble package + +## Exports + +add_column(.data, ..., .before = NULL, .after = NULL) +add_row(.data, ..., .before = NULL, .after = NULL) +as_data_frame(x, ...) +as_tibble(x, ...) +column_to_rownames(df, var = "rowname") +data_frame(...) +data_frame_(xs) +enframe(x, name = "name", value = "value") +frame_data(...) +glimpse(x, width = NULL, ...) +has_name(x, name) +has_rownames(df) +is.tibble(x) +is_tibble(x) +is_vector_s3(x) +knit_print.trunc_mat(x, options) +lst(...) +lst_(xs) +obj_sum(x) +remove_rownames(df) +repair_names(x, prefix = "V", sep) +rownames_to_column(df, var = "rowname") +tbl_sum(x) +tibble(...) +tibble_(xs) +tribble(...) +trunc_mat(x, n = NULL, width = NULL, n_extra = NULL) +type_sum(x) + +## S3 methods + +as_data_frame.NULL(x, ...) +as_data_frame.data.frame(x, validate = TRUE, ...) +as_data_frame.default(x, ...) +as_data_frame.list(x, validate = TRUE, ...) +as_data_frame.matrix(x, ...) +as_data_frame.table(x, n = "n", ...) +as_data_frame.tbl_df(x, ...) +as_tibble.NULL(x, ...) +as_tibble.data.frame(x, validate = TRUE, ...) +as_tibble.default(x, ...) +as_tibble.list(x, validate = TRUE, ...) +as_tibble.matrix(x, ...) +as_tibble.poly(x, ...) +as_tibble.table(x, n = "n", ...) +as_tibble.tbl_df(x, ...) +check_names_before_after.character(j, names) +check_names_before_after.default(j, ...) +check_names_df.character(j, x) +check_names_df.default(j, ...) +check_names_df.logical(j, x) +check_names_df.numeric(j, x) +format_v.character(x) +format_v.default(x) +format_v.list(x) +glimpse.data.frame(x, width = NULL, ...) +glimpse.default(x, width = NULL, max.level = 3, ...) +glimpse.tbl(x, width = NULL, ...) +is_vector_s3.Date(x) +is_vector_s3.POSIXct(x) +is_vector_s3.data.frame(x) +is_vector_s3.default(x) +is_vector_s3.difftime(x) +is_vector_s3.factor(x) +is_vector_s3.ordered(x) +obj_sum.POSIXlt(x) +obj_sum.default(x) +obj_sum.list(x) +quote_n.character(x) +quote_n.default(x) +tbl_sum.default(x) +tbl_sum.grouped_df(x) +tbl_sum.tbl_df(x) +tbl_sum.tbl_sql(x) +type_sum.Date(x) +type_sum.POSIXt(x) +type_sum.data.frame(x) +type_sum.default(x) +type_sum.difftime(x) +type_sum.factor(x) +type_sum.ordered(x) +type_sum.tbl_df(x) From bef75e5ba06e0cb6b9b15e26f63e910351bfef62 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 10 Jan 2017 18:09:12 +0100 Subject: [PATCH 06/37] update with 1.3.0 API Created by rapier, https://github.com/krlmlr/rapier CC @hadley, @gaborcsardi: I'd be interested to hear if there's overlap with other projects. --- API | 3 +++ 1 file changed, 3 insertions(+) diff --git a/API b/API index 9ef0b9f5a..55b7c1481 100644 --- a/API +++ b/API @@ -4,6 +4,7 @@ add_column(.data, ..., .before = NULL, .after = NULL) add_row(.data, ..., .before = NULL, .after = NULL) +as.tibble(x, ...) as_data_frame(x, ...) as_tibble(x, ...) column_to_rownames(df, var = "rowname") @@ -11,6 +12,7 @@ data_frame(...) data_frame_(xs) enframe(x, name = "name", value = "value") frame_data(...) +frame_matrix(...) glimpse(x, width = NULL, ...) has_name(x, name) has_rownames(df) @@ -48,6 +50,7 @@ as_tibble.matrix(x, ...) as_tibble.poly(x, ...) as_tibble.table(x, n = "n", ...) as_tibble.tbl_df(x, ...) +as_tibble.ts(x, ...) check_names_before_after.character(j, names) check_names_before_after.default(j, ...) check_names_df.character(j, x) From 125690dcdc6e064032a6cc8f0470dc8c8a872bcd Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 10:56:40 +0100 Subject: [PATCH 07/37] test other intermediate versions of R --- appveyor.yml | 17 ++++++++++++++--- 1 file changed, 14 insertions(+), 3 deletions(-) diff --git a/appveyor.yml b/appveyor.yml index 20a54956f..8b65d70f9 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -23,6 +23,18 @@ environment: WARNINGS_ARE_ERRORS: 1 matrix: + - R_VERSION: 3.1.2 + RTOOLS_VERSION: 32 + CRAN: http://cran.rstudio.com + + - R_VERSION: 3.1.1 + RTOOLS_VERSION: 32 + CRAN: http://cran.rstudio.com + + - R_VERSION: 3.1.0 + RTOOLS_VERSION: 32 + CRAN: http://cran.rstudio.com + - R_VERSION: devel GCC_PATH: mingw_32 @@ -45,9 +57,8 @@ environment: RTOOLS_VERSION: 32 CRAN: http://cran.rstudio.com - - R_VERSION: 3.1.0 - RTOOLS_VERSION: 32 - CRAN: http://cran.rstudio.com +matrix: + fast_finish: true build_script: - travis-tool.sh install_deps From 5194f93752cd57f6ebffd9a02afb88e6c5fea529 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 12:17:53 +0100 Subject: [PATCH 08/37] test R 3.1.0 with type = source --- appveyor.yml | 18 ++++-------------- 1 file changed, 4 insertions(+), 14 deletions(-) diff --git a/appveyor.yml b/appveyor.yml index 8b65d70f9..4a4938571 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -23,18 +23,6 @@ environment: WARNINGS_ARE_ERRORS: 1 matrix: - - R_VERSION: 3.1.2 - RTOOLS_VERSION: 32 - CRAN: http://cran.rstudio.com - - - R_VERSION: 3.1.1 - RTOOLS_VERSION: 32 - CRAN: http://cran.rstudio.com - - - R_VERSION: 3.1.0 - RTOOLS_VERSION: 32 - CRAN: http://cran.rstudio.com - - R_VERSION: devel GCC_PATH: mingw_32 @@ -57,8 +45,10 @@ environment: RTOOLS_VERSION: 32 CRAN: http://cran.rstudio.com -matrix: - fast_finish: true + - R_VERSION: 3.1.0 + RTOOLS_VERSION: 32 + CRAN: http://cran.rstudio.com + PKGTYPE: source build_script: - travis-tool.sh install_deps From 7e0e3226c20cadd171593d77429398615c142b17 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 13:53:57 +0100 Subject: [PATCH 09/37] use MRAN --- appveyor.yml | 14 ++++++++++---- 1 file changed, 10 insertions(+), 4 deletions(-) diff --git a/appveyor.yml b/appveyor.yml index 4a4938571..2e588a9cc 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -23,6 +23,14 @@ environment: WARNINGS_ARE_ERRORS: 1 matrix: + - R_VERSION: 3.1.0 + RTOOLS_VERSION: 32 + CRAN: http://mran.microsoft.com/snapshot/2015-06-01 + + - R_VERSION: 3.0.2 + RTOOLS_VERSION: 32 + CRAN: http://mran.microsoft.com/snapshot/2015-06-01 + - R_VERSION: devel GCC_PATH: mingw_32 @@ -45,10 +53,8 @@ environment: RTOOLS_VERSION: 32 CRAN: http://cran.rstudio.com - - R_VERSION: 3.1.0 - RTOOLS_VERSION: 32 - CRAN: http://cran.rstudio.com - PKGTYPE: source +matrix: + fast_finish: true build_script: - travis-tool.sh install_deps From 77fd22b9b3a83e9641a8322d40a5357c5ac273d0 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 14:12:23 +0100 Subject: [PATCH 10/37] bump From 355e5921de26c949874843234bdfb9162555cd59 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 14:44:30 +0100 Subject: [PATCH 11/37] need source for MRAN --- appveyor.yml | 2 ++ 1 file changed, 2 insertions(+) diff --git a/appveyor.yml b/appveyor.yml index 2e588a9cc..efc32fbff 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -26,10 +26,12 @@ environment: - R_VERSION: 3.1.0 RTOOLS_VERSION: 32 CRAN: http://mran.microsoft.com/snapshot/2015-06-01 + PKGTYPE: source - R_VERSION: 3.0.2 RTOOLS_VERSION: 32 CRAN: http://mran.microsoft.com/snapshot/2015-06-01 + PKGTYPE: source - R_VERSION: devel GCC_PATH: mingw_32 From 49aa8574ec6eafee33df062ebdc508b0f746fa25 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 15:21:00 +0100 Subject: [PATCH 12/37] can't currently test older versions - need to support multiple repos in r-appveyor --- appveyor.yml | 10 ---------- 1 file changed, 10 deletions(-) diff --git a/appveyor.yml b/appveyor.yml index efc32fbff..3c36b5b35 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -23,16 +23,6 @@ environment: WARNINGS_ARE_ERRORS: 1 matrix: - - R_VERSION: 3.1.0 - RTOOLS_VERSION: 32 - CRAN: http://mran.microsoft.com/snapshot/2015-06-01 - PKGTYPE: source - - - R_VERSION: 3.0.2 - RTOOLS_VERSION: 32 - CRAN: http://mran.microsoft.com/snapshot/2015-06-01 - PKGTYPE: source - - R_VERSION: devel GCC_PATH: mingw_32 From e8ef7d40790550a962b8ab14b475d9d08ab382f4 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 15:46:04 +0100 Subject: [PATCH 13/37] up year --- LICENSE | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/LICENSE b/LICENSE index 46b1e499e..003aacf0b 100644 --- a/LICENSE +++ b/LICENSE @@ -1,2 +1,2 @@ -YEAR: 2013-2016 +YEAR: 2013-2017 COPYRIGHT HOLDER: RStudio From e7ff1cf4d19062f75826cd86da2e65700c5655b4 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 15:50:49 +0100 Subject: [PATCH 14/37] CRAN and Bioc --- cran-comments.md | 6 ++++-- 1 file changed, 4 insertions(+), 2 deletions(-) diff --git a/cran-comments.md b/cran-comments.md index 5fc83c41b..effed8cdb 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -8,5 +8,7 @@ ## Reverse dependencies -I checked all 88 reverse dependencies for version 1.2 and for the current release, -and compared the outputs of R CMD check. They were identical for all packages; tidyr requires version 0.6.1 which contains a compatibility fix. +I checked all 88 reverse dependencies on CRAN and Bioconductor for version 1.2 +and for the current release, and compared the outputs of R CMD check. They were +identical for all packages; tidyr requires version 0.6.1 which contains a +compatibility fix. From ce902aae3799b55d001f40fdb02fff6004bf8c3e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 11 Jan 2017 15:53:53 +0100 Subject: [PATCH 15/37] fix typo --- NEWS.md | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/NEWS.md b/NEWS.md index d4ea1d93f..62450d483 100644 --- a/NEWS.md +++ b/NEWS.md @@ -3,7 +3,7 @@ ## Bug fixes - Time series matrices (objects of class `mts` and `ts`) are now supported in `as_tibble()` (#184). -- The `all_equal()` function (called by `all.equal.tbl_df()`) now forwards to `dplyr` and fails with a helpful message if not installed. Data frames with list columns cannot be compared anymore, and differences in the declard class (`data.frame` vs. `tbl_df`) are ignored. This ensures consistent behavior of this function, regardless if `dplyr` is loaded or not (#198). +- The `all_equal()` function (called by `all.equal.tbl_df()`) now forwards to `dplyr` and fails with a helpful message if not installed. Data frames with list columns cannot be compared anymore, and differences in the declared class (`data.frame` vs. `tbl_df`) are ignored. This ensures consistent behavior of this function, regardless if `dplyr` is loaded or not (#198). ## Interface changes From f5c9239dad57f83624dc7c62777fa975dc813abb Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 7 Feb 2017 10:10:56 +0100 Subject: [PATCH 16/37] get rid of assertthat dependency --- DESCRIPTION | 1 - NAMESPACE | 1 - NEWS.md | 1 + R/tibble.R | 1 - 4 files changed, 1 insertion(+), 3 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 692553207..7e57474e5 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -16,7 +16,6 @@ Depends: R (>= 3.1.0) Imports: methods, - assertthat, utils, lazyeval (>= 0.1.10), Rcpp (>= 0.12.3) diff --git a/NAMESPACE b/NAMESPACE index 48357c05b..7da4a9dc7 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -90,7 +90,6 @@ export(tibble_) export(tribble) export(trunc_mat) export(type_sum) -import(assertthat) importFrom(Rcpp,sourceCpp) importFrom(stats,setNames) importFrom(utils,head) diff --git a/NEWS.md b/NEWS.md index 62450d483..7bbe45306 100644 --- a/NEWS.md +++ b/NEWS.md @@ -10,6 +10,7 @@ - Now requiring R 3.1.0 instead of R 3.1.3 (#189). - Add `as.tibble()` as an alias to `as_tibble()` (#160, @LaDilettante). - New `frame_matrix()` (#140, #168, @LaDilettante). +- Removed unused dependency on `assertthat`. ## Features diff --git a/R/tibble.R b/R/tibble.R index 6e3f15179..bbeb8a9fa 100644 --- a/R/tibble.R +++ b/R/tibble.R @@ -1,6 +1,5 @@ #' @useDynLib tibble #' @importFrom Rcpp sourceCpp -#' @import assertthat #' @importFrom utils head tail #' @aliases NULL #' @details The S3 class `tbl_df` wraps a local data frame. The main From 4b1393f6a8ac1bd557820f0f78c84d63e1902429 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 7 Feb 2017 10:11:28 +0100 Subject: [PATCH 17/37] document --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 7e57474e5..bbbb993ed 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -31,5 +31,5 @@ LinkingTo: Rcpp LazyData: yes License: MIT + file LICENSE Roxygen: list(markdown = TRUE) -RoxygenNote: 5.0.1.9000 +RoxygenNote: 6.0.0 VignetteBuilder: knitr From b056354142414b621d69f82f5fed133d23c9241b Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 7 Feb 2017 13:39:17 +0100 Subject: [PATCH 18/37] NEWS --- NEWS.md | 3 ++- 1 file changed, 2 insertions(+), 1 deletion(-) diff --git a/NEWS.md b/NEWS.md index 7bbe45306..429c4462c 100644 --- a/NEWS.md +++ b/NEWS.md @@ -9,7 +9,8 @@ - Now requiring R 3.1.0 instead of R 3.1.3 (#189). - Add `as.tibble()` as an alias to `as_tibble()` (#160, @LaDilettante). -- New `frame_matrix()` (#140, #168, @LaDilettante). +- New `frame_matrix()`, similar to `frame_data()` but for matrices (#140, #168, @LaDilettante). +- New `deframe()` as reverse operation to `enframe()` (#146, #214). - Removed unused dependency on `assertthat`. ## Features From d41e5bf9f8a56f31ea5600995820a090d83b16e0 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Tue, 7 Feb 2017 13:48:37 +0100 Subject: [PATCH 19/37] up API --- API | 3 ++- DESCRIPTION | 2 +- 2 files changed, 3 insertions(+), 2 deletions(-) diff --git a/API b/API index 55b7c1481..ba3bba5be 100644 --- a/API +++ b/API @@ -1,6 +1,6 @@ # API for tibble package -## Exports +## Exported functions add_column(.data, ..., .before = NULL, .after = NULL) add_row(.data, ..., .before = NULL, .after = NULL) @@ -10,6 +10,7 @@ as_tibble(x, ...) column_to_rownames(df, var = "rowname") data_frame(...) data_frame_(xs) +deframe(x) enframe(x, name = "name", value = "value") frame_data(...) frame_matrix(...) diff --git a/DESCRIPTION b/DESCRIPTION index bbbb993ed..8e0dfd905 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -30,6 +30,6 @@ Suggests: LinkingTo: Rcpp LazyData: yes License: MIT + file LICENSE -Roxygen: list(markdown = TRUE) +Roxygen: list(markdown = TRUE, roclets = c("collate", "namespace", "rd", "pkgapi::api_roclet")) RoxygenNote: 6.0.0 VignetteBuilder: knitr From f9c738a19021ace3bb0c32c1b850ec0cdbae77a3 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Thu, 9 Feb 2017 01:04:30 +0100 Subject: [PATCH 20/37] bump From 704abb3890863cfd9e734364a2c9cffa53065287 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Thu, 9 Feb 2017 01:07:24 +0100 Subject: [PATCH 21/37] bump From f9cb864093b1f24078077f5db0b7841cd6856881 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 29 Mar 2017 19:04:57 +0000 Subject: [PATCH 22/37] Revert "don't check old" This reverts commit a5340fac3ba51ed06564a776bd4b4c328c973758. --- revdep/diff.sh | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/revdep/diff.sh b/revdep/diff.sh index 843b5e59a..f28075cdc 100755 --- a/revdep/diff.sh +++ b/revdep/diff.sh @@ -2,7 +2,7 @@ set -e -old_tag= +old_tag=v1.2 branch=$(git symbolic-ref --short HEAD) cd $(dirname $0)/.. From ecd8f67fc76150bd9154874fe0f02475f5762253 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 29 Mar 2017 19:48:04 +0000 Subject: [PATCH 23/37] revdep update with v1.2 results --- revdep/README-v1.2.md | 817 ++++++++++++++++++++------- revdep/README.md | 812 +++++++++++++++++++------- revdep/checks.rds | Bin 7741 -> 11278 bytes revdep/install/ROI.plugin.glpk.out | 2 - revdep/install/Rglpk.out | 8 - revdep/install/ggimage.out | 2 + revdep/install/ggspectra.out | 10 + revdep/install/gridGraphics.out | 11 + revdep/install/photobiologyInOut.out | 11 + revdep/problems-v1.2.md | 371 +++++++++--- revdep/problems.md | 372 +++++++++--- revdep/timing.md | 210 ++++--- 12 files changed, 1913 insertions(+), 713 deletions(-) delete mode 100644 revdep/install/ROI.plugin.glpk.out delete mode 100644 revdep/install/Rglpk.out create mode 100644 revdep/install/ggimage.out create mode 100644 revdep/install/ggspectra.out create mode 100644 revdep/install/gridGraphics.out create mode 100644 revdep/install/photobiologyInOut.out diff --git a/revdep/README-v1.2.md b/revdep/README-v1.2.md index 579e5c2f8..c6aada28d 100644 --- a/revdep/README-v1.2.md +++ b/revdep/README-v1.2.md @@ -4,13 +4,13 @@ |setting |value | |:--------|:----------------------------| -|version |R version 3.3.2 (2016-10-31) | +|version |R version 3.3.3 (2017-03-06) | |system |x86_64, linux-gnu | |ui |X11 | |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-01-10 | +|date |2017-03-29 | ## Packages @@ -20,114 +20,150 @@ |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | -|nycflights13 | |0.2.1 |2016-12-30 |cran (@0.2.1) | -|Rcpp | |0.12.8 |2016-11-17 |cran (@0.12.8) | +|nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | +|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | |rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | -|testthat | |1.0.2.9000 |2016-12-24 |Github (hadley/testthat@3b2f225) | +|testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | # Check results -88 packages +118 packages |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |abjutils |0.0.1 | 0| 0| 0| -|biomartr |0.2.1 | 0| 0| 0| +|anomalyDetection |0.1.0 | 0| 0| 0| +|biomartr |0.4.0 | 0| 0| 0| |blkbox |1.0 | 0| 0| 2| |blob |1.0.0 | 0| 0| 0| |blockTools |0.6-3 | 0| 0| 0| |bold |0.4.0 | 0| 0| 1| |bsam |1.1.1 | 0| 0| 0| +|ccafs |0.1.0 | 0| 0| 0| +|cdata |0.1.0 | 0| 0| 0| |cellranger |1.1.0 | 0| 0| 0| |checkmate |1.8.2 | 0| 0| 0| |corrr |0.2.1 | 0| 0| 0| |countyweather |0.1.0 | 0| 0| 0| -|datapasta |1.1.0 | 0| 0| 0| +|cpr |0.2.3 | 0| 0| 0| +|datapasta |2.0.0 | 0| 0| 0| |datastepr |0.0.2 | 0| 0| 0| |dat |0.1.0 | 1| 0| 0| |DiagrammeR |0.9.0 | 0| 0| 1| -|docxtools |0.1.0 | 0| 0| 0| +|doctr |0.2.0 | 0| 0| 0| |docxtractr |0.2.0 | 0| 0| 0| |dotwhisker |0.2.3 | 0| 0| 0| |dplyr |0.5.0 | 0| 0| 1| |easyformatr |0.1.2 | 0| 0| 0| -|eurostat |2.2.1 | 0| 0| 0| -|fbar |0.1.16 | 0| 0| 1| +|ecoseries |0.1.1 | 0| 0| 0| +|enigma |0.3.0 | 0| 0| 0| +|eurostat |3.1.1 | 0| 0| 0| +|evaluator |0.1.0 | 0| 0| 0| +|fbar |0.1.23 | 0| 0| 0| |feather |0.3.1 | 0| 0| 0| -|forcats |0.1.1 | 0| 0| 0| -|geojson |0.1.0 | 0| 0| 0| +|fileplyr |0.2.0 | 0| 0| 0| +|filesstrings |0.3.2 | 0| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|foghorn |0.4.2 | 0| 0| 0| +|forcats |0.2.0 | 0| 0| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|geojson |0.1.2 | 0| 0| 0| |getlandsat |0.1.0 | 0| 0| 0| +|ggalt |0.4.0 | 0| 0| 0| |ggenealogy |0.3.0 | 0| 0| 0| -|ggfortify |0.3.0.0 | 0| 0| 1| +|ggfortify |0.4.1 | 0| 0| 1| |ggguitar |0.1.1 | 0| 0| 0| +|ggimage |0.0.4 | 1| 0| 0| |ggplot2 |2.2.1 | 0| 0| 0| -|ggpmisc |0.2.13 | 0| 0| 0| -|haven |1.0.0 | 0| 0| 1| -|heemod |0.7.1 | 0| 0| 0| -|highcharter |0.4.0 | 0| 1| 0| +|ggpmisc |0.2.14 | 0| 0| 0| +|giphyr |0.1.0 | 0| 0| 0| +|gitlabr |0.7 | 0| 0| 0| +|GSODR |1.0.1 | 0| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| |hypoparsr |0.1.0 | 0| 0| 0| -|isdparser |0.1.0 | 0| 0| 0| -|jpmesh |0.3.0 | 1| 0| 0| +|inferr |0.1.0 | 0| 0| 0| +|isdparser |0.2.0 | 0| 0| 0| +|jpmesh |0.3.0 | 0| 0| 1| |knitr |1.15.1 | 0| 0| 0| -|KraljicMatrix |0.1.0 | 0| 0| 0| +|KraljicMatrix |0.1.1 | 0| 0| 0| |manifestoR |1.2.3 | 0| 0| 0| -|modelr |0.1.0 | 0| 0| 1| +|modelr |0.1.0 | 0| 0| 0| +|modeval |0.1.2 | 0| 0| 0| |monkeylearn |0.1.1 | 0| 0| 0| |mregions |0.1.4 | 0| 0| 0| -|msgtools |0.2.4 | 0| 0| 0| +|mrgsolve |0.8.6 | 0| 0| 1| +|msgtools |0.2.7 | 0| 0| 0| +|myTAI |0.5.0 | 0| 0| 1| |natserv |0.1.4 | 0| 0| 0| -|nycflights13 |0.2.1 | 0| 0| 1| +|nycflights13 |0.2.2 | 0| 0| 1| |oai |0.2.2 | 0| 0| 0| +|observer |0.1.2 | 0| 0| 1| +|odbc |1.0.1 | 0| 0| 0| +|officer |0.1.1 | 2| 1| 0| |openadds |0.2.0 | 0| 0| 0| -|pangaear |0.2.4 | 0| 0| 0| +|pangaear |0.3.0 | 0| 0| 0| |pdfsearch |0.1.1 | 0| 0| 0| -|photobiologyInOut |0.4.12 | 1| 0| 0| -|photobiology |0.9.13 | 0| 0| 0| -|phylopath |0.2.2 | 0| 0| 0| +|photobiologyInOut |0.4.13 | 1| 0| 0| +|photobiology |0.9.14 | 0| 0| 0| +|phylopath |0.2.3 | 0| 0| 0| |plotly |4.5.6 | 1| 0| 0| -|poio |0.0-2 | 0| 0| 1| -|pollstR |1.4.0 | 0| 0| 0| +|poio |0.0-3 | 0| 0| 0| +|prcr |0.1.1 | 0| 0| 0| |radiant.data |0.6.0 | 0| 0| 0| |randNames |0.2.3 | 0| 0| 0| -|rbgm |0.0.4 | 0| 1| 0| +|rbcb |0.1.0 | 0| 0| 0| +|rbgm |0.0.4 | 0| 0| 0| |rbhl |0.3.0 | 0| 0| 0| +|rdefra |0.3.4 | 0| 0| 0| |rdpla |0.1.0 | 0| 0| 0| -|readr |1.0.0 | 0| 0| 1| +|readr |1.1.0 | 0| 0| 1| |refimpact |0.1.0 | 0| 0| 0| |reutils |0.2.3 | 0| 0| 0| -|rgbif |0.9.6 | 0| 0| 0| -|rgho |1.0.0 | 0| 0| 0| +|rgbif |0.9.7 | 0| 0| 0| +|rgho |1.0.1 | 0| 0| 0| |riem |0.1.1 | 0| 0| 0| +|rif |0.1.0 | 0| 0| 0| |ritis |0.5.4 | 0| 0| 0| -|rmarkdown |1.3 | 0| 0| 1| +|rmarkdown |1.4 | 0| 0| 1| |rnoaa |0.6.6 | 0| 0| 0| |rorcid |0.3.0 | 0| 0| 0| |rtide |0.0.3 | 0| 0| 0| -|sf |0.2-8 | 1| 0| 1| -|sjmisc |2.2.1 | 0| 0| 0| -|sjPlot |2.2.0 | 0| 0| 1| -|sjstats |0.7.1 | 0| 0| 0| +|sf |0.4-1 | 0| 0| 1| +|sjmisc |2.3.1 | 0| 0| 0| +|sjPlot |2.3.1 | 0| 0| 0| +|sjstats |0.9.0 | 0| 0| 1| |solrium |0.4.0 | 0| 0| 0| |spbabel |0.4.5 | 0| 0| 0| |spdplyr |0.1.2 | 0| 0| 0| |spocc |0.6.0 | 0| 0| 0| |srvyr |0.2.0 | 0| 0| 0| -|taxize |0.8.0 | 0| 0| 0| -|tidyquant |0.2.0 | 1| 0| 0| -|tidyr |0.6.0 | 0| 0| 0| -|tidyverse |1.0.0 | 0| 0| 0| -|units |0.4-1 | 0| 0| 0| -|valr |0.1.1 | 0| 0| 1| +|taxize |0.8.4 | 0| 0| 0| +|tidyquant |0.4.0 | 0| 0| 0| +|tidyr |0.6.1 | 0| 0| 0| +|tidyverse |1.1.1 | 0| 0| 0| +|units |0.4-3 | 0| 0| 0| +|unpivotr |0.1.0 | 0| 0| 0| +|valr |0.1.2 | 0| 0| 1| |wand |0.2.0 | 0| 0| 0| +|worrms |0.1.0 | 0| 0| 0| ## abjutils (0.0.1) Maintainer: Fernando Correa 0 errors | 0 warnings | 0 notes -## biomartr (0.2.1) +## anomalyDetection (0.1.0) +Maintainer: Bradley Boehmke +Bug reports: https://github.com/bradleyboehmke/anomalyDetection/issues + +0 errors | 0 warnings | 0 notes + +## biomartr (0.4.0) Maintainer: Hajk-Georg Drost Bug reports: https://github.com/HajkD/biomartr/issues @@ -174,6 +210,18 @@ Bug reports: https://github.com/ianjonsen/bsam/issues 0 errors | 0 warnings | 0 notes +## ccafs (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/ccafs/issues + +0 errors | 0 warnings | 0 notes + +## cdata (0.1.0) +Maintainer: John Mount +Bug reports: https://github.com/WinVector/cdata/issues + +0 errors | 0 warnings | 0 notes + ## cellranger (1.1.0) Maintainer: Jennifer Bryan Bug reports: https://github.com/rsheets/cellranger/issues @@ -197,7 +245,12 @@ Maintainer: Rachel Severson 0 errors | 0 warnings | 0 notes -## datapasta (1.1.0) +## cpr (0.2.3) +Maintainer: Peter DeWitt + +0 errors | 0 warnings | 0 notes + +## datapasta (2.0.0) Maintainer: Miles McBain Bug reports: https://github.com/milesmcbain/datapasta/issues @@ -217,8 +270,11 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR + Running ‘testthat.R’ [10s/10s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + ^ + tests/testthat/test-trunc-mat.R:5:3: style: Variable and function names should not be longer than 25 characters. print_arg_names_without_ellipsis <- setdiff(print_arg_names, "...") ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ tests/testthat/test-trunc-mat.R:9:16: style: Variable and function names should not be longer than 25 characters. @@ -249,8 +305,8 @@ checking installed package size ... NOTE img 2.8Mb ``` -## docxtools (0.1.0) -Maintainer: Richard Layton +## doctr (0.2.0) +Maintainer: Caio Lente 0 errors | 0 warnings | 0 notes @@ -273,9 +329,9 @@ Bug reports: https://github.com/hadley/dplyr/issues ``` checking installed package size ... NOTE - installed size is 23.4Mb + installed size is 23.5Mb sub-directories of 1Mb or more: - libs 21.3Mb + libs 21.4Mb ``` ## easyformatr (0.1.2) @@ -284,22 +340,34 @@ Bug reports: https://github.com/bramtayl/easyformatr/issues 0 errors | 0 warnings | 0 notes -## eurostat (2.2.1) -Maintainer: Lahti Leo +## ecoseries (0.1.1) +Maintainer: Fernando Teixeira +Bug reports: https://github.com/fernote7/ecoseries/issues + +0 errors | 0 warnings | 0 notes + +## enigma (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropengov/enigma/issues + +0 errors | 0 warnings | 0 notes + +## eurostat (3.1.1) +Maintainer: Leo Lahti Bug reports: https://github.com/ropengov/eurostat/issues 0 errors | 0 warnings | 0 notes -## fbar (0.1.16) -Maintainer: Max Conway +## evaluator (0.1.0) +Maintainer: David Severski +Bug reports: https://github.com/davidski/evaluator/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 0 notes -``` -checking package dependencies ... NOTE -Packages suggested but not available for checking: - ‘Rglpk’ ‘ROI.plugin.glpk’ -``` +## fbar (0.1.23) +Maintainer: Max Conway + +0 errors | 0 warnings | 0 notes ## feather (0.3.1) Maintainer: Hadley Wickham @@ -307,13 +375,103 @@ Bug reports: https://github.com/wesm/feather/issues 0 errors | 0 warnings | 0 notes -## forcats (0.1.1) +## fileplyr (0.2.0) +Maintainer: KS Srikanth +Bug reports: https://github.com/talegari/fileplyr/issues + +0 errors | 0 warnings | 0 notes + +## filesstrings (0.3.2) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/filesstrings/issues + +0 errors | 0 warnings | 0 notes + +## flextable (0.1.0) +Maintainer: David Gohel + +0 errors | 1 warning | 0 notes + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Loading required package: officer + +Attaching package: 'dplyr' + +The following objects are masked from 'package:stats': + + filter, lag + +The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + +PhantomJS not found. You can install it with webshot::install_phantomjs(). If it is installed, please make sure the phantomjs executable can be found via the PATH variable. +Quitting from lines 39-41 (format.Rmd) +Error: processing vignette 'format.Rmd' failed with diagnostics: +cannot open the connection +Execution halted + +``` + +## foghorn (0.4.2) +Maintainer: Francois Michonneau +Bug reports: https://github.com/fmichonneau/foghorn/issues + +0 errors | 0 warnings | 0 notes + +## forcats (0.2.0) Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/forcats/issues +Bug reports: https://github.com/tidyverse/forcats/issues 0 errors | 0 warnings | 0 notes -## geojson (0.1.0) +## FSelectorRcpp (0.1.2) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues + +1 error | 0 warnings | 2 notes + +``` +checking examples ... ERROR +Running examples in ‘FSelectorRcpp-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: feature_search +> ### Title: General Feature Searching Engine +> ### Aliases: feature_search +> +> ### ** Examples +> +> +> # Enable parallelization in examples +> library(doSNOW) # doSNOW has an option for progress bar +Loading required package: foreach +Loading required package: iterators +Loading required package: snow +> cl <- makeCluster(2) +Loading required namespace: Rmpi +Error in Rmpi::mpi.comm.spawn(slave = mpitask, slavearg = args, nslaves = count, : + MPI_Comm_spawn is not supported. +Calls: makeCluster -> makeMPIcluster -> +Execution halted + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ + +checking installed package size ... NOTE + installed size is 9.7Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 7.3Mb +``` + +## geojson (0.1.2) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/geojson/issues @@ -325,12 +483,18 @@ Bug reports: https://github.com/ropenscilabs/getlandsat/issues 0 errors | 0 warnings | 0 notes +## ggalt (0.4.0) +Maintainer: Bob Rudis +Bug reports: https://github.com/hrbrmstr/ggalt/issues + +0 errors | 0 warnings | 0 notes + ## ggenealogy (0.3.0) Maintainer: Lindsay Rutter 0 errors | 0 warnings | 0 notes -## ggfortify (0.3.0.0) +## ggfortify (0.4.1) Maintainer: Masaaki Horikoshi Bug reports: https://github.com/sinhrks/ggfortify/issues @@ -349,40 +513,191 @@ Bug reports: https://github.com/ezgraphs/ggguitar/issues 0 errors | 0 warnings | 0 notes +## ggimage (0.0.4) +Maintainer: Guangchuang Yu +Bug reports: https://github.com/GuangchuangYu/ggimage/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: ‘EBImage’ ‘gridGraphics’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## ggplot2 (2.2.1) Maintainer: Hadley Wickham Bug reports: https://github.com/tidyverse/ggplot2/issues 0 errors | 0 warnings | 0 notes -## ggpmisc (0.2.13) +## ggpmisc (0.2.14) Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/ggpmisc/issues 0 errors | 0 warnings | 0 notes +## giphyr (0.1.0) +Maintainer: Hao Zhu +Bug reports: https://github.com/haozhu233/giphyr/issues + +0 errors | 0 warnings | 0 notes + +## gitlabr (0.7) +Maintainer: Jirka Lewandowski +Bug reports: http://gitlab.points-of-interest.cc/points-of-interest/gitlabr/issues/ + +0 errors | 0 warnings | 0 notes + +## GSODR (1.0.1) +Maintainer: Adam Sparks +Bug reports: https://github.com/ropensci/GSODR/issues + +0 errors | 0 warnings | 0 notes + ## haven (1.0.0) Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/haven/issues -0 errors | 0 warnings | 1 note +2 errors | 0 warnings | 1 note ``` +checking examples ... ERROR +Running examples in ‘haven-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: read_dta +> ### Title: Read and write Stata DTA files. +> ### Aliases: read_dta read_stata write_dta +> +> ### ** Examples +... 14 lines ... +8 5.0 3.4 1.5 0.2 setosa +9 4.4 2.9 1.4 0.2 setosa +10 4.9 3.1 1.5 0.1 setosa +# ... with 140 more rows +> +> tmp <- tempfile(fileext = ".dta") +> write_dta(mtcars, tmp) +Error in write_dta_(data, normalizePath(path, mustWork = FALSE), version = stata_file_format(version)) : + Writing failure: Unable to write data. +Calls: write_dta -> write_dta_ -> .Call +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + + testthat results ================================================================ + OK: 132 SKIPPED: 0 FAILED: 9 + 1. Error: can roundtrip basic types (@test-write-dta.R#5) + 2. Error: can roundtrip missing values (as much as possible) (@test-write-dta.R#12) + 3. Error: can roundtrip date times (@test-write-dta.R#23) + 4. Error: infinity gets converted to NA (@test-write-dta.R#28) + 5. Error: factors become labelleds (@test-write-dta.R#33) + 6. Error: labels are preserved (@test-write-dta.R#44) + 7. Error: labelleds are round tripped (@test-write-dta.R#52) + 8. Error: factors become labelleds (@test-write-dta.R#59) + 9. Error: labels are converted to utf-8 (@test-write-dta.R#73) + + Error: testthat unit tests failed + Execution halted + checking for GNU extensions in Makefiles ... NOTE GNU make is a SystemRequirements. ``` -## heemod (0.7.1) +## hddtools (0.6) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/hddtools/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [14s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", + sQuote(fdef@generic), sQuote(cnames)), domain = NA) + + trying URL 'ftp://ftp.bafg.de/pub/REFERATE/GRDC/ltdata/africa.zip' + ftp data connection made, file length 2730333 bytes + ================================================== + downloaded 2.6 MB + + testthat results ================================================================ + OK: 55 SKIPPED: 1 FAILED: 2 + 1. Error: Test TRMM function using dates in the past (@test-TRMM.R#15) + 2. Error: Test TRMM function using 3-hourly dates in the past (@test-TRMM.R#58) + + Error: testthat unit tests failed + Execution halted +``` + +## heemod (0.8.0) Maintainer: Antoine Filipovic-Pierucci Bug reports: https://github.com/pierucci/heemod/issues -0 errors | 0 warnings | 0 notes +1 error | 1 warning | 1 note + +``` +checking tests ... ERROR + Running ‘testthat.R’ [33s/36s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) + 6: flexsurv::summary.flexsurvreg + 7: getExportedValue(pkg, name) + 8: stop(gettextf("'%s' is not an exported object from 'namespace:%s'", name, getNamespaceName(ns)), + call. = FALSE, domain = NA) + + .model from to prob + 1 standard RevisionTHR SuccessfulRevision + 2 new RevisionTHR SuccessfulRevision + testthat results ================================================================ + OK: 346 SKIPPED: 0 FAILED: 1 + 1. Error: (unknown) (@test_survival.R#23) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +'colour', which will replace the existing scale. +Scale for 'colour' is already present. Adding another scale for +'colour', which will replace the existing scale. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +... 8 lines ... + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Error in mutate_impl(.data, dots) : + 'summary.flexsurvreg' is not an exported object from 'namespace:flexsurv' +Quitting from lines 42-83 (j-survival.Rmd) +Error: processing vignette 'j-survival.Rmd' failed with diagnostics: +Error in parameter: p2. +Execution halted -## highcharter (0.4.0) +checking dependencies in R code ... NOTE +Missing or unexported object: ‘flexsurv::summary.flexsurvreg’ +``` + +## highcharter (0.5.0) Maintainer: Joshua Kunst Bug reports: https://github.com/jbkunst/highcharter/issues -0 errors | 1 warning | 0 notes +0 errors | 1 warning | 1 note ``` checking re-building of vignette outputs ... WARNING @@ -390,11 +705,19 @@ Error in re-building vignettes: ... Warning in engine$weave(file, quiet = quiet, encoding = enc) : Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Quitting from lines 58-81 (replicating-highcharts-demos.Rmd) -Error: processing vignette 'replicating-highcharts-demos.Rmd' failed with diagnostics: +Highcharts (www.highcharts.com) is a Highsoft software product which is +not free for commercial and Governmental use +Quitting from lines 45-46 (charting-data-frames.Rmd) +Error: processing vignette 'charting-data-frames.Rmd' failed with diagnostics: cannot open the connection Execution halted + +checking installed package size ... NOTE + installed size is 16.5Mb + sub-directories of 1Mb or more: + doc 13.7Mb + htmlwidgets 1.9Mb ``` ## hypoparsr (0.1.0) @@ -402,9 +725,15 @@ Maintainer: Hannes Muehleisen 0 errors | 0 warnings | 0 notes -## isdparser (0.1.0) +## inferr (0.1.0) +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: http://www.github.com/ropenscilabs/isdparser/issues +Bug reports: https://github.com/ropensci/isdparser/issues 0 errors | 0 warnings | 0 notes @@ -412,12 +741,13 @@ Bug reports: http://www.github.com/ropenscilabs/isdparser/issues Maintainer: Shinya Uryu Bug reports: https://github.com/uribo/jpmesh/issues -1 error | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note ``` -checking whether package ‘jpmesh’ can be installed ... ERROR -Installation failed. -See ‘/home/muelleki/git/R/tibble/revdep/checks/jpmesh.Rcheck/00install.out’ for details. +checking installed package size ... NOTE + installed size is 206.0Mb + sub-directories of 1Mb or more: + extdata 205.2Mb ``` ## knitr (1.15.1) @@ -426,7 +756,7 @@ Bug reports: https://github.com/yihui/knitr/issues 0 errors | 0 warnings | 0 notes -## KraljicMatrix (0.1.0) +## KraljicMatrix (0.1.1) Maintainer: Bradley Boehmke Bug reports: https://github.com/bradleyboehmke/KraljicMatrix/issues @@ -442,12 +772,12 @@ Bug reports: https://github.com/ManifestoProject/manifestoR/issues Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/modelr/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 0 notes -``` -checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘rstanarm’ -``` +## modeval (0.1.2) +Maintainer: Younggun You + +0 errors | 0 warnings | 0 notes ## monkeylearn (0.1.1) Maintainer: Maëlle Salmon @@ -461,19 +791,46 @@ Bug reports: https://github.com/ropenscilabs/mregions/issues 0 errors | 0 warnings | 0 notes -## msgtools (0.2.4) +## mrgsolve (0.8.6) +Maintainer: Kyle T Baron +Bug reports: https://github.com/metrumresearchgroup/mrgsolve/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 6.2Mb + sub-directories of 1Mb or more: + libs 5.0Mb +``` + +## msgtools (0.2.7) Maintainer: Thomas J. Leeper Bug reports: https://github.com/RL10N/msgtools/issues 0 errors | 0 warnings | 0 notes +## myTAI (0.5.0) +Maintainer: Hajk-Georg Drost +Bug reports: https://github.com/HajkD/myTAI/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 5.3Mb + sub-directories of 1Mb or more: + data 2.0Mb + doc 2.3Mb +``` + ## natserv (0.1.4) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/natserv/issues 0 errors | 0 warnings | 0 notes -## nycflights13 (0.2.1) +## nycflights13 (0.2.2) Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/nycflights13/issues @@ -492,13 +849,88 @@ Bug reports: https://github.com/ropensci/oai/issues 0 errors | 0 warnings | 0 notes +## observer (0.1.2) +Maintainer: Paul Poncet +Bug reports: https://github.com/paulponcet/observer/issues + +0 errors | 0 warnings | 1 note + +``` +checking Rd cross-references ... NOTE +Package unavailable to check Rd xrefs: ‘validate’ +``` + +## odbc (1.0.1) +Maintainer: Jim Hester +Bug reports: https://github.com/rstats-db/odbc/issues + +0 errors | 0 warnings | 0 notes + +## officer (0.1.1) +Maintainer: David Gohel +Bug reports: https://github.com/davidgohel/officer/issues + +2 errors | 1 warning | 0 notes + +``` +checking examples ... ERROR +Running examples in ‘officer-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: slip_in_img +> ### Title: append an image +> ### Aliases: slip_in_img +> +> ### ** Examples +> +> library(magrittr) +> img.file <- file.path( Sys.getenv("R_HOME"), "doc", "html", "logo.jpg" ) +> x <- read_docx() %>% ++ body_add_par("R logo: ", style = "Normal") %>% ++ slip_in_img(src = img.file, style = "strong", width = .3, height = .3) +Error: file.exists(src) is not TRUE +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ [21s/21s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) + 10: external_img(src, width = width, height = height) + 11: stopifnot(file.exists(src)) + 12: stop(sprintf(ngettext(length(r), "%s is not TRUE", "%s are not all TRUE"), ch), call. = FALSE, + domain = NA) + + testthat results ================================================================ + OK: 317 SKIPPED: 0 FAILED: 4 + 1. Error: image add (@test-docx-add.R#68) + 2. Error: pml fp_border (@test-fp_cell.R#75) + 3. Error: css fp_border (@test-fp_cell.R#165) + 4. Error: add img into placeholder (@test-pptx-add.R#67) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Quitting from lines 181-191 (powerpoint.Rmd) +Error: processing vignette 'powerpoint.Rmd' failed with diagnostics: +file.exists(src) is not TRUE +Execution halted + +``` + ## openadds (0.2.0) Maintainer: Scott Chamberlain Bug reports: https://github.com/sckott/openadds/issues 0 errors | 0 warnings | 0 notes -## pangaear (0.2.4) +## pangaear (0.3.0) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/pangaear/issues @@ -510,38 +942,27 @@ Bug reports: https://github.com/lebebr01/pdfsearch/issues 0 errors | 0 warnings | 0 notes -## photobiologyInOut (0.4.12) +## photobiologyInOut (0.4.13) Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/ +Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ 1 error | 0 warnings | 0 notes ``` -checking tests ... ERROR -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - as.numeric(getWhenMeasured(ss.spct), tz = "CET") not equal to as.numeric(ymd_hms("2013-05-06 15:13:40", tz = "CET"), tz = "CET"). - 1/1 mismatches - [1] 1.37e+09 - 1.37e+09 == 3450400 - - - Read 4 items - testthat results ================================================================ - OK: 214 SKIPPED: 0 FAILED: 2 - 1. Failure: SpectraSuite (@test-oo.R#76) - 2. Failure: SpectraSuite (@test-oo.R#158) - - Error: testthat unit tests failed - Execution halted +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘photobiology’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. ``` -## photobiology (0.9.13) +## photobiology (0.9.14) Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/photobiology/issues 0 errors | 0 warnings | 0 notes -## phylopath (0.2.2) +## phylopath (0.2.3) Maintainer: Wouter van der Bijl Bug reports: https://github.com/Ax3man/phylopath/issues @@ -555,8 +976,11 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR + Running ‘testthat.R’ [46s/47s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + [1] "Running test: plotly-group-within-trace" + [1] "Running test: plotly-alpha-blending" [1] "Running test: plotly-alpha-no-color" [1] "Running test: plotly-factor-axis" [1] "Running test: plotly-character-axis" @@ -565,27 +989,21 @@ Last 13 lines of output: [1] "Running test: plotly-inherit-FALSE" [1] "Running test: plotly-time-series-summary" testthat results ================================================================ - OK: 808 SKIPPED: 17 FAILED: 1 + OK: 813 SKIPPED: 17 FAILED: 1 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) Error: testthat unit tests failed Execution halted ``` -## poio (0.0-2) +## poio (0.0-3) Maintainer: Richard Cotton Bug reports: https://github.com/RL10N/poio/issues -0 errors | 0 warnings | 1 note - -``` -checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘ISOcodes’ -``` +0 errors | 0 warnings | 0 notes -## pollstR (1.4.0) -Maintainer: Jeffrey B. Arnold -Bug reports: https://github.com/rOpenGov/pollstR/issues +## prcr (0.1.1) +Maintainer: Joshua Rosenberg 0 errors | 0 warnings | 0 notes @@ -601,36 +1019,17 @@ Bug reports: https://github.com/karthik/randNames/issues 0 errors | 0 warnings | 0 notes +## rbcb (0.1.0) +Maintainer: Wilson Freitas +Bug reports: https://github.com/wilsonfreitas/rbcb/issues + +0 errors | 0 warnings | 0 notes + ## rbgm (0.0.4) Maintainer: Michael D. Sumner Bug reports: https://github.com/AustralianAntarcticDivision/rbgm/issues/ -0 errors | 1 warning | 0 notes - -``` -checking re-building of vignette outputs ... WARNING -Error in re-building vignettes: - ... -Warning in engine$weave(file, quiet = quiet, encoding = enc) : - Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Loading required package: sp - -Attaching package: 'dplyr' - -The following objects are masked from 'package:raster': -... 8 lines ... -The following objects are masked from 'package:base': - - intersect, setdiff, setequal, union - -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/rgdal/libs/rgdal.so': - libgdal.so.1: cannot open shared object file: No such file or directory -Quitting from lines 16-24 (BGM_Spatial.Rmd) -Error: processing vignette 'BGM_Spatial.Rmd' failed with diagnostics: -package or namespace load failed for 'rgdal' -Execution halted -``` +0 errors | 0 warnings | 0 notes ## rbhl (0.3.0) Maintainer: Scott Chamberlain @@ -638,23 +1037,29 @@ Bug reports: https://github.com/ropensci/rbhl/issues 0 errors | 0 warnings | 0 notes +## rdefra (0.3.4) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/rdefra/issues + +0 errors | 0 warnings | 0 notes + ## rdpla (0.1.0) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rdpla/issues 0 errors | 0 warnings | 0 notes -## readr (1.0.0) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/readr/issues +## readr (1.1.0) +Maintainer: Jim Hester +Bug reports: https://github.com/tidyverse/readr/issues 0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE - installed size is 11.7Mb + installed size is 12.5Mb sub-directories of 1Mb or more: - libs 11.1Mb + libs 11.9Mb ``` ## refimpact (0.1.0) @@ -669,13 +1074,13 @@ Bug reports: https://github.com/gschofl/reutils/issues 0 errors | 0 warnings | 0 notes -## rgbif (0.9.6) +## rgbif (0.9.7) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rgbif/issues 0 errors | 0 warnings | 0 notes -## rgho (1.0.0) +## rgho (1.0.1) Maintainer: Antoine Filipovic-Pierucci Bug reports: https://github.com/pierucci/rgho/issues @@ -687,13 +1092,19 @@ Bug reports: http://github.com/ropenscilabs/riem/issues 0 errors | 0 warnings | 0 notes +## rif (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rif/issues + +0 errors | 0 warnings | 0 notes + ## ritis (0.5.4) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/ritis/issues 0 errors | 0 warnings | 0 notes -## rmarkdown (1.3) +## rmarkdown (1.4) Maintainer: JJ Allaire 0 errors | 0 warnings | 1 note @@ -723,60 +1134,43 @@ Bug reports: https://github.com/poissonconsulting/rtide/issues 0 errors | 0 warnings | 0 notes -## sf (0.2-8) +## sf (0.4-1) Maintainer: Edzer Pebesma Bug reports: https://github.com/edzer/sfr/issues/ -1 error | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` -checking tests ... ERROR -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - > test_check("sf") - 1. Error: st_transform works (@test_gdal.R#11) --------------------------------- - package rgdal is required for spTransform methods - 1: spTransform(sp, CRS(toCrs)) at testthat/test_gdal.R:11 - 2: spTransform(sp, CRS(toCrs)) at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:93 - 3: stop("package rgdal is required for spTransform methods") at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:97 - - testthat results ================================================================ - OK: 190 SKIPPED: 0 FAILED: 1 - 1. Error: st_transform works (@test_gdal.R#11) - - Error: testthat unit tests failed - Execution halted - checking installed package size ... NOTE - installed size is 8.5Mb + installed size is 10.2Mb sub-directories of 1Mb or more: doc 4.0Mb - libs 3.7Mb + libs 4.2Mb ``` -## sjmisc (2.2.1) +## sjmisc (2.3.1) Maintainer: Daniel Lüdecke Bug reports: https://github.com/sjPlot/sjmisc/issues 0 errors | 0 warnings | 0 notes -## sjPlot (2.2.0) +## sjPlot (2.3.1) Maintainer: Daniel Lüdecke Bug reports: https://github.com/sjPlot/devel/issues +0 errors | 0 warnings | 0 notes + +## sjstats (0.9.0) +Maintainer: Daniel Lüdecke +Bug reports: https://github.com/sjPlot/sjstats/issues + 0 errors | 0 warnings | 1 note ``` checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘plm’ +Package unavailable to check Rd xrefs: ‘piecewiseSEM’ ``` -## sjstats (0.7.1) -Maintainer: Daniel Lüdecke -Bug reports: https://github.com/sjPlot/sjstats/issues - -0 errors | 0 warnings | 0 notes - ## solrium (0.4.0) Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropensci/solrium/issues @@ -807,66 +1201,53 @@ Bug reports: https://github.com/gergness/srvyr/issues 0 errors | 0 warnings | 0 notes -## taxize (0.8.0) +## taxize (0.8.4) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/taxize/issues 0 errors | 0 warnings | 0 notes -## tidyquant (0.2.0) -Maintainer: Matt Dancho +## tidyquant (0.4.0) +Maintainer: Matt Dancho Bug reports: https://github.com/mdancho84/tidyquant/issues -1 error | 0 warnings | 0 notes - -``` -checking tests ... ERROR -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - AAPL %>% tq_mutate_(ohlc_fun = "close", mutate_fun = mutate_fun) - }, paste0("fun = ", mutate_fun, " not a valid option.")) at testthat/test_tq_transform.R:118 - 2: paste0("fun = ", mutate_fun, " not a valid option.") at /tmp/RtmpGs2f8Q/devtools11166987ba25/hadley-testthat-3b2f225/R/expect-output.R:147 - - testthat results ================================================================ - OK: 133 SKIPPED: 1 FAILED: 4 - 1. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#133) - 2. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#151) - 3. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#100) - 4. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#118) - - Error: testthat unit tests failed - Execution halted -``` +0 errors | 0 warnings | 0 notes -## tidyr (0.6.0) +## tidyr (0.6.1) Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/tidyr/issues +Bug reports: https://github.com/tidyverse/tidyr/issues 0 errors | 0 warnings | 0 notes -## tidyverse (1.0.0) +## tidyverse (1.1.1) Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/tidyverse/issues +Bug reports: https://github.com/tidyverse/tidyverse/issues 0 errors | 0 warnings | 0 notes -## units (0.4-1) +## units (0.4-3) Maintainer: Edzer Pebesma Bug reports: https://github.com/edzer/units/issues/ 0 errors | 0 warnings | 0 notes -## valr (0.1.1) +## unpivotr (0.1.0) +Maintainer: Duncan Garmonsway +Bug reports: https://github.com/nacnudus/unpivotr/issues + +0 errors | 0 warnings | 0 notes + +## valr (0.1.2) Maintainer: Jay Hesselberth -Bug reports: https://github.com/jayhesselberth/valr/issues +Bug reports: https://github.com/rnabioco/valr/issues 0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE - installed size is 12.4Mb + installed size is 12.5Mb sub-directories of 1Mb or more: - libs 11.4Mb + libs 11.5Mb ``` ## wand (0.2.0) @@ -875,3 +1256,9 @@ Bug reports: https://github.com/hrbrmstr/wand/issues 0 errors | 0 warnings | 0 notes +## worrms (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/worrms/issues + +0 errors | 0 warnings | 0 notes + diff --git a/revdep/README.md b/revdep/README.md index 9e01aeb10..c6aada28d 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -4,131 +4,166 @@ |setting |value | |:--------|:----------------------------| -|version |R version 3.3.2 (2016-10-31) | +|version |R version 3.3.3 (2017-03-06) | |system |x86_64, linux-gnu | |ui |X11 | |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-01-10 | +|date |2017-03-29 | ## Packages |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| |assertthat | |0.1 |2013-12-06 |cran (@0.1) | -|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | -|nycflights13 | |0.2.1 |2016-12-30 |cran (@0.2.1) | -|Rcpp | |0.12.8 |2016-11-17 |cran (@0.12.8) | +|nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | +|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | |rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | -|testthat | |1.0.2.9000 |2016-12-24 |Github (hadley/testthat@3b2f225) | +|testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | # Check results -88 packages +118 packages |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |abjutils |0.0.1 | 0| 0| 0| -|biomartr |0.2.1 | 0| 0| 0| +|anomalyDetection |0.1.0 | 0| 0| 0| +|biomartr |0.4.0 | 0| 0| 0| |blkbox |1.0 | 0| 0| 2| |blob |1.0.0 | 0| 0| 0| |blockTools |0.6-3 | 0| 0| 0| |bold |0.4.0 | 0| 0| 1| |bsam |1.1.1 | 0| 0| 0| +|ccafs |0.1.0 | 0| 0| 0| +|cdata |0.1.0 | 0| 0| 0| |cellranger |1.1.0 | 0| 0| 0| |checkmate |1.8.2 | 0| 0| 0| |corrr |0.2.1 | 0| 0| 0| |countyweather |0.1.0 | 0| 0| 0| -|datapasta |1.1.0 | 0| 0| 0| +|cpr |0.2.3 | 0| 0| 0| +|datapasta |2.0.0 | 0| 0| 0| |datastepr |0.0.2 | 0| 0| 0| |dat |0.1.0 | 1| 0| 0| |DiagrammeR |0.9.0 | 0| 0| 1| -|docxtools |0.1.0 | 0| 0| 0| +|doctr |0.2.0 | 0| 0| 0| |docxtractr |0.2.0 | 0| 0| 0| |dotwhisker |0.2.3 | 0| 0| 0| |dplyr |0.5.0 | 0| 0| 1| |easyformatr |0.1.2 | 0| 0| 0| -|eurostat |2.2.1 | 0| 0| 0| -|fbar |0.1.16 | 0| 0| 1| +|ecoseries |0.1.1 | 0| 0| 0| +|enigma |0.3.0 | 0| 0| 0| +|eurostat |3.1.1 | 0| 0| 0| +|evaluator |0.1.0 | 0| 0| 0| +|fbar |0.1.23 | 0| 0| 0| |feather |0.3.1 | 0| 0| 0| -|forcats |0.1.1 | 0| 0| 0| -|geojson |0.1.0 | 0| 0| 0| +|fileplyr |0.2.0 | 0| 0| 0| +|filesstrings |0.3.2 | 0| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|foghorn |0.4.2 | 0| 0| 0| +|forcats |0.2.0 | 0| 0| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|geojson |0.1.2 | 0| 0| 0| |getlandsat |0.1.0 | 0| 0| 0| +|ggalt |0.4.0 | 0| 0| 0| |ggenealogy |0.3.0 | 0| 0| 0| -|ggfortify |0.3.0.0 | 0| 0| 1| +|ggfortify |0.4.1 | 0| 0| 1| |ggguitar |0.1.1 | 0| 0| 0| +|ggimage |0.0.4 | 1| 0| 0| |ggplot2 |2.2.1 | 0| 0| 0| -|ggpmisc |0.2.13 | 0| 0| 0| -|haven |1.0.0 | 0| 0| 1| -|heemod |0.7.1 | 0| 0| 0| -|highcharter |0.4.0 | 0| 1| 0| +|ggpmisc |0.2.14 | 0| 0| 0| +|giphyr |0.1.0 | 0| 0| 0| +|gitlabr |0.7 | 0| 0| 0| +|GSODR |1.0.1 | 0| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| |hypoparsr |0.1.0 | 0| 0| 0| -|isdparser |0.1.0 | 0| 0| 0| -|jpmesh |0.3.0 | 1| 0| 0| +|inferr |0.1.0 | 0| 0| 0| +|isdparser |0.2.0 | 0| 0| 0| +|jpmesh |0.3.0 | 0| 0| 1| |knitr |1.15.1 | 0| 0| 0| -|KraljicMatrix |0.1.0 | 0| 0| 0| +|KraljicMatrix |0.1.1 | 0| 0| 0| |manifestoR |1.2.3 | 0| 0| 0| -|modelr |0.1.0 | 0| 0| 1| +|modelr |0.1.0 | 0| 0| 0| +|modeval |0.1.2 | 0| 0| 0| |monkeylearn |0.1.1 | 0| 0| 0| |mregions |0.1.4 | 0| 0| 0| -|msgtools |0.2.4 | 0| 0| 0| +|mrgsolve |0.8.6 | 0| 0| 1| +|msgtools |0.2.7 | 0| 0| 0| +|myTAI |0.5.0 | 0| 0| 1| |natserv |0.1.4 | 0| 0| 0| -|nycflights13 |0.2.1 | 0| 0| 1| +|nycflights13 |0.2.2 | 0| 0| 1| |oai |0.2.2 | 0| 0| 0| +|observer |0.1.2 | 0| 0| 1| +|odbc |1.0.1 | 0| 0| 0| +|officer |0.1.1 | 2| 1| 0| |openadds |0.2.0 | 0| 0| 0| -|pangaear |0.2.4 | 0| 0| 0| +|pangaear |0.3.0 | 0| 0| 0| |pdfsearch |0.1.1 | 0| 0| 0| -|photobiologyInOut |0.4.12 | 1| 0| 0| -|photobiology |0.9.13 | 0| 0| 0| -|phylopath |0.2.2 | 0| 0| 0| +|photobiologyInOut |0.4.13 | 1| 0| 0| +|photobiology |0.9.14 | 0| 0| 0| +|phylopath |0.2.3 | 0| 0| 0| |plotly |4.5.6 | 1| 0| 0| -|poio |0.0-2 | 0| 0| 1| -|pollstR |1.4.0 | 0| 0| 0| +|poio |0.0-3 | 0| 0| 0| +|prcr |0.1.1 | 0| 0| 0| |radiant.data |0.6.0 | 0| 0| 0| |randNames |0.2.3 | 0| 0| 0| -|rbgm |0.0.4 | 0| 1| 0| +|rbcb |0.1.0 | 0| 0| 0| +|rbgm |0.0.4 | 0| 0| 0| |rbhl |0.3.0 | 0| 0| 0| +|rdefra |0.3.4 | 0| 0| 0| |rdpla |0.1.0 | 0| 0| 0| -|readr |1.0.0 | 0| 0| 1| +|readr |1.1.0 | 0| 0| 1| |refimpact |0.1.0 | 0| 0| 0| |reutils |0.2.3 | 0| 0| 0| -|rgbif |0.9.6 | 0| 0| 0| -|rgho |1.0.0 | 0| 0| 0| +|rgbif |0.9.7 | 0| 0| 0| +|rgho |1.0.1 | 0| 0| 0| |riem |0.1.1 | 0| 0| 0| +|rif |0.1.0 | 0| 0| 0| |ritis |0.5.4 | 0| 0| 0| -|rmarkdown |1.3 | 0| 0| 1| +|rmarkdown |1.4 | 0| 0| 1| |rnoaa |0.6.6 | 0| 0| 0| |rorcid |0.3.0 | 0| 0| 0| |rtide |0.0.3 | 0| 0| 0| -|sf |0.2-8 | 1| 0| 1| -|sjmisc |2.2.1 | 0| 0| 0| -|sjPlot |2.2.0 | 0| 0| 1| -|sjstats |0.7.1 | 0| 0| 0| +|sf |0.4-1 | 0| 0| 1| +|sjmisc |2.3.1 | 0| 0| 0| +|sjPlot |2.3.1 | 0| 0| 0| +|sjstats |0.9.0 | 0| 0| 1| |solrium |0.4.0 | 0| 0| 0| |spbabel |0.4.5 | 0| 0| 0| |spdplyr |0.1.2 | 0| 0| 0| |spocc |0.6.0 | 0| 0| 0| |srvyr |0.2.0 | 0| 0| 0| -|taxize |0.8.0 | 0| 0| 0| -|tidyquant |0.2.0 | 1| 0| 0| +|taxize |0.8.4 | 0| 0| 0| +|tidyquant |0.4.0 | 0| 0| 0| |tidyr |0.6.1 | 0| 0| 0| -|tidyverse |1.0.0 | 0| 0| 0| -|units |0.4-1 | 0| 0| 0| -|valr |0.1.1 | 0| 0| 1| +|tidyverse |1.1.1 | 0| 0| 0| +|units |0.4-3 | 0| 0| 0| +|unpivotr |0.1.0 | 0| 0| 0| +|valr |0.1.2 | 0| 0| 1| |wand |0.2.0 | 0| 0| 0| +|worrms |0.1.0 | 0| 0| 0| ## abjutils (0.0.1) Maintainer: Fernando Correa 0 errors | 0 warnings | 0 notes -## biomartr (0.2.1) +## anomalyDetection (0.1.0) +Maintainer: Bradley Boehmke +Bug reports: https://github.com/bradleyboehmke/anomalyDetection/issues + +0 errors | 0 warnings | 0 notes + +## biomartr (0.4.0) Maintainer: Hajk-Georg Drost Bug reports: https://github.com/HajkD/biomartr/issues @@ -175,6 +210,18 @@ Bug reports: https://github.com/ianjonsen/bsam/issues 0 errors | 0 warnings | 0 notes +## ccafs (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/ccafs/issues + +0 errors | 0 warnings | 0 notes + +## cdata (0.1.0) +Maintainer: John Mount +Bug reports: https://github.com/WinVector/cdata/issues + +0 errors | 0 warnings | 0 notes + ## cellranger (1.1.0) Maintainer: Jennifer Bryan Bug reports: https://github.com/rsheets/cellranger/issues @@ -198,7 +245,12 @@ Maintainer: Rachel Severson 0 errors | 0 warnings | 0 notes -## datapasta (1.1.0) +## cpr (0.2.3) +Maintainer: Peter DeWitt + +0 errors | 0 warnings | 0 notes + +## datapasta (2.0.0) Maintainer: Miles McBain Bug reports: https://github.com/milesmcbain/datapasta/issues @@ -218,8 +270,11 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR + Running ‘testthat.R’ [10s/10s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + ^ + tests/testthat/test-trunc-mat.R:5:3: style: Variable and function names should not be longer than 25 characters. print_arg_names_without_ellipsis <- setdiff(print_arg_names, "...") ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ tests/testthat/test-trunc-mat.R:9:16: style: Variable and function names should not be longer than 25 characters. @@ -250,8 +305,8 @@ checking installed package size ... NOTE img 2.8Mb ``` -## docxtools (0.1.0) -Maintainer: Richard Layton +## doctr (0.2.0) +Maintainer: Caio Lente 0 errors | 0 warnings | 0 notes @@ -274,9 +329,9 @@ Bug reports: https://github.com/hadley/dplyr/issues ``` checking installed package size ... NOTE - installed size is 23.4Mb + installed size is 23.5Mb sub-directories of 1Mb or more: - libs 21.3Mb + libs 21.4Mb ``` ## easyformatr (0.1.2) @@ -285,22 +340,34 @@ Bug reports: https://github.com/bramtayl/easyformatr/issues 0 errors | 0 warnings | 0 notes -## eurostat (2.2.1) -Maintainer: Lahti Leo +## ecoseries (0.1.1) +Maintainer: Fernando Teixeira +Bug reports: https://github.com/fernote7/ecoseries/issues + +0 errors | 0 warnings | 0 notes + +## enigma (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropengov/enigma/issues + +0 errors | 0 warnings | 0 notes + +## eurostat (3.1.1) +Maintainer: Leo Lahti Bug reports: https://github.com/ropengov/eurostat/issues 0 errors | 0 warnings | 0 notes -## fbar (0.1.16) -Maintainer: Max Conway +## evaluator (0.1.0) +Maintainer: David Severski +Bug reports: https://github.com/davidski/evaluator/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 0 notes -``` -checking package dependencies ... NOTE -Packages suggested but not available for checking: - ‘Rglpk’ ‘ROI.plugin.glpk’ -``` +## fbar (0.1.23) +Maintainer: Max Conway + +0 errors | 0 warnings | 0 notes ## feather (0.3.1) Maintainer: Hadley Wickham @@ -308,13 +375,103 @@ Bug reports: https://github.com/wesm/feather/issues 0 errors | 0 warnings | 0 notes -## forcats (0.1.1) +## fileplyr (0.2.0) +Maintainer: KS Srikanth +Bug reports: https://github.com/talegari/fileplyr/issues + +0 errors | 0 warnings | 0 notes + +## filesstrings (0.3.2) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/filesstrings/issues + +0 errors | 0 warnings | 0 notes + +## flextable (0.1.0) +Maintainer: David Gohel + +0 errors | 1 warning | 0 notes + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Loading required package: officer + +Attaching package: 'dplyr' + +The following objects are masked from 'package:stats': + + filter, lag + +The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + +PhantomJS not found. You can install it with webshot::install_phantomjs(). If it is installed, please make sure the phantomjs executable can be found via the PATH variable. +Quitting from lines 39-41 (format.Rmd) +Error: processing vignette 'format.Rmd' failed with diagnostics: +cannot open the connection +Execution halted + +``` + +## foghorn (0.4.2) +Maintainer: Francois Michonneau +Bug reports: https://github.com/fmichonneau/foghorn/issues + +0 errors | 0 warnings | 0 notes + +## forcats (0.2.0) Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/forcats/issues +Bug reports: https://github.com/tidyverse/forcats/issues 0 errors | 0 warnings | 0 notes -## geojson (0.1.0) +## FSelectorRcpp (0.1.2) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues + +1 error | 0 warnings | 2 notes + +``` +checking examples ... ERROR +Running examples in ‘FSelectorRcpp-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: feature_search +> ### Title: General Feature Searching Engine +> ### Aliases: feature_search +> +> ### ** Examples +> +> +> # Enable parallelization in examples +> library(doSNOW) # doSNOW has an option for progress bar +Loading required package: foreach +Loading required package: iterators +Loading required package: snow +> cl <- makeCluster(2) +Loading required namespace: Rmpi +Error in Rmpi::mpi.comm.spawn(slave = mpitask, slavearg = args, nslaves = count, : + MPI_Comm_spawn is not supported. +Calls: makeCluster -> makeMPIcluster -> +Execution halted + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ + +checking installed package size ... NOTE + installed size is 9.7Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 7.3Mb +``` + +## geojson (0.1.2) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/geojson/issues @@ -326,12 +483,18 @@ Bug reports: https://github.com/ropenscilabs/getlandsat/issues 0 errors | 0 warnings | 0 notes +## ggalt (0.4.0) +Maintainer: Bob Rudis +Bug reports: https://github.com/hrbrmstr/ggalt/issues + +0 errors | 0 warnings | 0 notes + ## ggenealogy (0.3.0) Maintainer: Lindsay Rutter 0 errors | 0 warnings | 0 notes -## ggfortify (0.3.0.0) +## ggfortify (0.4.1) Maintainer: Masaaki Horikoshi Bug reports: https://github.com/sinhrks/ggfortify/issues @@ -350,40 +513,191 @@ Bug reports: https://github.com/ezgraphs/ggguitar/issues 0 errors | 0 warnings | 0 notes +## ggimage (0.0.4) +Maintainer: Guangchuang Yu +Bug reports: https://github.com/GuangchuangYu/ggimage/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: ‘EBImage’ ‘gridGraphics’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + ## ggplot2 (2.2.1) Maintainer: Hadley Wickham Bug reports: https://github.com/tidyverse/ggplot2/issues 0 errors | 0 warnings | 0 notes -## ggpmisc (0.2.13) +## ggpmisc (0.2.14) Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/ggpmisc/issues 0 errors | 0 warnings | 0 notes +## giphyr (0.1.0) +Maintainer: Hao Zhu +Bug reports: https://github.com/haozhu233/giphyr/issues + +0 errors | 0 warnings | 0 notes + +## gitlabr (0.7) +Maintainer: Jirka Lewandowski +Bug reports: http://gitlab.points-of-interest.cc/points-of-interest/gitlabr/issues/ + +0 errors | 0 warnings | 0 notes + +## GSODR (1.0.1) +Maintainer: Adam Sparks +Bug reports: https://github.com/ropensci/GSODR/issues + +0 errors | 0 warnings | 0 notes + ## haven (1.0.0) Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/haven/issues -0 errors | 0 warnings | 1 note +2 errors | 0 warnings | 1 note ``` +checking examples ... ERROR +Running examples in ‘haven-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: read_dta +> ### Title: Read and write Stata DTA files. +> ### Aliases: read_dta read_stata write_dta +> +> ### ** Examples +... 14 lines ... +8 5.0 3.4 1.5 0.2 setosa +9 4.4 2.9 1.4 0.2 setosa +10 4.9 3.1 1.5 0.1 setosa +# ... with 140 more rows +> +> tmp <- tempfile(fileext = ".dta") +> write_dta(mtcars, tmp) +Error in write_dta_(data, normalizePath(path, mustWork = FALSE), version = stata_file_format(version)) : + Writing failure: Unable to write data. +Calls: write_dta -> write_dta_ -> .Call +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + + testthat results ================================================================ + OK: 132 SKIPPED: 0 FAILED: 9 + 1. Error: can roundtrip basic types (@test-write-dta.R#5) + 2. Error: can roundtrip missing values (as much as possible) (@test-write-dta.R#12) + 3. Error: can roundtrip date times (@test-write-dta.R#23) + 4. Error: infinity gets converted to NA (@test-write-dta.R#28) + 5. Error: factors become labelleds (@test-write-dta.R#33) + 6. Error: labels are preserved (@test-write-dta.R#44) + 7. Error: labelleds are round tripped (@test-write-dta.R#52) + 8. Error: factors become labelleds (@test-write-dta.R#59) + 9. Error: labels are converted to utf-8 (@test-write-dta.R#73) + + Error: testthat unit tests failed + Execution halted + checking for GNU extensions in Makefiles ... NOTE GNU make is a SystemRequirements. ``` -## heemod (0.7.1) +## hddtools (0.6) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/hddtools/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [14s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", + sQuote(fdef@generic), sQuote(cnames)), domain = NA) + + trying URL 'ftp://ftp.bafg.de/pub/REFERATE/GRDC/ltdata/africa.zip' + ftp data connection made, file length 2730333 bytes + ================================================== + downloaded 2.6 MB + + testthat results ================================================================ + OK: 55 SKIPPED: 1 FAILED: 2 + 1. Error: Test TRMM function using dates in the past (@test-TRMM.R#15) + 2. Error: Test TRMM function using 3-hourly dates in the past (@test-TRMM.R#58) + + Error: testthat unit tests failed + Execution halted +``` + +## heemod (0.8.0) Maintainer: Antoine Filipovic-Pierucci Bug reports: https://github.com/pierucci/heemod/issues -0 errors | 0 warnings | 0 notes +1 error | 1 warning | 1 note + +``` +checking tests ... ERROR + Running ‘testthat.R’ [33s/36s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) + 6: flexsurv::summary.flexsurvreg + 7: getExportedValue(pkg, name) + 8: stop(gettextf("'%s' is not an exported object from 'namespace:%s'", name, getNamespaceName(ns)), + call. = FALSE, domain = NA) + + .model from to prob + 1 standard RevisionTHR SuccessfulRevision + 2 new RevisionTHR SuccessfulRevision + testthat results ================================================================ + OK: 346 SKIPPED: 0 FAILED: 1 + 1. Error: (unknown) (@test_survival.R#23) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +'colour', which will replace the existing scale. +Scale for 'colour' is already present. Adding another scale for +'colour', which will replace the existing scale. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +... 8 lines ... + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Error in mutate_impl(.data, dots) : + 'summary.flexsurvreg' is not an exported object from 'namespace:flexsurv' +Quitting from lines 42-83 (j-survival.Rmd) +Error: processing vignette 'j-survival.Rmd' failed with diagnostics: +Error in parameter: p2. +Execution halted -## highcharter (0.4.0) +checking dependencies in R code ... NOTE +Missing or unexported object: ‘flexsurv::summary.flexsurvreg’ +``` + +## highcharter (0.5.0) Maintainer: Joshua Kunst Bug reports: https://github.com/jbkunst/highcharter/issues -0 errors | 1 warning | 0 notes +0 errors | 1 warning | 1 note ``` checking re-building of vignette outputs ... WARNING @@ -391,11 +705,19 @@ Error in re-building vignettes: ... Warning in engine$weave(file, quiet = quiet, encoding = enc) : Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Quitting from lines 58-81 (replicating-highcharts-demos.Rmd) -Error: processing vignette 'replicating-highcharts-demos.Rmd' failed with diagnostics: +Highcharts (www.highcharts.com) is a Highsoft software product which is +not free for commercial and Governmental use +Quitting from lines 45-46 (charting-data-frames.Rmd) +Error: processing vignette 'charting-data-frames.Rmd' failed with diagnostics: cannot open the connection Execution halted + +checking installed package size ... NOTE + installed size is 16.5Mb + sub-directories of 1Mb or more: + doc 13.7Mb + htmlwidgets 1.9Mb ``` ## hypoparsr (0.1.0) @@ -403,9 +725,15 @@ Maintainer: Hannes Muehleisen 0 errors | 0 warnings | 0 notes -## isdparser (0.1.0) +## inferr (0.1.0) +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: http://www.github.com/ropenscilabs/isdparser/issues +Bug reports: https://github.com/ropensci/isdparser/issues 0 errors | 0 warnings | 0 notes @@ -413,12 +741,13 @@ Bug reports: http://www.github.com/ropenscilabs/isdparser/issues Maintainer: Shinya Uryu Bug reports: https://github.com/uribo/jpmesh/issues -1 error | 0 warnings | 0 notes +0 errors | 0 warnings | 1 note ``` -checking whether package ‘jpmesh’ can be installed ... ERROR -Installation failed. -See ‘/home/muelleki/git/R/tibble/revdep/checks/jpmesh.Rcheck/00install.out’ for details. +checking installed package size ... NOTE + installed size is 206.0Mb + sub-directories of 1Mb or more: + extdata 205.2Mb ``` ## knitr (1.15.1) @@ -427,7 +756,7 @@ Bug reports: https://github.com/yihui/knitr/issues 0 errors | 0 warnings | 0 notes -## KraljicMatrix (0.1.0) +## KraljicMatrix (0.1.1) Maintainer: Bradley Boehmke Bug reports: https://github.com/bradleyboehmke/KraljicMatrix/issues @@ -443,12 +772,12 @@ Bug reports: https://github.com/ManifestoProject/manifestoR/issues Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/modelr/issues -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 0 notes -``` -checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘rstanarm’ -``` +## modeval (0.1.2) +Maintainer: Younggun You + +0 errors | 0 warnings | 0 notes ## monkeylearn (0.1.1) Maintainer: Maëlle Salmon @@ -462,19 +791,46 @@ Bug reports: https://github.com/ropenscilabs/mregions/issues 0 errors | 0 warnings | 0 notes -## msgtools (0.2.4) +## mrgsolve (0.8.6) +Maintainer: Kyle T Baron +Bug reports: https://github.com/metrumresearchgroup/mrgsolve/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 6.2Mb + sub-directories of 1Mb or more: + libs 5.0Mb +``` + +## msgtools (0.2.7) Maintainer: Thomas J. Leeper Bug reports: https://github.com/RL10N/msgtools/issues 0 errors | 0 warnings | 0 notes +## myTAI (0.5.0) +Maintainer: Hajk-Georg Drost +Bug reports: https://github.com/HajkD/myTAI/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 5.3Mb + sub-directories of 1Mb or more: + data 2.0Mb + doc 2.3Mb +``` + ## natserv (0.1.4) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/natserv/issues 0 errors | 0 warnings | 0 notes -## nycflights13 (0.2.1) +## nycflights13 (0.2.2) Maintainer: Hadley Wickham Bug reports: https://github.com/hadley/nycflights13/issues @@ -493,13 +849,88 @@ Bug reports: https://github.com/ropensci/oai/issues 0 errors | 0 warnings | 0 notes +## observer (0.1.2) +Maintainer: Paul Poncet +Bug reports: https://github.com/paulponcet/observer/issues + +0 errors | 0 warnings | 1 note + +``` +checking Rd cross-references ... NOTE +Package unavailable to check Rd xrefs: ‘validate’ +``` + +## odbc (1.0.1) +Maintainer: Jim Hester +Bug reports: https://github.com/rstats-db/odbc/issues + +0 errors | 0 warnings | 0 notes + +## officer (0.1.1) +Maintainer: David Gohel +Bug reports: https://github.com/davidgohel/officer/issues + +2 errors | 1 warning | 0 notes + +``` +checking examples ... ERROR +Running examples in ‘officer-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: slip_in_img +> ### Title: append an image +> ### Aliases: slip_in_img +> +> ### ** Examples +> +> library(magrittr) +> img.file <- file.path( Sys.getenv("R_HOME"), "doc", "html", "logo.jpg" ) +> x <- read_docx() %>% ++ body_add_par("R logo: ", style = "Normal") %>% ++ slip_in_img(src = img.file, style = "strong", width = .3, height = .3) +Error: file.exists(src) is not TRUE +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ [21s/21s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) + 10: external_img(src, width = width, height = height) + 11: stopifnot(file.exists(src)) + 12: stop(sprintf(ngettext(length(r), "%s is not TRUE", "%s are not all TRUE"), ch), call. = FALSE, + domain = NA) + + testthat results ================================================================ + OK: 317 SKIPPED: 0 FAILED: 4 + 1. Error: image add (@test-docx-add.R#68) + 2. Error: pml fp_border (@test-fp_cell.R#75) + 3. Error: css fp_border (@test-fp_cell.R#165) + 4. Error: add img into placeholder (@test-pptx-add.R#67) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Quitting from lines 181-191 (powerpoint.Rmd) +Error: processing vignette 'powerpoint.Rmd' failed with diagnostics: +file.exists(src) is not TRUE +Execution halted + +``` + ## openadds (0.2.0) Maintainer: Scott Chamberlain Bug reports: https://github.com/sckott/openadds/issues 0 errors | 0 warnings | 0 notes -## pangaear (0.2.4) +## pangaear (0.3.0) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/pangaear/issues @@ -511,38 +942,27 @@ Bug reports: https://github.com/lebebr01/pdfsearch/issues 0 errors | 0 warnings | 0 notes -## photobiologyInOut (0.4.12) +## photobiologyInOut (0.4.13) Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/ +Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ 1 error | 0 warnings | 0 notes ``` -checking tests ... ERROR -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - as.numeric(getWhenMeasured(ss.spct), tz = "CET") not equal to as.numeric(ymd_hms("2013-05-06 15:13:40", tz = "CET"), tz = "CET"). - 1/1 mismatches - [1] 1.37e+09 - 1.37e+09 == 3450400 - - - Read 4 items - testthat results ================================================================ - OK: 214 SKIPPED: 0 FAILED: 2 - 1. Failure: SpectraSuite (@test-oo.R#76) - 2. Failure: SpectraSuite (@test-oo.R#158) - - Error: testthat unit tests failed - Execution halted +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘photobiology’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. ``` -## photobiology (0.9.13) +## photobiology (0.9.14) Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/photobiology/issues 0 errors | 0 warnings | 0 notes -## phylopath (0.2.2) +## phylopath (0.2.3) Maintainer: Wouter van der Bijl Bug reports: https://github.com/Ax3man/phylopath/issues @@ -556,8 +976,11 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR + Running ‘testthat.R’ [46s/47s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + [1] "Running test: plotly-group-within-trace" + [1] "Running test: plotly-alpha-blending" [1] "Running test: plotly-alpha-no-color" [1] "Running test: plotly-factor-axis" [1] "Running test: plotly-character-axis" @@ -566,27 +989,21 @@ Last 13 lines of output: [1] "Running test: plotly-inherit-FALSE" [1] "Running test: plotly-time-series-summary" testthat results ================================================================ - OK: 808 SKIPPED: 17 FAILED: 1 + OK: 813 SKIPPED: 17 FAILED: 1 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) Error: testthat unit tests failed Execution halted ``` -## poio (0.0-2) +## poio (0.0-3) Maintainer: Richard Cotton Bug reports: https://github.com/RL10N/poio/issues -0 errors | 0 warnings | 1 note - -``` -checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘ISOcodes’ -``` +0 errors | 0 warnings | 0 notes -## pollstR (1.4.0) -Maintainer: Jeffrey B. Arnold -Bug reports: https://github.com/rOpenGov/pollstR/issues +## prcr (0.1.1) +Maintainer: Joshua Rosenberg 0 errors | 0 warnings | 0 notes @@ -602,36 +1019,17 @@ Bug reports: https://github.com/karthik/randNames/issues 0 errors | 0 warnings | 0 notes +## rbcb (0.1.0) +Maintainer: Wilson Freitas +Bug reports: https://github.com/wilsonfreitas/rbcb/issues + +0 errors | 0 warnings | 0 notes + ## rbgm (0.0.4) Maintainer: Michael D. Sumner Bug reports: https://github.com/AustralianAntarcticDivision/rbgm/issues/ -0 errors | 1 warning | 0 notes - -``` -checking re-building of vignette outputs ... WARNING -Error in re-building vignettes: - ... -Warning in engine$weave(file, quiet = quiet, encoding = enc) : - Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Loading required package: sp - -Attaching package: 'dplyr' - -The following objects are masked from 'package:raster': -... 8 lines ... -The following objects are masked from 'package:base': - - intersect, setdiff, setequal, union - -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/rgdal/libs/rgdal.so': - libgdal.so.1: cannot open shared object file: No such file or directory -Quitting from lines 16-24 (BGM_Spatial.Rmd) -Error: processing vignette 'BGM_Spatial.Rmd' failed with diagnostics: -package or namespace load failed for 'rgdal' -Execution halted -``` +0 errors | 0 warnings | 0 notes ## rbhl (0.3.0) Maintainer: Scott Chamberlain @@ -639,23 +1037,29 @@ Bug reports: https://github.com/ropensci/rbhl/issues 0 errors | 0 warnings | 0 notes +## rdefra (0.3.4) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/rdefra/issues + +0 errors | 0 warnings | 0 notes + ## rdpla (0.1.0) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rdpla/issues 0 errors | 0 warnings | 0 notes -## readr (1.0.0) -Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/readr/issues +## readr (1.1.0) +Maintainer: Jim Hester +Bug reports: https://github.com/tidyverse/readr/issues 0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE - installed size is 11.7Mb + installed size is 12.5Mb sub-directories of 1Mb or more: - libs 11.1Mb + libs 11.9Mb ``` ## refimpact (0.1.0) @@ -670,13 +1074,13 @@ Bug reports: https://github.com/gschofl/reutils/issues 0 errors | 0 warnings | 0 notes -## rgbif (0.9.6) +## rgbif (0.9.7) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/rgbif/issues 0 errors | 0 warnings | 0 notes -## rgho (1.0.0) +## rgho (1.0.1) Maintainer: Antoine Filipovic-Pierucci Bug reports: https://github.com/pierucci/rgho/issues @@ -688,13 +1092,19 @@ Bug reports: http://github.com/ropenscilabs/riem/issues 0 errors | 0 warnings | 0 notes +## rif (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rif/issues + +0 errors | 0 warnings | 0 notes + ## ritis (0.5.4) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/ritis/issues 0 errors | 0 warnings | 0 notes -## rmarkdown (1.3) +## rmarkdown (1.4) Maintainer: JJ Allaire 0 errors | 0 warnings | 1 note @@ -724,60 +1134,43 @@ Bug reports: https://github.com/poissonconsulting/rtide/issues 0 errors | 0 warnings | 0 notes -## sf (0.2-8) +## sf (0.4-1) Maintainer: Edzer Pebesma Bug reports: https://github.com/edzer/sfr/issues/ -1 error | 0 warnings | 1 note +0 errors | 0 warnings | 1 note ``` -checking tests ... ERROR -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - > test_check("sf") - 1. Error: st_transform works (@test_gdal.R#11) --------------------------------- - package rgdal is required for spTransform methods - 1: spTransform(sp, CRS(toCrs)) at testthat/test_gdal.R:11 - 2: spTransform(sp, CRS(toCrs)) at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:93 - 3: stop("package rgdal is required for spTransform methods") at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:97 - - testthat results ================================================================ - OK: 190 SKIPPED: 0 FAILED: 1 - 1. Error: st_transform works (@test_gdal.R#11) - - Error: testthat unit tests failed - Execution halted - checking installed package size ... NOTE - installed size is 8.5Mb + installed size is 10.2Mb sub-directories of 1Mb or more: doc 4.0Mb - libs 3.7Mb + libs 4.2Mb ``` -## sjmisc (2.2.1) +## sjmisc (2.3.1) Maintainer: Daniel Lüdecke Bug reports: https://github.com/sjPlot/sjmisc/issues 0 errors | 0 warnings | 0 notes -## sjPlot (2.2.0) +## sjPlot (2.3.1) Maintainer: Daniel Lüdecke Bug reports: https://github.com/sjPlot/devel/issues +0 errors | 0 warnings | 0 notes + +## sjstats (0.9.0) +Maintainer: Daniel Lüdecke +Bug reports: https://github.com/sjPlot/sjstats/issues + 0 errors | 0 warnings | 1 note ``` checking Rd cross-references ... NOTE -Package unavailable to check Rd xrefs: ‘plm’ +Package unavailable to check Rd xrefs: ‘piecewiseSEM’ ``` -## sjstats (0.7.1) -Maintainer: Daniel Lüdecke -Bug reports: https://github.com/sjPlot/sjstats/issues - -0 errors | 0 warnings | 0 notes - ## solrium (0.4.0) Maintainer: Scott Chamberlain Bug reports: http://www.github.com/ropensci/solrium/issues @@ -808,36 +1201,17 @@ Bug reports: https://github.com/gergness/srvyr/issues 0 errors | 0 warnings | 0 notes -## taxize (0.8.0) +## taxize (0.8.4) Maintainer: Scott Chamberlain Bug reports: https://github.com/ropensci/taxize/issues 0 errors | 0 warnings | 0 notes -## tidyquant (0.2.0) -Maintainer: Matt Dancho +## tidyquant (0.4.0) +Maintainer: Matt Dancho Bug reports: https://github.com/mdancho84/tidyquant/issues -1 error | 0 warnings | 0 notes - -``` -checking tests ... ERROR -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - AAPL %>% tq_mutate_(ohlc_fun = "close", mutate_fun = mutate_fun) - }, paste0("fun = ", mutate_fun, " not a valid option.")) at testthat/test_tq_transform.R:118 - 2: paste0("fun = ", mutate_fun, " not a valid option.") at /tmp/RtmpGs2f8Q/devtools11166987ba25/hadley-testthat-3b2f225/R/expect-output.R:147 - - testthat results ================================================================ - OK: 133 SKIPPED: 1 FAILED: 4 - 1. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#133) - 2. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#151) - 3. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#100) - 4. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#118) - - Error: testthat unit tests failed - Execution halted -``` +0 errors | 0 warnings | 0 notes ## tidyr (0.6.1) Maintainer: Hadley Wickham @@ -845,29 +1219,35 @@ Bug reports: https://github.com/tidyverse/tidyr/issues 0 errors | 0 warnings | 0 notes -## tidyverse (1.0.0) +## tidyverse (1.1.1) Maintainer: Hadley Wickham -Bug reports: https://github.com/hadley/tidyverse/issues +Bug reports: https://github.com/tidyverse/tidyverse/issues 0 errors | 0 warnings | 0 notes -## units (0.4-1) +## units (0.4-3) Maintainer: Edzer Pebesma Bug reports: https://github.com/edzer/units/issues/ 0 errors | 0 warnings | 0 notes -## valr (0.1.1) +## unpivotr (0.1.0) +Maintainer: Duncan Garmonsway +Bug reports: https://github.com/nacnudus/unpivotr/issues + +0 errors | 0 warnings | 0 notes + +## valr (0.1.2) Maintainer: Jay Hesselberth -Bug reports: https://github.com/jayhesselberth/valr/issues +Bug reports: https://github.com/rnabioco/valr/issues 0 errors | 0 warnings | 1 note ``` checking installed package size ... NOTE - installed size is 12.4Mb + installed size is 12.5Mb sub-directories of 1Mb or more: - libs 11.4Mb + libs 11.5Mb ``` ## wand (0.2.0) @@ -876,3 +1256,9 @@ Bug reports: https://github.com/hrbrmstr/wand/issues 0 errors | 0 warnings | 0 notes +## worrms (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/worrms/issues + +0 errors | 0 warnings | 0 notes + diff --git a/revdep/checks.rds b/revdep/checks.rds index d6a2f301bf69baf633d51f338028641cc6a13a39..28db3aca2f14fdeccd747685bd2fef107c8ca005 100644 GIT binary patch literal 11278 zcmV+pEb-GHiwFP!000001MPjyZzM;SUr&FksnL2C11zvR>v4#!Ru?5!))&d{=1@|x zyV+lAwt7fP8qHvqh{}x03^KnIk;!7U0b_2y_+}XP`n0Eo0mG*Sd@|s}T-SfV0zU1* zCm(Dq;Ny>nTB zS=(P*Std4j!{esuhEoMD{i@TMO1j+GdOlsxyUgAHa##Cu?_u-Kbn#z@_H?Za$s2X= zLV=69oGUJMn2d{GixaQK{KU6c&@vGO77dd64qYCI?9E<|*%7tl`#*BH zF1!JAb<3gRFi!okJJyFbH?2T+ddaKq=)NCcUl&-|@J2~Pyb~~)f9BPI4+eI^@0Ae` zEHU+>7hc=n$$BrfwNCOD9j&vP-d$;HU9Fw;NJm>~b|>??NgmVySxM1L9W7~tg^q>= z@3z~y%!KTU%AD>Fz*n!?=>p<&DQnG6r`hdJq_iP1pR%gTtWM$-Qf?O@ccSKQv)h?0 z)19P(XWeOb*QTG|ZBM=XySkt*Y4o8vmJ+zcNm0Wlsqdu)p@Eacf0hl2`c9(X$cVL;lf6#eyLEjuWBag+ibHs;>)gq$MKdJrn}J zgI|C6!yo=%RPbW*jl_U6K#0er-3!~PFpR@b6Cp>nQgN}-ZFX6+G$1N zrzO~t!TgqPG5t`s60WozmC$Op)nCo_%&9&|rLHQlFPIGNKt?S!!OYd9UmVKa0RFK= z(7rneO(66=5y)aJO+jcOdRD-lv_SgY!k7DL#NB@W9WP`9!!#H^x+l~(LhgCYat;~U z7(@w!=)P|P54NUz&Zkq9cda1s<$4R-7CtsC(wd}gQP*>*J$}FfrU$@Ni%S`@Y5e?T zy4WnfK!&FHy8jP7{5f}gU7l{)?FyKh;;5e3T6|0o4x5h{h!pZbcrqXxmT7c*eVsZQ z)wS?&8dHq|OkpJtS_2L(Dgsdqp?8w(S?H|fp!4g8L;U&vp;JK|C7jd~G9Tab1efGd z$Xu6=xC!D&Gn1RXNyQO$)euF)q9N+)z&;#!$5W}7^5WyOQw>izz96Zg-W$4^#LYs0 z8RiAOHzMk3fD>=w||YI!UTqCx8FD|1jXD z82M*nRLsZ*Tz8M%8?54m|kY*4KT( z46X<2A+HfL9q z_^kqoAv_pGq|RFd&o;_r24u|wC$BTLV|bhloF83?#xQ=Ktcs9= zW~(Pg-+ux!>Z#{S2H@l%m=4r+-}x3rRIHZe35ryDpo_>_14*4SXhPOBG&?X8%q$I$ zpZzWT{Es(#I0G)~iIg))vm(r-(oEOsP!?n6iprZ#oHQRi{p&dmg!fJl8pTFEQM35e zvs}=CLN_2A2M+%2kGR`Bf~k!siomi|0G6-0`;{VS>1Y})Lks4ejF!%yem};{GoeLU ze`|^s=DK{y1i2?rdEPjH`*B|eG|<9oPx7v4d_-wgvE4haX*eKqJLv@KkGE0H)?RNizVE|O+i z@Mmws5QS{i6EdwGs^rWr!{;Jsgi6q4oY2=j+rtryl^J>7(@_l?j~ETC*`a4rVd>9n zPV}@28glH^6BX~jU;$_?57^fn=13a`8^K?HYPEG52bXleP!?oXzUSY}Nfz`g^uAxy zKEJumZ6?XKelMB}%25OFwLsl>yPa|r70r5p+(A;+t}QHb&H?uWX3>(@ zQ#K1HJMl8YrNeX?0bTc^b%U*)oiBD42-yi;ga$4MBz}DwE(nm{blS27|9-oW6aoDr zt^fpXTwb;&sfNHdGqi_sIy|w`&tCw+lh;j)e((*#vP|G3%Mr;pf>%bIrUw4)076nZb zvdXyL^rRnK4itCN3D z!Qb8W&f4o|kRAI>2Y$W{sXfiX47bZfz0f|qP*!Sbwlhz`ZS;S_Es4KK^2r&0pw2Ho zUniaRZL<6MlNT?x9;}l#dARxH8D4cDyQ7hZfX+}rD<%tOyV$6t(N}E_SVc#n8>>t4 zOKzbMUC-V%ba@be0TIrz%rVnL)dv=}1C}iRouh!Rpd1>ApE`=>_jfqr-5^h>>v}FO z|MTdo@311V+$l0-LLJSRto49X6NY$)?UYzEvjVfC`fg5CADqg-kP!cuRCIF}bT#O4 zBV7xY{AJFIiR4PC9FS3+wzjrCfGimfng$ojh|eQ|+}R$W$CKm1_Yez&00;E=OYUkb zijoj3aO@E`Oa`zgWJS9jr*p^5efeGO&h}ugCfKY4>WTTE-KX3m&zKtk+#S}}0~@c) zroUGVPcQQD?B=k#Ixq7_1!I_EqnH7kH_;EGYDCf`&Q{PzCso zPH)Fu`z9~9WW3a~=YRH1$jIZ6Y>Y$Jw8CbmA98O*6O(7Y=tl)3+faIT0F4-oEG`dA z7wEDAMTp7lWRL%DPUenEh)H;WJ2~rI zBZlesF7Y0p9zr>0Y6_%uXXYN`$BYZyn;9o*L7dbdnn&>t%?a9~Q4?sPYi_rg?n#C+ zq{PIV<`;n|TWWqAJQPw^>ItDUcwH7b(kZV?(>rQ0mjhuje6B{Bv)Jk7M$owlpbFcR zB0lN~oIiiYU@lIrfRhcId76!veSXNbA)iLd$0s5s6v~~UWT$45J&l&$grs>iFG*8j zr)I)QJ@L|bK##Z)yR{qwXbilEtG>agVKI8d+|w>aCZsJ4K@w8*+btQVlKg4(OfD|n znV0`%m2oOzrJnFv+@{CmzUPkUm~80kujbI>&dDAymxlv7-S=0OqMOa__x>vG<2QI$ z2(nSnet%7~`Vo_;-YO5WVp(x*SmrL*%Z)Sbznzo4_(27*)Y?(*^Iftl_#t%zi)={2 zVID+vt6YmM(oF(tGm{G58giSJ8-m_RvS%@qH#dLwH**?YD(EH&Cp87ljwi)~}dXjT%?j7B4ELa9YsAXN=2WgxJxiqZ4qe34lM^>W6T_Pq3yC)E&?a8pkd z-H0^YM;^LwN9wI+;!U55IN(;1j&glyv*Q3gUS>g%S5mi5^p}f?F8w?;B@5OZgxoe% z;Ey3W;-<@jfW>}Fk&o2Zn>){+Jb$#H{6Ns@DNmG8NVFV7>4mQ&n)*^PYWLHtDL6J(b*1) zOziANw-(#Rx(3j{B=E=%*^VOzlB15c@XVt|#4meDWAa~Bp~STL-4&eL7hK0_~b4UK%`g+vFz6)y}B z9uRbHA|p1CmKUtA#~J&6M13F|OB#7H#DZLA>j}%mw;8+Awf4G#2Fy#oO zT(j_b0~Wmj;DoA@FE;lclcU&sOI!G5$b$geK`|Y<$@T6wS30B-8Ev&4$5#^xz ztbkwB5j9?-9r9(A(toLJv%WnInr`8anr;)iN77O2;V!e)iaW-dEym7!6J=%*lwWr( z-j5gixnKO>sdmSXspH!$@9Lg-v8P#)6Z^!&n_I_uH+H45DAW-L<1O0!klAD6>3S$o zkK!(`O+4ZpB%9JV2N4M+_iCZSpWGLv~deTR8b3wgOR2XCk z_%;D)652(apnF15G(DV90<>L$CS7?#8R>c>d_UbrhkVq{?%SaR!bW##mQ1;=11%8l zI6lu5d%Rm;hhK{Y5a3=ex#g@yRj2;>Is6I+f-5t^V`RuYaV*if|;)5t|bmn7-)*@BQX&)C@9MTAC600 zZPNT%?5yM#(5+J~h9<<}*%a^9%8K`@);ozkjz?BeL?vW(}Fy zd}hoV%962l?+LyW+WO$m6x?`(-vZYqBrPoLGLWFrDjDXZ9q_@{?){x7FZP~%@f?>m z6)BIF)S$%If~(cM9kO*Cz|;c>RZR|cLuza1{}oi3Xh!`}&yV1>uZx(bZ+k(v6#FW7 z8vEUen1hTIVgJJH-?@TDF;Y*^eDs1D!Xr;Lvguo(Hj@n>6Ev#s`WCZ64?Nkof53x5 zs2{Qb&)aE5gxIJKmwGvNFn22Xs)|>c3eNtE@mpZpia4n!c>eig>XBbtA&MIBr4@F2 zy=sQglnfGmtIXZ6F-AN9n_@>4DjDS5_5=285A0l)jgE*>jd-;C#eEp2j zsVb!32quykmkuLwJ=oh+Q%$K&yLcp(L>E$(R+MqgWgZ`Rwy%m@sE$X4vbv6vrO$90pM?|LFb4LgGnYll8@eSvUFc+S$X2!Vrl+l@$sKJaxdiD=hBNN_eN_Rr7>}JZ7&1PfSa9CtkIX$4)y(nCr)qR_&yO zHSUx&kj2Cu)C1;&qh15PBG8Z-;jp7Af*H0$F?MIF+@hk0SfJ zW5=Fn;pq^A;4pj!m~!Vn@kbl_4^t(~r_wpUUubTzazcZy%B+f&3VDKU44+~vWTsPK-u z=K{3Q84RHFe6z5IJF14&w1y$Ybt6dz3hs$|!t%FM9l1N~}spdq8~XPbQAw z*#(3vD~j;;B%yi?RbMRbv_Ss-V*1sn(eAv`Td&?##CMC{dZNX`VA#AyCZ8AgC-zm}}&CD~KyFs)xpRd4!li>7Hw zQ1R7Q7!Js9IxDi(?Y{n?;wl2T=Qm8;8Fd^C8;fB&27-h`-5MTXG5jbE;;_K-4E5cl zA+&Ewb&slj1&a+}mnB+IeulWvei}Ejq-binW*AzXg>5 zi5kUo+qd9LHrTS7Adpz6?%wX_*92TGlOrNI#Q4cZ>mZNS*IMz-&r@3_0Vnhm?1 zblB}q47+>qY_hkry`6Pes0L3Q?PRhHho@O2(iaQkU^zVom)6v4T3#q%&i7qauHJdG z!-H2?4o`$YJ!Nid(+xa$LGqB>-1m;S-h9EC2z8y44L`oB7T+tOYFUgqUdbuZSEJ0S z)GKZ6PR{IMEESnl6WL2%N%r=7vejFA{jzs;9h6or-op)Yuz@=`Whjo;*JbE9RE)JG zMKH5*3^OEzSR9sOL@pz>wt&4?VLwIQMf63}nBE?|sFISlP2m25oU z{1gRURD;V#rzAKpsoq;zJK-FLSaLQ(_t1sWCYk3bG;o*@WiyqtiP`w$y855aaohhb zJa8@)x0cDs;xK<3aoYw8-v*edFN_^?six-=0K&9|UHqeTjf7OG<2IVs#?ds$4K%W8 zsOM2YDyS_HF;Z23;2Rs5;EjE;AG+v`@1h@G?4QhwrE=B@(E)#-JHFk}B4erH1v0jB z-YQT6s*L3c*{#CZ8!O%BogQf%G_x`2JL7Lm7Cs>cN6I1YvUTvRN~p1`l?LEQ+#V0o zacjce5jU*DM9|1NcyGtnM0iZ-PPK$`csx;;!o8gHboq!h;(AU)$Wu>RAtj%OE@;>r z2ZKYrs21EKCTdySwD8=cpe&5vySWmx6Oep}{ujTCr>Q5!Q@Z$P=crh{vGVG1(uR^W zFv3~drV=}2DKf5NA?XbRg1<(Qf!i}ekV}zDz~zF9QY2Ws&)RbwCUj11wG8~o0~ESw zl!b&)vSOLF+5|Pbp`Hy{O%$0;H3gHWkX~hEuQ!%Z0leZwce#%Nc`~TxjL66Wl|CkL1)aKCp(S=5%jPg;iU9|QgzYRgq8dRqSbH*+1 z4xtxIjBrurcR(lx%A4#h8}U(7{JeV5fTFnR>Dn2W27Z-gO4RiDHmk%g(>LqVlG(3v;K{{8=LX7>#eR^S0uno)G!yo`}4+?|IB}4w*VW4HE{@ zeYt2`D?U3dN89>bQ2T)E+cXgTxFnk2M44%TO>PxdXW5jrS^%nT z>hd9zf%igqXrF93NkZA#+F5~VKy@Y#A}tON`8@!tLgw|^q&iuP<1e57NcHmy9ajmyQ9ITXzKuO-C@L|A%`?V) z415__o;`xJI^}p=PgH?C+#pvvS(r2&4rHG{M~6_dttu7i8-k!a26lagTv+{ z<_VKLz$1EL#%3DbUSFq`q1X4706Dn=#?Q7A=ta*YWVV9A$ynzbkP!>=+$(}__-Zr~(szEX_6#ga^bUOyoK~I%U!G=sQ zc%g!0k3u&)<|y!@{gg;~3`9~n%pXyk<6hu%@r|!A`$!tAp2)oUlsn`xQwL&g94HrM zOWmC`6c@&>Q|Hn)jX}#Z1|<CJ_YL315=#(19^#=cJlR7a3( zoj?ULK+`WY$a59CYcV6qG1QPkhcd~F=BQ*KJlBMJqG)%Y5UsaNEQT7Yx>-uLX(-0j z)=-JHEhU@V_IAG9DvQeXaf+WRp#Zua*@AzsJruy*b>dt5xN$@^iI#2c$Hv8`oNA=B z89>agWi8avdUtWte5bvxq8bU8+DRj4rPSYC9npoN>qI;M`4HN#G2O1JL^qBNAbkO1 zZP;+*AOVdimP$h)kZ#I+A1p>GxS2=o7_#js8A|FF{+bK`kVOV42nusv`|dlpi}u~G zOzgW?-zEX1lO(nYehE!T&~|RD-I)rR;yX4O`uhV<7%&LO1dyP^NQAMiR;S~UNqJKF z&f4l!3^IHX=vzGG-6Lv`wB^}3THg=Sm%IJ?q5}LV+mckH&1*&b$U1jA&CcBpY53lV z2^Avx6#K^}3!kuStddwe$1~_F7{B5Xww_wl8LS6IL2;yh2-UUFh5#RN*>X{mJ*!LQ zw^VfJwW+Jhge~Ue2k=w`&x!HuK97lo4V5cSqSB4b4&ADx~Z_KD`lmg7<%>7 zde%-nt;e^#z#DK6kIm#R=!PXnX8du!;1lB@+{&=g0^Ky)=u;7?yr=D24{WXX~n6V#Gm*C9(9zU?j#z-Y!x+a4PI%7*VGe=0*wAW~7=@BhP`?DtiM?}U|lV(I36DkO|M zyPRQYb+V!RGP>+kn|Nk(2iptm5?ORL%A7{cinf|_uKn_-Cq=^k`74=VSJq@}<@W10 z!TzT6Te6te3DoN(VzH^bjhkqn;chb!RA-APmZvrd^d{ibMdQ?I%DP??BOi*B%SN&H zoAj8=lM7;S94O09Q`X`#@JvCSQxAcPitgw)dT+|aPS{#&c$CJz*FkzC70|(K=Y>^~QLS}mZ!H638wk8*vZcX zZ_dlGP+=yRvQkgrEPc&woC!V@j0Y5i&`8~D!|1-+LO?_tleWY_AC%}Wm^BNXe9Vac zhj0GCgq`E4H%rA;ePoacqvJK*U6L=PS!1V__IzI#2 z*K|tk|Ccdu7D4UY2B5uf-hAyBxu_?C&aj4E6sjh*Ly3W9mkJ%LAXG_y?Rxnw(3X*l zdP3%v4)8nCXekUf6eTM1)hM$FFqw?`<-7n>!5kCuQBTO6LCO?vaL9n;+ak!-HTxwF{Go0C@O<(XW;t3765eu2(?}a8WnJM8%umH9UQMg7Nyqpe>?oc)BEt2B(Pwkmd!M z3PD>$U5BP~Q)qa=OH|=2DsL7ut2wjdhi`-Z2-&D7YJT?gDcQ6EErOAagM(?S(X<=S zb>YOjho>?w<>T3{pGp}?NW(LkfXJG*c4`xla10fataBa~penQWq!sH4x^oj%u18Bv z-IzC>i0(s~Tla&1Gbb02DxwP6_yIMqVIO*i8c*olC|g-mnX|abFU7X!HN;g}SyOz} z6F46}^%&W+Jb@uRHx4}3_dV!s&(%E_Nujwlolaw>Q#4nfrfZ3S8zqt2uc*9P=(OL2 z6N;*c9Au-O$Z2jFFPR`O*nmlgk`0EpnjhWvLzg$90bN{f(~Ozfdy%KSs-Pu@qQqC| zqAZw#tu(V)`&WN+8d;MNpDpHfr(Gege;nd^C5?F<2l`(*pA#ZKJ3W47?Iwhg(dotm z>T+h2XTSe%1`vRLZ)kSN)O9~RWCf5dvQNr`7q%C`ABW45K#5nQ%xUCyVU)~}`*>bE zJSvQm5g$Lm<&2eh0LEk#qeRJcUDL5de# zE3 zMx&8dG*OhEEqGY6;&Ls{oki(N-h%!XxCO+F)Du3hwp*YmP(?!3lKy}W$_B%0ac&W8 zR#Vt~@ixFFV&n(dyf)YvzCA7rH67>9!X_UwfAg(?jbfypusJV7xb!`}WUh8a<;~(I zzmN9uTd-!Q*r+FJnvVoCaTg>r9O{xS+vbvNn2?BDAyr~E+?Y(5E|bux;;2mGTv2(m zxXFiO-Tdo0$(t&;K{o1%oAX*g3Ft9@Sz-jg8fDJn=1zY5qTCpu!&xlrRF|eI1S+l*OGN%)9**06}|7c#GvlRr6Vxyj@`S3yL z>M)ghM1|wIazw{u!=<_#8dVP{NT{GSeSYKxWd{@_*|V_8J6zw5!SN;^P>^s^Pvm_3 z6tMCbv|wh#oGP$z6ZROlU?&L`V}rPKz&+h-9Z|akI+ro42sWAB@0(L?B1?$pu?2he zJbXebY%IYxtS4aqDT4F>4l^c^gsh zR1QoR=86vFqMqnDFB8$o6M&r(6H$~o3!D5%xHhk)j0z^Ah>w5rz?pc(qohsg;2_!- zAKm|ix}HPr@dFk_=Y}NZV0d$=2ogrF4(!8$cbv$Nf$a^FH->BdaL@D7Ixi1A+eoh^ zb&~$mbvjHtQ&(|96Rx4x1a-}{;jSxw92&5+JoK7Kd&CRfU_4?puu_ssx}Q>G-9DA+ z15^S=o=6KrLh|qjoMLEkhwUWKGCV!yd;t$x#IWo6lwf3Wd6+)>O0>uq_c^0-Jj5eM zQ;O^GT}ENXQ=q#XzR;wxStva81xbs;xEE3wpp#Y{4rp?HZ8*X8J9wx|?&&|qdkNw{ z_u*V0+U!^zACuPMnU*Kq>{jSBMd*7EcbTp9gB{)XlQJgr4rGQ?lLa=2Uzxu271N}4 z+NP$-Tt?MFA@MtyCOjqJ!zAGy(=_o=o0KopR0mvUw;1%ho4ZxMi*fsz+_%OVDTkLC zq`mQI_lpNPV&C0Kpe;--b6wu20Y*4X!aDrEW{aCgX39A4+r zz}&R_)dSyQ(n_9v2vfBbv!4rUA8>seV8N3Q2@l%gLnZ?+dEcw>KFm%z!#e;&@`f<$ zIb>s-(X{X0aRf8**q-d(l%9RW(tBy z5b=AdFy_fM#xY1K6ap zJTH9XKoiLWFnB<6joZTG4iIUPcpqm{dAh|f$yHmYl2?p2#3Wg2i$ipSzUy(J*dI8( zQ~sXut0vxj$!+X5mE6YeFzIbx0>*3C$&Ff&jGqxNGsP@qD+h7e$R?c2jjVlfZe+lT z5tYu&<0eznt@v80xA7BGtz~*hyqt9kj-VM-Z5p8XPEeCSwrgfgzVMI#AE<=p9r{NB E0ElD;0ssI2 literal 7741 zcmV-D9>U=tiwFP!000001MOYSZ`??B_xM8|Yj%<>76`D}1Y0A|jHR)f-R#zvweoDs zpJR_?dt08J**ktMPIJgV z5aha(SH&Wm%_e2hvZm$Gjq!+8uc}zD>c>~Fs$RYNV)op*bLY=pxN!d5`3vIld+@)D z@b3@j&Rr1Cm*L-^z`wU3_6q#{^A6f4KBvq>Ev=W(oBZdYlPz@?YP4Ew=ujz0 za6U!3sp2XXLx@GP#9C1Nu# zHXY1)rk?K(Ab*$n?k@GZEY;?hRKj;+h9EETgTTf?T%I*>hJGCAdo=Jz)qFN2``A(8 zKXR$*GlO`h?P9;LV!z`J&8|axcEI&kTCIYWB^9#*!CG@^EJoLB&1N=@o{m|TX_m)xHEXR# zwj6ymo2IEx#Eieau~utN*07P`<{i_=9-41M`z*wuy4~4)gyuVu2uNa8!l?b@*mslc z&<}CsA16s=f8?drv&BaJvyiD3^iv##?gI)#1I^pma>%eAL$=*An%!n|c`|D=mmwj? z#Mk@QH>xEr#qb$mvpy?r@!5eE%c6IM^mq>c`{tW({x?c^ zK7RB0L{vm?=8>pST?X<GxkiBHk}S20gqa0jG39ZUtCPR0RE9!D8FNbJ;*pR{++1WFi+i(5xuKmUzEdw%!p=f73&`epL2v3F1pb&$y{GJ4xKd;}sL6c~Es zP;?)>kr{i$3}nfNJ%hpbw!S{_iABvozT{Pd`gRFW%WkPAq_2J=6$SJ;HTyPpK?cfj z+vh=OQ6^+uRt$cSBLXWb6TmjlCHlot**acs_PXm)daxx9g_tC zx(!moAie{2MH}wWcZtc&AxI0}?g0}{p2WD8BQbmiqX;)?-C&MYBr||C37n;r%&2wc z?*+hl>s&O3(bF6+Ire(cA>_->sf=f3gcLMeH8J|$1CUV_K?g<^c}0&@eRG$jVY5ib>m z&bAmw9JB>(07IY*h=uXu@h?xxxQ^3{TGYh>$%oCAgg%LyHM!&(q2}g4Pf2~cR{}LL zE7b(e{0?;)j7?An4u3Z+csWGuMd5PLiSyRQ;$?xvxg=@X$ngcIo72*|Z-0`{)SLN6E|5FFT(Lr-ID=-HeW8XlHGLyDbh zqT+*X>cCuO+q@Ocz(h!MO#?#3Qly?Y0EwJY#=6)=8DM}?!8nxAvk*EX+DnOXC}E|V z@L9a&iw!UjJ;g%@rm!1E6xIS6ZZ`E|6y<5aklhtoWxK*uc~CGOT}kL!2sPC1aRi~O z)7k_n2_eZ!H6irD4l#g#m?opop@D7YJVP4?*v1|$#?JdW*opFp=FG>;1)xl#Wo*p) zFmL%sE%%)NyJWdXY=cMZJ9j&s$DP?u=y@{UCW;2K^y}xpkg<552aF{obzJ(%u!uAVA**Fwp_09BtGPCxJz~-T6$~ zMKlK$n_H0O{OT`{{z0PgI?9Jy;D?@Bb48WcZ>;Mp>xc(KhpeNYVxP+8D)`7z7ZL@+ zYDvBqaj2nV$z?5rAcu(=9kd8^YjYWyHU@1Y0AOjdV&rf@OyK9s5Ib28Cb(ThvO>F1 zp;4-c!Li>lxQ+gcxkU=d=;jH3Q0C)L*OA^>MLVB9c=F`#opsbe_ckAFi6BN`RWw`H3H4#Ym_)#U|M$-6@KtdHs%dNfeziZCS791=5>ePClJAo1$v zDay5WDY;fniS}NH3cOqB0rouRiQNqvJ+)nuC(ZP{wIC>?rn1%VP~3x&(IuUN1)))b zNeOo&CE@Jl{$4M*#K+EorMNp1Qr%m*3RZwvDN- zVvRbWnwbAE#{3o@24Zpvtue4ICi;AQ7|%{BuRx;1Ab(RYJvi&H!KzfkN;N_7{aegH zozM~riouMwFCI0I1i8Dpvay6#kh`ul>i9*~y=Qq5d&EmMd;SMM3kmupL>t49)a!1Do=G;kL&pK^|g8`~P?U`#9UU(?(3pOEnSm5|%&UQw0x-)d5%ZIOJI*peoO%C5YEiSLl$+zIMGiGU?`i5<>ooM65)0?D z5vz&RldN%RN3C%Y%!lHz3NEtreJ7P-62N+Do$JGCt#f^Hdtut~IKHNp3a)U*S_LCcReTJy!#V!c+V2g^@j=-C=mzc8U!6u;AP*j{ia}FF9 zG>bIvh?+&s_^PD&pJ#ubuNbK&Xg+#EET5r=8rmG#pfjM2fr!ws47F|Iz#!PCT9+1L z$Dn}`ntc)o9~bo~qi9r@a^lG+rN*0cJ`2x}r8@p{mO?;jA5G4nzyE+P;&B0qLY@fg3KPwLd=u%yL1Ak_95<-Ls|S)&GpRT&14+iV6orAkVPzkTyCO$U7P(0==gz@+&**Fxr^ns+M15$0ay+-v7pwHrsg#Z;LWv;Yb~HzWsWc2 zOCpC{Y{%^LU5p58ZK z!ipn>#A<%{?|lMYCXP&o#C8akzCmmm)iw{P<~g}W&h~J?2H5Ahv*pp}`=jUTYdyn8 z&Iv2k?Ee$&IkdzW07JmR!GTt^?LfID8n}$*hJViB+JQP zKmScsys+DWu}mEO8!ai1PDnn8;;6#-z(lVap+&t(17$@XtppXpBGBoM zm{Xl0Jvm$NDxv((en#z(qAw^x8;6v%haxCFHD}?S=Lk}!u1jz11vC7}Q+o#T%3pbM z9$;F+u*5uE@=;BQe00l?)`M;_V!M4JEv!X^5rvB-;!3`Gbt-TDQy)8f)ZE5_PY?4k z^zK-iEWpOc)#G^xJOwC~aBDKgPBkI5_>lU2jJC*um@*#lK7}c|h|-)a}hB)$gE%&<=KlBe)G0iw4uU47P{ZW=!J~DweJ$ zphc5U$lE7Fhd_rFEJUVKVQSCLj#3JUTnh=_Q3Jrz1umsp5WFTxO1Do+ZM+VAyqU>zxjYoBt_oNSnBH$?U zBygH3;IwmHIh`@!C{C&goYS)V_i(_8zh7WMqNtPLNlTr-n3nI#5(XrSk!oV+B^2_! z{a2-sr*H1dht2rqemR0?r1u=pTS=VxWUd6zsxZ7guBmS1UTHO|4@w|6)t1$S z?+HX--X1_A`WU7Kt`C8d2is->+w0R(v`RRX118?!r6gYRjFh<9hvMo2HQ2I>^sJbi zhnq%%8+}^qp(XUJn3Ff)DG8oJ?-N4U46xV3r0{e=OwNPPNYk2s4d!<-C)I>cE%tu1 zMQ#xsq78=_#PA#X^?}vp&@851&c$<_zn&T_t#Q|{5A>tSMFOjabR>}3o4OAOF-n@xg zOUsR=Mk8^s+#%RPONa)<<)`Rxxv4MZ`CD#g{4MVYU(-I`386l*yJg0-&ehcw>1?@q zoV5D#+S&HZ{HTOD%6=7Z#8Nr2)Ht?SDp*fQCz%vUH`1q>?o3NXDlw%`vr|nht$q&D zoA_uSd&m;kz|lPiZ5+r*P2A%Qk(vRK?Pp9h6V-T_vq6`)vblNKa0bW}@Go);)q{)TNk}YGUbw+gM)Ev_r+sOaa<32RwQ_!qa5lM1M3_b6DUM$fB8u zm_^N!wycdj#qA99gix#({q47<7YP+)E-4doucN5;HSB=wt$C~_F0u0Gj!fIdVx6>x z4=F!7VRCE5G1A(U2TZttKW4I;=+C3mQqKk@E~wqx+}gQ&bW(xE8Yg1$x5h))#r|;a z6cw+v#@a~n(pR%LT_^>~!T}K#;|TlmWQ$;#SVBc5T2DifPO8@$P1IOkZ#3Y)Smlb& zR@W?f!QWL~KijHT38R&$zp5$Mk~;!!vq0VvAnv%J#AoJF4p#E6`iVA*2aK|U`*Z~< zE72NSqc$1`Z$4L;n2r(EgPq4Fvk0HIXG_sg)kNdsL(=W~!s;0Gf8S${C2sANQ5u%v zk{i&EVX(c=_Mu4~hX)0Ap_dgk3r>CP6z9^hzF-a=0;a?)F=3^e z!1++z8;*&C?r3NybUk5t=UQAo6=UZ|c?%374}9#vhqwtm`({ARJ9M84Uh2Nla}|`b zi|ZE!Z4yR})b`%PBM)AwOc%aNl&cDPBiLftiddGOU=p*Rb;Jj=vztMHK{p=xT3<)k z4FT*Np9`r^_KEM?rbC#O*-Bhdho4dOLgX*tu3); z1f8dz76k&J7sbR8G;*bkiyVl{_VZy-|=GI_T9BgnuwRWNzEBx#eN zNgr-QufbVu$woC%^J-o9`2<@<2m2*08#(T}@Ak1AJ-!-SYh5ql7CE}M4YKG{zP3#^ zVl|Q4d;%>zL_46J+aQ_5dh9(5RqB7oByx ztf-UNNw3u`fB)>eyH$)-4LPT*Y4r@+EgC%qZ4x&(QhWNh`IOZ2GUJzEqnfBWp?BK6 zXv@+8=;G$}3q@I(Vzpx9iJv`Nq`r}hr6PD{*`8J+|i)kMt?9zH~y4xq&+Xk%|Ly8!Tq zO!6zft9Cy!gbR8~m0dfQGpso43GX>t(N>NCJtIDPLJY!Pj5de}YJ(`)4n10f2K0nshGtF7#qunkWdU{G^$Uz~ z&hwnro@Q+=0Ziw{5hpkK zW);yk(SldBMDwu0{9I|?=1yLL)#&`iX&orhZ#42w^6KTm@ygDL#NW|hootq|rY)De zO%*LEuTJqkB5H}P$5$`Pe|&sV&MUVF8?B~Yy@NeU9JKY-zgv(2rn;8qghW2K!#>H8 z-gyhJeD8_F0{ByWx8Y1g%nI@GYcV(fXG#lcB^1Vpk2i2RCS3BYBNSXfK$8ONtC=WC z9$Fd+TCC>^6vsN^^wU>;#A)D6-9>cNN^h`uOf2TDktCukI-!!kPpzm~IF8?F_~d(M z->ar#q-uyc@j6NE=$ozToH;%X3wDq$E9xYC(r4l}UIVABijiu<=j9HhKn>G`AjeIC~OT5aowgjzf4ZjSrS9I7Qp-*BaEo(mi`#g`i z@mA39zOAhw_1oNhvV}hQ_yZJtx$A~7`zE{d%y!J(Zs-Yzq^83-nOj7P7R8PN3sFhG zUPJ?N(77=`r}Cw9ETXyScsAO{4z&;)h;@H$E^k){s*&t6$laZ_XnW^niXYo{xzC&3 zwVx#0F1oI-tlU^zHE?rTorkK$HL10XX159PojN%b9!YCavx)jFo%U8ttCjNYm2AZ< zjcvs|g_k2KJP`8$28wUhZHwqo9Fj*vponw(TD(t_bg|g1X|-bStFN%ozN15-lUNH(g8n(Gho5Pd>8Cl1VC0~>AZ;h|=aBFarkAag2j9dw_9 zf$E|lO(G|KIOyljamJ}Q^9c{}H?^hmhxnIH!}zAe(InA^)r9Sz-eLyoz<9{fhQW-s zA6gpa$FaDveZzNo;Mc`%?*-Ttq)BY1XUg^0;NY6z;{QE5#;W*5+@jdni_XWZutAxN z{UEOJjN$YRb{KcJ;V>hv89bZ)r}7%vn93Y0dFI$ncz_;&30p5|hAXmmF3dOMjx?F? z`$_w<&zxLU@sgQ(SFfc77oH)(n(S?^DszNc2-6R*W~^v zCOEJu?;t|OQa#gr2#Io>9r&xEl<%yielG3|19tooNBr-?_M-Xm;}k9xUB z0tYb2M;!Ee#3NYVZJ{{m^`MM^cH@Y*d%a#rgV7r!hu_UqP+G$&UTnNi;`hzigt#p3 zt9NYLvxQgbVAR_7aKHxG=Sc+RmIx;)X7&ay;dWelAM}Ex|33Axvq#NsXek;)2fhW5 zc3~>c;x3tqE}xGpk-imOF__$M9f#vfIWkDtX^rMRR~^=gN%Htb z6cBdxDv>hKOhVECPt`9rfQp04pd}6}Lxm)m{x;RFVjPfLMd}@D13pLn diff --git a/revdep/install/ROI.plugin.glpk.out b/revdep/install/ROI.plugin.glpk.out deleted file mode 100644 index b24684897..000000000 --- a/revdep/install/ROI.plugin.glpk.out +++ /dev/null @@ -1,2 +0,0 @@ -ERROR: dependency ‘Rglpk’ is not available for package ‘ROI.plugin.glpk’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ROI.plugin.glpk’ diff --git a/revdep/install/Rglpk.out b/revdep/install/Rglpk.out deleted file mode 100644 index 3a3b4e624..000000000 --- a/revdep/install/Rglpk.out +++ /dev/null @@ -1,8 +0,0 @@ -* installing *source* package ‘Rglpk’ ... -** package ‘Rglpk’ successfully unpacked and MD5 sums checked -** libs -/bin/bash: line 0: cd: GLPK: No such file or directory -Makevars:10: recipe for target 'GLPK.ts' failed -make: *** [GLPK.ts] Error 1 -ERROR: compilation failed for package ‘Rglpk’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/Rglpk’ diff --git a/revdep/install/ggimage.out b/revdep/install/ggimage.out new file mode 100644 index 000000000..6a464886a --- /dev/null +++ b/revdep/install/ggimage.out @@ -0,0 +1,2 @@ +ERROR: dependencies ‘EBImage’, ‘gridGraphics’ are not available for package ‘ggimage’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggimage’ diff --git a/revdep/install/ggspectra.out b/revdep/install/ggspectra.out new file mode 100644 index 000000000..ecc794cf3 --- /dev/null +++ b/revdep/install/ggspectra.out @@ -0,0 +1,10 @@ +* installing *source* package ‘ggspectra’ ... +** package ‘ggspectra’ successfully unpacked and MD5 sums checked +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required +ERROR: lazy loading failed for package ‘ggspectra’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ +* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ diff --git a/revdep/install/gridGraphics.out b/revdep/install/gridGraphics.out new file mode 100644 index 000000000..2ddaee7e5 --- /dev/null +++ b/revdep/install/gridGraphics.out @@ -0,0 +1,11 @@ +* installing *source* package ‘gridGraphics’ ... +** package ‘gridGraphics’ successfully unpacked and MD5 sums checked +** R +** inst +** tests +** preparing package for lazy loading +Error in system("convert --version", intern = TRUE, ignore.stderr = TRUE) : + error in running command +Error : unable to load R code in package ‘gridGraphics’ +ERROR: lazy loading failed for package ‘gridGraphics’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/gridGraphics’ diff --git a/revdep/install/photobiologyInOut.out b/revdep/install/photobiologyInOut.out new file mode 100644 index 000000000..8339117bf --- /dev/null +++ b/revdep/install/photobiologyInOut.out @@ -0,0 +1,11 @@ +* installing *source* package ‘photobiologyInOut’ ... +** package ‘photobiologyInOut’ successfully unpacked and MD5 sums checked +** R +** inst +** tests +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required +ERROR: lazy loading failed for package ‘photobiologyInOut’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ +* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ diff --git a/revdep/problems-v1.2.md b/revdep/problems-v1.2.md index fcedacc9a..bfa66b50c 100644 --- a/revdep/problems-v1.2.md +++ b/revdep/problems-v1.2.md @@ -4,13 +4,13 @@ |setting |value | |:--------|:----------------------------| -|version |R version 3.3.2 (2016-10-31) | +|version |R version 3.3.3 (2017-03-06) | |system |x86_64, linux-gnu | |ui |X11 | |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-01-10 | +|date |2017-03-29 | ## Packages @@ -20,27 +20,30 @@ |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | -|nycflights13 | |0.2.1 |2016-12-30 |cran (@0.2.1) | -|Rcpp | |0.12.8 |2016-11-17 |cran (@0.12.8) | +|nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | +|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | |rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | -|testthat | |1.0.2.9000 |2016-12-24 |Github (hadley/testthat@3b2f225) | +|testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | # Check results -8 packages with problems +11 packages with problems |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |dat |0.1.0 | 1| 0| 0| -|highcharter |0.4.0 | 0| 1| 0| -|jpmesh |0.3.0 | 1| 0| 0| -|photobiologyInOut |0.4.12 | 1| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|ggimage |0.0.4 | 1| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|officer |0.1.1 | 2| 1| 0| +|photobiologyInOut |0.4.13 | 1| 0| 0| |plotly |4.5.6 | 1| 0| 0| -|rbgm |0.0.4 | 0| 1| 0| -|sf |0.2-8 | 1| 0| 1| -|tidyquant |0.2.0 | 1| 0| 0| ## dat (0.1.0) Maintainer: Sebastian Warnholz @@ -50,8 +53,11 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR + Running ‘testthat.R’ [10s/10s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + ^ + tests/testthat/test-trunc-mat.R:5:3: style: Variable and function names should not be longer than 25 characters. print_arg_names_without_ellipsis <- setdiff(print_arg_names, "...") ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ tests/testthat/test-trunc-mat.R:9:16: style: Variable and function names should not be longer than 25 characters. @@ -67,9 +73,8 @@ Last 13 lines of output: Execution halted ``` -## highcharter (0.4.0) -Maintainer: Joshua Kunst -Bug reports: https://github.com/jbkunst/highcharter/issues +## flextable (0.1.0) +Maintainer: David Gohel 0 errors | 1 warning | 0 notes @@ -79,157 +84,339 @@ Error in re-building vignettes: ... Warning in engine$weave(file, quiet = quiet, encoding = enc) : Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Quitting from lines 58-81 (replicating-highcharts-demos.Rmd) -Error: processing vignette 'replicating-highcharts-demos.Rmd' failed with diagnostics: +Loading required package: officer + +Attaching package: 'dplyr' + +The following objects are masked from 'package:stats': + + filter, lag + +The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + +PhantomJS not found. You can install it with webshot::install_phantomjs(). If it is installed, please make sure the phantomjs executable can be found via the PATH variable. +Quitting from lines 39-41 (format.Rmd) +Error: processing vignette 'format.Rmd' failed with diagnostics: cannot open the connection Execution halted ``` -## jpmesh (0.3.0) -Maintainer: Shinya Uryu -Bug reports: https://github.com/uribo/jpmesh/issues +## FSelectorRcpp (0.1.2) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues -1 error | 0 warnings | 0 notes +1 error | 0 warnings | 2 notes ``` -checking whether package ‘jpmesh’ can be installed ... ERROR -Installation failed. -See ‘/home/muelleki/git/R/tibble/revdep/checks/jpmesh.Rcheck/00install.out’ for details. +checking examples ... ERROR +Running examples in ‘FSelectorRcpp-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: feature_search +> ### Title: General Feature Searching Engine +> ### Aliases: feature_search +> +> ### ** Examples +> +> +> # Enable parallelization in examples +> library(doSNOW) # doSNOW has an option for progress bar +Loading required package: foreach +Loading required package: iterators +Loading required package: snow +> cl <- makeCluster(2) +Loading required namespace: Rmpi +Error in Rmpi::mpi.comm.spawn(slave = mpitask, slavearg = args, nslaves = count, : + MPI_Comm_spawn is not supported. +Calls: makeCluster -> makeMPIcluster -> +Execution halted + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ + +checking installed package size ... NOTE + installed size is 9.7Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 7.3Mb ``` -## photobiologyInOut (0.4.12) -Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/ +## ggimage (0.0.4) +Maintainer: Guangchuang Yu +Bug reports: https://github.com/GuangchuangYu/ggimage/issues 1 error | 0 warnings | 0 notes ``` +checking package dependencies ... ERROR +Packages required but not available: ‘EBImage’ ‘gridGraphics’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## haven (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/haven/issues + +2 errors | 0 warnings | 1 note + +``` +checking examples ... ERROR +Running examples in ‘haven-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: read_dta +> ### Title: Read and write Stata DTA files. +> ### Aliases: read_dta read_stata write_dta +> +> ### ** Examples +... 14 lines ... +8 5.0 3.4 1.5 0.2 setosa +9 4.4 2.9 1.4 0.2 setosa +10 4.9 3.1 1.5 0.1 setosa +# ... with 140 more rows +> +> tmp <- tempfile(fileext = ".dta") +> write_dta(mtcars, tmp) +Error in write_dta_(data, normalizePath(path, mustWork = FALSE), version = stata_file_format(version)) : + Writing failure: Unable to write data. +Calls: write_dta -> write_dta_ -> .Call +Execution halted + checking tests ... ERROR + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - as.numeric(getWhenMeasured(ss.spct), tz = "CET") not equal to as.numeric(ymd_hms("2013-05-06 15:13:40", tz = "CET"), tz = "CET"). - 1/1 mismatches - [1] 1.37e+09 - 1.37e+09 == 3450400 - - Read 4 items testthat results ================================================================ - OK: 214 SKIPPED: 0 FAILED: 2 - 1. Failure: SpectraSuite (@test-oo.R#76) - 2. Failure: SpectraSuite (@test-oo.R#158) + OK: 132 SKIPPED: 0 FAILED: 9 + 1. Error: can roundtrip basic types (@test-write-dta.R#5) + 2. Error: can roundtrip missing values (as much as possible) (@test-write-dta.R#12) + 3. Error: can roundtrip date times (@test-write-dta.R#23) + 4. Error: infinity gets converted to NA (@test-write-dta.R#28) + 5. Error: factors become labelleds (@test-write-dta.R#33) + 6. Error: labels are preserved (@test-write-dta.R#44) + 7. Error: labelleds are round tripped (@test-write-dta.R#52) + 8. Error: factors become labelleds (@test-write-dta.R#59) + 9. Error: labels are converted to utf-8 (@test-write-dta.R#73) Error: testthat unit tests failed Execution halted + +checking for GNU extensions in Makefiles ... NOTE +GNU make is a SystemRequirements. ``` -## plotly (4.5.6) -Maintainer: Carson Sievert -Bug reports: https://github.com/ropensci/plotly/issues +## hddtools (0.6) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/hddtools/issues 1 error | 0 warnings | 0 notes ``` checking tests ... ERROR + Running ‘testthat.R’ [14s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - [1] "Running test: plotly-alpha-no-color" - [1] "Running test: plotly-factor-axis" - [1] "Running test: plotly-character-axis" - [1] "Running test: plotly-histogram" - [1] "Running test: plotly-histogram-vert" - [1] "Running test: plotly-inherit-FALSE" - [1] "Running test: plotly-time-series-summary" + 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", + sQuote(fdef@generic), sQuote(cnames)), domain = NA) + + trying URL 'ftp://ftp.bafg.de/pub/REFERATE/GRDC/ltdata/africa.zip' + ftp data connection made, file length 2730333 bytes + ================================================== + downloaded 2.6 MB + testthat results ================================================================ - OK: 808 SKIPPED: 17 FAILED: 1 - 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) + OK: 55 SKIPPED: 1 FAILED: 2 + 1. Error: Test TRMM function using dates in the past (@test-TRMM.R#15) + 2. Error: Test TRMM function using 3-hourly dates in the past (@test-TRMM.R#58) Error: testthat unit tests failed Execution halted ``` -## rbgm (0.0.4) -Maintainer: Michael D. Sumner -Bug reports: https://github.com/AustralianAntarcticDivision/rbgm/issues/ +## heemod (0.8.0) +Maintainer: Antoine Filipovic-Pierucci +Bug reports: https://github.com/pierucci/heemod/issues -0 errors | 1 warning | 0 notes +1 error | 1 warning | 1 note ``` +checking tests ... ERROR + Running ‘testthat.R’ [33s/36s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) + 6: flexsurv::summary.flexsurvreg + 7: getExportedValue(pkg, name) + 8: stop(gettextf("'%s' is not an exported object from 'namespace:%s'", name, getNamespaceName(ns)), + call. = FALSE, domain = NA) + + .model from to prob + 1 standard RevisionTHR SuccessfulRevision + 2 new RevisionTHR SuccessfulRevision + testthat results ================================================================ + OK: 346 SKIPPED: 0 FAILED: 1 + 1. Error: (unknown) (@test_survival.R#23) + + Error: testthat unit tests failed + Execution halted + checking re-building of vignette outputs ... WARNING Error in re-building vignettes: ... +'colour', which will replace the existing scale. +Scale for 'colour' is already present. Adding another scale for +'colour', which will replace the existing scale. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. Warning in engine$weave(file, quiet = quiet, encoding = enc) : Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Loading required package: sp +... 8 lines ... + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Error in mutate_impl(.data, dots) : + 'summary.flexsurvreg' is not an exported object from 'namespace:flexsurv' +Quitting from lines 42-83 (j-survival.Rmd) +Error: processing vignette 'j-survival.Rmd' failed with diagnostics: +Error in parameter: p2. +Execution halted -Attaching package: 'dplyr' +checking dependencies in R code ... NOTE +Missing or unexported object: ‘flexsurv::summary.flexsurvreg’ +``` -The following objects are masked from 'package:raster': -... 8 lines ... -The following objects are masked from 'package:base': +## highcharter (0.5.0) +Maintainer: Joshua Kunst +Bug reports: https://github.com/jbkunst/highcharter/issues - intersect, setdiff, setequal, union +0 errors | 1 warning | 1 note -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/rgdal/libs/rgdal.so': - libgdal.so.1: cannot open shared object file: No such file or directory -Quitting from lines 16-24 (BGM_Spatial.Rmd) -Error: processing vignette 'BGM_Spatial.Rmd' failed with diagnostics: -package or namespace load failed for 'rgdal' +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Highcharts (www.highcharts.com) is a Highsoft software product which is +not free for commercial and Governmental use +Quitting from lines 45-46 (charting-data-frames.Rmd) +Error: processing vignette 'charting-data-frames.Rmd' failed with diagnostics: +cannot open the connection Execution halted + + +checking installed package size ... NOTE + installed size is 16.5Mb + sub-directories of 1Mb or more: + doc 13.7Mb + htmlwidgets 1.9Mb ``` -## sf (0.2-8) -Maintainer: Edzer Pebesma -Bug reports: https://github.com/edzer/sfr/issues/ +## officer (0.1.1) +Maintainer: David Gohel +Bug reports: https://github.com/davidgohel/officer/issues -1 error | 0 warnings | 1 note +2 errors | 1 warning | 0 notes ``` +checking examples ... ERROR +Running examples in ‘officer-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: slip_in_img +> ### Title: append an image +> ### Aliases: slip_in_img +> +> ### ** Examples +> +> library(magrittr) +> img.file <- file.path( Sys.getenv("R_HOME"), "doc", "html", "logo.jpg" ) +> x <- read_docx() %>% ++ body_add_par("R logo: ", style = "Normal") %>% ++ slip_in_img(src = img.file, style = "strong", width = .3, height = .3) +Error: file.exists(src) is not TRUE +Execution halted + checking tests ... ERROR + Running ‘testthat.R’ [21s/21s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - > test_check("sf") - 1. Error: st_transform works (@test_gdal.R#11) --------------------------------- - package rgdal is required for spTransform methods - 1: spTransform(sp, CRS(toCrs)) at testthat/test_gdal.R:11 - 2: spTransform(sp, CRS(toCrs)) at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:93 - 3: stop("package rgdal is required for spTransform methods") at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:97 + 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) + 10: external_img(src, width = width, height = height) + 11: stopifnot(file.exists(src)) + 12: stop(sprintf(ngettext(length(r), "%s is not TRUE", "%s are not all TRUE"), ch), call. = FALSE, + domain = NA) testthat results ================================================================ - OK: 190 SKIPPED: 0 FAILED: 1 - 1. Error: st_transform works (@test_gdal.R#11) + OK: 317 SKIPPED: 0 FAILED: 4 + 1. Error: image add (@test-docx-add.R#68) + 2. Error: pml fp_border (@test-fp_cell.R#75) + 3. Error: css fp_border (@test-fp_cell.R#165) + 4. Error: add img into placeholder (@test-pptx-add.R#67) Error: testthat unit tests failed Execution halted -checking installed package size ... NOTE - installed size is 8.5Mb - sub-directories of 1Mb or more: - doc 4.0Mb - libs 3.7Mb +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Quitting from lines 181-191 (powerpoint.Rmd) +Error: processing vignette 'powerpoint.Rmd' failed with diagnostics: +file.exists(src) is not TRUE +Execution halted + ``` -## tidyquant (0.2.0) -Maintainer: Matt Dancho -Bug reports: https://github.com/mdancho84/tidyquant/issues +## photobiologyInOut (0.4.13) +Maintainer: Pedro J. Aphalo +Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘photobiology’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## plotly (4.5.6) +Maintainer: Carson Sievert +Bug reports: https://github.com/ropensci/plotly/issues 1 error | 0 warnings | 0 notes ``` checking tests ... ERROR + Running ‘testthat.R’ [46s/47s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - AAPL %>% tq_mutate_(ohlc_fun = "close", mutate_fun = mutate_fun) - }, paste0("fun = ", mutate_fun, " not a valid option.")) at testthat/test_tq_transform.R:118 - 2: paste0("fun = ", mutate_fun, " not a valid option.") at /tmp/RtmpGs2f8Q/devtools11166987ba25/hadley-testthat-3b2f225/R/expect-output.R:147 - + [1] "Running test: plotly-group-within-trace" + [1] "Running test: plotly-alpha-blending" + [1] "Running test: plotly-alpha-no-color" + [1] "Running test: plotly-factor-axis" + [1] "Running test: plotly-character-axis" + [1] "Running test: plotly-histogram" + [1] "Running test: plotly-histogram-vert" + [1] "Running test: plotly-inherit-FALSE" + [1] "Running test: plotly-time-series-summary" testthat results ================================================================ - OK: 133 SKIPPED: 1 FAILED: 4 - 1. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#133) - 2. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#151) - 3. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#100) - 4. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#118) + OK: 813 SKIPPED: 17 FAILED: 1 + 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) Error: testthat unit tests failed Execution halted diff --git a/revdep/problems.md b/revdep/problems.md index c41251781..bfa66b50c 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -4,44 +4,46 @@ |setting |value | |:--------|:----------------------------| -|version |R version 3.3.2 (2016-10-31) | +|version |R version 3.3.3 (2017-03-06) | |system |x86_64, linux-gnu | |ui |X11 | |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-01-10 | +|date |2017-03-29 | ## Packages |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| |assertthat | |0.1 |2013-12-06 |cran (@0.1) | -|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | -|nycflights13 | |0.2.1 |2016-12-30 |cran (@0.2.1) | -|Rcpp | |0.12.8 |2016-11-17 |cran (@0.12.8) | +|nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | +|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | |rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | -|testthat | |1.0.2.9000 |2016-12-24 |Github (hadley/testthat@3b2f225) | +|testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | # Check results -8 packages with problems +11 packages with problems |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |dat |0.1.0 | 1| 0| 0| -|highcharter |0.4.0 | 0| 1| 0| -|jpmesh |0.3.0 | 1| 0| 0| -|photobiologyInOut |0.4.12 | 1| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|ggimage |0.0.4 | 1| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|officer |0.1.1 | 2| 1| 0| +|photobiologyInOut |0.4.13 | 1| 0| 0| |plotly |4.5.6 | 1| 0| 0| -|rbgm |0.0.4 | 0| 1| 0| -|sf |0.2-8 | 1| 0| 1| -|tidyquant |0.2.0 | 1| 0| 0| ## dat (0.1.0) Maintainer: Sebastian Warnholz @@ -51,8 +53,11 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR + Running ‘testthat.R’ [10s/10s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + ^ + tests/testthat/test-trunc-mat.R:5:3: style: Variable and function names should not be longer than 25 characters. print_arg_names_without_ellipsis <- setdiff(print_arg_names, "...") ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ tests/testthat/test-trunc-mat.R:9:16: style: Variable and function names should not be longer than 25 characters. @@ -68,9 +73,8 @@ Last 13 lines of output: Execution halted ``` -## highcharter (0.4.0) -Maintainer: Joshua Kunst -Bug reports: https://github.com/jbkunst/highcharter/issues +## flextable (0.1.0) +Maintainer: David Gohel 0 errors | 1 warning | 0 notes @@ -80,157 +84,339 @@ Error in re-building vignettes: ... Warning in engine$weave(file, quiet = quiet, encoding = enc) : Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Quitting from lines 58-81 (replicating-highcharts-demos.Rmd) -Error: processing vignette 'replicating-highcharts-demos.Rmd' failed with diagnostics: +Loading required package: officer + +Attaching package: 'dplyr' + +The following objects are masked from 'package:stats': + + filter, lag + +The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + +PhantomJS not found. You can install it with webshot::install_phantomjs(). If it is installed, please make sure the phantomjs executable can be found via the PATH variable. +Quitting from lines 39-41 (format.Rmd) +Error: processing vignette 'format.Rmd' failed with diagnostics: cannot open the connection Execution halted ``` -## jpmesh (0.3.0) -Maintainer: Shinya Uryu -Bug reports: https://github.com/uribo/jpmesh/issues +## FSelectorRcpp (0.1.2) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues -1 error | 0 warnings | 0 notes +1 error | 0 warnings | 2 notes ``` -checking whether package ‘jpmesh’ can be installed ... ERROR -Installation failed. -See ‘/home/muelleki/git/R/tibble/revdep/checks/jpmesh.Rcheck/00install.out’ for details. +checking examples ... ERROR +Running examples in ‘FSelectorRcpp-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: feature_search +> ### Title: General Feature Searching Engine +> ### Aliases: feature_search +> +> ### ** Examples +> +> +> # Enable parallelization in examples +> library(doSNOW) # doSNOW has an option for progress bar +Loading required package: foreach +Loading required package: iterators +Loading required package: snow +> cl <- makeCluster(2) +Loading required namespace: Rmpi +Error in Rmpi::mpi.comm.spawn(slave = mpitask, slavearg = args, nslaves = count, : + MPI_Comm_spawn is not supported. +Calls: makeCluster -> makeMPIcluster -> +Execution halted + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ + +checking installed package size ... NOTE + installed size is 9.7Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 7.3Mb ``` -## photobiologyInOut (0.4.12) -Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/ +## ggimage (0.0.4) +Maintainer: Guangchuang Yu +Bug reports: https://github.com/GuangchuangYu/ggimage/issues 1 error | 0 warnings | 0 notes ``` +checking package dependencies ... ERROR +Packages required but not available: ‘EBImage’ ‘gridGraphics’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## haven (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/haven/issues + +2 errors | 0 warnings | 1 note + +``` +checking examples ... ERROR +Running examples in ‘haven-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: read_dta +> ### Title: Read and write Stata DTA files. +> ### Aliases: read_dta read_stata write_dta +> +> ### ** Examples +... 14 lines ... +8 5.0 3.4 1.5 0.2 setosa +9 4.4 2.9 1.4 0.2 setosa +10 4.9 3.1 1.5 0.1 setosa +# ... with 140 more rows +> +> tmp <- tempfile(fileext = ".dta") +> write_dta(mtcars, tmp) +Error in write_dta_(data, normalizePath(path, mustWork = FALSE), version = stata_file_format(version)) : + Writing failure: Unable to write data. +Calls: write_dta -> write_dta_ -> .Call +Execution halted + checking tests ... ERROR + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - as.numeric(getWhenMeasured(ss.spct), tz = "CET") not equal to as.numeric(ymd_hms("2013-05-06 15:13:40", tz = "CET"), tz = "CET"). - 1/1 mismatches - [1] 1.37e+09 - 1.37e+09 == 3450400 - - Read 4 items testthat results ================================================================ - OK: 214 SKIPPED: 0 FAILED: 2 - 1. Failure: SpectraSuite (@test-oo.R#76) - 2. Failure: SpectraSuite (@test-oo.R#158) + OK: 132 SKIPPED: 0 FAILED: 9 + 1. Error: can roundtrip basic types (@test-write-dta.R#5) + 2. Error: can roundtrip missing values (as much as possible) (@test-write-dta.R#12) + 3. Error: can roundtrip date times (@test-write-dta.R#23) + 4. Error: infinity gets converted to NA (@test-write-dta.R#28) + 5. Error: factors become labelleds (@test-write-dta.R#33) + 6. Error: labels are preserved (@test-write-dta.R#44) + 7. Error: labelleds are round tripped (@test-write-dta.R#52) + 8. Error: factors become labelleds (@test-write-dta.R#59) + 9. Error: labels are converted to utf-8 (@test-write-dta.R#73) Error: testthat unit tests failed Execution halted + +checking for GNU extensions in Makefiles ... NOTE +GNU make is a SystemRequirements. ``` -## plotly (4.5.6) -Maintainer: Carson Sievert -Bug reports: https://github.com/ropensci/plotly/issues +## hddtools (0.6) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/hddtools/issues 1 error | 0 warnings | 0 notes ``` checking tests ... ERROR + Running ‘testthat.R’ [14s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - [1] "Running test: plotly-alpha-no-color" - [1] "Running test: plotly-factor-axis" - [1] "Running test: plotly-character-axis" - [1] "Running test: plotly-histogram" - [1] "Running test: plotly-histogram-vert" - [1] "Running test: plotly-inherit-FALSE" - [1] "Running test: plotly-time-series-summary" + 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", + sQuote(fdef@generic), sQuote(cnames)), domain = NA) + + trying URL 'ftp://ftp.bafg.de/pub/REFERATE/GRDC/ltdata/africa.zip' + ftp data connection made, file length 2730333 bytes + ================================================== + downloaded 2.6 MB + testthat results ================================================================ - OK: 808 SKIPPED: 17 FAILED: 1 - 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) + OK: 55 SKIPPED: 1 FAILED: 2 + 1. Error: Test TRMM function using dates in the past (@test-TRMM.R#15) + 2. Error: Test TRMM function using 3-hourly dates in the past (@test-TRMM.R#58) Error: testthat unit tests failed Execution halted ``` -## rbgm (0.0.4) -Maintainer: Michael D. Sumner -Bug reports: https://github.com/AustralianAntarcticDivision/rbgm/issues/ +## heemod (0.8.0) +Maintainer: Antoine Filipovic-Pierucci +Bug reports: https://github.com/pierucci/heemod/issues -0 errors | 1 warning | 0 notes +1 error | 1 warning | 1 note ``` +checking tests ... ERROR + Running ‘testthat.R’ [33s/36s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) + 6: flexsurv::summary.flexsurvreg + 7: getExportedValue(pkg, name) + 8: stop(gettextf("'%s' is not an exported object from 'namespace:%s'", name, getNamespaceName(ns)), + call. = FALSE, domain = NA) + + .model from to prob + 1 standard RevisionTHR SuccessfulRevision + 2 new RevisionTHR SuccessfulRevision + testthat results ================================================================ + OK: 346 SKIPPED: 0 FAILED: 1 + 1. Error: (unknown) (@test_survival.R#23) + + Error: testthat unit tests failed + Execution halted + checking re-building of vignette outputs ... WARNING Error in re-building vignettes: ... +'colour', which will replace the existing scale. +Scale for 'colour' is already present. Adding another scale for +'colour', which will replace the existing scale. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. Warning in engine$weave(file, quiet = quiet, encoding = enc) : Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. -Loading required package: sp +... 8 lines ... + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Error in mutate_impl(.data, dots) : + 'summary.flexsurvreg' is not an exported object from 'namespace:flexsurv' +Quitting from lines 42-83 (j-survival.Rmd) +Error: processing vignette 'j-survival.Rmd' failed with diagnostics: +Error in parameter: p2. +Execution halted -Attaching package: 'dplyr' +checking dependencies in R code ... NOTE +Missing or unexported object: ‘flexsurv::summary.flexsurvreg’ +``` -The following objects are masked from 'package:raster': -... 8 lines ... -The following objects are masked from 'package:base': +## highcharter (0.5.0) +Maintainer: Joshua Kunst +Bug reports: https://github.com/jbkunst/highcharter/issues - intersect, setdiff, setequal, union +0 errors | 1 warning | 1 note -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/rgdal/libs/rgdal.so': - libgdal.so.1: cannot open shared object file: No such file or directory -Quitting from lines 16-24 (BGM_Spatial.Rmd) -Error: processing vignette 'BGM_Spatial.Rmd' failed with diagnostics: -package or namespace load failed for 'rgdal' +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Highcharts (www.highcharts.com) is a Highsoft software product which is +not free for commercial and Governmental use +Quitting from lines 45-46 (charting-data-frames.Rmd) +Error: processing vignette 'charting-data-frames.Rmd' failed with diagnostics: +cannot open the connection Execution halted + + +checking installed package size ... NOTE + installed size is 16.5Mb + sub-directories of 1Mb or more: + doc 13.7Mb + htmlwidgets 1.9Mb ``` -## sf (0.2-8) -Maintainer: Edzer Pebesma -Bug reports: https://github.com/edzer/sfr/issues/ +## officer (0.1.1) +Maintainer: David Gohel +Bug reports: https://github.com/davidgohel/officer/issues -1 error | 0 warnings | 1 note +2 errors | 1 warning | 0 notes ``` +checking examples ... ERROR +Running examples in ‘officer-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: slip_in_img +> ### Title: append an image +> ### Aliases: slip_in_img +> +> ### ** Examples +> +> library(magrittr) +> img.file <- file.path( Sys.getenv("R_HOME"), "doc", "html", "logo.jpg" ) +> x <- read_docx() %>% ++ body_add_par("R logo: ", style = "Normal") %>% ++ slip_in_img(src = img.file, style = "strong", width = .3, height = .3) +Error: file.exists(src) is not TRUE +Execution halted + checking tests ... ERROR + Running ‘testthat.R’ [21s/21s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - > test_check("sf") - 1. Error: st_transform works (@test_gdal.R#11) --------------------------------- - package rgdal is required for spTransform methods - 1: spTransform(sp, CRS(toCrs)) at testthat/test_gdal.R:11 - 2: spTransform(sp, CRS(toCrs)) at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:93 - 3: stop("package rgdal is required for spTransform methods") at /tmp/RtmpvuUUir/devtools345049746f77/sp/R/Spatial-methods.R:97 + 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) + 10: external_img(src, width = width, height = height) + 11: stopifnot(file.exists(src)) + 12: stop(sprintf(ngettext(length(r), "%s is not TRUE", "%s are not all TRUE"), ch), call. = FALSE, + domain = NA) testthat results ================================================================ - OK: 190 SKIPPED: 0 FAILED: 1 - 1. Error: st_transform works (@test_gdal.R#11) + OK: 317 SKIPPED: 0 FAILED: 4 + 1. Error: image add (@test-docx-add.R#68) + 2. Error: pml fp_border (@test-fp_cell.R#75) + 3. Error: css fp_border (@test-fp_cell.R#165) + 4. Error: add img into placeholder (@test-pptx-add.R#67) Error: testthat unit tests failed Execution halted -checking installed package size ... NOTE - installed size is 8.5Mb - sub-directories of 1Mb or more: - doc 4.0Mb - libs 3.7Mb +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Quitting from lines 181-191 (powerpoint.Rmd) +Error: processing vignette 'powerpoint.Rmd' failed with diagnostics: +file.exists(src) is not TRUE +Execution halted + ``` -## tidyquant (0.2.0) -Maintainer: Matt Dancho -Bug reports: https://github.com/mdancho84/tidyquant/issues +## photobiologyInOut (0.4.13) +Maintainer: Pedro J. Aphalo +Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘photobiology’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## plotly (4.5.6) +Maintainer: Carson Sievert +Bug reports: https://github.com/ropensci/plotly/issues 1 error | 0 warnings | 0 notes ``` checking tests ... ERROR + Running ‘testthat.R’ [46s/47s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - AAPL %>% tq_mutate_(ohlc_fun = "close", mutate_fun = mutate_fun) - }, paste0("fun = ", mutate_fun, " not a valid option.")) at testthat/test_tq_transform.R:118 - 2: paste0("fun = ", mutate_fun, " not a valid option.") at /tmp/RtmpGs2f8Q/devtools11166987ba25/hadley-testthat-3b2f225/R/expect-output.R:147 - + [1] "Running test: plotly-group-within-trace" + [1] "Running test: plotly-alpha-blending" + [1] "Running test: plotly-alpha-no-color" + [1] "Running test: plotly-factor-axis" + [1] "Running test: plotly-character-axis" + [1] "Running test: plotly-histogram" + [1] "Running test: plotly-histogram-vert" + [1] "Running test: plotly-inherit-FALSE" + [1] "Running test: plotly-time-series-summary" testthat results ================================================================ - OK: 133 SKIPPED: 1 FAILED: 4 - 1. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#133) - 2. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_mutate.R#151) - 3. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#100) - 4. Error: Test error on invalid ohlc_fun, x and y inputs. (@test_tq_transform.R#118) + OK: 813 SKIPPED: 17 FAILED: 1 + 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) Error: testthat unit tests failed Execution halted diff --git a/revdep/timing.md b/revdep/timing.md index 9b6caa8e9..2c38f3a5d 100644 --- a/revdep/timing.md +++ b/revdep/timing.md @@ -1,94 +1,124 @@ # Check times -| |package |version | check_time| -|:--|:-----------------|:-------|----------:| -|15 |DiagrammeR |0.9.0 | 198.9| -|33 |heemod |0.7.1 | 165.3| -|28 |ggfortify |0.3.0.0 | 165.2| -|75 |sjPlot |2.2.0 | 164| -|30 |ggplot2 |2.2.1 | 158.7| -|27 |ggenealogy |0.3.0 | 120.2| -|87 |valr |0.1.1 | 105.7| -|83 |tidyquant |0.2.0 | 94.6| -|54 |plotly |4.5.6 | 77.9| -|73 |sf |0.2-8 | 72.9| -|19 |dplyr |0.5.0 | 70.9| -|76 |sjstats |0.7.1 | 64.3| -|31 |ggpmisc |0.2.13 | 62.7| -|78 |spbabel |0.4.5 | 62.7| -|82 |taxize |0.8.0 | 61.2| -|57 |radiant.data |0.6.0 | 56.6| -|59 |rbgm |0.0.4 | 53.6| -|34 |highcharter |0.4.0 | 52.4| -|21 |eurostat |2.2.1 | 52| -|22 |fbar |0.1.16 | 46.8| -|80 |spocc |0.6.0 | 46.7| -|51 |photobiologyInOut |0.4.12 | 46| -|18 |dotwhisker |0.2.3 | 43.8| -|38 |knitr |1.15.1 | 43.6| -|7 |bsam |1.1.1 | 43.1| -|52 |photobiology |0.9.13 | 41.2| -|3 |blkbox |1.0 | 39| -|65 |rgbif |0.9.6 | 38.9| -|62 |readr |1.0.0 | 38.7| -|70 |rnoaa |0.6.6 | 38.5| -|74 |sjmisc |2.2.1 | 35.9| -|81 |srvyr |0.2.0 | 35| -|11 |countyweather |0.1.0 | 34.4| -|14 |dat |0.1.0 | 34.3| -|53 |phylopath |0.2.2 | 33.1| -|44 |msgtools |0.2.4 | 32.3| -|79 |spdplyr |0.1.2 | 32.1| -|72 |rtide |0.0.3 | 31.1| -|40 |manifestoR |1.2.3 | 30.7| -|9 |checkmate |1.8.2 | 29.7| -|55 |poio |0.0-2 | 29.5| -|10 |corrr |0.2.1 | 29.2| -|2 |biomartr |0.2.1 | 28.6| -|77 |solrium |0.4.0 | 28.2| -|36 |isdparser |0.1.0 | 27.8| -|35 |hypoparsr |0.1.0 | 27.5| -|5 |blockTools |0.6-3 | 25.2| -|25 |geojson |0.1.0 | 24.8| -|69 |rmarkdown |1.3 | 24.7| -|66 |rgho |1.0.0 | 23.6| -|26 |getlandsat |0.1.0 | 21.8| -|64 |reutils |0.2.3 | 21.1| -|56 |pollstR |1.4.0 | 20.5| -|84 |tidyr |0.6.1 | 19.8| -|71 |rorcid |0.3.0 | 18.3| -|16 |docxtools |0.1.0 | 17.7| -|48 |openadds |0.2.0 | 17.4| -|86 |units |0.4-1 | 17.4| -|85 |tidyverse |1.0.0 | 17| -|88 |wand |0.2.0 | 15.6| -|32 |haven |1.0.0 | 15.1| -|43 |mregions |0.1.4 | 14.8| -|6 |bold |0.4.0 | 14.7| -|39 |KraljicMatrix |0.1.0 | 14.7| -|41 |modelr |0.1.0 | 14.1| -|60 |rbhl |0.3.0 | 14.1| -|17 |docxtractr |0.2.0 | 14| -|46 |nycflights13 |0.2.1 | 14| -|63 |refimpact |0.1.0 | 13.9| -|47 |oai |0.2.2 | 13.8| -|4 |blob |1.0.0 | 13.6| -|1 |abjutils |0.0.1 | 13| -|29 |ggguitar |0.1.1 | 12.5| -|49 |pangaear |0.2.4 | 12.3| -|23 |feather |0.3.1 | 12.2| -|50 |pdfsearch |0.1.1 | 12.2| -|20 |easyformatr |0.1.2 | 11.3| -|58 |randNames |0.2.3 | 10.1| -|37 |jpmesh |0.3.0 | 9.9| -|13 |datastepr |0.0.2 | 9.8| -|68 |ritis |0.5.4 | 9.8| -|42 |monkeylearn |0.1.1 | 9| -|8 |cellranger |1.1.0 | 8.9| -|12 |datapasta |1.1.0 | 8.9| -|24 |forcats |0.1.1 | 8.8| -|61 |rdpla |0.1.0 | 8.4| -|67 |riem |0.1.1 | 7.8| -|45 |natserv |0.1.4 | 7.3| +| |package |version | check_time| +|:---|:-----------------|:-------|----------:| +|61 |modeval |0.1.2 | 374.9| +|103 |sjPlot |2.3.1 | 224.2| +|19 |DiagrammeR |0.9.0 | 208.8| +|41 |ggfortify |0.4.1 | 197.6| +|111 |tidyquant |0.4.0 | 190.9| +|44 |ggplot2 |2.2.1 | 169| +|51 |heemod |0.8.0 | 161.3| +|66 |myTAI |0.5.0 | 156| +|50 |hddtools |0.6 | 140.6| +|40 |ggenealogy |0.3.0 | 125.2| +|3 |biomartr |0.4.0 | 105.1| +|116 |valr |0.1.2 | 103.4| +|23 |dplyr |0.5.0 | 96.6| +|101 |sf |0.4-1 | 90.8| +|79 |plotly |4.5.6 | 84.3| +|29 |fbar |0.1.23 | 82.5| +|85 |rbgm |0.0.4 | 81.4| +|110 |taxize |0.8.4 | 81.1| +|104 |sjstats |0.9.0 | 77.3| +|72 |officer |0.1.1 | 76.7| +|87 |rdefra |0.3.4 | 69.6| +|52 |highcharter |0.5.0 | 66| +|45 |ggpmisc |0.2.14 | 65.9| +|106 |spbabel |0.4.5 | 63.8| +|15 |cpr |0.2.3 | 60.7| +|82 |radiant.data |0.6.0 | 60| +|9 |ccafs |0.1.0 | 53.3| +|89 |readr |1.1.0 | 51.2| +|56 |jpmesh |0.3.0 | 50.2| +|22 |dotwhisker |0.2.3 | 49.7| +|39 |ggalt |0.4.0 | 49.7| +|8 |bsam |1.1.1 | 48.6| +|108 |spocc |0.6.0 | 48.4| +|102 |sjmisc |2.3.1 | 48.2| +|27 |eurostat |3.1.1 | 47.8| +|57 |knitr |1.15.1 | 46.5| +|77 |photobiology |0.9.14 | 45.6| +|64 |mrgsolve |0.8.6 | 44.5| +|33 |flextable |0.1.0 | 42.8| +|92 |rgbif |0.9.7 | 41.7| +|98 |rnoaa |0.6.6 | 41.1| +|2 |anomalyDetection |0.1.0 | 39.9| +|55 |isdparser |0.2.0 | 38.1| +|18 |dat |0.1.0 | 35.8| +|107 |spdplyr |0.1.2 | 35.8| +|109 |srvyr |0.2.0 | 35.3| +|65 |msgtools |0.2.7 | 35| +|78 |phylopath |0.2.3 | 33.9| +|14 |countyweather |0.1.0 | 32.6| +|36 |FSelectorRcpp |0.1.2 | 32.6| +|59 |manifestoR |1.2.3 | 32.6| +|100 |rtide |0.0.3 | 32.6| +|84 |rbcb |0.1.0 | 32.3| +|31 |fileplyr |0.2.0 | 31.7| +|4 |blkbox |1.0 | 31.6| +|13 |corrr |0.2.1 | 31.1| +|80 |poio |0.0-3 | 30.1| +|53 |hypoparsr |0.1.0 | 29.9| +|105 |solrium |0.4.0 | 29.9| +|95 |rif |0.1.0 | 29.6| +|54 |inferr |0.1.0 | 29| +|48 |GSODR |1.0.1 | 28.7| +|113 |tidyverse |1.1.1 | 28.4| +|12 |checkmate |1.8.2 | 27.9| +|25 |ecoseries |0.1.1 | 27.9| +|37 |geojson |0.1.2 | 27.1| +|97 |rmarkdown |1.4 | 26.4| +|34 |foghorn |0.4.2 | 26.2| +|115 |unpivotr |0.1.0 | 25| +|28 |evaluator |0.1.0 | 24.2| +|93 |rgho |1.0.1 | 23.4| +|6 |blockTools |0.6-3 | 22.9| +|118 |worrms |0.1.0 | 22.9| +|47 |gitlabr |0.7 | 22.1| +|91 |reutils |0.2.3 | 21.9| +|20 |doctr |0.2.0 | 21.3| +|38 |getlandsat |0.1.0 | 21.3| +|112 |tidyr |0.6.1 | 21.3| +|71 |odbc |1.0.1 | 21.2| +|70 |observer |0.1.2 | 20.6| +|117 |wand |0.2.0 | 19.7| +|49 |haven |1.0.0 | 19.3| +|68 |nycflights13 |0.2.2 | 19| +|73 |openadds |0.2.0 | 18.9| +|58 |KraljicMatrix |0.1.1 | 17.4| +|10 |cdata |0.1.0 | 17.1| +|30 |feather |0.3.1 | 16.8| +|63 |mregions |0.1.4 | 16.8| +|32 |filesstrings |0.3.2 | 16.2| +|99 |rorcid |0.3.0 | 16.2| +|7 |bold |0.4.0 | 16| +|21 |docxtractr |0.2.0 | 16| +|69 |oai |0.2.2 | 14.7| +|90 |refimpact |0.1.0 | 14.6| +|46 |giphyr |0.1.0 | 14.2| +|86 |rbhl |0.3.0 | 14.2| +|42 |ggguitar |0.1.1 | 13.8| +|114 |units |0.4-3 | 13.3| +|60 |modelr |0.1.0 | 13| +|75 |pdfsearch |0.1.1 | 12.8| +|74 |pangaear |0.3.0 | 12.7| +|24 |easyformatr |0.1.2 | 12| +|26 |enigma |0.3.0 | 12| +|96 |ritis |0.5.4 | 11.1| +|83 |randNames |0.2.3 | 10.9| +|1 |abjutils |0.0.1 | 10.3| +|62 |monkeylearn |0.1.1 | 10.3| +|17 |datastepr |0.0.2 | 10.2| +|11 |cellranger |1.1.0 | 10.1| +|16 |datapasta |2.0.0 | 9.8| +|5 |blob |1.0.0 | 9.7| +|35 |forcats |0.2.0 | 9.2| +|81 |prcr |0.1.1 | 8.7| +|88 |rdpla |0.1.0 | 8.6| +|94 |riem |0.1.1 | 7.9| +|67 |natserv |0.1.4 | 6.9| +|76 |photobiologyInOut |0.4.13 | 1.1| +|43 |ggimage |0.0.4 | 1| From 39798d89eaae89693322d0f18f68e81e2eac900f Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 29 Mar 2017 19:48:04 +0000 Subject: [PATCH 24/37] revdep update for clean state --- revdep/install/ggimage.out | 2 -- revdep/install/ggspectra.out | 10 ---------- revdep/install/gridGraphics.out | 11 ----------- revdep/install/photobiologyInOut.out | 11 ----------- 4 files changed, 34 deletions(-) delete mode 100644 revdep/install/ggimage.out delete mode 100644 revdep/install/ggspectra.out delete mode 100644 revdep/install/gridGraphics.out delete mode 100644 revdep/install/photobiologyInOut.out diff --git a/revdep/install/ggimage.out b/revdep/install/ggimage.out deleted file mode 100644 index 6a464886a..000000000 --- a/revdep/install/ggimage.out +++ /dev/null @@ -1,2 +0,0 @@ -ERROR: dependencies ‘EBImage’, ‘gridGraphics’ are not available for package ‘ggimage’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggimage’ diff --git a/revdep/install/ggspectra.out b/revdep/install/ggspectra.out deleted file mode 100644 index ecc794cf3..000000000 --- a/revdep/install/ggspectra.out +++ /dev/null @@ -1,10 +0,0 @@ -* installing *source* package ‘ggspectra’ ... -** package ‘ggspectra’ successfully unpacked and MD5 sums checked -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required -ERROR: lazy loading failed for package ‘ggspectra’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ -* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ diff --git a/revdep/install/gridGraphics.out b/revdep/install/gridGraphics.out deleted file mode 100644 index 2ddaee7e5..000000000 --- a/revdep/install/gridGraphics.out +++ /dev/null @@ -1,11 +0,0 @@ -* installing *source* package ‘gridGraphics’ ... -** package ‘gridGraphics’ successfully unpacked and MD5 sums checked -** R -** inst -** tests -** preparing package for lazy loading -Error in system("convert --version", intern = TRUE, ignore.stderr = TRUE) : - error in running command -Error : unable to load R code in package ‘gridGraphics’ -ERROR: lazy loading failed for package ‘gridGraphics’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/gridGraphics’ diff --git a/revdep/install/photobiologyInOut.out b/revdep/install/photobiologyInOut.out deleted file mode 100644 index 8339117bf..000000000 --- a/revdep/install/photobiologyInOut.out +++ /dev/null @@ -1,11 +0,0 @@ -* installing *source* package ‘photobiologyInOut’ ... -** package ‘photobiologyInOut’ successfully unpacked and MD5 sums checked -** R -** inst -** tests -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required -ERROR: lazy loading failed for package ‘photobiologyInOut’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ -* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ From 6e93fde63a87975aca6510401f0ec35eb5b1e4b4 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 29 Mar 2017 20:18:40 +0000 Subject: [PATCH 25/37] revdep update with r-1.3.0 results --- revdep/README-r-1.3.0.md | 1264 ++++++++++++++++++++++++++ revdep/README.md | 8 +- revdep/checks.rds | Bin 11278 -> 11286 bytes revdep/install/ggimage.out | 2 + revdep/install/ggspectra.out | 10 + revdep/install/gridGraphics.out | 11 + revdep/install/photobiologyInOut.out | 11 + revdep/problems-r-1.3.0.md | 424 +++++++++ revdep/problems.md | 8 +- revdep/timing.md | 226 ++--- 10 files changed, 1843 insertions(+), 121 deletions(-) create mode 100644 revdep/README-r-1.3.0.md create mode 100644 revdep/install/ggimage.out create mode 100644 revdep/install/ggspectra.out create mode 100644 revdep/install/gridGraphics.out create mode 100644 revdep/install/photobiologyInOut.out create mode 100644 revdep/problems-r-1.3.0.md diff --git a/revdep/README-r-1.3.0.md b/revdep/README-r-1.3.0.md new file mode 100644 index 000000000..38dcfe58f --- /dev/null +++ b/revdep/README-r-1.3.0.md @@ -0,0 +1,1264 @@ +# Setup + +## Platform + +|setting |value | +|:--------|:----------------------------| +|version |R version 3.3.3 (2017-03-06) | +|system |x86_64, linux-gnu | +|ui |X11 | +|language |(EN) | +|collate |en_US.UTF-8 | +|tz |Zulu | +|date |2017-03-29 | + +## Packages + +|package |* |version |date |source | +|:--------------|:--|:----------|:----------|:--------------------------------| +|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | +|knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | +|lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | +|microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | +|nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | +|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | +|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | +|tibble | |1.2 |2016-08-26 |cran (@1.2) | +|withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | + +# Check results + +118 packages + +|package |version | errors| warnings| notes| +|:-----------------|:-------|------:|--------:|-----:| +|abjutils |0.0.1 | 0| 0| 0| +|anomalyDetection |0.1.0 | 0| 0| 0| +|biomartr |0.4.0 | 0| 0| 0| +|blkbox |1.0 | 0| 0| 2| +|blob |1.0.0 | 0| 0| 0| +|blockTools |0.6-3 | 0| 0| 0| +|bold |0.4.0 | 0| 0| 1| +|bsam |1.1.1 | 0| 0| 0| +|ccafs |0.1.0 | 0| 0| 0| +|cdata |0.1.0 | 0| 0| 0| +|cellranger |1.1.0 | 0| 0| 0| +|checkmate |1.8.2 | 0| 0| 0| +|corrr |0.2.1 | 0| 0| 0| +|countyweather |0.1.0 | 0| 0| 0| +|cpr |0.2.3 | 0| 0| 0| +|datapasta |2.0.0 | 0| 0| 0| +|datastepr |0.0.2 | 0| 0| 0| +|dat |0.1.0 | 1| 0| 0| +|DiagrammeR |0.9.0 | 0| 0| 1| +|doctr |0.2.0 | 0| 0| 0| +|docxtractr |0.2.0 | 0| 0| 0| +|dotwhisker |0.2.3 | 0| 0| 0| +|dplyr |0.5.0 | 0| 0| 1| +|easyformatr |0.1.2 | 0| 0| 0| +|ecoseries |0.1.1 | 0| 0| 0| +|enigma |0.3.0 | 0| 0| 0| +|eurostat |3.1.1 | 0| 0| 0| +|evaluator |0.1.0 | 0| 0| 0| +|fbar |0.1.23 | 0| 0| 0| +|feather |0.3.1 | 0| 0| 0| +|fileplyr |0.2.0 | 0| 0| 0| +|filesstrings |0.3.2 | 0| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|foghorn |0.4.2 | 0| 0| 0| +|forcats |0.2.0 | 0| 0| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|geojson |0.1.2 | 0| 0| 0| +|getlandsat |0.1.0 | 0| 0| 0| +|ggalt |0.4.0 | 0| 0| 0| +|ggenealogy |0.3.0 | 0| 0| 0| +|ggfortify |0.4.1 | 0| 0| 1| +|ggguitar |0.1.1 | 0| 0| 0| +|ggimage |0.0.4 | 1| 0| 0| +|ggplot2 |2.2.1 | 0| 0| 0| +|ggpmisc |0.2.14 | 0| 0| 0| +|giphyr |0.1.0 | 0| 0| 0| +|gitlabr |0.7 | 0| 0| 0| +|GSODR |1.0.1 | 0| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|hypoparsr |0.1.0 | 0| 0| 0| +|inferr |0.1.0 | 0| 0| 0| +|isdparser |0.2.0 | 0| 0| 0| +|jpmesh |0.3.0 | 0| 0| 1| +|knitr |1.15.1 | 0| 0| 0| +|KraljicMatrix |0.1.1 | 0| 0| 0| +|manifestoR |1.2.3 | 0| 0| 0| +|modelr |0.1.0 | 0| 0| 0| +|modeval |0.1.2 | 0| 0| 0| +|monkeylearn |0.1.1 | 0| 0| 0| +|mregions |0.1.4 | 0| 0| 0| +|mrgsolve |0.8.6 | 0| 0| 1| +|msgtools |0.2.7 | 0| 0| 0| +|myTAI |0.5.0 | 0| 0| 1| +|natserv |0.1.4 | 0| 0| 0| +|nycflights13 |0.2.2 | 0| 0| 1| +|oai |0.2.2 | 0| 0| 0| +|observer |0.1.2 | 0| 0| 1| +|odbc |1.0.1 | 0| 0| 0| +|officer |0.1.1 | 2| 1| 0| +|openadds |0.2.0 | 0| 0| 0| +|pangaear |0.3.0 | 0| 0| 0| +|pdfsearch |0.1.1 | 0| 0| 0| +|photobiologyInOut |0.4.13 | 1| 0| 0| +|photobiology |0.9.14 | 0| 0| 0| +|phylopath |0.2.3 | 0| 0| 0| +|plotly |4.5.6 | 1| 0| 0| +|poio |0.0-3 | 0| 0| 0| +|prcr |0.1.1 | 0| 0| 0| +|radiant.data |0.6.0 | 0| 0| 0| +|randNames |0.2.3 | 0| 0| 0| +|rbcb |0.1.0 | 0| 0| 0| +|rbgm |0.0.4 | 0| 0| 0| +|rbhl |0.3.0 | 0| 0| 0| +|rdefra |0.3.4 | 0| 0| 0| +|rdpla |0.1.0 | 0| 0| 0| +|readr |1.1.0 | 0| 0| 1| +|refimpact |0.1.0 | 0| 0| 0| +|reutils |0.2.3 | 0| 0| 0| +|rgbif |0.9.7 | 0| 0| 0| +|rgho |1.0.1 | 0| 0| 0| +|riem |0.1.1 | 0| 0| 0| +|rif |0.1.0 | 0| 0| 0| +|ritis |0.5.4 | 0| 0| 0| +|rmarkdown |1.4 | 0| 0| 1| +|rnoaa |0.6.6 | 0| 0| 0| +|rorcid |0.3.0 | 0| 0| 0| +|rtide |0.0.3 | 0| 0| 0| +|sf |0.4-1 | 0| 0| 1| +|sjmisc |2.3.1 | 0| 0| 0| +|sjPlot |2.3.1 | 0| 0| 0| +|sjstats |0.9.0 | 0| 0| 1| +|solrium |0.4.0 | 0| 0| 0| +|spbabel |0.4.5 | 0| 0| 0| +|spdplyr |0.1.2 | 0| 0| 0| +|spocc |0.6.0 | 0| 0| 0| +|srvyr |0.2.0 | 0| 0| 0| +|taxize |0.8.4 | 0| 0| 0| +|tidyquant |0.4.0 | 0| 0| 0| +|tidyr |0.6.1 | 0| 0| 0| +|tidyverse |1.1.1 | 0| 0| 0| +|units |0.4-3 | 0| 0| 0| +|unpivotr |0.1.0 | 0| 0| 0| +|valr |0.1.2 | 0| 0| 1| +|wand |0.2.0 | 0| 0| 0| +|worrms |0.1.0 | 0| 0| 0| + +## abjutils (0.0.1) +Maintainer: Fernando Correa + +0 errors | 0 warnings | 0 notes + +## anomalyDetection (0.1.0) +Maintainer: Bradley Boehmke +Bug reports: https://github.com/bradleyboehmke/anomalyDetection/issues + +0 errors | 0 warnings | 0 notes + +## biomartr (0.4.0) +Maintainer: Hajk-Georg Drost +Bug reports: https://github.com/HajkD/biomartr/issues + +0 errors | 0 warnings | 0 notes + +## blkbox (1.0) +Maintainer: Boris Guennewig + +0 errors | 0 warnings | 2 notes + +``` +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘bigrf’ + +checking dependencies in R code ... NOTE +Missing or unexported object: ‘xgboost::predict’ +``` + +## blob (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/blob/issues + +0 errors | 0 warnings | 0 notes + +## blockTools (0.6-3) +Maintainer: Ryan T. Moore + +0 errors | 0 warnings | 0 notes + +## bold (0.4.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/bold/issues + +0 errors | 0 warnings | 1 note + +``` +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘sangerseqR’ +``` + +## bsam (1.1.1) +Maintainer: Ian Jonsen +Bug reports: https://github.com/ianjonsen/bsam/issues + +0 errors | 0 warnings | 0 notes + +## ccafs (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/ccafs/issues + +0 errors | 0 warnings | 0 notes + +## cdata (0.1.0) +Maintainer: John Mount +Bug reports: https://github.com/WinVector/cdata/issues + +0 errors | 0 warnings | 0 notes + +## cellranger (1.1.0) +Maintainer: Jennifer Bryan +Bug reports: https://github.com/rsheets/cellranger/issues + +0 errors | 0 warnings | 0 notes + +## checkmate (1.8.2) +Maintainer: Michel Lang +Bug reports: https://github.com/mllg/checkmate/issues + +0 errors | 0 warnings | 0 notes + +## corrr (0.2.1) +Maintainer: Simon Jackson +Bug reports: https://github.com/drsimonj/corrr/issues + +0 errors | 0 warnings | 0 notes + +## countyweather (0.1.0) +Maintainer: Rachel Severson + +0 errors | 0 warnings | 0 notes + +## cpr (0.2.3) +Maintainer: Peter DeWitt + +0 errors | 0 warnings | 0 notes + +## datapasta (2.0.0) +Maintainer: Miles McBain +Bug reports: https://github.com/milesmcbain/datapasta/issues + +0 errors | 0 warnings | 0 notes + +## datastepr (0.0.2) +Maintainer: Brandon Taylor +Bug reports: https://github.com/bramtayl/datastepr/issues + +0 errors | 0 warnings | 0 notes + +## dat (0.1.0) +Maintainer: Sebastian Warnholz +Bug reports: https://github.com/wahani/dat/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [11s/11s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-trunc-mat.R:5:3: style: Variable and function names should not be longer than 25 characters. + print_arg_names_without_ellipsis <- setdiff(print_arg_names, "...") + ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + tests/testthat/test-trunc-mat.R:9:16: style: Variable and function names should not be longer than 25 characters. + expect_equal(print_arg_names_without_ellipsis, trunc_mat_arg_names) + ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + + testthat results ================================================================ + OK: 107 SKIPPED: 0 FAILED: 1 + 1. Failure: Package Style (@test-lintr.R#5) + + Error: testthat unit tests failed + Execution halted +``` + +## DiagrammeR (0.9.0) +Maintainer: Richard Iannone +Bug reports: https://github.com/rich-iannone/DiagrammeR/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 10.6Mb + sub-directories of 1Mb or more: + extdata 2.4Mb + htmlwidgets 4.7Mb + img 2.8Mb +``` + +## doctr (0.2.0) +Maintainer: Caio Lente + +0 errors | 0 warnings | 0 notes + +## docxtractr (0.2.0) +Maintainer: Bob Rudis + +0 errors | 0 warnings | 0 notes + +## dotwhisker (0.2.3) +Maintainer: Yue Hu +Bug reports: https://github.com/fsolt/dotwhisker/issues + +0 errors | 0 warnings | 0 notes + +## dplyr (0.5.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/dplyr/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 23.5Mb + sub-directories of 1Mb or more: + libs 21.4Mb +``` + +## easyformatr (0.1.2) +Maintainer: Brandon Taylor +Bug reports: https://github.com/bramtayl/easyformatr/issues + +0 errors | 0 warnings | 0 notes + +## ecoseries (0.1.1) +Maintainer: Fernando Teixeira +Bug reports: https://github.com/fernote7/ecoseries/issues + +0 errors | 0 warnings | 0 notes + +## enigma (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropengov/enigma/issues + +0 errors | 0 warnings | 0 notes + +## eurostat (3.1.1) +Maintainer: Leo Lahti +Bug reports: https://github.com/ropengov/eurostat/issues + +0 errors | 0 warnings | 0 notes + +## evaluator (0.1.0) +Maintainer: David Severski +Bug reports: https://github.com/davidski/evaluator/issues + +0 errors | 0 warnings | 0 notes + +## fbar (0.1.23) +Maintainer: Max Conway + +0 errors | 0 warnings | 0 notes + +## feather (0.3.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/wesm/feather/issues + +0 errors | 0 warnings | 0 notes + +## fileplyr (0.2.0) +Maintainer: KS Srikanth +Bug reports: https://github.com/talegari/fileplyr/issues + +0 errors | 0 warnings | 0 notes + +## filesstrings (0.3.2) +Maintainer: Rory Nolan +Bug reports: https://www.github.com/rorynolan/filesstrings/issues + +0 errors | 0 warnings | 0 notes + +## flextable (0.1.0) +Maintainer: David Gohel + +0 errors | 1 warning | 0 notes + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Loading required package: officer + +Attaching package: 'dplyr' + +The following objects are masked from 'package:stats': + + filter, lag + +The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + +PhantomJS not found. You can install it with webshot::install_phantomjs(). If it is installed, please make sure the phantomjs executable can be found via the PATH variable. +Quitting from lines 39-41 (format.Rmd) +Error: processing vignette 'format.Rmd' failed with diagnostics: +cannot open the connection +Execution halted + +``` + +## foghorn (0.4.2) +Maintainer: Francois Michonneau +Bug reports: https://github.com/fmichonneau/foghorn/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 + +## FSelectorRcpp (0.1.2) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues + +1 error | 0 warnings | 2 notes + +``` +checking examples ... ERROR +Running examples in ‘FSelectorRcpp-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: feature_search +> ### Title: General Feature Searching Engine +> ### Aliases: feature_search +> +> ### ** Examples +> +> +> # Enable parallelization in examples +> library(doSNOW) # doSNOW has an option for progress bar +Loading required package: foreach +Loading required package: iterators +Loading required package: snow +> cl <- makeCluster(2) +Loading required namespace: Rmpi +Error in Rmpi::mpi.comm.spawn(slave = mpitask, slavearg = args, nslaves = count, : + MPI_Comm_spawn is not supported. +Calls: makeCluster -> makeMPIcluster -> +Execution halted + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ + +checking installed package size ... NOTE + installed size is 9.7Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 7.3Mb +``` + +## geojson (0.1.2) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/geojson/issues + +0 errors | 0 warnings | 0 notes + +## getlandsat (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropenscilabs/getlandsat/issues + +0 errors | 0 warnings | 0 notes + +## ggalt (0.4.0) +Maintainer: Bob Rudis +Bug reports: https://github.com/hrbrmstr/ggalt/issues + +0 errors | 0 warnings | 0 notes + +## ggenealogy (0.3.0) +Maintainer: Lindsay Rutter + +0 errors | 0 warnings | 0 notes + +## ggfortify (0.4.1) +Maintainer: Masaaki Horikoshi +Bug reports: https://github.com/sinhrks/ggfortify/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 5.7Mb + sub-directories of 1Mb or more: + doc 5.0Mb +``` + +## ggguitar (0.1.1) +Maintainer: Casimir Saternos +Bug reports: https://github.com/ezgraphs/ggguitar/issues + +0 errors | 0 warnings | 0 notes + +## ggimage (0.0.4) +Maintainer: Guangchuang Yu +Bug reports: https://github.com/GuangchuangYu/ggimage/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: ‘EBImage’ ‘gridGraphics’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## ggplot2 (2.2.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/ggplot2/issues + +0 errors | 0 warnings | 0 notes + +## ggpmisc (0.2.14) +Maintainer: Pedro J. Aphalo +Bug reports: https://bitbucket.org/aphalo/ggpmisc/issues + +0 errors | 0 warnings | 0 notes + +## giphyr (0.1.0) +Maintainer: Hao Zhu +Bug reports: https://github.com/haozhu233/giphyr/issues + +0 errors | 0 warnings | 0 notes + +## gitlabr (0.7) +Maintainer: Jirka Lewandowski +Bug reports: http://gitlab.points-of-interest.cc/points-of-interest/gitlabr/issues/ + +0 errors | 0 warnings | 0 notes + +## GSODR (1.0.1) +Maintainer: Adam Sparks +Bug reports: https://github.com/ropensci/GSODR/issues + +0 errors | 0 warnings | 0 notes + +## haven (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/haven/issues + +2 errors | 0 warnings | 1 note + +``` +checking examples ... ERROR +Running examples in ‘haven-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: read_dta +> ### Title: Read and write Stata DTA files. +> ### Aliases: read_dta read_stata write_dta +> +> ### ** Examples +... 14 lines ... +8 5.0 3.4 1.5 0.2 setosa +9 4.4 2.9 1.4 0.2 setosa +10 4.9 3.1 1.5 0.1 setosa +# ... with 140 more rows +> +> tmp <- tempfile(fileext = ".dta") +> write_dta(mtcars, tmp) +Error in write_dta_(data, normalizePath(path, mustWork = FALSE), version = stata_file_format(version)) : + Writing failure: Unable to write data. +Calls: write_dta -> write_dta_ -> .Call +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + + testthat results ================================================================ + OK: 132 SKIPPED: 0 FAILED: 9 + 1. Error: can roundtrip basic types (@test-write-dta.R#5) + 2. Error: can roundtrip missing values (as much as possible) (@test-write-dta.R#12) + 3. Error: can roundtrip date times (@test-write-dta.R#23) + 4. Error: infinity gets converted to NA (@test-write-dta.R#28) + 5. Error: factors become labelleds (@test-write-dta.R#33) + 6. Error: labels are preserved (@test-write-dta.R#44) + 7. Error: labelleds are round tripped (@test-write-dta.R#52) + 8. Error: factors become labelleds (@test-write-dta.R#59) + 9. Error: labels are converted to utf-8 (@test-write-dta.R#73) + + Error: testthat unit tests failed + Execution halted + +checking for GNU extensions in Makefiles ... NOTE +GNU make is a SystemRequirements. +``` + +## hddtools (0.6) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/hddtools/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [13s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", + sQuote(fdef@generic), sQuote(cnames)), domain = NA) + + trying URL 'ftp://ftp.bafg.de/pub/REFERATE/GRDC/ltdata/africa.zip' + ftp data connection made, file length 2730333 bytes + ================================================== + downloaded 2.6 MB + + testthat results ================================================================ + OK: 55 SKIPPED: 1 FAILED: 2 + 1. Error: Test TRMM function using dates in the past (@test-TRMM.R#15) + 2. Error: Test TRMM function using 3-hourly dates in the past (@test-TRMM.R#58) + + Error: testthat unit tests failed + Execution halted +``` + +## heemod (0.8.0) +Maintainer: Antoine Filipovic-Pierucci +Bug reports: https://github.com/pierucci/heemod/issues + +1 error | 1 warning | 1 note + +``` +checking tests ... ERROR + Running ‘testthat.R’ [33s/36s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) + 6: flexsurv::summary.flexsurvreg + 7: getExportedValue(pkg, name) + 8: stop(gettextf("'%s' is not an exported object from 'namespace:%s'", name, getNamespaceName(ns)), + call. = FALSE, domain = NA) + + .model from to prob + 1 standard RevisionTHR SuccessfulRevision + 2 new RevisionTHR SuccessfulRevision + testthat results ================================================================ + OK: 346 SKIPPED: 0 FAILED: 1 + 1. Error: (unknown) (@test_survival.R#23) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +'colour', which will replace the existing scale. +Scale for 'colour' is already present. Adding another scale for +'colour', which will replace the existing scale. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +... 8 lines ... + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Error in mutate_impl(.data, dots) : + 'summary.flexsurvreg' is not an exported object from 'namespace:flexsurv' +Quitting from lines 42-83 (j-survival.Rmd) +Error: processing vignette 'j-survival.Rmd' failed with diagnostics: +Error in parameter: p2. +Execution halted + +checking dependencies in R code ... NOTE +Missing or unexported object: ‘flexsurv::summary.flexsurvreg’ +``` + +## highcharter (0.5.0) +Maintainer: Joshua Kunst +Bug reports: https://github.com/jbkunst/highcharter/issues + +0 errors | 1 warning | 1 note + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Highcharts (www.highcharts.com) is a Highsoft software product which is +not free for commercial and Governmental use +Quitting from lines 45-46 (charting-data-frames.Rmd) +Error: processing vignette 'charting-data-frames.Rmd' failed with diagnostics: +cannot open the connection +Execution halted + + +checking installed package size ... NOTE + installed size is 16.5Mb + sub-directories of 1Mb or more: + doc 13.7Mb + htmlwidgets 1.9Mb +``` + +## hypoparsr (0.1.0) +Maintainer: Hannes Muehleisen + +0 errors | 0 warnings | 0 notes + +## inferr (0.1.0) +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 + +## jpmesh (0.3.0) +Maintainer: Shinya Uryu +Bug reports: https://github.com/uribo/jpmesh/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 206.0Mb + sub-directories of 1Mb or more: + extdata 205.2Mb +``` + +## knitr (1.15.1) +Maintainer: Yihui Xie +Bug reports: https://github.com/yihui/knitr/issues + +0 errors | 0 warnings | 0 notes + +## KraljicMatrix (0.1.1) +Maintainer: Bradley Boehmke +Bug reports: https://github.com/bradleyboehmke/KraljicMatrix/issues + +0 errors | 0 warnings | 0 notes + +## manifestoR (1.2.3) +Maintainer: Jirka Lewandowski +Bug reports: https://github.com/ManifestoProject/manifestoR/issues + +0 errors | 0 warnings | 0 notes + +## modelr (0.1.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/modelr/issues + +0 errors | 0 warnings | 0 notes + +## modeval (0.1.2) +Maintainer: Younggun You + +0 errors | 0 warnings | 0 notes + +## monkeylearn (0.1.1) +Maintainer: Maëlle Salmon +Bug reports: http://github.com/ropenscilabs/monkeylearn/issues + +0 errors | 0 warnings | 0 notes + +## mregions (0.1.4) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropenscilabs/mregions/issues + +0 errors | 0 warnings | 0 notes + +## mrgsolve (0.8.6) +Maintainer: Kyle T Baron +Bug reports: https://github.com/metrumresearchgroup/mrgsolve/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 6.2Mb + sub-directories of 1Mb or more: + libs 5.0Mb +``` + +## msgtools (0.2.7) +Maintainer: Thomas J. Leeper +Bug reports: https://github.com/RL10N/msgtools/issues + +0 errors | 0 warnings | 0 notes + +## myTAI (0.5.0) +Maintainer: Hajk-Georg Drost +Bug reports: https://github.com/HajkD/myTAI/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 5.3Mb + sub-directories of 1Mb or more: + data 2.0Mb + doc 2.3Mb +``` + +## natserv (0.1.4) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/natserv/issues + +0 errors | 0 warnings | 0 notes + +## nycflights13 (0.2.2) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/nycflights13/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 7.0Mb + sub-directories of 1Mb or more: + data 6.9Mb +``` + +## oai (0.2.2) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/oai/issues + +0 errors | 0 warnings | 0 notes + +## observer (0.1.2) +Maintainer: Paul Poncet +Bug reports: https://github.com/paulponcet/observer/issues + +0 errors | 0 warnings | 1 note + +``` +checking Rd cross-references ... NOTE +Package unavailable to check Rd xrefs: ‘validate’ +``` + +## odbc (1.0.1) +Maintainer: Jim Hester +Bug reports: https://github.com/rstats-db/odbc/issues + +0 errors | 0 warnings | 0 notes + +## officer (0.1.1) +Maintainer: David Gohel +Bug reports: https://github.com/davidgohel/officer/issues + +2 errors | 1 warning | 0 notes + +``` +checking examples ... ERROR +Running examples in ‘officer-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: slip_in_img +> ### Title: append an image +> ### Aliases: slip_in_img +> +> ### ** Examples +> +> library(magrittr) +> img.file <- file.path( Sys.getenv("R_HOME"), "doc", "html", "logo.jpg" ) +> x <- read_docx() %>% ++ body_add_par("R logo: ", style = "Normal") %>% ++ slip_in_img(src = img.file, style = "strong", width = .3, height = .3) +Error: file.exists(src) is not TRUE +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ [21s/21s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) + 10: external_img(src, width = width, height = height) + 11: stopifnot(file.exists(src)) + 12: stop(sprintf(ngettext(length(r), "%s is not TRUE", "%s are not all TRUE"), ch), call. = FALSE, + domain = NA) + + testthat results ================================================================ + OK: 317 SKIPPED: 0 FAILED: 4 + 1. Error: image add (@test-docx-add.R#68) + 2. Error: pml fp_border (@test-fp_cell.R#75) + 3. Error: css fp_border (@test-fp_cell.R#165) + 4. Error: add img into placeholder (@test-pptx-add.R#67) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Quitting from lines 181-191 (powerpoint.Rmd) +Error: processing vignette 'powerpoint.Rmd' failed with diagnostics: +file.exists(src) is not TRUE +Execution halted + +``` + +## openadds (0.2.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/sckott/openadds/issues + +0 errors | 0 warnings | 0 notes + +## pangaear (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/pangaear/issues + +0 errors | 0 warnings | 0 notes + +## pdfsearch (0.1.1) +Maintainer: Brandon LeBeau +Bug reports: https://github.com/lebebr01/pdfsearch/issues + +0 errors | 0 warnings | 0 notes + +## photobiologyInOut (0.4.13) +Maintainer: Pedro J. Aphalo +Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘photobiology’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## photobiology (0.9.14) +Maintainer: Pedro J. Aphalo +Bug reports: https://bitbucket.org/aphalo/photobiology/issues + +0 errors | 0 warnings | 0 notes + +## phylopath (0.2.3) +Maintainer: Wouter van der Bijl +Bug reports: https://github.com/Ax3man/phylopath/issues + +0 errors | 0 warnings | 0 notes + +## plotly (4.5.6) +Maintainer: Carson Sievert +Bug reports: https://github.com/ropensci/plotly/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [47s/46s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + [1] "Running test: plotly-group-within-trace" + [1] "Running test: plotly-alpha-blending" + [1] "Running test: plotly-alpha-no-color" + [1] "Running test: plotly-factor-axis" + [1] "Running test: plotly-character-axis" + [1] "Running test: plotly-histogram" + [1] "Running test: plotly-histogram-vert" + [1] "Running test: plotly-inherit-FALSE" + [1] "Running test: plotly-time-series-summary" + testthat results ================================================================ + OK: 813 SKIPPED: 17 FAILED: 1 + 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) + + Error: testthat unit tests failed + Execution halted +``` + +## poio (0.0-3) +Maintainer: Richard Cotton +Bug reports: https://github.com/RL10N/poio/issues + +0 errors | 0 warnings | 0 notes + +## prcr (0.1.1) +Maintainer: Joshua Rosenberg + +0 errors | 0 warnings | 0 notes + +## radiant.data (0.6.0) +Maintainer: Vincent Nijs +Bug reports: https://github.com/radiant-rstats/radiant.data/issues + +0 errors | 0 warnings | 0 notes + +## randNames (0.2.3) +Maintainer: Karthik Ram +Bug reports: https://github.com/karthik/randNames/issues + +0 errors | 0 warnings | 0 notes + +## rbcb (0.1.0) +Maintainer: Wilson Freitas +Bug reports: https://github.com/wilsonfreitas/rbcb/issues + +0 errors | 0 warnings | 0 notes + +## rbgm (0.0.4) +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 + +0 errors | 0 warnings | 0 notes + +## rdefra (0.3.4) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/rdefra/issues + +0 errors | 0 warnings | 0 notes + +## rdpla (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rdpla/issues + +0 errors | 0 warnings | 0 notes + +## readr (1.1.0) +Maintainer: Jim Hester +Bug reports: https://github.com/tidyverse/readr/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 12.5Mb + sub-directories of 1Mb or more: + libs 11.9Mb +``` + +## refimpact (0.1.0) +Maintainer: Perry Stephenson +Bug reports: https://github.com/perrystephenson/refimpact/issues + +0 errors | 0 warnings | 0 notes + +## reutils (0.2.3) +Maintainer: Gerhard Schöfl +Bug reports: https://github.com/gschofl/reutils/issues + +0 errors | 0 warnings | 0 notes + +## rgbif (0.9.7) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rgbif/issues + +0 errors | 0 warnings | 0 notes + +## rgho (1.0.1) +Maintainer: Antoine Filipovic-Pierucci +Bug reports: https://github.com/pierucci/rgho/issues + +0 errors | 0 warnings | 0 notes + +## riem (0.1.1) +Maintainer: Maëlle Salmon +Bug reports: http://github.com/ropenscilabs/riem/issues + +0 errors | 0 warnings | 0 notes + +## rif (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rif/issues + +0 errors | 0 warnings | 0 notes + +## ritis (0.5.4) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/ritis/issues + +0 errors | 0 warnings | 0 notes + +## rmarkdown (1.4) +Maintainer: JJ Allaire + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 6.6Mb + sub-directories of 1Mb or more: + rmd 6.1Mb +``` + +## rnoaa (0.6.6) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rnoaa/issues + +0 errors | 0 warnings | 0 notes + +## rorcid (0.3.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/rorcid/issues + +0 errors | 0 warnings | 0 notes + +## rtide (0.0.3) +Maintainer: Joe Thorley +Bug reports: https://github.com/poissonconsulting/rtide/issues + +0 errors | 0 warnings | 0 notes + +## sf (0.4-1) +Maintainer: Edzer Pebesma +Bug reports: https://github.com/edzer/sfr/issues/ + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 10.2Mb + sub-directories of 1Mb or more: + doc 4.0Mb + libs 4.2Mb +``` + +## sjmisc (2.3.1) +Maintainer: Daniel Lüdecke +Bug reports: https://github.com/sjPlot/sjmisc/issues + +0 errors | 0 warnings | 0 notes + +## sjPlot (2.3.1) +Maintainer: Daniel Lüdecke +Bug reports: https://github.com/sjPlot/devel/issues + +0 errors | 0 warnings | 0 notes + +## sjstats (0.9.0) +Maintainer: Daniel Lüdecke +Bug reports: https://github.com/sjPlot/sjstats/issues + +0 errors | 0 warnings | 1 note + +``` +checking Rd cross-references ... NOTE +Package unavailable to check Rd xrefs: ‘piecewiseSEM’ +``` + +## solrium (0.4.0) +Maintainer: Scott Chamberlain +Bug reports: http://www.github.com/ropensci/solrium/issues + +0 errors | 0 warnings | 0 notes + +## spbabel (0.4.5) +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 +Bug reports: https://github.com/mdsumner/spdplyr/issues + +0 errors | 0 warnings | 0 notes + +## spocc (0.6.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/spocc/issues + +0 errors | 0 warnings | 0 notes + +## srvyr (0.2.0) +Maintainer: Greg Freedman Ellis +Bug reports: https://github.com/gergness/srvyr/issues + +0 errors | 0 warnings | 0 notes + +## taxize (0.8.4) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/taxize/issues + +0 errors | 0 warnings | 0 notes + +## tidyquant (0.4.0) +Maintainer: Matt Dancho +Bug reports: https://github.com/mdancho84/tidyquant/issues + +0 errors | 0 warnings | 0 notes + +## tidyr (0.6.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/tidyr/issues + +0 errors | 0 warnings | 0 notes + +## tidyverse (1.1.1) +Maintainer: Hadley Wickham +Bug reports: https://github.com/tidyverse/tidyverse/issues + +0 errors | 0 warnings | 0 notes + +## units (0.4-3) +Maintainer: Edzer Pebesma +Bug reports: https://github.com/edzer/units/issues/ + +0 errors | 0 warnings | 0 notes + +## unpivotr (0.1.0) +Maintainer: Duncan Garmonsway +Bug reports: https://github.com/nacnudus/unpivotr/issues + +0 errors | 0 warnings | 0 notes + +## valr (0.1.2) +Maintainer: Jay Hesselberth +Bug reports: https://github.com/rnabioco/valr/issues + +0 errors | 0 warnings | 1 note + +``` +checking installed package size ... NOTE + installed size is 12.5Mb + sub-directories of 1Mb or more: + libs 11.5Mb +``` + +## wand (0.2.0) +Maintainer: Bob Rudis +Bug reports: https://github.com/hrbrmstr/wand/issues + +0 errors | 0 warnings | 0 notes + +## worrms (0.1.0) +Maintainer: Scott Chamberlain +Bug reports: https://github.com/ropensci/worrms/issues + +0 errors | 0 warnings | 0 notes + diff --git a/revdep/README.md b/revdep/README.md index c6aada28d..38dcfe58f 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -16,7 +16,7 @@ |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| -|assertthat | |0.1 |2013-12-06 |cran (@0.1) | +|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | @@ -270,7 +270,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [10s/10s] + Running ‘testthat.R’ [11s/11s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -619,7 +619,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [14s/22s] + Running ‘testthat.R’ [13s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -976,7 +976,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [46s/47s] + Running ‘testthat.R’ [47s/46s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" diff --git a/revdep/checks.rds b/revdep/checks.rds index 28db3aca2f14fdeccd747685bd2fef107c8ca005..90c5b06ebc54bdd47f7a27df116773adf455ce12 100644 GIT binary patch literal 11286 zcmV+xEa}r9iwFP!000001MPiHY$QjPUXS`uO^w#GSYUwt8;96xbx~qv{gG@om+C2Y zll`Y=tB0hd(F|tjsLZI$AoHgbkx8=JfT5c&z8QwSd-BnMZNPv50|pG(z+CN+tU<@b5>EdISFc*$z2kLUPX~Jq`XNjc&Vhr`hf`+bavXvVVB8 zy0X8rv`B331}9C^4RQr8|FYA`C0%K3J7>R z3cQoax$07f$*B1CDDis4Pjq`tj-}6>=M_2FK)HMTYvY1TwY@7P=?K}R<_>~My z%{^GRsg$|*e18P=Lr*yS+#PzEHoqDboQtWAkv$gi&7sSEk-pT+F*~AmbpHnq*M&D= zu5LM097d@>cE|eA=BDM#PA`7T9ep&4u5Sn|YH8M-<2Ld6U|`3rUOnc% zC35e0>9zgM@!r;!wRZd-9j&vhb<(VEl6AeKEj7E7dEGd#t#u$PE_%76#jP;c(Xim% zb~}?9lU-Grx%WYEtpL`W-KB|?PN&)J=F4=lDa)$N@+3$hsY%1V|& zcs=zI{^<8nGhB_~FrxZl`XT@5<6=P&e#fy;@B*Rdzv>&pJJw>6@;(ZIZ{gSPfB*ac z7Z!Xce)2oX7au-ZhF^TtU+^5N4F%K_$^a#Uk0M!cEhjWSe8_}LUBe^Lrh-wjKGfAk zpAHT*Png<3+zacOpnDgx1E1S@Ap{=^d>zf5)Hy5k35JRQS^L--(vJ95)ja z!V@xnikk-^ojc2ZlTtKE5y1H$v`v%yJGHSs#Q6gYdp@ z0uQ#Pd(OQaIs=o?t6ku@+e@g%Z|AT;z%>& zo4!fK5p~rNMT4Rt>e|3Q9C#7;_BAOUw`|r2HX_Gzy9_wqi6jl zdDg@;xJ!13?inn7+BSRySPm)-Ty}!p2T$|{2Ow=!%_ru-gYRu^Z6uh%bzeQ?b%Xjr z1yHMQsVAgwJ`M-iueg3_Q3qt8y6+3=2L|_whSpmJVlYx=2evmTmVs9=E0?C`A1U^4 z_SDb!FaI{GK*bx>6DVY746~6vjcj``*CFe|clw~w3$BCAV@9FCn}g=k5BEH;NGo4y z_AXTudl%64k1BP2#7jK^@X4<3`9667Qewb_4ev_Uow0D3?&)KY7P4F!zg-|Pga@OD z)Ol;**+!YnfUIfYWOXL(Ow+j^T?)rAev#v)q^=1a!oJzLknyaFkb-8bCq_Sb0y65U z=Sl|P$VNRO)7qg*&g?RL zE`mm=1WiT>eciJ?9I;rLk>`CK)u8b)qrNpg^h_!&_r8rf{rg74(<*4luv1S|eDH$# zptWqWuQ<$+)(v(He@D61);ta_>!U(hkXrek%t{vYEA;-TrhR^Eo7+s1ZT)^Y7sfly z(Fbr>K612*ln$f}30tW9kEkr0ld-^|5DK);A80D&8om#s;vA+XI1ZSEN~ z4C(aH(HMlZHzZ!*j{<)Uo>=MUw?HuY9Cgw3Md0d92Oqn(yw+PI(jVJwjeJQ3SIZsn zF_R&bL4P5lTmp%-yudcpvdDlD+r!y9Fa_P$T_(CkL6Zb6LTc(AM*`rtPldU!i1*RO z7I@f)uY!*xmt?(3B=ZeE95!-g7s))d@ce?R=ePgl^q({EcXzF`^7q@ z&T}xu?IKYxv=1+omRgwZ%rkHs{vUHoqA!wsdd?rH^YhQvNT+>=?0)v-#fz=YHPR*z zH=aDhs}5v$H1ZJ883<^_c)@HJ8AMCl_oFW$#5tBZ zVS1qYz@oO#;^n^!6wnovLj&bw2{!G3dSd=hA5iX*XUz2h?hfngzKz#q)8DIxrx$s6b~9LAju81K z8^aVE_3ZIKzV8h{fiqAW8F+)fz)Q_#exYv@G}MWYD!_MidV5xe^9tX3%1b?a{!hOS z7M(OR?zJ91MVHu*yNcl`fsaBt)kV3so?=EXmXaB(Ib=;&NJP`9TopIHa8`2duhZU>d0 z*^X-1i1kG3c`S3^rpKD>}G@<&4l$VW(!yNj>q>*rZ3?h}>EZ z0W=2Q!&Tp4)UX&mV(wX&B4g4P#vutP`t6pCQ*nMCJ(G(|E6={45CrEMr(#y>37`3G zdO{v}?lB#cbzS|{9D33@-2>*za6t2Ye@!X6>D+$r$202u3cEs(je7R`Yns&`Gl}Z0 z@*pdg71xJl?sC1%ICDFK#P<%C%?ef;9&Lw+$8eV@Qs;=`!DEk)KlN zBlXqB&hsbFAI&L05OjLV62%k}EyqxL?yC?vSPrIc&=nsZquSoUu3seI1f2Qg)9~*i zl+Zm@&8K*|K(LY*XqeJT3PE+UTYzIXqc6Os%i)~|F1L$Ak zdt`@fN8tm>QAeA5=20VL86GZDXmrqDsMmx4y+PJ^cVCTxqS1RBLiO+oXkvFTu}fM3yLYP>`{w; zHp{xY$6oA7R_Me&@$lx>N!E>BX)FqL#KCxrHa}$cn0UG#2-Ksv3+l-|f{M!88imo> zbQ|;92)k!~Q4QG|UN;ut#*?7x%|E~w+&bBEkLDME^5)H($WWU+49k#RRR($4QhH`odc)@MBC?>asKCb`ldXvPFcH(C4yChbo-A0Fe)Xg5)fds-vcVU`Lxvc{&5bii5o+|cux3&hq5WkKF zWscp3v_XA`UV~&G6jabSF@XwH+TpicB(6%qo>iML7YSKIzwzxCPxc=`J^QL2R3lLX zlfftqEvU^sfTo6y%DgUV-cz?gs;4RI8?NV$9WRjgrj)gu)O;uW1}>$0JuV<*)Xv_6 zM;n@O0cYP}(5Ubm{io;h&mngskK(iV=ivNEIU9E)C*;s!huqP67vZo|VHfU%9I5B% zagN3EA}7TpM3Kq716daC_G6M>T8R7V4tU>8W8u=0Hz!8HGj~PxpV;HS4!;L2THR zmwJNW);5)t!u<9z=$eO~v|y$yxoe5TQwEwM`$$9t4GPM#&xhj@SDPe%8aqpw1$6U8 z1d%g2#s}w9yq7C0-pgA1BGl{(#^IzL>xtWi2UK#03$hE6O1K^jaypfojP9yom%TIv z9a-3@W&l&%vUU78dm6e~AH&628TTrz!rW>2fb5Im^YgzcoT0^mu>b3KTQx!}Uu4#hsm*7~tf4F!Tlb&f zJE5%)?o7drNBAvpT|&~_+%5wN8m^LIKH32{w{{=wJbAJAs!nQJ@9nj{sH#~fquw*Ja4BJ5@Mq| zT;hJb|%g=y*n$1-3k^`#YRoh@>)YhSh#hq z1S=}92rKPNr;k|CYWLOjK*6(ne5i-c&eKCMYU~?6o%He8fm9XJ?-(YM7?%zsac%Bx zsHvvZ@-7~6CE&jjjogQ`g7bfXfl{lVo)rCd(1SX?z+^ zaNQW#_ogn3lGk-h+?(s9ambdnguN`` zos_VfA?y_qE@cTG#aJh&uROcK?>BIp!y<9fYun~8 z*$eoD)OWNvGHjbhqwG9 z^y%`wNSvts6|vV*@y90Jkt-J-~$cf-h` zksCgG_6v0D_XQu}aKLrqk4NyDQ4CSlo=pRzYDaNIyCuXB)k0T8OLM3AmAXAeyp#}gcgS7tkBJKJsCzCz3!T9LI?p!>Ygkn^ zEGIP#DXtqyGGH+1GXhFBDpy9~<9p%bR}x}XI@|*?g8pRU2%cR)xU{4Q?@SV^$58df z;!X?Xe^gAr95&kOE4}sdT}6Di=&dJOEbxcT)uI~i^j>2~*;rB9O}lS2(;q*;PuwPG~517|aW`nX24M%c!Tyed~cuLAR#lOYVDU zU(}D(g~5)ht?4CGG|Mo2Jo~j|O)t*QrNgv-B~iWUKRabf=JN6@31&a*xPD7+Sz>2vQ-$~79HYI#o9|gx($^8i5kT-+qd9LHrS$?AdpC> z?%wHP^iDDu`%0aDrNI#Q4cZ>mZNS*ILbmT;?6|wUoDRF4WZ3Oa47+>qY_hkry`6Sf zpaxGI?PReaTknlXDA5lD(;5bx_wKzpEvvC45B#@6vN8QK7MWsUH zq)HDQi@uy+K*_lRO4@1lpgOpQYU|cXxUJ$#RHPfDLvvB>^T0Y*r$&X_x8&`3Lk7hy zE+K8S8#&s6oNg0=((_?;i}^POIKi{~Af-bDVWyfbExG1UKTUt5g z9EM18HUjt1h0!LS=O{FAm=L8imGg<&=;ONfZ!U1#|7|>QE)cgD$+5*@{&vi58z@FL zz(jpv?1W1-J(mCwrp@i*AEj%=q)HvP(X=)Wr$Mf-kqtvVj{;IbZ3&5ys`>-p*uVsD z?2G--MQ?l;{qSOcZ(b~svrd2x`1{-$*$pi;mKvTfBP-|a0wtizSRRwzE{wgg)NQWz zNaLWHjzQlUe`B)nDKR(_4sn;QgJ)Gjja{uY07vZhc#w=+6Yh?%J6s*_z6A%UCal!6|3BFf^azdf zkJ(^AZ4SL3UT8GTC?5seMQb1On*ao@L3L^{XWZiM5PGr12p49a4xzPgBc!~+-m)Pd zHO0@X2Ms8So1UzlacSUJS*AqYNb;xQlMQ#Z@fJv+gq3iwUvfs)PdMw3@m50xicK+2>m6yjZ%$=4q z&f6QaIuM|OCyC;to)G!?z6iay?|aO04w*VW4HE|8eYt2`DLy+bL)-dHQ2T)E+te5Q zq$HZ(M43FmCbx`tPL0`ofl#Ut*K2~EdP3?vo066bK($R>K4jAOUI-8ElPxDsC_7s_ zEszIPXW}5zpGUBHlS8khywnp-uduu1cKPlSwVGZw#|ty_keQt0eLSnZNEK9`kdJ!8 z<-@PNz%|XlRgv7+$I)FM9V3RGFv`L;UB^Z{qIOa5caz>f`RSX#b1`D1ZrvZQfZg7v zzx%h)L}ZuR4!W&46kAM_>b5_omgi}5O8xDmdtnPh0s`$J8{3SQML~ZrQ=$k$sS@+y ztU^mxurz0wsT+*WZ7C{>elv+B!A$hIFY&aFvx`uaMsa9=8-e8wj-C{AQcnoYe+C~A z*(3L<069d~58-yucbG2%N0?`wP(|fg7@OM^UNC}oHKk`Cm4r`vH_o00&}zn6|KXX8 zjWO~0j#MWrQT*kzAE|y(q2nsSH*Cjx!nd&p4Mio!uzAMV2m@dGmM0HvbyF=4z|ONy z`+3We=4m@j;_PYIb~B+P`h|N;^02)$Ti`^T)Dt-KkLkf-^AYoeNjC9_UYN0&Mz`13 zsiRR{3l7g>d&EjMTh4fI<4K9_QRPj8CF_$i_&*UQ&Lrc`8J2z-L&~4k<3L%*NjI{o zXX4afNLcy`mQdBI^#txkg`;<=j~i7>f_6o@(?HH@dw)JFqeF#hXT(T7vGWQ>sv^I< z$Vlam^`Xs8%a@&A$!V9_BGcIEW=s~nGliFaO^V)~3af;X5L~$!zp4snZD!lDp71?~ z=qp;_PDGzac`<%3L(b{2omqI`{@H;8OwRy~n<>nV50W2O$oT0c-O%9gr2Z742`U8l~a zZ5o4?XADXru3o{cJSZna*DXfS``*RaMg_zG7xhHT8PAx`k`y@tDndoqicUx_QTC(U zJY*&p2zIX(jeNi@7Jg?nky~evU>7}hb}{Uv%}4v(-RF)u8ODx|aGR0}wt*qW^I_{I z>B@rC#b*sd4TAf=z-I%6idKi=xbUxrakCm2!bUTh&)lQN{LcR4&$qYc;q~WX`i;Tt z(BU8d0{A`cU}Vk{tm*{o2;?Y{ z>S(>YxM{xAUQEm$LeX`?o&S6Y?bpb+t18irVgtyL0I@b~xKWUR zMi@(_ArMHnWVR3H!xY@iqjn70c9;w$bqjw@1^`GS0~7>>xu|{jojXPQ?w2O^-K%et z0Mbbu+XTOaCM0M(H&<43AyY<w?i5u@0bY{BKi#b z$0iG(vTLl8Si8V8=qnh%q7k;9TGTnL2Sq_~q<#q1wa|tDA92}oQJg)kOJ%oIbia+X z>^FG1DCXn`@KglPsqySU>Y0?4o>3KNPs1m>#bV*on-8CulX}9Zd0*i0=8|XZKBECy zx7mOVM7#6J$QXuB6V*0##q_O&zGPEZl0OZh>};+vD+pEC)RnMOPYk{KX+0~ap4Kz6 zJl`8|50A~{F6f3OM`rwCw%`-@^B{j<>@{`hW8${{^Z#4892i?Rf0wAKXFK~WJ^Bm- z38ZFDJP0jtB_4o>w^5%cTW9u#-_rBXo>%xh^4;^pXHxAmX`lHsDOv5z7McDw?q-j- zdMIbKN2tPrW0swIV(HFTAP!;1enee@Gxz)az$WX*Dp7+(4HC5hB=%o=*i2lLL4n(L zk>AC}Ne_ewwDH*X(CAk-e8>5@3^jpBL~Z})v+}&CGJMCZ)Dug$9#A1++}Y&}L#vZ@ zeI&!nPPK_=I(M)=-!73w*TT#^YL>L+jC1YYzdJ1w_Rn6)1iN%cww5j+8tbn+zajHU zoj|=tLKd6K+qjAL8SXZHL3K8NYI$mdKyLy*T{KRerL5~UG4i1}y=)kJze!KHJiQT$WRPTww*USw}r zETkhB^@NHR1tr|^By$H$m}LFHLG&8V{t;m_bij#kRe0Bu*||$xw`R3( zx57*?VWpnHS@??EI1_v*822d%p<{Kg4a56t3jrZ*MA{MqeNdviVAeErvN0n*omJeL z3Ii8%QBTx-v>hrcWK$!%f#ag*sAEWVRSucIC^9_-5~j&Ei0=*HS?E63H+gt|2DGo~ zl-U2TVBR!>+L;YNJOA@-K#=Lw6G7)#!!8O{lh~oez_Lq)j#Uts?kyyY$!@pelc6)6gdCW|*K!-SUQZHD${T ziJ(yfpO;0lxgOory3UPl{LZ(8{7E#xs z>B1Bm?(-5=_^QgA#>{fY?09olVy22hgKX3jHGlf_DcP_AErOBtgM+-)DDTE|Lpagy z;atY$Y&^TWXAIR7k_P880g)AL<;*4^;TS3;S?3}wKvib#aVypnbQdP7T#uHTx-l=G zi0(tFTleNiGjc$yBC3#$A5ile_MxY!@r2HevXwQJIgOj_Qmi&B$HgiuYl@G00_UTr z9wU2}CoqKP`hmy#BM*Apb9K)}QfO{Xr+LhDistHhx|Z;{Q4*>Bs>+*&PCH{J>_-53 zqeTv~QBUMFw~UuekQZ#gq(jL%!&_|>-u45RH=zMtTyE2hso8sxr@X45C5NKKSLhvC zFa=v`rnB}h7ptgN=ZksWX;+BrABDJHN@89|f&P~+=7h+fpB=xlb`!$T=yY?Fx}4eM z+3)^~0R*7m8=4(3b=?mRSpj5=?341~h3)z9$KkRhP~x>PGmqRZjFKsGAH4+cppyiBcDVn+^!X?}dQoP_A<>mo{ z3uo;FFgyP`!o``w1MepT<7)~JJmO4e$6T`At?dg55nN$iH)^lC0rT9m#AdYIa(sNO z6-^YSXA2&bthii{a;H(cltJmeSq*|!;1e=ZPx!prZh@je6){yyjs|p4HW*%ya*JTI zoWSPuuipaLgpB+Eo7V;#V`PuZLQO}x)3C{g%-@*RXY&h19-i#(~Rd9oB)Dt%swSeN&6aKQq2!1WhoW{*+X1(~?to%wUO!h-Q z>Is~MZ3?)78NY6MsMn~A{vePTZb~)*12}KixK}u%no@8S`RbC|a`H_;-7+`*B!3z` z**TT;kK;<9bJ&c6`h<4qPg zij8`r=A+HP)nO|2hziGZWQ3Bo&r`LgBHwem{a){Zo(ep7VJ2oVr&qX4!Ea#ts`oeK<5f(6~QL8`+fbN zzrQnqUu_Ha@c#ks#5I@#Lvu zY+}|lHnTRO_N;6~70`iP)Ds;SWga(Og^qNR|#0y-1e9WkCB_x;i zQ9_M%kEl!@pb{|hL{b(sj{9}vD!{pId!$rQR z&l#2DAs#uJP~3p;G7K}G0Nv&Ag~pA|0^y-ANKzcey@0|19k=3eK;!G{!wIh6#Y0^( zPyaFAOA!B=59h|vW+&?Sn4}KRv^?Raw?d~0Lf?P5%WS0|?C7IWT*hSHflP5~GT#RA zE0dSLYMRte+SD|e%cwdiBzgzags1p?7$>}InkF7VV7i7K46wGq=ijF={`P zkF0S@%Hd@ONpC#b{d_a&ON$<{1l5*d_!*>Lvlw%{7_0AD+_W&%wx7b#8jrjY6*Bn_ zxI1JC4sUR2U~W?W+QGseV8P=L2@l%gLneJMe&1{GKFm%y z!#e;&{Dv^=Ib>s-(WLL*bp$i<*q-#>l%9RWl6z@pS-$Fw_cory)w|H^OvJ+B$L?4k z+ISeN?DXOf#iKl~Dmef?LZv!)JE|!@Q#mdgp9>h>CkMSn4VNC<6($rMz7)OF#Gx}W zb#iJ*)M(LZ5Yc<7Fy`?!#d9uYX&Q)8d;#Uke#Kc)@i$i#W zzUxt;$R9YlQ~sXOtH$1Z@onTb72ihgFv)FJ0!C}s@r_!LjGhrKGes<{{*x6u<5ttCGsUP(IzN6-|iHuX__$Ee93+ch;NU;4ZM M4;zF% literal 11278 zcmV+pEb-GHiwFP!000001MPjyZzM;SUr&FksnL2C11zvR>v4#!Ru?5!))&d{=1@|x zyV+lAwt7fP8qHvqh{}x03^KnIk;!7U0b_2y_+}XP`n0Eo0mG*Sd@|s}T-SfV0zU1* zCm(Dq;Ny>nTB zS=(P*Std4j!{esuhEoMD{i@TMO1j+GdOlsxyUgAHa##Cu?_u-Kbn#z@_H?Za$s2X= zLV=69oGUJMn2d{GixaQK{KU6c&@vGO77dd64qYCI?9E<|*%7tl`#*BH zF1!JAb<3gRFi!okJJyFbH?2T+ddaKq=)NCcUl&-|@J2~Pyb~~)f9BPI4+eI^@0Ae` zEHU+>7hc=n$$BrfwNCOD9j&vP-d$;HU9Fw;NJm>~b|>??NgmVySxM1L9W7~tg^q>= z@3z~y%!KTU%AD>Fz*n!?=>p<&DQnG6r`hdJq_iP1pR%gTtWM$-Qf?O@ccSKQv)h?0 z)19P(XWeOb*QTG|ZBM=XySkt*Y4o8vmJ+zcNm0Wlsqdu)p@Eacf0hl2`c9(X$cVL;lf6#eyLEjuWBag+ibHs;>)gq$MKdJrn}J zgI|C6!yo=%RPbW*jl_U6K#0er-3!~PFpR@b6Cp>nQgN}-ZFX6+G$1N zrzO~t!TgqPG5t`s60WozmC$Op)nCo_%&9&|rLHQlFPIGNKt?S!!OYd9UmVKa0RFK= z(7rneO(66=5y)aJO+jcOdRD-lv_SgY!k7DL#NB@W9WP`9!!#H^x+l~(LhgCYat;~U z7(@w!=)P|P54NUz&Zkq9cda1s<$4R-7CtsC(wd}gQP*>*J$}FfrU$@Ni%S`@Y5e?T zy4WnfK!&FHy8jP7{5f}gU7l{)?FyKh;;5e3T6|0o4x5h{h!pZbcrqXxmT7c*eVsZQ z)wS?&8dHq|OkpJtS_2L(Dgsdqp?8w(S?H|fp!4g8L;U&vp;JK|C7jd~G9Tab1efGd z$Xu6=xC!D&Gn1RXNyQO$)euF)q9N+)z&;#!$5W}7^5WyOQw>izz96Zg-W$4^#LYs0 z8RiAOHzMk3fD>=w||YI!UTqCx8FD|1jXD z82M*nRLsZ*Tz8M%8?54m|kY*4KT( z46X<2A+HfL9q z_^kqoAv_pGq|RFd&o;_r24u|wC$BTLV|bhloF83?#xQ=Ktcs9= zW~(Pg-+ux!>Z#{S2H@l%m=4r+-}x3rRIHZe35ryDpo_>_14*4SXhPOBG&?X8%q$I$ zpZzWT{Es(#I0G)~iIg))vm(r-(oEOsP!?n6iprZ#oHQRi{p&dmg!fJl8pTFEQM35e zvs}=CLN_2A2M+%2kGR`Bf~k!siomi|0G6-0`;{VS>1Y})Lks4ejF!%yem};{GoeLU ze`|^s=DK{y1i2?rdEPjH`*B|eG|<9oPx7v4d_-wgvE4haX*eKqJLv@KkGE0H)?RNizVE|O+i z@Mmws5QS{i6EdwGs^rWr!{;Jsgi6q4oY2=j+rtryl^J>7(@_l?j~ETC*`a4rVd>9n zPV}@28glH^6BX~jU;$_?57^fn=13a`8^K?HYPEG52bXleP!?oXzUSY}Nfz`g^uAxy zKEJumZ6?XKelMB}%25OFwLsl>yPa|r70r5p+(A;+t}QHb&H?uWX3>(@ zQ#K1HJMl8YrNeX?0bTc^b%U*)oiBD42-yi;ga$4MBz}DwE(nm{blS27|9-oW6aoDr zt^fpXTwb;&sfNHdGqi_sIy|w`&tCw+lh;j)e((*#vP|G3%Mr;pf>%bIrUw4)076nZb zvdXyL^rRnK4itCN3D z!Qb8W&f4o|kRAI>2Y$W{sXfiX47bZfz0f|qP*!Sbwlhz`ZS;S_Es4KK^2r&0pw2Ho zUniaRZL<6MlNT?x9;}l#dARxH8D4cDyQ7hZfX+}rD<%tOyV$6t(N}E_SVc#n8>>t4 zOKzbMUC-V%ba@be0TIrz%rVnL)dv=}1C}iRouh!Rpd1>ApE`=>_jfqr-5^h>>v}FO z|MTdo@311V+$l0-LLJSRto49X6NY$)?UYzEvjVfC`fg5CADqg-kP!cuRCIF}bT#O4 zBV7xY{AJFIiR4PC9FS3+wzjrCfGimfng$ojh|eQ|+}R$W$CKm1_Yez&00;E=OYUkb zijoj3aO@E`Oa`zgWJS9jr*p^5efeGO&h}ugCfKY4>WTTE-KX3m&zKtk+#S}}0~@c) zroUGVPcQQD?B=k#Ixq7_1!I_EqnH7kH_;EGYDCf`&Q{PzCso zPH)Fu`z9~9WW3a~=YRH1$jIZ6Y>Y$Jw8CbmA98O*6O(7Y=tl)3+faIT0F4-oEG`dA z7wEDAMTp7lWRL%DPUenEh)H;WJ2~rI zBZlesF7Y0p9zr>0Y6_%uXXYN`$BYZyn;9o*L7dbdnn&>t%?a9~Q4?sPYi_rg?n#C+ zq{PIV<`;n|TWWqAJQPw^>ItDUcwH7b(kZV?(>rQ0mjhuje6B{Bv)Jk7M$owlpbFcR zB0lN~oIiiYU@lIrfRhcId76!veSXNbA)iLd$0s5s6v~~UWT$45J&l&$grs>iFG*8j zr)I)QJ@L|bK##Z)yR{qwXbilEtG>agVKI8d+|w>aCZsJ4K@w8*+btQVlKg4(OfD|n znV0`%m2oOzrJnFv+@{CmzUPkUm~80kujbI>&dDAymxlv7-S=0OqMOa__x>vG<2QI$ z2(nSnet%7~`Vo_;-YO5WVp(x*SmrL*%Z)Sbznzo4_(27*)Y?(*^Iftl_#t%zi)={2 zVID+vt6YmM(oF(tGm{G58giSJ8-m_RvS%@qH#dLwH**?YD(EH&Cp87ljwi)~}dXjT%?j7B4ELa9YsAXN=2WgxJxiqZ4qe34lM^>W6T_Pq3yC)E&?a8pkd z-H0^YM;^LwN9wI+;!U55IN(;1j&glyv*Q3gUS>g%S5mi5^p}f?F8w?;B@5OZgxoe% z;Ey3W;-<@jfW>}Fk&o2Zn>){+Jb$#H{6Ns@DNmG8NVFV7>4mQ&n)*^PYWLHtDL6J(b*1) zOziANw-(#Rx(3j{B=E=%*^VOzlB15c@XVt|#4meDWAa~Bp~STL-4&eL7hK0_~b4UK%`g+vFz6)y}B z9uRbHA|p1CmKUtA#~J&6M13F|OB#7H#DZLA>j}%mw;8+Awf4G#2Fy#oO zT(j_b0~Wmj;DoA@FE;lclcU&sOI!G5$b$geK`|Y<$@T6wS30B-8Ev&4$5#^xz ztbkwB5j9?-9r9(A(toLJv%WnInr`8anr;)iN77O2;V!e)iaW-dEym7!6J=%*lwWr( z-j5gixnKO>sdmSXspH!$@9Lg-v8P#)6Z^!&n_I_uH+H45DAW-L<1O0!klAD6>3S$o zkK!(`O+4ZpB%9JV2N4M+_iCZSpWGLv~deTR8b3wgOR2XCk z_%;D)652(apnF15G(DV90<>L$CS7?#8R>c>d_UbrhkVq{?%SaR!bW##mQ1;=11%8l zI6lu5d%Rm;hhK{Y5a3=ex#g@yRj2;>Is6I+f-5t^V`RuYaV*if|;)5t|bmn7-)*@BQX&)C@9MTAC600 zZPNT%?5yM#(5+J~h9<<}*%a^9%8K`@);ozkjz?BeL?vW(}Fy zd}hoV%962l?+LyW+WO$m6x?`(-vZYqBrPoLGLWFrDjDXZ9q_@{?){x7FZP~%@f?>m z6)BIF)S$%If~(cM9kO*Cz|;c>RZR|cLuza1{}oi3Xh!`}&yV1>uZx(bZ+k(v6#FW7 z8vEUen1hTIVgJJH-?@TDF;Y*^eDs1D!Xr;Lvguo(Hj@n>6Ev#s`WCZ64?Nkof53x5 zs2{Qb&)aE5gxIJKmwGvNFn22Xs)|>c3eNtE@mpZpia4n!c>eig>XBbtA&MIBr4@F2 zy=sQglnfGmtIXZ6F-AN9n_@>4DjDS5_5=285A0l)jgE*>jd-;C#eEp2j zsVb!32quykmkuLwJ=oh+Q%$K&yLcp(L>E$(R+MqgWgZ`Rwy%m@sE$X4vbv6vrO$90pM?|LFb4LgGnYll8@eSvUFc+S$X2!Vrl+l@$sKJaxdiD=hBNN_eN_Rr7>}JZ7&1PfSa9CtkIX$4)y(nCr)qR_&yO zHSUx&kj2Cu)C1;&qh15PBG8Z-;jp7Af*H0$F?MIF+@hk0SfJ zW5=Fn;pq^A;4pj!m~!Vn@kbl_4^t(~r_wpUUubTzazcZy%B+f&3VDKU44+~vWTsPK-u z=K{3Q84RHFe6z5IJF14&w1y$Ybt6dz3hs$|!t%FM9l1N~}spdq8~XPbQAw z*#(3vD~j;;B%yi?RbMRbv_Ss-V*1sn(eAv`Td&?##CMC{dZNX`VA#AyCZ8AgC-zm}}&CD~KyFs)xpRd4!li>7Hw zQ1R7Q7!Js9IxDi(?Y{n?;wl2T=Qm8;8Fd^C8;fB&27-h`-5MTXG5jbE;;_K-4E5cl zA+&Ewb&slj1&a+}mnB+IeulWvei}Ejq-binW*AzXg>5 zi5kUo+qd9LHrTS7Adpz6?%wX_*92TGlOrNI#Q4cZ>mZNS*IMz-&r@3_0Vnhm?1 zblB}q47+>qY_hkry`6Pes0L3Q?PRhHho@O2(iaQkU^zVom)6v4T3#q%&i7qauHJdG z!-H2?4o`$YJ!Nid(+xa$LGqB>-1m;S-h9EC2z8y44L`oB7T+tOYFUgqUdbuZSEJ0S z)GKZ6PR{IMEESnl6WL2%N%r=7vejFA{jzs;9h6or-op)Yuz@=`Whjo;*JbE9RE)JG zMKH5*3^OEzSR9sOL@pz>wt&4?VLwIQMf63}nBE?|sFISlP2m25oU z{1gRURD;V#rzAKpsoq;zJK-FLSaLQ(_t1sWCYk3bG;o*@WiyqtiP`w$y855aaohhb zJa8@)x0cDs;xK<3aoYw8-v*edFN_^?six-=0K&9|UHqeTjf7OG<2IVs#?ds$4K%W8 zsOM2YDyS_HF;Z23;2Rs5;EjE;AG+v`@1h@G?4QhwrE=B@(E)#-JHFk}B4erH1v0jB z-YQT6s*L3c*{#CZ8!O%BogQf%G_x`2JL7Lm7Cs>cN6I1YvUTvRN~p1`l?LEQ+#V0o zacjce5jU*DM9|1NcyGtnM0iZ-PPK$`csx;;!o8gHboq!h;(AU)$Wu>RAtj%OE@;>r z2ZKYrs21EKCTdySwD8=cpe&5vySWmx6Oep}{ujTCr>Q5!Q@Z$P=crh{vGVG1(uR^W zFv3~drV=}2DKf5NA?XbRg1<(Qf!i}ekV}zDz~zF9QY2Ws&)RbwCUj11wG8~o0~ESw zl!b&)vSOLF+5|Pbp`Hy{O%$0;H3gHWkX~hEuQ!%Z0leZwce#%Nc`~TxjL66Wl|CkL1)aKCp(S=5%jPg;iU9|QgzYRgq8dRqSbH*+1 z4xtxIjBrurcR(lx%A4#h8}U(7{JeV5fTFnR>Dn2W27Z-gO4RiDHmk%g(>LqVlG(3v;K{{8=LX7>#eR^S0uno)G!yo`}4+?|IB}4w*VW4HE{@ zeYt2`D?U3dN89>bQ2T)E+cXgTxFnk2M44%TO>PxdXW5jrS^%nT z>hd9zf%igqXrF93NkZA#+F5~VKy@Y#A}tON`8@!tLgw|^q&iuP<1e57NcHmy9ajmyQ9ITXzKuO-C@L|A%`?V) z415__o;`xJI^}p=PgH?C+#pvvS(r2&4rHG{M~6_dttu7i8-k!a26lagTv+{ z<_VKLz$1EL#%3DbUSFq`q1X4706Dn=#?Q7A=ta*YWVV9A$ynzbkP!>=+$(}__-Zr~(szEX_6#ga^bUOyoK~I%U!G=sQ zc%g!0k3u&)<|y!@{gg;~3`9~n%pXyk<6hu%@r|!A`$!tAp2)oUlsn`xQwL&g94HrM zOWmC`6c@&>Q|Hn)jX}#Z1|<CJ_YL315=#(19^#=cJlR7a3( zoj?ULK+`WY$a59CYcV6qG1QPkhcd~F=BQ*KJlBMJqG)%Y5UsaNEQT7Yx>-uLX(-0j z)=-JHEhU@V_IAG9DvQeXaf+WRp#Zua*@AzsJruy*b>dt5xN$@^iI#2c$Hv8`oNA=B z89>agWi8avdUtWte5bvxq8bU8+DRj4rPSYC9npoN>qI;M`4HN#G2O1JL^qBNAbkO1 zZP;+*AOVdimP$h)kZ#I+A1p>GxS2=o7_#js8A|FF{+bK`kVOV42nusv`|dlpi}u~G zOzgW?-zEX1lO(nYehE!T&~|RD-I)rR;yX4O`uhV<7%&LO1dyP^NQAMiR;S~UNqJKF z&f4l!3^IHX=vzGG-6Lv`wB^}3THg=Sm%IJ?q5}LV+mckH&1*&b$U1jA&CcBpY53lV z2^Avx6#K^}3!kuStddwe$1~_F7{B5Xww_wl8LS6IL2;yh2-UUFh5#RN*>X{mJ*!LQ zw^VfJwW+Jhge~Ue2k=w`&x!HuK97lo4V5cSqSB4b4&ADx~Z_KD`lmg7<%>7 zde%-nt;e^#z#DK6kIm#R=!PXnX8du!;1lB@+{&=g0^Ky)=u;7?yr=D24{WXX~n6V#Gm*C9(9zU?j#z-Y!x+a4PI%7*VGe=0*wAW~7=@BhP`?DtiM?}U|lV(I36DkO|M zyPRQYb+V!RGP>+kn|Nk(2iptm5?ORL%A7{cinf|_uKn_-Cq=^k`74=VSJq@}<@W10 z!TzT6Te6te3DoN(VzH^bjhkqn;chb!RA-APmZvrd^d{ibMdQ?I%DP??BOi*B%SN&H zoAj8=lM7;S94O09Q`X`#@JvCSQxAcPitgw)dT+|aPS{#&c$CJz*FkzC70|(K=Y>^~QLS}mZ!H638wk8*vZcX zZ_dlGP+=yRvQkgrEPc&woC!V@j0Y5i&`8~D!|1-+LO?_tleWY_AC%}Wm^BNXe9Vac zhj0GCgq`E4H%rA;ePoacqvJK*U6L=PS!1V__IzI#2 z*K|tk|Ccdu7D4UY2B5uf-hAyBxu_?C&aj4E6sjh*Ly3W9mkJ%LAXG_y?Rxnw(3X*l zdP3%v4)8nCXekUf6eTM1)hM$FFqw?`<-7n>!5kCuQBTO6LCO?vaL9n;+ak!-HTxwF{Go0C@O<(XW;t3765eu2(?}a8WnJM8%umH9UQMg7Nyqpe>?oc)BEt2B(Pwkmd!M z3PD>$U5BP~Q)qa=OH|=2DsL7ut2wjdhi`-Z2-&D7YJT?gDcQ6EErOAagM(?S(X<=S zb>YOjho>?w<>T3{pGp}?NW(LkfXJG*c4`xla10fataBa~penQWq!sH4x^oj%u18Bv z-IzC>i0(s~Tla&1Gbb02DxwP6_yIMqVIO*i8c*olC|g-mnX|abFU7X!HN;g}SyOz} z6F46}^%&W+Jb@uRHx4}3_dV!s&(%E_Nujwlolaw>Q#4nfrfZ3S8zqt2uc*9P=(OL2 z6N;*c9Au-O$Z2jFFPR`O*nmlgk`0EpnjhWvLzg$90bN{f(~Ozfdy%KSs-Pu@qQqC| zqAZw#tu(V)`&WN+8d;MNpDpHfr(Gege;nd^C5?F<2l`(*pA#ZKJ3W47?Iwhg(dotm z>T+h2XTSe%1`vRLZ)kSN)O9~RWCf5dvQNr`7q%C`ABW45K#5nQ%xUCyVU)~}`*>bE zJSvQm5g$Lm<&2eh0LEk#qeRJcUDL5de# zE3 zMx&8dG*OhEEqGY6;&Ls{oki(N-h%!XxCO+F)Du3hwp*YmP(?!3lKy}W$_B%0ac&W8 zR#Vt~@ixFFV&n(dyf)YvzCA7rH67>9!X_UwfAg(?jbfypusJV7xb!`}WUh8a<;~(I zzmN9uTd-!Q*r+FJnvVoCaTg>r9O{xS+vbvNn2?BDAyr~E+?Y(5E|bux;;2mGTv2(m zxXFiO-Tdo0$(t&;K{o1%oAX*g3Ft9@Sz-jg8fDJn=1zY5qTCpu!&xlrRF|eI1S+l*OGN%)9**06}|7c#GvlRr6Vxyj@`S3yL z>M)ghM1|wIazw{u!=<_#8dVP{NT{GSeSYKxWd{@_*|V_8J6zw5!SN;^P>^s^Pvm_3 z6tMCbv|wh#oGP$z6ZROlU?&L`V}rPKz&+h-9Z|akI+ro42sWAB@0(L?B1?$pu?2he zJbXebY%IYxtS4aqDT4F>4l^c^gsh zR1QoR=86vFqMqnDFB8$o6M&r(6H$~o3!D5%xHhk)j0z^Ah>w5rz?pc(qohsg;2_!- zAKm|ix}HPr@dFk_=Y}NZV0d$=2ogrF4(!8$cbv$Nf$a^FH->BdaL@D7Ixi1A+eoh^ zb&~$mbvjHtQ&(|96Rx4x1a-}{;jSxw92&5+JoK7Kd&CRfU_4?puu_ssx}Q>G-9DA+ z15^S=o=6KrLh|qjoMLEkhwUWKGCV!yd;t$x#IWo6lwf3Wd6+)>O0>uq_c^0-Jj5eM zQ;O^GT}ENXQ=q#XzR;wxStva81xbs;xEE3wpp#Y{4rp?HZ8*X8J9wx|?&&|qdkNw{ z_u*V0+U!^zACuPMnU*Kq>{jSBMd*7EcbTp9gB{)XlQJgr4rGQ?lLa=2Uzxu271N}4 z+NP$-Tt?MFA@MtyCOjqJ!zAGy(=_o=o0KopR0mvUw;1%ho4ZxMi*fsz+_%OVDTkLC zq`mQI_lpNPV&C0Kpe;--b6wu20Y*4X!aDrEW{aCgX39A4+r zz}&R_)dSyQ(n_9v2vfBbv!4rUA8>seV8N3Q2@l%gLnZ?+dEcw>KFm%z!#e;&@`f<$ zIb>s-(X{X0aRf8**q-d(l%9RW(tBy z5b=AdFy_fM#xY1K6ap zJTH9XKoiLWFnB<6joZTG4iIUPcpqm{dAh|f$yHmYl2?p2#3Wg2i$ipSzUy(J*dI8( zQ~sXut0vxj$!+X5mE6YeFzIbx0>*3C$&Ff&jGqxNGsP@qD+h7e$R?c2jjVlfZe+lT z5tYu&<0eznt@v80xA7BGtz~*hyqt9kj-VM-Z5p8XPEeCSwrgfgzVMI#AE<=p9r{NB E0ElD;0ssI2 diff --git a/revdep/install/ggimage.out b/revdep/install/ggimage.out new file mode 100644 index 000000000..6a464886a --- /dev/null +++ b/revdep/install/ggimage.out @@ -0,0 +1,2 @@ +ERROR: dependencies ‘EBImage’, ‘gridGraphics’ are not available for package ‘ggimage’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggimage’ diff --git a/revdep/install/ggspectra.out b/revdep/install/ggspectra.out new file mode 100644 index 000000000..ecc794cf3 --- /dev/null +++ b/revdep/install/ggspectra.out @@ -0,0 +1,10 @@ +* installing *source* package ‘ggspectra’ ... +** package ‘ggspectra’ successfully unpacked and MD5 sums checked +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required +ERROR: lazy loading failed for package ‘ggspectra’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ +* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ diff --git a/revdep/install/gridGraphics.out b/revdep/install/gridGraphics.out new file mode 100644 index 000000000..2ddaee7e5 --- /dev/null +++ b/revdep/install/gridGraphics.out @@ -0,0 +1,11 @@ +* installing *source* package ‘gridGraphics’ ... +** package ‘gridGraphics’ successfully unpacked and MD5 sums checked +** R +** inst +** tests +** preparing package for lazy loading +Error in system("convert --version", intern = TRUE, ignore.stderr = TRUE) : + error in running command +Error : unable to load R code in package ‘gridGraphics’ +ERROR: lazy loading failed for package ‘gridGraphics’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/gridGraphics’ diff --git a/revdep/install/photobiologyInOut.out b/revdep/install/photobiologyInOut.out new file mode 100644 index 000000000..8339117bf --- /dev/null +++ b/revdep/install/photobiologyInOut.out @@ -0,0 +1,11 @@ +* installing *source* package ‘photobiologyInOut’ ... +** package ‘photobiologyInOut’ successfully unpacked and MD5 sums checked +** R +** inst +** tests +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required +ERROR: lazy loading failed for package ‘photobiologyInOut’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ +* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ diff --git a/revdep/problems-r-1.3.0.md b/revdep/problems-r-1.3.0.md new file mode 100644 index 000000000..c7b531863 --- /dev/null +++ b/revdep/problems-r-1.3.0.md @@ -0,0 +1,424 @@ +# Setup + +## Platform + +|setting |value | +|:--------|:----------------------------| +|version |R version 3.3.3 (2017-03-06) | +|system |x86_64, linux-gnu | +|ui |X11 | +|language |(EN) | +|collate |en_US.UTF-8 | +|tz |Zulu | +|date |2017-03-29 | + +## Packages + +|package |* |version |date |source | +|:--------------|:--|:----------|:----------|:--------------------------------| +|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | +|knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | +|lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | +|microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | +|nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | +|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | +|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | +|tibble | |1.2 |2016-08-26 |cran (@1.2) | +|withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | + +# Check results + +11 packages with problems + +|package |version | errors| warnings| notes| +|:-----------------|:-------|------:|--------:|-----:| +|dat |0.1.0 | 1| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|ggimage |0.0.4 | 1| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|officer |0.1.1 | 2| 1| 0| +|photobiologyInOut |0.4.13 | 1| 0| 0| +|plotly |4.5.6 | 1| 0| 0| + +## dat (0.1.0) +Maintainer: Sebastian Warnholz +Bug reports: https://github.com/wahani/dat/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [11s/11s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + ^ + tests/testthat/test-trunc-mat.R:5:3: style: Variable and function names should not be longer than 25 characters. + print_arg_names_without_ellipsis <- setdiff(print_arg_names, "...") + ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + tests/testthat/test-trunc-mat.R:9:16: style: Variable and function names should not be longer than 25 characters. + expect_equal(print_arg_names_without_ellipsis, trunc_mat_arg_names) + ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + + testthat results ================================================================ + OK: 107 SKIPPED: 0 FAILED: 1 + 1. Failure: Package Style (@test-lintr.R#5) + + Error: testthat unit tests failed + Execution halted +``` + +## flextable (0.1.0) +Maintainer: David Gohel + +0 errors | 1 warning | 0 notes + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Loading required package: officer + +Attaching package: 'dplyr' + +The following objects are masked from 'package:stats': + + filter, lag + +The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + +PhantomJS not found. You can install it with webshot::install_phantomjs(). If it is installed, please make sure the phantomjs executable can be found via the PATH variable. +Quitting from lines 39-41 (format.Rmd) +Error: processing vignette 'format.Rmd' failed with diagnostics: +cannot open the connection +Execution halted + +``` + +## FSelectorRcpp (0.1.2) +Maintainer: Zygmunt Zawadzki +Bug reports: https://github.com/mi2-warsaw/FSelectorRcpp/issues + +1 error | 0 warnings | 2 notes + +``` +checking examples ... ERROR +Running examples in ‘FSelectorRcpp-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: feature_search +> ### Title: General Feature Searching Engine +> ### Aliases: feature_search +> +> ### ** Examples +> +> +> # Enable parallelization in examples +> library(doSNOW) # doSNOW has an option for progress bar +Loading required package: foreach +Loading required package: iterators +Loading required package: snow +> cl <- makeCluster(2) +Loading required namespace: Rmpi +Error in Rmpi::mpi.comm.spawn(slave = mpitask, slavearg = args, nslaves = count, : + MPI_Comm_spawn is not supported. +Calls: makeCluster -> makeMPIcluster -> +Execution halted + +checking package dependencies ... NOTE +Package suggested but not available for checking: ‘RTCGA.rnaseq’ + +checking installed package size ... NOTE + installed size is 9.7Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 7.3Mb +``` + +## ggimage (0.0.4) +Maintainer: Guangchuang Yu +Bug reports: https://github.com/GuangchuangYu/ggimage/issues + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Packages required but not available: ‘EBImage’ ‘gridGraphics’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## haven (1.0.0) +Maintainer: Hadley Wickham +Bug reports: https://github.com/hadley/haven/issues + +2 errors | 0 warnings | 1 note + +``` +checking examples ... ERROR +Running examples in ‘haven-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: read_dta +> ### Title: Read and write Stata DTA files. +> ### Aliases: read_dta read_stata write_dta +> +> ### ** Examples +... 14 lines ... +8 5.0 3.4 1.5 0.2 setosa +9 4.4 2.9 1.4 0.2 setosa +10 4.9 3.1 1.5 0.1 setosa +# ... with 140 more rows +> +> tmp <- tempfile(fileext = ".dta") +> write_dta(mtcars, tmp) +Error in write_dta_(data, normalizePath(path, mustWork = FALSE), version = stata_file_format(version)) : + Writing failure: Unable to write data. +Calls: write_dta -> write_dta_ -> .Call +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + + testthat results ================================================================ + OK: 132 SKIPPED: 0 FAILED: 9 + 1. Error: can roundtrip basic types (@test-write-dta.R#5) + 2. Error: can roundtrip missing values (as much as possible) (@test-write-dta.R#12) + 3. Error: can roundtrip date times (@test-write-dta.R#23) + 4. Error: infinity gets converted to NA (@test-write-dta.R#28) + 5. Error: factors become labelleds (@test-write-dta.R#33) + 6. Error: labels are preserved (@test-write-dta.R#44) + 7. Error: labelleds are round tripped (@test-write-dta.R#52) + 8. Error: factors become labelleds (@test-write-dta.R#59) + 9. Error: labels are converted to utf-8 (@test-write-dta.R#73) + + Error: testthat unit tests failed + Execution halted + +checking for GNU extensions in Makefiles ... NOTE +GNU make is a SystemRequirements. +``` + +## hddtools (0.6) +Maintainer: Claudia Vitolo +Bug reports: https://github.com/ropensci/hddtools/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [13s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", + sQuote(fdef@generic), sQuote(cnames)), domain = NA) + + trying URL 'ftp://ftp.bafg.de/pub/REFERATE/GRDC/ltdata/africa.zip' + ftp data connection made, file length 2730333 bytes + ================================================== + downloaded 2.6 MB + + testthat results ================================================================ + OK: 55 SKIPPED: 1 FAILED: 2 + 1. Error: Test TRMM function using dates in the past (@test-TRMM.R#15) + 2. Error: Test TRMM function using 3-hourly dates in the past (@test-TRMM.R#58) + + Error: testthat unit tests failed + Execution halted +``` + +## heemod (0.8.0) +Maintainer: Antoine Filipovic-Pierucci +Bug reports: https://github.com/pierucci/heemod/issues + +1 error | 1 warning | 1 note + +``` +checking tests ... ERROR + Running ‘testthat.R’ [33s/36s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) + 6: flexsurv::summary.flexsurvreg + 7: getExportedValue(pkg, name) + 8: stop(gettextf("'%s' is not an exported object from 'namespace:%s'", name, getNamespaceName(ns)), + call. = FALSE, domain = NA) + + .model from to prob + 1 standard RevisionTHR SuccessfulRevision + 2 new RevisionTHR SuccessfulRevision + testthat results ================================================================ + OK: 346 SKIPPED: 0 FAILED: 1 + 1. Error: (unknown) (@test_survival.R#23) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +'colour', which will replace the existing scale. +Scale for 'colour' is already present. Adding another scale for +'colour', which will replace the existing scale. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +... 8 lines ... + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Error in mutate_impl(.data, dots) : + 'summary.flexsurvreg' is not an exported object from 'namespace:flexsurv' +Quitting from lines 42-83 (j-survival.Rmd) +Error: processing vignette 'j-survival.Rmd' failed with diagnostics: +Error in parameter: p2. +Execution halted + +checking dependencies in R code ... NOTE +Missing or unexported object: ‘flexsurv::summary.flexsurvreg’ +``` + +## highcharter (0.5.0) +Maintainer: Joshua Kunst +Bug reports: https://github.com/jbkunst/highcharter/issues + +0 errors | 1 warning | 1 note + +``` +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Highcharts (www.highcharts.com) is a Highsoft software product which is +not free for commercial and Governmental use +Quitting from lines 45-46 (charting-data-frames.Rmd) +Error: processing vignette 'charting-data-frames.Rmd' failed with diagnostics: +cannot open the connection +Execution halted + + +checking installed package size ... NOTE + installed size is 16.5Mb + sub-directories of 1Mb or more: + doc 13.7Mb + htmlwidgets 1.9Mb +``` + +## officer (0.1.1) +Maintainer: David Gohel +Bug reports: https://github.com/davidgohel/officer/issues + +2 errors | 1 warning | 0 notes + +``` +checking examples ... ERROR +Running examples in ‘officer-Ex.R’ failed +The error most likely occurred in: + +> base::assign(".ptime", proc.time(), pos = "CheckExEnv") +> ### Name: slip_in_img +> ### Title: append an image +> ### Aliases: slip_in_img +> +> ### ** Examples +> +> library(magrittr) +> img.file <- file.path( Sys.getenv("R_HOME"), "doc", "html", "logo.jpg" ) +> x <- read_docx() %>% ++ body_add_par("R logo: ", style = "Normal") %>% ++ slip_in_img(src = img.file, style = "strong", width = .3, height = .3) +Error: file.exists(src) is not TRUE +Execution halted + +checking tests ... ERROR + Running ‘testthat.R’ [21s/21s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) + 10: external_img(src, width = width, height = height) + 11: stopifnot(file.exists(src)) + 12: stop(sprintf(ngettext(length(r), "%s is not TRUE", "%s are not all TRUE"), ch), call. = FALSE, + domain = NA) + + testthat results ================================================================ + OK: 317 SKIPPED: 0 FAILED: 4 + 1. Error: image add (@test-docx-add.R#68) + 2. Error: pml fp_border (@test-fp_cell.R#75) + 3. Error: css fp_border (@test-fp_cell.R#165) + 4. Error: add img into placeholder (@test-pptx-add.R#67) + + Error: testthat unit tests failed + Execution halted + +checking re-building of vignette outputs ... WARNING +Error in re-building vignettes: + ... +Warning in engine$weave(file, quiet = quiet, encoding = enc) : + Pandoc (>= 1.12.3) and/or pandoc-citeproc not available. Falling back to R Markdown v1. +Quitting from lines 181-191 (powerpoint.Rmd) +Error: processing vignette 'powerpoint.Rmd' failed with diagnostics: +file.exists(src) is not TRUE +Execution halted + +``` + +## photobiologyInOut (0.4.13) +Maintainer: Pedro J. Aphalo +Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ + +1 error | 0 warnings | 0 notes + +``` +checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘photobiology’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +``` + +## plotly (4.5.6) +Maintainer: Carson Sievert +Bug reports: https://github.com/ropensci/plotly/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [47s/46s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + [1] "Running test: plotly-group-within-trace" + [1] "Running test: plotly-alpha-blending" + [1] "Running test: plotly-alpha-no-color" + [1] "Running test: plotly-factor-axis" + [1] "Running test: plotly-character-axis" + [1] "Running test: plotly-histogram" + [1] "Running test: plotly-histogram-vert" + [1] "Running test: plotly-inherit-FALSE" + [1] "Running test: plotly-time-series-summary" + testthat results ================================================================ + OK: 813 SKIPPED: 17 FAILED: 1 + 1. Error: datetimes are converted to e.g. 2013-01-02 05:00:00 (@test-ggplot-date.R#11) + + Error: testthat unit tests failed + Execution halted +``` + diff --git a/revdep/problems.md b/revdep/problems.md index bfa66b50c..c7b531863 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -16,7 +16,7 @@ |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| -|assertthat | |0.1 |2013-12-06 |cran (@0.1) | +|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | @@ -53,7 +53,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [10s/10s] + Running ‘testthat.R’ [11s/11s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -221,7 +221,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [14s/22s] + Running ‘testthat.R’ [13s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -402,7 +402,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [46s/47s] + Running ‘testthat.R’ [47s/46s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" diff --git a/revdep/timing.md b/revdep/timing.md index 2c38f3a5d..a8ac75e6e 100644 --- a/revdep/timing.md +++ b/revdep/timing.md @@ -2,123 +2,123 @@ | |package |version | check_time| |:---|:-----------------|:-------|----------:| -|61 |modeval |0.1.2 | 374.9| -|103 |sjPlot |2.3.1 | 224.2| -|19 |DiagrammeR |0.9.0 | 208.8| -|41 |ggfortify |0.4.1 | 197.6| -|111 |tidyquant |0.4.0 | 190.9| -|44 |ggplot2 |2.2.1 | 169| -|51 |heemod |0.8.0 | 161.3| -|66 |myTAI |0.5.0 | 156| -|50 |hddtools |0.6 | 140.6| -|40 |ggenealogy |0.3.0 | 125.2| -|3 |biomartr |0.4.0 | 105.1| -|116 |valr |0.1.2 | 103.4| -|23 |dplyr |0.5.0 | 96.6| -|101 |sf |0.4-1 | 90.8| -|79 |plotly |4.5.6 | 84.3| -|29 |fbar |0.1.23 | 82.5| -|85 |rbgm |0.0.4 | 81.4| -|110 |taxize |0.8.4 | 81.1| -|104 |sjstats |0.9.0 | 77.3| -|72 |officer |0.1.1 | 76.7| -|87 |rdefra |0.3.4 | 69.6| -|52 |highcharter |0.5.0 | 66| -|45 |ggpmisc |0.2.14 | 65.9| -|106 |spbabel |0.4.5 | 63.8| -|15 |cpr |0.2.3 | 60.7| -|82 |radiant.data |0.6.0 | 60| -|9 |ccafs |0.1.0 | 53.3| -|89 |readr |1.1.0 | 51.2| -|56 |jpmesh |0.3.0 | 50.2| -|22 |dotwhisker |0.2.3 | 49.7| -|39 |ggalt |0.4.0 | 49.7| -|8 |bsam |1.1.1 | 48.6| -|108 |spocc |0.6.0 | 48.4| -|102 |sjmisc |2.3.1 | 48.2| -|27 |eurostat |3.1.1 | 47.8| -|57 |knitr |1.15.1 | 46.5| -|77 |photobiology |0.9.14 | 45.6| -|64 |mrgsolve |0.8.6 | 44.5| -|33 |flextable |0.1.0 | 42.8| -|92 |rgbif |0.9.7 | 41.7| -|98 |rnoaa |0.6.6 | 41.1| -|2 |anomalyDetection |0.1.0 | 39.9| -|55 |isdparser |0.2.0 | 38.1| -|18 |dat |0.1.0 | 35.8| -|107 |spdplyr |0.1.2 | 35.8| -|109 |srvyr |0.2.0 | 35.3| -|65 |msgtools |0.2.7 | 35| -|78 |phylopath |0.2.3 | 33.9| -|14 |countyweather |0.1.0 | 32.6| -|36 |FSelectorRcpp |0.1.2 | 32.6| -|59 |manifestoR |1.2.3 | 32.6| -|100 |rtide |0.0.3 | 32.6| -|84 |rbcb |0.1.0 | 32.3| -|31 |fileplyr |0.2.0 | 31.7| -|4 |blkbox |1.0 | 31.6| -|13 |corrr |0.2.1 | 31.1| -|80 |poio |0.0-3 | 30.1| -|53 |hypoparsr |0.1.0 | 29.9| -|105 |solrium |0.4.0 | 29.9| -|95 |rif |0.1.0 | 29.6| -|54 |inferr |0.1.0 | 29| -|48 |GSODR |1.0.1 | 28.7| -|113 |tidyverse |1.1.1 | 28.4| -|12 |checkmate |1.8.2 | 27.9| -|25 |ecoseries |0.1.1 | 27.9| -|37 |geojson |0.1.2 | 27.1| -|97 |rmarkdown |1.4 | 26.4| -|34 |foghorn |0.4.2 | 26.2| -|115 |unpivotr |0.1.0 | 25| -|28 |evaluator |0.1.0 | 24.2| -|93 |rgho |1.0.1 | 23.4| -|6 |blockTools |0.6-3 | 22.9| -|118 |worrms |0.1.0 | 22.9| -|47 |gitlabr |0.7 | 22.1| -|91 |reutils |0.2.3 | 21.9| -|20 |doctr |0.2.0 | 21.3| -|38 |getlandsat |0.1.0 | 21.3| -|112 |tidyr |0.6.1 | 21.3| -|71 |odbc |1.0.1 | 21.2| -|70 |observer |0.1.2 | 20.6| -|117 |wand |0.2.0 | 19.7| -|49 |haven |1.0.0 | 19.3| -|68 |nycflights13 |0.2.2 | 19| -|73 |openadds |0.2.0 | 18.9| -|58 |KraljicMatrix |0.1.1 | 17.4| -|10 |cdata |0.1.0 | 17.1| -|30 |feather |0.3.1 | 16.8| -|63 |mregions |0.1.4 | 16.8| -|32 |filesstrings |0.3.2 | 16.2| -|99 |rorcid |0.3.0 | 16.2| -|7 |bold |0.4.0 | 16| -|21 |docxtractr |0.2.0 | 16| -|69 |oai |0.2.2 | 14.7| -|90 |refimpact |0.1.0 | 14.6| -|46 |giphyr |0.1.0 | 14.2| -|86 |rbhl |0.3.0 | 14.2| -|42 |ggguitar |0.1.1 | 13.8| -|114 |units |0.4-3 | 13.3| -|60 |modelr |0.1.0 | 13| -|75 |pdfsearch |0.1.1 | 12.8| -|74 |pangaear |0.3.0 | 12.7| -|24 |easyformatr |0.1.2 | 12| -|26 |enigma |0.3.0 | 12| -|96 |ritis |0.5.4 | 11.1| +|61 |modeval |0.1.2 | 385.4| +|103 |sjPlot |2.3.1 | 215.6| +|19 |DiagrammeR |0.9.0 | 199.6| +|111 |tidyquant |0.4.0 | 194.1| +|41 |ggfortify |0.4.1 | 186.5| +|44 |ggplot2 |2.2.1 | 165.5| +|51 |heemod |0.8.0 | 160| +|66 |myTAI |0.5.0 | 151.5| +|50 |hddtools |0.6 | 140.4| +|40 |ggenealogy |0.3.0 | 120.4| +|3 |biomartr |0.4.0 | 103.4| +|116 |valr |0.1.2 | 102.9| +|101 |sf |0.4-1 | 88.7| +|79 |plotly |4.5.6 | 82.7| +|29 |fbar |0.1.23 | 80.2| +|72 |officer |0.1.1 | 76.1| +|85 |rbgm |0.0.4 | 75.3| +|104 |sjstats |0.9.0 | 74.5| +|87 |rdefra |0.3.4 | 68.4| +|52 |highcharter |0.5.0 | 66.3| +|23 |dplyr |0.5.0 | 65.5| +|45 |ggpmisc |0.2.14 | 65.2| +|106 |spbabel |0.4.5 | 62.7| +|110 |taxize |0.8.4 | 57.4| +|82 |radiant.data |0.6.0 | 54.5| +|9 |ccafs |0.1.0 | 52.7| +|15 |cpr |0.2.3 | 50.2| +|39 |ggalt |0.4.0 | 48.3| +|56 |jpmesh |0.3.0 | 48| +|108 |spocc |0.6.0 | 46.6| +|8 |bsam |1.1.1 | 46.4| +|102 |sjmisc |2.3.1 | 46.2| +|77 |photobiology |0.9.14 | 44.9| +|64 |mrgsolve |0.8.6 | 44.8| +|25 |ecoseries |0.1.1 | 43.5| +|22 |dotwhisker |0.2.3 | 43.2| +|33 |flextable |0.1.0 | 41.4| +|27 |eurostat |3.1.1 | 40.9| +|98 |rnoaa |0.6.6 | 40.3| +|92 |rgbif |0.9.7 | 40.1| +|107 |spdplyr |0.1.2 | 35.1| +|55 |isdparser |0.2.0 | 34.8| +|18 |dat |0.1.0 | 34.4| +|109 |srvyr |0.2.0 | 34.4| +|57 |knitr |1.15.1 | 34.1| +|95 |rif |0.1.0 | 33.4| +|2 |anomalyDetection |0.1.0 | 33.2| +|65 |msgtools |0.2.7 | 33.1| +|31 |fileplyr |0.2.0 | 32| +|100 |rtide |0.0.3 | 32| +|78 |phylopath |0.2.3 | 31.6| +|59 |manifestoR |1.2.3 | 31| +|14 |countyweather |0.1.0 | 30.5| +|105 |solrium |0.4.0 | 30.1| +|113 |tidyverse |1.1.1 | 30.1| +|84 |rbcb |0.1.0 | 29.7| +|80 |poio |0.0-3 | 28.1| +|12 |checkmate |1.8.2 | 27.2| +|54 |inferr |0.1.0 | 26.5| +|13 |corrr |0.2.1 | 26.1| +|34 |foghorn |0.4.2 | 25.9| +|48 |GSODR |1.0.1 | 25.6| +|53 |hypoparsr |0.1.0 | 25.4| +|97 |rmarkdown |1.4 | 25.3| +|37 |geojson |0.1.2 | 24.8| +|115 |unpivotr |0.1.0 | 24.7| +|93 |rgho |1.0.1 | 23.7| +|89 |readr |1.1.0 | 22.7| +|28 |evaluator |0.1.0 | 22.3| +|4 |blkbox |1.0 | 22.1| +|6 |blockTools |0.6-3 | 22.1| +|38 |getlandsat |0.1.0 | 21.9| +|91 |reutils |0.2.3 | 21.3| +|118 |worrms |0.1.0 | 21.2| +|20 |doctr |0.2.0 | 21| +|47 |gitlabr |0.7 | 20.9| +|36 |FSelectorRcpp |0.1.2 | 20.2| +|70 |observer |0.1.2 | 19.3| +|68 |nycflights13 |0.2.2 | 19.1| +|73 |openadds |0.2.0 | 18.5| +|58 |KraljicMatrix |0.1.1 | 17.7| +|112 |tidyr |0.6.1 | 17.6| +|63 |mregions |0.1.4 | 16.5| +|10 |cdata |0.1.0 | 16.4| +|21 |docxtractr |0.2.0 | 16.2| +|117 |wand |0.2.0 | 16.2| +|7 |bold |0.4.0 | 15.4| +|32 |filesstrings |0.3.2 | 15.3| +|99 |rorcid |0.3.0 | 15.2| +|42 |ggguitar |0.1.1 | 14.2| +|69 |oai |0.2.2 | 14.2| +|46 |giphyr |0.1.0 | 14.1| +|49 |haven |1.0.0 | 14.1| +|71 |odbc |1.0.1 | 14| +|86 |rbhl |0.3.0 | 14| +|60 |modelr |0.1.0 | 13.3| +|90 |refimpact |0.1.0 | 12.9| +|74 |pangaear |0.3.0 | 12.5| +|114 |units |0.4-3 | 12.5| +|24 |easyformatr |0.1.2 | 12.1| +|75 |pdfsearch |0.1.1 | 12| +|30 |feather |0.3.1 | 11.5| +|26 |enigma |0.3.0 | 11.1| |83 |randNames |0.2.3 | 10.9| -|1 |abjutils |0.0.1 | 10.3| -|62 |monkeylearn |0.1.1 | 10.3| -|17 |datastepr |0.0.2 | 10.2| -|11 |cellranger |1.1.0 | 10.1| -|16 |datapasta |2.0.0 | 9.8| -|5 |blob |1.0.0 | 9.7| +|62 |monkeylearn |0.1.1 | 10.4| +|11 |cellranger |1.1.0 | 9.8| +|96 |ritis |0.5.4 | 9.8| +|17 |datastepr |0.0.2 | 9.7| +|5 |blob |1.0.0 | 9.6| +|16 |datapasta |2.0.0 | 9.2| |35 |forcats |0.2.0 | 9.2| |81 |prcr |0.1.1 | 8.7| -|88 |rdpla |0.1.0 | 8.6| +|88 |rdpla |0.1.0 | 8.5| |94 |riem |0.1.1 | 7.9| -|67 |natserv |0.1.4 | 6.9| +|1 |abjutils |0.0.1 | 7.7| +|67 |natserv |0.1.4 | 7.4| |76 |photobiologyInOut |0.4.13 | 1.1| -|43 |ggimage |0.0.4 | 1| +|43 |ggimage |0.0.4 | 0.9| From 17fb55d90ae80a3e063d3f6a77a6e34682416fe1 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Thu, 30 Mar 2017 11:18:04 +0200 Subject: [PATCH 26/37] up release notes --- cran-comments.md | 8 +++++--- 1 file changed, 5 insertions(+), 3 deletions(-) diff --git a/cran-comments.md b/cran-comments.md index effed8cdb..5217e975c 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -8,7 +8,9 @@ ## Reverse dependencies -I checked all 88 reverse dependencies on CRAN and Bioconductor for version 1.2 +I checked all 118 reverse dependencies on CRAN and Bioconductor for version 1.2 and for the current release, and compared the outputs of R CMD check. They were -identical for all packages; tidyr requires version 0.6.1 which contains a -compatibility fix. +identical for all packages. + +The previous attempt to release didn't cover an error in the `readr` package +due to a missing dependency, this should be fixed in `readr` 1.1.0. From 3170fa1ad7aaeadae97b2ef24c895fb81ef06aa1 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Thu, 30 Mar 2017 11:32:26 +0200 Subject: [PATCH 27/37] up roxygen2 version --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 8e0dfd905..0d851f2ac 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -31,5 +31,5 @@ LinkingTo: Rcpp LazyData: yes License: MIT + file LICENSE Roxygen: list(markdown = TRUE, roclets = c("collate", "namespace", "rd", "pkgapi::api_roclet")) -RoxygenNote: 6.0.0 +RoxygenNote: 6.0.1 VignetteBuilder: knitr From 22d311b9864ac92e296ced4ad26e4d3f5558f2ab Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Thu, 30 Mar 2017 11:47:59 +0200 Subject: [PATCH 28/37] register native functions using instructions from https://ironholds.org/registering-routines/ @kevinushey: Is this currently the best way to register native functions, or have I overlooked an Rcpp option? --- NAMESPACE | 2 +- NEWS.md | 4 ++++ R/tibble.R | 2 +- src/init.c | 22 ++++++++++++++++++++++ 4 files changed, 28 insertions(+), 2 deletions(-) create mode 100644 src/init.c diff --git a/NAMESPACE b/NAMESPACE index c496123d5..81815823f 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -96,4 +96,4 @@ importFrom(stats,setNames) importFrom(utils,head) importFrom(utils,str) importFrom(utils,tail) -useDynLib(tibble) +useDynLib(tibble, .registration = TRUE) diff --git a/NEWS.md b/NEWS.md index 429c4462c..3674a6b74 100644 --- a/NEWS.md +++ b/NEWS.md @@ -39,6 +39,10 @@ - Reword documentation for `tribble()` (#191, @kwstat). - Now explicitly stating minimum Rcpp version 0.12.3. +## Internal + +- Using registration of native routines. + # tibble 1.2 (2016-08-26) diff --git a/R/tibble.R b/R/tibble.R index bbeb8a9fa..cde8d1adc 100644 --- a/R/tibble.R +++ b/R/tibble.R @@ -1,4 +1,4 @@ -#' @useDynLib tibble +#' @useDynLib tibble, .registration = TRUE #' @importFrom Rcpp sourceCpp #' @importFrom utils head tail #' @aliases NULL diff --git a/src/init.c b/src/init.c new file mode 100644 index 000000000..063b616cc --- /dev/null +++ b/src/init.c @@ -0,0 +1,22 @@ +#include +#include +#include // for NULL +#include + +/* FIXME: + Check these declarations against the C/Fortran source code. + */ + +/* .Call calls */ +extern SEXP tibble_matrixToDataFrame(SEXP); + +static const R_CallMethodDef CallEntries[] = { + {"tibble_matrixToDataFrame", (DL_FUNC) &tibble_matrixToDataFrame, 1}, + {NULL, NULL, 0} +}; + +void R_init_tibble(DllInfo *dll) +{ + R_registerRoutines(dll, NULL, CallEntries, NULL, NULL); + R_useDynamicSymbols(dll, FALSE); +} From ae4efcc1fe672d646db636d211d701807de0cff1 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 11:39:48 +0000 Subject: [PATCH 29/37] set flag from incoming check --- revdep/diff.sh | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/revdep/diff.sh b/revdep/diff.sh index f28075cdc..cd914db19 100755 --- a/revdep/diff.sh +++ b/revdep/diff.sh @@ -23,7 +23,7 @@ rm -rf revdep/install git add revdep git commit -m "revdep update for clean state" || true -R -f revdep/check.R +_R_CHECK_SUGGESTS_ONLY_=true R -f revdep/check.R #echo $old_tag >> revdep/README.md mv revdep revdep-$old_tag @@ -49,7 +49,7 @@ git fetch --all git rebase git push origin HEAD -R -f revdep/check.R +_R_CHECK_SUGGESTS_ONLY_=true R -f revdep/check.R #echo $branch >> revdep/README.md cp revdep/README.md revdep/README-${branch}.md From 80aafa9357774750481515cdc63fc654567a19bb Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 12:17:03 +0000 Subject: [PATCH 30/37] revdep update with v1.2 results --- revdep/README-v1.2.md | 56 ++++--- revdep/README.md | 60 ++++--- revdep/checks.rds | Bin 11286 -> 11541 bytes revdep/install/ggspectra.out | 10 -- revdep/install/photobiologyInOut.out | 11 -- revdep/problems-v1.2.md | 82 ++++++---- revdep/problems.md | 86 +++++----- revdep/timing.md | 230 +++++++++++++-------------- 8 files changed, 285 insertions(+), 250 deletions(-) delete mode 100644 revdep/install/ggspectra.out delete mode 100644 revdep/install/photobiologyInOut.out diff --git a/revdep/README-v1.2.md b/revdep/README-v1.2.md index c6aada28d..35b4829a5 100644 --- a/revdep/README-v1.2.md +++ b/revdep/README-v1.2.md @@ -10,7 +10,7 @@ |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-03-29 | +|date |2017-03-31 | ## Packages @@ -21,8 +21,8 @@ |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | |nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | -|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|Rcpp | |0.12.10 |2017-03-31 |Github (RcppCore/Rcpp@886f5df) | +|rmarkdown | |1.4 |2017-03-24 |cran (@1.4) | |testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | @@ -34,7 +34,7 @@ |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |abjutils |0.0.1 | 0| 0| 0| -|anomalyDetection |0.1.0 | 0| 0| 0| +|anomalyDetection |0.1.1 | 0| 0| 0| |biomartr |0.4.0 | 0| 0| 0| |blkbox |1.0 | 0| 0| 2| |blob |1.0.0 | 0| 0| 0| @@ -108,7 +108,7 @@ |openadds |0.2.0 | 0| 0| 0| |pangaear |0.3.0 | 0| 0| 0| |pdfsearch |0.1.1 | 0| 0| 0| -|photobiologyInOut |0.4.13 | 1| 0| 0| +|photobiologyInOut |0.4.13 | 0| 0| 0| |photobiology |0.9.14 | 0| 0| 0| |phylopath |0.2.3 | 0| 0| 0| |plotly |4.5.6 | 1| 0| 0| @@ -122,7 +122,7 @@ |rdefra |0.3.4 | 0| 0| 0| |rdpla |0.1.0 | 0| 0| 0| |readr |1.1.0 | 0| 0| 1| -|refimpact |0.1.0 | 0| 0| 0| +|refimpact |0.1.0 | 1| 0| 0| |reutils |0.2.3 | 0| 0| 0| |rgbif |0.9.7 | 0| 0| 0| |rgho |1.0.1 | 0| 0| 0| @@ -157,7 +157,7 @@ Maintainer: Fernando Correa 0 errors | 0 warnings | 0 notes -## anomalyDetection (0.1.0) +## anomalyDetection (0.1.1) Maintainer: Bradley Boehmke Bug reports: https://github.com/bradleyboehmke/anomalyDetection/issues @@ -619,7 +619,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [14s/22s] + Running ‘testthat.R’ [13s/24s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -647,7 +647,7 @@ Bug reports: https://github.com/pierucci/heemod/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [33s/36s] + Running ‘testthat.R’ [32s/36s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) @@ -893,7 +893,7 @@ Error: file.exists(src) is not TRUE Execution halted checking tests ... ERROR - Running ‘testthat.R’ [21s/21s] + Running ‘testthat.R’ [20s/20s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) @@ -946,15 +946,7 @@ Bug reports: https://github.com/lebebr01/pdfsearch/issues Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ -1 error | 0 warnings | 0 notes - -``` -checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘photobiology’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` +0 errors | 0 warnings | 0 notes ## photobiology (0.9.14) Maintainer: Pedro J. Aphalo @@ -976,7 +968,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [46s/47s] + Running ‘testthat.R’ [44s/45s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" @@ -1066,7 +1058,29 @@ checking installed package size ... NOTE Maintainer: Perry Stephenson Bug reports: https://github.com/perrystephenson/refimpact/issues -0 errors | 0 warnings | 0 notes +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [1s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 7: parseJSON(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/fromJSON.R:115 + 8: parse_con(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/parseJSON.R:3 + 9: open(con, "rb") at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/push_parser.R:6 + 10: open.connection(con, "rb") + + testthat results ================================================================ + OK: 21 SKIPPED: 0 FAILED: 5 + 1. Error: get_institutions() returns a tibble (@test_institutions.R#6) + 2. Error: Function returns sensible data frames for sensible queries (@test_search_case_studies.R#6) + 3. Error: get_tag_types() returns a tibble (@test_tag_types.R#6) + 4. Error: get_tag_value() returns a tibble (@test_tag_values.R#6) + 5. Error: get_units_of_assessment() returns a tibble (@test_units_of_assessment.R#6) + + Error: testthat unit tests failed + Execution halted +``` ## reutils (0.2.3) Maintainer: Gerhard Schöfl diff --git a/revdep/README.md b/revdep/README.md index 38dcfe58f..35b4829a5 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -10,19 +10,19 @@ |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-03-29 | +|date |2017-03-31 | ## Packages |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| -|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | +|assertthat | |0.1 |2013-12-06 |cran (@0.1) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | |nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | -|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|Rcpp | |0.12.10 |2017-03-31 |Github (RcppCore/Rcpp@886f5df) | +|rmarkdown | |1.4 |2017-03-24 |cran (@1.4) | |testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | @@ -34,7 +34,7 @@ |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |abjutils |0.0.1 | 0| 0| 0| -|anomalyDetection |0.1.0 | 0| 0| 0| +|anomalyDetection |0.1.1 | 0| 0| 0| |biomartr |0.4.0 | 0| 0| 0| |blkbox |1.0 | 0| 0| 2| |blob |1.0.0 | 0| 0| 0| @@ -108,7 +108,7 @@ |openadds |0.2.0 | 0| 0| 0| |pangaear |0.3.0 | 0| 0| 0| |pdfsearch |0.1.1 | 0| 0| 0| -|photobiologyInOut |0.4.13 | 1| 0| 0| +|photobiologyInOut |0.4.13 | 0| 0| 0| |photobiology |0.9.14 | 0| 0| 0| |phylopath |0.2.3 | 0| 0| 0| |plotly |4.5.6 | 1| 0| 0| @@ -122,7 +122,7 @@ |rdefra |0.3.4 | 0| 0| 0| |rdpla |0.1.0 | 0| 0| 0| |readr |1.1.0 | 0| 0| 1| -|refimpact |0.1.0 | 0| 0| 0| +|refimpact |0.1.0 | 1| 0| 0| |reutils |0.2.3 | 0| 0| 0| |rgbif |0.9.7 | 0| 0| 0| |rgho |1.0.1 | 0| 0| 0| @@ -157,7 +157,7 @@ Maintainer: Fernando Correa 0 errors | 0 warnings | 0 notes -## anomalyDetection (0.1.0) +## anomalyDetection (0.1.1) Maintainer: Bradley Boehmke Bug reports: https://github.com/bradleyboehmke/anomalyDetection/issues @@ -270,7 +270,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [11s/11s] + Running ‘testthat.R’ [10s/10s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -619,7 +619,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [13s/22s] + Running ‘testthat.R’ [13s/24s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -647,7 +647,7 @@ Bug reports: https://github.com/pierucci/heemod/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [33s/36s] + Running ‘testthat.R’ [32s/36s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) @@ -893,7 +893,7 @@ Error: file.exists(src) is not TRUE Execution halted checking tests ... ERROR - Running ‘testthat.R’ [21s/21s] + Running ‘testthat.R’ [20s/20s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) @@ -946,15 +946,7 @@ Bug reports: https://github.com/lebebr01/pdfsearch/issues Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ -1 error | 0 warnings | 0 notes - -``` -checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘photobiology’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` +0 errors | 0 warnings | 0 notes ## photobiology (0.9.14) Maintainer: Pedro J. Aphalo @@ -976,7 +968,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [47s/46s] + Running ‘testthat.R’ [44s/45s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" @@ -1066,7 +1058,29 @@ checking installed package size ... NOTE Maintainer: Perry Stephenson Bug reports: https://github.com/perrystephenson/refimpact/issues -0 errors | 0 warnings | 0 notes +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [1s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 7: parseJSON(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/fromJSON.R:115 + 8: parse_con(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/parseJSON.R:3 + 9: open(con, "rb") at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/push_parser.R:6 + 10: open.connection(con, "rb") + + testthat results ================================================================ + OK: 21 SKIPPED: 0 FAILED: 5 + 1. Error: get_institutions() returns a tibble (@test_institutions.R#6) + 2. Error: Function returns sensible data frames for sensible queries (@test_search_case_studies.R#6) + 3. Error: get_tag_types() returns a tibble (@test_tag_types.R#6) + 4. Error: get_tag_value() returns a tibble (@test_tag_values.R#6) + 5. Error: get_units_of_assessment() returns a tibble (@test_units_of_assessment.R#6) + + Error: testthat unit tests failed + Execution halted +``` ## reutils (0.2.3) Maintainer: Gerhard Schöfl diff --git a/revdep/checks.rds b/revdep/checks.rds index 90c5b06ebc54bdd47f7a27df116773adf455ce12..d96dbe40e84eec8f5c800e03b0ed033e004bfc31 100644 GIT binary patch literal 11541 zcmV+wE$Y%AiwFP!000001MPjyZyZUMpGKc8cF%ei3oNiZJA-Jd)hf1FSzjbYaoIgZ zNz_-1l7?h=PtRbMj>?S63^G5eBQi;r3@qm6i?4>g{sR^Z*ghHX$$%G_tNl;xVNZK7 zV8AECE?m5Xmwy7k zF2le7cj3Y%yuJqieggk~1gY2I?_X?_Lnb8mT+-9vKho&7J9nDxUbDTjkSqJg$Ez!Q zD@%*S=5BD@G~FOq;L@);om|r8#^&>UJs&c6@2ef{tKEmq)qL?^2X?;Jx%iEGQ2FJH znVc&wb(oBbUyBm2Mf^m!SLImx%!%$U20Xg@z^1MlP?N=Ex@X(ek8dyfui{rSFg5pJ z-KJ9J-t)&JpdWg|+2iie%e48GsNh`85YRH=`xf=%`VL&~i}cN2joBf!qx(N{xGuZ_ zb9Kw1;vh=>$Q|oLo12y|JH7Z-xAoB|y1p*3u;CrW4e^1`WcHa?eLfi2F~3)ixNnKv zi(YtZe<$m`)YdxjTXeL}a&mX2t#!3_+#?-rso9;(>&AId17yWTFG10`aXT6oyxVSP zGGnqUDl^|5fUjP&(*?w5QdXLsPP5ycNNGc2Hf33rS)Rlxq}(Y$ZZ4&}G?~(!q=ILy zHoGhNr+3@AcmGfq)Fq8RG{-^=mnbQ0*f{maNkM4fIPqU3MO8x=mF>ofKYs)O2?nHr z7`yKY*20Va>gvjH*%&V5-Un)olSoWxQNw2ARt&@b;7*rzyQ|Zr$us}x{`SUmc%l+b z@OtVa{LvqxHn~%jZr~AbD=#%l%2n-Cp(`FQfxQ9t@w|6Y3iw_dI4f2aK!_!h}J1-#38= zThl$~iyY-$%lAiet%Yq19~%~FP13fg>p9dOKVUx7ec-9Zr3_deKR?MAo5oisgRjSb zgFpY_-0^ie-?Cd3FqPw|p4ggyO!p6(j~Iv)@<4dfC+n7JbbEcBIvUlr;2@8wMggX< zk_W8;hZYsSD2C7narQKHmSAv?q4TTnNir5ITMFQ>r(jxR`RsP~3$CQ-8xV1~H{XvUmL zqG=j={$h7??q!rK0~5w(pBZEj_yiz9=po2Y3jIt#PbYD8Yvdn(_wNVX6vKb`-QPsd z`fc*8iDz(^Y!lrxSo*Xr_z18ZR2aDI7`qRi=neKk+Nhe3&4CBs+uGVlFoWy9ddS-b z_5BKIs0`JG$rlWjPT*k91LJFF# zo*4c33CO6Yo+}xElY?N|SJ!>#I}}loT9zd!Qt5#%Bx?;Mb;_U#S$Sx7CT4;U|7=Dx z!74}rF6xPtGf1-{%p}rG*Xd9eW9Ev=%O~RUK|2A>lL#8$J815m9yE%LdZK3jsb{&M z0R^s4*7qI!+dtxN^AM&so+tv#LIGI5;qKRpprzx|Xc<~C?_{*JPc>VdFZ%xs{ zT$c}-Aom0+&+GeeKkiGP`dTp1HJ#?svREWqq{WyI4GC>6l#Wphn7On-9yOf_)ZB=$ z@h&UdDK9mJ&KBybHhBhZ00Wb{!Ts54qmpCWX4s+*^;t1&t|$4^s99B8gCT0xPNiv| z18N>tKuyd_Jwemh;f@FTFT8_2@XTiR zRfZ^Jqn?myZBr#@b{IYvK_gUxCZmMD?%5uWSgdT3=f^s#LE|GveQSE?nN(Qr{r!y4 z@U#jVGVIh76(7H3K4>iu*f$*JNb3eWg1@8OZfhO~m-JDgEJ#=Rp3Q1T+^^94qnh^l z%`I*-Nw)NR;anK+G)Eu6UHQn-DpER-G9+xF?mwckY>sn1$j!>PoU9`OLpnl_JlIjzA1Ub`a$?7Q^ z{Rk8jXo2xz(&?i*}wZ@<`{BV;>p5gNE55Zm=>xFJA((`m~V{QK=(TmrxBH;H7v!H2^}uIwV2hZde+Q1$%PU!VMQ z3jXe{bynU!gY0<3bl~T^fZBNurnp@s>V@{;h0;ylMqjl#U=_F26Bca8$Of^ujee(ETiKi=kucY{2kuIstD z{m;XzzQc;da;In^6Y6M2WUU9BnlQvWY`bJNGc7PJs_$k*wY77aHSn1DKPRG_yP&H< zj~mHeu;i~YR!k&QLgj#r>a?|$tpQ}oV9+$UP>c9H6v&;e0a`pc9()gxK=5%ukG|xt zwxlQtv3$oq;)clp_Jk~HccOIen3*rXtF3MgX1WBMc0fHb|I_=Fd*m5&eSo{e`nqr9 zb=mayis9)+7M|SmzvA`Lfa;2sAC^h zfY)^T=}c74q0=jT>nShw?D?O58!+-XAnW6RHLal8=?C09qVbYvw&-UCBim4VwhxWy zA6Z-;ly13ZrCt}{fZuZl1yIEsokIOb$RNgdTmNO#e<)^2! zf(wZc&!hu&d)o4;bs(D$K*{NLQ2CkdsD_PLPo$n@WllS3WsXrfM(JQDs$U}32wrJD@TIiZPEv9>t zp$sWm;!X04K$LDZKlt|D-z7*`sV9WaV0Bq!NT;kWP4BS9Tn>cA@VOdhPGhH+89_gZ z5c0iar-GYO$VWYa^B2z;%*CnYbFywTPqXo|&kwjZ$H7rICnS0u;$e6T+AxHv>cDp6x zRGgnj&*bLP%6qVzov>0*_{?w7V{+efkLZ}J>*}xO(Bsa@7BH8G1Dfyqt4h&L=l0w0 zfs-S$QO|yVOSAeTCQ-dr7G%Y;;@YsxT&|ZHXBxAT6b~wZrPhXWU+$0{!4IhGTV!1d z4)Y+YTjg48k#6Eso0(Mb){xt*d?DzAIC~m1+2!UhW`&swx=GAQO+mBmi7|QZ+2|4i ztvz-hgF(o3p^z&pXS+M3H;I^Rx ze+t0Up8F<54wi$d8+64dN2s

EihsFh1lu6LWJLz7NAd#?gF@ z+)_)>x8~+{Ep#5YZSP36l?sa@2^EYuR31QeL*Y5(R!oR-ZY#HMED ziUw4&xE=sEx~l8Ya*@%Mx=_YTi)feQxpQ+bEg053=jo1WpP?7HhDN^i0-}T9iZ%ua z_X!#|ks~&cmgldnMHzdeka}M>7Buo?hy}S!_Y)S$$Y$_H@U92wXb*3V_HYRmVagCl znP%bh1}uC7zzJ0)UvBI^CWn#rmNxgxfcrkSgJL=~lk44WE_FyFT(s4;9b^&3|gacp?UFxv2Xh7D7QKIG~iRI&OvuN=;C2S2n)AB?~{J3jT?zFgF%8a>p z-v>=UWTc)jdV`r^p{~!3F}^s1))YEO_EONO+-cBs-vzgbN}y4U)D$$o9-9uv3ivfW zqQ)y+hkO;L^k1p9*^!+GO}EgarrU(>k@TqbaEIAy#~owM7Gvkf6J@3ml-+l|Q|OTu z*|}f*r$oDB$J80wENki>Td^lup%MGU!<(DOSu=K}u_)9L2jeZ;{D9eG;^}%IP>i8t zq)BKOaf0p%MRDojgc6|b3S82aCzO${cZBb!+h~xFy4ig@kU-ezE=-dtvvr^a!fj{7 zQ^g+d*4E$`;@8oj%#quWHmL8=Ymn@Nf(jZZCQyM&JN%Z5#8oNSv&so`k&rdC8{c~Q zWbZ!Iv#07oH4-&28H~cvg4*1DXlm%F%((BscXoxP4v06KoN@C35s4`m=TI9*tw>>)DuX5I&BlLae0~uB9<5kNBW{= znlQkY7`LjtX_RC`JU;y2?|zUg#YQ~=^2sxfpT`(L;-i|iZVPqM=k&y|A#uRYnt_&zkT=pCsJPO34)tjR8k7_+sB}59(dA%nXcrnB@Rv)Xo}WHA|hx|P?mi@ z9G95dB>B_WS;}mn5C89JtSw^V;B1Qba%IJPS!a zt_OphPNgQJyK2~FuS`Kl7B;FGz!bM^A3x5XhHloz@OA{ycX=N_=A@qBX*>$3Yw8yM zCf^2R-AwPtCu}Da1wph7ckXXLdAa-K z#dF-&RHQuIQiBrT2(EVXw#nwP4^s~yR5dx&4XCZ1|5s3Dq8au_JwJlCzAs{$Bir-4 zrPx=wdF*#5Vh$R!as;Ua8pTLGLG#&5W(bcw)yT%k0=1c}k1#=_>aK4w8}z`FZTkn@ z9|ZaV^YOf$R!E4A>Ts!-V+V6{$yZgp%0zJXU;KT9k#`$B$VolH^Rvg)Bfqu+6gA!} zE9mxm)fPe%GDsX*W#*Pw!^~W2ZUyW1tgN{!xDADT)DtUp?=?$C8c#271)AiPLYE(W(RqH}t3WeFZIthG8wRL4J0mI%V8%${#**sh4G)cYwDaOYNgSjrDlebdnK;w* z?yTI=Dy)zyHfoBNw;C$KLf5qttf;&qth5uXEEd`fMZ4Ws(gOugZ}FiXIy*}b!Kkrk z_;k|7V;fRcNWUYPNMc+%jKuX|cSB7zrIt7Gh${&%q$;f_qngVsKJaW`6}eCysjgw= zjrq8JfRlMHxYVEyxGhyaIw)f z;c@Evh#PP@Vt$gWuES(GVmOUY!wIe%1N)1q%cA6U-4b8Sb<#Lw%UW{N)0UIuj}CjiMTARP!j+V;lObF#B20O~W!RK(B|}*F zsw-K-rIhe)hVV{GxRemyNeL%jbtyxbd15aiTrGLkEMXy!=_|n#lhWOZS1shR)6NiP z`mv-{I|<L__3v@lBF4(~K9QekO?^vhwRt-jG)FW*(fcZ=S7qQwG#*jz2D z;ZE-@hLnvJrJdw^L_57l&%eS5p3%}Xeq~$qfGO=E-3G)$%72B!+mjuo1Z;;3lzh#757!s-W!)kka$rQ~p3?I*aE!oqHvvcV%tzSu0 z?|=DEMTBcoq!KO?t>YJ~=VYXdqoHG{QA!JxIh`EYZ4V|TOlX#2tamaW3@w&)O# zD%M`{(JiP1NYp5vao>V3*;z~AG}$Zlxi zVyWTzGFs)lRiFe^8Ovj`TZOSVmb%T=9%<}1(=q6^@i!(5pAds1;SjxS9XzWNYV2yI z0XSl_$Ngm7nlN`nhgFye8W{uct!On79uv5^mQV(dC+bq@%Q;Jvk5D77=QM;o^`sS0 z@@3$HhP}Q&IKYc)!960Pmc>mA&pqpP!>*_0Gzx z$8j4<(!dC3Nt;USjD>J<6$?pk=o9>P6fSUkMgVdtR0+78Q&EZpi~OuT$6-R})K=TT zk32x3i;J?55J*-mvzD8nW;fKcA*+cZv#F+F@)XjmjO^{k5{lvVZ_nhb(pjl+h(qKg z9_{<}k^`$I53=fLchAF@r9y!I%(qxi(f9FVz!RR~8!*de9F%IbHNm95e#AA`E({1~ zjYl4gqw+PTj(<6;!<#F3GbOClv;S{z2zrQ%^N-nJKy41aA6{rQ%qSlP+eLdH^1A>8 ztwD8aFlXH2?htyhWDzdRJQ+fFXJyw|L3IlGs40HlJZL~s-1KDcj7tN*$}%PDdXhg4 zpKQ3Rd#5_(=p5ivK>{VL)DuA;?^xU&Q}UG<2V`9a{D5{k-8<#DDKc~n1Rr><{SoL- zR*AF;GpFH_^&5ZGk5F+c-`{_ACVi^gUO`vhswabX+shbvXQl!#Y|47V_0PZMR=~-x zI3w%Fob|_etKkwy9;Y`8aH>kT4qRS#{?!$gm&Y#5otCp_iOfo>Rj?#ceAE*npWPFo z_4YlFS2iT;`czaeVdWE=N z6YSIzQfF~WS}p+97IpcMN#A=ZJY1h_IdMYS+1hD=JfJ!g2a(R~EP)E4S5jW;iKaL3 zF1c0iU7~i=%jS4tW*#z=bG(IF9Uf3YIS1TuM`zUznR36 zU?$q!msncI*+nQyqc~{q!6`^FC-sET{Fm?nkzI0+3Xnr&{QzzUeTVrXaD;i<2~|{{ zg|WF!;RPdTS5tcSVM+L;58~`;0Ig<>^&gxn>SRoOwjIbOHp0M{zU9e%TisNP1F-$9(|+D^qsDK#Y zqMm3u7}hb}{Uv%}0CO z-Q$iq8ODx|&`n7N+rSXx`LK19bY(&6;=Lhc>Q^peq%5@H2BBA0De!~ADQz6t2)Ly!Z>!Ge%x3fH@~E1!3k~vIh3=Y9NiqyIq|l*E{Gu5u=?l*_p`I|>-RDH> zEfR~NhN^BBVmA%Nm~su3SldGE+_t;@)n-{#uGhKjLWPJvh5y)O;S;>ZDv7moJcGW%;#V}n)>Df*!|Fj%P#mcrKy@u# zLx7LCY`ZAVp4O$ZE*0HbdE``?utl8w0G^8AIWe9cNIjFX(le^!>}mL9T`WGEm9bw1 z_{5yl6F$v*0*5!3JY)A54amC925cbOo!cX07#dAfbLxueTM2!MQ&*Bd4WaC8t}&|< zG%7fCC9KpFLvMas&&r9X^^7df_Xga7u6x?#zY8GoED_{4n?innY6)=_O=?838!&dv$*ecl~%odpj)ZOfvP!IbNZoY3oRoJD=vQtki-T4M&2uyPi zsY`IWdyntiWc^4bYLKWwqBelU{woigiEA<_uyrmnR@gZ1In;$V9@`$Sl$DKnaegjC zY2B%O>d#7Tsxs!qtke@rH}6v+L2cUM4C9fLb$ukm%TBe~TB>l{o^O}PqN`zM9yLqa za>gQc_r&ngKYycj%cUjRT3UYl>z2Ri{FclobprJo30Z6^6Wt~*YH+vd3#zmE6U$Q@ z1bP$j>EepcY0A1@6T=0Hlgowy>znkL%aaRYL>VZ{PE*$6()Ub3ol_QTBA`w#8wJ^J zsx{D)i{i)7lnf0@no&@)`Ey(vU4^bsBTe5aiAjoEzTxo+Q{nxYW@@C{?(~}NPP5%5 z?d7$08~%^iDZ?W&F`N>^b;X?t)p<(8&f`_{E6W|qQGAzV9ZC!=yHw~{1@S$4uRT5ZU4x8OyWk%2qU9T$dUxWYr7+k~l&Hv8!^|SU zyaO_(!g5T=M?E2P1}SsmiT1)6*(JESqVlF;lT~hhJ}aw$3a-G4je4Tyjl4*T1dY#) zF}^ysEj7x*XsWz?VrK#{%MmQT4=>J6w?gpzFkDCHoTB4bfh#s*J>lAY2`xM(J3bp( zAf9m5d4wsNOj2&^FwHHOb-g10Jgg$E0UCJ79pKY1TM~%#^GMFc*)LSFqHVs*AHC5w zUq`mO-M7EXcV~^LVAoG~UOaF3$NnN2a1+3=N97(a@-GnTla}v{THEl;-;@X4K?{@- z75!t?xN9tThm^H@t$k=eoBIr~i)PeVpSHc$=`4q54yuRj>7M(x9+JE@Jf#=9S>V9c zfJZEnc`=xOqe=s5?Zv^r*H$8L3#?a5&-KVW;(Q$!x}74wh2@F8Ig|N&DBifQw#sB< z0p7w7go_8RghC`fNibUs{RVPA4G-hPUt@ZS2WKO_@?sAULkZ6Vjx)Xs)J|n`RG~7k z+tVrZv>HQL`kdax8~fDUQ)k4V@VZHvq>iPjI@Ce&uc;$EOg^b(d7={Bca(eH5RfRD zlz6zz3Dp&pPU?MUH#Ms)6UO4LZevX7Fa6mgCe*&>j&A+_zYcA(ZiWe()GcplSDS#D zArUkx^mkcEsB2N~^mvk8V!r>6?|w+mh>^M>=bWct=70~&G-}M7#?9SKB(eLm+SaO~ z(;^%7M9mpb+b&unOitStrd4KBfmwOnOnUS$zYqHoz(w6)bEf#epS>pjFKBX38DbzS zkC;gljGw&+F(8nOx*;Yk-hAEgbo+!2trMdkiL&A8k|-LSvXkVQ8E#dGekAHTG@YA5 z!+l<&3SUuq)0kP#Y(>n>)}o3+gKX3jH9vj&lx*057Qx8+{(gQXId9r`T{w{&elFuu zHZbJrP8^I$gEK7)lND{{)XT!cF;r~7&Uvf~SDCfPtyoXcotvm~JzBc`g?afzG$~A7 zJ?_i*VD5!%{D7Lb5YQn-jVE+&l$3;P9Q0k9q><)2ALIyOt*~7Vi4K z$ND1=dfRh#&qY#bZcV3o%yf$8>Up}B@VQZPhxxsN`Y(F$dSQ8MJ?2e_OP zE=B815nK#*$Vv=euZBfVM$7)J&gZR!7Ubgxw44$xMN_v#xP%^J#T%|sZXPhWan?=% z^UG7792LI)UNSJgr8wIo&UALfCEMBDI+s}674~(b_Np5&&pbIs~MEeg1S z8NY6MsMn~A{veR(oFbcm0h~8$+$)?>O({5ve052=p?w!nx6E}X$)83~c1~sVBapnq z(L54X>ItAXIEeCOzeT(%8>m#?G-OsXtBc)PDaI8BD#gYRa5=-drIT<8ugWEj%Fn~5 zGhs6O`FjvGJz=Gu&^gnNZP9*4xMQo_$V&EXuc*v?B5vEJ`~0_O6~Uu|z)@_}6E&Yc z2wWYeQje%`JXapkFUg4yVn3H-U z=k`;;%45)inGJI)-@?EQV+_j>Csd3V}J&l`|!P@^PSA9#bl2n>zO(_qsQ1K~)JXh(R2TQN2lDl8F&eEhQq&crJo#%)Rm`=MKW zc>fdXdJeV6511c@;E2n?@a9nA$BbMZ*arjeIF=s++Z)7h4A=U>E{6U{ay{Eft|fKi z{?m0jOgd9nv4dl-q1Oa;&7|S3D}Eg6v!p!qnn-%Y3tWGE#Hep2B$xD2LXCBgs7xN9 z5-=J~QWz5Ahdv6*^52`s0T?%vSorwmurgWlZK_IG4B$Oy=7ler58~S4@-I zNt>D`a~V~K2Sx8-n(!2#595RnOw$awpYmmz>ZI8877qgGW^R@3V$^;nA6es+l*7vm zlHPc<^Ws6$mli!_392o_@H0rgYBA<`F;+jcxM^X~96yDjH6D2wwI=xvxI1JC4zF`* zgfVU6?ER6$q!mB=0H$gQX1^5F-sk!jz=Fpg5=ab}51I76_3Y)aPqile86UOpPZN&HC%fBU6@dCidpnd69-Yn)X7OgQKLmC z#6<664WY@ z#i1aR_hFc0DQ-*#jqc z%HA`2)!3RZzKzVL;@ij^Cb`W@z-aF}zEK;J(KDiLrig`f=O8K@t_f#y!_~ehH(bDp z5S7f#qb5_+t>{{*x6u<5ttCGsUQRm&N6-|iHuX__$Eblk<{He^Q}KN*qYM0hV4o)y HLrVbwdexP| literal 11286 zcmV+xEa}r9iwFP!000001MPiHY$QjPUXS`uO^w#GSYUwt8;96xbx~qv{gG@om+C2Y zll`Y=tB0hd(F|tjsLZI$AoHgbkx8=JfT5c&z8QwSd-BnMZNPv50|pG(z+CN+tU<@b5>EdISFc*$z2kLUPX~Jq`XNjc&Vhr`hf`+bavXvVVB8 zy0X8rv`B331}9C^4RQr8|FYA`C0%K3J7>R z3cQoax$07f$*B1CDDis4Pjq`tj-}6>=M_2FK)HMTYvY1TwY@7P=?K}R<_>~My z%{^GRsg$|*e18P=Lr*yS+#PzEHoqDboQtWAkv$gi&7sSEk-pT+F*~AmbpHnq*M&D= zu5LM097d@>cE|eA=BDM#PA`7T9ep&4u5Sn|YH8M-<2Ld6U|`3rUOnc% zC35e0>9zgM@!r;!wRZd-9j&vhb<(VEl6AeKEj7E7dEGd#t#u$PE_%76#jP;c(Xim% zb~}?9lU-Grx%WYEtpL`W-KB|?PN&)J=F4=lDa)$N@+3$hsY%1V|& zcs=zI{^<8nGhB_~FrxZl`XT@5<6=P&e#fy;@B*Rdzv>&pJJw>6@;(ZIZ{gSPfB*ac z7Z!Xce)2oX7au-ZhF^TtU+^5N4F%K_$^a#Uk0M!cEhjWSe8_}LUBe^Lrh-wjKGfAk zpAHT*Png<3+zacOpnDgx1E1S@Ap{=^d>zf5)Hy5k35JRQS^L--(vJ95)ja z!V@xnikk-^ojc2ZlTtKE5y1H$v`v%yJGHSs#Q6gYdp@ z0uQ#Pd(OQaIs=o?t6ku@+e@g%Z|AT;z%>& zo4!fK5p~rNMT4Rt>e|3Q9C#7;_BAOUw`|r2HX_Gzy9_wqi6jl zdDg@;xJ!13?inn7+BSRySPm)-Ty}!p2T$|{2Ow=!%_ru-gYRu^Z6uh%bzeQ?b%Xjr z1yHMQsVAgwJ`M-iueg3_Q3qt8y6+3=2L|_whSpmJVlYx=2evmTmVs9=E0?C`A1U^4 z_SDb!FaI{GK*bx>6DVY746~6vjcj``*CFe|clw~w3$BCAV@9FCn}g=k5BEH;NGo4y z_AXTudl%64k1BP2#7jK^@X4<3`9667Qewb_4ev_Uow0D3?&)KY7P4F!zg-|Pga@OD z)Ol;**+!YnfUIfYWOXL(Ow+j^T?)rAev#v)q^=1a!oJzLknyaFkb-8bCq_Sb0y65U z=Sl|P$VNRO)7qg*&g?RL zE`mm=1WiT>eciJ?9I;rLk>`CK)u8b)qrNpg^h_!&_r8rf{rg74(<*4luv1S|eDH$# zptWqWuQ<$+)(v(He@D61);ta_>!U(hkXrek%t{vYEA;-TrhR^Eo7+s1ZT)^Y7sfly z(Fbr>K612*ln$f}30tW9kEkr0ld-^|5DK);A80D&8om#s;vA+XI1ZSEN~ z4C(aH(HMlZHzZ!*j{<)Uo>=MUw?HuY9Cgw3Md0d92Oqn(yw+PI(jVJwjeJQ3SIZsn zF_R&bL4P5lTmp%-yudcpvdDlD+r!y9Fa_P$T_(CkL6Zb6LTc(AM*`rtPldU!i1*RO z7I@f)uY!*xmt?(3B=ZeE95!-g7s))d@ce?R=ePgl^q({EcXzF`^7q@ z&T}xu?IKYxv=1+omRgwZ%rkHs{vUHoqA!wsdd?rH^YhQvNT+>=?0)v-#fz=YHPR*z zH=aDhs}5v$H1ZJ883<^_c)@HJ8AMCl_oFW$#5tBZ zVS1qYz@oO#;^n^!6wnovLj&bw2{!G3dSd=hA5iX*XUz2h?hfngzKz#q)8DIxrx$s6b~9LAju81K z8^aVE_3ZIKzV8h{fiqAW8F+)fz)Q_#exYv@G}MWYD!_MidV5xe^9tX3%1b?a{!hOS z7M(OR?zJ91MVHu*yNcl`fsaBt)kV3so?=EXmXaB(Ib=;&NJP`9TopIHa8`2duhZU>d0 z*^X-1i1kG3c`S3^rpKD>}G@<&4l$VW(!yNj>q>*rZ3?h}>EZ z0W=2Q!&Tp4)UX&mV(wX&B4g4P#vutP`t6pCQ*nMCJ(G(|E6={45CrEMr(#y>37`3G zdO{v}?lB#cbzS|{9D33@-2>*za6t2Ye@!X6>D+$r$202u3cEs(je7R`Yns&`Gl}Z0 z@*pdg71xJl?sC1%ICDFK#P<%C%?ef;9&Lw+$8eV@Qs;=`!DEk)KlN zBlXqB&hsbFAI&L05OjLV62%k}EyqxL?yC?vSPrIc&=nsZquSoUu3seI1f2Qg)9~*i zl+Zm@&8K*|K(LY*XqeJT3PE+UTYzIXqc6Os%i)~|F1L$Ak zdt`@fN8tm>QAeA5=20VL86GZDXmrqDsMmx4y+PJ^cVCTxqS1RBLiO+oXkvFTu}fM3yLYP>`{w; zHp{xY$6oA7R_Me&@$lx>N!E>BX)FqL#KCxrHa}$cn0UG#2-Ksv3+l-|f{M!88imo> zbQ|;92)k!~Q4QG|UN;ut#*?7x%|E~w+&bBEkLDME^5)H($WWU+49k#RRR($4QhH`odc)@MBC?>asKCb`ldXvPFcH(C4yChbo-A0Fe)Xg5)fds-vcVU`Lxvc{&5bii5o+|cux3&hq5WkKF zWscp3v_XA`UV~&G6jabSF@XwH+TpicB(6%qo>iML7YSKIzwzxCPxc=`J^QL2R3lLX zlfftqEvU^sfTo6y%DgUV-cz?gs;4RI8?NV$9WRjgrj)gu)O;uW1}>$0JuV<*)Xv_6 zM;n@O0cYP}(5Ubm{io;h&mngskK(iV=ivNEIU9E)C*;s!huqP67vZo|VHfU%9I5B% zagN3EA}7TpM3Kq716daC_G6M>T8R7V4tU>8W8u=0Hz!8HGj~PxpV;HS4!;L2THR zmwJNW);5)t!u<9z=$eO~v|y$yxoe5TQwEwM`$$9t4GPM#&xhj@SDPe%8aqpw1$6U8 z1d%g2#s}w9yq7C0-pgA1BGl{(#^IzL>xtWi2UK#03$hE6O1K^jaypfojP9yom%TIv z9a-3@W&l&%vUU78dm6e~AH&628TTrz!rW>2fb5Im^YgzcoT0^mu>b3KTQx!}Uu4#hsm*7~tf4F!Tlb&f zJE5%)?o7drNBAvpT|&~_+%5wN8m^LIKH32{w{{=wJbAJAs!nQJ@9nj{sH#~fquw*Ja4BJ5@Mq| zT;hJb|%g=y*n$1-3k^`#YRoh@>)YhSh#hq z1S=}92rKPNr;k|CYWLOjK*6(ne5i-c&eKCMYU~?6o%He8fm9XJ?-(YM7?%zsac%Bx zsHvvZ@-7~6CE&jjjogQ`g7bfXfl{lVo)rCd(1SX?z+^ zaNQW#_ogn3lGk-h+?(s9ambdnguN`` zos_VfA?y_qE@cTG#aJh&uROcK?>BIp!y<9fYun~8 z*$eoD)OWNvGHjbhqwG9 z^y%`wNSvts6|vV*@y90Jkt-J-~$cf-h` zksCgG_6v0D_XQu}aKLrqk4NyDQ4CSlo=pRzYDaNIyCuXB)k0T8OLM3AmAXAeyp#}gcgS7tkBJKJsCzCz3!T9LI?p!>Ygkn^ zEGIP#DXtqyGGH+1GXhFBDpy9~<9p%bR}x}XI@|*?g8pRU2%cR)xU{4Q?@SV^$58df z;!X?Xe^gAr95&kOE4}sdT}6Di=&dJOEbxcT)uI~i^j>2~*;rB9O}lS2(;q*;PuwPG~517|aW`nX24M%c!Tyed~cuLAR#lOYVDU zU(}D(g~5)ht?4CGG|Mo2Jo~j|O)t*QrNgv-B~iWUKRabf=JN6@31&a*xPD7+Sz>2vQ-$~79HYI#o9|gx($^8i5kT-+qd9LHrS$?AdpC> z?%wHP^iDDu`%0aDrNI#Q4cZ>mZNS*ILbmT;?6|wUoDRF4WZ3Oa47+>qY_hkry`6Sf zpaxGI?PReaTknlXDA5lD(;5bx_wKzpEvvC45B#@6vN8QK7MWsUH zq)HDQi@uy+K*_lRO4@1lpgOpQYU|cXxUJ$#RHPfDLvvB>^T0Y*r$&X_x8&`3Lk7hy zE+K8S8#&s6oNg0=((_?;i}^POIKi{~Af-bDVWyfbExG1UKTUt5g z9EM18HUjt1h0!LS=O{FAm=L8imGg<&=;ONfZ!U1#|7|>QE)cgD$+5*@{&vi58z@FL zz(jpv?1W1-J(mCwrp@i*AEj%=q)HvP(X=)Wr$Mf-kqtvVj{;IbZ3&5ys`>-p*uVsD z?2G--MQ?l;{qSOcZ(b~svrd2x`1{-$*$pi;mKvTfBP-|a0wtizSRRwzE{wgg)NQWz zNaLWHjzQlUe`B)nDKR(_4sn;QgJ)Gjja{uY07vZhc#w=+6Yh?%J6s*_z6A%UCal!6|3BFf^azdf zkJ(^AZ4SL3UT8GTC?5seMQb1On*ao@L3L^{XWZiM5PGr12p49a4xzPgBc!~+-m)Pd zHO0@X2Ms8So1UzlacSUJS*AqYNb;xQlMQ#Z@fJv+gq3iwUvfs)PdMw3@m50xicK+2>m6yjZ%$=4q z&f6QaIuM|OCyC;to)G!?z6iay?|aO04w*VW4HE|8eYt2`DLy+bL)-dHQ2T)E+te5Q zq$HZ(M43FmCbx`tPL0`ofl#Ut*K2~EdP3?vo066bK($R>K4jAOUI-8ElPxDsC_7s_ zEszIPXW}5zpGUBHlS8khywnp-uduu1cKPlSwVGZw#|ty_keQt0eLSnZNEK9`kdJ!8 z<-@PNz%|XlRgv7+$I)FM9V3RGFv`L;UB^Z{qIOa5caz>f`RSX#b1`D1ZrvZQfZg7v zzx%h)L}ZuR4!W&46kAM_>b5_omgi}5O8xDmdtnPh0s`$J8{3SQML~ZrQ=$k$sS@+y ztU^mxurz0wsT+*WZ7C{>elv+B!A$hIFY&aFvx`uaMsa9=8-e8wj-C{AQcnoYe+C~A z*(3L<069d~58-yucbG2%N0?`wP(|fg7@OM^UNC}oHKk`Cm4r`vH_o00&}zn6|KXX8 zjWO~0j#MWrQT*kzAE|y(q2nsSH*Cjx!nd&p4Mio!uzAMV2m@dGmM0HvbyF=4z|ONy z`+3We=4m@j;_PYIb~B+P`h|N;^02)$Ti`^T)Dt-KkLkf-^AYoeNjC9_UYN0&Mz`13 zsiRR{3l7g>d&EjMTh4fI<4K9_QRPj8CF_$i_&*UQ&Lrc`8J2z-L&~4k<3L%*NjI{o zXX4afNLcy`mQdBI^#txkg`;<=j~i7>f_6o@(?HH@dw)JFqeF#hXT(T7vGWQ>sv^I< z$Vlam^`Xs8%a@&A$!V9_BGcIEW=s~nGliFaO^V)~3af;X5L~$!zp4snZD!lDp71?~ z=qp;_PDGzac`<%3L(b{2omqI`{@H;8OwRy~n<>nV50W2O$oT0c-O%9gr2Z742`U8l~a zZ5o4?XADXru3o{cJSZna*DXfS``*RaMg_zG7xhHT8PAx`k`y@tDndoqicUx_QTC(U zJY*&p2zIX(jeNi@7Jg?nky~evU>7}hb}{Uv%}4v(-RF)u8ODx|aGR0}wt*qW^I_{I z>B@rC#b*sd4TAf=z-I%6idKi=xbUxrakCm2!bUTh&)lQN{LcR4&$qYc;q~WX`i;Tt z(BU8d0{A`cU}Vk{tm*{o2;?Y{ z>S(>YxM{xAUQEm$LeX`?o&S6Y?bpb+t18irVgtyL0I@b~xKWUR zMi@(_ArMHnWVR3H!xY@iqjn70c9;w$bqjw@1^`GS0~7>>xu|{jojXPQ?w2O^-K%et z0Mbbu+XTOaCM0M(H&<43AyY<w?i5u@0bY{BKi#b z$0iG(vTLl8Si8V8=qnh%q7k;9TGTnL2Sq_~q<#q1wa|tDA92}oQJg)kOJ%oIbia+X z>^FG1DCXn`@KglPsqySU>Y0?4o>3KNPs1m>#bV*on-8CulX}9Zd0*i0=8|XZKBECy zx7mOVM7#6J$QXuB6V*0##q_O&zGPEZl0OZh>};+vD+pEC)RnMOPYk{KX+0~ap4Kz6 zJl`8|50A~{F6f3OM`rwCw%`-@^B{j<>@{`hW8${{^Z#4892i?Rf0wAKXFK~WJ^Bm- z38ZFDJP0jtB_4o>w^5%cTW9u#-_rBXo>%xh^4;^pXHxAmX`lHsDOv5z7McDw?q-j- zdMIbKN2tPrW0swIV(HFTAP!;1enee@Gxz)az$WX*Dp7+(4HC5hB=%o=*i2lLL4n(L zk>AC}Ne_ewwDH*X(CAk-e8>5@3^jpBL~Z})v+}&CGJMCZ)Dug$9#A1++}Y&}L#vZ@ zeI&!nPPK_=I(M)=-!73w*TT#^YL>L+jC1YYzdJ1w_Rn6)1iN%cww5j+8tbn+zajHU zoj|=tLKd6K+qjAL8SXZHL3K8NYI$mdKyLy*T{KRerL5~UG4i1}y=)kJze!KHJiQT$WRPTww*USw}r zETkhB^@NHR1tr|^By$H$m}LFHLG&8V{t;m_bij#kRe0Bu*||$xw`R3( zx57*?VWpnHS@??EI1_v*822d%p<{Kg4a56t3jrZ*MA{MqeNdviVAeErvN0n*omJeL z3Ii8%QBTx-v>hrcWK$!%f#ag*sAEWVRSucIC^9_-5~j&Ei0=*HS?E63H+gt|2DGo~ zl-U2TVBR!>+L;YNJOA@-K#=Lw6G7)#!!8O{lh~oez_Lq)j#Uts?kyyY$!@pelc6)6gdCW|*K!-SUQZHD${T ziJ(yfpO;0lxgOory3UPl{LZ(8{7E#xs z>B1Bm?(-5=_^QgA#>{fY?09olVy22hgKX3jHGlf_DcP_AErOBtgM+-)DDTE|Lpagy z;atY$Y&^TWXAIR7k_P880g)AL<;*4^;TS3;S?3}wKvib#aVypnbQdP7T#uHTx-l=G zi0(tFTleNiGjc$yBC3#$A5ile_MxY!@r2HevXwQJIgOj_Qmi&B$HgiuYl@G00_UTr z9wU2}CoqKP`hmy#BM*Apb9K)}QfO{Xr+LhDistHhx|Z;{Q4*>Bs>+*&PCH{J>_-53 zqeTv~QBUMFw~UuekQZ#gq(jL%!&_|>-u45RH=zMtTyE2hso8sxr@X45C5NKKSLhvC zFa=v`rnB}h7ptgN=ZksWX;+BrABDJHN@89|f&P~+=7h+fpB=xlb`!$T=yY?Fx}4eM z+3)^~0R*7m8=4(3b=?mRSpj5=?341~h3)z9$KkRhP~x>PGmqRZjFKsGAH4+cppyiBcDVn+^!X?}dQoP_A<>mo{ z3uo;FFgyP`!o``w1MepT<7)~JJmO4e$6T`At?dg55nN$iH)^lC0rT9m#AdYIa(sNO z6-^YSXA2&bthii{a;H(cltJmeSq*|!;1e=ZPx!prZh@je6){yyjs|p4HW*%ya*JTI zoWSPuuipaLgpB+Eo7V;#V`PuZLQO}x)3C{g%-@*RXY&h19-i#(~Rd9oB)Dt%swSeN&6aKQq2!1WhoW{*+X1(~?to%wUO!h-Q z>Is~MZ3?)78NY6MsMn~A{vePTZb~)*12}KixK}u%no@8S`RbC|a`H_;-7+`*B!3z` z**TT;kK;<9bJ&c6`h<4qPg zij8`r=A+HP)nO|2hziGZWQ3Bo&r`LgBHwem{a){Zo(ep7VJ2oVr&qX4!Ea#ts`oeK<5f(6~QL8`+fbN zzrQnqUu_Ha@c#ks#5I@#Lvu zY+}|lHnTRO_N;6~70`iP)Ds;SWga(Og^qNR|#0y-1e9WkCB_x;i zQ9_M%kEl!@pb{|hL{b(sj{9}vD!{pId!$rQR z&l#2DAs#uJP~3p;G7K}G0Nv&Ag~pA|0^y-ANKzcey@0|19k=3eK;!G{!wIh6#Y0^( zPyaFAOA!B=59h|vW+&?Sn4}KRv^?Raw?d~0Lf?P5%WS0|?C7IWT*hSHflP5~GT#RA zE0dSLYMRte+SD|e%cwdiBzgzags1p?7$>}InkF7VV7i7K46wGq=ijF={`P zkF0S@%Hd@ONpC#b{d_a&ON$<{1l5*d_!*>Lvlw%{7_0AD+_W&%wx7b#8jrjY6*Bn_ zxI1JC4sUR2U~W?W+QGseV8P=L2@l%gLneJMe&1{GKFm%y z!#e;&{Dv^=Ib>s-(WLL*bp$i<*q-#>l%9RWl6z@pS-$Fw_cory)w|H^OvJ+B$L?4k z+ISeN?DXOf#iKl~Dmef?LZv!)JE|!@Q#mdgp9>h>CkMSn4VNC<6($rMz7)OF#Gx}W zb#iJ*)M(LZ5Yc<7Fy`?!#d9uYX&Q)8d;#Uke#Kc)@i$i#W zzUxt;$R9YlQ~sXOtH$1Z@onTb72ihgFv)FJ0!C}s@r_!LjGhrKGes<{{*x6u<5ttCGsUP(IzN6-|iHuX__$Ee93+ch;NU;4ZM M4;zF% diff --git a/revdep/install/ggspectra.out b/revdep/install/ggspectra.out deleted file mode 100644 index ecc794cf3..000000000 --- a/revdep/install/ggspectra.out +++ /dev/null @@ -1,10 +0,0 @@ -* installing *source* package ‘ggspectra’ ... -** package ‘ggspectra’ successfully unpacked and MD5 sums checked -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required -ERROR: lazy loading failed for package ‘ggspectra’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ -* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggspectra’ diff --git a/revdep/install/photobiologyInOut.out b/revdep/install/photobiologyInOut.out deleted file mode 100644 index 8339117bf..000000000 --- a/revdep/install/photobiologyInOut.out +++ /dev/null @@ -1,11 +0,0 @@ -* installing *source* package ‘photobiologyInOut’ ... -** package ‘photobiologyInOut’ successfully unpacked and MD5 sums checked -** R -** inst -** tests -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - namespace ‘photobiology’ 0.9.13 is being loaded, but >= 0.9.14 is required -ERROR: lazy loading failed for package ‘photobiologyInOut’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ -* restoring previous ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/photobiologyInOut’ diff --git a/revdep/problems-v1.2.md b/revdep/problems-v1.2.md index bfa66b50c..bebe6753e 100644 --- a/revdep/problems-v1.2.md +++ b/revdep/problems-v1.2.md @@ -10,7 +10,7 @@ |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-03-29 | +|date |2017-03-31 | ## Packages @@ -21,8 +21,8 @@ |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | |nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | -|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|Rcpp | |0.12.10 |2017-03-31 |Github (RcppCore/Rcpp@886f5df) | +|rmarkdown | |1.4 |2017-03-24 |cran (@1.4) | |testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | @@ -31,19 +31,19 @@ 11 packages with problems -|package |version | errors| warnings| notes| -|:-----------------|:-------|------:|--------:|-----:| -|dat |0.1.0 | 1| 0| 0| -|flextable |0.1.0 | 0| 1| 0| -|FSelectorRcpp |0.1.2 | 1| 0| 2| -|ggimage |0.0.4 | 1| 0| 0| -|haven |1.0.0 | 2| 0| 1| -|hddtools |0.6 | 1| 0| 0| -|heemod |0.8.0 | 1| 1| 1| -|highcharter |0.5.0 | 0| 1| 1| -|officer |0.1.1 | 2| 1| 0| -|photobiologyInOut |0.4.13 | 1| 0| 0| -|plotly |4.5.6 | 1| 0| 0| +|package |version | errors| warnings| notes| +|:-------------|:-------|------:|--------:|-----:| +|dat |0.1.0 | 1| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|ggimage |0.0.4 | 1| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|officer |0.1.1 | 2| 1| 0| +|plotly |4.5.6 | 1| 0| 0| +|refimpact |0.1.0 | 1| 0| 0| ## dat (0.1.0) Maintainer: Sebastian Warnholz @@ -221,7 +221,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [14s/22s] + Running ‘testthat.R’ [13s/24s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -249,7 +249,7 @@ Bug reports: https://github.com/pierucci/heemod/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [33s/36s] + Running ‘testthat.R’ [32s/36s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) @@ -349,7 +349,7 @@ Error: file.exists(src) is not TRUE Execution halted checking tests ... ERROR - Running ‘testthat.R’ [21s/21s] + Running ‘testthat.R’ [20s/20s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) @@ -380,20 +380,6 @@ Execution halted ``` -## photobiologyInOut (0.4.13) -Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ - -1 error | 0 warnings | 0 notes - -``` -checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘photobiology’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` - ## plotly (4.5.6) Maintainer: Carson Sievert Bug reports: https://github.com/ropensci/plotly/issues @@ -402,7 +388,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [46s/47s] + Running ‘testthat.R’ [44s/45s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" @@ -422,3 +408,31 @@ Last 13 lines of output: Execution halted ``` +## refimpact (0.1.0) +Maintainer: Perry Stephenson +Bug reports: https://github.com/perrystephenson/refimpact/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [1s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 7: parseJSON(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/fromJSON.R:115 + 8: parse_con(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/parseJSON.R:3 + 9: open(con, "rb") at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/push_parser.R:6 + 10: open.connection(con, "rb") + + testthat results ================================================================ + OK: 21 SKIPPED: 0 FAILED: 5 + 1. Error: get_institutions() returns a tibble (@test_institutions.R#6) + 2. Error: Function returns sensible data frames for sensible queries (@test_search_case_studies.R#6) + 3. Error: get_tag_types() returns a tibble (@test_tag_types.R#6) + 4. Error: get_tag_value() returns a tibble (@test_tag_values.R#6) + 5. Error: get_units_of_assessment() returns a tibble (@test_units_of_assessment.R#6) + + Error: testthat unit tests failed + Execution halted +``` + diff --git a/revdep/problems.md b/revdep/problems.md index c7b531863..bebe6753e 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -10,19 +10,19 @@ |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-03-29 | +|date |2017-03-31 | ## Packages |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| -|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | +|assertthat | |0.1 |2013-12-06 |cran (@0.1) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | |nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | -|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|Rcpp | |0.12.10 |2017-03-31 |Github (RcppCore/Rcpp@886f5df) | +|rmarkdown | |1.4 |2017-03-24 |cran (@1.4) | |testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | @@ -31,19 +31,19 @@ 11 packages with problems -|package |version | errors| warnings| notes| -|:-----------------|:-------|------:|--------:|-----:| -|dat |0.1.0 | 1| 0| 0| -|flextable |0.1.0 | 0| 1| 0| -|FSelectorRcpp |0.1.2 | 1| 0| 2| -|ggimage |0.0.4 | 1| 0| 0| -|haven |1.0.0 | 2| 0| 1| -|hddtools |0.6 | 1| 0| 0| -|heemod |0.8.0 | 1| 1| 1| -|highcharter |0.5.0 | 0| 1| 1| -|officer |0.1.1 | 2| 1| 0| -|photobiologyInOut |0.4.13 | 1| 0| 0| -|plotly |4.5.6 | 1| 0| 0| +|package |version | errors| warnings| notes| +|:-------------|:-------|------:|--------:|-----:| +|dat |0.1.0 | 1| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|ggimage |0.0.4 | 1| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|officer |0.1.1 | 2| 1| 0| +|plotly |4.5.6 | 1| 0| 0| +|refimpact |0.1.0 | 1| 0| 0| ## dat (0.1.0) Maintainer: Sebastian Warnholz @@ -53,7 +53,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [11s/11s] + Running ‘testthat.R’ [10s/10s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -221,7 +221,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [13s/22s] + Running ‘testthat.R’ [13s/24s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -249,7 +249,7 @@ Bug reports: https://github.com/pierucci/heemod/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [33s/36s] + Running ‘testthat.R’ [32s/36s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) @@ -349,7 +349,7 @@ Error: file.exists(src) is not TRUE Execution halted checking tests ... ERROR - Running ‘testthat.R’ [21s/21s] + Running ‘testthat.R’ [20s/20s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) @@ -380,20 +380,6 @@ Execution halted ``` -## photobiologyInOut (0.4.13) -Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ - -1 error | 0 warnings | 0 notes - -``` -checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘photobiology’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` - ## plotly (4.5.6) Maintainer: Carson Sievert Bug reports: https://github.com/ropensci/plotly/issues @@ -402,7 +388,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [47s/46s] + Running ‘testthat.R’ [44s/45s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" @@ -422,3 +408,31 @@ Last 13 lines of output: Execution halted ``` +## refimpact (0.1.0) +Maintainer: Perry Stephenson +Bug reports: https://github.com/perrystephenson/refimpact/issues + +1 error | 0 warnings | 0 notes + +``` +checking tests ... ERROR + Running ‘testthat.R’ [1s/22s] +Running the tests in ‘tests/testthat.R’ failed. +Last 13 lines of output: + 7: parseJSON(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/fromJSON.R:115 + 8: parse_con(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/parseJSON.R:3 + 9: open(con, "rb") at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/push_parser.R:6 + 10: open.connection(con, "rb") + + testthat results ================================================================ + OK: 21 SKIPPED: 0 FAILED: 5 + 1. Error: get_institutions() returns a tibble (@test_institutions.R#6) + 2. Error: Function returns sensible data frames for sensible queries (@test_search_case_studies.R#6) + 3. Error: get_tag_types() returns a tibble (@test_tag_types.R#6) + 4. Error: get_tag_value() returns a tibble (@test_tag_values.R#6) + 5. Error: get_units_of_assessment() returns a tibble (@test_units_of_assessment.R#6) + + Error: testthat unit tests failed + Execution halted +``` + diff --git a/revdep/timing.md b/revdep/timing.md index a8ac75e6e..d318fd8fa 100644 --- a/revdep/timing.md +++ b/revdep/timing.md @@ -2,123 +2,123 @@ | |package |version | check_time| |:---|:-----------------|:-------|----------:| -|61 |modeval |0.1.2 | 385.4| -|103 |sjPlot |2.3.1 | 215.6| -|19 |DiagrammeR |0.9.0 | 199.6| -|111 |tidyquant |0.4.0 | 194.1| -|41 |ggfortify |0.4.1 | 186.5| -|44 |ggplot2 |2.2.1 | 165.5| -|51 |heemod |0.8.0 | 160| -|66 |myTAI |0.5.0 | 151.5| -|50 |hddtools |0.6 | 140.4| -|40 |ggenealogy |0.3.0 | 120.4| -|3 |biomartr |0.4.0 | 103.4| -|116 |valr |0.1.2 | 102.9| -|101 |sf |0.4-1 | 88.7| -|79 |plotly |4.5.6 | 82.7| -|29 |fbar |0.1.23 | 80.2| -|72 |officer |0.1.1 | 76.1| -|85 |rbgm |0.0.4 | 75.3| -|104 |sjstats |0.9.0 | 74.5| -|87 |rdefra |0.3.4 | 68.4| -|52 |highcharter |0.5.0 | 66.3| -|23 |dplyr |0.5.0 | 65.5| -|45 |ggpmisc |0.2.14 | 65.2| -|106 |spbabel |0.4.5 | 62.7| -|110 |taxize |0.8.4 | 57.4| -|82 |radiant.data |0.6.0 | 54.5| -|9 |ccafs |0.1.0 | 52.7| -|15 |cpr |0.2.3 | 50.2| -|39 |ggalt |0.4.0 | 48.3| -|56 |jpmesh |0.3.0 | 48| +|61 |modeval |0.1.2 | 480.9| +|103 |sjPlot |2.3.1 | 209.2| +|19 |DiagrammeR |0.9.0 | 194.6| +|41 |ggfortify |0.4.1 | 183.9| +|44 |ggplot2 |2.2.1 | 162.8| +|111 |tidyquant |0.4.0 | 162| +|51 |heemod |0.8.0 | 155.3| +|66 |myTAI |0.5.0 | 148.4| +|50 |hddtools |0.6 | 135.4| +|40 |ggenealogy |0.3.0 | 110.6| +|116 |valr |0.1.2 | 106.7| +|3 |biomartr |0.4.0 | 96.8| +|101 |sf |0.4-1 | 88.8| +|79 |plotly |4.5.6 | 83.7| +|29 |fbar |0.1.23 | 75.2| +|110 |taxize |0.8.4 | 73.8| +|85 |rbgm |0.0.4 | 73.1| +|87 |rdefra |0.3.4 | 73.1| +|104 |sjstats |0.9.0 | 71.8| +|72 |officer |0.1.1 | 70.4| +|23 |dplyr |0.5.0 | 64.6| +|38 |getlandsat |0.1.0 | 64| +|45 |ggpmisc |0.2.14 | 63.5| +|106 |spbabel |0.4.5 | 63.3| +|52 |highcharter |0.5.0 | 60.6| +|15 |cpr |0.2.3 | 56.2| +|82 |radiant.data |0.6.0 | 55.9| +|9 |ccafs |0.1.0 | 50| +|2 |anomalyDetection |0.1.1 | 49.2| +|76 |photobiologyInOut |0.4.13 | 48.7| |108 |spocc |0.6.0 | 46.6| -|8 |bsam |1.1.1 | 46.4| -|102 |sjmisc |2.3.1 | 46.2| -|77 |photobiology |0.9.14 | 44.9| -|64 |mrgsolve |0.8.6 | 44.8| -|25 |ecoseries |0.1.1 | 43.5| -|22 |dotwhisker |0.2.3 | 43.2| -|33 |flextable |0.1.0 | 41.4| -|27 |eurostat |3.1.1 | 40.9| -|98 |rnoaa |0.6.6 | 40.3| -|92 |rgbif |0.9.7 | 40.1| -|107 |spdplyr |0.1.2 | 35.1| -|55 |isdparser |0.2.0 | 34.8| -|18 |dat |0.1.0 | 34.4| -|109 |srvyr |0.2.0 | 34.4| -|57 |knitr |1.15.1 | 34.1| -|95 |rif |0.1.0 | 33.4| -|2 |anomalyDetection |0.1.0 | 33.2| -|65 |msgtools |0.2.7 | 33.1| -|31 |fileplyr |0.2.0 | 32| -|100 |rtide |0.0.3 | 32| -|78 |phylopath |0.2.3 | 31.6| -|59 |manifestoR |1.2.3 | 31| -|14 |countyweather |0.1.0 | 30.5| -|105 |solrium |0.4.0 | 30.1| -|113 |tidyverse |1.1.1 | 30.1| -|84 |rbcb |0.1.0 | 29.7| -|80 |poio |0.0-3 | 28.1| -|12 |checkmate |1.8.2 | 27.2| -|54 |inferr |0.1.0 | 26.5| -|13 |corrr |0.2.1 | 26.1| -|34 |foghorn |0.4.2 | 25.9| -|48 |GSODR |1.0.1 | 25.6| -|53 |hypoparsr |0.1.0 | 25.4| -|97 |rmarkdown |1.4 | 25.3| -|37 |geojson |0.1.2 | 24.8| -|115 |unpivotr |0.1.0 | 24.7| -|93 |rgho |1.0.1 | 23.7| -|89 |readr |1.1.0 | 22.7| -|28 |evaluator |0.1.0 | 22.3| -|4 |blkbox |1.0 | 22.1| -|6 |blockTools |0.6-3 | 22.1| -|38 |getlandsat |0.1.0 | 21.9| -|91 |reutils |0.2.3 | 21.3| -|118 |worrms |0.1.0 | 21.2| -|20 |doctr |0.2.0 | 21| -|47 |gitlabr |0.7 | 20.9| -|36 |FSelectorRcpp |0.1.2 | 20.2| -|70 |observer |0.1.2 | 19.3| -|68 |nycflights13 |0.2.2 | 19.1| -|73 |openadds |0.2.0 | 18.5| -|58 |KraljicMatrix |0.1.1 | 17.7| -|112 |tidyr |0.6.1 | 17.6| -|63 |mregions |0.1.4 | 16.5| -|10 |cdata |0.1.0 | 16.4| -|21 |docxtractr |0.2.0 | 16.2| -|117 |wand |0.2.0 | 16.2| -|7 |bold |0.4.0 | 15.4| -|32 |filesstrings |0.3.2 | 15.3| +|56 |jpmesh |0.3.0 | 46.5| +|102 |sjmisc |2.3.1 | 46.1| +|39 |ggalt |0.4.0 | 45.9| +|77 |photobiology |0.9.14 | 44.5| +|8 |bsam |1.1.1 | 44.2| +|33 |flextable |0.1.0 | 42.7| +|22 |dotwhisker |0.2.3 | 42.5| +|64 |mrgsolve |0.8.6 | 41.9| +|25 |ecoseries |0.1.1 | 40.7| +|92 |rgbif |0.9.7 | 39.9| +|27 |eurostat |3.1.1 | 39.8| +|91 |reutils |0.2.3 | 39.8| +|98 |rnoaa |0.6.6 | 38.9| +|57 |knitr |1.15.1 | 38.3| +|14 |countyweather |0.1.0 | 37.5| +|55 |isdparser |0.2.0 | 36.3| +|18 |dat |0.1.0 | 34.5| +|109 |srvyr |0.2.0 | 34.3| +|65 |msgtools |0.2.7 | 34.2| +|107 |spdplyr |0.1.2 | 34.2| +|78 |phylopath |0.2.3 | 32.8| +|84 |rbcb |0.1.0 | 31.3| +|31 |fileplyr |0.2.0 | 30.6| +|59 |manifestoR |1.2.3 | 30.6| +|100 |rtide |0.0.3 | 29.9| +|113 |tidyverse |1.1.1 | 29.8| +|105 |solrium |0.4.0 | 28.8| +|4 |blkbox |1.0 | 28.7| +|80 |poio |0.0-3 | 28.7| +|95 |rif |0.1.0 | 28.7| +|90 |refimpact |0.1.0 | 27.6| +|53 |hypoparsr |0.1.0 | 27.1| +|12 |checkmate |1.8.2 | 26.4| +|48 |GSODR |1.0.1 | 25.9| +|54 |inferr |0.1.0 | 25.7| +|97 |rmarkdown |1.4 | 25.7| +|34 |foghorn |0.4.2 | 25.6| +|115 |unpivotr |0.1.0 | 25.3| +|37 |geojson |0.1.2 | 24.5| +|6 |blockTools |0.6-3 | 24| +|13 |corrr |0.2.1 | 24| +|36 |FSelectorRcpp |0.1.2 | 23.1| +|28 |evaluator |0.1.0 | 22.6| +|93 |rgho |1.0.1 | 21.3| +|89 |readr |1.1.0 | 21| +|118 |worrms |0.1.0 | 21| +|47 |gitlabr |0.7 | 20.7| +|68 |nycflights13 |0.2.2 | 19.8| +|70 |observer |0.1.2 | 19.1| +|73 |openadds |0.2.0 | 18.7| +|20 |doctr |0.2.0 | 18.5| +|112 |tidyr |0.6.1 | 18.1| +|10 |cdata |0.1.0 | 16.7| +|117 |wand |0.2.0 | 16.6| +|58 |KraljicMatrix |0.1.1 | 16.1| +|32 |filesstrings |0.3.2 | 15.7| +|63 |mregions |0.1.4 | 15.3| +|7 |bold |0.4.0 | 15.2| +|21 |docxtractr |0.2.0 | 15.2| |99 |rorcid |0.3.0 | 15.2| -|42 |ggguitar |0.1.1 | 14.2| -|69 |oai |0.2.2 | 14.2| -|46 |giphyr |0.1.0 | 14.1| -|49 |haven |1.0.0 | 14.1| -|71 |odbc |1.0.1 | 14| -|86 |rbhl |0.3.0 | 14| -|60 |modelr |0.1.0 | 13.3| -|90 |refimpact |0.1.0 | 12.9| -|74 |pangaear |0.3.0 | 12.5| -|114 |units |0.4-3 | 12.5| -|24 |easyformatr |0.1.2 | 12.1| -|75 |pdfsearch |0.1.1 | 12| -|30 |feather |0.3.1 | 11.5| -|26 |enigma |0.3.0 | 11.1| -|83 |randNames |0.2.3 | 10.9| -|62 |monkeylearn |0.1.1 | 10.4| -|11 |cellranger |1.1.0 | 9.8| -|96 |ritis |0.5.4 | 9.8| -|17 |datastepr |0.0.2 | 9.7| -|5 |blob |1.0.0 | 9.6| -|16 |datapasta |2.0.0 | 9.2| -|35 |forcats |0.2.0 | 9.2| -|81 |prcr |0.1.1 | 8.7| -|88 |rdpla |0.1.0 | 8.5| -|94 |riem |0.1.1 | 7.9| -|1 |abjutils |0.0.1 | 7.7| +|71 |odbc |1.0.1 | 15.1| +|49 |haven |1.0.0 | 14.3| +|86 |rbhl |0.3.0 | 14.3| +|69 |oai |0.2.2 | 14| +|46 |giphyr |0.1.0 | 13.9| +|114 |units |0.4-3 | 13.8| +|42 |ggguitar |0.1.1 | 13.5| +|74 |pangaear |0.3.0 | 13.2| +|60 |modelr |0.1.0 | 12.7| +|75 |pdfsearch |0.1.1 | 12.4| +|30 |feather |0.3.1 | 12.3| +|24 |easyformatr |0.1.2 | 11.2| +|83 |randNames |0.2.3 | 10.7| +|96 |ritis |0.5.4 | 10.7| +|1 |abjutils |0.0.1 | 10.1| +|26 |enigma |0.3.0 | 10| +|17 |datastepr |0.0.2 | 9.9| +|62 |monkeylearn |0.1.1 | 9.8| +|11 |cellranger |1.1.0 | 9.5| +|5 |blob |1.0.0 | 8.9| +|16 |datapasta |2.0.0 | 8.8| +|35 |forcats |0.2.0 | 8.8| +|81 |prcr |0.1.1 | 8.8| +|88 |rdpla |0.1.0 | 7.7| |67 |natserv |0.1.4 | 7.4| -|76 |photobiologyInOut |0.4.13 | 1.1| -|43 |ggimage |0.0.4 | 0.9| +|94 |riem |0.1.1 | 7.3| +|43 |ggimage |0.0.4 | 1| From 440a980e69bd9859713216e27524329c6d83f554 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 12:17:03 +0000 Subject: [PATCH 31/37] revdep update for clean state --- revdep/install/ggimage.out | 2 -- revdep/install/gridGraphics.out | 11 ----------- 2 files changed, 13 deletions(-) delete mode 100644 revdep/install/ggimage.out delete mode 100644 revdep/install/gridGraphics.out diff --git a/revdep/install/ggimage.out b/revdep/install/ggimage.out deleted file mode 100644 index 6a464886a..000000000 --- a/revdep/install/ggimage.out +++ /dev/null @@ -1,2 +0,0 @@ -ERROR: dependencies ‘EBImage’, ‘gridGraphics’ are not available for package ‘ggimage’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggimage’ diff --git a/revdep/install/gridGraphics.out b/revdep/install/gridGraphics.out deleted file mode 100644 index 2ddaee7e5..000000000 --- a/revdep/install/gridGraphics.out +++ /dev/null @@ -1,11 +0,0 @@ -* installing *source* package ‘gridGraphics’ ... -** package ‘gridGraphics’ successfully unpacked and MD5 sums checked -** R -** inst -** tests -** preparing package for lazy loading -Error in system("convert --version", intern = TRUE, ignore.stderr = TRUE) : - error in running command -Error : unable to load R code in package ‘gridGraphics’ -ERROR: lazy loading failed for package ‘gridGraphics’ -* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/gridGraphics’ From c02b47ddb5cc43d53ce1b45480209e2bcc6223f1 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 12:48:00 +0000 Subject: [PATCH 32/37] revdep update with r-1.3.0 results --- revdep/README-r-1.3.0.md | 28 ++-- revdep/README.md | 38 ++---- revdep/checks.rds | Bin 11541 -> 11218 bytes revdep/install/ggimage.out | 2 + revdep/install/gridGraphics.out | 11 ++ revdep/problems-r-1.3.0.md | 55 +++----- revdep/problems.md | 43 +----- revdep/timing.md | 228 ++++++++++++++++---------------- 8 files changed, 172 insertions(+), 233 deletions(-) create mode 100644 revdep/install/ggimage.out create mode 100644 revdep/install/gridGraphics.out diff --git a/revdep/README-r-1.3.0.md b/revdep/README-r-1.3.0.md index 38dcfe58f..6ac88d796 100644 --- a/revdep/README-r-1.3.0.md +++ b/revdep/README-r-1.3.0.md @@ -10,7 +10,7 @@ |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-03-29 | +|date |2017-03-31 | ## Packages @@ -21,8 +21,8 @@ |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | |nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | -|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|Rcpp | |0.12.10 |2017-03-31 |Github (RcppCore/Rcpp@886f5df) | +|rmarkdown | |1.4 |2017-03-24 |cran (@1.4) | |testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | @@ -34,7 +34,7 @@ |package |version | errors| warnings| notes| |:-----------------|:-------|------:|--------:|-----:| |abjutils |0.0.1 | 0| 0| 0| -|anomalyDetection |0.1.0 | 0| 0| 0| +|anomalyDetection |0.1.1 | 0| 0| 0| |biomartr |0.4.0 | 0| 0| 0| |blkbox |1.0 | 0| 0| 2| |blob |1.0.0 | 0| 0| 0| @@ -108,7 +108,7 @@ |openadds |0.2.0 | 0| 0| 0| |pangaear |0.3.0 | 0| 0| 0| |pdfsearch |0.1.1 | 0| 0| 0| -|photobiologyInOut |0.4.13 | 1| 0| 0| +|photobiologyInOut |0.4.13 | 0| 0| 0| |photobiology |0.9.14 | 0| 0| 0| |phylopath |0.2.3 | 0| 0| 0| |plotly |4.5.6 | 1| 0| 0| @@ -157,7 +157,7 @@ Maintainer: Fernando Correa 0 errors | 0 warnings | 0 notes -## anomalyDetection (0.1.0) +## anomalyDetection (0.1.1) Maintainer: Bradley Boehmke Bug reports: https://github.com/bradleyboehmke/anomalyDetection/issues @@ -270,7 +270,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [11s/11s] + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -619,7 +619,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [13s/22s] + Running ‘testthat.R’ [14s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -946,15 +946,7 @@ Bug reports: https://github.com/lebebr01/pdfsearch/issues Maintainer: Pedro J. Aphalo Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ -1 error | 0 warnings | 0 notes - -``` -checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘photobiology’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` +0 errors | 0 warnings | 0 notes ## photobiology (0.9.14) Maintainer: Pedro J. Aphalo @@ -976,7 +968,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [47s/46s] + Running ‘testthat.R’ [44s/44s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" diff --git a/revdep/README.md b/revdep/README.md index 35b4829a5..6ac88d796 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -16,7 +16,7 @@ |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| -|assertthat | |0.1 |2013-12-06 |cran (@0.1) | +|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | @@ -122,7 +122,7 @@ |rdefra |0.3.4 | 0| 0| 0| |rdpla |0.1.0 | 0| 0| 0| |readr |1.1.0 | 0| 0| 1| -|refimpact |0.1.0 | 1| 0| 0| +|refimpact |0.1.0 | 0| 0| 0| |reutils |0.2.3 | 0| 0| 0| |rgbif |0.9.7 | 0| 0| 0| |rgho |1.0.1 | 0| 0| 0| @@ -270,7 +270,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [10s/10s] + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -619,7 +619,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [13s/24s] + Running ‘testthat.R’ [14s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -647,7 +647,7 @@ Bug reports: https://github.com/pierucci/heemod/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [32s/36s] + Running ‘testthat.R’ [33s/36s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) @@ -893,7 +893,7 @@ Error: file.exists(src) is not TRUE Execution halted checking tests ... ERROR - Running ‘testthat.R’ [20s/20s] + Running ‘testthat.R’ [21s/21s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) @@ -968,7 +968,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [44s/45s] + Running ‘testthat.R’ [44s/44s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" @@ -1058,29 +1058,7 @@ checking installed package size ... NOTE Maintainer: Perry Stephenson Bug reports: https://github.com/perrystephenson/refimpact/issues -1 error | 0 warnings | 0 notes - -``` -checking tests ... ERROR - Running ‘testthat.R’ [1s/22s] -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - 7: parseJSON(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/fromJSON.R:115 - 8: parse_con(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/parseJSON.R:3 - 9: open(con, "rb") at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/push_parser.R:6 - 10: open.connection(con, "rb") - - testthat results ================================================================ - OK: 21 SKIPPED: 0 FAILED: 5 - 1. Error: get_institutions() returns a tibble (@test_institutions.R#6) - 2. Error: Function returns sensible data frames for sensible queries (@test_search_case_studies.R#6) - 3. Error: get_tag_types() returns a tibble (@test_tag_types.R#6) - 4. Error: get_tag_value() returns a tibble (@test_tag_values.R#6) - 5. Error: get_units_of_assessment() returns a tibble (@test_units_of_assessment.R#6) - - Error: testthat unit tests failed - Execution halted -``` +0 errors | 0 warnings | 0 notes ## reutils (0.2.3) Maintainer: Gerhard Schöfl diff --git a/revdep/checks.rds b/revdep/checks.rds index d96dbe40e84eec8f5c800e03b0ed033e004bfc31..18fda22cbc29f32e4b9acc6b0cb919bcc514767c 100644 GIT binary patch literal 11218 zcmV;@D=pL?iwFP!000001MPjyZyZUMpGKc8_Vjud11#X3ok29a)hbG?ELQPD6wOu_ zB~f23sx>5gdU^)4bW~Y5=nSwg0JwoQZN_G0iVc_jl= z3lG+9DrMn4Kk$Km=m}?!yF)M6=2zl^GYPff+arXt*rL7e(yccc$(Zd!rtE+%iet^0m_eO+K-!#hga;Jtv!Ah2kVv`N4R13O{$$`KDN zQFzA-Z|rY@_XTZPTS(rct96&PZkE+cv#xcurFL&Tub1R4XkExkie7@E2~@fo7QDN# zkjqTSuBgny`yjYh0PF4E(pXBj+wS#>WxDy4WmRT*9HfwPrv$czl(A<)N^hJBp0(QU ztxUY(LgC&2n9hv65#HUQd05 zKl)?b3|A63_*6g0KI9+WDi;LNcbo_XFBE$5tG+J0BP|grAD|HU7JmKlkAM8XQNfGJ zlP{)UeDq`)eerRB!E>lK6i`nj1C$ItjAg;qg3$Q*5fd(T4Ua&Z3P#ELP*)dyI@s4d zVQK?$FREvZ?mfs318x_E5PT@`bzs|JV*lrh>L-5qrMU2g$-iSQdnsuqCWI$s^2j49 zT<)65{T0^>u&Kt{@Ul+>tME>n9m{iA#|fEjvjg5SdC=MJL^7x&*rCDvj&3piKz0(Y zv~88pSy)hiHQO@_eUM6BRbWpr8QOu2T561$t4Y5&l)C}^V~MnVe-N5L=zAiN7H}1 zKzY{+0$;9mux;UE!y=t=+75L+huWiuEMR&7JaxE~AuHnNC&glu`0D2H_1RzH&%Zl& zd|fWK>{bm-6*y`pwq~Eu{e$*n1|o$#6rK#ox@8)@#lB7*jp|x>P{dTL1XEba!_I(1 zi;6&$L+HIEdlEWJFuo_y`StfCnkJxALmVZXG!rtn?|Xtv@;GF!%Z|7S;z%=-o4!fK zA$8RdMZ>Zo>gvEg7*dqX#qxLF7=!(0Q@W6mVeG>yFY zVs~@qWt=NR6UOF%8DtO!1Rz1^A;?b({Y*elCrNc{?KgME-Ts^(*J;KBE{w&n|Fa6M2DdDEbNPy^Je zTbc>!kDf#W>{nbru&4tvP~G>13_^o@Wkc(Y5-}L7vIE;2l*_=&m{mwq^N$SsvqSas z{mZ|NI#BTj%>)YB9>Hv6S0h^<%yr1R2%J7>^n&Xk^O#X8@MfU7^n+c`E7QtX+KXw| zFUKAHy?6cNT3sLW(o6u{-qF1vAP+!F44AOtUCFvL5)RWneFV}%Rx9H-OC*NyU=)!$ z?+iTKsFE3wH3^)&&NP22o#{sxqA`r0=XfcpYeI*xZ??~6JgXz5pxK&<(GQ=3jC$s| zk^wk52&R2?-FLo05f!Utd4e*P9_S*n&OlP93Yw5rgl2baCb;?cQ&Q*aAO*N+CQ{BI z&B`#7N;6%jLs^cQD=M#;h~|TZ6f{p`XngOWxqo`lC^njjn%QTb<$?wjx&c|=ckplj zh`a4WnA&)v3@mdcVEKx>zfuGp9ZjQEXu-Ub(bAcg##{$2%KF<-v@qA@Lng?5fy(px zKHQJ`GN6GL4s=bYMYPP9i56)w7C=KnTMMOQlmliaD^NsDcMLVN(=t)kP_{E(8Va2) z)KzWr9NGW|CUt}Bv-L(L$F|L=MI9Qja@br?^CwZWs#XUh)ZCpGY97@jpd=6859}deBK|JGl5(A#tv#yka6Ql4e@)>bEgE-sT|+*=QzYI@?sq znH`4DMbHS9pvgF)uY0zKBNnSN@_eA98Z%YwY7+YOS)ew3o#InMPozX+V(*vi0%(-IpsbdQvkX2NIwzCfoP zm+aD!?Fr?mf%jUV?t8s%HHyk+JwWatscKglFuy_vxt``1A+!)Xw@rD{Qxigpm1aWd z#ts_*{~Tt@UqJ&~p8blfA5n|Cyc#A4K}y8zu2B3WIJ>b8n_^k`1NVHATX0;fL0NcftZa;$|gJML~ZA-9c*V9en|y+oQtVQ^b4dSPMMt z!MDJD$t78D6UhRD4~MNn*?BSx?K(TB>iNrme)7*L_`AE-U3v2ivSXj=z|S`!wTm1~ za63=b3+=%RWu@jOJM$FWM*k<=lK49$pPumt>ipvKHPT(ULv}uY`ts%G!!@!%9&J2* zj#pjC?rP)_pfeQEipetB4mK)j^;Me#R?$7^qvg5yB{xxYu4V5Ux;%)#fC%SU=9uZB z>H~|~0ZSJB&QUDaPzephPZI_5hua+SZjh(cbv+js{dsiNcUYM)?v|M^p^kP;)_KUO z2?M*swkvFyS%FCbeK#kd&A*G`@g3{F5%GUa1vYm#r z>D)1MUw%(p-5N~Q@S1f%Gco_O2b6o{IdcPmyTkf=VB>Ywr1y&9>1BSMy&P5-pHFG_ zQo{tM*l1>t|Kt1K0Ms@EwUL20=nK5mTo#miG(kfh2dDykN2hD=z#>b=OEY`^XJ3bm zJPFDAC}eFbYQvicHGt2oD}iVOyK;*a|Uy9Y6YCE+sxB! zyzKJ>t_^t+DYs8VN+^^QL&g5gB)f=~#W6|q;IF47X=?1xOgL#KURn?7Ava=YmIDBd zf%kCLHyAZ6Mh}^L+6Bmjw1d${LWWotfE6s$@>=r#H z4?OpXj>x*M{%Q_A?w;)Ta(OtQ#lF9)6y0oYzw^_#e=i8K(ae5-L$mrLCQ-dreq-gb z;@YsvNp3MW&fJ)mA?RTZur%5|?(-e8BlrPz1B>iwzQ`nk7IVfJEyl_Bj-aRY5R`D!OcZ?-X}FI)blQ&8Tg}9qJ{578 ztuh_u`p{;_0eZYlf*`M?KKS+|5X3~6evz7z1#1sNZW}7x$B-Oy(`7-xVn3zGGwQ32 z?H5m9Jf2a0An5dzCrT(JT8^Rg%vTX|upCU?pesH;LbbhxT|ZC02{{YMr_tYeD4~0* znosd^j$kD((J-Zx*1b%^-+@nUsGCW*l#`85`e8_bsW@a{m0EU6w_VP7yQ<vW7h3Al)2_eqmF4Fd?Y9c2f!X~q{Ggl zAz2^BiJFrpR*%2!GUIhd*cp1J<%x=@ao6J9NpZWB-%~d&zxFzse#A&KVe}d^!%|(J z8zX#i2CXS{knEM9QMr?#>AekMl4^lQG15@b{AOf27$M*{^oSa-&<^=3O6k8+wprgU zf~HrxkEYj#?veDU^Js_JYQ-HR%$8&4gRwG`2+FU!mOG@y-t8CvkZO1Am^!}A@(%8a z7kio&IkAsDyuEpxcVkx?i$Wc7Fv_CM512h7p00-i^(gLwdUB7TqO!I|VRSa#)~x1Z z_sq_#AzQ=i)*Re;5>&m}2l#@U$D8iq>>N;j^wCG;1$98%LaPMm6nm0Up<8j*E)US< z`!NH^P@6o8%8(sZ26@?3dS+aD!{+cJvZSuKz^z+kGiE+Y#B``b=`21KsOQ-H6;&Dm zYOz^ibc_&Gj9P}b^WuxI=727`0?h$bI2Y6lMTMb-fNv9!CZS!#3A!f~MbpCxB|zI1 zXwsD@l##A?gzu-@=#Y=P*#kS2K-lWdO_C|Mb)W^pZO7-CVvl!gYw!#4>u6Bs$Zbg* z)OYALNDe?j1&tFEs6eG1e#?2{sub*5we@nIkTvuh-+K9U?*Y`ar|Lm95;ZUx`cXhZ zZRPGh%QN}skh`%*@oD^XaDJqmjeD^Za^$c>?r4kW;jmL<@9mfzY3As0hQ;zS zC&e@{k;%M$Srz2?TAX|GxN+y(_)~d{HIJB)AFxvsJEdDUV(fq%!-frP>Kd|Y5q%~r zP==y~6h+_spDCfJhM#N3OEZD=XOlkh8keVu8)AupaAY7lrU?UVg>$RQn?y-Iu;Zf( zQ$k4%_fo}1GXe7PbB>?K2tX2`nze2Vb>9@5v>ls?+qnl+a)%4D1CmO(9t?6im70w2>S33? zG6nT5Y*aIZDQ?v|ev&;2-Mo+C?RVe|h=h}7f~WO3q^_x3_?vtkl65n?ADytAP!=jD zSJl@cv@3Ujt*RMXlsgF@kbMb!KKn!IfW0+T&i^Z@GtrFtqnRJU8($YOP2cu{UM2QbZV~&vu}FjZ|C*BM ztOXjyNHalm>m@UUN1kb9!?!?fChI;XXjI+xEoOrrc(QN*fCqz6KVSi#veStOu~8i^ z^=j;3ZXx-qic*;h&i;#k_4cpC#+)=0JU@RzJ@OkXL{a0tvclftVm(7>N(PC(RpoAZ zHOefc7A#n|rnPKeW7|-~M>DZ9|BQWH9-jb_5? zqYVR8ogJTw1DG*VxUruEr}y|!51pQ;hhWs$GXgs9N-l6 zKEr8z7EW;87})nFF3XbFbxYiv>1J`rmbLU|QCm)vyV_E63Hmd>VBkqQ)5{2#w7VJM z!gmoa<_Yg)guNW$Vj1C5o^T~2?B)oU%Lp@G&{Uy7>@MU8bNyJ+s@;_EBPB1C*K~Jj zK^eS>04*!}Tmr|(uLV98Uwtb0iyfmI|E&5*@QX-4yOtB^RA8t~$Dhkwi_-kP7H)Hx zCoXzz+x!)K37?Sqj^>FI%HS(c96-&FHlFWnf*gruKBTD6dk>$z7kPZQ;=H-J$loY2 zJ`I!bmS09bU4a*i6Sco0@j6Oh2tAClx5GOPi7_ z3qy$H(1CMhwRU@|+Qo`$p{t>#xl{g1y+uX5loE4y$XyIt{X`*U@+)20!lV2S4QdM7o*3oq{OOpvJqm~o35JJggHij%##}sLi4ijT<@R%ObEqsd z@LLO536Q8!Jhy!dzGQ>V zs|f;$b?V-o#RcdwG8hF)oqnys5cdt*9@K5X*tJ5o?w{|tyS$tYyWMoy?Trn)yYOtX zyS=rQbyuhcPaN%JvJ8i3SR~RH3*%r}9D^%sT5MZhC}7U_T~#ixzTM%$Yb=K+LZF#4 zx3l2}9=srV#BJ_-hg@&JA=amYLlPW!QEc$A84khObC}}6vgX-WKs;!&H(YA_Tp(5S#56pSB&jagNofs8v z-jFww4H*=-xJ0z^Zsd3ea<)wbO3y~s&Eun9BpGY?B?p7?W}s+DR%|f3a~71zl8w%Z^S- za9&ba|xFNo&8IjX~cTe`CDx2{AZQ4sn;QgC|r%jXkY007v5XxSx(&WA2W)VHGBV zM$W-|E4C)WV?wvk63XH6L|qE^a!%9bBhrYQISnDtJZXiLd>*=>VXyBG4)CI0aF3X% zV{y~MbB}_mFn;gnN=!~b@*(<9b}NgCF8=vBDpqf;yn2$fp(HJgaF({I#Lk$DjH_5k zdc%O=ucOGo?HM7+rAQ^}9DD zpg;F5HdFL{_yq8TC-;WTvKa@Z8huSLsjnY#&9zGd!dWBVgK<=ThpXf2|9<!++V zv;S{z2zrRd`6p~Jpf-ozk1jMCWmJ!X3uS8`@|zF@twD8aFlW@^?htyh!Uz{-o(!S2 zcOb}q#79H%^ZG#p%HpP{YiC><_*GUZQPWa!MVi)F4%Q@%m&!(kU)$k-yd^8gxx9*F`d;7k}Ea!l!i!zIlDeQ=R2j+MY zAI*fz$6tG)Ynq{}BDt@R;=4XNMhrb+RE2B0hK+Ve?XuqQrM-XrFW&x$#4#gH>;7m3 z?B*8z{lAAMB0JP}&~3$`*kYPgxBU^dJWrDo>TfsO3tJiz5NHqB$Y!)E3i|uG5@is| zl$ej-fumq^%rp%~XSNiTMZX!xl3*tK+*f#7C)s5v%Az=Q-hoq)5>A>4q1n&j10uWR zJ{2H`$oc`?4*CuYMCb_fv=gehJd0v;o5BlyXjfBu_F+Z%r1z5SNdT?pob@+PrN<=1 zXFF1ztidM0n+f06E;JOC7{lf{V?GAH3@lIX+v=uX9DwcT-Gvt& zN17+?FiEl}VcW}vj_AkWe5>VN%tTNg4dl(;P3E5T7wD{W6A>Kdr}svW}BpY*Ww0sXv#n z^ffG@s#Ti_-17=Y@6rG_s#XN;igPD{oY(e#{tldz8Z**N?7W7Ns?0AhHd47GeQ0yj z3S@V&;Z~D%b{w7%zsc8>g!ZQkR@H2sH>E z1OlH86e?OBhU3D&8ph3PVF(+|WC3#zTeI7HPrlgNoQ2n)h3Pj2vqOh}{0rdsw0+;4 zC0Nxl))B?A^Yr7^9Jz7t#>{QdTnC;p+M|ZC=TiaI5hPn9P=O54^a~C0LWS;{%}8<# zwWQFYO!A^RDj5jRHKCp;+TEu_Tbw5rLk(5k%q8126k}>@sKnallFeR2;NKe$1#owb_|_h798pc8Wn25Paj_{2jg&S6h}o5_g}U0}UEDO^U0735 zjf6|>q>-~y>Tj-&=t9wTqn-bJ2<_J@wyP@9i(>;wUw~K}w%j;KKr4!+(h>-y8#3Pq zvr!6e=21I_Y&%MZlDdVz#sdIkkpW7A!kpK>`|h2xefLXa`|j1ZNdW02iEV;kLK_ma z?T=Pg3n5c{$0kF6Z{P_72H}_h5_A}eFt*ilF&>$eCzbE6EEi&s;fp}u;vw%IQG28< z&(6{MevrQ0oi`U1;78e(qy}wXE89obUG28Jce|wJdq+&D5YeaDKQ>oyy(fmrC?_KjiW zG*NF;S3=)O=_@vMrTLQ(%FpI*#z1+SH+7|~G!sLwe_GGViKq4WmKS&f?%}bS+y&jR z;>e6Y%@=&?ei0TAjJ>K3eazg}ADwDl`y4R!q6VglJpF*Jde~YxHMT022=hfI0d+Tj zCe-6krZmpgSf$Ie(@ZSg`3htROmh#ZOK`e-pYPjb{YWKhkf=eTHh{$bD-WBAYceeH zbuM#O*f?Hvs0(d8vOTnvRgHN`ej!6?-I;v)Y+C30)EV;W8xN?Epf>GrhVjVB zy6(&9vRiMqmMPq}7uXfD=xUT%M9q@6obyQC`NIh(dS3d)YuPQAmShM1y>YwcZ@a%E zvuT|`y+$Gy+sZ|^jYbXbwgW+RHhW@uYJ)&;13q1}=$xjk>$Ndlpg6f~6tKQckGVX# zAV!pdvg|ZvEiMDk6x2Cou{Hwg=93K8rMc zry?dPF8M~sCrpI*XPT*z-a>b=z0hqh^vJ^U+QI_-pV%p*BQi0Z5<@#@_w9}oU1R@Q z)L+dMte+TO>*2kST6jyzC48J64lFoR%L|9S8sy&4j?m zzv8aW+wtGr_5CcC9fJ zOj&6raOS?^HqHbe3C05oLg+}{Ys2Wip7lJUjY&IVpbsi^7tET3PCn4Wy=fT{Y7AV+ zMKe+J$yTJOkcS%C2^|;REgeIut7^#nlQPp&C}EmxgZSP6o`oK8{UMJIoq+Z=oeHD* zWz3sI&_Zt4%=UkH`?X)>qL~Of!@_S_e3#S?B?gvVDRiuo_#XKM-&@n#XjKa`R^x(u zBu2~EIQ8yCqopv|P*kYMSEI}_z+^J!m(x;kYM5gpKAH)cGf0^ePqY_?Z&%>vipraW zOyMw*74b5^&^0UuV4o|rd@o4dKFK@WdCC7Dxa{6aRG ziJCK>tXpOdNKe)krd73midjY6jPKrEeh1c1k&C9m=1j3ZZ+%CsPf&H8D#Som5i#S- zt-p8&_Io22O+!pny!~Cn)9n+C*C$3g5mm#}B~dmwxf3>C+#dma{`I>RT&pbwUEl*(F%k_Pa z^?eU|+jDi#MN(*PO{Yc7bj#-IMY@g%xKR<_{EEt(gw8^K|Is^ebf5uuoB3Y*(c@xOWO1S^zQt|hQ+)3EvXJ>{=8~+Nkce9$RboBdm`s>1lhCN*uu9@wQF)WN$;UA5|NYy) z)~ncPCT`Aa0VSZv{8fb!{A!driJR5@)+G7%pHv?4(M;gXZBf7t%=mT7L%l{_^ar8D za8t4k7{Gb6#=X)R)r5kh$XA!tmXmKn>Q=ewr}>lU$%Xq!e>;sW*vseP6H;Si3ASM~ z0sCk7y#d(Y{vHDe;cFYEjAHFeEfq4&e$s+CT&Uw`_Z=e=>8|v^&D!C9%2VhY$Lsv)JghJ*Xc0rOkKqZ zO}K_$6Vx@+hP$r#acIEO^3ZD{?GZ0@gV7PAft8Y6(*2Yg>-MQkAD|L2@GuB&>8`*?&xskOm&W#K>F{09$dE8`bx)on5 w^)`NDs?S63^G5eBQi;r3@qm6i?4>g{sR^Z*ghHX$$%G_tNl;xVNZK7 zV8AECE?m5Xmwy7k zF2le7cj3Y%yuJqieggk~1gY2I?_X?_Lnb8mT+-9vKho&7J9nDxUbDTjkSqJg$Ez!Q zD@%*S=5BD@G~FOq;L@);om|r8#^&>UJs&c6@2ef{tKEmq)qL?^2X?;Jx%iEGQ2FJH znVc&wb(oBbUyBm2Mf^m!SLImx%!%$U20Xg@z^1MlP?N=Ex@X(ek8dyfui{rSFg5pJ z-KJ9J-t)&JpdWg|+2iie%e48GsNh`85YRH=`xf=%`VL&~i}cN2joBf!qx(N{xGuZ_ zb9Kw1;vh=>$Q|oLo12y|JH7Z-xAoB|y1p*3u;CrW4e^1`WcHa?eLfi2F~3)ixNnKv zi(YtZe<$m`)YdxjTXeL}a&mX2t#!3_+#?-rso9;(>&AId17yWTFG10`aXT6oyxVSP zGGnqUDl^|5fUjP&(*?w5QdXLsPP5ycNNGc2Hf33rS)Rlxq}(Y$ZZ4&}G?~(!q=ILy zHoGhNr+3@AcmGfq)Fq8RG{-^=mnbQ0*f{maNkM4fIPqU3MO8x=mF>ofKYs)O2?nHr z7`yKY*20Va>gvjH*%&V5-Un)olSoWxQNw2ARt&@b;7*rzyQ|Zr$us}x{`SUmc%l+b z@OtVa{LvqxHn~%jZr~AbD=#%l%2n-Cp(`FQfxQ9t@w|6Y3iw_dI4f2aK!_!h}J1-#38= zThl$~iyY-$%lAiet%Yq19~%~FP13fg>p9dOKVUx7ec-9Zr3_deKR?MAo5oisgRjSb zgFpY_-0^ie-?Cd3FqPw|p4ggyO!p6(j~Iv)@<4dfC+n7JbbEcBIvUlr;2@8wMggX< zk_W8;hZYsSD2C7narQKHmSAv?q4TTnNir5ITMFQ>r(jxR`RsP~3$CQ-8xV1~H{XvUmL zqG=j={$h7??q!rK0~5w(pBZEj_yiz9=po2Y3jIt#PbYD8Yvdn(_wNVX6vKb`-QPsd z`fc*8iDz(^Y!lrxSo*Xr_z18ZR2aDI7`qRi=neKk+Nhe3&4CBs+uGVlFoWy9ddS-b z_5BKIs0`JG$rlWjPT*k91LJFF# zo*4c33CO6Yo+}xElY?N|SJ!>#I}}loT9zd!Qt5#%Bx?;Mb;_U#S$Sx7CT4;U|7=Dx z!74}rF6xPtGf1-{%p}rG*Xd9eW9Ev=%O~RUK|2A>lL#8$J815m9yE%LdZK3jsb{&M z0R^s4*7qI!+dtxN^AM&so+tv#LIGI5;qKRpprzx|Xc<~C?_{*JPc>VdFZ%xs{ zT$c}-Aom0+&+GeeKkiGP`dTp1HJ#?svREWqq{WyI4GC>6l#Wphn7On-9yOf_)ZB=$ z@h&UdDK9mJ&KBybHhBhZ00Wb{!Ts54qmpCWX4s+*^;t1&t|$4^s99B8gCT0xPNiv| z18N>tKuyd_Jwemh;f@FTFT8_2@XTiR zRfZ^Jqn?myZBr#@b{IYvK_gUxCZmMD?%5uWSgdT3=f^s#LE|GveQSE?nN(Qr{r!y4 z@U#jVGVIh76(7H3K4>iu*f$*JNb3eWg1@8OZfhO~m-JDgEJ#=Rp3Q1T+^^94qnh^l z%`I*-Nw)NR;anK+G)Eu6UHQn-DpER-G9+xF?mwckY>sn1$j!>PoU9`OLpnl_JlIjzA1Ub`a$?7Q^ z{Rk8jXo2xz(&?i*}wZ@<`{BV;>p5gNE55Zm=>xFJA((`m~V{QK=(TmrxBH;H7v!H2^}uIwV2hZde+Q1$%PU!VMQ z3jXe{bynU!gY0<3bl~T^fZBNurnp@s>V@{;h0;ylMqjl#U=_F26Bca8$Of^ujee(ETiKi=kucY{2kuIstD z{m;XzzQc;da;In^6Y6M2WUU9BnlQvWY`bJNGc7PJs_$k*wY77aHSn1DKPRG_yP&H< zj~mHeu;i~YR!k&QLgj#r>a?|$tpQ}oV9+$UP>c9H6v&;e0a`pc9()gxK=5%ukG|xt zwxlQtv3$oq;)clp_Jk~HccOIen3*rXtF3MgX1WBMc0fHb|I_=Fd*m5&eSo{e`nqr9 zb=mayis9)+7M|SmzvA`Lfa;2sAC^h zfY)^T=}c74q0=jT>nShw?D?O58!+-XAnW6RHLal8=?C09qVbYvw&-UCBim4VwhxWy zA6Z-;ly13ZrCt}{fZuZl1yIEsokIOb$RNgdTmNO#e<)^2! zf(wZc&!hu&d)o4;bs(D$K*{NLQ2CkdsD_PLPo$n@WllS3WsXrfM(JQDs$U}32wrJD@TIiZPEv9>t zp$sWm;!X04K$LDZKlt|D-z7*`sV9WaV0Bq!NT;kWP4BS9Tn>cA@VOdhPGhH+89_gZ z5c0iar-GYO$VWYa^B2z;%*CnYbFywTPqXo|&kwjZ$H7rICnS0u;$e6T+AxHv>cDp6x zRGgnj&*bLP%6qVzov>0*_{?w7V{+efkLZ}J>*}xO(Bsa@7BH8G1Dfyqt4h&L=l0w0 zfs-S$QO|yVOSAeTCQ-dr7G%Y;;@YsxT&|ZHXBxAT6b~wZrPhXWU+$0{!4IhGTV!1d z4)Y+YTjg48k#6Eso0(Mb){xt*d?DzAIC~m1+2!UhW`&swx=GAQO+mBmi7|QZ+2|4i ztvz-hgF(o3p^z&pXS+M3H;I^Rx ze+t0Up8F<54wi$d8+64dN2s

EihsFh1lu6LWJLz7NAd#?gF@ z+)_)>x8~+{Ep#5YZSP36l?sa@2^EYuR31QeL*Y5(R!oR-ZY#HMED ziUw4&xE=sEx~l8Ya*@%Mx=_YTi)feQxpQ+bEg053=jo1WpP?7HhDN^i0-}T9iZ%ua z_X!#|ks~&cmgldnMHzdeka}M>7Buo?hy}S!_Y)S$$Y$_H@U92wXb*3V_HYRmVagCl znP%bh1}uC7zzJ0)UvBI^CWn#rmNxgxfcrkSgJL=~lk44WE_FyFT(s4;9b^&3|gacp?UFxv2Xh7D7QKIG~iRI&OvuN=;C2S2n)AB?~{J3jT?zFgF%8a>p z-v>=UWTc)jdV`r^p{~!3F}^s1))YEO_EONO+-cBs-vzgbN}y4U)D$$o9-9uv3ivfW zqQ)y+hkO;L^k1p9*^!+GO}EgarrU(>k@TqbaEIAy#~owM7Gvkf6J@3ml-+l|Q|OTu z*|}f*r$oDB$J80wENki>Td^lup%MGU!<(DOSu=K}u_)9L2jeZ;{D9eG;^}%IP>i8t zq)BKOaf0p%MRDojgc6|b3S82aCzO${cZBb!+h~xFy4ig@kU-ezE=-dtvvr^a!fj{7 zQ^g+d*4E$`;@8oj%#quWHmL8=Ymn@Nf(jZZCQyM&JN%Z5#8oNSv&so`k&rdC8{c~Q zWbZ!Iv#07oH4-&28H~cvg4*1DXlm%F%((BscXoxP4v06KoN@C35s4`m=TI9*tw>>)DuX5I&BlLae0~uB9<5kNBW{= znlQkY7`LjtX_RC`JU;y2?|zUg#YQ~=^2sxfpT`(L;-i|iZVPqM=k&y|A#uRYnt_&zkT=pCsJPO34)tjR8k7_+sB}59(dA%nXcrnB@Rv)Xo}WHA|hx|P?mi@ z9G95dB>B_WS;}mn5C89JtSw^V;B1Qba%IJPS!a zt_OphPNgQJyK2~FuS`Kl7B;FGz!bM^A3x5XhHloz@OA{ycX=N_=A@qBX*>$3Yw8yM zCf^2R-AwPtCu}Da1wph7ckXXLdAa-K z#dF-&RHQuIQiBrT2(EVXw#nwP4^s~yR5dx&4XCZ1|5s3Dq8au_JwJlCzAs{$Bir-4 zrPx=wdF*#5Vh$R!as;Ua8pTLGLG#&5W(bcw)yT%k0=1c}k1#=_>aK4w8}z`FZTkn@ z9|ZaV^YOf$R!E4A>Ts!-V+V6{$yZgp%0zJXU;KT9k#`$B$VolH^Rvg)Bfqu+6gA!} zE9mxm)fPe%GDsX*W#*Pw!^~W2ZUyW1tgN{!xDADT)DtUp?=?$C8c#271)AiPLYE(W(RqH}t3WeFZIthG8wRL4J0mI%V8%${#**sh4G)cYwDaOYNgSjrDlebdnK;w* z?yTI=Dy)zyHfoBNw;C$KLf5qttf;&qth5uXEEd`fMZ4Ws(gOugZ}FiXIy*}b!Kkrk z_;k|7V;fRcNWUYPNMc+%jKuX|cSB7zrIt7Gh${&%q$;f_qngVsKJaW`6}eCysjgw= zjrq8JfRlMHxYVEyxGhyaIw)f z;c@Evh#PP@Vt$gWuES(GVmOUY!wIe%1N)1q%cA6U-4b8Sb<#Lw%UW{N)0UIuj}CjiMTARP!j+V;lObF#B20O~W!RK(B|}*F zsw-K-rIhe)hVV{GxRemyNeL%jbtyxbd15aiTrGLkEMXy!=_|n#lhWOZS1shR)6NiP z`mv-{I|<L__3v@lBF4(~K9QekO?^vhwRt-jG)FW*(fcZ=S7qQwG#*jz2D z;ZE-@hLnvJrJdw^L_57l&%eS5p3%}Xeq~$qfGO=E-3G)$%72B!+mjuo1Z;;3lzh#757!s-W!)kka$rQ~p3?I*aE!oqHvvcV%tzSu0 z?|=DEMTBcoq!KO?t>YJ~=VYXdqoHG{QA!JxIh`EYZ4V|TOlX#2tamaW3@w&)O# zD%M`{(JiP1NYp5vao>V3*;z~AG}$Zlxi zVyWTzGFs)lRiFe^8Ovj`TZOSVmb%T=9%<}1(=q6^@i!(5pAds1;SjxS9XzWNYV2yI z0XSl_$Ngm7nlN`nhgFye8W{uct!On79uv5^mQV(dC+bq@%Q;Jvk5D77=QM;o^`sS0 z@@3$HhP}Q&IKYc)!960Pmc>mA&pqpP!>*_0Gzx z$8j4<(!dC3Nt;USjD>J<6$?pk=o9>P6fSUkMgVdtR0+78Q&EZpi~OuT$6-R})K=TT zk32x3i;J?55J*-mvzD8nW;fKcA*+cZv#F+F@)XjmjO^{k5{lvVZ_nhb(pjl+h(qKg z9_{<}k^`$I53=fLchAF@r9y!I%(qxi(f9FVz!RR~8!*de9F%IbHNm95e#AA`E({1~ zjYl4gqw+PTj(<6;!<#F3GbOClv;S{z2zrQ%^N-nJKy41aA6{rQ%qSlP+eLdH^1A>8 ztwD8aFlXH2?htyhWDzdRJQ+fFXJyw|L3IlGs40HlJZL~s-1KDcj7tN*$}%PDdXhg4 zpKQ3Rd#5_(=p5ivK>{VL)DuA;?^xU&Q}UG<2V`9a{D5{k-8<#DDKc~n1Rr><{SoL- zR*AF;GpFH_^&5ZGk5F+c-`{_ACVi^gUO`vhswabX+shbvXQl!#Y|47V_0PZMR=~-x zI3w%Fob|_etKkwy9;Y`8aH>kT4qRS#{?!$gm&Y#5otCp_iOfo>Rj?#ceAE*npWPFo z_4YlFS2iT;`czaeVdWE=N z6YSIzQfF~WS}p+97IpcMN#A=ZJY1h_IdMYS+1hD=JfJ!g2a(R~EP)E4S5jW;iKaL3 zF1c0iU7~i=%jS4tW*#z=bG(IF9Uf3YIS1TuM`zUznR36 zU?$q!msncI*+nQyqc~{q!6`^FC-sET{Fm?nkzI0+3Xnr&{QzzUeTVrXaD;i<2~|{{ zg|WF!;RPdTS5tcSVM+L;58~`;0Ig<>^&gxn>SRoOwjIbOHp0M{zU9e%TisNP1F-$9(|+D^qsDK#Y zqMm3u7}hb}{Uv%}0CO z-Q$iq8ODx|&`n7N+rSXx`LK19bY(&6;=Lhc>Q^peq%5@H2BBA0De!~ADQz6t2)Ly!Z>!Ge%x3fH@~E1!3k~vIh3=Y9NiqyIq|l*E{Gu5u=?l*_p`I|>-RDH> zEfR~NhN^BBVmA%Nm~su3SldGE+_t;@)n-{#uGhKjLWPJvh5y)O;S;>ZDv7moJcGW%;#V}n)>Df*!|Fj%P#mcrKy@u# zLx7LCY`ZAVp4O$ZE*0HbdE``?utl8w0G^8AIWe9cNIjFX(le^!>}mL9T`WGEm9bw1 z_{5yl6F$v*0*5!3JY)A54amC925cbOo!cX07#dAfbLxueTM2!MQ&*Bd4WaC8t}&|< zG%7fCC9KpFLvMas&&r9X^^7df_Xga7u6x?#zY8GoED_{4n?innY6)=_O=?838!&dv$*ecl~%odpj)ZOfvP!IbNZoY3oRoJD=vQtki-T4M&2uyPi zsY`IWdyntiWc^4bYLKWwqBelU{woigiEA<_uyrmnR@gZ1In;$V9@`$Sl$DKnaegjC zY2B%O>d#7Tsxs!qtke@rH}6v+L2cUM4C9fLb$ukm%TBe~TB>l{o^O}PqN`zM9yLqa za>gQc_r&ngKYycj%cUjRT3UYl>z2Ri{FclobprJo30Z6^6Wt~*YH+vd3#zmE6U$Q@ z1bP$j>EepcY0A1@6T=0Hlgowy>znkL%aaRYL>VZ{PE*$6()Ub3ol_QTBA`w#8wJ^J zsx{D)i{i)7lnf0@no&@)`Ey(vU4^bsBTe5aiAjoEzTxo+Q{nxYW@@C{?(~}NPP5%5 z?d7$08~%^iDZ?W&F`N>^b;X?t)p<(8&f`_{E6W|qQGAzV9ZC!=yHw~{1@S$4uRT5ZU4x8OyWk%2qU9T$dUxWYr7+k~l&Hv8!^|SU zyaO_(!g5T=M?E2P1}SsmiT1)6*(JESqVlF;lT~hhJ}aw$3a-G4je4Tyjl4*T1dY#) zF}^ysEj7x*XsWz?VrK#{%MmQT4=>J6w?gpzFkDCHoTB4bfh#s*J>lAY2`xM(J3bp( zAf9m5d4wsNOj2&^FwHHOb-g10Jgg$E0UCJ79pKY1TM~%#^GMFc*)LSFqHVs*AHC5w zUq`mO-M7EXcV~^LVAoG~UOaF3$NnN2a1+3=N97(a@-GnTla}v{THEl;-;@X4K?{@- z75!t?xN9tThm^H@t$k=eoBIr~i)PeVpSHc$=`4q54yuRj>7M(x9+JE@Jf#=9S>V9c zfJZEnc`=xOqe=s5?Zv^r*H$8L3#?a5&-KVW;(Q$!x}74wh2@F8Ig|N&DBifQw#sB< z0p7w7go_8RghC`fNibUs{RVPA4G-hPUt@ZS2WKO_@?sAULkZ6Vjx)Xs)J|n`RG~7k z+tVrZv>HQL`kdax8~fDUQ)k4V@VZHvq>iPjI@Ce&uc;$EOg^b(d7={Bca(eH5RfRD zlz6zz3Dp&pPU?MUH#Ms)6UO4LZevX7Fa6mgCe*&>j&A+_zYcA(ZiWe()GcplSDS#D zArUkx^mkcEsB2N~^mvk8V!r>6?|w+mh>^M>=bWct=70~&G-}M7#?9SKB(eLm+SaO~ z(;^%7M9mpb+b&unOitStrd4KBfmwOnOnUS$zYqHoz(w6)bEf#epS>pjFKBX38DbzS zkC;gljGw&+F(8nOx*;Yk-hAEgbo+!2trMdkiL&A8k|-LSvXkVQ8E#dGekAHTG@YA5 z!+l<&3SUuq)0kP#Y(>n>)}o3+gKX3jH9vj&lx*057Qx8+{(gQXId9r`T{w{&elFuu zHZbJrP8^I$gEK7)lND{{)XT!cF;r~7&Uvf~SDCfPtyoXcotvm~JzBc`g?afzG$~A7 zJ?_i*VD5!%{D7Lb5YQn-jVE+&l$3;P9Q0k9q><)2ALIyOt*~7Vi4K z$ND1=dfRh#&qY#bZcV3o%yf$8>Up}B@VQZPhxxsN`Y(F$dSQ8MJ?2e_OP zE=B815nK#*$Vv=euZBfVM$7)J&gZR!7Ubgxw44$xMN_v#xP%^J#T%|sZXPhWan?=% z^UG7792LI)UNSJgr8wIo&UALfCEMBDI+s}674~(b_Np5&&pbIs~MEeg1S z8NY6MsMn~A{veR(oFbcm0h~8$+$)?>O({5ve052=p?w!nx6E}X$)83~c1~sVBapnq z(L54X>ItAXIEeCOzeT(%8>m#?G-OsXtBc)PDaI8BD#gYRa5=-drIT<8ugWEj%Fn~5 zGhs6O`FjvGJz=Gu&^gnNZP9*4xMQo_$V&EXuc*v?B5vEJ`~0_O6~Uu|z)@_}6E&Yc z2wWYeQje%`JXapkFUg4yVn3H-U z=k`;;%45)inGJI)-@?EQV+_j>Csd3V}J&l`|!P@^PSA9#bl2n>zO(_qsQ1K~)JXh(R2TQN2lDl8F&eEhQq&crJo#%)Rm`=MKW zc>fdXdJeV6511c@;E2n?@a9nA$BbMZ*arjeIF=s++Z)7h4A=U>E{6U{ay{Eft|fKi z{?m0jOgd9nv4dl-q1Oa;&7|S3D}Eg6v!p!qnn-%Y3tWGE#Hep2B$xD2LXCBgs7xN9 z5-=J~QWz5Ahdv6*^52`s0T?%vSorwmurgWlZK_IG4B$Oy=7ler58~S4@-I zNt>D`a~V~K2Sx8-n(!2#595RnOw$awpYmmz>ZI8877qgGW^R@3V$^;nA6es+l*7vm zlHPc<^Ws6$mli!_392o_@H0rgYBA<`F;+jcxM^X~96yDjH6D2wwI=xvxI1JC4zF`* zgfVU6?ER6$q!mB=0H$gQX1^5F-sk!jz=Fpg5=ab}51I76_3Y)aPqile86UOpPZN&HC%fBU6@dCidpnd69-Yn)X7OgQKLmC z#6<664WY@ z#i1aR_hFc0DQ-*#jqc z%HA`2)!3RZzKzVL;@ij^Cb`W@z-aF}zEK;J(KDiLrig`f=O8K@t_f#y!_~ehH(bDp z5S7f#qb5_+t>{{*x6u<5ttCGsUQRm&N6-|iHuX__$Eblk<{He^Q}KN*qYM0hV4o)y HLrVbwdexP| diff --git a/revdep/install/ggimage.out b/revdep/install/ggimage.out new file mode 100644 index 000000000..6a464886a --- /dev/null +++ b/revdep/install/ggimage.out @@ -0,0 +1,2 @@ +ERROR: dependencies ‘EBImage’, ‘gridGraphics’ are not available for package ‘ggimage’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/ggimage’ diff --git a/revdep/install/gridGraphics.out b/revdep/install/gridGraphics.out new file mode 100644 index 000000000..2ddaee7e5 --- /dev/null +++ b/revdep/install/gridGraphics.out @@ -0,0 +1,11 @@ +* installing *source* package ‘gridGraphics’ ... +** package ‘gridGraphics’ successfully unpacked and MD5 sums checked +** R +** inst +** tests +** preparing package for lazy loading +Error in system("convert --version", intern = TRUE, ignore.stderr = TRUE) : + error in running command +Error : unable to load R code in package ‘gridGraphics’ +ERROR: lazy loading failed for package ‘gridGraphics’ +* removing ‘/home/muelleki/R/x86_64-pc-linux-gnu-library/3.3/gridGraphics’ diff --git a/revdep/problems-r-1.3.0.md b/revdep/problems-r-1.3.0.md index c7b531863..bd3b7678c 100644 --- a/revdep/problems-r-1.3.0.md +++ b/revdep/problems-r-1.3.0.md @@ -10,7 +10,7 @@ |language |(EN) | |collate |en_US.UTF-8 | |tz |Zulu | -|date |2017-03-29 | +|date |2017-03-31 | ## Packages @@ -21,29 +21,28 @@ |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | |nycflights13 | |0.2.2 |2017-01-27 |cran (@0.2.2) | -|Rcpp | |0.12.10 |2017-03-29 |Github (RcppCore/Rcpp@876d635) | -|rmarkdown | |1.3 |2016-12-21 |cran (@1.3) | +|Rcpp | |0.12.10 |2017-03-31 |Github (RcppCore/Rcpp@886f5df) | +|rmarkdown | |1.4 |2017-03-24 |cran (@1.4) | |testthat | |1.0.2.9000 |2017-02-27 |Github (hadley/testthat@b72a228) | |tibble | |1.2 |2016-08-26 |cran (@1.2) | |withr | |1.0.2 |2016-06-20 |CRAN (R 3.3.1) | # Check results -11 packages with problems - -|package |version | errors| warnings| notes| -|:-----------------|:-------|------:|--------:|-----:| -|dat |0.1.0 | 1| 0| 0| -|flextable |0.1.0 | 0| 1| 0| -|FSelectorRcpp |0.1.2 | 1| 0| 2| -|ggimage |0.0.4 | 1| 0| 0| -|haven |1.0.0 | 2| 0| 1| -|hddtools |0.6 | 1| 0| 0| -|heemod |0.8.0 | 1| 1| 1| -|highcharter |0.5.0 | 0| 1| 1| -|officer |0.1.1 | 2| 1| 0| -|photobiologyInOut |0.4.13 | 1| 0| 0| -|plotly |4.5.6 | 1| 0| 0| +10 packages with problems + +|package |version | errors| warnings| notes| +|:-------------|:-------|------:|--------:|-----:| +|dat |0.1.0 | 1| 0| 0| +|flextable |0.1.0 | 0| 1| 0| +|FSelectorRcpp |0.1.2 | 1| 0| 2| +|ggimage |0.0.4 | 1| 0| 0| +|haven |1.0.0 | 2| 0| 1| +|hddtools |0.6 | 1| 0| 0| +|heemod |0.8.0 | 1| 1| 1| +|highcharter |0.5.0 | 0| 1| 1| +|officer |0.1.1 | 2| 1| 0| +|plotly |4.5.6 | 1| 0| 0| ## dat (0.1.0) Maintainer: Sebastian Warnholz @@ -53,7 +52,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [11s/11s] + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -221,7 +220,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [13s/22s] + Running ‘testthat.R’ [14s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -380,20 +379,6 @@ Execution halted ``` -## photobiologyInOut (0.4.13) -Maintainer: Pedro J. Aphalo -Bug reports: https://bitbucket.org/aphalo/photobiologyinout/issues/ - -1 error | 0 warnings | 0 notes - -``` -checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘photobiology’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -``` - ## plotly (4.5.6) Maintainer: Carson Sievert Bug reports: https://github.com/ropensci/plotly/issues @@ -402,7 +387,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [47s/46s] + Running ‘testthat.R’ [44s/44s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" diff --git a/revdep/problems.md b/revdep/problems.md index bebe6753e..bd3b7678c 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -16,7 +16,7 @@ |package |* |version |date |source | |:--------------|:--|:----------|:----------|:--------------------------------| -|assertthat | |0.1 |2013-12-06 |cran (@0.1) | +|dplyr | |0.5.0 |2016-06-24 |CRAN (R 3.3.2) | |knitr | |1.15.1 |2016-11-22 |cran (@1.15.1) | |lazyeval | |0.2.0 |2016-06-12 |cran (@0.2.0) | |microbenchmark | |1.4-2.1 |2015-11-25 |cran (@1.4-2.1) | @@ -29,7 +29,7 @@ # Check results -11 packages with problems +10 packages with problems |package |version | errors| warnings| notes| |:-------------|:-------|------:|--------:|-----:| @@ -43,7 +43,6 @@ |highcharter |0.5.0 | 0| 1| 1| |officer |0.1.1 | 2| 1| 0| |plotly |4.5.6 | 1| 0| 0| -|refimpact |0.1.0 | 1| 0| 0| ## dat (0.1.0) Maintainer: Sebastian Warnholz @@ -53,7 +52,7 @@ Bug reports: https://github.com/wahani/dat/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [10s/10s] + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: ^ @@ -221,7 +220,7 @@ Bug reports: https://github.com/ropensci/hddtools/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [13s/24s] + Running ‘testthat.R’ [14s/22s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 3: stop(gettextf("unable to find an inherited method for function %s for signature %s", @@ -249,7 +248,7 @@ Bug reports: https://github.com/pierucci/heemod/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [32s/36s] + Running ‘testthat.R’ [33s/36s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 5: as.data.frame(flexsurv::summary.flexsurvreg(x, t = times_surv, type = "cumhaz")) @@ -349,7 +348,7 @@ Error: file.exists(src) is not TRUE Execution halted checking tests ... ERROR - Running ‘testthat.R’ [20s/20s] + Running ‘testthat.R’ [21s/21s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: 9: ph_with_img(., type = "body", src = img.file, height = 1.06, width = 1.39) @@ -388,7 +387,7 @@ Bug reports: https://github.com/ropensci/plotly/issues ``` checking tests ... ERROR - Running ‘testthat.R’ [44s/45s] + Running ‘testthat.R’ [44s/44s] Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: [1] "Running test: plotly-group-within-trace" @@ -408,31 +407,3 @@ Last 13 lines of output: Execution halted ``` -## refimpact (0.1.0) -Maintainer: Perry Stephenson -Bug reports: https://github.com/perrystephenson/refimpact/issues - -1 error | 0 warnings | 0 notes - -``` -checking tests ... ERROR - Running ‘testthat.R’ [1s/22s] -Running the tests in ‘tests/testthat.R’ failed. -Last 13 lines of output: - 7: parseJSON(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/fromJSON.R:115 - 8: parse_con(txt, bigint_as_char) at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/parseJSON.R:3 - 9: open(con, "rb") at /tmp/RtmptEsk2b/devtools8d9d52fae03/jsonlite/R/push_parser.R:6 - 10: open.connection(con, "rb") - - testthat results ================================================================ - OK: 21 SKIPPED: 0 FAILED: 5 - 1. Error: get_institutions() returns a tibble (@test_institutions.R#6) - 2. Error: Function returns sensible data frames for sensible queries (@test_search_case_studies.R#6) - 3. Error: get_tag_types() returns a tibble (@test_tag_types.R#6) - 4. Error: get_tag_value() returns a tibble (@test_tag_values.R#6) - 5. Error: get_units_of_assessment() returns a tibble (@test_units_of_assessment.R#6) - - Error: testthat unit tests failed - Execution halted -``` - diff --git a/revdep/timing.md b/revdep/timing.md index d318fd8fa..3eea104d7 100644 --- a/revdep/timing.md +++ b/revdep/timing.md @@ -2,123 +2,123 @@ | |package |version | check_time| |:---|:-----------------|:-------|----------:| -|61 |modeval |0.1.2 | 480.9| -|103 |sjPlot |2.3.1 | 209.2| -|19 |DiagrammeR |0.9.0 | 194.6| -|41 |ggfortify |0.4.1 | 183.9| -|44 |ggplot2 |2.2.1 | 162.8| -|111 |tidyquant |0.4.0 | 162| -|51 |heemod |0.8.0 | 155.3| -|66 |myTAI |0.5.0 | 148.4| -|50 |hddtools |0.6 | 135.4| -|40 |ggenealogy |0.3.0 | 110.6| -|116 |valr |0.1.2 | 106.7| +|61 |modeval |0.1.2 | 392.4| +|38 |getlandsat |0.1.0 | 286.5| +|103 |sjPlot |2.3.1 | 201.4| +|19 |DiagrammeR |0.9.0 | 191.5| +|41 |ggfortify |0.4.1 | 171.6| +|44 |ggplot2 |2.2.1 | 159.1| +|111 |tidyquant |0.4.0 | 155.5| +|51 |heemod |0.8.0 | 151.5| +|66 |myTAI |0.5.0 | 150.8| +|50 |hddtools |0.6 | 134.6| +|40 |ggenealogy |0.3.0 | 107.3| +|116 |valr |0.1.2 | 98.6| |3 |biomartr |0.4.0 | 96.8| -|101 |sf |0.4-1 | 88.8| -|79 |plotly |4.5.6 | 83.7| -|29 |fbar |0.1.23 | 75.2| -|110 |taxize |0.8.4 | 73.8| -|85 |rbgm |0.0.4 | 73.1| -|87 |rdefra |0.3.4 | 73.1| -|104 |sjstats |0.9.0 | 71.8| -|72 |officer |0.1.1 | 70.4| -|23 |dplyr |0.5.0 | 64.6| -|38 |getlandsat |0.1.0 | 64| -|45 |ggpmisc |0.2.14 | 63.5| -|106 |spbabel |0.4.5 | 63.3| -|52 |highcharter |0.5.0 | 60.6| -|15 |cpr |0.2.3 | 56.2| -|82 |radiant.data |0.6.0 | 55.9| +|101 |sf |0.4-1 | 82.7| +|79 |plotly |4.5.6 | 79.7| +|29 |fbar |0.1.23 | 76.3| +|85 |rbgm |0.0.4 | 74.7| +|104 |sjstats |0.9.0 | 74.4| +|110 |taxize |0.8.4 | 69.8| +|87 |rdefra |0.3.4 | 69.6| +|72 |officer |0.1.1 | 68.9| +|23 |dplyr |0.5.0 | 62.5| +|45 |ggpmisc |0.2.14 | 61.1| +|52 |highcharter |0.5.0 | 61.1| +|106 |spbabel |0.4.5 | 61| +|82 |radiant.data |0.6.0 | 52.3| |9 |ccafs |0.1.0 | 50| -|2 |anomalyDetection |0.1.1 | 49.2| -|76 |photobiologyInOut |0.4.13 | 48.7| -|108 |spocc |0.6.0 | 46.6| -|56 |jpmesh |0.3.0 | 46.5| -|102 |sjmisc |2.3.1 | 46.1| -|39 |ggalt |0.4.0 | 45.9| -|77 |photobiology |0.9.14 | 44.5| -|8 |bsam |1.1.1 | 44.2| -|33 |flextable |0.1.0 | 42.7| -|22 |dotwhisker |0.2.3 | 42.5| -|64 |mrgsolve |0.8.6 | 41.9| -|25 |ecoseries |0.1.1 | 40.7| -|92 |rgbif |0.9.7 | 39.9| -|27 |eurostat |3.1.1 | 39.8| -|91 |reutils |0.2.3 | 39.8| -|98 |rnoaa |0.6.6 | 38.9| -|57 |knitr |1.15.1 | 38.3| -|14 |countyweather |0.1.0 | 37.5| -|55 |isdparser |0.2.0 | 36.3| -|18 |dat |0.1.0 | 34.5| -|109 |srvyr |0.2.0 | 34.3| -|65 |msgtools |0.2.7 | 34.2| -|107 |spdplyr |0.1.2 | 34.2| -|78 |phylopath |0.2.3 | 32.8| -|84 |rbcb |0.1.0 | 31.3| -|31 |fileplyr |0.2.0 | 30.6| -|59 |manifestoR |1.2.3 | 30.6| -|100 |rtide |0.0.3 | 29.9| -|113 |tidyverse |1.1.1 | 29.8| -|105 |solrium |0.4.0 | 28.8| -|4 |blkbox |1.0 | 28.7| -|80 |poio |0.0-3 | 28.7| -|95 |rif |0.1.0 | 28.7| -|90 |refimpact |0.1.0 | 27.6| -|53 |hypoparsr |0.1.0 | 27.1| -|12 |checkmate |1.8.2 | 26.4| -|48 |GSODR |1.0.1 | 25.9| -|54 |inferr |0.1.0 | 25.7| -|97 |rmarkdown |1.4 | 25.7| -|34 |foghorn |0.4.2 | 25.6| -|115 |unpivotr |0.1.0 | 25.3| -|37 |geojson |0.1.2 | 24.5| -|6 |blockTools |0.6-3 | 24| -|13 |corrr |0.2.1 | 24| -|36 |FSelectorRcpp |0.1.2 | 23.1| -|28 |evaluator |0.1.0 | 22.6| +|15 |cpr |0.2.3 | 47.2| +|77 |photobiology |0.9.14 | 46.3| +|76 |photobiologyInOut |0.4.13 | 45.7| +|56 |jpmesh |0.3.0 | 45| +|108 |spocc |0.6.0 | 44.3| +|102 |sjmisc |2.3.1 | 44.1| +|39 |ggalt |0.4.0 | 44| +|8 |bsam |1.1.1 | 43.9| +|25 |ecoseries |0.1.1 | 42.8| +|64 |mrgsolve |0.8.6 | 42.4| +|22 |dotwhisker |0.2.3 | 41.2| +|92 |rgbif |0.9.7 | 40.1| +|27 |eurostat |3.1.1 | 39.3| +|33 |flextable |0.1.0 | 39| +|98 |rnoaa |0.6.6 | 36| +|55 |isdparser |0.2.0 | 35.1| +|107 |spdplyr |0.1.2 | 34.6| +|109 |srvyr |0.2.0 | 33.9| +|95 |rif |0.1.0 | 32.3| +|65 |msgtools |0.2.7 | 32| +|57 |knitr |1.15.1 | 31.9| +|100 |rtide |0.0.3 | 31.9| +|78 |phylopath |0.2.3 | 31.7| +|2 |anomalyDetection |0.1.1 | 31.6| +|18 |dat |0.1.0 | 31.2| +|84 |rbcb |0.1.0 | 30.7| +|31 |fileplyr |0.2.0 | 30.4| +|59 |manifestoR |1.2.3 | 29.8| +|113 |tidyverse |1.1.1 | 29| +|14 |countyweather |0.1.0 | 28.8| +|105 |solrium |0.4.0 | 28.5| +|80 |poio |0.0-3 | 28.3| +|54 |inferr |0.1.0 | 26.2| +|34 |foghorn |0.4.2 | 25.8| +|12 |checkmate |1.8.2 | 25.6| +|97 |rmarkdown |1.4 | 25.4| +|53 |hypoparsr |0.1.0 | 24.9| +|13 |corrr |0.2.1 | 24.5| +|48 |GSODR |1.0.1 | 24.2| +|91 |reutils |0.2.3 | 23.6| +|115 |unpivotr |0.1.0 | 23.6| +|37 |geojson |0.1.2 | 23.5| +|89 |readr |1.1.0 | 21.8| |93 |rgho |1.0.1 | 21.3| -|89 |readr |1.1.0 | 21| -|118 |worrms |0.1.0 | 21| -|47 |gitlabr |0.7 | 20.7| -|68 |nycflights13 |0.2.2 | 19.8| -|70 |observer |0.1.2 | 19.1| -|73 |openadds |0.2.0 | 18.7| -|20 |doctr |0.2.0 | 18.5| -|112 |tidyr |0.6.1 | 18.1| -|10 |cdata |0.1.0 | 16.7| -|117 |wand |0.2.0 | 16.6| -|58 |KraljicMatrix |0.1.1 | 16.1| -|32 |filesstrings |0.3.2 | 15.7| -|63 |mregions |0.1.4 | 15.3| -|7 |bold |0.4.0 | 15.2| -|21 |docxtractr |0.2.0 | 15.2| -|99 |rorcid |0.3.0 | 15.2| -|71 |odbc |1.0.1 | 15.1| -|49 |haven |1.0.0 | 14.3| -|86 |rbhl |0.3.0 | 14.3| -|69 |oai |0.2.2 | 14| -|46 |giphyr |0.1.0 | 13.9| -|114 |units |0.4-3 | 13.8| -|42 |ggguitar |0.1.1 | 13.5| -|74 |pangaear |0.3.0 | 13.2| -|60 |modelr |0.1.0 | 12.7| -|75 |pdfsearch |0.1.1 | 12.4| -|30 |feather |0.3.1 | 12.3| -|24 |easyformatr |0.1.2 | 11.2| -|83 |randNames |0.2.3 | 10.7| -|96 |ritis |0.5.4 | 10.7| -|1 |abjutils |0.0.1 | 10.1| -|26 |enigma |0.3.0 | 10| -|17 |datastepr |0.0.2 | 9.9| -|62 |monkeylearn |0.1.1 | 9.8| -|11 |cellranger |1.1.0 | 9.5| -|5 |blob |1.0.0 | 8.9| -|16 |datapasta |2.0.0 | 8.8| -|35 |forcats |0.2.0 | 8.8| -|81 |prcr |0.1.1 | 8.8| -|88 |rdpla |0.1.0 | 7.7| +|6 |blockTools |0.6-3 | 21| +|90 |refimpact |0.1.0 | 20.8| +|4 |blkbox |1.0 | 20.7| +|28 |evaluator |0.1.0 | 20.7| +|118 |worrms |0.1.0 | 20.5| +|47 |gitlabr |0.7 | 19.7| +|20 |doctr |0.2.0 | 19.3| +|36 |FSelectorRcpp |0.1.2 | 19.3| +|70 |observer |0.1.2 | 18.9| +|68 |nycflights13 |0.2.2 | 18.8| +|73 |openadds |0.2.0 | 18.8| +|58 |KraljicMatrix |0.1.1 | 17.2| +|112 |tidyr |0.6.1 | 16.8| +|99 |rorcid |0.3.0 | 15.8| +|10 |cdata |0.1.0 | 15.7| +|63 |mregions |0.1.4 | 15.7| +|21 |docxtractr |0.2.0 | 15.3| +|32 |filesstrings |0.3.2 | 15| +|117 |wand |0.2.0 | 14.6| +|7 |bold |0.4.0 | 14.1| +|49 |haven |1.0.0 | 13.7| +|42 |ggguitar |0.1.1 | 13.6| +|69 |oai |0.2.2 | 13.6| +|46 |giphyr |0.1.0 | 13.4| +|86 |rbhl |0.3.0 | 13.3| +|71 |odbc |1.0.1 | 13.2| +|60 |modelr |0.1.0 | 13.1| +|74 |pangaear |0.3.0 | 12.7| +|114 |units |0.4-3 | 12| +|24 |easyformatr |0.1.2 | 11.7| +|75 |pdfsearch |0.1.1 | 11.5| +|26 |enigma |0.3.0 | 11.1| +|30 |feather |0.3.1 | 10.8| +|62 |monkeylearn |0.1.1 | 10.2| +|83 |randNames |0.2.3 | 10.2| +|96 |ritis |0.5.4 | 9.6| +|11 |cellranger |1.1.0 | 9.3| +|17 |datastepr |0.0.2 | 9.3| +|5 |blob |1.0.0 | 9.2| +|35 |forcats |0.2.0 | 9.2| +|16 |datapasta |2.0.0 | 8.9| +|81 |prcr |0.1.1 | 8.6| +|88 |rdpla |0.1.0 | 8.1| +|94 |riem |0.1.1 | 7.6| |67 |natserv |0.1.4 | 7.4| -|94 |riem |0.1.1 | 7.3| -|43 |ggimage |0.0.4 | 1| +|1 |abjutils |0.0.1 | 7.3| +|43 |ggimage |0.0.4 | 0.9| From 3a8701ae1b9cc2ef3efaedaae4d8c37bc2b5de2e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 15:02:13 +0200 Subject: [PATCH 33/37] only warn --- NEWS.md | 2 +- R/all-equal.r | 11 +++++++++-- 2 files changed, 10 insertions(+), 3 deletions(-) diff --git a/NEWS.md b/NEWS.md index 3674a6b74..d8bc34c12 100644 --- a/NEWS.md +++ b/NEWS.md @@ -3,7 +3,7 @@ ## Bug fixes - Time series matrices (objects of class `mts` and `ts`) are now supported in `as_tibble()` (#184). -- The `all_equal()` function (called by `all.equal.tbl_df()`) now forwards to `dplyr` and fails with a helpful message if not installed. Data frames with list columns cannot be compared anymore, and differences in the declared class (`data.frame` vs. `tbl_df`) are ignored. This ensures consistent behavior of this function, regardless if `dplyr` is loaded or not (#198). +- The `all_equal()` function (called by `all.equal.tbl_df()`) now forwards to `dplyr` and fails with a helpful message if not installed. Data frames with list columns cannot be compared anymore, and differences in the declared class (`data.frame` vs. `tbl_df`) are ignored. The `all.equal.tbl_df()` method gives a warning and forwards to `NextMethod()` if `dplyr` is not installed; call `all.equal(as.data.frame(...), ...)` to avoid the warning. This ensures consistent behavior of this function, regardless if `dplyr` is loaded or not (#198). ## Interface changes diff --git a/R/all-equal.r b/R/all-equal.r index 8ab0899f7..3ea0a4bda 100644 --- a/R/all-equal.r +++ b/R/all-equal.r @@ -33,7 +33,7 @@ all_equal <- function(target, current, ignore_col_order = TRUE, ignore_row_order = TRUE, convert = FALSE, ...) { if (!requireNamespace("dplyr", quietly = TRUE)) { - stop("Please install dplyr to use all.equal() on tibbles", call. = FALSE) + stop("Please install dplyr to use all_equal()", call. = FALSE) } dplyr_all_equal <- get( @@ -49,4 +49,11 @@ all_equal <- function(target, current, ignore_col_order = TRUE, #' @export #' @rdname all_equal #' @method all.equal tbl_df -all.equal.tbl_df <- all_equal +all.equal.tbl_df <- function(target, current, ...) { + if (!requireNamespace("dplyr", quietly = TRUE)) { + warning("Please install dplyr to use all.equal() on tibbles", call. = FALSE) + NextMethod() + } + + all_equal(target, current, ...) +} From 7ce4a47a93d4cde17b77673fc14a3d5268075ac9 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 15:10:15 +0200 Subject: [PATCH 34/37] oops --- R/all-equal.r | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/R/all-equal.r b/R/all-equal.r index 3ea0a4bda..0f72aefe5 100644 --- a/R/all-equal.r +++ b/R/all-equal.r @@ -52,7 +52,7 @@ all_equal <- function(target, current, ignore_col_order = TRUE, all.equal.tbl_df <- function(target, current, ...) { if (!requireNamespace("dplyr", quietly = TRUE)) { warning("Please install dplyr to use all.equal() on tibbles", call. = FALSE) - NextMethod() + return(NextMethod()) } all_equal(target, current, ...) From de69b1b13d9522d8c8cd9aba52c3c00a178b60e7 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 15:11:03 +0200 Subject: [PATCH 35/37] CRAN comments --- cran-comments.md | 5 +++-- 1 file changed, 3 insertions(+), 2 deletions(-) diff --git a/cran-comments.md b/cran-comments.md index 5217e975c..21d78a5ee 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -12,5 +12,6 @@ I checked all 118 reverse dependencies on CRAN and Bioconductor for version 1.2 and for the current release, and compared the outputs of R CMD check. They were identical for all packages. -The previous attempt to release didn't cover an error in the `readr` package -due to a missing dependency, this should be fixed in `readr` 1.1.0. +The compatibility error in the `readr` package is now finally resolved. +The test error for the `refimpact` package seems to occur only sporadically, +this looks like an unstable test to me, and not like a regression caused by tibble. From 71455ca698f696473b6cd4d02febd86bf48bfd06 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 15:11:51 +0200 Subject: [PATCH 36/37] document --- man/all_equal.Rd | 3 +-- 1 file changed, 1 insertion(+), 2 deletions(-) diff --git a/man/all_equal.Rd b/man/all_equal.Rd index bf24638d6..149eadd89 100644 --- a/man/all_equal.Rd +++ b/man/all_equal.Rd @@ -8,8 +8,7 @@ all_equal(target, current, ignore_col_order = TRUE, ignore_row_order = TRUE, convert = FALSE, ...) -\method{all.equal}{tbl_df}(target, current, ignore_col_order = TRUE, - ignore_row_order = TRUE, convert = FALSE, ...) +\method{all.equal}{tbl_df}(target, current, ...) } \arguments{ \item{target, current}{Two data frames to compare.} From da12e2a51dcfd8f762b335154f39bd772f40ee8b Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Fri, 31 Mar 2017 15:12:28 +0200 Subject: [PATCH 37/37] quotes --- cran-comments.md | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/cran-comments.md b/cran-comments.md index 21d78a5ee..c7de2bbc1 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -14,4 +14,4 @@ identical for all packages. The compatibility error in the `readr` package is now finally resolved. The test error for the `refimpact` package seems to occur only sporadically, -this looks like an unstable test to me, and not like a regression caused by tibble. +this looks like an unstable test to me, and not like a regression caused by `tibble`.