R中体积空间中的切片 [英] Slices in volumetric space in R

查看:40
本文介绍了R中体积空间中的切片的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

我正在尝试使用两个横截面的表面绘制 plot_ly 曲面图,即将一个曲面映射到 Z 平面,另一个曲面映射到 X 平面.

z 平面上的曲面工作正常,但在另一个平面上添加第二个曲面让我感到困惑.我可能误解了 plot_ly 如何处理数据.

我正在尝试做这样的事情,但我无法从这个情节中获得代码在我自己的 R (RStudio) 中工作

Im trying to make a plot_ly surface plot with two surfaces that cross-section, ie mapping one surface on the Z plane, and another surface mapped on the X plane.

The surface on the z-plane is working fine, but adding a second surface in another plane is tripping me up. I'm probably misunderstanding something about how plot_ly handles data.

I'm trying to do something like this, but I can't get the code from this plot working in my own R (RStudio) https://plot.ly/~schippkus/0/slices-in-volumetric-data/#plot

Here a reproducible example with one-surface working, and the two-surface being odd. The data created in this sample has the same dimensions as the data I am working on. It originally comes in a 3-dimensional array, that I force into this format.

library(plotly); library(tidyverse); 

    x = 1:91
    y = 1:109
    z = 1:91

    val = as.numeric(scale(sample(length(x)*length(y)*length(z))))

    DATA = expand.grid(X=x,Y=y,Z=z) %>% as.data.frame() %>% 
      mutate(Val = val)

    getTrace = function(data,plane,slice){
      require(tidyverse)
      tmp = data %>% filter(get(plane) %in% slice)

      Trace = list(
        x = tmp %>% select(X) %>% unique() %>% unlist() %>% unname(),
        y = tmp %>% select(Y) %>% unique() %>% unlist() %>% unname(),
        z = tmp %>% select(Z) %>% unique() %>% unlist() %>% unname()
      )

      switch(plane,
             "Z"={
               oneplane = expand.grid(x = Trace$x, y = Trace$y)
               oneplane$z <- tmp %>% select(Val) %>% unlist() %>% unname()

               Trace$SurfaceColor = as.matrix(spread(oneplane, key = x, value = z)[, -1]) %>% unname()
               Trace$z <- matrix(slice, ncol=ncol(Trace$SurfaceColor), nrow=nrow(Trace$SurfaceColor))
               Trace
             },
             "Y"={
               oneplane = expand.grid(x = Trace$x, z = Trace$z)
               oneplane$y <- tmp %>% select(Val) %>% unlist() %>% unname()

               Trace$SurfaceColor = as.matrix(spread(oneplane, key = z, value = y)[, -1]) %>% unname()
               Trace$y <- matrix(slice, ncol=ncol(Trace$SurfaceColor), nrow=nrow(Trace$SurfaceColor))
               Trace
             },
             "X"={
               oneplane = expand.grid(y = Trace$y, z = Trace$z)
               oneplane$x <- tmp %>% select(Val) %>% unlist() %>% unname()

               Trace$SurfaceColor = as.matrix(spread(oneplane, key = y, value = x)[, -1]) %>% unname()
               Trace$x <- matrix(slice, ncol=ncol(Trace$SurfaceColor), nrow=nrow(Trace$SurfaceColor))
               Trace
             }
      )
    }

    Trace1 = getTrace(DATA,"Z",45)
    Trace2 = getTrace(DATA,"Y",45)

    # This works as intended (except I can't seem to make the surface greyscale)
    plot_ly() %>% 
      add_trace(x=Trace1$x,
                y=Trace1$y,
                z=Trace1$z, 
                type="surface", 
                cauto=T,
                surfacecolor=Trace1$SurfaceColor,
                colorscale=c("white","black")
      )  %>%
      layout(title="Ok one-surface plot",
             scene = list(
        aspectratio = list(
          x = 91/109, 
          y = 1, 
          z = 91/109
        ), 
        xaxis = list(
          backgroundcolor = "rgb(230, 230,230)", 
          gridcolor = "rgb(255, 255, 255)", 
          showbackground = TRUE, 
          zerolinecolor = "rgb(255, 255, 255)",
          range=c(1,91)
        ), 
        yaxis = list(
          backgroundcolor = "rgb(230, 230,230)", 
          gridcolor = "rgb(255, 255, 255)", 
          showbackground = TRUE, 
          zerolinecolor = "rgb(255, 255, 255)",
          range=c(1,109)
        ), 
        zaxis = list(
          backgroundcolor = "rgb(230, 230,230)", 
          gridcolor = "rgb(255, 255, 255)", 
          range = c(1, 91), 
          showbackground = TRUE, 
          zerolinecolor = "rgb(255, 255, 255)"
        )
      ))

    # This definately does not do as intended
    plot_ly() %>% 
      add_trace(x=Trace1$x,
                y=Trace1$y,
                z=Trace1$z, 
                type="surface", 
                cauto=T,
                surfacecolor=Trace1$SurfaceColor,
                colorscale=c("white","black")
      ) %>%
      add_trace(x=Trace2$x,
                y=Trace2$y,
                z=Trace2$z, 
                type="surface", 
                cauto=T,
                surfacecolor=Trace2$SurfaceColor,
                colorscale=c("white","black")
      ) %>%
      layout(title="Bogus plot",
             scene = list(
               aspectratio = list(
                 x = 91/109, 
                 y = 1, 
                 z = 91/109
               ), 
               xaxis = list(
                 backgroundcolor = "rgb(230, 230,230)", 
                 gridcolor = "rgb(255, 255, 255)", 
                 showbackground = TRUE, 
                 zerolinecolor = "rgb(255, 255, 255)",
                 range=c(1,91)
               ), 
               yaxis = list(
                 backgroundcolor = "rgb(230, 230,230)", 
                 gridcolor = "rgb(255, 255, 255)", 
                 showbackground = TRUE, 
                 zerolinecolor = "rgb(255, 255, 255)",
                 range=c(1,109)
               ), 
               zaxis = list(
                 backgroundcolor = "rgb(230, 230,230)", 
                 gridcolor = "rgb(255, 255, 255)", 
                 range = c(1, 91), 
                 showbackground = TRUE, 
                 zerolinecolor = "rgb(255, 255, 255)"
               )
             ))

解决方案

In Trace2, z is an integer. And I believe, z in both traces needs to be a matrix in order to work.

> class(Trace2$y)
[1] "matrix"
> class(Trace2$z)
[1] "integer"

So using a simpler example with both z a matrix, it works. In the first matrix, all z values are the same (matrix2 = 6). But in the second, the y values are constant, but the z values are different.

matrix2 <- c(
  c(6,6,6,6,6,6),
  c(6,6,6,6,6,6),
  c(6,6,6,6,6,6),
  c(6,6,6,6,6,6)
)
dim(matrix2) <- c(6,4)

x <- c(1,2,3,4,5, 6)
y <- c(1,2,3,4)
rownames(matrix2) <- x
colnames(matrix2) <- y


plot_ly() %>% add_surface(z~matrix2, x= x, y = y)

matrix22 <- c(
  c(5,5.5,6,6.5),
  c(5,5.5,6,6.5),
  c(5,5.5,6,6.5),
  c(5,5.5,6,6.5)
)
dim(matrix22) <- c(4,4)

x2 <- c(1,2,3,4)
y2 <- c(3,3,3,3)
rownames(matrix22) <- x2
colnames(matrix22) <- y2

plot_ly() %>% add_surface(z~matrix22, x= x2, y = y2) %>% add_surface(z~matrix2, x= x, y = y)

Gives this:

这篇关于R中体积空间中的切片的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

查看全文
登录 关闭
扫码关注1秒登录
发送“验证码”获取 | 15天全站免登陆