This is an R Markdown document. Markdown is a simple formatting syntax for authoring HTML, PDF, and MS Word documents. For more details on using R Markdown see http://rmarkdown.rstudio.com.
When you click the Knit button a document will be generated that includes both content as well as the output of any embedded R code chunks within the document. You can embed an R code chunk like this:
summary(cars)
## speed dist
## Min. : 4.0 Min. : 2.00
## 1st Qu.:12.0 1st Qu.: 26.00
## Median :15.0 Median : 36.00
## Mean :15.4 Mean : 42.98
## 3rd Qu.:19.0 3rd Qu.: 56.00
## Max. :25.0 Max. :120.00
You can also embed plots, for example:
Note that the echo = FALSE parameter was added to the
code chunk to prevent printing of the R code that generated the
plot.
library(tidyverse)
## ── Attaching packages ─────────────────────────────────────── tidyverse 1.3.1 ──
## ✔ ggplot2 3.3.6 ✔ purrr 0.3.4
## ✔ tibble 3.1.7 ✔ dplyr 1.0.9
## ✔ tidyr 1.2.0 ✔ stringr 1.4.0
## ✔ readr 2.1.2 ✔ forcats 0.5.1
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
library(ggrepel)
new <- mpg %>%
group_by(class) %>%
filter(row_number(desc(hwy)) == 1)
ggplot(mpg, aes(x = displ, y = hwy)) +
geom_point(aes(colour = class)) +
geom_point(data = new, size = 3, shape = 1) +
geom_label_repel(data =new, aes(label = model))
new_carat <- diamonds %>% filter(carat < 3)
ggplot(data = new_carat, aes(x = carat, y = price)) +
geom_boxplot(aes(group = cut_number(carat, 20)))
为了方便呈现,筛选出carat大于3的数据,并使用cut_number()将carat划分为20组。
ggplot(data = new_carat, aes(x = carat, y = price)) +
geom_boxplot(aes(group = cut_width(carat, 0.1)))
使用cut_width(carat, 0.1)将carat以0.1为间隔划分。
之前的code报错,evaluate函数有误,缺少大括号,已修改。修改代码后运行
# install.packages("lattice")
library(lattice)
# install.packages("zoo")
library(zoo)
##
## 载入程辑包:'zoo'
## The following objects are masked from 'package:base':
##
## as.Date, as.Date.numeric
evaluate <- function(PARAM, minVal = NA, maxVal = NA, y = 2014,
transform = FALSE, verbose = FALSE,
negative = FALSE, transformOnly = FALSE,
returnData = FALSE, accountParams = NULL){
# Step 1
# Convert and declare parameters if they exist on unbounded (-inf,inf) domain
if( transform | transformOnly ){
PARAM <- minVal +
(maxVal - minVal) * unlist(lapply( PARAM, function(v) (1 + exp(-v))^(-1) ))
if( transformOnly ){
}
}
return(PARAM)
} ## 修改
# Declare bounds and step size for optimization
lowerBound <- c(n1 = 5, nFact = 3, nSharpe = 22, shThresh = 0.05)
upperBound <- c(n1 = 80, nFact = 3, nSharpe = 22, shThresh = 0.95)
stepSize <- c(n1 = 5, nFact = 1, nSharpe = 1, shThresh = 0.05)
pnames <- names(stepSize)
np <- length(pnames)
# Declare list of all test points
POINTS <- list()
for( p in pnames ){
POINTS[[p]] <- seq(lowerBound[[p]], upperBound[[p]], stepSize[[p]])
}
OPTIM <- data.frame(matrix(NA, nrow = prod(unlist(lapply(POINTS, length))),
ncol = np + 1))
names(OPTIM)[1:np] <- names(POINTS)
names(OPTIM)[np+1] <- "obj"
# Store all possible combinations of parameters
for( i in 1:np ){
each <- prod(unlist(lapply(POINTS, length))[-(1:i)])
times <- prod(unlist(lapply(POINTS, length))[-(i:length(pnames))])
OPTIM[,i] <- rep(POINTS[[pnames[i]]], each = each, times = times)
}
# Test each row of OPTIM
timeLapse <- proc.time()[3]
for( i in 1:nrow(OPTIM) ){
OPTIM[i,np+1] <- evaluate(OPTIM[i,1:np], transform = FALSE, y = 2014)
cat(paste0("## ", floor( 100 * i / nrow(OPTIM)), "% complete\n"))
cat(paste0("## ",
round( ((proc.time()[3] - timeLapse) *
((nrow(OPTIM) - i)/ i))/60, 2),
" minutes remaining\n\n"))
}
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 0% complete
## ## 0.05 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 0% complete
## ## 0.08 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 0% complete
## ## 0.05 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 1% complete
## ## 0.04 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 1% complete
## ## 0.03 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 1% complete
## ## 0.02 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 2% complete
## ## 0.02 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 2% complete
## ## 0.02 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 2% complete
## ## 0.02 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 3% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 3% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 3% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 4% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 4% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 4% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 5% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 5% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 5% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 = 5, :
## 提供了4变数用来替换1变数
## ## 6% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 6% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 6% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 7% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 7% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 7% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 8% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 8% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 8% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 9% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 9% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 9% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 10% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 10% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 10% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 11% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 11% complete
## ## 0.01 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 11% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 12% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 10, : 提供了4变数用来替换1变数
## ## 12% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 12% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 13% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 13% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 13% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 14% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 14% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 14% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 15% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 15% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 15% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 16% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 16% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 16% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 17% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 17% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 17% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 18% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 18% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 15, : 提供了4变数用来替换1变数
## ## 18% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 19% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 19% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 19% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 20% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 20% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 20% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 21% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 21% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 21% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 22% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 22% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 22% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 23% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 23% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 23% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 24% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 24% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 24% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 20, : 提供了4变数用来替换1变数
## ## 25% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 25% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 25% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 25% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 26% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 26% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 26% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 27% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 27% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 27% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 28% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 28% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 28% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 29% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 29% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 29% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 30% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 30% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 30% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 25, : 提供了4变数用来替换1变数
## ## 31% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 31% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 31% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 32% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 32% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 32% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 33% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 33% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 33% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 34% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 34% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 34% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 35% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 35% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 35% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 36% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 36% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 36% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 37% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 30, : 提供了4变数用来替换1变数
## ## 37% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 37% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 38% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 38% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 38% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 39% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 39% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 39% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 40% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 40% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 40% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 41% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 41% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 41% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 42% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 42% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 42% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 43% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 43% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 35, : 提供了4变数用来替换1变数
## ## 43% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 44% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 44% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 44% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 45% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 45% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 45% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 46% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 46% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 46% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 47% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 47% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 47% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 48% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 48% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 48% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 49% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 49% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 49% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 40, : 提供了4变数用来替换1变数
## ## 50% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 50% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 50% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 50% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 51% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 51% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 51% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 52% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 52% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 52% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 53% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 53% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 53% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 54% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 54% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 54% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 55% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 55% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 55% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 45, : 提供了4变数用来替换1变数
## ## 56% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 56% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 56% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 57% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 57% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 57% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 58% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 58% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 58% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 59% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 59% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 59% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 60% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 60% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 60% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 61% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 61% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 61% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 62% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 50, : 提供了4变数用来替换1变数
## ## 62% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 62% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 63% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 63% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 63% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 64% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 64% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 64% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 65% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 65% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 65% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 66% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 66% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 66% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 67% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 67% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 67% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 68% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 68% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 55, : 提供了4变数用来替换1变数
## ## 68% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 69% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 69% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 69% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 70% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 70% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 70% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 71% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 71% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 71% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 72% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 72% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 72% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 73% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 73% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 73% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 74% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 74% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 74% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 60, : 提供了4变数用来替换1变数
## ## 75% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 75% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 75% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 75% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 76% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 76% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 76% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 77% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 77% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 77% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 78% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 78% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 78% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 79% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 79% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 79% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 80% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 80% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 80% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 65, : 提供了4变数用来替换1变数
## ## 81% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 81% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 81% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 82% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 82% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 82% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 83% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 83% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 83% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 84% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 84% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 84% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 85% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 85% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 85% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 86% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 86% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 86% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 87% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 70, : 提供了4变数用来替换1变数
## ## 87% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 87% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 88% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 88% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 88% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 89% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 89% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 89% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 90% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 90% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 90% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 91% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 91% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 91% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 92% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 92% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 92% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 93% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 93% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 75, : 提供了4变数用来替换1变数
## ## 93% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 94% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 94% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 94% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 95% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 95% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 95% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 96% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 96% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 96% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 97% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 97% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 97% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 98% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 98% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 98% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 99% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 99% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 99% complete
## ## 0 minutes remaining
## Warning in `[<-.data.frame`(`*tmp*`, i, np + 1, value = structure(list(n1 =
## 80, : 提供了4变数用来替换1变数
## ## 100% complete
## ## 0 minutes remaining
library(lattice)
wireframe(obj ~ n1*shThresh, data = OPTIM,
xlab = "n1", ylab = "shThresh",
main = "Long-Only MACD Exhaustive Optimization",
drape = TRUE,
colorkey = TRUE,
screen = list(z = 15, x = -60)
)
levelplot(obj ~ n1*shThresh, data = OPTIM,
xlab = "n1", ylab = "shThresh",
main = "Long-Only MACD Exhaustive Optimization"
)