Last updated on 2020-02-19 14:48:34 CET.
Flavor | Version | Tinstall | Tcheck | Ttotal | Status | Flags |
---|---|---|---|---|---|---|
r-devel-linux-x86_64-debian-clang | 0.4.2 | 14.90 | 109.40 | 124.30 | ERROR | --no-vignettes |
r-devel-linux-x86_64-debian-gcc | 0.4.2 | 11.26 | 79.90 | 91.16 | ERROR | --no-vignettes |
r-devel-linux-x86_64-fedora-clang | 0.4.2 | 495.19 | ERROR | |||
r-devel-linux-x86_64-fedora-gcc | 0.4.2 | 450.60 | ERROR | |||
r-devel-windows-ix86+x86_64 | 0.4.2 | 25.00 | 1039.00 | 1064.00 | OK | |
r-devel-windows-ix86+x86_64-gcc8 | 0.4.2 | 43.00 | 904.00 | 947.00 | OK | |
r-patched-linux-x86_64 | 0.4.2 | 10.94 | 114.84 | 125.78 | OK | --no-vignettes |
r-patched-solaris-x86 | 0.4.2 | 874.10 | OK | |||
r-release-linux-x86_64 | 0.4.2 | 11.49 | 115.38 | 126.87 | OK | --no-vignettes |
r-release-windows-ix86+x86_64 | 0.4.2 | 23.00 | 519.00 | 542.00 | OK | |
r-release-osx-x86_64 | 0.4.2 | OK | ||||
r-oldrel-windows-ix86+x86_64 | 0.4.2 | 15.00 | 599.00 | 614.00 | OK | |
r-oldrel-osx-x86_64 | 0.4.2 | OK |
Version: 0.4.2
Flags: --no-vignettes
Check: examples
Result: ERROR
Running examples in 'tvReg-Ex.R' failed
The error most likely occurred in:
> base::assign(".ptime", proc.time(), pos = "CheckExEnv")
> ### Name: forecast
> ### Title: Forecast Methods for Objects in tvReg.
> ### Aliases: forecast forecast.tvlm forecast.tvar forecast.tvvar
> ### forecast.tvsure
>
> ### ** Examples
>
> data("RV")
> RV2 <- head(RV, 2001)
> tvHAR <- tvLM (RV ~ RV_lag + RV_week + RV_month, data = RV2, bw = 20)
> newx <- cbind(RV$RV_lag[2002:2004], RV$RV_week[2002:2004],
+ RV$RV_month[2002:2004])
> forecast(tvHAR, newx, n.ahead = 3)
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
tvReg
--- call from context ---
forecast.tvlm(tvHAR, newx, n.ahead = 3)
--- call from argument ---
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
--- R stacktrace ---
where 1: forecast.tvlm(tvHAR, newx, n.ahead = 3)
where 2: forecast(tvHAR, newx, n.ahead = 3)
--- value of length: 2 type: logical ---
[1] FALSE FALSE
--- function from context ---
function (object, newx, n.ahead = 1, winsize = 0, ...)
{
if (!inherits(object, c("tvlm")))
stop("\nParameter 'object' should be entered and it should have class 'tvlm' or 'tvar'.\n")
if (!is.null(object$z))
stop("\nYour model coefficients are functions of a random variable 'z', use function \n 'predict' with parameter 'newz'.\n")
if (!inherits(newx, c("data.frame", "matrix", "numeric",
"vector")))
stop("\nParameter 'newx' should be entered and it should be a numeric vector if there is only\n one row or a 'matrix' or a 'data.frame' for more than one row.\n")
if (n.ahead == 1)
newx <- matrix(newx, ncol = length(newx))
if (NROW(newx) != n.ahead)
stop("\nDimensions of 'newx' are not compatible with 'n.ahead'.\n")
n.col <- NCOL(newx)
is.intercept <- ("(Intercept)" %in% colnames(object$x))
if (is.intercept & n.col == (NCOL(object$x) - 1))
newx <- cbind(rep(1, n.ahead), newx)
obs <- object$obs
is.rw <- !(winsize == 0)
if (winsize > obs | winsize < 0)
winsize <- obs - 1
prediction <- numeric(n.ahead)
tobs <- obs + n.ahead
grid <- (1:tobs)/tobs
X <- object$x
Y <- object$y
for (t in 1:n.ahead) {
i <- ifelse(is.rw, obs - winsize, 1)
object$x <- X[i:(obs + t - 1), ]
object$y <- Y[i:(obs + t - 1)]
object$z <- grid[i:(obs + t - 1)]
object$ez <- grid[obs + t]
beta <- try(tvOLS(object)$tvcoef)
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
prediction[t] <- beta %*% newx[t, ]
X <- rbind(X, newx[t, ])
Y <- c(Y, prediction[t])
}
return(prediction)
}
<bytecode: 0x7af2048>
<environment: namespace:tvReg>
--- function search by body ---
Function forecast.tvlm in namespace tvReg has this body.
----------- END OF FAILURE REPORT --------------
Error in if (class(beta) == "try-error") { : the condition has length > 1
Calls: forecast -> forecast.tvlm
Execution halted
Flavor: r-devel-linux-x86_64-debian-clang
Version: 0.4.2
Flags: --no-vignettes
Check: examples
Result: ERROR
Running examples in ‘tvReg-Ex.R’ failed
The error most likely occurred in:
> base::assign(".ptime", proc.time(), pos = "CheckExEnv")
> ### Name: forecast
> ### Title: Forecast Methods for Objects in tvReg.
> ### Aliases: forecast forecast.tvlm forecast.tvar forecast.tvvar
> ### forecast.tvsure
>
> ### ** Examples
>
> data("RV")
> RV2 <- head(RV, 2001)
> tvHAR <- tvLM (RV ~ RV_lag + RV_week + RV_month, data = RV2, bw = 20)
> newx <- cbind(RV$RV_lag[2002:2004], RV$RV_week[2002:2004],
+ RV$RV_month[2002:2004])
> forecast(tvHAR, newx, n.ahead = 3)
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
tvReg
--- call from context ---
forecast.tvlm(tvHAR, newx, n.ahead = 3)
--- call from argument ---
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
--- R stacktrace ---
where 1: forecast.tvlm(tvHAR, newx, n.ahead = 3)
where 2: forecast(tvHAR, newx, n.ahead = 3)
--- value of length: 2 type: logical ---
[1] FALSE FALSE
--- function from context ---
function (object, newx, n.ahead = 1, winsize = 0, ...)
{
if (!inherits(object, c("tvlm")))
stop("\nParameter 'object' should be entered and it should have class 'tvlm' or 'tvar'.\n")
if (!is.null(object$z))
stop("\nYour model coefficients are functions of a random variable 'z', use function \n 'predict' with parameter 'newz'.\n")
if (!inherits(newx, c("data.frame", "matrix", "numeric",
"vector")))
stop("\nParameter 'newx' should be entered and it should be a numeric vector if there is only\n one row or a 'matrix' or a 'data.frame' for more than one row.\n")
if (n.ahead == 1)
newx <- matrix(newx, ncol = length(newx))
if (NROW(newx) != n.ahead)
stop("\nDimensions of 'newx' are not compatible with 'n.ahead'.\n")
n.col <- NCOL(newx)
is.intercept <- ("(Intercept)" %in% colnames(object$x))
if (is.intercept & n.col == (NCOL(object$x) - 1))
newx <- cbind(rep(1, n.ahead), newx)
obs <- object$obs
is.rw <- !(winsize == 0)
if (winsize > obs | winsize < 0)
winsize <- obs - 1
prediction <- numeric(n.ahead)
tobs <- obs + n.ahead
grid <- (1:tobs)/tobs
X <- object$x
Y <- object$y
for (t in 1:n.ahead) {
i <- ifelse(is.rw, obs - winsize, 1)
object$x <- X[i:(obs + t - 1), ]
object$y <- Y[i:(obs + t - 1)]
object$z <- grid[i:(obs + t - 1)]
object$ez <- grid[obs + t]
beta <- try(tvOLS(object)$tvcoef)
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
prediction[t] <- beta %*% newx[t, ]
X <- rbind(X, newx[t, ])
Y <- c(Y, prediction[t])
}
return(prediction)
}
<bytecode: 0x562642934ee0>
<environment: namespace:tvReg>
--- function search by body ---
Function forecast.tvlm in namespace tvReg has this body.
----------- END OF FAILURE REPORT --------------
Error in if (class(beta) == "try-error") { : the condition has length > 1
Calls: forecast -> forecast.tvlm
Execution halted
Flavor: r-devel-linux-x86_64-debian-gcc
Version: 0.4.2
Check: examples
Result: ERROR
Running examples in ‘tvReg-Ex.R’ failed
The error most likely occurred in:
> ### Name: forecast
> ### Title: Forecast Methods for Objects in tvReg.
> ### Aliases: forecast forecast.tvlm forecast.tvar forecast.tvvar
> ### forecast.tvsure
>
> ### ** Examples
>
> data("RV")
> RV2 <- head(RV, 2001)
> tvHAR <- tvLM (RV ~ RV_lag + RV_week + RV_month, data = RV2, bw = 20)
> newx <- cbind(RV$RV_lag[2002:2004], RV$RV_week[2002:2004],
+ RV$RV_month[2002:2004])
> forecast(tvHAR, newx, n.ahead = 3)
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
tvReg
--- call from context ---
forecast.tvlm(tvHAR, newx, n.ahead = 3)
--- call from argument ---
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
--- R stacktrace ---
where 1: forecast.tvlm(tvHAR, newx, n.ahead = 3)
where 2: forecast(tvHAR, newx, n.ahead = 3)
--- value of length: 2 type: logical ---
[1] FALSE FALSE
--- function from context ---
function (object, newx, n.ahead = 1, winsize = 0, ...)
{
if (!inherits(object, c("tvlm")))
stop("\nParameter 'object' should be entered and it should have class 'tvlm' or 'tvar'.\n")
if (!is.null(object$z))
stop("\nYour model coefficients are functions of a random variable 'z', use function \n 'predict' with parameter 'newz'.\n")
if (!inherits(newx, c("data.frame", "matrix", "numeric",
"vector")))
stop("\nParameter 'newx' should be entered and it should be a numeric vector if there is only\n one row or a 'matrix' or a 'data.frame' for more than one row.\n")
if (n.ahead == 1)
newx <- matrix(newx, ncol = length(newx))
if (NROW(newx) != n.ahead)
stop("\nDimensions of 'newx' are not compatible with 'n.ahead'.\n")
n.col <- NCOL(newx)
is.intercept <- ("(Intercept)" %in% colnames(object$x))
if (is.intercept & n.col == (NCOL(object$x) - 1))
newx <- cbind(rep(1, n.ahead), newx)
obs <- object$obs
is.rw <- !(winsize == 0)
if (winsize > obs | winsize < 0)
winsize <- obs - 1
prediction <- numeric(n.ahead)
tobs <- obs + n.ahead
grid <- (1:tobs)/tobs
X <- object$x
Y <- object$y
for (t in 1:n.ahead) {
i <- ifelse(is.rw, obs - winsize, 1)
object$x <- X[i:(obs + t - 1), ]
object$y <- Y[i:(obs + t - 1)]
object$z <- grid[i:(obs + t - 1)]
object$ez <- grid[obs + t]
beta <- try(tvOLS(object)$tvcoef)
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
prediction[t] <- beta %*% newx[t, ]
X <- rbind(X, newx[t, ])
Y <- c(Y, prediction[t])
}
return(prediction)
}
<bytecode: 0x71735d8>
<environment: namespace:tvReg>
--- function search by body ---
Function forecast.tvlm in namespace tvReg has this body.
----------- END OF FAILURE REPORT --------------
Error in if (class(beta) == "try-error") { : the condition has length > 1
Calls: forecast -> forecast.tvlm
Execution halted
Flavor: r-devel-linux-x86_64-fedora-clang
Version: 0.4.2
Check: re-building of vignette outputs
Result: WARN
Error(s) in re-building vignettes:
--- re-building ‘tvReg.Rmd’ using rmarkdown
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
tvReg
--- call from context ---
tvPsi(x, nstep = n.ahead, ortho.cov, bw.cov = bw.cov)
--- call from argument ---
if (class(P) != "matrix") {
Sigma.hat[, , t] <- as.matrix(nearPD(Sigma.hat[, , t])$mat)
P <- try(chol(Sigma.hat[, , t]), silent = T)
}
--- R stacktrace ---
where 1: tvPsi(x, nstep = n.ahead, ortho.cov, bw.cov = bw.cov)
where 2: .tvIRF(x = x, impulse = impulse, response = response, y.names = y.names,
n.ahead = n.ahead, ortho = ortho, cumulative = cumulative,
ortho.cov = ortho.cov, bw.cov = bw.cov)
where 3: tvIRF(model.tvVAR)
where 4: eval(expr, envir, enclos)
where 5: eval(expr, envir, enclos)
where 6: withVisible(eval(expr, envir, enclos))
where 7: withCallingHandlers(withVisible(eval(expr, envir, enclos)), warning = wHandler,
error = eHandler, message = mHandler)
where 8: handle(ev <- withCallingHandlers(withVisible(eval(expr, envir,
enclos)), warning = wHandler, error = eHandler, message = mHandler))
where 9: timing_fn(handle(ev <- withCallingHandlers(withVisible(eval(expr,
envir, enclos)), warning = wHandler, error = eHandler, message = mHandler)))
where 10: evaluate_call(expr, parsed$src[[i]], envir = envir, enclos = enclos,
debug = debug, last = i == length(out), use_try = stop_on_error !=
2L, keep_warning = keep_warning, keep_message = keep_message,
output_handler = output_handler, include_timing = include_timing)
where 11: evaluate::evaluate(...)
where 12: evaluate(code, envir = env, new_device = FALSE, keep_warning = !isFALSE(options$warning),
keep_message = !isFALSE(options$message), stop_on_error = if (options$error &&
options$include) 0L else 2L, output_handler = knit_handlers(options$render,
options))
where 13: in_dir(input_dir(), evaluate(code, envir = env, new_device = FALSE,
keep_warning = !isFALSE(options$warning), keep_message = !isFALSE(options$message),
stop_on_error = if (options$error && options$include) 0L else 2L,
output_handler = knit_handlers(options$render, options)))
where 14: block_exec(params)
where 15: call_block(x)
where 16: process_group.block(group)
where 17: process_group(group)
where 18: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group),
error = function(e) {
setwd(wd)
cat(res, sep = "\n", file = output %n% "")
message("Quitting from lines ", paste(current_lines(i),
collapse = "-"), " (", knit_concord$get("infile"),
") ")
})
where 19: process_file(text, output)
where 20: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet)
where 21: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(),
output_dir = getwd(), ...)
where 22: vweave_rmarkdown(...)
where 23: engine$weave(file, quiet = quiet, encoding = enc)
where 24: doTryCatch(return(expr), name, parentenv, handler)
where 25: tryCatchOne(expr, names, parentenv, handlers[[1L]])
where 26: tryCatchList(expr, classes, parentenv, handlers)
where 27: tryCatch({
engine$weave(file, quiet = quiet, encoding = enc)
setwd(startdir)
output <- find_vignette_product(name, by = "weave", engine = engine)
if (!have.makefile && vignette_is_tex(output)) {
texi2pdf(file = output, clean = FALSE, quiet = quiet)
output <- find_vignette_product(name, by = "texi2pdf",
engine = engine)
}
outputs <- c(outputs, output)
}, error = function(e) {
thisOK <<- FALSE
fails <<- c(fails, file)
message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s",
file, conditionMessage(e)))
})
where 28: tools:::buildVignettes(dir = "/data/gannet/ripley/R/packages/tests-clang/tvReg.Rcheck/vign_test/tvReg",
ser_elibs = "/tmp/Rtmp2ZaP3Y/file6a8f73b60d62.rds")
--- value of length: 2 type: logical ---
[1] FALSE TRUE
--- function from context ---
function (x, nstep = 10, ortho.cov = "const", bw.cov = NULL,
...)
{
if (!(class(x) == "tvvar"))
stop("\nPlease provide an object of class 'tvvar', generated by tvVAR().\n")
obs <- x$obs
nstep <- abs(as.integer(nstep))
neq <- x$neq
X <- x$x
params <- NCOL(X)
Phi <- tvPhi(x, nstep = nstep)
horizon <- dim(Phi)[4]
Psi <- array(0, dim = dim(Phi))
Sigma.hat <- array(0, dim = c(neq, neq, obs))
if (ortho.cov == "tv") {
tkernel <- x$tkernel
est <- x$est
if (is.null(bw.cov))
bw.cov <- bwCov(x$residuals, cv.block = x$cv.block,
tkernel = tkernel, est = est)
Sigma.hat <- tvCov(x$residuals, bw = bw.cov, tkernel = tkernel,
est = est)
}
for (t in 1:obs) {
if (ortho.cov == "const")
Sigma.hat[, , t] <- crossprod(x$residuals)/(obs -
params)
for (i in 1:horizon) {
P <- try(chol(Sigma.hat[, , t]), silent = T)
if (class(P) != "matrix") {
Sigma.hat[, , t] <- as.matrix(nearPD(Sigma.hat[,
, t])$mat)
P <- try(chol(Sigma.hat[, , t]), silent = T)
}
Psi[t, , , i] <- Phi[t, , , i] %*% t(P)
}
}
return(list(Psi = Psi, bw.cov = bw.cov))
}
<bytecode: 0xca94428>
<environment: namespace:tvReg>
--- function search by body ---
Function tvPsi in namespace tvReg has this body.
----------- END OF FAILURE REPORT --------------
Quitting from lines 404-411 (tvReg.Rmd)
Error: processing vignette 'tvReg.Rmd' failed with diagnostics:
the condition has length > 1
--- failed re-building ‘tvReg.Rmd’
SUMMARY: processing the following file failed:
‘tvReg.Rmd’
Error: Vignette re-building failed.
Execution halted
Flavor: r-devel-linux-x86_64-fedora-clang
Version: 0.4.2
Check: examples
Result: ERROR
Running examples in ‘tvReg-Ex.R’ failed
The error most likely occurred in:
> ### Name: forecast
> ### Title: Forecast Methods for Objects in tvReg.
> ### Aliases: forecast forecast.tvlm forecast.tvar forecast.tvvar
> ### forecast.tvsure
>
> ### ** Examples
>
> data("RV")
> RV2 <- head(RV, 2001)
> tvHAR <- tvLM (RV ~ RV_lag + RV_week + RV_month, data = RV2, bw = 20)
> newx <- cbind(RV$RV_lag[2002:2004], RV$RV_week[2002:2004],
+ RV$RV_month[2002:2004])
> forecast(tvHAR, newx, n.ahead = 3)
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
tvReg
--- call from context ---
forecast.tvlm(tvHAR, newx, n.ahead = 3)
--- call from argument ---
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
--- R stacktrace ---
where 1: forecast.tvlm(tvHAR, newx, n.ahead = 3)
where 2: forecast(tvHAR, newx, n.ahead = 3)
--- value of length: 2 type: logical ---
[1] FALSE FALSE
--- function from context ---
function (object, newx, n.ahead = 1, winsize = 0, ...)
{
if (!inherits(object, c("tvlm")))
stop("\nParameter 'object' should be entered and it should have class 'tvlm' or 'tvar'.\n")
if (!is.null(object$z))
stop("\nYour model coefficients are functions of a random variable 'z', use function \n 'predict' with parameter 'newz'.\n")
if (!inherits(newx, c("data.frame", "matrix", "numeric",
"vector")))
stop("\nParameter 'newx' should be entered and it should be a numeric vector if there is only\n one row or a 'matrix' or a 'data.frame' for more than one row.\n")
if (n.ahead == 1)
newx <- matrix(newx, ncol = length(newx))
if (NROW(newx) != n.ahead)
stop("\nDimensions of 'newx' are not compatible with 'n.ahead'.\n")
n.col <- NCOL(newx)
is.intercept <- ("(Intercept)" %in% colnames(object$x))
if (is.intercept & n.col == (NCOL(object$x) - 1))
newx <- cbind(rep(1, n.ahead), newx)
obs <- object$obs
is.rw <- !(winsize == 0)
if (winsize > obs | winsize < 0)
winsize <- obs - 1
prediction <- numeric(n.ahead)
tobs <- obs + n.ahead
grid <- (1:tobs)/tobs
X <- object$x
Y <- object$y
for (t in 1:n.ahead) {
i <- ifelse(is.rw, obs - winsize, 1)
object$x <- X[i:(obs + t - 1), ]
object$y <- Y[i:(obs + t - 1)]
object$z <- grid[i:(obs + t - 1)]
object$ez <- grid[obs + t]
beta <- try(tvOLS(object)$tvcoef)
if (class(beta) == "try-error") {
object$bw <- bw(object)
beta <- tvOLS(object)$tvcoef
}
prediction[t] <- beta %*% newx[t, ]
X <- rbind(X, newx[t, ])
Y <- c(Y, prediction[t])
}
return(prediction)
}
<bytecode: 0x7525770>
<environment: namespace:tvReg>
--- function search by body ---
Function forecast.tvlm in namespace tvReg has this body.
----------- END OF FAILURE REPORT --------------
Error in if (class(beta) == "try-error") { : the condition has length > 1
Calls: forecast -> forecast.tvlm
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc
Version: 0.4.2
Check: re-building of vignette outputs
Result: WARN
Error(s) in re-building vignettes:
--- re-building ‘tvReg.Rmd’ using rmarkdown
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
tvReg
--- call from context ---
tvPsi(x, nstep = n.ahead, ortho.cov, bw.cov = bw.cov)
--- call from argument ---
if (class(P) != "matrix") {
Sigma.hat[, , t] <- as.matrix(nearPD(Sigma.hat[, , t])$mat)
P <- try(chol(Sigma.hat[, , t]), silent = T)
}
--- R stacktrace ---
where 1: tvPsi(x, nstep = n.ahead, ortho.cov, bw.cov = bw.cov)
where 2: .tvIRF(x = x, impulse = impulse, response = response, y.names = y.names,
n.ahead = n.ahead, ortho = ortho, cumulative = cumulative,
ortho.cov = ortho.cov, bw.cov = bw.cov)
where 3: tvIRF(model.tvVAR)
where 4: eval(expr, envir, enclos)
where 5: eval(expr, envir, enclos)
where 6: withVisible(eval(expr, envir, enclos))
where 7: withCallingHandlers(withVisible(eval(expr, envir, enclos)), warning = wHandler,
error = eHandler, message = mHandler)
where 8: handle(ev <- withCallingHandlers(withVisible(eval(expr, envir,
enclos)), warning = wHandler, error = eHandler, message = mHandler))
where 9: timing_fn(handle(ev <- withCallingHandlers(withVisible(eval(expr,
envir, enclos)), warning = wHandler, error = eHandler, message = mHandler)))
where 10: evaluate_call(expr, parsed$src[[i]], envir = envir, enclos = enclos,
debug = debug, last = i == length(out), use_try = stop_on_error !=
2L, keep_warning = keep_warning, keep_message = keep_message,
output_handler = output_handler, include_timing = include_timing)
where 11: evaluate::evaluate(...)
where 12: evaluate(code, envir = env, new_device = FALSE, keep_warning = !isFALSE(options$warning),
keep_message = !isFALSE(options$message), stop_on_error = if (options$error &&
options$include) 0L else 2L, output_handler = knit_handlers(options$render,
options))
where 13: in_dir(input_dir(), evaluate(code, envir = env, new_device = FALSE,
keep_warning = !isFALSE(options$warning), keep_message = !isFALSE(options$message),
stop_on_error = if (options$error && options$include) 0L else 2L,
output_handler = knit_handlers(options$render, options)))
where 14: block_exec(params)
where 15: call_block(x)
where 16: process_group.block(group)
where 17: process_group(group)
where 18: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group),
error = function(e) {
setwd(wd)
cat(res, sep = "\n", file = output %n% "")
message("Quitting from lines ", paste(current_lines(i),
collapse = "-"), " (", knit_concord$get("infile"),
") ")
})
where 19: process_file(text, output)
where 20: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet)
where 21: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(),
output_dir = getwd(), ...)
where 22: vweave_rmarkdown(...)
where 23: engine$weave(file, quiet = quiet, encoding = enc)
where 24: doTryCatch(return(expr), name, parentenv, handler)
where 25: tryCatchOne(expr, names, parentenv, handlers[[1L]])
where 26: tryCatchList(expr, classes, parentenv, handlers)
where 27: tryCatch({
engine$weave(file, quiet = quiet, encoding = enc)
setwd(startdir)
output <- find_vignette_product(name, by = "weave", engine = engine)
if (!have.makefile && vignette_is_tex(output)) {
texi2pdf(file = output, clean = FALSE, quiet = quiet)
output <- find_vignette_product(name, by = "texi2pdf",
engine = engine)
}
outputs <- c(outputs, output)
}, error = function(e) {
thisOK <<- FALSE
fails <<- c(fails, file)
message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s",
file, conditionMessage(e)))
})
where 28: tools:::buildVignettes(dir = "/data/gannet/ripley/R/packages/tests-devel/tvReg.Rcheck/vign_test/tvReg",
ser_elibs = "/tmp/RtmpCoZuYq/file797b16739e79.rds")
--- value of length: 2 type: logical ---
[1] FALSE TRUE
--- function from context ---
function (x, nstep = 10, ortho.cov = "const", bw.cov = NULL,
...)
{
if (!(class(x) == "tvvar"))
stop("\nPlease provide an object of class 'tvvar', generated by tvVAR().\n")
obs <- x$obs
nstep <- abs(as.integer(nstep))
neq <- x$neq
X <- x$x
params <- NCOL(X)
Phi <- tvPhi(x, nstep = nstep)
horizon <- dim(Phi)[4]
Psi <- array(0, dim = dim(Phi))
Sigma.hat <- array(0, dim = c(neq, neq, obs))
if (ortho.cov == "tv") {
tkernel <- x$tkernel
est <- x$est
if (is.null(bw.cov))
bw.cov <- bwCov(x$residuals, cv.block = x$cv.block,
tkernel = tkernel, est = est)
Sigma.hat <- tvCov(x$residuals, bw = bw.cov, tkernel = tkernel,
est = est)
}
for (t in 1:obs) {
if (ortho.cov == "const")
Sigma.hat[, , t] <- crossprod(x$residuals)/(obs -
params)
for (i in 1:horizon) {
P <- try(chol(Sigma.hat[, , t]), silent = T)
if (class(P) != "matrix") {
Sigma.hat[, , t] <- as.matrix(nearPD(Sigma.hat[,
, t])$mat)
P <- try(chol(Sigma.hat[, , t]), silent = T)
}
Psi[t, , , i] <- Phi[t, , , i] %*% t(P)
}
}
return(list(Psi = Psi, bw.cov = bw.cov))
}
<bytecode: 0x11249160>
<environment: namespace:tvReg>
--- function search by body ---
Function tvPsi in namespace tvReg has this body.
----------- END OF FAILURE REPORT --------------
Quitting from lines 404-411 (tvReg.Rmd)
Error: processing vignette 'tvReg.Rmd' failed with diagnostics:
the condition has length > 1
--- failed re-building ‘tvReg.Rmd’
SUMMARY: processing the following file failed:
‘tvReg.Rmd’
Error: Vignette re-building failed.
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc