Displaying 18 results from an estimated 18 matches for "axes3d".
2011 Oct 07
1
axes3d/bbox3d - axis values not fixed
...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 values that default.
Trying again:
open3d()
persp3d(x, y, z, col="red", alpha=0.7,
aspect=c(1,1,0.5),xlab='',ylab='',zlab='', axes=F)
axis3d('x',labels=...
2007 May 29
1
rgl.postscript
...ep(0,length(ge9recs))
y2<-c(uy2,ly2)
m1<-cbind(path.one,y1)
m2<-cbind(path.two,y2)
d.mat<-rbind(m1,m2)
open3d()
points3d(x=d.mat[,1],y=d.mat[,3],z=d.mat[,2],size=3)
lines3d(x=m1[,1],y=m1[,3],z=m1[,2],size=3)
lines3d(x=m2[,1],y=m2[,3],z=m2[,2],size=3)
I then added axes using
box3d()
axes3d(c('x--'),tick=TRUE,nticks=5)
axes3d(c('z--'),tick=TRUE,nticks=5)
axes3d(c('z++'),tick=TRUE,nticks=5)
title3d(main = "Test 3-D plot", sub = NULL, xlab ="Lag", ylab = NULL, zlab =
"Dissolved O2", line = NA)
I did some rotation to determine a...
2010 May 04
3
Kernel density estimate plot for 3-dimensional data
...imensional data in ks-package.
Here the example:
# load ks, spatstat
# three-dimensional kernel density of B
B <- pp3(runif(300), runif(300), runif(300), box3(c(0,1)))
x <- unclass(B$data)$df
H <- Hpi(x)
fhat <- kde(x, H=H)
plot(fhat)
plot(fhat, axes=FALSE, box=FALSE, drawpoints=TRUE); axes3d(c('x','y','z'))
If I try to insert my own coordinates instead of the artificial 3D-pattern, it does not work.
It would be great, if anybody could help me!
Thanks
Pascal
[[alternative HTML version deleted]]
2011 Sep 09
1
rgl: axis/viewport/box problems in persp3d()
...(rgl)
s <- seq(0, 1, length.out=21)
M <- function(u) apply(u, 1, min)
u <- s
v <- s
z <- outer(u, v, function(u,v) M(cbind(u,v)))
persp3d(u, v, z, aspect="iso", front="line", lit=FALSE, axes=FALSE, xlab="",
ylab="", zlab="")
axes3d(edges=c('x--','y--','z+-'), xlab="x", ylab="y", zlab="z")
par3d(windowRect=c(0,0,480,480))
R1 <- rotationMatrix(-55*pi/180, 1,0,0)
R3 <- rotationMatrix(50*pi/180, 0,0,1)
R <- R1 %*% R3
rgl.viewpoint(interactive=TRUE, userMatrix=R) # r...
2012 Jul 10
1
RGL 3D curvilinear shapes
...,0.66,0.82,0.9,0.95,0.97,0.99,0.99,1)
dat <- data.frame(x = x, y = y, z = z, ID = c(rep(c(1,2,3),each=10)))
plot3d(dat, type = "n", ylab = "", xlab = "", zlab = "", axes = F, ylim =
c(0,200))
lines3d(dat[1:10,])
lines3d(dat[11:20,])
lines3d(dat[21:30,])
axes3d(edge = c("x--", "y-+", "z--"), nticks = 5, ylim = c(0,200))
bbox3d(color = c("black", "white"), lit = F, back = "line")
Any ideas/tips on how to do this?
thanks in advance,
Patrick
--
View this message in context: http://r.789695.n4.n...
2012 Jun 12
4
How do I connect dots in the RGL package?
Hi all,
I just started using the rgl package in R, and I need to know how I connect
the dots I created. A simple line from one co?rdinate (x0,y0,z0) to another
(x1,y1,z1) will do. I tried using the code rgl.lines, but it doesn't accept
lines that don't stem from O (0,0,0). Please help!
Thanks!
--
View this message in context:
2009 Mar 23
1
Axes in 3D plots
I am wondering if anyone knows how to change or rotate the default axes on a 3D scatterplot. I would like to change which sides of the cube the 3 axes are displayed on.
Many thanks,
Leah Gerber
[[alternative HTML version deleted]]
2011 Aug 09
1
rgl how to plot a cylinder like arrow3d?
...otate3d(c, -theta,0,0,1) # Z-achses rotation
shade3d(addNormals(c), col=mycol)
}
open3d()
vector3D(start=c(0,0,0),end=data[,1], 'red');
vector3D(start=c(0,0,0),end=data[,2],'green')
arrow3d(c(0,0,0),data[,1],color='red');arrow3d(c(0,0,0),data[,2],
color='green')
axes3d(c('x','y','z'));title3d('main','sub','X','Y','Z');box3d()
thanks,
Ren?
2009 Apr 28
1
image3d in misc3d
...positions all set (I thought) to 1:3
image3d(arr, x = 1:3, y = 1:3, z = 1:3, vlim = quantile(arr, c(0.01, 0.99)))
## Add spheres of the same data at the same positions
spheres3d(x=expand.grid(x = 1:3, y = 1:3, z = 1:3), radius = 0.1 *sqrt(arr))
## Ooops! So why don't they match up? Add axes:
axes3d()
## For some reason the image3d is generating negative values of z...
spheres3d(x=expand.grid(x = 1:3, y = 1:3, z = -(1:3)), radius = 0.1 * arr^(1/3))
## But is this reliable? I've tried with a variety of plots and sometimes it seems as though another axis is the negative one...
I'm usin...
2011 Sep 09
1
Rgl and plotmath symbols (via sprites): a trial
...=70)
grid.newpage()
pushViewport(plotViewport(c(1,1,1,1)))
print(grid.text(expression(W(u[1],u[2])==c),rot=90))
popViewport()
dev.off()
## plot
persp3d(u, v, z, aspect="iso", front="line", lit=FALSE, axes=FALSE, xlab="",
ylab="", zlab="")
axes3d(edges=c('x--','y--','z+-'))
sprites3d(1,-0.4,0.65, radius=0.5, lit=FALSE, textype="alpha", texture="zlabel.png")
rgl.postscript("W.pdf", fmt="pdf") # print to file
# par3d(c("userMatrix", "zoom", "FOV"))...
2012 Mar 26
0
Pareto frontier plots in three dimensions
...quot;s", # CAUTION: 'type' not 'pch',
"s" for spheres
size = 0.7,
box = F, # added in below if required
axes = F) # added in below if required
if ( opt$axes == 0 ) axes3d() # add back standard
axes
if ( opt$axes == 1 ) axes3d(c('x--', 'y--', 'z-+')) # used fixed
specified axes
if ( opt$axes == 2 ) axes3d(c('x+-', 'y--', 'z++')) # used fixed
specified axes
if ( opt$axes == 3 ) invisible()...
2013 Jun 25
1
Correct scaling of axis in persp3d plot
...<-c(1:2318)f <-function(s,t){dged(s,mean=fd[t,'Mu'],sd=fd[t,'Sigma'],nu=fd[t,'Shape'])}z <-outer(x,y,f)persp3d(x,y,z,theta=50,phi=25,expand=0.75,col=color,ticktype="detailed",xlab="",ylab="time",zlab="",axes=TRUE,axes=FALSE)
axes3d(c('x--','z'))axis3d(edge='y+-',at =seq(500,2000,by=500),labels =rownames(fd)[seq(500,2000,by=500)])
My first question is:
Currently I have four date ticks on my axis, but what I don't like is, that in my data,
the starting date is in 2004, but the plots look like, as i...
2016 Apr 04
0
Question about function DrawDensity3D {VecStatGraphs3D}
...z, size = 3, color = "black")
contour3d(Cr$d, level = th[c(-1, -(Layers + 2))], x = Cr$x,
y = Cr$y, z = Cr$z, alpha = al, color = colo, add = TRUE,
engine = "rgl", fill = TRUE, smooth = 2, material = "shiny")
if (DrawAxes == TRUE) {
axes3d()
}
}
2007 Jun 05
2
biplot package
...pect3d(aspect3d)
for(i in 1:nrow(hl)) {
segments3d(rbind(matrix(0, nc=3),
hl[i,]*var.red),
col=col.var)
}
text3d(hl*var.red,
texts=rownames(hl),
col=col.var)
if(simple.axes) {
axes3d(c('x', 'y', 'z'))
}
else
decorate3d(xlab = 'PC1', ylab = 'PC2', zlab = 'PC3', box = box)
title3d(xlab = 'PC1', ylab = 'PC2', zlab = 'PC3')
} else {
require(scatterplot3d)...
2001 Jan 06
4
3D package in R
Hi all,
I am considering writing a 3D visualisation package for R.
Purposes:
- Visualise 3 dimension data
- Manipulate the data or series or any other object with the mouse as in any 3D software (3D Studio Max, Lightwave...)
- Eventually display more than just 3D objects.
Justification:
- It's always interesting to plot data before performing any analysis
- Manipulating (rotating,
2008 Jan 10
6
4 dimensional graphics
Dear all
I want to display 4 dimensional space by some suitable way. I searched
CRAN and found miscellaneous 3 dim graphics packages which I maybe can
modify but anyway I am open to any hint how to efficiently display data
like:
longitude, latitude, height, value
Thank you
Petr Pikal
petr.pikal at precheza.cz
2007 Jun 11
0
biplot package II
...ts=rownames(g), col=col.obj, alpha=.5)
aspect3d(aspect3d)
for(i in 1:nrow(hl)) {
segments3d(rbind(matrix(0, nc=3),
hl[i,]*var.factor),
col=col.var)
}
text3d(hl*var.factor,
texts=rownames(hl),
col=col.var)
if(simple.axes) {
axes3d(c('x', 'y', 'z'))
title3d(xlab=paste('PC', lambda.ini, sep=''),
ylab=paste('PC', lambda.ini+1, sep=''),
zlab=paste('PC', lambda.end, sep=''))
}
else
decorate3d(xlab=paste('PC',...
2010 May 05
0
R-help Digest, Vol 87, Issue 5
...imensional data in ks-package.
Here the example:
# load ks, spatstat
# three-dimensional kernel density of B
B <- pp3(runif(300), runif(300), runif(300), box3(c(0,1)))
x <- unclass(B$data)$df
H <- Hpi(x)
fhat <- kde(x, H=H)
plot(fhat)
plot(fhat, axes=FALSE, box=FALSE, drawpoints=TRUE); axes3d(c('x','y','z'))
If I try to insert my own coordinates instead of the artificial 3D-pattern, it does not work.
It would be great, if anybody could help me!
Thanks
Pascal
[[alternative HTML version deleted]]
------------------------------
Message: 39
Date: Tue, 4 Ma...