Home
last modified time | relevance | path

Searched +refs:frequency +refs:zoo (Results 1 – 25 of 328) sorted by relevance

12345678910>>...14

/dports/math/R-cran-zoo/zoo/R/
H A Das.zoo.R8 zoo(structure(x, dim = dim(x)), index(x), ...)
13 zoo(x, ...)
18 zoo(x, ...)
23 zoo(as.matrix(x), ...)
28 zoo(as.matrix(x), attr(x, "dates"))
33 zoo(x$value, x$time, ...)
40 zoo(x, index, ...)
50 zoo(as.matrix(x), timeSeries::time(x), ...)
58 zoo(y, order.by = index(x), ...)
156 xx <- merge(zoo(coredata(x), tt), zoo(, tt2))
[all …]
H A Daggregate.zoo.R1 aggregate.zoo <- function(x, by, FUN = sum, ..., regular = NULL, frequency = NULL, coredata = TRUE) argument
13 if(is.null(frequency)) {
40 rval <- zoo(df, ix[!is.na(ix)])
43 freq <- ifelse(is.null(frequency), frequency(rval), frequency)
44 rval <- zoo(df, ix, freq)
56 function(ind) zoo(xc[ind], ix[ind]))
59 function(ind) zoo(xc[ind, , drop = drop], ix[ind]))
H A Dzoo.R1 zoo <- function (x = NULL, order.by = index(x), frequency = NULL, function
35 if(frequency > 1 && identical(all.equal(frequency, round(frequency)), TRUE))
36 frequency <- round(frequency)
40 order.by <- floor(frequency * order.by + .0001)/frequency
129 i <- which(coredata(merge(zoo(,time(x)), i)))
138 rval <- zoo(rval, index(x)[i])
140 rval <- zoo(rval[i], index(x)[i])
198 zoo(value2a, i2)
230 if(is.plain(value)) value <- zoo(value,
334 zoo(coredata(x), time(x)[ix])
[all …]
H A Das.zoo.tis.R5 zoo(tis::stripTis(x), time(tis::ti(x), offset = 0))
8zoo(tis::stripTis(x), do.call(asFun, list(tis::POSIXct(tis::ti(x), offset = 0, tz = "GMT"))), ...)
12 as.zooreg.tis <- function(x, frequency = NULL, class = "ti", ...) { argument
14 else as.zooreg(as.zoo(x, class = class, ...), frequency = frequency)
H A Dmerge.zoo.R55 rval <- zoo(do.call("rbind", argsdata), indexes)
57 rval <- zoo(do.call("c", argsdata), indexes)
61 freq <- c(frequency(rval), unlist(sapply(args, frequency)))
115 freq <- unlist(sapply(args, frequency))
197 freq <- c(frequency(zoo(,indexes)), freq)
213 rval <- zoo(, indexes)
226 z <- zoo(z, indexes)
245 rval <- if(ret.zoo) zoo(, indexes) else numeric()
285 charindex <- index2char(index(rval[[1]]), frequency = freq)
317 rval <- zoo(coredata(rval), indexes)
[all …]
/dports/math/R-cran-zoo/zoo/man/
H A Dzooreg.Rd3 \alias{frequency.zooreg}
4 \alias{frequency.zoo}
50 \code{end} are ignored and \code{zoo(data, order.by, frequency)} is
60 underlying frequency associated with them.
76 \code{\link{zoo}} is called with \code{zoo(data, order.by, frequency)}. It
78 It is essentially a \code{"zoo"} series with an additional \code{"frequency"}
113 It is essentially a \code{"zoo"} series with a \code{"frequency"}
123 as.zoo(ts(1:10, frequency = 4, start = c(1959, 2)))
124 zoo(1:10, seq(1959.25, 1961.5, by = 0.25), frequency = 4)
127 z <- zoo(1:10, yearqtr(seq(1959.25, 1961.5, by = 0.25)), frequency = 4)
[all …]
H A Dis.regular.Rd3 \alias{is.regular.zoo}
42 \seealso{\code{\link{zooreg}}, \code{\link{zoo}}}
45 ## checking of a strictly regular zoo series
46 z <- zoo(1:10, seq(2000, 2002.25, by = 0.25), frequency = 4)
49 frequency(z) ## extraction of frequency attribute
56 ## checking of a plain zoo series without frequency attribute
58 z <- zoo(1:10, seq(2000, 2002.25, by = 0.25))
61 frequency(z) ## data driven computation of frequency
71 ## checking of an irregular zoo series
72 z <- zoo(1:10, rnorm(10))
[all …]
H A Daggregate.zoo.Rd2 \name{aggregate.zoo}
3 \alias{aggregate.zoo}
4 \alias{split.zoo}
14 regular = NULL, frequency = NULL, coredata = TRUE)
30 \item{frequency}{numeric indicating the frequency of the aggregated series
32 determine the frequency from the data if \code{regular} is \code{TRUE}.
33 If \code{frequency} is specified, it sets \code{regular} to \code{TRUE}.
73 # create zoo series
100 # the frequency can be automatically chosen
103 zr.qtr2 <- aggregate(z.day, as.yearqtr, mean, frequency = 4)
[all …]
H A Dfrequency.Rd1 \name{frequency<-}
2 \alias{frequency<-}
3 \alias{frequency<-.zoo}
4 \alias{frequency<-.zooreg}
7 Generic function for replacing the frequency of an object.
10 frequency(x) <- value
14 \item{value}{a frequency.}
18 \code{frequency<-} is a generic function for replacing (or assigning)
20 a \code{"zoo"} method. In both cases, the \code{value} is assigned
21 to the \code{"frequency"} of the object if it complies with the
[all …]
H A Dzoo.Rd1 \name{zoo}
2 \alias{zoo}
3 \alias{with.zoo}
10 \alias{[.zoo}
54 zoo(x = NULL, order.by = index(x), frequency = NULL,
63 \item{frequency}{numeric indicating frequency of \code{order.by}.
64 If specified, it is checked whether \code{order.by} and \code{frequency}
68 \item{calendar}{logical. If \code{frequency} is specified and is 4 or 12:
94 series with a certain \code{frequency}).
128 If a \code{frequency} is specified when creating a series via \code{zoo}, the
[all …]
H A Dmerge.zoo.Rd1 \name{merge.zoo}
2 \alias{merge.zoo}
3 \alias{rbind.zoo}
4 \alias{c.zoo}
5 \alias{cbind.zoo}
59 If \code{retclass} is \code{"zoo"} (the default) a single merged \code{"zoo"}
78 An object of class \code{"zoo"} if \code{retclass="zoo"}, an object of
81 of class \code{"zoo"} then its frequency is the common frequency of its
82 zoo arguments, if they have a common frequency.
111 z0 <- zoo(, 1:4)
[all …]
/dports/math/R-cran-quantreg/quantreg/R/
H A Ddynrq.R23 freq <- frequency(x)
40 frequency(x)
47 rval <- zoo::zoo(seq_along(zoo::index(x))/freq, zoo::index(x), frequency = ofreq) functionVar
143 rownames(mf) <- zoo::index2char(zoo::index(mf1), frequency(mf1))
205 rval$frequency <- frequency(mf1)
231 cat(paste("Start = ", zoo::index2char(zoo::index(rx)[1], x$frequency),
232 ", End = ", zoo::index2char(zoo::index(rx)[length(rx)], x$frequency), "\n", sep = ""))
239 cat(paste("Start = ", zoo::index2char(ix[1], x$frequency),
240 ", End = ", zoo::index2char(ix[length(ix)], x$frequency), "\n", sep = ""))
255 cat(paste("Start = ", zoo::index2char(zoo::index(rx)[1], x$frequency),
[all …]
/dports/math/R-cran-forecast/forecast/R/
H A Dcalendar.R42 freq <- frequency(x)
58 date <- zoo::as.Date(time(x))
66 date <- zoo::as.Date(time(x))
72 bizdays <- format(zoo::as.yearqtr(biz), format = "%Y Qtr%q")
83 out <- ts(num.days, start = tsp(x)[1L], frequency = freq)
117 freq <- frequency(x)
118 date <- zoo::as.Date(time(x))
135 yr.mon <- format(zoo::as.yearqtr(date), format = fmat) # yr.qtr
136 gd.fri <- format(zoo::as.yearqtr(gd.fri0), format = fmat)
137 easter <- format(zoo::as.yearqtr(easter0), format = fmat)
[all …]
/dports/math/R-cran-zoo/zoo/
H A DNAMESPACE9 "zoo",
11 "as.zoo",
16 "is.zoo",
18 "read.zoo",
30 "rev.zoo",
46 "frequency<-",
183 S3method("frequency", "zoo")
184 S3method("frequency<-", "zoo")
246 S3method("frequency", "zooreg")
247 S3method("frequency<-", "zooreg")
[all …]
/dports/math/R-cran-zoo/zoo/vignettes/
H A Dzoo-refcard-raw.tex3 \code{zoo(x, order.by)} & creation of a \code{"zoo"} object
14 \code{zoo(x, order.by, freq)} & works as above but creates a \code{"zooreg"}
15 object which inherits from \code{"zoo"} if the frequency \code{freq} complies
24 \code{lines} & adding a \code{"zoo"} series to a plot \\
27 \code{str} & displaying structure of \code{"zoo"} objects \\
31 \code{as.zoo} & coercion to \code{"zoo"} is available for objects
34 \code{as.}\textit{class}\code{.zoo} & coercion from \code{"zoo"} to
38 \code{is.zoo} & querying wether an object is of class \code{"zoo"} \\[0.5cm]
64 \code{window, window<-} & subsetting of \code{"zoo"} objects
82 \code{frequency}, \code{deltat} & extracts the frequency or its reciprocal value
[all …]
H A Dzoo.Rnw302 to be able to convert back and forth between \code{"ts"} and \code{"zoo"}, the frequency
309 from class \code{"zoo"} but have an additional attribute \code{"frequency"} in which
317 zoo(x, order.by, frequency)
318 zooreg(data, start, end, frequency, deltat, ts.eps, order.by)
322 \code{frequency} argument, it is checked whether \code{frequency} complies
326 is specified in the \code{zooreg()} call, then \code{zoo(x, order.by, frequency)}
331 the index must be expressable as multiples of 1/frequency.
343 zr1 <- zooreg(sin(1:9), start = 2000, frequency = 4)
359 frequency(zr1)
388 frequency(zr1)
[all …]
/dports/math/R-cran-zoo/zoo/inst/doc/
H A Dzoo.R29 z1 <- zoo(z1.data, z1.index)
38 z2 <- zoo(z2.data, z2.index)
47 Z <- zoo(Z.data, Z.index)
80 zr1 <- zooreg(sin(1:9), start = 2000, frequency = 4)
81 zr2 <- zoo(sin(1:9), seq(2000, 2002, by = 1/4), 4)
92 frequency(zr1)
115 frequency(zr1)
199 zoo(, seq(start(Nile)[1], end(Nile)[1], 1/4)))
361 z2td <- zoo(coredata(z2), timeDate(index(z2), FinCenter = "GMT"))
368 zr3 <- zooreg(rnorm(9), start = as.yearmon(2000), frequency = 12)
H A Dzoo.Rnw302 to be able to convert back and forth between \code{"ts"} and \code{"zoo"}, the frequency
309 from class \code{"zoo"} but have an additional attribute \code{"frequency"} in which
317 zoo(x, order.by, frequency)
318 zooreg(data, start, end, frequency, deltat, ts.eps, order.by)
322 \code{frequency} argument, it is checked whether \code{frequency} complies
326 is specified in the \code{zooreg()} call, then \code{zoo(x, order.by, frequency)}
331 the index must be expressable as multiples of 1/frequency.
343 zr1 <- zooreg(sin(1:9), start = 2000, frequency = 4)
359 frequency(zr1)
388 frequency(zr1)
[all …]
/dports/math/R-cran-zoo/zoo/tests/
H A Dvignette-zoo.R27 z1 <- zoo(z1.data, z1.index)
35 z2 <- zoo(z2.data, z2.index)
44 Z <- zoo(Z.data, Z.index)
77 zr1 <- zooreg(sin(1:9), start = 2000, frequency = 4)
78 zr2 <- zoo(sin(1:9), seq(2000, 2002, by = 1/4), 4)
89 frequency(zr1)
112 frequency(zr1)
193 Nile.na <- merge(as.zoo(Nile), zoo(, seq(start(Nile)[1], end(Nile)[1], 1/4)))
354 z2td <- zoo(coredata(z2), timeDate(index(z2), FinCenter = "GMT"))
361 zr3 <- zooreg(rnorm(9), start = as.yearmon(2000), frequency = 12)
H A Dvignette-zoo.Rout.save21 > library("zoo")
23 Attaching package: 'zoo'
43 R> library("zoo")
139 R> zr1 <- zooreg(sin(1:9), start = 2000, frequency = 4)
161 [1] "zooreg" "zoo"
162 R> frequency(zr1)
186 R> zr1 <- as.zoo(zr1)
191 [1] "zoo"
194 R> frequency(zr1)
325 R> head(as.zoo(Nile))
[all …]
/dports/math/R-cran-zoo/zoo/tests/Examples/
H A Dzoo-Ex.Rout.save447 > ### Aliases: frequency<- frequency<-.zoo frequency<-.zooreg
647 > z <- zoo(1:10, seq(2000, 2002.25, by = 0.25), frequency = 4)
653 > frequency(z) ## extraction of frequency attribute
665 > ## checking of a plain zoo series without frequency attribute
673 > frequency(z) ## data driven computation of frequency
2796 > z <- zoo(rnorm(24), x, frequency = 12)
2910 > zz <- zoo(rnorm(8), x, frequency = 4)
3156 > ### Aliases: zooreg frequency.zooreg frequency.zoo deltat.zooreg deltat.zoo
3169 > as.zoo(ts(1:10, frequency = 4, start = c(1959, 2)))
3172 > zoo(1:10, seq(1959.25, 1961.5, by = 0.25), frequency = 4)
[all …]
/dports/math/R-cran-xts/xts/R/
H A Dzoo.R28 xx <- zoo(xx,
41 function(x,order.by=index(x),frequency=NULL,...,.RECLASS=FALSE) { argument
45 frequency=frequency,
51 frequency=frequency,
71 zoo(cd,
/dports/finance/R-cran-PerformanceAnalytics/PerformanceAnalytics/man/
H A DReturn.read.Rd9 frequency = c("d", "m", "q", "i", "o"),
20 \item{frequency}{\itemize{
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
43 \code{\link[zoo]{read.zoo}}}
46 A simple wrapper of read.zoo with some defaults for different date formats
61 Return.read("managers.cvs", frequency="d")
66 \code{\link[zoo]{read.zoo}}, \code{\link[utils]{read.table}}
/dports/math/R-cran-xts/xts/man/
H A Das.xts.methods.Rd6 \alias{as.xts.zoo}
25 \method{as.xts}{zoo}(x, order.by=index(x), frequency=NULL, ..., .RECLASS=FALSE)
30 frequency=NULL, ...,.RECLASS=FALSE)
33 frequency=NULL, ..., .RECLASS=FALSE)
45 \item{order.by}{see zoo help}
46 \item{frequency}{see zoo help}
56 \code{matrix}, \code{data.frame}, and \code{zoo}.
65 zoo and xts compatible methods. A call to \code{reclass}
/dports/math/R-cran-zoo/zoo/inst/
H A DWISHLIST4 o within.zoo
17 using zoo objects with DBI
22 o provide a [<-.zoo method that is fully consistent with [.zoo
29 zoo methods
31 o allow plot.zoo to accept a list of zoo objects -- this would
52 xz <- as.zoo(x)
55 x[(i - tsp(x)[1])*frequency(x) + 1] <- 0
64 o zoo()
65 - support zoo data.frame objects (and zoo list objects)
69 but a list with slots "coredata", "index" and "frequency".
[all …]

12345678910>>...14