该图表是否有名称-饼形图和mekko图之间的交叉点


9

下面是否有这种图表的名称(来自新西兰商业,创新和就业部,我曾为之工作,但未参与创建此地块)?它由面积与变量成比例的矩形组成,类似于饼形图,镶嵌图和mekko图之间的交叉。它也许最接近mekko图,但其复杂之处在于我们不是在使用列,而是在使用更复杂的拼图。

由于每个区域的矩形之间都有白色边框,因此原始图像看起来要好一些。

令人惊讶的是,尽管可以通过更好地使用映射到有意义的颜色来改善统计图形,但实际上它对我来说还算不错。“纽约时报”使用了一个强大的互动版本显示美国2011年预算。

一个有趣的挑战是考虑一种自动算法来绘制一个并使它看起来也合理。需要允许矩形在可接受的范围内具有不同的纵横比。

在此处输入图片说明


从这个问题开始的项目最终结果可以在链接到这里的交互式Web工具中看到:mbie.govt.nz/what-we-do/business-growth-agenda/regions
Peter Ellis

Answers:



12

问题是名称,但是它的运作方式也有待讨论。

作为替代方案,水平条形图更为平淡。

在此处输入图片说明

我们可能希望对这种图形进行处理,从对整体模式的掌握到对个别案件的仔细审查(霍克湾等)。我断言,使用条形图,两者都比较容易。小细节是,我在容易使用的标题和名称中使用小写字母,并且不重复%符号。我粗略地模仿了颜色编码,但没有弄清楚它的含义,因此与复制的内容一样清晰或晦涩。

我建议树形图的某些吸引力在于它们的相对新颖性。如果有数十种名称,它们可以在二维区域内分布而不是在长列中列出,则它们的工作原理可能会比条形图更好或更好。但是在我看来,对于15个左右的名称,条形图仍然是一个强有力的竞争者。

我对任何喜欢此处(克利夫兰)圆点图的人感到满意。垂直条形图将面临难以舒适地放置区域名称的困难。(只需想象一下旋转这张图就可以看到。)我也喜欢给出数字的想法,尽管保守主义者不喜欢将图表和表格的想法混在一起。

该图是在Stata中绘制的。


4
我必须对其进行挖掘,但是如果我的记忆正确地为我服务,则树图的原始动机之一就是信息的层次结构(即,允许您查看层次结构不同级别的组合大小),并且更多的数字。从未打算将其用于较小的数字列表,而具有更大的探索吸引力,请参阅《创建矩形树图的感知准则》Kong等人,2010年
Andy W

1
这也是我的印象,因此命名为treemap。层次结构中只有一个级别是显而易见的。
Nick Cox

4
Bill Shneiderman整理了一个很好的树状图历史,并提供了一些相关出版物的链接(cs.umd.edu/hcil/treemap-history)。树形图最初旨在以比树状图或树形图更简洁的方式显示多级层次结构,并且它们最初用于可视化硬盘的内容。如今,树形图用于可视化大型系统发育树(它们显示物种之间的关系)以及其他应用程序。有关更多示例,请参阅Shneiderman的文章,网址为perceptualedge.com/articles/b-eye/treemaps.pdf
JTT 2013年

谢谢; 对于这个特殊的情况,我同意这一点。
彼得·埃利斯

3

编辑/添加

从那以后,我发现树形图包比下面提到(并改编)的map.market()函数提供了更好的结果。但出于历史原因,我将保留我的答案。

原始答案

感谢您的回答。建立在@JTT提供的流动数据链接的基础上,但不喜欢为了获得合理的图形而需要在Illustrator或Inkscape中进行手动调整,因此我对Jeff Enos和David Kane的投资组合包中的map.market()函数进行了调整,使其更加完善。在用户控制下,标签随矩形大小变化,并避免出现红绿色对比。用法示例:

library(portfolio)
library(extrafont)
data(dow.jan.2005)

with(dow.jan.2005, 
    treemap(id    = symbol,
        area  = price,
        group = sector,
        color = 100 * month.ret,
        labsc = .12,  # user-chosen scaling of labels 
        fontfamily="Comic Sans MS")
    )

在此处输入图片说明

对于它的价值,我也同意@NickCox的观点,即在我原始问题的示例中,点状图更为出色。我修改后的treemap()函数的代码如下。

treemap <- function (id, area, group, color, scale = NULL, lab = c(group = TRUE, 
    id = FALSE), low="red", middle="grey60", high="blue", main = "Map of the Market", labsc = c(.5, 1), print = TRUE, ...) 
{
    # Adapted by Peter Ellis from map.market() by Jeff Enos and David Kane in the portfolio package on CRAN
    # See map.market for the original helpfile.  The changes are:
    # 1. low, middle and high are user-set color ramp choices
    # 2. The font size now varies with the area of the rectangle being labelled; labsc is a scaling parameter to make it look ok.
    #    First element of labsc is scaling parameter for size of group labels.  Second element is scaling for id labels.
    # 3. ... extra arguments to be passed to gpar() when drawing labels; expected use is for fontfamily="whatever"
    require(portfolio)
    if (any(length(id) != length(area), length(id) != length(group), 
        length(id) != length(color))) {
        stop("id, area, group, and color must be the same length.")
    }
    if (length(lab) == 1) {
        lab[2] <- lab[1]
    }
    if (missing(id)) {
        id <- seq_along(area)
        lab["id"] <- FALSE
    }
    stopifnot(all(!is.na(id)))
    data <- data.frame(label = id, group, area, color)
    data <- data[order(data$area, decreasing = TRUE), ]
    na.idx <- which(is.na(data$area) | is.na(data$group) | is.na(data$color))
    if (length(na.idx)) {
        warning("Stocks with NAs for area, group, or color will not be shown")
        data <- data[-na.idx, ]
    }
    zero.area.idx <- which(data$area == 0)
    if (length(zero.area.idx)) {
        data <- data[-zero.area.idx, ]
    }
    if (nrow(data) == 0) {
        stop("No records to display")
    }
    data$color.orig <- data$color
    if (is.null(scale)) {
        data$color <- data$color * 1/max(abs(data$color))
    }
    else {
        data$color <- sapply(data$color, function(x) {
            if (x/scale > 1) 
                1
            else if (-1 > x/scale) 
                -1
            else x/scale
        })
    }
    data.by.group <- split(data, data$group, drop = TRUE)
    group.data <- lapply(data.by.group, function(x) {
        sum(x[, 3])
    })
    group.data <- data.frame(area = as.numeric(group.data), label = names(group.data))
    group.data <- group.data[order(group.data$area, decreasing = TRUE), 
        ]
    group.data$color <- rep(NULL, nrow(group.data))
    color.ramp.pos <- colorRamp(c(middle, high))
    color.ramp.neg <- colorRamp(c(middle, low))
    color.ramp.rgb <- function(x) {
        col.mat <- mapply(function(x) {
            if (x < 0) {
                color.ramp.neg(abs(x))
            }
            else {
                color.ramp.pos(abs(x))
            }
        }, x)
        mapply(rgb, col.mat[1, ], col.mat[2, ], col.mat[3, ], 
            max = 255)
    }
    add.viewport <- function(z, label, color, x.0, y.0, x.1, 
        y.1) {
        for (i in 1:length(label)) {
            if (is.null(color[i])) {
                filler <- gpar(col = "blue", fill = "transparent", 
                  cex = 1)
            }
            else {
                filler.col <- color.ramp.rgb(color[i])
                filler <- gpar(col = filler.col, fill = filler.col, 
                  cex = 0.6)
            }
            new.viewport <- viewport(x = x.0[i], y = y.0[i], 
                width = (x.1[i] - x.0[i]), height = (y.1[i] - 
                  y.0[i]), default.units = "npc", just = c("left", 
                  "bottom"), name = as.character(label[i]), clip = "on", 
                gp = filler)
            z <- append(z, list(new.viewport))
        }
        z
    }
    squarified.treemap <- function(z, x = 0, y = 0, w = 1, h = 1, 
        func = add.viewport, viewport.list) {
        cz <- cumsum(z$area)/sum(z$area)
        n <- which.min(abs(log(max(w/h, h/w) * sum(z$area) * 
            ((cz^2)/z$area))))
        more <- n < length(z$area)
        a <- c(0, cz[1:n])/cz[n]
        if (h > w) {
            viewport.list <- func(viewport.list, z$label[1:n], 
                z$color[1:n], x + w * a[1:(length(a) - 1)], rep(y, 
                  n), x + w * a[-1], rep(y + h * cz[n], n))
            if (more) {
                viewport.list <- Recall(z[-(1:n), ], x, y + h * 
                  cz[n], w, h * (1 - cz[n]), func, viewport.list)
            }
        }
        else {
            viewport.list <- func(viewport.list, z$label[1:n], 
                z$color[1:n], rep(x, n), y + h * a[1:(length(a) - 
                  1)], rep(x + w * cz[n], n), y + h * a[-1])
            if (more) {
                viewport.list <- Recall(z[-(1:n), ], x + w * 
                  cz[n], y, w * (1 - cz[n]), h, func, viewport.list)
            }
        }
        viewport.list
    }
    map.viewport <- viewport(x = 0.05, y = 0.05, width = 0.9, 
        height = 0.75, default.units = "npc", name = "MAP", just = c("left", 
            "bottom"))
    map.tree <- gTree(vp = map.viewport, name = "MAP", children = gList(rectGrob(gp = gpar(col = "dark grey"), 
        name = "background")))
    group.viewports <- squarified.treemap(z = group.data, viewport.list = list())
    for (i in 1:length(group.viewports)) {
        this.group <- data.by.group[[group.data$label[i]]]
        this.data <- data.frame(this.group$area, this.group$label, 
            this.group$color)
        names(this.data) <- c("area", "label", "color")
        stock.viewports <- squarified.treemap(z = this.data, 
            viewport.list = list())
        group.tree <- gTree(vp = group.viewports[[i]], name = group.data$label[i])
        for (s in 1:length(stock.viewports)) {
            stock.tree <- gTree(vp = stock.viewports[[s]], name = this.data$label[s], 
                children = gList(rectGrob(name = "color")))
            if (lab[2]) {
                stock.tree <- addGrob(stock.tree, textGrob(x = unit(1, 
                  "lines"), y = unit(1, "npc") - unit(1, "lines"), 
                  label = this.data$label[s], gp = gpar(col = "white", fontsize=this.data$area[s] * labsc[2], ...), 
                  name = "label", just = c("left", "top")))
            }
            group.tree <- addGrob(group.tree, stock.tree)
        }
        group.tree <- addGrob(group.tree, rectGrob(gp = gpar(col = "grey"), 
            name = "border"))
        if (lab[1]) {
            group.tree <- addGrob(group.tree, textGrob(label = group.data$label[i], 
                name = "label", gp = gpar(col = "white", fontsize=group.data$area[i] * labsc[1], ...)))
        }
        map.tree <- addGrob(map.tree, group.tree)
    }
    op <- options(digits = 1)
    top.viewport <- viewport(x = 0.05, y = 1, width = 0.9, height = 0.2, 
        default.units = "npc", name = "TOP", , just = c("left", 
            "top"))
    legend.ncols <- 51
    l.x <- (0:(legend.ncols - 1))/(legend.ncols)
    l.y <- unit(0.25, "npc")
    l.cols <- color.ramp.rgb(seq(-1, 1, by = 2/(legend.ncols - 
        1)))
    if (is.null(scale)) {
        l.end <- max(abs(data$color.orig))
    }
    else {
        l.end <- scale
    }
    top.list <- gList(textGrob(label = main, y = unit(0.7, "npc"), 
        just = c("center", "center"), gp = gpar(cex = 2, ...)), segmentsGrob(x0 = seq(0, 
        1, by = 0.25), y0 = unit(0.25, "npc"), x1 = seq(0, 1, 
        by = 0.25), y1 = unit(0.2, "npc")), rectGrob(x = l.x, 
        y = l.y, width = 1/legend.ncols, height = unit(1, "lines"), 
        just = c("left", "bottom"), gp = gpar(col = NA, fill = l.cols), 
        default.units = "npc"), textGrob(label = format(l.end * 
        seq(-1, 1, by = 0.5), trim = TRUE), x = seq(0, 1, by = 0.25), 
        y = 0.1, default.units = "npc", just = c("center", "center"), 
        gp = gpar(col = "black", cex = 0.8, fontface = "bold")))
    options(op)
    top.tree <- gTree(vp = top.viewport, name = "TOP", children = top.list)
    mapmarket <- gTree(name = "MAPMARKET", children = gList(rectGrob(gp = gpar(col = "dark grey", 
        fill = "dark grey"), name = "background"), top.tree, 
        map.tree))
    if (print) {
        grid.newpage()
        grid.draw(mapmarket)
    }
    invisible(mapmarket)
}

该代码无疑将是有用的。我不想将讨论拖到不会进行讨论的领域,但是这个例子是否很武断,还是有理由让这些领域代表股票价格?我们应该在这个情节上看到或寻找什么?(尽管我已经看到很多示例,但我并不怀有敌意,只是完全没有经验尝试使用此设计。)
Nick Cox

1
实际上,我只是从Enos和Kane的map.market()帮助文件中举了一个例子。反思一下,我不明白为什么他们选择了区域展示价格。更为合理的方法肯定是显示总资本,即价格x股份数量(取决于目的,是市场上的股份数量,或者我碰巧拥有的股份数量)。然后,您将可以很好地直观地使用该图来显示不同股票的重要性。
彼得·埃利斯

我也对价格的使用感到困惑。
Nick Cox

By using our site, you acknowledge that you have read and understand our Cookie Policy and Privacy Policy.
Licensed under cc by-sa 3.0 with attribution required.