Displaying 20 results from an estimated 4000 matches similar to: "(no subject)"
2004 Mar 17
3
Persp plotting of kernel density estimate.
Dear All,
I am trying to visualize the surface of a bivariate kernel density
estimate.
I have a vector of bivariate observations(x,y), and a function which
computes the kernel density estimate z corresponding to each
observation.
I cannot generate the (x,y) data in the ascending order needed by
persp(x,y,z).
I was wondering whether there is an R version of the S function interp.
Would anybody
2009 Mar 30
1
Warning messages in Splancs package :: no non-missing arguments to min; returning Inf
Hi,
I would need some help with the splans package in R.
I am using a Shapefile (downloadable at)
http://rapidshare.com/files/215206891/Redlands_Crime.zip
and the following execution code
setwd("C:\\Documents and
Settings\\Dejan\\Desktop\\GIS\\assignment6\\DataSet_Redlands_Crime\\Redlands_Crime")
library(foreign)
library(splancs)
auto_xy<-read.dbf("Auto_theft_98.dbf")
2007 Dec 17
1
polygon class in splancs package
Dear forum,
I would like to use the kernel2d or spkernel2d in the Splancs-package, but
it does not recognize my polygon data.
"Error in kernel2d(as.points(ptsbin), polygonprov, h0 = 2, nx = 100, : " is
the error message.
Invalid poly argument
The data are defined as follows:
polgonprov<-list(x=polyprov$X, y=polyprov$Y) with X and Y coordinates in the
Lambert1972
2010 Jan 01
2
How to calculate density function of Bivariate binomial distribution
Am trying to do some study on bivariate binomial distribution. Anyone knows
if there is package in R that I can use to calculate the density function of
bivariate binomial distribution and to generate random samples of it.
Thanks,
--
View this message in context: http://n4.nabble.com/How-to-calculate-density-function-of-Bivariate-binomial-distribution-tp992002p992002.html
Sent from the R help
2005 Mar 07
1
plot gam object
Dear R help,
I am fitting a gam model with package GAM ( I use lo() to fit 2 non-parametric
additive components).
When I plot the GAM object, along with the graphics window displaying plots of
each components, I read the following warnings at the prompt:
3: the condition has length 1 and only the first element will be used in: if
(scale2 < scale) rep(mean(ylim), 2) + ((ylim - mean(ylim))
2003 Sep 17
1
Bivariate Ripley K function
Hello,
I have used the univariate Ripley K function in R, but does anyone know if
there is a bivariate function built in? I have two species that I am dealing
with.
Also, how might I add error bars into the graphs (univariate and/or
bivariate)?
Thank you,
Karin Leiderman
k_leiderman at hotmail.com
Graduate Student/Research Assistant
Department of Mathematics
Univesity of New Mexico
2005 Sep 16
1
Question:manipulating spatial data using combination of Maptools and Splancs
Hi,
I have a problem that concerns combination of the package Maptools and
Splancs
I have 2 shapefiles that i want to manipulate (one of type point and one
polygon).I import them in R using Maptools but then i can't estimate a
quartic Kernel using Splancs. The package doesn't recognize the shapes
(invalid points and poly argument).I don't know if this is an easy task but
i have
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
2010 Feb 20
1
Add lines (contours) to lattice wireframe plot
Hi,
I draw a surface corresponding to bivariate density of independent
variables (rho=0) using persp(). Then I add a contour line (i.e.,
circle in my case) at a particular density. Below is a minimal example
of what I have so far.
# Bivariate density
dnorm2d <- function(x, y, rho = 0) {
xoy = (x^2 - 2 * rho * x * y + y^2)/(2 * (1 - rho^2))
density = exp(-xoy)/(2 * pi * sqrt(1 - rho^2))
2002 Oct 01
2
R-gui
I discover last week the R software statistics programm, I have a small
questions, When we generate a bivariate normal distribution is it
possible to plot the generate distribution.
The second one if there is a code to generate a bivariate student
distribution.
If yes i would ask you gratefully a help.
Thank you very much
2003 Jul 12
2
help with bivariate density plot question
Dear R users:
I have a dataset with two variables (>20000 observations, two samples from same subject) and I used "kernSur" from library(Genkern) to
get a estimated bivariate density and corresponding plots as follows:
new.data.normal<-data.normal[!is.na(data.normal[,2]),]
x<-new.data.normal[,2]
y<-new.data.normal[,3]
op <- KernSur(x,y, xgridsize=50, ygridsize=50,
2002 Jan 24
1
Simulation of a particular type of population
Does anyone have any R code or suggestions on how to generate a population
that follows a Neyman-Scott process? More specifically, I'd like to
randomly generate both the parents and the children from Poisson
distributions and the children locations from a bivariate normal onto an
N by N grid. If the locations spill over outside the grid, then I'd like
to reflect those locations back into
2011 Feb 09
1
Plot bivariate density with densities margins
Dear R users,
I would like to plot the bivariate density surface with its marginal
densities on the sides of the 3D box, just like in the picture I attach. I
tried to found information about how to do it but did not find anything.
Does anyone know how to do it?
Thanks in advance,
Eduardo.
2003 Aug 30
1
3D plot of a bivariate normal distribution
Hi,
I've used the Mathematica to produce 3D graphics, contour plots of a
bivariate normal distribution
Now I want make these graphics in R, but i do not know how.
I would like to:
- Plot a 3D graph for some different variance matrix
- Plot the contour plots
- Find and try to plot (in the 3d graph ou contour plot) the (1-a)%
confidence region based in a chi-square(a) with the degrees of
2008 May 05
3
troubles with R CMD check and examples under Ubuntu gutsy
Dear listers,
I was used to package pgirmess under Windows with everything OK, but,
for the first time, I had a trial this afternoon on Ubuntu 7.10 gutsy (I
have a double boot computer and work more and more under unix) and R
2.7.0. Everything went OK except this:
sudo R CMD check pgirmess
.....
* checking examples ... ERROR
Running examples in 'pgirmess-Ex.R' failed.
The error most
2012 Feb 15
3
(sin asunto)
Hola
Alguien me podría decir como hacer una grafica
del tipo persp() de la densidad de una distribucion
normal bivariante estandarzada con correlacion 0.5??
gracias
[[alternative HTML version deleted]]
2008 Jul 29
1
tensor product of equi-spaced B-splines in the unit square
Dear all,
I need to compute tensor product of B-spline defined over equi-spaced
break-points.
I wrote my own program (it works in a 2-dimensional setting)
library(splines)
# set the break-points
Knots = seq(-1,1,length=10)
# number of splines
M = (length(Knots)-4)^2
# short cut to splineDesign function
bspline = function(x) splineDesign(Knots,x,outer.ok = T)
# bivariate tensor product of
2007 May 17
1
3d graph question
Hi, this is simple,
I've generated a bivariate normal distribution with a known correlation.
I want to plot the density function with p(y,x) on the vertical axis
and x, and y on the horizontal axes. How is that done? Thanks in advance!
library(MASS)
mu <- c(0,1) # mean vector
sigma <- matrix(c(1,.8,.8,1), ncol=2)
tmp <- mvrnorm(1000, mu, sigma)
cor(tmp)
2005 Sep 05
1
bivirate k-function
Hi
Is there anyone who can help a reporter (me) with the following:
I want to use the bivirate k-function to determin if burgerbars are
clustered around schools.
To that purpose I’ve been told to use the bivirate k-function, but my
program Arcview doesn’t contain that.
Im stuck on a dead end – how to I for a start get the data into R?
Michael Holm
DICAR – Center for Anaytical Reporting
2008 Aug 30
1
Unable to send color palette through plot.Design to method="image"
I have been trying to specify a different color palette to the image
method in plot.Design. My model has crossed two rcs() arguments and
one two-level gender argument. The goal which appears to have been
mostly achieved is to produce separate bivariate plots for men and women
The call to plot does produce a level plot but it appears only with
the default color palette despite various