Home
last modified time | relevance | path

Searched refs:tzone (Results 1 – 25 of 480) sorted by relevance

12345678910>>...20

/dports/math/R-cran-xts/xts/R/
H A Dtzone.R24 tzone(x, ...)
27 tzone <- function(x, ...) { function
33 `tzone<-`(x, value)
40 `tzone<-.xts` <-
61 `tzone<-.default` <-
77 if (is.null(tzone)) {
81 if (is.null(tzone)) {
84 if (is.null(tzone)) {
87 tzone <- ""
90 return(tzone)
[all …]
H A Dxts.R39 tzone=Sys.getenv("TZ"), argument
49 if(!missing(tzone))
52 tzone <- "UTC"
80 tzone <- order.by@FinCenter
83 tzone <- attr(order.by, "tzone")
93 tzone <- tzone[1L]
96 index=structure(index,tzone=tzone,tclass=orderBy),
128 tzone=Sys.getenv("TZ"), argument
186 tzone <- index.tz
189 tzone <- tzone[1L]
[all …]
H A Dindex.R125 attr(value, 'tzone') <- tzone(x)
132 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$sec
135 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$min
138 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$hour
141 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$mday
144 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$mon
147 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$year
150 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$wday
154 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$wday %% 6 > 0
157 as.POSIXlt(.POSIXct(.index(x), tz=tzone(x)))$yday
[all …]
/dports/devel/R-cran-lubridate/lubridate/tests/testthat/
H A Dtest-daylight-savings.R4 x <- structure(1268532305, class = c("POSIXct", "POSIXt"), tzone = "UTC") nameattr
5 y <- structure(1268618705, class = c("POSIXct", "POSIXt"), tzone = "UTC") nameattr
6 z <- structure(1268633105, class = c("POSIXct", "POSIXt"), tzone = "America/New_York") nameattr
13 y <- structure(1289111405, tzone = "America/New_York", class = c("POSIXct", "POSIXt"))
95 class = c("POSIXlt", "POSIXt"), tzone = c("America/New_York", "EST", "EDT")) nameattr in c
99 class = c("POSIXlt", "POSIXt"), tzone = c("America/New_York", "EST", "EDT")) nameattr in c
103 class = c("POSIXlt", "POSIXt"), tzone = c("America/New_York", "EST", "EDT")) nameattr in c
107 class = c("POSIXlt", "POSIXt"), tzone = "UTC") nameattr
116 class = c("POSIXlt", "POSIXt"), tzone = c("America/New_York", "EST", "EDT")) nameattr in c
124 class = c("POSIXlt", "POSIXt"), tzone = c("America/New_York", "EST", "EDT")) nameattr in c
[all …]
/dports/devel/R-cran-vctrs/vctrs/src/
H A Dtype-date-time.c7 static SEXP new_datetime(SEXP x, SEXP tzone);
8 static SEXP new_empty_datetime(SEXP tzone);
40 PROTECT(tzone); in date_datetime_ptype2()
212 return r_as_posixlt(x, tzone); in posixct_as_posixlt_impl()
293 return new_datetime(x, tzone); in vctrs_new_datetime()
303 if (tzone == R_NilValue) { in new_datetime()
304 tzone = chrs_empty; in new_datetime()
307 if (TYPEOF(tzone) != STRSXP) { in new_datetime()
370 if (tzone != R_NilValue) { in datetime_validate_tzone()
423 if (tzone == R_NilValue) { in tzone_get()
[all …]
/dports/x11/kf5-kdelibs4support/kdelibs4support-5.89.0/src/kdecore/
H A Dscoop-tzones.py65 tzone = message variable
66 if tzone not in current_timezones:
67 current_timezones[tzone] = []
84 tzone = els[2] variable
85 if tzone not in system_timezones:
86 system_timezones[tzone] = []
97 for tzone, tzcomments in system_timezones.items():
98 if tzone not in current_timezones:
99 current_timezones[tzone] = tzcomments
111 for tzone in tzones:
[all …]
/dports/devel/R-cran-lubridate/lubridate/R/
H A Dtime-zones.r22 with_tz <- function(time, tzone = "") { argument
23 if (!C_valid_tz(tzone))
24 warning(sprintf("Unrecognized time zone '%s'", tzone))
28 time[[nm]] <- .with_tz(time[[nm]], tzone = tzone)
33 .with_tz(time, tzone)
37 .with_tz <- function(time, tzone = "") { argument
39 attr(out, "tzone") <- tzone
82 force_tz <- function(time, tzone = "", roll = FALSE) { argument
83 tzone <- as.character(tzone)
87 time[[nm]] <- force_tz(time[[nm]], tzone = tzone)
[all …]
H A Dintervals.r88 new("Interval", spans, start = starts, tzone = x@tzone)
115 new("Interval", x@.Data, start = x@start, tzone = x@tzone)
119 new("Interval", x@.Data, start = x@start, tzone = x@tzone)
128 new("Interval", x@.Data, start = x@start, tzone = x@tzone)
132 new("Interval", x@.Data, start = x@start, tzone = x@tzone)
152 new("Interval", df$data, start = df$start, tzone = x@tzone)
219 force(tzone)
225 if (tzone != tz(starts)) starts <- with_tz(starts, tzone)
227 new("Interval", span, start = starts, tzone = tzone)
294 tzone = int@tzone)
[all …]
H A Dvctrs.R11 new_empty_interval <- function(tzone) { argument
12 interval(tzone = tzone)
188 tzone <- to@tzone functionVar
193 start <- vctrs::new_datetime(start, tzone = tzone)
195 out <- new("Interval", span, start = start, tzone = tzone)
229 new_empty_interval(tzone = tz_union(x, y))
237 x_tzone <- x@tzone
238 to_tzone <- to@tzone
249 new("Interval", x_span, start = start, tzone = to_tzone)
259 x_tzone <- x@tzone
[all …]
/dports/devel/R-cran-vctrs/vctrs/R/
H A Dtype-date-time.R33 .Call(vctrs_new_datetime, x, tzone)
65 x <- vec_cast(x, new_datetime(tzone = tzone(x)))
70 x <- vec_cast(x, new_datetime(tzone = tzone(x)))
103 tzone <- if (tzone_is_local(x)) "local" else tzone(x) functionVar
104 paste0("datetime<", tzone, ">")
109 tzone <- if (tzone_is_local(x)) "local" else tzone(x) functionVar
110 paste0("POSIXlt<", tzone, ">")
520 tzone <- function(x) { function
525 identical(tzone(x), "")
530 tzone(y)
[all …]
/dports/devel/icu/icu/source/test/compat/
H A Dtzone.pl36 foreach my $tzone (@TZONE_RAW) {
37 chomp($tzone);
38 if (-e $tzone) {
39 $TZONE[$index] = substr($tzone, 20);
50 foreach my $tzone (@TZONE) {
52 $ENV{'TZ'} = "$tzone";
58 print "\nTIME ZONE: $tzone\n";
/dports/devel/icu-lx/icu/source/test/compat/
H A Dtzone.pl36 foreach my $tzone (@TZONE_RAW) {
37 chomp($tzone);
38 if (-e $tzone) {
39 $TZONE[$index] = substr($tzone, 20);
50 foreach my $tzone (@TZONE) {
52 $ENV{'TZ'} = "$tzone";
58 print "\nTIME ZONE: $tzone\n";
/dports/math/R-cran-memisc/memisc/R/
H A Ditem-more-methods-datetime.R11 tz <- if(is.character(x@tzone) && !nzchar(x@tzone)) x@tzone else "UTC"
23 tzone=attr(x,"tzone"),
37 tzone=x@tzone,
48 tzone=x@tzone,
90 if (missing(tz) && !is.null(tzone <- x@tzone)) tz <- tzone functionVar
130 tzone <- if(length(object@tzone)) object@tzone else "UTC"
135 ", time zone = ",tzone,
/dports/math/R-cran-xts/xts/inst/unitTests/
H A Drunit.tzone.R8 index = structure(1:5, tzone = "", tclass = c("POSIXct", "POSIXt")),
11 .indexTZ = "UTC", tzone = "UTC",
15 checkIdentical(tzone(x), "")
32 tzone(y) <- "GMT"
39 tzone(y) <- "GMT"
45 tzone(y) <- NULL
57 checkIdentical(NULL, y$tzone)
H A Drunit.xts.R52 checkIdentical(tz, tzone(y))
155 idx <- structure(1, tzone="", tclass="yearmon", tformat="%Y-%b")
190 idx <- structure(1, tzone="",tclass="yearmon")
197 checkXtsTz <- function(xts, tzone) { argument
198 checkEquals(tzone(xts), tzone)
199 checkEquals(attr(attr(xts, "index"), "tzone"), tzone)
212 checkXtsTz(.xts(1, 1, tzone="Europe/London"), "Europe/London")
215 checkXtsTz(.xts(1, 1, tzone="Europe/London", .indexTZ="America/New_York"), "Europe/London")
218 idx <- structure(1, tzone="Asia/Tokyo",tclass="yearmon")
220 checkXtsTz(.xts(1, idx, tzone="Europe/London"), "Europe/London")
[all …]
/dports/sysutils/toybox/toybox-0.8.5/toys/other/
H A Dhwclock.c36 struct timezone tzone; local
71 tzone.tz_minuteswest = timezone / 60 - 60 * daylight;
75 tzone.tz_minuteswest = timezone / 60;
76 if (tm.tm_isdst) tzone.tz_minuteswest -= 60;
77 if (!utc) timeval.tv_sec += tzone.tz_minuteswest * 60;
83 tzone.tz_dsttime = 0;
84 if (settimeofday(&timeval, &tzone)) perror_exit("settimeofday failed");
/dports/multimedia/libv4l/linux-5.13-rc2/drivers/thermal/intel/int340x_thermal/
H A Dint340x_thermal_zone.h43 struct int34x_thermal_zone *tzone, void *priv_data) in int340x_thermal_zone_set_priv_data() argument
45 tzone->priv_data = priv_data; in int340x_thermal_zone_set_priv_data()
49 struct int34x_thermal_zone *tzone) in int340x_thermal_zone_get_priv_data() argument
51 return tzone->priv_data; in int340x_thermal_zone_get_priv_data()
55 struct int34x_thermal_zone *tzone, in int340x_thermal_zone_device_update() argument
58 thermal_zone_device_update(tzone->zone, event); in int340x_thermal_zone_device_update()
/dports/multimedia/v4l_compat/linux-5.13-rc2/drivers/thermal/intel/int340x_thermal/
H A Dint340x_thermal_zone.h43 struct int34x_thermal_zone *tzone, void *priv_data) in int340x_thermal_zone_set_priv_data() argument
45 tzone->priv_data = priv_data; in int340x_thermal_zone_set_priv_data()
49 struct int34x_thermal_zone *tzone) in int340x_thermal_zone_get_priv_data() argument
51 return tzone->priv_data; in int340x_thermal_zone_get_priv_data()
55 struct int34x_thermal_zone *tzone, in int340x_thermal_zone_device_update() argument
58 thermal_zone_device_update(tzone->zone, event); in int340x_thermal_zone_device_update()
/dports/multimedia/v4l-utils/linux-5.13-rc2/drivers/thermal/intel/int340x_thermal/
H A Dint340x_thermal_zone.h43 struct int34x_thermal_zone *tzone, void *priv_data) in int340x_thermal_zone_set_priv_data() argument
45 tzone->priv_data = priv_data; in int340x_thermal_zone_set_priv_data()
49 struct int34x_thermal_zone *tzone) in int340x_thermal_zone_get_priv_data() argument
51 return tzone->priv_data; in int340x_thermal_zone_get_priv_data()
55 struct int34x_thermal_zone *tzone, in int340x_thermal_zone_device_update() argument
58 thermal_zone_device_update(tzone->zone, event); in int340x_thermal_zone_device_update()
/dports/multimedia/libv4l/linux-5.13-rc2/drivers/thermal/intel/
H A Dx86_pkg_temp_thermal.c55 struct thermal_zone_device *tzone; member
265 struct thermal_zone_device *tzone = NULL; in pkg_temp_thermal_threshold_work_fn() local
286 tzone = zonedev->tzone; in pkg_temp_thermal_threshold_work_fn()
296 if (tzone) in pkg_temp_thermal_threshold_work_fn()
363 if (IS_ERR(zonedev->tzone)) { in pkg_temp_thermal_device_add()
364 err = PTR_ERR(zonedev->tzone); in pkg_temp_thermal_device_add()
368 err = thermal_zone_device_enable(zonedev->tzone); in pkg_temp_thermal_device_add()
370 thermal_zone_device_unregister(zonedev->tzone); in pkg_temp_thermal_device_add()
402 struct thermal_zone_device *tzone = zonedev->tzone; in pkg_thermal_cpu_offline() local
411 zonedev->tzone = NULL; in pkg_thermal_cpu_offline()
[all …]
/dports/multimedia/v4l_compat/linux-5.13-rc2/drivers/thermal/intel/
H A Dx86_pkg_temp_thermal.c55 struct thermal_zone_device *tzone; member
265 struct thermal_zone_device *tzone = NULL; in pkg_temp_thermal_threshold_work_fn() local
286 tzone = zonedev->tzone; in pkg_temp_thermal_threshold_work_fn()
296 if (tzone) in pkg_temp_thermal_threshold_work_fn()
363 if (IS_ERR(zonedev->tzone)) { in pkg_temp_thermal_device_add()
364 err = PTR_ERR(zonedev->tzone); in pkg_temp_thermal_device_add()
368 err = thermal_zone_device_enable(zonedev->tzone); in pkg_temp_thermal_device_add()
370 thermal_zone_device_unregister(zonedev->tzone); in pkg_temp_thermal_device_add()
402 struct thermal_zone_device *tzone = zonedev->tzone; in pkg_thermal_cpu_offline() local
411 zonedev->tzone = NULL; in pkg_thermal_cpu_offline()
[all …]
/dports/multimedia/v4l-utils/linux-5.13-rc2/drivers/thermal/intel/
H A Dx86_pkg_temp_thermal.c55 struct thermal_zone_device *tzone; member
265 struct thermal_zone_device *tzone = NULL; in pkg_temp_thermal_threshold_work_fn() local
286 tzone = zonedev->tzone; in pkg_temp_thermal_threshold_work_fn()
296 if (tzone) in pkg_temp_thermal_threshold_work_fn()
363 if (IS_ERR(zonedev->tzone)) { in pkg_temp_thermal_device_add()
364 err = PTR_ERR(zonedev->tzone); in pkg_temp_thermal_device_add()
368 err = thermal_zone_device_enable(zonedev->tzone); in pkg_temp_thermal_device_add()
370 thermal_zone_device_unregister(zonedev->tzone); in pkg_temp_thermal_device_add()
402 struct thermal_zone_device *tzone = zonedev->tzone; in pkg_thermal_cpu_offline() local
411 zonedev->tzone = NULL; in pkg_thermal_cpu_offline()
[all …]
/dports/multimedia/v4l_compat/linux-5.13-rc2/drivers/net/wireless/intel/iwlwifi/mvm/
H A Dtt.c146 if (mvm->tz_device.tzone) { in iwl_mvm_temp_notif()
564 if (!mvm->tz_device.tzone) in iwl_mvm_send_temp_report_ths_cmd()
664 struct iwl_mvm_thermal_device *tzone; in iwl_mvm_tzone_set_trip_temp() local
687 tzone = &mvm->tz_device; in iwl_mvm_tzone_set_trip_temp()
689 if (!tzone) { in iwl_mvm_tzone_set_trip_temp()
708 tzone->temp_trips[trip] = temperature; in iwl_mvm_tzone_set_trip_temp()
733 mvm->tz_device.tzone = NULL; in iwl_mvm_thermal_zone_register()
746 if (IS_ERR(mvm->tz_device.tzone)) { in iwl_mvm_thermal_zone_register()
750 mvm->tz_device.tzone = NULL; in iwl_mvm_thermal_zone_register()
848 if (mvm->tz_device.tzone) { in iwl_mvm_thermal_zone_unregister()
[all …]
/dports/multimedia/v4l-utils/linux-5.13-rc2/drivers/net/wireless/intel/iwlwifi/mvm/
H A Dtt.c146 if (mvm->tz_device.tzone) { in iwl_mvm_temp_notif()
564 if (!mvm->tz_device.tzone) in iwl_mvm_send_temp_report_ths_cmd()
664 struct iwl_mvm_thermal_device *tzone; in iwl_mvm_tzone_set_trip_temp() local
687 tzone = &mvm->tz_device; in iwl_mvm_tzone_set_trip_temp()
689 if (!tzone) { in iwl_mvm_tzone_set_trip_temp()
708 tzone->temp_trips[trip] = temperature; in iwl_mvm_tzone_set_trip_temp()
733 mvm->tz_device.tzone = NULL; in iwl_mvm_thermal_zone_register()
746 if (IS_ERR(mvm->tz_device.tzone)) { in iwl_mvm_thermal_zone_register()
750 mvm->tz_device.tzone = NULL; in iwl_mvm_thermal_zone_register()
848 if (mvm->tz_device.tzone) { in iwl_mvm_thermal_zone_unregister()
[all …]
/dports/multimedia/libv4l/linux-5.13-rc2/drivers/net/wireless/intel/iwlwifi/mvm/
H A Dtt.c146 if (mvm->tz_device.tzone) { in iwl_mvm_temp_notif()
564 if (!mvm->tz_device.tzone) in iwl_mvm_send_temp_report_ths_cmd()
664 struct iwl_mvm_thermal_device *tzone; in iwl_mvm_tzone_set_trip_temp() local
687 tzone = &mvm->tz_device; in iwl_mvm_tzone_set_trip_temp()
689 if (!tzone) { in iwl_mvm_tzone_set_trip_temp()
708 tzone->temp_trips[trip] = temperature; in iwl_mvm_tzone_set_trip_temp()
733 mvm->tz_device.tzone = NULL; in iwl_mvm_thermal_zone_register()
746 if (IS_ERR(mvm->tz_device.tzone)) { in iwl_mvm_thermal_zone_register()
750 mvm->tz_device.tzone = NULL; in iwl_mvm_thermal_zone_register()
848 if (mvm->tz_device.tzone) { in iwl_mvm_thermal_zone_unregister()
[all …]

12345678910>>...20