[Yuima-commits] r584 - pkg/yuima/inst/ybook

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Thu Jan 26 16:51:13 CET 2017


Author: iacus
Date: 2017-01-26 16:51:12 +0100 (Thu, 26 Jan 2017)
New Revision: 584

Modified:
   pkg/yuima/inst/ybook/chapter1.R
   pkg/yuima/inst/ybook/chapter2.R
   pkg/yuima/inst/ybook/chapter3.R
   pkg/yuima/inst/ybook/chapter4.R
   pkg/yuima/inst/ybook/chapter5.R
   pkg/yuima/inst/ybook/chapter6.R
   pkg/yuima/inst/ybook/chapter7.R
Log:
updated R scripts

Modified: pkg/yuima/inst/ybook/chapter1.R
===================================================================
--- pkg/yuima/inst/ybook/chapter1.R	2017-01-26 05:55:35 UTC (rev 583)
+++ pkg/yuima/inst/ybook/chapter1.R	2017-01-26 15:51:12 UTC (rev 584)
@@ -1,53 +1,46 @@
-### R code from vignette source '/Users/jago/Dropbox (VOICES)/yuima-book/chapter1.Rnw'
+## ----include=FALSE-------------------------------------------------------
+library(knitr)
+opts_chunk$set(
+tidy=FALSE,
+width.cutoff = 60,
+strip.white=TRUE,
+warning=FALSE
+)
 
-###################################################
-### code chunk number 1: chapter1.Rnw:3-6
-###################################################
-options(width=60)
+## ----include=FALSE-------------------------------------------------------
+options(width=55)
 options(continue="  ")
 require(yuima)
 
+## ----eval=FALSE----------------------------------------------------------
+## ybook(1)
 
-###################################################
-### code chunk number 2: chapter1.Rnw:110-112
-###################################################
+## ----eval=FALSE----------------------------------------------------------
+## ybook(3)
+
+## ------------------------------------------------------------------------
 data(cars)
 class(cars)
 
-
-###################################################
-### code chunk number 3: chapter1.Rnw:115-118
-###################################################
+## ------------------------------------------------------------------------
 summary(cars)
 mod <- lm(dist~speed, data=cars)
 summary(mod)
 
-
-###################################################
-### code chunk number 4: chapter1.Rnw:121-122
-###################################################
+## ------------------------------------------------------------------------
 class(mod)
 
-
-###################################################
-### code chunk number 5: chapter1.Rnw:125-126
-###################################################
+## ------------------------------------------------------------------------
 methods(summary)
 
-
-###################################################
-### code chunk number 6: chapter1.Rnw:130-135
-###################################################
+## ------------------------------------------------------------------------
 x <- 1:4
 x
 class(x)
 class(x) <- "lm"
 class(x)
 
-
-###################################################
-### code chunk number 7: chapter1.Rnw:140-146
-###################################################
+## ------------------------------------------------------------------------
 require(stats4)
 set.seed(123)
 y <- rnorm(100, mean=1.5)
@@ -55,295 +48,195 @@
 fit <- mle(f)
 fit
 
-
-###################################################
-### code chunk number 8: chapter1.Rnw:149-150
-###################################################
+## ----results='hide'------------------------------------------------------
 str(fit)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(fit)),width=60))
 
-###################################################
-### code chunk number 9: chapter1.Rnw:153-154
-###################################################
+## ------------------------------------------------------------------------
 fit at coef
 
-
-###################################################
-### code chunk number 10: chapter1.Rnw:157-158
-###################################################
+## ------------------------------------------------------------------------
 showMethods(summary)
 
-
-###################################################
-### code chunk number 11: chapter1.Rnw:165-166 (eval = FALSE)
-###################################################
+## ----eval=FALSE----------------------------------------------------------
 ## install.packages("yuima")
 
-
-###################################################
-### code chunk number 12: chapter1.Rnw:176-177 (eval = FALSE)
-###################################################
+## ----eval=FALSE----------------------------------------------------------
 ## install.packages("yuima",repos="http://R-Forge.R-project.org")
 
-
-###################################################
-### code chunk number 13: chapter1.Rnw:181-183 (eval = FALSE)
-###################################################
-## install.packages("yuima",repos="http://R-Forge.R-project.org", 
+## ----eval=FALSE----------------------------------------------------------
+## install.packages("yuima",repos="http://R-Forge.R-project.org",
 ##   type="source")
 
-
-###################################################
-### code chunk number 14: chapter1.Rnw:188-189
-###################################################
+## ----echo=TRUE,eval=TRUE,results='markup',showWarnings=TRUE--------------
 library(yuima)
 
-
-###################################################
-### code chunk number 15: chapter1.Rnw:288-289
-###################################################
+## ----echo=TRUE,results='hide'--------------------------------------------
 mod1 <- setModel(drift = "-3*x", diffusion = "1/(1+x^2)")
 
-
-###################################################
-### code chunk number 16: chapter1.Rnw:295-296
-###################################################
+## ----results='hide'------------------------------------------------------
 str(mod1)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(mod1)),width=60))
 
-###################################################
-### code chunk number 17: chapter1.Rnw:302-303
-###################################################
+## ------------------------------------------------------------------------
 mod1
 
-
-###################################################
-### code chunk number 18: chapter1.Rnw:315-317
-###################################################
+## ----echo=TRUE,results='hide'--------------------------------------------
 mod1b <- setModel(drift = "-3*s*y", diffusion = "1/(1+y^2)", 
 state.var="y", time.var="s")
 
-
-###################################################
-### code chunk number 19: chapter1.Rnw:320-322
-###################################################
+## ------------------------------------------------------------------------
 tmp <- capture.output(str(mod1b))
-cat(tmp[c(2,3,4,17,19,23)],sep="\n")
+writeLines(strwrap(tmp[c(2,3,4,17,19,23)],width=60))
 
-
-###################################################
-### code chunk number 20: chapter1.Rnw:334-335
-###################################################
+## ----echo=TRUE,results='hide'--------------------------------------------
 mod2 <- setModel(drift = "-mu*x", diffusion = "1/(1+x^gamma)")
 
+## ------------------------------------------------------------------------
+tmp <- capture.output(str(mod2)) 
+writeLines(strwrap(tmp[c(2,3,4,9:13,17,19,23)],width=60))
 
-###################################################
-### code chunk number 21: chapter1.Rnw:340-342
-###################################################
-capture.output(str(mod2)) -> tmp
-cat(tmp[c(2,3,4,9:13,17,19,23)],sep="\n")
-
-
-###################################################
-### code chunk number 22: chapter1.Rnw:345-346
-###################################################
+## ------------------------------------------------------------------------
 mod2
 
-
-###################################################
-### code chunk number 23: sim-mod1
-###################################################
+## ----sim-mod1,echo=TRUE,results='hide'-----------------------------------
 set.seed(123)
 X <- simulate(mod1)
 
-
-###################################################
-### code chunk number 24: plot-mod1
-###################################################
+## ----plot-mod1,echo=TRUE,fig.keep='none',results='hide'------------------
 plot(X)
 
-
-###################################################
-### code chunk number 25: chapter1.Rnw:370-374
-###################################################
+## ----echo=FALSE,results='hide'-------------------------------------------
 pdf("figures/plot-mod1.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X)
 dev.off()
 
-
-###################################################
-### code chunk number 26: plot-mod1bis
-###################################################
+## ----plot-mod1bis,echo=TRUE,fig.keep='none',results='hide'---------------
 x0 <- 1
 set.seed(123)
 X <- simulate(mod1, xinit=x0)
 plot(X)
 
-
-###################################################
-### code chunk number 27: chapter1.Rnw:390-394
-###################################################
+## ----echo=FALSE,results='hide'-------------------------------------------
 pdf("figures/plot-mod1bis.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X)
 dev.off()
 
-
-###################################################
-### code chunk number 28: chapter1.Rnw:401-402
-###################################################
+## ----results='hide'------------------------------------------------------
 str(X at data,vec.len=2)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(X at data,vec.len=2)),width=60))
 
-###################################################
-### code chunk number 29: chapter1.Rnw:405-406
-###################################################
+## ------------------------------------------------------------------------
 str(X at sampling,vec.len=2)
 
-
-###################################################
-### code chunk number 30: chapter1.Rnw:411-413
-###################################################
+## ------------------------------------------------------------------------
 tmp <- capture.output(str(X))
-cat(tmp[c(14:16,29,31,35,36)],sep="\n")
+writeLines(strwrap(tmp[c(14:16,29,31,35,36)],width=60))
 
-
-###################################################
-### code chunk number 31: chapter1.Rnw:416-417
-###################################################
+## ------------------------------------------------------------------------
 X
 
-
-###################################################
-### code chunk number 32: plot-mod1ter
-###################################################
+## ----plot-mod1ter,echo=TRUE,fig.keep='none',results='hide'---------------
 x0 <- 1
 set.seed(123)
 X <- simulate(mod1, xinit=x0, Initial=0.5, Terminal=1.2)
 X
 plot(X)
 
-
-###################################################
-### code chunk number 33: chapter1.Rnw:428-432
-###################################################
+## ----echo=FALSE,results='hide'-------------------------------------------
 pdf("figures/plot-mod1ter.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X)
 dev.off()
 
-
-###################################################
-### code chunk number 34: chapter1.Rnw:439-440
-###################################################
+## ------------------------------------------------------------------------
 str(X at sampling,vec.len=2)
 
-
-###################################################
-### code chunk number 35: plot-mod1b
-###################################################
+## ----plot-mod1b,echo=TRUE,fig.keep='none',results='hide'-----------------
 set.seed(123)
 X <- simulate(mod1b, xinit=x0)
 X
 plot(X)
 
-
-###################################################
-### code chunk number 36: chapter1.Rnw:458-462
-###################################################
+## ----echo=FALSE,results='hide'-------------------------------------------
 pdf("figures/plot-mod1b.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X)
 dev.off()
 
-
-###################################################
-### code chunk number 37: sim-mod2
-###################################################
+## ----sim-mod2,echo=TRUE,fig.keep='none',results='hide'-------------------
 set.seed(123)
 X <- simulate(mod2,true.param=list(mu=1,gamma=3))
 plot(X)
 
-
-###################################################
-### code chunk number 38: plot-mod2
-###################################################
+## ----plot-mod2,echo=FALSE,results='hide'---------------------------------
 pdf("figures/plot-mod2.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X)
 dev.off()
 
-
-###################################################
-### code chunk number 39: setModel1
-###################################################
+## ------------------------------------------------------------------------
 sol <- c("x1","x2") # variable for numerical solution
-b <- c("-theta*x1","-x1-gamma*x2")   # drift vector 
-s <- matrix(c("1","x1","0","delta","x2","0"),2,3)  #  diffusion matrix
+b <- c("-theta*x1","-x1-gamma*x2") # drift vector 
+s <- matrix(c("1","x1","0","delta","x2","0"),2,3) # diff. mat.
 mymod <- setModel(drift = b, diffusion = s, solve.variable = sol)
 
-
-###################################################
-### code chunk number 40: chapter1.Rnw:551-552
-###################################################
+## ------------------------------------------------------------------------
 samp <- setSampling(Terminal=3, n=3000)
 
-
-###################################################
-### code chunk number 41: chapter1.Rnw:555-556
-###################################################
+## ----results='hide'------------------------------------------------------
 str(samp)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(samp)),width=60))
 
-###################################################
-### code chunk number 42: chapter1.Rnw:560-564
-###################################################
+## ------------------------------------------------------------------------
 set.seed(123)
 X2 <- simulate(mymod, sampling=samp, 
  true.param=list(theta=1,gamma=1,delta=1))
 X2
 
-
-###################################################
-### code chunk number 43: chapter1.Rnw:567-568
-###################################################
+## ----results='hide'------------------------------------------------------
 str(X2 at sampling)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(X2 at sampling)),width=60))
 
-###################################################
-### code chunk number 44: sub1
-###################################################
+## ----sub1----------------------------------------------------------------
 newsamp <- setSampling(
 random=list(rdist=c( function(x) rexp(x, rate=10), 
 function(x) rexp(x, rate=20))) )
+
+## ----results='hide'------------------------------------------------------
 str(newsamp)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(newsamp)),width=60))
 
-###################################################
-### code chunk number 45: sub2
-###################################################
+## ----sub2,echo=TRUE, fig.keep='none'-------------------------------------
 newdata <- subsampling(X2, sampling=newsamp)
 newdata
 plot(X2,plot.type="single", lty=c(1,3),ylab="X2")
 points(get.zoo.data(newdata)[[1]],col="red")
 points(get.zoo.data(newdata)[[2]],col="green",pch=18)
 
-
-###################################################
-### code chunk number 46: plot-sub2
-###################################################
+## ----plot-sub2,echo=FALSE, fig.keep='none',results='hide'----------------
 pdf("figures/plot-sub2.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X2,plot.type="single", lty=c(1,3),ylab="X2")
 points(get.zoo.data(newdata)[[1]],col="red")
 points(get.zoo.data(newdata)[[2]],col="green",pch=18)
 dev.off()
 
-
-###################################################
-### code chunk number 47: sub3
-###################################################
+## ----sub3,echo=TRUE, fig.keep='none'-------------------------------------
 newsamp <- setSampling(Terminal=3, delta=c(0.1,0.2), n=NULL)
 newsamp
 newdata <- subsampling(X2, sampling=newsamp)
@@ -352,27 +245,18 @@
 points(get.zoo.data(newdata)[[1]],col="red")
 points(get.zoo.data(newdata)[[2]],col="green", pch=18)
 
-
-###################################################
-### code chunk number 48: plot-sub3
-###################################################
+## ----plot-sub3,echo=FALSE, fig.keep='none',results='hide'----------------
 pdf("figures/plot-sub3.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(X2,plot.type="single", lty=c(1,3),ylab="X2")
 points(get.zoo.data(newdata)[[1]],col="red")
 points(get.zoo.data(newdata)[[2]],col="green", pch=18)
 dev.off()
 
-
-###################################################
-### code chunk number 49: chapter1.Rnw:629-630
-###################################################
+## ------------------------------------------------------------------------
 str(newdata at sampling)
 
-
-###################################################
-### code chunk number 50: sub4
-###################################################
+## ----sub4,fig.keep='none'------------------------------------------------
 set.seed(123)
 Y.sub <- simulate(mymod,sampling=setSampling(delta=0.001,n=1000),
  subsampling=setSampling(delta=0.01,n=100), 
@@ -384,256 +268,180 @@
 points(get.zoo.data(Y.sub)[[1]],col="red")
 points(get.zoo.data(Y.sub)[[2]],col="green",pch=18)
 
-
-###################################################
-### code chunk number 51: plot-sub4
-###################################################
+## ----plot-sub4,echo=FALSE, fig.keep='none',results='hide'----------------
 pdf("figures/plot-sub4.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(Y, plot.type="single")
 points(get.zoo.data(Y.sub)[[1]],col="red")
 points(get.zoo.data(Y.sub)[[2]],col="green",pch=18)
 dev.off()
 
-
-###################################################
-### code chunk number 52: sub5
-###################################################
+## ----sub5,fig.keep='none'------------------------------------------------
 plot(Y.sub, plot.type="single")
 
-
-###################################################
-### code chunk number 53: plot-sub5
-###################################################
+## ----plot-sub5,echo=FALSE, fig.keep='none',results='hide'----------------
 pdf("figures/plot-sub5.pdf",width=9,height=4)
-par(mar=c(4,4,0,0))
+par(mar=c(4,4,1,1))
 plot(Y.sub, plot.type="single")
 dev.off()
 
-
-###################################################
-### code chunk number 54: chapter1.Rnw:675-677
-###################################################
+## ------------------------------------------------------------------------
 Y
 Y.sub
 
-
-###################################################
-### code chunk number 55: chapter1.Rnw:681-682 (eval = FALSE)
-###################################################
+## ----eval=FALSE----------------------------------------------------------
 ## my.yuima <- setYuima(data=setData(X), model=mod)
 
-
-###################################################
-### code chunk number 56: chapter1.Rnw:688-690
-###################################################
+## ----echo=TRUE,results='hide',tidy=TRUE----------------------------------
 data <- read.csv("http://chart.yahoo.com/table.csv?s=IBM&g=d&x=.csv", 
  stringsAsFactor=FALSE)
 
-
-###################################################
-### code chunk number 57: chapter1.Rnw:694-695
-###################################################
+## ----echo=TRUE-----------------------------------------------------------
 head(data)
 
-
-###################################################
-### code chunk number 58: chapter1.Rnw:698-700
-###################################################
-tmp <- zoo(data$Close,order.by=as.Date(data$Date, format="%Y-%m-%d"))
+## ----results='hide',tidy=FALSE-------------------------------------------
+tmp <- zoo(data$Close, order.by=as.Date(data$Date, 
+ format="%Y-%m-%d"))
 str(tmp)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(tmp)),width=60))
 
-###################################################
-### code chunk number 59: chapter1.Rnw:704-706
-###################################################
+## ------------------------------------------------------------------------
 x <- setYuima(data=setData(tmp))
 str(x at data)
 
-
-###################################################
-### code chunk number 60: chapter1.Rnw:713-715
-###################################################
+## ------------------------------------------------------------------------
 y <- setYuima(data=setData(tmp, delta=1/252))
 str(y at data)
 
-
-###################################################
-### code chunk number 61: setData
-###################################################
+## ----setData,fig.keep='none'---------------------------------------------
 plot(x, main="data with the original time stamps")
 plot(y, main="time stamps of data rescaled")
 
-
-###################################################
-### code chunk number 62: plot-setData
-###################################################
+## ----plot-setData,echo=FALSE, fig.keep='none',results='hide'-------------
 pdf("figures/plot-setData.pdf",width=9,height=6)
-par(mar=c(4,4,2,0), mfrow=c(2,1))
+par(mar=c(4,4,2,1), mfrow=c(2,1))
 plot(x, main="data with the original time stamps")
 plot(y, main="time stamps of data rescaled")
 dev.off()
 
-
-###################################################
-### code chunk number 63: chapter1.Rnw:736-738
-###################################################
+## ------------------------------------------------------------------------
 x
 y
 
-
-###################################################
-### code chunk number 64: quantmod
-###################################################
+## ----quantmod,message=FALSE----------------------------------------------
 library(quantmod)
 getSymbols("IBM")
 attr(IBM, "src")
 
-
-###################################################
-### code chunk number 65: chapter1.Rnw:753-755
-###################################################
+## ------------------------------------------------------------------------
 getSymbols("IBM",src="google")
 attr(IBM, "src")
 
-
-###################################################
-### code chunk number 66: chapter1.Rnw:758-763
-###################################################
+## ------------------------------------------------------------------------
 getSymbols("DEXUSEU",src="FRED")
 attr(DEXUSEU, "src")
 getSymbols("EUR/USD",src="oanda")
 attr(EURUSD, "src")
 str(EURUSD)
 
-
-###################################################
-### code chunk number 67: chapter1.Rnw:768-771
-###################################################
+## ----results="hide",message=FALSE----------------------------------------
 require(fImport)
 X <- yahooSeries("IBM")
 str(X)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(X)),width=60))
 
-###################################################
-### code chunk number 68: chapter1.Rnw:774-776
-###################################################
+## ----results='hide'------------------------------------------------------
 X <- yahooImport("IBM")
 str(X)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(X)),width=60))
 
-###################################################
-### code chunk number 69: chapter1.Rnw:783-789
-###################################################
+## ----results='hide'------------------------------------------------------
 library(tseries)
 x <- get.hist.quote("IBM")
 str(x)
+
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(x)),width=60))
+
+## ----results='hide'------------------------------------------------------
 x <- get.hist.quote(instrument = "EUR/USD", provider = "oanda", 
  start = Sys.Date() - 300)
 str(x)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(x)),width=60))
 
-###################################################
-### code chunk number 70: chapter1.Rnw:801-803
-###################################################
+## ------------------------------------------------------------------------
 mydat <- get.zoo.data(y)[[1]]
 str(mydat)
 
+## ------------------------------------------------------------------------
+head(y at data@original.data)
 
-###################################################
-### code chunk number 71: chapter1.Rnw:806-808
-###################################################
+## ----results='hide'------------------------------------------------------
 str(y at data@original.data)
-head(y at data@original.data)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(str(y at data@original.data)),width=60))
 
-###################################################
-### code chunk number 72: chapter1.Rnw:826-829
-###################################################
+## ------------------------------------------------------------------------
 set.seed(123)
 some.data <- rnorm(12)
 str(some.data)
 
-
-###################################################
-### code chunk number 73: chapter1.Rnw:832-834
-###################################################
+## ------------------------------------------------------------------------
 X <- ts(some.data, frequency = 4, start = c(1961, 2))
 X
 
-
-###################################################
-### code chunk number 74: chapter1.Rnw:837-840
-###################################################
+## ------------------------------------------------------------------------
 set.seed(123)
 X <- ts(some.data, start = c(1964, 2), frequency = 12)
 X
 
-
-###################################################
-### code chunk number 75: chapter1.Rnw:845-850
-###################################################
+## ------------------------------------------------------------------------
 time(X)[1:12]
 deltat(X)
 start(X)
 end(X)
 frequency(X)
 
-
-###################################################
-### code chunk number 76: chapter1.Rnw:853-854
-###################################################
+## ------------------------------------------------------------------------
 window(X, frequency=4)
 
-
-###################################################
-### code chunk number 77: chapter1.Rnw:860-864
-###################################################
+## ------------------------------------------------------------------------
 require(zoo)
 X <- zoo( some.data )
 X
 str(X)
 
-
-###################################################
-### code chunk number 78: chapter1.Rnw:867-868
-###################################################
+## ------------------------------------------------------------------------
 index(X)
 
-
-###################################################
-### code chunk number 79: chapter1.Rnw:871-873
-###################################################
+## ------------------------------------------------------------------------
 rtimes <- cumsum(rexp(12,rate=0.2))
 rtimes
 
-
-###################################################
-### code chunk number 80: chapter1.Rnw:876-879
-###################################################
+## ------------------------------------------------------------------------
 X <- zoo( rnorm(12), order.by = rtimes)
 X
 str(X)
 
-
-###################################################
-### code chunk number 81: chapter1.Rnw:882-884
-###################################################
+## ------------------------------------------------------------------------
 Xreg <- zooreg(some.data, start = c(1964, 2),  frequency = 12)
 time(Xreg)[1:12]
 
-
-###################################################
-### code chunk number 82: chapter1.Rnw:887-890
-###################################################
+## ------------------------------------------------------------------------
 Y <- as.ts(X)
 time(X)
 time(Y)
 
-
-###################################################
-### code chunk number 83: chapter1.Rnw:894-900
-###################################################
+## ------------------------------------------------------------------------
 require(xts)
 my.time.stamps <- as.Date(rtimes)
 my.time.stamps
@@ -641,10 +449,7 @@
 X
 str(X)
 
-
-###################################################
-### code chunk number 84: chapter1.Rnw:905-911
-###################################################
+## ------------------------------------------------------------------------
 X.ts <- ts(some.data, start = c(1964, 2), frequency = 12)
 X.ts
 X.zoo <- as.zoo(X.ts)
@@ -652,69 +457,45 @@
 X.xts <- as.xts(X.ts)
 X.xts
 
-
-###################################################
-### code chunk number 85: xts
-###################################################
+## ----xts,fig.keep='none'-------------------------------------------------
 plot(X)
 
-
-###################################################
-### code chunk number 86: chapter1.Rnw:919-923
-###################################################
+## ----echo=FALSE,results='hide'-------------------------------------------
 pdf("figures/plot-xts.pdf",width=9,height=4)
-par(mar=c(4,4,2,0))
+par(mar=c(4,4,2,1))
 plot(X)
 dev.off()
 
-
-###################################################
-### code chunk number 87: chapter1.Rnw:936-940
-###################################################
+## ------------------------------------------------------------------------
 require(tseries)
 X <- irts( rtimes, some.data)
 X
 str(X)
 
-
-###################################################
-### code chunk number 88: chapter1.Rnw:946-950
-###################################################
+## ------------------------------------------------------------------------
 require(timeSeries)
 X <- timeSeries( some.data,  my.time.stamps)
 X
 str(X)
 
-
-###################################################
-### code chunk number 89: chapter1.Rnw:959-961
-###################################################
+## ------------------------------------------------------------------------
 d <- ISOdate(2008,7,3)
 d
 
-
-###################################################
-### code chunk number 90: chapter1.Rnw:964-965
-###################################################
+## ----results='hide'------------------------------------------------------
 args(ISOdate)
 
+## ----echo=FALSE----------------------------------------------------------
+writeLines(strwrap(capture.output(args(ISOdate)),width=60))
 
-###################################################
-### code chunk number 91: chapter1.Rnw:969-970
-###################################################
+## ------------------------------------------------------------------------
 class(d)
 
-
-###################################################
-### code chunk number 92: chapter1.Rnw:973-975
-###################################################
+## ------------------------------------------------------------------------
 names(as.POSIXlt(d))
 unlist(as.POSIXlt(d))
 
-
-###################################################
-### code chunk number 93: chapter1.Rnw:979-993
-###################################################
+## ------------------------------------------------------------------------
 format(d,"%a") # week day
 format(d,"%A")
 
@@ -730,94 +511,58 @@
 format(d,"%A   %d/%m/%Y")
 format(d,"%d/%m/%Y (%A)")
 
-
-###################################################
-### code chunk number 94: chapter1.Rnw:997-999
-###################################################
+## ------------------------------------------------------------------------
 x <- c("10jan1962", "2feb1970", "11jul2011", "27jun1968")
 strptime(x, "%d%b%Y")
 
-
-###################################################
-### code chunk number 95: chapter1.Rnw:1002-1007
-###################################################
+## ------------------------------------------------------------------------
 Sys.getlocale()
 Sys.setlocale("LC_ALL", "it_it")
 strptime(x, "%d%b%Y")
 Sys.setlocale("LC_ALL", "en_GB")
 strptime(x, "%d%b%Y")
 
-
-###################################################
-### code chunk number 96: chapter1.Rnw:1010-1012
-###################################################
+## ------------------------------------------------------------------------
 format(ISOdate(2006,6,9),"%H:%M:%S")
 format(as.POSIXct("2006-06-09"),"%H:%M:%S")
 
-
-###################################################
-### code chunk number 97: chapter1.Rnw:1016-1018
-###################################################
+## ------------------------------------------------------------------------
 holidayNYSE()
 holidayNERC()
 
-
-###################################################
-### code chunk number 98: chapter1.Rnw:1021-1022
-###################################################
+## ------------------------------------------------------------------------
 ISOdate(2006,7,10) - ISOdate(2005, 3, 1)
 
-
-###################################################
-### code chunk number 99: chapter1.Rnw:1025-1027
-###################################################
+## ------------------------------------------------------------------------
 my.dates <- timeDate(c("2001-01-09", "2001-02-25")) 
 diff(my.dates)
 
+## ------------------------------------------------------------------------
+listFinCenter("America*")[1:50]
 
-###################################################
-### code chunk number 100: chapter1.Rnw:1030-1031
-###################################################
[TRUNCATED]

To get the complete diff run:
    svnlook diff /svnroot/yuima -r 584


More information about the Yuima-commits mailing list