矢量场可视化R.

时间:2013-02-18 12:37:43

标签: r vector plot

我有一个包含大量行的大文本文件。每行对应一个向量。 这是每一行的示例:

        x           y               dx              dy
99.421875   52.078125   0.653356799108  0.782479314511

前两列是矢量开始的坐标。并且两个第二列是坐标增量(结束减去开始)。 我需要制作这个矢量场的图片(一张图片上的所有矢量)。 我怎么能这样做? 谢谢

4 个答案:

答案 0 :(得分:31)

如果有大量数据(问题是"大文件"), 绘制单个矢量可能无法给出非常易读的情节。 这是另一种方法:矢量场描述了一种使平面上绘制的东西变形的方法; 将其应用于白噪声图像。

vector_field <- function(
  f,  # Function describing the vector field
  xmin=0, xmax=1, ymin=0, ymax=1,
  width=600, height=600,
  iterations=50,
  epsilon=.01,
  trace=TRUE
) {
  z <- matrix(runif(width*height),nr=height)
  i_to_x <- function(i) xmin + i / width  * (xmax - xmin)
  j_to_y <- function(j) ymin + j / height * (ymax - ymin)
  x_to_i <- function(x) pmin( width,  pmax( 1, floor( (x-xmin)/(xmax-xmin) * width  ) ) )
  y_to_j <- function(y) pmin( height, pmax( 1, floor( (y-ymin)/(ymax-ymin) * height ) ) )
  i <- col(z)
  j <- row(z)
  x <- i_to_x(i)
  y <- j_to_y(j)
  res <- z
  for(k in 1:iterations) {
    v <- matrix( f(x, y), nc=2 )
    x <- x+.01*v[,1]
    y <- y+.01*v[,2]
    i <- x_to_i(x)
    j <- y_to_j(y)
    res <- res + z[cbind(i,j)]
    if(trace) {
      cat(k, "/", iterations, "\n", sep="")
      dev.hold()
      image(res)
      dev.flush()
    }
  }
  if(trace) {
    dev.hold()
    image(res>quantile(res,.6), col=0:1)
    dev.flush()
  }
  res
}

# Sample data
van_der_Pol <- function(x,y, mu=1) c(y, mu * ( 1 - x^2 ) * y - x )
res <- vector_field(
  van_der_Pol,
  xmin=-3, xmax=3, ymin=-3, ymax=3,
  width=800, height=800,
  iterations=50,
  epsilon=.01
)
image(-res)

Van der Pol attractor

您可能希望对结果应用一些图像处理,以使其更具可读性。

image(res > quantile(res,.6), col=0:1)

After thresholding

在您的情况下,函数不描述向量字段: 你可以使用最近邻居的值或一些二维插值 (例如,来自akima包)。

答案 1 :(得分:13)

使用ggplot2,您可以执行以下操作:

library(grid) 
df <- data.frame(x=runif(10),y=runif(10),dx=rnorm(10),dy=rnorm(10))
ggplot(data=df, aes(x=x, y=y)) + geom_segment(aes(xend=x+dx, yend=y+dy), arrow = arrow(length = unit(0.3,"cm")))

enter image description here

这几乎直接来自geom_segment help page

答案 2 :(得分:5)

好的,这是一个基本解决方案:

DF <- data.frame(x=rnorm(10),y=rnorm(10),dx=runif(10),dy=runif(10))
plot(NULL, type = "n", xlim=c(-3,3),ylim=c(-3,3))
arrows(DF[,1], DF[,2], DF[,1] + DF[,3], DF[,2] + DF[,4])

答案 3 :(得分:3)

以下是pracma-package的R-Help中的示例。

library(pracma)
f <- function(x, y) x^2 - y^2
xx <- c(-1, 1); yy <- c(-1, 1)
vectorfield(f, xx, yy, scale = 0.1)
for (xs in seq(-1, 1, by = 0.25)) {
    sol <- rk4(f, -1, 1, xs, 100)
    lines(sol$x, sol$y, col="darkgreen")
}

你也可以使用箭袋。

library(pracma)
xyRange <- seq(-1*pi,1*pi,0.2)
temp <- meshgrid(xyRange,xyRange)
u <- sin(temp$Y)
v <- cos(temp$X)
plot(range(xyRange),range(xyRange),type="n",xlab=expression(frac(d*Phi,dx)),ylab=expression(d*Phi/dy))
quiver(temp$X,temp$Y,u,v,scale=0.5,length=0.05,angle=1)