R clusplot-显示变量

R clusplot-显示变量,r,cluster-analysis,pca,R,Cluster Analysis,Pca,我想在clusplot中添加用于pca的变量作为箭头。我不确定是否实现了某种方法(我在文档中找不到任何东西) 我制作了一个棒状物,看起来像这样: 使用包princomp我可以在类似的表示空间中独立绘制观察结果,变量(列)如箭头所示: 有没有办法同时做这两件事,在同一张图上显示pca的簇和变量?我今天想做与OP相同的事情,最后把clusplot和biplot的片段放在一起。如果您想做同样的事情,这可能是有用的结果: clusplot2 <- function(dat, clusterin

我想在
clusplot中添加用于pca的变量作为箭头。我不确定是否实现了某种方法(我在文档中找不到任何东西)

我制作了一个棒状物,看起来像这样:

使用包
princomp
我可以在类似的表示空间中独立绘制观察结果,变量(列)如箭头所示:


有没有办法同时做这两件事,在同一张图上显示pca的簇和变量?

我今天想做与OP相同的事情,最后把
clusplot
biplot
的片段放在一起。如果您想做同样的事情,这可能是有用的结果:

clusplot2 <- function(dat, clustering, ...) {
    clusplot(dat, clustering, ...)

    ##  this is from clusplot.default
    pca <- princomp(dat, scores = TRUE, cor = (ncol(dat) != 2))

    ##  this is (adapted) from biplot.princomp 
    directions <- t(t(pca$loadings[, 1:2]) * pca$sdev[1:2]) * sqrt(pca$n.obs)

    ##  all below is (adapted) from biplot.default
    unsigned.range <- function(x) c(-abs(min(x, na.rm = TRUE)), 
                                    abs(max(x, na.rm = TRUE)))
    x <- predict(pca)[, 1:2]
    y <- directions
    rangx1 <- unsigned.range(x[, 1L])
    rangx2 <- unsigned.range(x[, 2L])
    rangy1 <- unsigned.range(y[, 1L])
    rangy2 <- unsigned.range(y[, 2L])
    xlim <- ylim <- rangx1 <- rangx2 <- range(rangx1, rangx2)
    ratio <- max(rangy1/rangx1, rangy2/rangx2)
    par(new = T)
    col <- par("col")
    if (!is.numeric(col)) 
        col <- match(col, palette(), nomatch = 1L)
    col <- c(col, col + 1L)
    cex <- rep(par("cex"), 2)
    plot(y, axes = FALSE, type = "n", xlim = xlim * ratio, ylim = ylim * 
             ratio, xlab = "", ylab = "", col = col[1L])
    axis(3, col = col[2L])
    axis(4, col = col[2L])
    box(col = col[1L])
    text(y, labels = names(dat), cex = cex[2L], col = col[2L])
    arrows(0, 0, y[, 1L] * 0.8, y[, 2L] * 0.8, col = col[2L], 
           length = 0.1)
}

############################################################

library(cluster)

dat <- iris[, 1:4]

clus <- pam(dat, k = 3)
clusplot2(dat, clus$clustering, main = "Test")

clusplot2这个问题可能更适合交叉验证。