Skip to content

Commit

Permalink
Change na.value for continous scale to NA_real_. Fixes #627
Browse files Browse the repository at this point in the history
  • Loading branch information
wch committed Jul 18, 2012
1 parent 64ad8d3 commit 404f72f
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/scale-.r
Original file line number Diff line number Diff line change
Expand Up @@ -35,7 +35,7 @@ NULL
#' (i.e. \code{\link{scale_colour_gradient2}}, \code{\link{scale_colour_gradientn}}).
#' @param oob What to do with values outside scale limits (out of bounds)?
#' @keywords internal
continuous_scale <- function(aesthetics, scale_name, palette, name = NULL, breaks = waiver(), minor_breaks = waiver(), labels = waiver(), legend = NULL, limits = NULL, rescaler = rescale, oob = censor, expand = waiver(), na.value = NA, trans = "identity", guide="legend") {
continuous_scale <- function(aesthetics, scale_name, palette, name = NULL, breaks = waiver(), minor_breaks = waiver(), labels = waiver(), legend = NULL, limits = NULL, rescaler = rescale, oob = censor, expand = waiver(), na.value = NA_real_, trans = "identity", guide="legend") {

if (!is.null(legend)) {
warning("\"legend\" argument in scale_XXX is deprecated. Use guide=\"none\" for suppress the guide display.")
Expand Down
2 changes: 1 addition & 1 deletion man/continuous_scale.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
name = NULL, breaks = waiver(),
minor_breaks = waiver(), labels = waiver(),
legend = NULL, limits = NULL, rescaler = rescale,
oob = censor, expand = waiver(), na.value = NA,
oob = censor, expand = waiver(), na.value = NA_real_,
trans = "identity", guide = "legend")
}
\arguments{
Expand Down

0 comments on commit 404f72f

Please sign in to comment.