Skip to content

Commit 32c65fe

Browse files
committed
add {+-}.POSIXt and tests for {+-} POSIXct
1 parent 0f4a5ae commit 32c65fe

File tree

5 files changed

+67
-15
lines changed

5 files changed

+67
-15
lines changed

NAMESPACE

+2
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,9 @@
11
# Generated by roxygen2: do not edit by hand
22

33
S3method("+",Date)
4+
S3method("+",POSIXt)
45
S3method("-",Date)
6+
S3method("-",POSIXt)
57
S3method("[<-",hms)
68
S3method("[[",hms)
79
S3method("units<-",hms)

R/generics.R

+14
Original file line numberDiff line numberDiff line change
@@ -1,10 +1,18 @@
11
#' @export
22
Ops.hms <- function(e1, e2) {
3+
# This logic is hard-coded in R for difftime
4+
# cf. https://github.com/wch/r-source/blob/a46559e8f728317da979be60e401899ae60086b2/src/main/eval.c#L3406-L3419
35
if (.Generic == "+" && (inherits(e1, "Date") || inherits(e2, "Date"))) {
46
return(base::`+.Date`(e1, e2))
57
} else if (.Generic == "-" && inherits(e1, "Date")) {
68
return(base::`-.Date`(e1, e2))
9+
} else if (.Generic == "+" && (inherits(e1, "POSIXt") || inherits(e2, "POSIXt"))) {
10+
return(base::`+.POSIXt`(e1, e2))
11+
} else if (.Generic == "-" && inherits(e1, "POSIXt")) {
12+
return(base::`-.POSIXt`(e1, e2))
713
}
14+
15+
# delegate to Ops.difftime
816
res <- NextMethod(.Generic)
917
if (inherits(res, "difftime")) {
1018
as_hms(res)
@@ -18,3 +26,9 @@ Ops.hms <- function(e1, e2) {
1826

1927
#' @export
2028
`-.Date` <- Ops.hms
29+
30+
#' @export
31+
`+.POSIXt` <- Ops.hms
32+
33+
#' @export
34+
`-.POSIXt` <- Ops.hms

tests/testthat/helper-compare.R

-6
Original file line numberDiff line numberDiff line change
@@ -3,9 +3,3 @@ expect_hms_equal <- function(x, y) {
33
expect_s3_class(y, "hms")
44
expect_equal(as.numeric(x), as.numeric(y))
55
}
6-
7-
expect_difftime_equal <- function(x, y) {
8-
expect_s3_class(x, "difftime")
9-
expect_s3_class(y, "difftime")
10-
expect_equal(as.numeric(as_hms(x)), as.numeric(as_hms(y)))
11-
}

tests/testthat/test-arith.R

+5-5
Original file line numberDiff line numberDiff line change
@@ -11,11 +11,11 @@ test_that("arithmetics work", {
1111
expect_equal(hms(days = 1) + as.Date("2016-03-31"), as.Date("2016-04-01"))
1212
expect_equal(empty_tz(hms(hours = 1) + as.POSIXct("2016-03-31")), as.POSIXct("2016-03-31 01:00:00"))
1313

14-
expect_difftime_equal(hms(1) + hms(2), hms(3))
15-
expect_difftime_equal(hms(1) - hms(2), hms(-1))
16-
expect_difftime_equal(2 * hms(1), hms(2))
17-
expect_difftime_equal(hms(hours = 1) / 2, hms(minutes = 30))
18-
expect_difftime_equal(-hms(1), hms(-1))
14+
expect_hms_equal(hms(1) + hms(2), hms(3))
15+
expect_hms_equal(hms(1) - hms(2), hms(-1))
16+
expect_hms_equal(2 * hms(1), hms(2))
17+
expect_hms_equal(hms(hours = 1) / 2, hms(minutes = 30))
18+
expect_hms_equal(-hms(1), hms(-1))
1919
})
2020

2121
test_that("component extraction work", {

tests/testthat/test-generics.R

+46-4
Original file line numberDiff line numberDiff line change
@@ -56,10 +56,52 @@ test_that("generic operations work as intended", {
5656

5757
# Can't reproduce this warning because we forced compatibility
5858
hms_result <- hms_test_vec - date_vec
59-
expect_warning({
60-
difftime_result <- as_hms(difftime_test_vec - date_vec)
61-
}, regexp = "Incompatible methods \\(\"Ops.difftime\", \"-.Date\") for \"-\"")
62-
expect_equal(hms_result, difftime_result)
59+
expect_warning(
60+
difftime_result <- as_hms(difftime_test_vec - date_vec),
61+
regexp = "Incompatible methods \\(\"Ops.difftime\", \"-.Date\") for \"-\""
62+
)
63+
expect_equal(hms_result, difftime_result, info = "hms - Date not equal to difftime - Date")
6364

6465
expect_equal(date_vec - hms_test_vec, date_vec - difftime_test_vec)
66+
67+
# hms {+-} POSIXt
68+
posixct_vec <- as.POSIXct(
69+
c("2023-03-26 03:00:00", "2023-10-29 02:00:00", NA_character_, "1970-01-01 00:00:00"),
70+
tz = "Europe/Berlin"
71+
)
72+
73+
posix_difftime_result <- posixct_vec + as.difftime(1.0, units = "hours")
74+
expect_equal(
75+
format(posix_difftime_result, usetz = TRUE),
76+
c("2023-03-26 04:00:00 CEST", "2023-10-29 02:00:00 CET", NA_character_, "1970-01-01 01:00:00 CET")
77+
)
78+
expect_equal(posixct_vec + hms(hours = 1L), posix_difftime_result)
79+
expect_equal(hms(hours = 1L) + posixct_vec, posix_difftime_result)
80+
expect_equal(as.difftime(1.0, units = "hours") + posixct_vec, posix_difftime_result)
81+
82+
posix_difftime_result <- posixct_vec - as.difftime(1.0, units = "hours")
83+
expect_equal(
84+
format(posix_difftime_result, usetz = TRUE),
85+
c("2023-03-26 01:00:00 CET", "2023-10-29 01:00:00 CEST", NA, "1969-12-31 23:00:00 CET"),
86+
info = "POSIXct - difftime"
87+
)
88+
expect_equal(posixct_vec - hms(hours = 1L), posix_difftime_result)
89+
90+
hms_result <- hms(hours = 1L) - posixct_vec
91+
expect_warning(
92+
difftime_result <- as.difftime(3600.0, units = "secs") - posixct_vec,
93+
regexp = "Incompatible methods \\(\"Ops.difftime\", \"-.POSIXt\") for \"-\""
94+
)
95+
# FIXME this currently returns a different result than difftime - POSIXt.
96+
# hms - POSIXt produces a hms
97+
# difftime - POSIXt produces a POSIXt
98+
expect_equal(
99+
as.numeric(hms_result), as.numeric(difftime_result),
100+
info = "hms - POSIXt not equal to difftime - POSIXt"
101+
)
102+
expect_hms_equal(hms_result, new_hms(c(-1679788800.0, -1698534000.0, NA_real_, 7200.0)))
103+
expect_equal(
104+
difftime_result,
105+
as.POSIXct(c(-1679788800.0, -1698534000.0, NA_real_, 7200.0), origin = "1970-01-01", tz = "Europe/Berlin")
106+
)
65107
})

0 commit comments

Comments
 (0)