Displaying 20 results from an estimated 8000 matches similar to: "ts.plot data labels"
2005 Aug 12
1
access assigned objects
Dear list,
I am trying to write a function that will make a matrix of each row of a data frame (4 columns), calculate a fisher.test on each resulting matrix and assign a vector of the p-values. I have gotten through making the matrices, but cannot calculate the fisher.test.
fm<-function(x)
{dfrow<-nrow(x)
mm <- vector("list", dfrow)
for(i in 1:dfrow)
mm[[i]] <-
2008 Feb 26
1
load windows file in linux
Hello R users,
I have windows XP running Rv2.6.0 and a Solaris OS 10 x86-64 running
Rv2.4.0.
I transferred several large .rda files from windows to linux because
of memory issues. I saved as .rda files on windows. In linux, the
files load and have the proper dimensions, but will not index. I get
the following error:
"negative length vectors are not allowed".
However, I can load
2012 Feb 28
2
ts.plot and x axes customization
Dear List,
I would be pleased if someone can help me with the following issue:
I'm about to plot two time series in one plot via ts.plot which looks like:
ts.plot(series1, series2, main=main, xlab=xlab, ylab=ylab, col=c("green",
"red", "blue"), lwd=2)
The problem is, that R automatically sets the x axes labels in
5-year-intervalls. Every
2006 May 15
1
adding line to spinogram
Dear all,
I wonder what's special about spinograms {vcd} that prevents me from using
it the way I do with other plots.
I do:
> spine(f.speaker.identity ~ x.log.lengthening,
> data=ms,breaks=45,gp=gpar(fill=c("red","green")),xlab="length difference
> (log ms)",ylab="speaker")
> curve(0*x,add=T)
Error in plot.xy(xy.coords(x, y), type =
2012 Jun 04
1
Plotting with Rgraphviz
Hi All,
After a lengthy battle just to get the package installed, I am not able to
actually use Rgraphviz to generate any plots. I tried just using the sample
code in the documentation
(http://www2.warwick.ac.uk/fac/sci/moac/people/students/peter_cock/r/rgraphviz/)
and I get the following:
*> > library(Rgraphviz)
> test.matrix<-matrix(rep(c(0,1,0,0), 9), ncol=6, nrow=6)
>
2006 Jan 21
1
Bug in xy.coords() or documentation error?
Hi,
I noticed the following problem with xy.coords() in R 2.2.1-patched
(version info at the foot of this email) and R 2.3.0 unstable
(subversion no: r37123):
> xy.coords(x = matrix(1:20, ncol = 2))
Error in xy.coords(x = matrix(1:20, ncol = 2)) :
argument "y" is missing, with no default
> xy.coords(x = matrix(1:20, ncol = 2), y = NULL)
$x
[1] 1 2 3 4 5 6 7 8 9
2011 Feb 21
2
(no subject)
What is plot.new? and how can i get it to work so i can load other data?
> library(splancs)
> area = 6*4
> lambda = 1.5
> N = rpois(1,lambda*area)
> u = runif(N,-2,4)
> v = runif(N,0,4)
> plot(u,v,asp=1)
> h = chull(u,v)
> h = c(h,h[1])
> plot(u[h],v[h],"1",asp=1)
Error in plot.xy(xy, type, ...) : invalid plot type '1'
>
2001 May 04
1
scoping error in xy.coords (PR#932)
Hola!
> rm(list=ls(all=TRUE))
> x <- 1:20
> y <- 1+x+rnorm(x)
> xy.coords(y ~ x,NULL)
... expected output, correct, but when called from inside lowess:
> lowess(y ~ x)
Error in xy.coords(x, y) : x and y lengths differ
> debug(xy.coords)
> lowess(y ~ x)
debugging in: xy.coords(x, y)
... long listing deleted
if (is.language(x)) {
if (inherits(x,
2008 Oct 23
3
xy.coords in text
Hello,
I want to add text annotation about correlation on "pairs" plots. I
found that I could pass a function to the "panel" argument of pairs :
panel.annot <- function(x, y, ...) {
points(x, y, ...)
c <- cor.test(x, y)
legend("topleft", legend=substitute(rho == r, list(r=sprintf("%.2f",
c$estimate))), bty="n")
}
And then :
2005 Dec 31
1
xy.coords
In ?xy.coords it says:
If 'y' is missing and 'x' is a
formula: of the form 'yvar ~ xvar'. 'xvar' and 'yvar' are used as
x and y variables.
list: containing components 'x' and 'y', these are used to define
plotting coordinates.
time series: the x values are taken to be 'time(x)' and the y
2006 Jun 04
4
xy.coords(MATRIX) bug in code or documentation (PR#8937)
Hi, people.
xy.coords() does not behave like its documentation says, when given some
matrices. ?xy.coords says:
If 'y' is 'NULL' and 'x' is a [...] formula [...] list [...]
time series [...] matrix with two columns [...]
In any other case, the 'x' argument is coerced to a vector and
returned as *y* component [...]
Now, consider this short
2013 Feb 14
1
Alternate tick labels in xyplot
Dear Rhelp,
I would like to get alternate tick labels for the xyplot:
library(lattice)
library(grid)
xy <-xyplot(decrease ~ treatment, OrchardSprays,
??? main= "Some plot",
??????? groups = rowpos, type = "a",
??? ??????????? page???? = function(n){
???????????????????????? grid.text(LETTERS[j],
???????????????????????? y = 0.95,
???????????????????????? x = 0.15,
2008 Jun 21
2
clicking on plot and recording XY coords
Dear all,
I need to run a interactive procedure where the user
will need click on the screen (over a XY plot)
and I need to record the XY coordinate which the
user clicked. Roughly I wrote a short code below.
You see that I suppose that the user will choose
four coordinates inside the region of intersection
between three segmentes. On each click, I would like to
record the position clicked in a
2012 Apr 01
1
Error in xy.coords(x, NULL, log = log) : (list) object cannot be coerced to type 'double'
Hi there,
When I run the code below I get the error
Error in xy.coords(x, NULL, log = log) :(list) object cannot be coerced to
type 'double'
Any tips how I can resolve this?
>
> library("waveslim")
>
> vols=read.csv(file="C:/Users/ocuk/My Documents/Abs Vol.csv", header=TRUE,
> sep=",")
> x<-c(vols[,1])
> #x
> #data(ibm)
>
2007 Nov 20
1
xy.coords and log10
Is there a way to teach xy.coords, when given log="xy", or just "x"
or "y" separately, to do a decimal log10 instead of the natural log?
Cheers,
Alexy
2001 Mar 12
2
residuals from lowess fit
Colleagues
----------------------------------
System info:
R version rw1022 on NT
ESS v. 5.1.18 using emacs ver. 20.4
----------------------------------
I would like to access the residuals from a lowess fit (function lowess() )
as an aid to assessing whether I am over-smoothing or under-smoothing
a dataset (as in Cleveland's book "Visualizing data", section 3.3)
Unless I
2004 Oct 27
3
ploting an ellipse keeps giving errors
library (ellipse)
shape1 = c (1, 0, 0,1)
dim(shape1) = c(2,2)
ellipse (center = c(0,0), shape = shape1, radius = 1)
=============================
Error in plot.xy(xy.coords(x, y), type = type, col = col, lty = lty, ...) :
plot.new has not been called yet
It is really frustrating. Also what do the shape matrix, radius correspond to an ellipse function
(x-x0)^2/a + (y-y0)^2/b = 1
?
2010 Mar 09
1
Help with adding points to allEffects plot
Thanks in advance for any help.
I am attempting to add points to a plot using the allEffects command in the
effects package. When I try to add the points I get the following error
message:
Error in plot.xy(xy.coords(x, y), type = type, ...) :
plot.new has not been called yet
Strangely, using the code I've pasted below this has worked for me in the
past however figuring out what has
2007 Dec 14
1
segfault isoreg with NAs
Dear list,
As can be seen below, adding a NA to the y values
in a call to isoreg results in a segfault.
ir4 <- isoreg(1:10, y4 <- c(5, 9, 1:2, 5:8, NA, 8))
Adding missing values to the x values, on the contrary,
gives an error, but maybe the error message could be
tailored to this particular situation.
y <- c(5, 9, 1:2, 5:8, 3, 8)
x <- c(1:9, NA)
isoreg(x, y)
## error message:
2009 Jun 06
1
large numbers of observations using ME() of spdep
Dear All,
We aim to remove the spatial structure of our data using Moran Eigen
Vectors and spdep package . Our data has 3694 samples and 13
variables.
The computer stop working after almost 4 days of processing (we found
it emitting a sharp sound and with all colors on the screen. No
wories, it was restared without problem!). And we are left with
nothing: no result file was produced since the