Home
last modified time | relevance | path

Searched +refs:as +refs:POSIXct +refs:zoo (Results 1 – 25 of 58) sorted by relevance

123

/dports/math/R-cran-zoo/zoo/inst/doc/
H A Dzoo-read.Rnw186 f <- function(d, t) as.chron(paste(as.Date(chron(d)), t))
304 and then passt do \fct{as.POSIXct} because \code{tz} and \code{format}
322 \textbf{Output index:} \class{POSIXct}.
325 \code{tz = ""} need to be specified to produce \class{POSIXct} index.
388 use all defaults to produce \class{POSIXct} by setting \code{tz}.
398 FUN = as.chron)
420 and \code{FUN2} or employ defaults yielding \class{POSIXct}.
433 FUN = paste, FUN2 = as.chron)
515 \class{POSIXct} can be produced by setting \code{tz} or, alternatively,
516 \class{chron} can be produced by setting \fct{as.chron} as \code{FUN}.
[all …]
/dports/math/R-cran-zoo/zoo/vignettes/
H A Dzoo-read.Rnw186 f <- function(d, t) as.chron(paste(as.Date(chron(d)), t))
304 and then passt do \fct{as.POSIXct} because \code{tz} and \code{format}
322 \textbf{Output index:} \class{POSIXct}.
325 \code{tz = ""} need to be specified to produce \class{POSIXct} index.
388 use all defaults to produce \class{POSIXct} by setting \code{tz}.
398 FUN = as.chron)
420 and \code{FUN2} or employ defaults yielding \class{POSIXct}.
433 FUN = paste, FUN2 = as.chron)
515 \class{POSIXct} can be produced by setting \code{tz} or, alternatively,
516 \class{chron} can be produced by setting \fct{as.chron} as \code{FUN}.
[all …]
/dports/math/R-cran-zoo/zoo/man/
H A Dindex.Rd4 \alias{index.zoo}
6 \alias{time.zoo}
8 \alias{index<-.zoo}
10 \alias{time<-.zoo}
11 \alias{start.zoo}
12 \alias{end.zoo}
26 as the \code{"index"} attribute of \code{x}.}
32 for \code{\link{zoo}} objects which is the same as the
48 x.date <- as.Date(paste(2003, 2, c(1, 3, 7, 9, 14), sep = "-"))
55 ## change class of index from Date to POSIXct
[all …]
H A Dwindow.zoo.Rd1 \name{window.zoo}
2 \alias{window.zoo}
3 \alias{window<-.zoo}
20 class supports comparisons to character variables, as does \code{"Date"}
37 \seealso{\code{\link{zoo}}}
43 ## zoo example
44 x.date <- as.Date(paste(2003, rep(1:4, 4:1), seq(1,19,2), sep = "-"))
48 window(x, start = as.Date("2003-02-01"), end = as.Date("2003-03-01"))
49 window(x, index = x.date[1:6], start = as.Date("2003-02-01"))
71 zp <- zoo(1:4, as.POSIXct("2000-01-01 00:00:00") + c(-3600, 0, 0.1, 3600))
[all …]
H A Dzoo.Rd6 \alias{as.zoo.factor}
227 The \pkg{zoo} package has an \code{as.Date} \code{numeric} method
235 the \code{POSIXct} class in base \R:
236 If \code{x} and \code{y} are \code{POSIXct} objects with \code{tzone}
239 at \code{\link[base:DateTimeClasses]{c.POSIXct}}, one may want to employ a workaround
286 ## or POSIXct
287 y.POSIXct <- ISOdatetime(2003, 02, c(1, 3, 7, 9, 14), 0, 0, 0)
288 y <- zoo(rnorm(5), y.POSIXct)
298 z2 <- zoo(matrix(1:12, 4, 3), as.Date("2003-01-01") + 0:3)
301 fz <- zoo(gl(2,5), as.Date("2004-01-01") + 0:9)
[all …]
H A Dread.zoo.Rd41 \item{tz}{time zone argument passed to \code{\link{as.POSIXct}}.}
125 index column is converted to \code{POSIXct}. (2) If \code{format} is specified
127 attempts to decide between \code{"numeric"}, \code{"POSIXct"}, and \code{"Date"} by
185 read.zoo(text = Lines, FUN = as.Date) # explicit coercion
194 FUN = paste, FUN2 = as.POSIXct) # explicit coercion
201 read.zoo(text = Lines, index = 1:2, FUN = paste, FUN2 = as.yearmon)
215 z <- read.zoo("foo.csv", sep = ",", FUN = as.yearmon)
232 z <- read.zoo("foo.csv", header = TRUE, sep = ",", FUN = as.chron)
236 z <- read.zoo("foo.csv", header = TRUE, sep = ",", FUN = as.chron,
239 ## same file format but read it in times as "POSIXct" class.
[all …]
H A Dyearmon.Rd20 \alias{as.POSIXct.yearmon}
64 \code{"POSIXct"},
98 \seealso{\code{\link{yearqtr}}, \code{\link{zoo}}, \code{\link{zooreg}}, \code{\link{ts}}}
114 as.POSIXct(x)
123 as.numeric(d - as.Date(as.yearmon(d)))
127 as.Date(as.yearmon(as.yearqtr(x)) + 2/12) + 14
132 z <- zoo(rnorm(24), x, frequency = 12)
148 ## 3. aggregate counts over months, convert to zoo and merge over IDs
149 ag <- function(DF) aggregate(zoo(DF$Count), DF$yearmon, sum)
150 z <- do.call("merge.zoo", lapply(split(DF, DF$ID), ag))
[all …]
H A Das.zoo.Rd1 \name{as.zoo}
2 \alias{as.zoo}
3 \alias{as.zoo.default}
5 \alias{as.zoo.fts}
6 \alias{as.zoo.its}
7 \alias{as.zoo.irts}
9 \alias{as.zoo.mcmc}
10 \alias{as.zoo.tis}
11 \alias{as.zoo.xts}
12 \alias{as.zoo.zoo}
[all …]
H A Daggregate.zoo.Rd2 \name{aggregate.zoo}
3 \alias{aggregate.zoo}
4 \alias{split.zoo}
9 reduced \code{"zoo"} object.
37 full zoo series is used.}
49 \seealso{\code{\link{zoo}}}
73 # create zoo series
75 z.day <- zoo(0:300, tt)
124 z <- zoo(101:200, as.Date("2000-01-01") + seq(0, length = 100, by = 2))
131 # aggregate POSIXct seconds data every 10 minutes
[all …]
H A Dplot.zoo.Rd1 \name{plot.zoo}
2 \alias{plot.zoo}
5 \alias{lines.zoo}
173 ym <- as.yearmon(tt)
174 mon <- as.numeric(format(ym, "\%m"))
184 plot(as.zoo(tab), panel = pnl.xaxis, xaxt = "n", main = "Fancy X Axis")
227 z1 <- zooreg(d1, start = as.POSIXct("2013-01-01 00:00:01"), frequency = 0.0000006)
228 z2 <- zooreg(d2, start = as.POSIXct("2013-01-01 00:00:20"), frequency = 0.0000006)
229 zt <- zooreg(rnorm(1050), start = as.POSIXct("2013-01-01 00:00:01"), frequency = 0.00007)
262 rect(as.yearmon("2007-8"), u[3], as.yearmon("2009-11"), u[4],
[all …]
H A Dyearqtr.Rd3 \alias{as.yearqtr}
7 \alias{as.yearqtr.date}
9 \alias{as.yearqtr.Date}
11 \alias{as.yearqtr.jul}
17 \alias{as.POSIXct.yearqtr}
84 and coercion from \code{"yearqtr"} to \code{"Date"} (see below), \code{"POSIXct"},
109 \seealso{\code{\link{yearmon}}, \code{\link{zoo}}, \code{\link{zooreg}}, \code{\link{ts}},
125 dd <- as.Date(x)
128 as.POSIXct(x)
133 zz <- zoo(rnorm(8), x, frequency = 4)
[all …]
/dports/devel/R-cran-lubridate/lubridate/
H A DNAMESPACE3 S3method(as.POSIXct,fts)
4 S3method(as.POSIXct,irts)
5 S3method(as.POSIXct,timeSeries)
6 S3method(as.POSIXct,xts)
7 S3method(as.POSIXct,zoo)
13 S3method(as.POSIXlt,zoo)
18 S3method(decimal_date,zoo)
36 S3method(reclass_date,POSIXct)
55 S3method(tz,zoo)
89 export(POSIXct)
[all …]
/dports/math/R-cran-xts/xts/man/
H A Das.xts.methods.Rd1 \name{as.xts.methods}
6 \alias{as.xts.zoo}
7 \alias{as.xts.ts}
22 \method{as.xts}{timeSeries}(x, dateFormat="POSIXct", FinCenter, recordIDs,
25 \method{as.xts}{zoo}(x, order.by=index(x), frequency=NULL, ..., .RECLASS=FALSE)
29 \method{as.xts}{data.frame}(x, order.by, dateFormat="POSIXct",
32 \method{as.xts}{matrix}(x, order.by, dateFormat="POSIXct",
45 \item{order.by}{see zoo help}
46 \item{frequency}{see zoo help}
56 \code{matrix}, \code{data.frame}, and \code{zoo}.
[all …]
H A Dsubset.xts.Rd80 Alternately converting character vectors to POSIXct objects will
83 As \code{xts} uses POSIXct time representations
85 timeBased subsetting will always be from POSIXct objects,
87 object. All non-POSIXct time classes
99 This is different from both matrix and \code{zoo} behavior as \R
120 # drop=FALSE for xts, differs from zoo and matrix
121 z <- as.zoo(xx)
124 m <- as.matrix(xx)
143 y <- xts(1:1000, as.POSIXct(format(as.Date("2000-01-01")+1:1000)))
158 y['2000/2000-04-01'] # through April 01, 2000 (using POSIXct series)
[all …]
H A Dxts-internals.Rd6 This help file is to help in development of xts, as well
7 as provide some clarity and insight into its purpose and implementation.
12 The \pkg{xts} package xts designed as a drop-in replacement
13 for the very popular \pkg{zoo} package. Most all functionality
14 of zoo has been extended or carries into the xts package.
25 way of \code{as.POSIXct}. There are defined types that meet this criteria.
31 same name. Rownames in \R must be character vectors, and as such
35 to standard \R date and time classes via the POSIXct functions, while at
38 User level functions \code{index}, as well as conversion to
39 other classes proceeds as if there were rownames. The code
[all …]
/dports/math/R-cran-zoo/zoo/tests/
H A Das.Date.Rout.save26 > as.Date(as.POSIXct("2000-01-01 00:00:00 GMT", tz = "GMT"))
28 > as.Date(as.POSIXlt("2000-01-01 00:00:00 GMT", tz = "GMT"))
30 > as.Date(NA)
59 > ## with zoo attached (masking as.Date/as.Date.numeric)
60 > library("zoo")
62 Attaching package: 'zoo'
66 as.Date, as.Date.numeric
72 > as.Date(as.POSIXct("2000-01-01 00:00:00 GMT", tz = "GMT"))
76 > as.Date(NA)
113 > as.Date(as.POSIXct("2000-01-01 00:00:00 GMT", tz = "GMT"))
[all …]
H A Dvignette-zoo.Rout.save27 as.Date, as.Date.numeric
58 R> z2.index <- as.POSIXct(paste(2004, rep(1:2, 5), sample(1:28, 10), sep = "-"))
186 R> zr1 <- as.zoo(zr1)
191 [1] "zoo"
206 R> identical(zr2, as.zoo(as.ts(zr2)))
324 R> Nile.na <- merge(as.zoo(Nile), zoo(, seq(start(Nile)[1], end(Nile)[1], 1/4)))
325 R> head(as.zoo(Nile))
428 R> window(z1, end = as.POSIXct("2004-02-01")) <- 9:5
586 R> MSFT <- as.zoo(MSFT)
594 R> MSFT <- as.zoo(MSFT)
[all …]
/dports/math/R-cran-xts/xts/inst/doc/
H A Dxts-faq.Rnw13 %\VignetteDepends{zoo}
90 sample.xts <- as.xts(do.call("rbind", lapply(filenames, read.zoo)))
97 \item \pkg{xts} is a subclass of \pkg{zoo}, and that's how \pkg{zoo} objects
119 sample.xts <- xts(c(1:3, 0, 0, 0), as.POSIXct("1970-01-01")+0:5)
130 sample.xts <- xts(1:10, seq(as.POSIXct("1970-01-01"), by=0.1, length=10))
152 dt <- as.POSIXct("2012-03-20 09:02:50.001")
173 sample.xts <- xts(1:50, seq(as.POSIXct("1970-01-01"),
174 as.POSIXct("1970-01-03")-1, length=50))
197 sample.xts <- xts(1:6, as.POSIXct(c("2009-09-22 07:43:30",
216 dispatched. The \pkg{zoo} method explicitly creates a new \pkg{zoo} object. To
[all …]
/dports/math/R-cran-xts/xts/vignettes/
H A Dxts-faq.Rnw13 %\VignetteDepends{zoo}
90 sample.xts <- as.xts(do.call("rbind", lapply(filenames, read.zoo)))
97 \item \pkg{xts} is a subclass of \pkg{zoo}, and that's how \pkg{zoo} objects
119 sample.xts <- xts(c(1:3, 0, 0, 0), as.POSIXct("1970-01-01")+0:5)
130 sample.xts <- xts(1:10, seq(as.POSIXct("1970-01-01"), by=0.1, length=10))
152 dt <- as.POSIXct("2012-03-20 09:02:50.001")
173 sample.xts <- xts(1:50, seq(as.POSIXct("1970-01-01"),
174 as.POSIXct("1970-01-03")-1, length=50))
197 sample.xts <- xts(1:6, as.POSIXct(c("2009-09-22 07:43:30",
216 dispatched. The \pkg{zoo} method explicitly creates a new \pkg{zoo} object. To
[all …]
/dports/math/R-cran-zoo/zoo/tests/Examples/
H A Dzoo-Ex.Rout.save604 > index(x) <- as.POSIXct(format(time(x)),tz="")
1308 > z <- zoo(1:9, as.POSIXct(c("2010-01-04 09:30:02", "2010-01-04 09:30:06",
1747 + FUN = paste, FUN2 = as.POSIXct) # explicit coercion
1809 > ##D ## same file format but read it in times as "POSIXct" class.
2453 > zp <- zoo(1:4, as.POSIXct("2000-01-01 00:00:00") + c(-3600, 0, 0.1, 3600))
2459 > window(zp, end = as.POSIXct("2000-01-01 00:00:00") + 0.5)
2725 > ### as.Date.numeric as.Date.ts as.Date.yearmon as.POSIXct.yearmon
2766 > as.POSIXct(x)
2867 > ### as.Date.yearqtr as.POSIXct.yearqtr as.POSIXlt.yearqtr as.list.yearqtr
2903 > as.POSIXct(x)
[all …]
/dports/math/R-cran-xts/xts/
H A DNAMESPACE190 S3method(align.time, POSIXct)
195 S3method(make.index.unique, POSIXct)
201 importFrom(zoo, index)
205 importFrom(zoo, as.zoo)
210 importFrom(zoo, as.yearmon)
211 importFrom(zoo, as.yearqtr)
213 importFrom(zoo, zoo)
279 #importFrom(zoo,as.zoo) # now in zoo
280 S3method(as.xts,zoo)
282 # xts:::as.zoo.xts was copied to zoo:::as.zoo.xts in zoo 1.8-5
[all …]
/dports/finance/R-cran-tseries/tseries/man/
H A Dget.hist.quote.Rd13 retclass = c("zoo", "ts"), quiet = FALSE, drop = FALSE)
21 \code{\link{as.POSIXct}}, which includes R POSIX date/time objects,
30 default provider, this can be specified as \code{"Open"},
47 should have: can be either \code{"zoo"} (with \code{"Date"} index),
55 A time series containing the data either as a \code{"zoo"} series
56 (default) or a \code{"ts"} series. The \code{"zoo"} series is created
57 with \code{\link[zoo]{zoo}} and has an index of class \code{"Date"}.
67 \code{\link[zoo]{zoo}},
69 \code{\link{as.Date}},
70 \code{\link{as.POSIXct}},
[all …]
H A Dirts.Rd4 \alias{as.irts}
5 \alias{as.irts.default}
6 \alias{as.irts.zoo}
12 \code{as.irts} coerces an object to an irregularly spaced
18 as.irts(object)
22 \item{time}{a numeric vector or a vector of class \code{"POSIXct"}
26 \code{\link{POSIXct}}.}
36 time-stamp of class \code{"POSIXct"}. Unlike objects of class
42 \item{time}{a vector of class \code{"POSIXct"}.}
50 \code{\link{POSIXct}},
[all …]
/dports/math/R-cran-zoo/zoo/
H A DNAMESPACE11 "as.zoo",
12 "as.zoo.default",
164 S3method("as.list", "zoo")
166 S3method("as.ts", "zoo")
300 S3method("as.POSIXct", "yearmon")
330 S3method("as.POSIXct", "yearqtr")
420 S3method("as.zoo", "fts")
422 S3method("as.zoo", "its")
425 S3method("as.zoo", "tis")
426 S3method("as.zoo", "ts")
[all …]
/dports/finance/R-cran-PerformanceAnalytics/PerformanceAnalytics/man/
H A DReturn.read.Rd21 \item "d" sets as a daily timeseries using \code{\link{as.Date}},
22 \item "m" sets as monthly timeseries using \code{\link[zoo]{as.yearmon}},
23 \item "q" sets as a quarterly timeseries using \code{\link[zoo]{as.yearqtr}}, and
24 \item "i" sets as irregular timeseries using \code{\link{as.POSIXct}}
28 default is set to the ISO 8601 standard (which can also be set as "%F"),
29 most spreadsheets have less sensible date formats as defaults. See below.}
34 of the variables as its first line.}
43 \code{\link[zoo]{read.zoo}}}
46 A simple wrapper of read.zoo with some defaults for different date formats
55 \item{...}{alternatively, any specific format may be passed in, such as "\%M/\%y"}
[all …]

123