Skip to content

Commit bd7d9d6

Browse files
committed
Prepare for patch release.
Fixes #1968
1 parent 4b05a3b commit bd7d9d6

File tree

4 files changed

+11
-205
lines changed

4 files changed

+11
-205
lines changed

Diff for: DESCRIPTION

+2-2
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
Package: ggplot2
2-
Version: 2.2.0.9000
2+
Version: 2.2.1
33
Title: Create Elegant Data Visualisations Using the Grammar of Graphics
44
Description: A system for 'declaratively' creating graphics,
55
based on "The Grammar of Graphics". You provide the data, tell 'ggplot2'
@@ -215,4 +215,4 @@ Collate:
215215
'zxx.r'
216216
'zzz.r'
217217
VignetteBuilder: knitr
218-
RoxygenNote: 5.0.1
218+
RoxygenNote: 5.0.1.9000

Diff for: NEWS.md

+3-1
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,6 @@
1-
# ggplot2 2.2.0.9000
1+
# ggplot2 2.2.1
2+
3+
* Fix usage of `structure(NULL)` for R-devel compatibility (#1968).
24

35
# ggplot2 2.2.0
46

Diff for: R/utilities.r

+1-1
Original file line numberDiff line numberDiff line change
@@ -146,7 +146,7 @@ should_stop <- function(expr) {
146146
#'
147147
#' @export
148148
#' @keywords internal
149-
waiver <- function() structure(NULL, class = "waiver")
149+
waiver <- function() structure(list(), class = "waiver")
150150

151151
is.waive <- function(x) inherits(x, "waiver")
152152

Diff for: cran-comments.md

+5-201
Original file line numberDiff line numberDiff line change
@@ -1,212 +1,16 @@
1-
This is a resubmission fixing two minor issues.
1+
This is a patch release to fix the new R-devel warning.
22

33
---
44

55
## Test environments
6-
* OS X, R 3.3.1
7-
* Ubuntu 14.04, R 3.3.1
6+
* OS X, R 3.3.2
7+
* Ubuntu 14.04, R 3.3.2
88
* win-builder (devel and release)
99

1010
## R CMD check results
1111

12-
There were no ERRORs or WARNINGs. I see two NOTEs:
13-
14-
* Found the following (possibly) invalid URLs:
15-
URL: http://fueleconomy.gov
16-
From: man/mpg.Rd
17-
Status: 404 Message: Not Found
18-
19-
I think the problem is a poorly configured webserver:
20-
`curl http://fueleconomy.gov` works, but `curl -I http://fueleconomy.gov`
21-
(which sends a HEAD request) does not.
22-
23-
* checking DESCRIPTION meta-information ... NOTE
24-
Authors@R field gives persons with non-standard roles:
25-
RStudio [cph, fnd]: fnd
26-
27-
I would rely like to capture the signficant funders in the authors list
28-
so that can be correctly acknowledged.
12+
There were no ERRORs, WARNING or NOTEs
2913

3014
## Reverse dependencies
3115

32-
* I ran `R CMD check` on 954 all reverse dependencies
33-
(summary at https://github.com/hadley/ggplot2/blob/master/revdep/).
34-
35-
* Maintainers with NOTEs, WARNINGs, or ERRORS were notified on Oct 6,
36-
Oct 25, and again today.
37-
38-
* There are a lot of WARNINGS/ERRORs, but I've carefully reviewed them
39-
all and as far as I can tell they are either deliberate changes to
40-
the ggplot2 API, or unrelated problems. I'm sorry there are so many -
41-
I don't know how to better encourage package authors to submit
42-
updates. Every maintainer has been personally emailed at least twice
43-
before today.
44-
45-
### ggproto mistake
46-
47-
I unfortunately made an implementation error in ggproto (the OO system that ggplot2 uses) that inadvertently introduced a build-time dependency on ggplot2. I've fixed the problem and added a clear error message, but to fix a number of downstream failures will require a rebuild of the following packages against the new version of ggplot2:
48-
49-
* ggrepel (GeomTextRepel)
50-
* ggmap (GeomRasterAnn)
51-
* ggpmisc (statpeaks)
52-
* ggbeeswarm (PositionQuasirandom)
53-
54-
This problem affects the following downstream packgaes:
55-
56-
* archivist: checking examples ... ERROR
57-
* clustrd: checking examples ... ERROR
58-
* clifro: checking re-building of vignette outputs ... WARNING
59-
* corrr: checking examples ... ERROR
60-
* factoextra: checking examples ... ERROR
61-
* ggnetwork: checking examples ... ERROR
62-
* ggpmisc: checking examples ... ERROR
63-
* ggpubr: checking examples ... ERROR
64-
* idm: checking examples ... ERROR
65-
* OutbreakTools: checking examples ... ERROR
66-
* photobiologyInOut: checking re-building of vignette outputs ... WARNING
67-
* photobiologyLamps: checking re-building of vignette outputs ... WARNING
68-
* photobiologyLEDs: checking re-building of vignette outputs ... WARNING
69-
* photobiologyPlants: checking re-building of vignette outputs ... WARNING
70-
* SensusR: checking examples ... ERROR
71-
* sjPlot: checking examples ... ERROR
72-
* soc.ca: checking examples ... ERROR
73-
* trackeR: checking re-building of vignette outputs ... WARNING
74-
* vipor: checking re-building of vignette outputs ... WARNING
75-
76-
### ggplot2 changes
77-
78-
Need dev version of plotly: the maintainer is planning on submitting ASAP:
79-
80-
* eechidna: checking examples ... ERROR
81-
* heatmaply: checking examples ... ERROR
82-
* MendelianRandomization: checking examples ... ERROR
83-
* plotly: checking examples ... ERROR
84-
85-
Errors that were silent, but now break thanks to stricter checks:
86-
87-
* biogram: checking re-building of vignette outputs ... WARNING
88-
* BlandAltmanLeh: checking re-building of vignette outputs ... WARNING
89-
* brms: checking tests ... ERROR
90-
* CopulaDTA: checking re-building of vignette outputs ... WARNING
91-
* ddpcr: checking re-building of vignette outputs ... WARNING
92-
* fheatmap: checking examples ... ERROR
93-
* gapfill: checking examples ... ERROR
94-
* ggExtra: checking examples ... ERROR
95-
* iNEXT: checking re-building of vignette outputs ... WARNING
96-
* largeVis: checking re-building of vignette outputs ... WARNING
97-
* MEGENA: checking re-building of vignette outputs ... WARNING
98-
* obAnalytics: checking examples ... ERROR
99-
* oddsratio: checking examples ... ERROR
100-
* onlineCPD: checking examples ... ERROR
101-
* PGRdup: checking re-building of vignette outputs ... WARNING
102-
* quickpsy: checking examples ... ERROR
103-
* sparkTable: checking examples ... ERROR
104-
* surveillance: checking re-building of vignette outputs ... WARNING
105-
* survMisc: checking examples ... ERROR
106-
* UpSetR: checking re-building of vignette outputs ... WARNING
107-
108-
Some packages rely on internal object definitions, and haven't yet been updated for this version:
109-
110-
* geomnet: checking examples ... ERROR
111-
* GGally: checking examples ... ERROR
112-
* ggalt: checking examples ... ERROR
113-
* hyperSpec: checking examples ... ERROR
114-
* manhattanly: checking re-building of vignette outputs ... WARNING
115-
* mtconnectR: checking tests ... ERROR
116-
* quanteda: checking tests ... ERROR
117-
* rstanarm: checking examples ... ERROR
118-
* tabplot: checking examples ... ERROR
119-
* vdmR: checking examples ... ERROR
120-
121-
Two use a newly deprecated argument:
122-
123-
* plotluck: checking tests ... ERROR
124-
* robCompositions: checking re-building of vignette outputs ... WARNING
125-
126-
### Problems unrelated to ggplot2
127-
128-
Failed to installed suggested package used in examples or vignettes:
129-
130-
* bcrm: checking examples ... ERROR
131-
* BCEA: checking examples ... ERROR
132-
* coloc: checking re-building of vignette outputs ... WARNING
133-
* emojifont: checking re-building of vignette outputs ... WARNING
134-
* fuzzyforest: checking examples ... ERROR
135-
* glycanr: checking examples ... ERROR
136-
* GenCAT: checking examples ... ERROR
137-
* ie2miscdata: checking re-building of vignette outputs ... WARNING
138-
* MixSIAR: checking examples ... ERROR
139-
* slim: checking re-building of vignette outputs ... WARNING
140-
* survminer: checking examples ... ERROR
141-
* tcgsaseq: checking examples ... ERROR
142-
* TELP: checking examples ... ERROR
143-
144-
Dependency of Hmisc on bleeding-edge survival:
145-
146-
* choroplethr: checking re-building of vignette outputs ... WARNING
147-
* Greg: checking examples ... ERROR
148-
* hdnom: checking examples ... ERROR
149-
* pander: checking re-building of vignette outputs ... WARNING
150-
* simcausal: checking re-building of vignette outputs ... WARNING
151-
152-
Needs java:
153-
154-
* mlr: checking examples ... ERROR
155-
* prcbench: checking examples ... ERROR
156-
* rfordummies: checking examples ... ERROR
157-
* userfriendlyscience: checking examples ... ERROR
158-
159-
Other/unknown:
160-
161-
* BioPET: checking examples ... ERROR
162-
Calling mean on non-numeric object
163-
164-
* ecb: checking tests ... ERROR
165-
Seems to be some badness in tests of remote server
166-
167-
* fitbitScraper: checking re-building of vignette outputs ... WARNING
168-
Looks related to RCurl
169-
170-
* ggenealogy: checking re-building of vignette outputs ... WARNING
171-
Looks like encoding related issues in vignette
172-
173-
* ggfortify: checking tests ... ERROR
174-
Don't know what's causing these failures
175-
176-
* ParamHelpers: checking tests ... ERROR
177-
Failing test appears unrelated to ggplot2
178-
179-
* PredictTestbench: checking re-building of vignette outputs ... WARNING
180-
Missing `pred` arugment
181-
182-
* xtractomatic: checking re-building of vignette outputs ... WARNING
183-
Failed to open connection
184-
185-
Existing R CMD check failures:
186-
187-
* proportion: checking sizes of PDF files under ‘inst/doc’ ... WARNING
188-
* Rz: checking dependencies in R code ... WARNING
189-
* simmer: checking compiled code ... WARNING
190-
191-
Failed to install dependencies for: aop, BACA, cate, clusterfly, demi, gitter,
192-
gridDebug, Hmisc, HTSSIP, ibmdbR, IntClust, LANDD, LDheatmap, MetaIntegrator,
193-
metaMix, multiDimBio, myTAI, NFP, PKgraph, PlasmaMutationDetector, pRF, PSCBS,
194-
raptr, rms, RPPanalyzer, scmamp, SeqFeatR, snpEnrichment, specmine, starmie,
195-
structSSI, TcGSA, toaster
196-
197-
Failed to install: BACCT, backShift, bamdit, brainGraph, bsam, BTSPAS,
198-
classify, CollapsABEL, crmPack, Crossover, Deducer, DiversityOccupancy,
199-
DynNom, dynr, Fgmutils, funModeling, G2Sd, ggtern, greport, IAPWS95,
200-
imageData, imager, InSilicoVA, llama, localgauss, ltbayes, magick,
201-
MergeGUI, MissingDataGUI, morse, mrMLM, mwaved, npregfast, OpenStreetMap,
202-
openVA, OriGen, pcaPA, pcrsim, playwith, PortfolioEffectHFT, qdap, ReporteRs,
203-
RJafroc, rmcfs, rrepast, RSA, rstan, rsvg, SEERaBomb, seewave, simmr, spcosa,
204-
StroupGLMM, strvalidator, subspaceMOA, UBL, UsingR, vmsbase, x.ent, XGR,
205-
XLConnect
206-
207-
### False positives
208-
209-
These seem to be a couple of false positives: neither I nor the maintainers could reproduce outside of my revdep check setup:
210-
211-
* radiant.model: checking examples ... ERROR
212-
* data.table: checking tests ... ERROR
16+
I did not run R CMD check as this change should not impact any downstream code.

0 commit comments

Comments
 (0)