簡體   English   中英

如何將 883276440288 中的軸居中於 3d 散點圖 plot 中的 R?

[英]How to center the axes in Plotly on a 3d scatter plot in R?

我有一個 3d 散點圖 plot,它是我在 R 中用 Plotly 創建的 - 是否可以將軸移動到中間? 我的 plot 現在看起來與我在 R 中快速制作的 plot 相似:

在此處輸入圖像描述

但我想刪除網格背景、軸刻度,並將軸移動到 plot 的中間,使其看起來類似於:

在此處輸入圖像描述

我的主要問題是將軸移動到中間,同時保持軸上的 x、y 和 z 標簽。 我已經使用軌跡來模擬中心軸,但是當我刪除背景網格和軸時,我遇到了沒有軸標簽的問題。 關於這個,go 最好的方法是什么?

重新創建第一個 plot 的代碼也在下面:

coords = list("x"=c(), "y"=c(), "z"=c())
for(phi in seq(0, 2*pi, 0.2)) {
  for(theta in seq(0, pi, 0.2)) {
    x = (8 * sin(theta) * cos(phi))
    y = (8 * sin(theta) * sin(phi))
    z = (8 * cos(theta))
    coords$x = append(coords$x, x)
    coords$y = append(coords$y, y)
    coords$z = append(coords$z, z)
  }
}
df = data.frame("x"=coords$x, "y"=coords$y, "z"=coords$z)
fig = plot_ly(df, x=~x, y=~y, z=~z, type="scatter3d",
              mode="markers", marker=list(size=3))
fig = layout(fig, scene=list(xaxis=list(range=c(-12, 12)),
                             yaxis=list(range=c(-12, 12)),
                             zaxis=list(range=c(-12, 12))))
fig

這個怎么樣?

在此處輸入圖像描述

如果將文本設為粗體: 在此處輸入圖像描述

我想如果我能把文字加粗會更好看。 在將在 function annots中生成的 object getvals 在您看到text = "x" (y 或 z)的地方,如果您喜歡粗體,請注釋為text = "<b>x</b>"

我試圖使它動態化,以便更容易地重新利用它,但我沒有測試任何 Plotly 可能的極端情況。 它基於只有 1 條軌跡並且該軌跡是scatter3d的假設。

我想指出的是,將線標記為mode = "lines"一直被 Plotly 打敗,呈現為lines+markers 如果我不指定它為lines+markers ,我也無法控制標記。 這就是為什么您會看到標記被調用但基本上隱藏的原因。

getvals <- function(plt) {
  plt <- plotly_build(plt) # ensure data is in object
  if(isTRUE(length(plt$x$data) == 1)) {
    df1 <- data.frame(x = plt$x$data[[1]]$x, # extract data
                      y = plt$x$data[[1]]$y,
                      z = plt$x$data[[1]]$z)
    mx <- max(df1$x); my <- max(df1$y); mz <- max(df1$z) # for segments
    nx <-.25 * mx; ny <- .25 * my; nz <- .25 * mz # for line segment size
    d <- colMeans(df1)
    dx <- d[[1]]; dy <- d[[2]]; dz <- d[[3]]     # line segment center
    hx <- dx + nx; hy <- dy + ny; hz <- dz + nz  # line segment high
    lx <- dx - nx; ly <- dy - ny; lz <- dz - nz  # line segment low
    plt <- plt %>%  # add the traces for the internal axes indic.
      add_trace(x = c(lx, hx), y = c(dy, dy), z = c(dz, dz), # x axis line
                mode = "lines+markers", 
                hoverinfo = "skip", marker = list(size = .01),
                line = list(color = "black", width = 3)) %>% 
      add_trace(x = c(dx, dx), y = c(ly, hy), z = c(dz, dz), # y axis line
                mode = "lines+markers",
                hoverinfo = "skip", marker = list(size = .01),
                line = list(color = "black", width = 3)) %>% 
      add_trace(x = c(dx, dx), y = c(dy, dy), z = c(lz, hz), # z axis line
                mode = "lines+markers", 
                hoverinfo = "skip", marker = list(size = .01),
                line = list(color = "black", width = 3)) %>% 
      add_trace(x = dx, y = dy, z = dz, type = "scattered",  # center ball
                mode = "markers", hoverinfo = "skip", 
                marker = list(size = 8, color = "black"))
    annots <- list(                   # text annotations x, y, z
      list(showarrow = F, x = hx, y = dy, z = dz,
           text = "x", xanchor = "right", xshift = -5,
           font = list(size = 20)),
      list(showarrow = F, x = dx, y = hy, z = dz,
           text = "y", xshift = -5, 
           font = list(size = 20)),
      list(showarrow = F, x = dx, y = dy, z = hz,
           text = "z", xshift = -5,
           font = list(size = 20)))
    assign("annots", annots, envir = .GlobalEnv)
    plt # return plot; send annotations to the global env
  }
}

使用那個 function

拿你原來的 plot,減去layout電話。 我添加了showlegend = F ,因為當添加其他痕跡時,它會創建一個圖例。 您可以將 pipe 轉為 plot,或者這樣做。

fig = plot_ly(df, x = ~x, y = ~y, z = ~z, type = "scatter3d",
              mode = "markers", marker = list(size = 3),
              showlegend = F) 

fig %>% getvals() %>% 
  layout(
    scene = list(
      aspectratio = list(x = 1, y = 1, z = 1),
      camera = list(
        center = list(x = 0, y = 0, z = 0),
        eye = list(x = -.5, y = .5, z = .6)),
      up = list(x = 0, y = 0, z = 1),
      xaxis = list(showgrid = FALSE, zeroline = FALSE, range = c(-12, 12),
                   showticklabels = FALSE, title = list(text = "")),
      yaxis = list(showgrid = FALSE, zeroline = FALSE, range = c(-12, 12),
                   showticklabels = FALSE, title = list(text = "")),
      zaxis = list(showgrid = FALSE, zeroline = FALSE, range = c(-12, 12),
                   showticklabels = FALSE, title = list(text = "")),
    dragmode = "turntable",
    annotations = annots
  ), margin = list(t = 30, r = 30, l = 30, b = 30, padding = 2))

暫無
暫無

聲明:本站的技術帖子網頁,遵循CC BY-SA 4.0協議,如果您需要轉載,請注明本站網址或者原文地址。任何問題請咨詢:yoyou2525@163.com.

 
粵ICP備18138465號  © 2020-2024 STACKOOM.COM