Plot Sphere with custom gridlines in R

浪子不回头ぞ 提交于 2019-12-25 00:08:49

问题


I would like to plot a sphere in R with the gridlines on the surface corresponding to the equal area gridding of the sphere using the arcos transformation.

I have been experimenting with the R packakge rgl and got some help from : Plot points on a sphere in R

Which plots the gridlines with equal lat long spacing.

I have the below function which returns a data frame of points that are the cross over points of the grid lines I want, but not sure how to proceed.

plot_sphere <- function(theta_num,phi_num){

  theta <- seq(0,2*pi,(2*pi)/(theta_num))

  phi <-  seq(0,pi,pi/(phi_num))

  tmp <- seq(0,2*phi_num,2)/phi_num

  phi <- acos(1-tmp)

  tmp <- cbind(rep(seq(1,theta_num),each = phi_num),rep(seq(1,phi_num),times = theta_num))

  results <- as.data.frame(cbind(theta[tmp[,1]],phi[tmp[,2]]))
  names(results) <- c("theta","phi")

  results$x <- cos(results$theta)*sin(results$phi)
  results$y <- sin(results$theta)*sin(results$phi)
  results$z <- cos(results$phi)
  return(results)
}

sphere <- plot_sphere(10,10)

Can anyone help, in general I am finding the rgl functions tricky to work with.


回答1:


If you use lines3d or plot3d(..., type="l"), you'll get a plot joining the points in your dataframe. To get breaks (you don't want one long line), add rows containing NA values.

The code in your plot_sphere function seems really messed up (you compute phi twice, you don't generate vectors of the requested length, etc.), but this function based on it works:

function(theta_num,phi_num){

  theta0 <- seq(0,2*pi, len = theta_num)

  tmp <- seq(0, 2, len = phi_num)

  phi0 <- acos(1-tmp)

  i <- seq(1, (phi_num + 1)*theta_num) - 1

  theta <- theta0[i %/% (phi_num + 1) + 1]
  phi <- phi0[i %% (phi_num + 1) + 1]

  i <- seq(1, phi_num*(theta_num + 1)) - 1
  theta <- c(theta, theta0[i %% (theta_num + 1) + 1])
  phi <- c(phi, phi0[i %/% (theta_num + 1) + 1])

  results <- data.frame( x = cos(theta)*sin(phi),
                         y = sin(theta)*sin(phi),
                         z = cos(phi))
  lines3d(results)
}


来源:https://stackoverflow.com/questions/54816367/plot-sphere-with-custom-gridlines-in-r

易学教程内所有资源均来自网络或用户发布的内容,如有违反法律规定的内容欢迎反馈
该文章没有解决你所遇到的问题?点击提问,说说你的问题,让更多的人一起探讨吧!