Displaying 20 results from an estimated 22 matches for "lines3d".
2012 Jul 10
1
RGL 3D curvilinear shapes
...0,0.32,0.59,0.77,0.87,0.93,0.96,0.98,0.99,1,
0,0.39,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,...
2011 Apr 25
1
Defining origin for rotation in RGL device
Hi all,
How can I tell RGL to set the center for the rotation to the origin of the coordinate system (0,0,0).
It seems that the default is to use the center of the display not the origin of the coordinate system.
open3d()
lines3d(c(0, 1), c(0,0), c(0,0))
lines3d(c(0,0), c(0, 1), c(0,0))
lines3d(c(0,0), c(0,0), c(0, 1))
TIA
Mark
???????????????????????????????????????
Mark Heckmann
Blog: www.markheckmann.de
R-Blog: http://ryouready.wordpress.com
2009 Aug 13
1
joining two points in rgl
Hi!!
I need to draw a cylinder/tube joining two points. I am trying to make something presentable, I have been able to do it using lines3d. But is it possible to
increase the thickness of the lines? The size parameter does not work. Does any one have any suggestions?
Thanks ../Murli
library(rgl)
pts<-structure(list(x = c(-0.975688, -0.975688), y = c(9.258795, -9.258795
), z = c(-1.8, 1.8)), .Names = c("x", "y"...
2007 May 29
1
rgl.postscript
...;-9-path.one[-ge9recs,1]
ly1<-rep(0,length(ge9recs))
y1<-c(uy1,ly1)
uy2<--1*(9-path.two[-ge9recs,1])
ly2<-rep(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...
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:
2006 Jun 29
3
advice on arguments
...omplex.
The particular case I have now is a little simpler.
foo2 (points3d) and foo3 (spheres3d)
are both functions from the rgl package
that pass arguments such as color, alpha, etc. along to
an rgl.material() command with lots of possible arguments.
(The function may also call segments3d or lines3d, but
these all have the same arguments as points3d.)
However, to change the size of points you use "size"; to
change the size of spheres you use "radius". Do I
(1) add "radius" to the argument list, cluttering up
the argument list for one particular special case?
(2)...
2010 Apr 19
2
Drawing a line with misc3d
Hi the list,
I would like to draw some lines with misc3d. I find a lot of tools to
draw surfaces, but nothing for simple line... Is it possible?
Note that I know that it is possible to draw lines with rgl (using
lines3d), but I need to do it with misc3d to export the drawing in .asy
format.
Any solution?
Christophe
2011 Feb 16
2
tikzDevice compiling problem
...e la funci?n de utilidad
f = function(x, y) ((y)^1*(x)^1)
x = seq(0,5,len=40)
y = seq(0,5,len=40)
z = outer(x, y, f)
showsurface = function(x, y, z)
persp3d(x,y,z, col="blue", alpha=0.3, axes=
F)+{
contours = contourLines(x,y,z)
for (i in 1:length(contours)) {
with(contours[[i]], lines3d(x, y, level, col="darkred"))
}
}
open3d()
showsurface(x,y,z)
# Cierro el device
dev.off()
# Compilo el archivo tex
tools::texi2dvi('CobbGRAF.tex',pdf=F)
--
View this message in context: http://r.789695.n4.nabble.com/tikzDevice-compiling-problem-tp3309028p3309028.html
Sent...
2006 May 23
1
shapes in rgl
...ls="lightgreen"){
rgl.bg(color="white")
rgl.spheres(x,(z-rad),-y,rad,col=cols,alpha=1)
x<-rep(x,each=3)
y<-rep(y,each=3)
z<-rep(z-rad*2,each=3)
a<-seq(3,length(x),by=3)
y[a]<-NA
x[a]<-NA
z[a]<-NA
a<-seq(1,length(x),by=3)
z[a]<-0
lines3d(x,y,z,col="brown",size=5,add=T)
rgl.bbox(color="black", emission="lightgreen", specular="#3333FF",
shininess=5, alpha=0.8 )
}
x<-runif(100,0,100)
y<-runif(100,0,100)
z<-runif(100,10,30)
rad<-z/5
Trees3d(x,y,z,rad)
Thanks,
Duncan Golicher
-...
2009 May 29
1
labels in rgl.sphere
Dear R list
I am using rgl.sphere to visualize scatter plot data in three
dimensional space.
Thanks to the rgl library, I can easily find out the data point that I
am interested in.
However, as I can not see the labels of each data point directly in
RGL window,
I usually look for the values of x, y, z axis to find out the label
(or line number of the data point).
Is there any way that I
2005 Jun 04
0
New CRAN package misc3d
...mputed by the marching cubes algorithm.
image3d Crude 3d analog of image() using rgl to plot points on a
three dimensional grid representing values in a three
dimensional array. Assumes high values are inside and
uses alpha blending to make outside points more
transparent.
lines3d Draws connected line segments in an rgl window.
parametric3d Plots a two-parameter surface in three dimensions in
rgl. Based on Mathematica's Param3D
slices3d Uses tkrplot to create an interactive slice view of three or
four dimensional vol...
2005 Aug 21
0
RGL v0.65
...function name pattern:
XXX3d()
The functions map to rgl functions internally (with some exceptions).
Here's a short list of interesting spots in the interface API:
* par3d() can be used to get/set values on the current RGL device.
* Primitives functions such as points3d(), lines3d(), surface3d(), ...
* First bunch of generic transformation utilities, rendering methods
and mesh objects are implemented.
The rgl interface using the pattern "rgl.XXX()" is still available.
You can decide between more OpenGL/RGL'is low-level functions or
more R'...
2005 Jun 04
0
New CRAN package misc3d
...mputed by the marching cubes algorithm.
image3d Crude 3d analog of image() using rgl to plot points on a
three dimensional grid representing values in a three
dimensional array. Assumes high values are inside and
uses alpha blending to make outside points more
transparent.
lines3d Draws connected line segments in an rgl window.
parametric3d Plots a two-parameter surface in three dimensions in
rgl. Based on Mathematica's Param3D
slices3d Uses tkrplot to create an interactive slice view of three or
four dimensional vol...
2005 Aug 21
0
RGL v0.65
...function name pattern:
XXX3d()
The functions map to rgl functions internally (with some exceptions).
Here's a short list of interesting spots in the interface API:
* par3d() can be used to get/set values on the current RGL device.
* Primitives functions such as points3d(), lines3d(), surface3d(), ...
* First bunch of generic transformation utilities, rendering methods
and mesh objects are implemented.
The rgl interface using the pattern "rgl.XXX()" is still available.
You can decide between more OpenGL/RGL'is low-level functions or
more R'...
2012 Jan 06
1
how to use rgl to plot dynamic orbit
Dear all,
I have a question about the plotting of the dynamical orbit by using rgl.
My code is as follows:
open3d()
par3d(cex=2)
bg3d("white")
for(i in 1:out.length){
ind<-which
plot3d(x[1:i],y[1:i],out[,"z"][1:i],xlim=c(-10,10),ylim=c(-10,10),zlim=c(-10,10),col="red",cex=2)
Sys.sleep(0.0001)
}
,where x,y,out[,"z"] are the position of the object in
2017 Jul 10
2
helix spring in R
Dear useRs,
Is there a way to draw helix spring in R of desired diameter and number of turns?
regards,
Eliza
[[alternative HTML version deleted]]
2010 Sep 25
3
3D plot
hey, how can i plot this function??? thanks for ur help
n=1000
m=2
k=n/m
N=100
myfun <- function(n, m, alpha = .05, seeder = 1000) {
l=matrix(0,nrow=m,ncol=N)
for(i in 1:N){
set.seed(i)
for(j in 1:m){
x=rnorm(n,0,0.5)
y=rnorm(n,0,0.8)
l[j,i]=cor((x[(((j-1)*k)+1):(((j-1)*k)+k)]),
(y[(((j-1)*k)+1):(((j-1)*k)+k)]))
}
}
for(i in 1:N){
for (j in 1:m){
gute <- function() {
q_1 <-
2006 Mar 11
2
Draw level lines on the surface of a bivariate function
Hello,
Is it possible to draw level lines on the surface of a bivariate function?
In the following example, to draw surface and levels lines for a
multivariate normal law,
I use persp, trans3d, contourLines and lines,
but if the lines are correctly drawn, some parts of them are, of
course, visible
even if they are drawn on a non visible "face".
Any suggestion to avoid this problem
2012 Jan 09
4
RGL- Drawing Circle
hi, i want to draw a simple circle by using 3d package RGL.
i think i can use the command rgl.lines by studying the code from:
http://www.swiftless.com/tutorials/opengl/circle.html
but is there a faster and easier way to do it??
graham
--
View this message in context: http://r.789695.n4.nabble.com/RGL-Drawing-Circle-tp4278717p4278717.html
Sent from the R help mailing list archive at
2007 Feb 21
1
Installing Package rgl - Compilation Fails - FreeBSD
...in 'rgl-Ex.R' failed.
>> The error most likely occurred in:
>>
>>> ### * 3dobjects
>>>
>>> flush(stderr()); flush(stdout())
>>>
>>> ### Name: points3d
>>> ### Title: add primitive set shape
>>> ### Aliases: points3d lines3d segments3d triangles3d quads3d
>>> ### Keywords: dynamic
>>>
>>> ### ** Examples
>>>
>>> # Show 12 random vertices in various ways.
>>>
>>> M <- matrix(rnorm(36), 3, 12, dimnames=list(c('x','y','z'),
>>...