search for: persp3d

Displaying 20 results from an estimated 81 matches for "persp3d".

2009 Apr 08
1
persp3d and rgl.viewpoint for rotating 3D plots
Dear R-users, within the rgl-package, I would have a question about the usage of persp3d in combination of rgl.viewpoint. I am not able to figure out how to let a 3D plot rotating around likewise the example in ?rgl.viewpoint. It seems that when I use persp3d(...) I see something on my screen, which is different from what I get when it's rotating. Is there any different behavior b...
2009 Mar 19
1
two plots side-by-side with persp3d(rgl)
Dear R-users, I would like to place two 3D plots side-by-side in a rgl-setting. It would nice to have something like "par(mfrow=c(1,2))" for basic plots, or an array framework for wireframe(lattice) (see example below). I only managed to overlap two persp3d plots. My final idea would be to animate both surfaces using play3d(rgl). Thanks in advance for any help. Best, Carlo Giovanni Camarda # simple datasets x <- seq(-10, 10, length= 30) y <- x f <- function(x,y) { r <- sqrt(x^2+y^2); 10 * sin(r)/r } z1 <- outer(x, y, f) z1[is.na(z1)...
2013 Jun 25
1
Correct scaling of axis in persp3d plot
Hi, I want to format my axis in my persp3d plot. With my data, which I attached I created a persp3d plot with the following code, which I summarized from different code snippets I found: library(rugarch)library(rgl)library(fGarch)fd <-as.data.frame(modelfit,which ='density')color <-rgb(85,141,85,maxColorValue=255)x <-seq(...
2012 Mar 12
1
How to add/draw a persp3d graph to a plot with an existing surface/graph
...isualize the solid region bounded by those two graphs. I could draw those two 3d graphs separately, but I could not get those two to work in one single plot. Here's my code for the paraboloid: x <- seq(-10, 10, length= 30) y <- x f <- function(x,y) { 9-x^2-y^2 } z <- outer(x, y, f) persp3d(x, y, z, aspect=c(1, 1, 1), col = "lightblue", xlab = "X", ylab = "Y", zlab = "9-x^2-y^2") And my code for the cylinder with the unit circle as the base: z <- matrix(seq(0, 1, len=50), 50, 50) theta <- t(z) x <- cos(theta*2*pi) y <- sin(t...
2009 Feb 28
2
rgl persp3d bounding box color problem.
Hi guys, I hit on a problem when I use rgl. Could you try to run the code here in this link and see why the first persp3d gives a red bounding box and the second shows black? http://rafb.net/p/g1i7ur33.html (sorry for not pasting the code here directly but my previous email got filtered by this list so I suspect my code looks like spam to the spam filter) I'm expecting black color to be the right result but the...
2012 Aug 27
1
RGL plot : lighting problem when triangle3d and persp3d are used in the same plot
Dear all, I have tried to plot a triangular matrix with the function persp3d(rgl). for example z=rbind(c(1,NA,NA,NA),c(5,3,NA,NA),c(4,2,9,NA),c(8,6,5,11)) x=1:4 y=1:4 persp3d(x,y,z,color="gray") The two extreme points are not plotted (value=1 and value=10). It seems because the half of the matrix have 'NA' and perp3d need planar quadrilateral face. So...
2011 Dec 05
1
Persp3d freezes when run from within Python
G'day everyone, I've been trying to get an interactive OpenGL plot to work from within Python 2.6 using Rpy2 and the persp3d function. The problem is that the plot seems to freeze upon activation. All interactivity is lost even though it works fine when run from within the R console (version 2.11.1). Is this a known issue? Any ideas as to what might be causing this, or possibly how to fix it? cheers, wchips -- View thi...
2011 Sep 09
1
rgl: axis/viewport/box problems in persp3d()
Dear expeRts, I am a new user of rgl, below is my first trial to plot a simple function in 3d. I managed to put the axes in the right locations, but: (1) The xlab, ylab, and zlab arguments are ignored; how can I put in axes labels? (2) Since I removed the axes in persp3d() the viewport is too small; is it possible to keep the size of the viewport? (3) The box is not correctly drawn, there are two "holes", one in (0,0,1) and one in (1,1,0); how can I fix that? Cheers, Marius require(rgl) s <- seq(0, 1, length.out=21) M <- function(u) appl...
2006 Aug 15
0
zlim not working in persp3d
Hi list, I'm trying to limit the z axis plotted using persp3d {rgl} to a given range. I'm trying the following statement persp3d(g0,pa,D, xlim=range(g0),ylim=range(pa), zlim=range (zbounds),col="lightblue") where g0 and pa are both a range of 20 numbers from 0.05 to 1, and D is a 20 x 20 matrix with values ranging from 0 to 30000. I'm...
2011 Apr 05
2
Animation for pers3d
Hello all, I use persp3d from the rgl-package to plot a sruface. The typical call is persp3d(x, y, z) With cooridinate-vectros x, y and a function-values matrix z. Now I have different z's, say z_1,...,z_n Question: Is it possible to generate an animation from a sequence of such calls, for different z's? I would...
2011 Jun 08
1
3D-plotting a 2D-matrix that contains z-values (3rd dimension)
Hello, say I have a 2D-matrix (indexed by x and y), which contains z values, which I want to plot over x-y. Either dotted, or if possible as a landscape. I tried around with persp and plot3d (from rgl) and persp3d (from rgl). I sometimes get something that looks good and a while later, when trying some new data I need to worry about that again. Is there something lika a convenience function that can be used to feed the data into persp, rgl::plot3d and rgl::persp3d? At least persp3d is picky about the orde...
2012 Jun 02
0
Question about persp3d label direction
Hello, R experts I am a new user of rgl package. I want axis label to be parallel to the axis. However, I cannot find any options in package manual. Could you show me how to how to make label be parallel to crresponding axis. Especially, Z axis label, in case that it is long, protrudes out of the plot and invades the plot. Please, let me know. I spent every night and day of even a month. TK Kim
2011 Oct 31
1
3D Graph Surface and single points (eg wireframe with points)
...allo! ? I just want to make a 3D plot of a surface of a cone and want to plot some single points around. ? I tried wireframe but cannot find how to plot single points ? I tried scatterplot3d but there the surface is not simple to plot. And: How can I rotate the point of view by the z-axis ? I tried persp3d but how can I add some single points? ? Example: ? library(lattice) library(scatterplot3d) #data d <- expand.grid(x = 1:10, y = 5:15) d$z <- sqrt((d$x-4)^2 + (d$y-10)^2) wireframe(z ~ x * y, data = d, drape=T) # How to plot points?? ????????????? scatterplot3d(d$x, d$y, d$z) # How to plot...
2013 Oct 15
1
plotting a marginal distribution on the plane behind a persp() plot
R'istas: I am trying to plot a marginal distribution on the plane behind a persp() plot. My existing code is: library(MASS) X <- mvrnorm(1000,mu=c(0,0),Sigma=matrix(c(1,0,0,1),2)) X.kde <- kde2d(X[,1],X[,2],n=25) # X.kde is list: $x 1*n, $y 1*n, $z n*n persp(X.kde,phi=30,theta=60,xlab="x_b",ylab="x_a",zlab="f") ->res Any suggestions are very
2017 Oct 19
1
overlaying points and lines on a surface3d rgl plot with axes
...f 3D plots. Specifically, I want to add points and lines to a surface plot. And get the axes and labels plotted also. Here is what I have tried with an example data set : library(rgl) vol2 <- 2*volcano # Exaggerate the relief library(reshape) mvol2 <- melt(vol2) str(mvol2) # First, persp and persp3d plots do not succeed #persp(mvol2$X1,mvol2$X2,vol2,xlab="X2",ylab="X1",zlab="value",axes=TRUE,ticktype="detailed",cex.lab=1) persp3d(mvol2$X2,mvol2$X1,vol2,axes=TRUE) # Error - Increasing 'x' and 'y' values expected ?? # Next, tried to get the...
2008 May 06
1
How to put different color in some portion of a surface plot?
...by=500) v = matrix(0, nrow=length(a), ncol=length(a)) for (i in 1:length(a)) { for (j in 1:length(a)) { d = c(17989*a[i], -18109*b[j]) v[i,j] = t(d) %*% matrix(c(0.0001741, 0.0001280, 0.0001280, 0.0002570), nrow=2) %*% d } } library("rgl") open3d() persp3d(a,b,v,col="green",alpha=0.7,aspect=c(1,1,0.5)) Now I want to shed the portion with different color of the surface which satisfy following condition: 0 < (a-b) < max(a) Can anyone please tell me how to do that? Regards, ------------------------------...
2011 Oct 28
1
3d graph to show matrix of z matrix values
Hello, I'm not getting a great looking 3d graph when plotting my z values: x <- seq(0.0, max(d1), max(d1)/20) y <- seq(0.0, max(d2), max(d2)/20) z <- matrix(NA, length(x), length(y)) persp3d(x, y, z, phi=30, theta=30, scale=TRUE,shade = 0.75, col=pal[col.ind], xlab=var.name[1], ylab=var.name[2], main="3d plot") Are there other options like persp3d where I can just plot my z-values along the x and y axis?? Thanks in advance -- View this message in context: http://r.789695....
2007 Feb 09
3
two perspective plots in in plot
Dear all, I would like to put two perspective plots into one plot. The help page for ?persp shows how one can add points and lines but not another perspective plot. data(volcano) z <- 2 * volcano # Exaggerate the relief x <- 10 * (1:nrow(z)) # 10 meter spacing (S to N) y <- 10 * (1:ncol(z)) # 10 meter spacing (E to W) ## Don't draw the grid lines : border = NA persp(x,
2010 Nov 26
2
3D-surface colour based on the values of X or Y data points
Dear R-experts, Using persp3d(), I plotted a 3d surface. I would like to colour this surface based on the result values (dependent variable) grouped in, say, three to five different ranges. Later, I would also like to paint the same surface based on the range-values of one of the independent variables. Please help. Thank you....
2011 Oct 07
1
axes3d/bbox3d - axis values not fixed
...ues of the measurement for 2 of the axes. So in the end I will have one axis (z actually) behave per normal (auto-hide) and I'd like the other two axes to be custom character vectors that auto-hide. Example: x <- 1:10 y <- 1:10 z <- matrix(outer(x-5,y-5) + rnorm(100), 10, 10) open3d() persp3d(x, y, z, col="red", alpha=0.7, aspect=c(1,1,0.5),xlab='',ylab='',zlab='', axes=F) For the above, axes=F for demonstration purposes only. Now when I call: axes3d() ...the axis values hide/behave the way I want, but I want my own characters in there instead of the v...