Skip to content

Commit 37d9e8c

Browse files
authored
Add integer/double scale_type methods (#5168)
1 parent 8b659c2 commit 37d9e8c

File tree

2 files changed

+8
-0
lines changed

2 files changed

+8
-0
lines changed

NAMESPACE

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -132,8 +132,10 @@ S3method(scale_type,Date)
132132
S3method(scale_type,POSIXt)
133133
S3method(scale_type,character)
134134
S3method(scale_type,default)
135+
S3method(scale_type,double)
135136
S3method(scale_type,factor)
136137
S3method(scale_type,hms)
138+
S3method(scale_type,integer)
137139
S3method(scale_type,list)
138140
S3method(scale_type,logical)
139141
S3method(scale_type,numeric)

R/scale-type.R

Lines changed: 6 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -91,5 +91,11 @@ scale_type.Date <- function(x) c("date", "continuous")
9191
#' @export
9292
scale_type.numeric <- function(x) "continuous"
9393

94+
#' @export
95+
scale_type.integer <- function(x) "continuous"
96+
97+
#' @export
98+
scale_type.double <- function(x) "continuous"
99+
94100
#' @export
95101
scale_type.hms <- function(x) "time"

0 commit comments

Comments
 (0)