亚洲欧美第一页_禁久久精品乱码_粉嫩av一区二区三区免费野_久草精品视频

? 歡迎來(lái)到蟲(chóng)蟲(chóng)下載站! | ?? 資源下載 ?? 資源專輯 ?? 關(guān)于我們
? 蟲(chóng)蟲(chóng)下載站

?? plots.r

?? 做主成分回歸和偏最小二乘回歸
?? R
?? 第 1 頁(yè) / 共 2 頁(yè)
字號(hào):
### Plots for mvr objects.  Some of them also work for other### objects, but that is not a priority.###### $Id: plots.R 148 2007-10-16 20:33:38Z bhm $###### Plot method for mvr objects###plot.mvr <- function(x, plottype = c("prediction", "validation",                        "coefficients", "scores", "loadings", "biplot",                        "correlation"),                     ...){    plottype <- match.arg(plottype)    plotFunc <- switch(plottype,                       prediction = predplot.mvr,                       validation = validationplot,                       coefficients = coefplot,                       scores = scoreplot,                       loadings = loadingplot,                       biplot = biplot.mvr,                       correlation = corrplot)    plotFunc(x, ...)}###### Scoreplot###scoreplot <- function(object, ...) UseMethod("scoreplot")scoreplot.default <- function(object, comps = 1:2, labels, identify = FALSE,                              type = "p", xlab, ylab, ...) {    ## Check arguments    nComps <- length(comps)    if (nComps == 0) stop("At least one component must be selected.")    ## Get the scores    if (is.matrix(object)) {        ## Assume this is already a score matrix        S <- object[,comps, drop = FALSE]    } else {        ## Try to get the scores        S <- scores(object)[,comps, drop = FALSE]        if (is.null(S))            stop("`", deparse(substitute(object)), "' has no scores.")    }    if (!missing(labels)) {        ## Set up point labels        if (length(labels) == 1) {            labels <- switch(match.arg(labels, c("names", "numbers")),                             names = rownames(S),                             numbers = 1:nrow(S)                             )        }        labels <- as.character(labels)        type <- "n"    }    varlab <- compnames(object, comps, explvar = TRUE)    if (nComps <= 2) {        if (nComps == 1) {            ## One component versus index            if (missing(xlab)) xlab <- "observation"            if (missing(ylab)) ylab <- varlab        } else {            ## Second component versus first            if (missing(xlab)) xlab <- varlab[1]            if (missing(ylab)) ylab <- varlab[2]        }        plot(S, xlab = xlab, ylab = ylab, type = type, ...)        if (!missing(labels)) text(S, labels, ...)        if (identify) {            if (!is.null(rownames(S))) {                identify(S, labels = rownames(S))            } else {                identify(S)            }        }    } else {        ## Pairwise scatterplots of several components        panel <- if (missing(labels))            function(x, y, ...) points(x, y, type = type, ...) else            function(x, y, ...) text(x, y, labels = labels, ...)        pairs(S, labels = varlab, panel = panel, ...)    }}## A plot method for scores:plot.scores <- function(x, ...) scoreplot(x, ...)###### Loadingplot###loadingplot <- function(object, ...) UseMethod("loadingplot")loadingplot.default <- function(object, comps = 1:2, scatter = FALSE, labels,                                identify = FALSE, type, lty, lwd = NULL, pch,                                cex = NULL, col, legendpos, xlab, ylab,                                pretty.xlabels = TRUE, xlim, ...){    ## Check arguments    nComps <- length(comps)    if (nComps == 0) stop("At least one component must be selected.")    if (!missing(type) &&        (length(type) != 1 || is.na(nchar(type, "c")) || nchar(type, "c") != 1))        stop("Invalid plot type.")    ## Get the loadings    if (is.matrix(object)) {        ## Assume this is already a loading matrix        L <- object[,comps, drop = FALSE]    } else {        ## Try to get the loadings:        L <- loadings(object)[,comps, drop = FALSE]        if (is.null(L))            stop("`", deparse(substitute(object)), "' has no loadings.")    }    varlab <- compnames(object, comps, explvar = TRUE)    if (scatter) {        ## Scatter plots        if (missing(type)) type <- "p"        if (!missing(labels)) {            ## Set up point/tick mark labels            if (length(labels) == 1) {                labels <- switch(match.arg(labels, c("names", "numbers")),                                 names = {                                     if (is.null(rnames <- rownames(L))) {                                         stop("The loadings have no row names.")                                     } else {                                         rnames                                     }},                                 numbers = 1:nrow(L)                                 )            }            labels <- as.character(labels)            type <- "n"        }        if (missing(lty)) lty <- NULL        if (missing(pch)) pch <- NULL        if (missing(col)) col <- par("col") # `NULL' means `no colour'        if (nComps <= 2) {            if (nComps == 1) {                ## One component versus index                if (missing(xlab)) xlab <- "variable"                if (missing(ylab)) ylab <- varlab            } else {                ## Second component versus first                if (missing(xlab)) xlab <- varlab[1]                if (missing(ylab)) ylab <- varlab[2]            }            plot(L, xlab = xlab, ylab = ylab, type = type, lty = lty,                 lwd = lwd, pch = pch, cex = cex, col = col, ...)            if (!missing(labels)) text(L, labels, cex = cex, col = col, ...)            if (identify)                identify(L, labels = paste(1:nrow(L), rownames(L), sep = ": "))        } else {            ## Pairwise scatterplots of several components            panel <- if (missing(labels)) {                function(x, y, ...)                    points(x, y, type = type, lty = lty, lwd = lwd,                           pch = pch, col = col, ...)            } else {                function(x, y, ...)                    text(x, y, labels = labels, col = col, ...)            }            pairs(L, labels = varlab, panel = panel, cex = cex, ...)        }    } else {                            # if (scatter)        ## Line plots        if (missing(type)) type <- "l"        if (missing(lty)) lty <- 1:nComps        if (missing(pch)) pch <- 1:nComps        if (missing(col)) col <- 1:nComps        if (missing(xlab)) xlab <- "variable"        if (missing(ylab)) ylab <- "loading value"        xnum <- 1:nrow(L)        if (missing(labels)) {            xaxt <- par("xaxt")        } else {            xaxt <- "n"            if (length(labels) == 1) {                xnam <- rownames(L)                switch(match.arg(labels, c("names", "numbers")),                       names = {        # Simply use the names as is                           labels <- xnam                       },                       numbers = {      # Try to use them as numbers                           if (length(grep("^[-0-9.]+[^0-9]*$", xnam)) ==                               length(xnam)) {                               ## Labels are on "num+text" format                               labels <- sub("[^0-9]*$", "", xnam)                               if (isTRUE(pretty.xlabels)) {                                   xnum <- as.numeric(labels)                                   xaxt <- par("xaxt")                               }                           } else {                               stop("Could not convert variable names to numbers.")                           }                       }                       )            } else {                labels <- as.character(labels)            }        }        if (missing(xlim)) xlim <- xnum[c(1, length(xnum))] # Needed for reverted scales        matplot(xnum, L, xlab = xlab, ylab = ylab, type = type,                lty = lty, lwd = lwd, pch = pch, cex = cex, col = col,                xaxt = xaxt, xlim = xlim, ...)        if (!missing(labels) && xaxt == "n") {            if (isTRUE(pretty.xlabels)) {                ticks <- axTicks(1)                ticks <- ticks[ticks >= 1 & ticks <= length(labels)]            } else {                ticks <- 1:length(labels)            }            axis(1, ticks, labels[ticks], ...)        }        if (!missing(legendpos)) {            ## Are we plotting lines?            dolines <- type %in% c("l", "b", "c", "o", "s", "S", "h")            ## Are we plotting points?            dopoints <- type %in% c("p", "b", "o")            if (length(lty) > nComps) lty <- lty[1:nComps]            do.call("legend", c(list(legendpos, varlab, col = col),                                if (dolines) list(lty = lty, lwd = lwd),                                if (dopoints) list(pch = pch, pt.cex = cex,                                                   pt.lwd = lwd)))        }        if (identify)            identify(c(row(L)), c(L),                     labels = paste(c(col(L)), rownames(L), sep = ": "))    }                                   # if (scatter)}## A plot method for loadings (loadings, loading.weights or Yloadings):plot.loadings <- function(x, ...) loadingplot(x, ...)###### Correlation loadings plot###corrplot <- function(object, comps = 1:2, labels, radii = c(sqrt(1/2), 1),                     identify = FALSE, type = "p", xlab, ylab, ...) {    nComps <- length(comps)    if (nComps < 2) stop("At least two components must be selected.")    if (is.matrix(object)) {        ## Assume this is already a correlation matrix        cl <- object[,comps, drop = FALSE]        varlab <- colnames(cl)    } else {        S <- scores(object)[,comps, drop = FALSE]        if (is.null(S))            stop("`", deparse(substitute(object)), "' has no scores.")        cl <- cor(model.matrix(object), S)        varlab <- compnames(object, comps, explvar = TRUE)    }    if (!missing(labels)) {        ## Set up point labels        if (length(labels) == 1) {            labels <- switch(match.arg(labels, c("names", "numbers")),                             names = rownames(cl),                             numbers = 1:nrow(cl)                             )        }        labels <- as.character(labels)        type <- "n"    }    ## Build the expression to add circles:    if (length(radii)) {        addcircles <- substitute(symbols(cent, cent, circles = radii,                                         inches = FALSE, add = TRUE),                                 list(cent = rep(0, length(radii))))    } else {        addcircles <- expression()    }    if (nComps == 2) {        ## Second component versus first        if (missing(xlab)) xlab <- varlab[1]        if (missing(ylab)) ylab <- varlab[2]        plot(cl, xlim = c(-1,1), ylim = c(-1,1), asp = 1,             xlab = xlab, ylab = ylab, type = type, ...)        eval(addcircles)        segments(x0 = c(-1, 0), y0 = c(0, -1), x1 = c(1, 0), y1 = c(0, 1))        if (!missing(labels)) text(cl, labels, ...)        if (identify) {            if (!is.null(rownames(cl))) {                identify(cl, labels = rownames(cl))            } else {                identify(cl)            }        }    } else {        ## Pairwise scatterplots of several components        pointsOrText <- if (missing(labels)) {            function(x, y, ...) points(x, y, type = type, ...)        } else {            function(x, y, ...) text(x, y, labels = labels, ...)        }        panel <- function(x, y, ...) {            ## Ignore the leading `ghost points':            pointsOrText(x[-(1:2)], y[-(1:2)], ...)            eval(addcircles)            segments(x0 = c(-1, 0), y0 = c(0, -1), x1 = c(1, 0),                     y1 = c(0, 1))        }        ## Call `pairs' with two leading `ghost points', to get        ## correct xlim and ylim:        pairs(rbind(-1, 1, cl), labels = varlab, panel = panel, asp = 1, ...)    }}###### prediction plot##### Generic:predplot <- function(object, ...)  UseMethod("predplot")## Default method:predplot.default <- function(object, ...) {    measured <- model.response(model.frame(object))    predicted <- predict(object)    predplotXy(measured, predicted, ...)}## Method for mvr objects:predplot.mvr <- function(object, ncomp = object$ncomp, which, newdata,                         nCols, nRows, xlab = "measured", ylab = "predicted",                         main, ..., font.main, cex.main){    ## Select type(s) of prediction    if (missing(which)) {        ## Pick the `best' alternative.        if (!missing(newdata)) {            which <- "test"        } else {            if (!is.null(object$validation)) {                which <- "validation"            } else {                which <- "train"            }        }    } else {        ## Check the supplied `which'        allTypes <- c("train", "validation", "test")        which <- allTypes[pmatch(which, allTypes)]        if (length(which) == 0 || any(is.na(which)))            stop("`which' should be a subset of ",                 paste(allTypes, collapse = ", "))    }    ## Help variables    nEst <- length(which)    nSize <- length(ncomp)    nResp <- dim(object$fitted.values)[2]    ## Set plot parametres as needed:    dims <- c(nEst, nSize, nResp)    dims <- dims[dims > 1]    nPlots <- prod(dims)    if (nPlots > 1) {        ## Set up default font.main and cex.main for individual titles:        if (missing(font.main)) font.main <- 1        if (missing(cex.main)) cex.main <- 1.1

?? 快捷鍵說(shuō)明

復(fù)制代碼 Ctrl + C
搜索代碼 Ctrl + F
全屏模式 F11
切換主題 Ctrl + Shift + D
顯示快捷鍵 ?
增大字號(hào) Ctrl + =
減小字號(hào) Ctrl + -
亚洲欧美第一页_禁久久精品乱码_粉嫩av一区二区三区免费野_久草精品视频
日韩av中文字幕一区二区三区| 久久精品亚洲一区二区三区浴池 | 成人av网在线| 国产原创一区二区| 美女一区二区久久| 精品中文字幕一区二区小辣椒| 日韩精品1区2区3区| 天天影视涩香欲综合网| 五月婷婷激情综合网| 日韩一区精品视频| 久久成人免费网站| 国产一区 二区| 成人av片在线观看| 欧美亚洲动漫另类| 51午夜精品国产| 日韩精品一区二区三区老鸭窝| 日韩精品一区二区三区在线| 欧美电影免费观看高清完整版在线 | 夜夜嗨av一区二区三区| 一区二区三区在线观看国产| 亚洲成人激情综合网| 免费观看成人av| 国产成人免费xxxxxxxx| jlzzjlzz国产精品久久| 欧美午夜影院一区| 日韩欧美一级二级三级久久久 | 麻豆精品在线观看| 国产一区免费电影| 91麻豆国产在线观看| 欧美日韩一区在线观看| 日韩欧美国产系列| 国产精品你懂的| 亚洲成年人影院| 久久99国产精品久久| 高清不卡在线观看| 欧美日韩亚洲国产综合| 久久精品在这里| 一区二区三区不卡视频| 久久成人av少妇免费| 成人免费毛片app| 在线不卡的av| 中文字幕乱码一区二区免费| 亚洲bt欧美bt精品| 风间由美一区二区av101| 在线观看日韩电影| 国产拍揄自揄精品视频麻豆| 亚洲第一搞黄网站| 高清免费成人av| 91麻豆精品国产91久久久久久久久| 久久久蜜桃精品| 亚洲线精品一区二区三区八戒| 麻豆国产欧美一区二区三区| 91网址在线看| 久久久久久99精品| 午夜激情久久久| 成人午夜精品在线| 欧美一区二区三区在| 亚洲天堂久久久久久久| 精品一区二区三区影院在线午夜| 不卡影院免费观看| 久久综合色之久久综合| 午夜影视日本亚洲欧洲精品| 成人午夜在线视频| 亚洲精品一区二区三区精华液| 亚洲精品一二三| 国产成人午夜电影网| 4438x成人网最大色成网站| 亚洲欧洲成人自拍| 久久99久久精品| 欧美日韩国产高清一区| 亚洲人成人一区二区在线观看| 国产综合色精品一区二区三区| 欧美撒尿777hd撒尿| 中文字幕在线播放不卡一区| 精品在线一区二区三区| 7777精品久久久大香线蕉| 亚洲天堂2016| 不卡区在线中文字幕| 久久久久久久精| 秋霞成人午夜伦在线观看| 欧美性受xxxx黑人xyx性爽| 国产精品久久久久aaaa樱花| 精品一区二区三区免费毛片爱| 欧美日韩精品一区视频| 亚洲欧美国产77777| 成人av一区二区三区| 国产清纯在线一区二区www| 久久99最新地址| 日韩视频免费观看高清完整版| 亚洲成在人线免费| 欧美日韩一区二区三区免费看| 亚洲日本在线看| 99riav一区二区三区| 国产欧美一区二区精品性色超碰| 国内成人免费视频| 欧美mv和日韩mv国产网站| 美国毛片一区二区三区| 欧美一区二区三区在线观看视频 | 国产一区二区三区久久久| 欧美va亚洲va| 精品一区二区免费| 精品毛片乱码1区2区3区| 麻豆精品久久久| 精品1区2区在线观看| 国产制服丝袜一区| 久久亚洲综合色| 国产精品一区不卡| 亚洲国产高清aⅴ视频| 成人听书哪个软件好| 国产精品麻豆视频| 99国产精品久久久久| 亚洲色欲色欲www| 欧美调教femdomvk| 欧美aaa在线| 精品免费一区二区三区| 国产一区二区三区免费播放| 国产精品视频一二| 色悠悠久久综合| 亚洲成av人片在线观看无码| 6080国产精品一区二区| 久久精品久久久精品美女| 久久综合九色综合97_久久久| 国产成人啪免费观看软件| 国产精品理伦片| 在线精品视频一区二区三四| 午夜欧美电影在线观看| 日韩欧美视频在线| 国产 欧美在线| 亚洲一区在线视频| 欧美一区永久视频免费观看| 韩国三级电影一区二区| 国产精品久久久久精k8| 欧美日韩黄视频| 韩国av一区二区三区四区| 国产精品国产三级国产aⅴ原创| 欧洲色大大久久| 久久爱另类一区二区小说| 国产精品日日摸夜夜摸av| 在线观看亚洲一区| 激情文学综合丁香| 亚洲欧美激情小说另类| 91精品国产一区二区三区 | 91精品中文字幕一区二区三区| 久久精品久久久精品美女| 亚洲欧美综合网| 欧美女孩性生活视频| 国产一区二区毛片| 亚洲免费av高清| 欧美成人午夜电影| 99国产精品久久久| 免费观看日韩av| 亚洲女女做受ⅹxx高潮| 欧美tk丨vk视频| 色激情天天射综合网| 国产米奇在线777精品观看| 一区av在线播放| 久久久亚洲高清| 欧美日韩综合一区| 成人黄色国产精品网站大全在线免费观看| 一区二区久久久| 国产日韩欧美精品电影三级在线| 欧美亚洲综合网| 丁香五精品蜜臀久久久久99网站| 亚洲一区二区三区激情| 国产欧美日韩视频在线观看| 欧美三级三级三级| 不卡av电影在线播放| 男女性色大片免费观看一区二区 | 日韩福利电影在线| 中文字幕综合网| 久久久国产午夜精品| 在线播放中文一区| 91啪在线观看| 大胆亚洲人体视频| 国产一区美女在线| 日日摸夜夜添夜夜添国产精品| 国产精品天美传媒沈樵| 精品日韩一区二区三区免费视频| 在线视频你懂得一区二区三区| 国产电影精品久久禁18| 久久综合综合久久综合| 视频一区视频二区中文| 亚洲人快播电影网| 国产精品久久久久aaaa樱花| 国产亚洲精品7777| 精品福利二区三区| 91精品国产综合久久福利| 欧美日韩久久久久久| 欧美在线观看一区二区| 99久久夜色精品国产网站| 国产传媒欧美日韩成人| 精品亚洲国内自在自线福利| 日韩av电影一区| 午夜久久久久久久久久一区二区| 一二三区精品福利视频| 亚洲乱码日产精品bd| 日韩伦理电影网| 综合网在线视频| 最新久久zyz资源站| 中文久久乱码一区二区|