26
26
# ' or left edges of bins are included in the bin.
27
27
# ' @param pad If `TRUE`, adds empty bins at either end of x. This ensures
28
28
# ' frequency polygons touch 0. Defaults to `FALSE`.
29
+ # ' @param keep.zeroes Treatment of zero count bins. If `"all"` (default), such
30
+ # ' bins are kept as-is. If `"none"`, all zero count bins are filtered out.
31
+ # ' If `"inner"` only zero count bins at the flanks are filtered out, but not
32
+ # ' in the middle.
29
33
# ' @eval rd_computed_vars(
30
34
# ' count = "number of points in bin.",
31
35
# ' density = "density of points in bin, scaled to integrate to 1.",
@@ -55,6 +59,7 @@ stat_bin <- function(mapping = NULL, data = NULL,
55
59
closed = c(" right" , " left" ),
56
60
pad = FALSE ,
57
61
na.rm = FALSE ,
62
+ keep.zeroes = " all" ,
58
63
orientation = NA ,
59
64
show.legend = NA ,
60
65
inherit.aes = TRUE ) {
@@ -77,6 +82,7 @@ stat_bin <- function(mapping = NULL, data = NULL,
77
82
pad = pad ,
78
83
na.rm = na.rm ,
79
84
orientation = orientation ,
85
+ keep.zeroes = keep.zeroes ,
80
86
...
81
87
)
82
88
)
@@ -89,6 +95,10 @@ stat_bin <- function(mapping = NULL, data = NULL,
89
95
StatBin <- ggproto(" StatBin" , Stat ,
90
96
setup_params = function (self , data , params ) {
91
97
params $ flipped_aes <- has_flipped_aes(data , params , main_is_orthogonal = FALSE )
98
+ params $ keep.zeroes <- arg_match0(
99
+ params $ keep.zeroes %|| % " all" ,
100
+ c(" all" , " none" , " inner" ), arg_nm = " keep.zeroes"
101
+ )
92
102
93
103
has_x <- ! (is.null(data $ x ) && is.null(params $ x ))
94
104
has_y <- ! (is.null(data $ y ) && is.null(params $ y ))
@@ -139,7 +149,7 @@ StatBin <- ggproto("StatBin", Stat,
139
149
compute_group = function (data , scales , binwidth = NULL , bins = NULL ,
140
150
center = NULL , boundary = NULL ,
141
151
closed = c(" right" , " left" ), pad = FALSE ,
142
- breaks = NULL , flipped_aes = FALSE ,
152
+ breaks = NULL , flipped_aes = FALSE , keep.zeroes = " all " ,
143
153
# The following arguments are not used, but must
144
154
# be listed so parameters are computed correctly
145
155
origin = NULL , right = NULL , drop = NULL ) {
@@ -163,6 +173,14 @@ StatBin <- ggproto("StatBin", Stat,
163
173
boundary = boundary , closed = closed )
164
174
}
165
175
bins <- bin_vector(data [[x ]], bins , weight = data $ weight , pad = pad )
176
+
177
+ keep <- switch (
178
+ keep.zeroes ,
179
+ none = bins $ count != 0 ,
180
+ inner = inner_runs(bins $ count != 0 ),
181
+ TRUE
182
+ )
183
+ bins <- vec_slice(bins , keep )
166
184
bins $ flipped_aes <- flipped_aes
167
185
flip_data(bins , flipped_aes )
168
186
},
@@ -174,3 +192,12 @@ StatBin <- ggproto("StatBin", Stat,
174
192
dropped_aes = " weight" # after statistical transformation, weights are no longer available
175
193
)
176
194
195
+ inner_runs <- function (x ) {
196
+ rle <- vec_unrep(x )
197
+ nruns <- nrow(rle )
198
+ inner <- rep(TRUE , nruns )
199
+ i <- unique(c(1 , nruns ))
200
+ inner [i ] <- inner [i ] & rle $ key [i ]
201
+ rep(inner , rle $ times )
202
+ }
203
+
0 commit comments