[R] R crash

2010-11-15 Thread Jeremy MAZET
We distribute several R applications using the tcltk package on different 
servers or PC (Windows XP). On some machines and in a not reproducible 
way, all the R windows disappear when using functions like tkgetSaveFile 
or tkchooseDirectory. The R application remains open (the Rgui.exe 
processus is still available)!
Despite several tests, we can not identify the origin of this problem 
which seems independent of the R version! 
Have you any ideas? Are there any compatibility issues between the tcltk 
package and other applications?


Jérémy 
[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash

2013-04-09 Thread Tasnuva Tabassum
I have a generalized linear model to solve. I used package "geepack". When
I use the correlation structure "unstructured", I get a messeage that- R
GUI front-end has stopped working. Why this happens? What is the solution?
The r codes are as follows:
a<-read.table("d:/bmt.txt",header=T")
cutoffs<-c(1.75,3.34,5.09,6.93,9.11,11.8,15.3,20.1,23.7,27.3,30.9,34.3,37.6,41.5,46.5,51.1,57,63,73.1,93.68)
a$icr <- REL
library(pseudo)
pseudo <- pseudoci(time=a$TIME,event=a$icr,tmax=cutoffs)

#rearranging data
b <- NULL
 for(it in 1:length(pseudo$time)){
 b <- rbind(b,cbind(a,pseudo = pseudo$pseudo[[1]][,it],
 tpseudo = pseudo$time[it],id=1:nrow(a)))
 }
 b <- b[order(b$id),]


 library(geepack)

fit3 <-  geese(pseudo ~ as.factor(AGE) + as.factor(WEIGHT) +
as.factor(HEIGHT) ,
data =b, id=id, jack = TRUE, scale.fix=TRUE,
mean.link = "logit", corstr="unstructured")

#The results using the AJ variance estimate
cbind(mean = round(fit3$beta,4), SD = round(sqrt(diag(fit3$vbeta.ajs)),4),
Z = round(fit3$beta/sqrt(diag(fit3$vbeta.ajs)),4),
PVal = round(2-2*pnorm(abs(fit3$beta/sqrt(diag(fit3$vbeta.ajs,4))

[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash

2011-08-30 Thread Ivan Calandra

Dear users,

By running the script below, R crashes systematically at the last 
command, namely dev.off(), on Windows 7, but not on Windows XP.
I therefore don't provide a reproducible example and do not really 
extract the relevant parts of the script because it has most likely 
nothing to do with the script itself. I can do it though if you think it 
might be relevant.


R crashes on Windows 7, sessionInfo():
R version 2.13.1 (2011-07-08)
Platform: i386-pc-mingw32/i386 (32-bit)

locale:
[1] LC_COLLATE=German_Germany.1252  LC_CTYPE=German_Germany.1252
[3] LC_MONETARY=German_Germany.1252 LC_NUMERIC=C
[5] LC_TIME=German_Germany.1252

attached base packages:
[1] splines   stats graphics  grDevices utils datasets  methods
[8] base

other attached packages:
 [1] doBy_4.4.0 MASS_7.3-13snow_0.3-7 
lme4_0.999375-41
 [5] Matrix_0.9996875-3 lattice_0.19-30multcomp_1.2-7 
mvtnorm_0.9-9991
 [9] R2HTML_2.2 survival_2.36-9RSvgDevice_0.6.4.1 
R.utils_1.7.8

[13] R.oo_1.8.1 R.methodsS3_1.2.1

loaded via a namespace (and not attached):
[1] grid_2.13.1   nlme_3.1-101  stats4_2.13.1

But it works perfectly on Windows XP, sessionInfo():
R version 2.13.1 (2011-07-08)
Platform: i386-pc-mingw32/i386 (32-bit)

locale:
[1] LC_COLLATE=English_United States.1252
[2] LC_CTYPE=English_United States.1252
[3] LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C
[5] LC_TIME=English_United States.1252

attached base packages:
[1] splines   stats graphics  grDevices utils datasets  methods
[8] base

other attached packages:
 [1] doBy_4.4.0 MASS_7.3-14snow_0.3-6 
lme4_0.999375-41
 [5] Matrix_0.9996875-3 lattice_0.19-33multcomp_1.2-7 
mvtnorm_0.9-9991
 [9] R2HTML_2.2 survival_2.36-9RSvgDevice_0.6.4.1 
R.utils_1.7.8

[13] R.oo_1.8.1 R.methodsS3_1.2.1

loaded via a namespace (and not attached):
[1] grid_2.13.1   nlme_3.1-102  stats4_2.13.1

Except the locale, I don't see any difference and I don't really 
understand how that would make R crash by running dev.off(). Is there 
anything else than sessionInfo()?


Thank you for your help,
Ivan



 script -

library(R.utils)
library(RSvgDevice)
library(doBy)
primate_med <- loadObject("primate_med.Rbin")

select <- primate_med   #data object to use
seq.yvar <- c(5,12,8,9)
ind.xvar <- 4

 filename <- paste("regression", names(datobj)[ind.xvar], 
paste(names(datobj)[seq.yvar],collapse="_"), 
paste(selvarstr,collapse="_"), sep="_")

 filename <- gsub(".median", "", filename)

 select_mean <- 
summaryBy(as.formula(paste(".~",names(select)[ind.xvar])), data=select, 
FUN=mean)


 devSVG(file=paste(filename, ".svg", sep=""))
 par(mfrow=c(2,2))
 diff_len <- length(select)-length(select_mean)

 for (i in seq_along(seq.yvar)){
  k <- seq.yvar[i]
  plot(select[[k]]~select[[ind.xvar]], type="p", pch=1, 
xlab=names(select)[ind.xvar], ylab=names(select)[k], las=1)
  points(select_mean[[ind.xvar-diff_len]], select_mean[[k-diff_len]], 
pch=18, cex=2)

  two_reg(dat=select, xvar=ind.xvar, yvar=k)
 }

 dev.off()

-

--
Ivan CALANDRA
PhD Student
University of Hamburg
Biozentrum Grindel und Zoologisches Museum
Dept. Mammalogy
Martin-Luther-King-Platz 3
D-20146 Hamburg, GERMANY
+49(0)40 42838 6231
ivan.calan...@uni-hamburg.de

**
http://www.for771.uni-bonn.de
http://webapp5.rrz.uni-hamburg.de/mammals/eng/1525_8_1.php

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash

2011-09-21 Thread Ivan Calandra

Dear users,

I have already sent this email last week, but haven't received an 
answer. So here is my second try.


By running the script below, R crashes systematically at the last 
command, namely dev.off(), on Windows 7, but not on Windows XP.
I therefore don't provide a reproducible example and do not really 
extract the relevant parts of the script because it has most likely 
nothing to do with the script itself. I can do it though if you think it 
might be relevant.


R crashes on Windows 7, sessionInfo():
R version 2.13.1 (2011-07-08)
Platform: i386-pc-mingw32/i386 (32-bit)
locale:
[1] LC_COLLATE=German_Germany.1252  LC_CTYPE=German_Germany.1252
[3] LC_MONETARY=German_Germany.1252 LC_NUMERIC=C
[5] LC_TIME=German_Germany.1252
attached base packages:
[1] splines   stats graphics  grDevices utils datasets  methods
[8] base
other attached packages:
[1] doBy_4.4.0 MASS_7.3-13snow_0.3-7 
lme4_0.999375-41
[5] Matrix_0.9996875-3 lattice_0.19-30multcomp_1.2-7 
mvtnorm_0.9-9991

[9] R2HTML_2.2 survival_2.36-9RSvgDevice_0.6.4.1 R.utils_1.7.8
[13] R.oo_1.8.1 R.methodsS3_1.2.1
loaded via a namespace (and not attached):
[1] grid_2.13.1   nlme_3.1-101  stats4_2.13.1


But it works perfectly on Windows XP, sessionInfo():
R version 2.13.1 (2011-07-08)
Platform: i386-pc-mingw32/i386 (32-bit)
locale:
[1] LC_COLLATE=English_United States.1252
[2] LC_CTYPE=English_United States.1252
[3] LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C
[5] LC_TIME=English_United States.1252
attached base packages:
[1] splines   stats graphics  grDevices utils datasets  methods
[8] base
other attached packages:
[1] doBy_4.4.0 MASS_7.3-14snow_0.3-6 
lme4_0.999375-41
[5] Matrix_0.9996875-3 lattice_0.19-33multcomp_1.2-7 
mvtnorm_0.9-9991

[9] R2HTML_2.2 survival_2.36-9RSvgDevice_0.6.4.1 R.utils_1.7.8
[13] R.oo_1.8.1 R.methodsS3_1.2.1
loaded via a namespace (and not attached):
[1] grid_2.13.1   nlme_3.1-102  stats4_2.13.1

Except the locale, I don't see any difference and I don't really 
understand how that would make R crash by running dev.off(). I would 
guess that the problem comes from RSvgDevice on Windows 7. Can someone 
help me to solve this issue?


Thank you for your help,
Ivan



 script -
library(R.utils)
library(RSvgDevice)
library(doBy)
primate_med <- loadObject("primate_med.Rbin")

select <- primate_med
seq.yvar <- c(5,12,8,9)
ind.xvar <- 4

filename <- paste("regression", names(datobj)[ind.xvar], 
paste(names(datobj)[seq.yvar],collapse="_"), 
paste(selvarstr,collapse="_"), sep="_") filename <- gsub(".median", "", 
filename)


select_mean <- 
summaryBy(as.formula(paste(".~",names(select)[ind.xvar])), data=select, 
FUN=mean)


devSVG(file=paste(filename, ".svg", sep=""))
par(mfrow=c(2,2))
diff_len <- length(select)-length(select_mean)

for (i in seq_along(seq.yvar)){
  k <- seq.yvar[i]
  plot(select[[k]]~select[[ind.xvar]], type="p", pch=1, 
xlab=names(select)[ind.xvar], ylab=names(select)[k], las=1)
  points(select_mean[[ind.xvar-diff_len]], select_mean[[k-diff_len]], 
pch=18, cex=2)

  two_reg(dat=select, xvar=ind.xvar, yvar=k)
}

dev.off()
-

--
Ivan CALANDRA
PhD Student
University of Hamburg
Biozentrum Grindel und Zoologisches Museum
Dept. Mammalogy
Martin-Luther-King-Platz 3
D-20146 Hamburg, GERMANY
+49(0)40 42838 6231
ivan.calan...@uni-hamburg.de

**
http://www.for771.uni-bonn.de
http://webapp5.rrz.uni-hamburg.de/mammals/eng/1525_8_1.php

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2013-04-09 Thread Duncan Murdoch

On 13-04-09 2:41 PM, Tasnuva Tabassum wrote:

I have a generalized linear model to solve. I used package "geepack". When
I use the correlation structure "unstructured", I get a messeage that- R
GUI front-end has stopped working. Why this happens? What is the solution?


Presumably geepack has a bug.  You should simplify your example as much 
as you can and send it to the maintainer of that package.


Duncan Murdoch


The r codes are as follows:
a<-read.table("d:/bmt.txt",header=T")
cutoffs<-c(1.75,3.34,5.09,6.93,9.11,11.8,15.3,20.1,23.7,27.3,30.9,34.3,37.6,41.5,46.5,51.1,57,63,73.1,93.68)
a$icr <- REL
library(pseudo)
pseudo <- pseudoci(time=a$TIME,event=a$icr,tmax=cutoffs)

#rearranging data
b <- NULL
  for(it in 1:length(pseudo$time)){
  b <- rbind(b,cbind(a,pseudo = pseudo$pseudo[[1]][,it],
  tpseudo = pseudo$time[it],id=1:nrow(a)))
  }
  b <- b[order(b$id),]


  library(geepack)

fit3 <-  geese(pseudo ~ as.factor(AGE) + as.factor(WEIGHT) +
as.factor(HEIGHT) ,
data =b, id=id, jack = TRUE, scale.fix=TRUE,
mean.link = "logit", corstr="unstructured")

#The results using the AJ variance estimate
cbind(mean = round(fit3$beta,4), SD = round(sqrt(diag(fit3$vbeta.ajs)),4),
Z = round(fit3$beta/sqrt(diag(fit3$vbeta.ajs)),4),
PVal = round(2-2*pnorm(abs(fit3$beta/sqrt(diag(fit3$vbeta.ajs,4))

[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.



__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2013-04-10 Thread ONKELINX, Thierry
Have a look at the warning in ?geepack::geeglm It should be mentioned in 
?geepack::geese as well.

ir. Thierry Onkelinx
Instituut voor natuur- en bosonderzoek / Research Institute for Nature and 
Forest
team Biometrie & Kwaliteitszorg / team Biometrics & Quality Assurance
Kliniekstraat 25
1070 Anderlecht
Belgium
+ 32 2 525 02 51
+ 32 54 43 61 85
thierry.onkel...@inbo.be
www.inbo.be

To call in the statistician after the experiment is done may be no more than 
asking him to perform a post-mortem examination: he may be able to say what the 
experiment died of.
~ Sir Ronald Aylmer Fisher

The plural of anecdote is not data.
~ Roger Brinner

The combination of some data and an aching desire for an answer does not ensure 
that a reasonable answer can be extracted from a given body of data.
~ John Tukey

-Oorspronkelijk bericht-
Van: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] Namens 
Tasnuva Tabassum
Verzonden: dinsdag 9 april 2013 20:41
Aan: R help
Onderwerp: [R] R crash

I have a generalized linear model to solve. I used package "geepack". When I 
use the correlation structure "unstructured", I get a messeage that- R GUI 
front-end has stopped working. Why this happens? What is the solution?
The r codes are as follows:
a<-read.table("d:/bmt.txt",header=T")
cutoffs<-c(1.75,3.34,5.09,6.93,9.11,11.8,15.3,20.1,23.7,27.3,30.9,34.3,37.6,41.5,46.5,51.1,57,63,73.1,93.68)
a$icr <- REL
library(pseudo)
pseudo <- pseudoci(time=a$TIME,event=a$icr,tmax=cutoffs)

#rearranging data
b <- NULL
 for(it in 1:length(pseudo$time)){
 b <- rbind(b,cbind(a,pseudo = pseudo$pseudo[[1]][,it],  tpseudo = 
pseudo$time[it],id=1:nrow(a)))  }  b <- b[order(b$id),]


 library(geepack)

fit3 <-  geese(pseudo ~ as.factor(AGE) + as.factor(WEIGHT) +
as.factor(HEIGHT) ,
data =b, id=id, jack = TRUE, scale.fix=TRUE, mean.link = "logit", 
corstr="unstructured")

#The results using the AJ variance estimate cbind(mean = round(fit3$beta,4), SD 
= round(sqrt(diag(fit3$vbeta.ajs)),4),
Z = round(fit3$beta/sqrt(diag(fit3$vbeta.ajs)),4),
PVal = round(2-2*pnorm(abs(fit3$beta/sqrt(diag(fit3$vbeta.ajs,4))

[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
* * * * * * * * * * * * * D I S C L A I M E R * * * * * * * * * * * * *
Dit bericht en eventuele bijlagen geven enkel de visie van de schrijver weer en 
binden het INBO onder geen enkel beding, zolang dit bericht niet bevestigd is 
door een geldig ondertekend document.
The views expressed in this message and any annex are purely those of the 
writer and may not be regarded as stating an official position of INBO, as long 
as the message is not confirmed by a duly signed document.

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2011-09-21 Thread Barry Rowlingson
On Wed, Sep 21, 2011 at 8:57 AM, Ivan Calandra
 wrote:
> Dear users,

> I therefore don't provide a reproducible example and do not really extract
> the relevant parts of the script because it has most likely nothing to do
> with the script itself. I can do it though if you think it might be
> relevant.

 In which case you could reduce your code to something we can all try
- does this crash for you:

library(RSvgDevice)
devSVG(file="foo.svg")
plot(1:10)
dev.off()

 - if not then something I've taken from your script is causing the
problem. Add bits back until it crashes.

 - if it does still crash then its likely a fundamental devSVG
problem, and you've now got something that hundreds of people reading
this can just cut n paste and go 'me too' or 'crashes for me'.

Barry

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2011-09-21 Thread Ivan Calandra

Dear Barry,

Thanks for your input, that is indeed a very good idea (shame on me not 
to have thought about it...).


As expected, it works fine on Windows XP, but crashes on Windows 7 at 
dev.off (which means that the svg file is correctly created, but R 
crashes every time, a bit annoying). This is therefore a devSVG problem 
on Windows 7.


Now, does anyone know how to fix this?

TIA,
Ivan

Le 9/21/2011 10:34, Barry Rowlingson a écrit :

On Wed, Sep 21, 2011 at 8:57 AM, Ivan Calandra
  wrote:

Dear users,
I therefore don't provide a reproducible example and do not really extract
the relevant parts of the script because it has most likely nothing to do
with the script itself. I can do it though if you think it might be
relevant.

  In which case you could reduce your code to something we can all try
- does this crash for you:

library(RSvgDevice)
devSVG(file="foo.svg")
plot(1:10)
dev.off()

  - if not then something I've taken from your script is causing the
problem. Add bits back until it crashes.

  - if it does still crash then its likely a fundamental devSVG
problem, and you've now got something that hundreds of people reading
this can just cut n paste and go 'me too' or 'crashes for me'.

Barry



--
Ivan CALANDRA
PhD Student
University of Hamburg
Biozentrum Grindel und Zoologisches Museum
Dept. Mammalogy
Martin-Luther-King-Platz 3
D-20146 Hamburg, GERMANY
+49(0)40 42838 6231
ivan.calan...@uni-hamburg.de

**
http://www.for771.uni-bonn.de
http://webapp5.rrz.uni-hamburg.de/mammals/eng/1525_8_1.php

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2011-09-21 Thread Barry Rowlingson
On Wed, Sep 21, 2011 at 10:12 AM, Ivan Calandra
 wrote:
> Dear Barry,
>
> Thanks for your input, that is indeed a very good idea (shame on me not to
> have thought about it...).
>
> As expected, it works fine on Windows XP, but crashes on Windows 7 at
> dev.off (which means that the svg file is correctly created, but R crashes
> every time, a bit annoying). This is therefore a devSVG problem on Windows
> 7.
>
> Now, does anyone know how to fix this?

 Why are you using that svg device when there's a perfectly good one
included in R? See help(svg).

Barry

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2011-09-21 Thread Duncan Murdoch

On 11-09-21 5:12 AM, Ivan Calandra wrote:

Dear Barry,

Thanks for your input, that is indeed a very good idea (shame on me not
to have thought about it...).

As expected, it works fine on Windows XP, but crashes on Windows 7 at
dev.off (which means that the svg file is correctly created, but R
crashes every time, a bit annoying). This is therefore a devSVG problem
on Windows 7.

Now, does anyone know how to fix this?


RSvgDevice is a contributed package; you should contact the maintainer 
of it.  There's also an svg() device in the upcoming R 2.14.0 on Windows 
(it has been on Unix-alikes for longer, I think); perhaps it will do 
what you need.


Duncan Murdoch



TIA,
Ivan

Le 9/21/2011 10:34, Barry Rowlingson a écrit :

On Wed, Sep 21, 2011 at 8:57 AM, Ivan Calandra
   wrote:

Dear users,
I therefore don't provide a reproducible example and do not really extract
the relevant parts of the script because it has most likely nothing to do
with the script itself. I can do it though if you think it might be
relevant.

   In which case you could reduce your code to something we can all try
- does this crash for you:

library(RSvgDevice)
devSVG(file="foo.svg")
plot(1:10)
dev.off()

   - if not then something I've taken from your script is causing the
problem. Add bits back until it crashes.

   - if it does still crash then its likely a fundamental devSVG
problem, and you've now got something that hundreds of people reading
this can just cut n paste and go 'me too' or 'crashes for me'.

Barry





__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2011-09-21 Thread Ivan Calandra
I think Duncan answered it: because there is no svg() in R2.13.1 for 
Windows.

Thank you for your help
Ivan

Le 9/21/2011 13:40, Barry Rowlingson a écrit :

On Wed, Sep 21, 2011 at 10:12 AM, Ivan Calandra
  wrote:

Dear Barry,

Thanks for your input, that is indeed a very good idea (shame on me not to
have thought about it...).

As expected, it works fine on Windows XP, but crashes on Windows 7 at
dev.off (which means that the svg file is correctly created, but R crashes
every time, a bit annoying). This is therefore a devSVG problem on Windows
7.

Now, does anyone know how to fix this?

  Why are you using that svg device when there's a perfectly good one
included in R? See help(svg).

Barry



--
Ivan CALANDRA
PhD Student
University of Hamburg
Biozentrum Grindel und Zoologisches Museum
Dept. Mammalogy
Martin-Luther-King-Platz 3
D-20146 Hamburg, GERMANY
+49(0)40 42838 6231
ivan.calan...@uni-hamburg.de

**
http://www.for771.uni-bonn.de
http://webapp5.rrz.uni-hamburg.de/mammals/eng/1525_8_1.php

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash

2011-09-21 Thread Ivan Calandra

Dear Duncan,

Thanks for the info. I'll be waiting for it then.
I once tried to contact the maintainer of this package, but never got an 
answer; so I haven't tried this time. I'll try again.


Ivan

Le 9/21/2011 13:45, Duncan Murdoch a écrit :

On 11-09-21 5:12 AM, Ivan Calandra wrote:

Dear Barry,

Thanks for your input, that is indeed a very good idea (shame on me not
to have thought about it...).

As expected, it works fine on Windows XP, but crashes on Windows 7 at
dev.off (which means that the svg file is correctly created, but R
crashes every time, a bit annoying). This is therefore a devSVG problem
on Windows 7.

Now, does anyone know how to fix this?


RSvgDevice is a contributed package; you should contact the maintainer 
of it.  There's also an svg() device in the upcoming R 2.14.0 on 
Windows (it has been on Unix-alikes for longer, I think); perhaps it 
will do what you need.


Duncan Murdoch



TIA,
Ivan

Le 9/21/2011 10:34, Barry Rowlingson a écrit :

On Wed, Sep 21, 2011 at 8:57 AM, Ivan Calandra
   wrote:

Dear users,
I therefore don't provide a reproducible example and do not really 
extract
the relevant parts of the script because it has most likely nothing 
to do

with the script itself. I can do it though if you think it might be
relevant.

   In which case you could reduce your code to something we can all try
- does this crash for you:

library(RSvgDevice)
devSVG(file="foo.svg")
plot(1:10)
dev.off()

   - if not then something I've taken from your script is causing the
problem. Add bits back until it crashes.

   - if it does still crash then its likely a fundamental devSVG
problem, and you've now got something that hundreds of people reading
this can just cut n paste and go 'me too' or 'crashes for me'.

Barry








--
Ivan CALANDRA
PhD Student
University of Hamburg
Biozentrum Grindel und Zoologisches Museum
Dept. Mammalogy
Martin-Luther-King-Platz 3
D-20146 Hamburg, GERMANY
+49(0)40 42838 6231
ivan.calan...@uni-hamburg.de

**
http://www.for771.uni-bonn.de
http://webapp5.rrz.uni-hamburg.de/mammals/eng/1525_8_1.php

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash with dyn.load

2008-12-18 Thread Thibault Helleputte
Hello,

I try to incorporate C code in R.

suppose I have the following C code:

#include 
#include 

int main(int *n)
{
int i;
for(i=0; i < *n; i++) {
printf("Hello, world!\n");
}
 }


in a file named "hello.c". First I make:

g++ -c hello.c -o hello.o -I
"/Library/Frameworks/R.framework/Versions/2.8/Headers/"
g++ -dynamic hello.o -o hello.so

I work on mac, and that's why I have to set the -dynamic option. First
of all, I don't understand why I have to specify the path to R.h, but if
I don't, R.h isn't found.

My problem is the following: once the .so is generated, without any
warning or error, I open my R envirronment and type

> dyn.load("/path/to/my/hello.so")

then push on enter, and then R runs  hours, without giving me the
command invite again. What am I doing wrong?

Thank you.

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash on Mac

2009-02-27 Thread Adelchi Azzalini

If I define this function

R> ask <-  function (message = "Type in datum") 
   eval(parse(prompt = paste(message, ": ", sep = "")))

the following is produced as expected on a Linux/debian machine

R> ask("input")
input: 3
[1] 3
R> ask("input")
input: 3:6
[1] 3 4 5 6
R> ask("input")
input: c(3,6)
[1] 3 6

If I run exactly the same on a Mac (OS X 10.5.6), it still works 
provided R is run in a Terminal window. 

The outcome changes if R is run in "its own window", started by clicking 
on its icon; the first two examples are still Ok, the third one produces:


 *** caught segfault ***
 address 0x4628c854, cause 'memory not mapped'
 

R> sessionInfo()  # before crash!
R version 2.8.1 (2008-12-22) 
i386-apple-darwin8.11.1 

locale:
en_GB.UTF-8/en_GB.UTF-8/C/C/en_GB.UTF-8/en_GB.UTF-8

attached base packages:
[1] stats utils datasets  grDevices graphics  methods   base
R> R.version
   _   
   platform   i386-apple-darwin8.11.1 
   arch   i386
   os darwin8.11.1
   system i386, darwin8.11.1  
   status 
   major  2   
   minor  8.1 
   year   2008
   month  12  
   day22  
   svn rev47281   
   language   R   
   version.string R version 2.8.1 (2008-12-22)
   


-- 
Adelchi Azzalini  
Dipart.Scienze Statistiche, Università di Padova, Italia
tel. +39 049 8274147,  http://azzalini.stat.unipd.it/

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash with dyn.load

2008-12-18 Thread Martyn Plummer
On Thu, 2008-12-18 at 17:18 +0100, Thibault Helleputte wrote:
> Hello,
> 
> I try to incorporate C code in R.
> 
> suppose I have the following C code:
> 
> #include 
> #include 
> 
> int main(int *n)
> {
> int i;
> for(i=0; i < *n; i++) {
> printf("Hello, world!\n");
> }
>  }
> 
> 
> in a file named "hello.c". First I make:
> 
> g++ -c hello.c -o hello.o -I
> "/Library/Frameworks/R.framework/Versions/2.8/Headers/"
> g++ -dynamic hello.o -o hello.so
> 
> I work on mac, and that's why I have to set the -dynamic option. First
> of all, I don't understand why I have to specify the path to R.h, but if
> I don't, R.h isn't found.
> 
> My problem is the following: once the .so is generated, without any
> warning or error, I open my R envirronment and type
> 
> > dyn.load("/path/to/my/hello.so")
> 
> then push on enter, and then R runs  hours, without giving me the
> command invite again. What am I doing wrong?

It might have something to do with the fact that you call your function
"main". Try renaming it.

Also have a look at section 5.5 of the "Writing R Extensions" manual on
creating shared objects for loading into R.

Martyn

> Thank you.

---
This message and its attachments are strictly confidenti...{{dropped:8}}

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash after fGarch update

2009-02-16 Thread John Kerpel
Hi folks!
After updating my packages my R seems to have completely crashed as will not
start up - even after I installed 2.8.1 from 2.8.0.

I get the following:

Fatal error: unable to restore saved data in .Rdata

Error in loadNamespeace(name): there is no package called fGarch

But I do have a package called fGarch.

After I hit ok, it crashes and exits.  I cannot use any functionality at
all.  What do I do?

John

[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R-crash when loading workspace - Windows

2009-09-07 Thread sebed1110-divers
Dear all,

One day when I tried to load an existing workspace (when opening R or by 
load()), R crashed without any error notification.
The day before I had worked  and saved my workspace without any trouble.
At first I though it was a memory problem (workspace reaching 180Mo) or related 
to a particular script or command, so I start a new workspace. Everything was 
ok, that script and others working. Then I saved the workspace (55Mo) and tried 
to open it, without any result : R crashes without any notification again.
This occurs only with Windows. 

Does someone know how to solve that problem?

Regards,

Edwige.



  
[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash after fGarch update

2009-02-16 Thread Prof Brian Ripley

Start R with --vanilla, or rename youe saved workspace (.RData).
Then

library(fGarch)
load(".RData")  # or whatever you renamed it to.

This will either work or (more ikely) tell you it cannot find fGarch 
or a package it depends on).


On Mon, 16 Feb 2009, John Kerpel wrote:


Hi folks!
After updating my packages my R seems to have completely crashed as will not
start up - even after I installed 2.8.1 from 2.8.0.


You haven't told us your OS: I am guesing Windows.


I get the following:

Fatal error: unable to restore saved data in .Rdata

Error in loadNamespeace(name): there is no package called fGarch

But I do have a package called fGarch.

After I hit ok, it crashes and exits.  I cannot use any functionality at
all.  What do I do?

John

[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.



--
Brian D. Ripley,  rip...@stats.ox.ac.uk
Professor of Applied Statistics,  http://www.stats.ox.ac.uk/~ripley/
University of Oxford, Tel:  +44 1865 272861 (self)
1 South Parks Road, +44 1865 272866 (PA)
Oxford OX1 3TG, UKFax:  +44 1865 272595

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash after fGarch update

2009-02-17 Thread John Kerpel
Prof Ripley:

Many thanks - it did indeed say it cannot find fGarch after I tried your
advice - but a completely clean re-install did the trick.

John

On Tue, Feb 17, 2009 at 1:09 AM, Prof Brian Ripley wrote:

> Start R with --vanilla, or rename youe saved workspace (.RData).
> Then
>
> library(fGarch)
> load(".RData")  # or whatever you renamed it to.
>
> This will either work or (more ikely) tell you it cannot find fGarch or a
> package it depends on).
>
> On Mon, 16 Feb 2009, John Kerpel wrote:
>
> Hi folks!
>> After updating my packages my R seems to have completely crashed as will
>> not
>> start up - even after I installed 2.8.1 from 2.8.0.
>>
>
> You haven't told us your OS: I am guesing Windows.
>
>  I get the following:
>>
>> Fatal error: unable to restore saved data in .Rdata
>>
>> Error in loadNamespeace(name): there is no package called fGarch
>>
>> But I do have a package called fGarch.
>>
>> After I hit ok, it crashes and exits.  I cannot use any functionality at
>> all.  What do I do?
>>
>> John
>>
>>[[alternative HTML version deleted]]
>>
>> __
>> R-help@r-project.org mailing list
>> https://stat.ethz.ch/mailman/listinfo/r-help
>> PLEASE do read the posting guide
>> http://www.R-project.org/posting-guide.html
>> and provide commented, minimal, self-contained, reproducible code.
>>
>>
> --
> Brian D. Ripley,  rip...@stats.ox.ac.uk
> Professor of Applied Statistics,  http://www.stats.ox.ac.uk/~ripley/
> University of Oxford, Tel:  +44 1865 272861 (self)
> 1 South Parks Road, +44 1865 272866 (PA)
> Oxford OX1 3TG, UKFax:  +44 1865 272595
>

[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R-crash when loading workspace - Windows

2009-09-07 Thread Duncan Murdoch

On 07/09/2009 10:34 AM, sebed1110-div...@yahoo.fr wrote:

Dear all,

One day when I tried to load an existing workspace (when opening R or by 
load()), R crashed without any error notification.
The day before I had worked  and saved my workspace without any trouble.
At first I though it was a memory problem (workspace reaching 180Mo) or related 
to a particular script or command, so I start a new workspace. Everything was 
ok, that script and others working. Then I saved the workspace (55Mo) and tried 
to open it, without any result : R crashes without any notification again.
This occurs only with Windows. 


Does someone know how to solve that problem?


You need to come up with a simple scheme to reproduce it, and then 
someone else will debug it, or you need to debug it yourself.


If you're willing to let me download the saved workspace, I could give 
it a try.  (I can't accept an email that big, you'll need to put it up 
for http or ftp download.)


Duncan Murdoch

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R-crash when loading workspace - Windows

2009-09-07 Thread Mark Knecht
On Mon, Sep 7, 2009 at 1:08 PM, Duncan Murdoch wrote:
> On 07/09/2009 10:34 AM, sebed1110-div...@yahoo.fr wrote:
>>
>> Dear all,
>>
>> One day when I tried to load an existing workspace (when opening R or by
>> load()), R crashed without any error notification.
>> The day before I had worked  and saved my workspace without any trouble.
>> At first I though it was a memory problem (workspace reaching 180Mo) or
>> related to a particular script or command, so I start a new workspace.
>> Everything was ok, that script and others working. Then I saved the
>> workspace (55Mo) and tried to open it, without any result : R crashes
>> without any notification again.
>> This occurs only with Windows.
>> Does someone know how to solve that problem?
>
> You need to come up with a simple scheme to reproduce it, and then someone
> else will debug it, or you need to debug it yourself.
>
> If you're willing to let me download the saved workspace, I could give it a
> try.  (I can't accept an email that big, you'll need to put it up for http
> or ftp download.)
>
> Duncan Murdoch

Wouldn't urt to uninstall and then reinstall Rgui. (I'm assuming this
is Rgui?) Maybe a file got corrupted and a reinstall will clear things
up?

Cheers,
Mark

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash when i'm using lme function

2012-05-04 Thread gaiarrido
When I try to adjust a mixed model with random effects I can make this order
without problem

> lm.FA<-lme(absFA~trait*condition,random=~1|individual)

But if I try to fit a model in which the response (absFA) is not the same in
all individuals at different levels of "trait" factor , but varies randomly
from each. That is, this order

> lm.FA2<-lme(absFA~rasgo*condicion,random=~rasgo|individuo)

R hangs and crashes, I've tried both with R 2.13 and with  R 2.15.

-
Mario Garrido Escudero
PhD student
Dpto. de Biología Animal, Ecología, Parasitología, Edafología y Qca. Agrícola
Universidad de Salamanca
--
View this message in context: 
http://r.789695.n4.nabble.com/R-crash-when-i-m-using-lme-function-tp4608196.html
Sent from the R help mailing list archive at Nabble.com.

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash when using pan for multiple imputation

2011-06-21 Thread D. Alain
Dear R-List, 

I apologize for not posting a reproducible example - the reason is that I
 actually do not succeed in reproducing my specific problem with 
generated data.

Let me still describe the problem: 

I want to impute missing data using the "pan" package. 

a) It works, when I use a fraction of my data (e.g. 200 out of 44000 cases)
b) It works, when I generate a dataset of equal size as the original 
based on my empirical means and covs using "mvrnorm" package.
c) It works, when I use "norm" instead of "pan" (though I used the 
stand-alone package - I do not know whether it makes a difference)

BUT R CRASHES without log after about 30 minutes whenever I try imputation on 
my original dataset using "pan".

This is the code I used:

library(pan)

level2<-DF$l2.id  #specify 
my level 2 ID in my dataframe (DF)

subj<-match(level2,unique(level2))    #number the level 
2 units from 1:n

y<-as.matrix(DF[-1])                                               
#specify the variables to be used for imputation  
       

pred <- matrix( rep( 1 , nrow(y) ) , ncol= 1)   #specify predictor 
matrix
xcol <- 1   #col 
with fixed effect in pred
zcol <- 1   #col 
with random effect in pred  

prior <- list( a=ncol(y),   
#non-informative prior
 Binv= diag( rep(1,ncol(y) ) ) ,
 c= ncol(y) * length(zcol) ,
 Dinv= diag( rep(1 ,ncol(y)*length(zcol) ) ) 
  ) 

  
imput1 <-  pan(y,subj,pred,xcol,zcol,prior,seed= 13579 ,iter= 1000) #run first 
imputation

...after 30 minutes: CRASH (R ends automatically, Rgui is closed without log)


Is there a way to identify the source of such a problem? Or any idea what could 
be the problem?

Thank you in advance.

Best wishes

Alain
[[alternative HTML version deleted]]

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R Crash -- R Gui crashes during MCMC iteration

2011-02-15 Thread Haillie

Hi I am posting to seek some advice regarding the R Gui 2.12.0 that keeps
freezing on my pc. 
I have been trying to run MCMC ordinal factanal code on my PC but the window
freezes everytime after 7001 iterations (total of 25 iterations). My
operating system is window vista 64-bit with 4.0 gb of memory. 
Here is the code that I was trying to run under MCMCpack. 

## installing packages 
install.packages("MCMCpack") 
install.packages("foreign") 

## calling libraries 
library(MCMCpack) 
library(foreign) 

## opening a data set on the desktop 
setwd("C:/Users/haillie/Desktop") 
UN2009<- read.csv("UN2009.csv") 

#calling libraries 
library(reshape) 
library(car) 

colname <- names(UN2009) 
## these are thevariables I want to recode 

UN2009[colname] <- 
   lapply(UN2009[colname], 
   function(x) recode(x, recodes = "8=NA", 
   as.factor.result = TRUE, as.numeric.result = FALSE)) 
## this applies the recode functionto all the variable I wantto recode 

## Ordinalfactanal Code 
un2009<-MCMCordfactanal(~R.64.6+R.64.10+R.64.16+R.64.17+R.64.18+R.64.19+R.64.20+R.64.21+R.64.23+R.64.28+R.64.31+R.64.34+R.64.37+R.64.39+R.64.42+R.64.44+R.64.47+R.64.48+R.64.50+R.64.52+R.64.53+R.64.54+R.64.55+R.64.56+R.64.57+R.64.59+R.64.66+R.64.69+R.64.27+R.64.71+R.64.89+R.64.90+R.64.91+R.64.93+R.64.94+R.64.98+R.64.99+R.64.105+R.64.88+R.64.106+R.64.87+R.64.92+R.64.95+R.64.97+R.64.147+R.64.160+R.64.170+R.64.172+R.64.173+R.64.174+R.64.175+R.64.176+R.64.148+R.64.150+R.64.151+R.64.152+R.64.156+R.64.157+R.64.195+R.64.185+R.64.188+R.64.209+R.64.197+R.64.189+R.64.238+R.64.254+R.64.282+R.64.292+R.64.296,
 
data=UN2009,lambda.constraints=list(R.64.18=list(2,"+")), factors=1,
burnin=5000, mcmc=20, thin=40, verbose=1000, L0=0.05, store.lambda=TRUE,
store.scores=TRUE, tune=1.2) 

The system is fine until I try to run the ordinalfactanal iterations I
am also using the most recent version of Tinn R with R gui. not at the same
time but they share the same window space. Could this be a problem? 
I do not think the data set I am using is too big ( dimension 193, 27). 

If anyone could help me gain some insight into this problem, I would greatly
appreciate it. Thank you very much and I hope to hear from you soon. 

Sincerely, 
Haillie 
  


-- 
View this message in context: 
http://r.789695.n4.nabble.com/R-Crash-R-Gui-crashes-during-MCMC-iteration-tp3308047p3308047.html
Sent from the R help mailing list archive at Nabble.com.

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash when i'm using lme function

2012-05-05 Thread Ben Bolker
gaiarrido  usal.es> writes:

> When I try to adjust a mixed model with random effects I can make this order
> without problem
> 
> > lm.FA<-lme(absFA~trait*condition,random=~1|individual)
> 
> But if I try to fit a model in which the response (absFA) is not the same in
> all individuals at different levels of "trait" factor , but varies randomly
> from each. That is, this order
> 
> > lm.FA2<-lme(absFA~rasgo*condicion,random=~rasgo|individuo)
> 
> R hangs and crashes, I've tried both with R 2.13 and with  R 2.15.
> 

  This is not reproducible ... and would be better on the
r-sig-mixed-models  r-project.org list.  If/when you repost,
more details would be useful:

 * how big is your data set (number of individuals, total
number of observations)?
 * are you including a data= argument in your calls?  It is
generally considered good practice.
 * your predictor variables are different in the two calls --
are you using different data sets, or different predictors,
(i.e. 'condicion' vs 'condition', 'individual' vs 'individuo',
'rasgo' vs 'trait'), or is this a typo?
 * have you checked to see that all variables are of the type
you think they should be (numeric vs factor)?
 * do you actually have multiple observations with different
trait values within at least some individuals?
 * see , or the posting
guide, for information about reproducible examples ...

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash using rpanel on mac os x

2007-11-27 Thread Aaron Robotham
Hello,
I've recently discovered a persistent issue with rpanel when running
R.app (2.6.1) on Mac OS X 10.4.11. tcltk and rpanel load without any
apparent error, and the interactive panels appear to work as expected,
however upon closing the panels rpanel has created I get catastrophic
errors and R crashes completely. For the most part R manages to crash
with dignity and work can be saved, but sometimes it will crash
straight out. Below is an example of an entire work session (only base
packages loaded) with the crash at the end typical of those
encountered:

> library(tcltk)
Loading Tcl/Tk interface ... done
> library(rpanel)
Package `rpanel', version 1.0-4
type help(rpanel) for summary information
> density.draw <- function(panel) {
+   plot(density(panel$x, bw = panel$h))
+   panel
+ }
> panel <- rp.control(x = rnorm(50))
> rp.slider(panel, h, 0.5, 5, log = TRUE, action = density.draw)

 *** caught bus error ***
address 0x0, cause 'non-existent physical address'

Possible actions:
1: abort (with core dump, if enabled)
2: normal R exit
3: exit R without saving workspace
4: exit R saving workspace

All packages that are required are up to date, and I can find no
evidence of similar issues from searching the mailing lists. Any
suggestions would be appreciated.

Aaron

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


[R] R crash with ATLAS precompiled Rblas.dll on Windows XP Core2 Duo

2008-07-08 Thread Law, Jason
I noticed a problem using R 2.7.1 on Windows XP SP2 with the precompiled
Atlas Rblas.dll.  Running the code below causes R to crash.  I started R
using Rgui --vanilla and am using the precompiled Atlas Rblas.dll from
cran.fhcrc.org dated 17-Jul-2007 05:04 for Core2 Duo.

The code that causes the crash:

x <- rnorm(100)
y <- rnorm(100)
z <- rnorm(100)
loess(z ~ x * y)

loess(z ~ x) does not cause a crash using the Atlas BLAS and neither does
running the above code with the Rblas.dll that came with R 2.7.1.  In
addition, the code runs fine using the Atlas BLAS under R 2.6.2.

The windows error information that is printed to the screen when R closes:

AppName: rgui.exeAppVer: 2.71.45970.0ModName: rblas.dll
ModVer: 2.51.42199.0 Offset: 000501cc


sessionInfo returns:

R version 2.7.1 (2008-06-23) 
i386-pc-mingw32 

locale:
LC_COLLATE=English_United States.1252;LC_CTYPE=English_United
States.1252;LC_MONETARY=English_United
States.1252;LC_NUMERIC=C;LC_TIME=English_United States.1252

attached base packages:
[1] stats graphics  grDevices utils datasets  methods   base

I checked the R FAQ, R for Windows FAQ, and the README associated with the
Atlas BLAS on CRAN and couldn't find any information related to possible
crash causes.  I've used the ATLAS BLAS for about 6 months on this machine
(it's a new machine) with R 2.6.2.

Using debug(stats:::simpleLoess), I've found that the crash occurs on the
first iteration of the line:

z <- .C(R_loess_raw, as.double(y), as.double(x), 
as.double(weights), as.double(robust), as.integer(D), 
as.integer(N), as.double(span), as.integer(degree), 
as.integer(nonparametric), as.integer(order.drop.sqr), 
as.integer(sum.drop.sqr), as.double(span * cell), 
as.character(surf.stat), fitted.values = double(N), 
parameter = integer(7), a = integer(max.kd), 
xi = double(max.kd), vert = double(2 * D), vval = double((D
+ 
  1) * max.kd), diagonal = double(N), trL = double(1), 
delta1 = double(1), delta2 = double(1), as.integer(surf.stat
== 
  "interpolate/exact"))

After that, I'm kind of stuck in terms of tracking it down.

Thanks for any input,

Jason Law
City of Portland, OR

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash with ATLAS precompiled Rblas.dll on Windows XP Core2 Duo

2008-07-13 Thread Prof Brian Ripley
Yes, that Rblas.dll is known to be faulty, and the person who built it is 
unable to re-build it.  It needs to be removed from CRAN.


(I've also tried to build on Core 2 Duo, and my Cygwin installation has a 
compiler crash during the build.)


On Tue, 8 Jul 2008, Law, Jason wrote:


I noticed a problem using R 2.7.1 on Windows XP SP2 with the precompiled
Atlas Rblas.dll.  Running the code below causes R to crash.  I started R
using Rgui --vanilla and am using the precompiled Atlas Rblas.dll from
cran.fhcrc.org dated 17-Jul-2007 05:04 for Core2 Duo.

The code that causes the crash:

x <- rnorm(100)
y <- rnorm(100)
z <- rnorm(100)
loess(z ~ x * y)

loess(z ~ x) does not cause a crash using the Atlas BLAS and neither does
running the above code with the Rblas.dll that came with R 2.7.1.  In
addition, the code runs fine using the Atlas BLAS under R 2.6.2.

The windows error information that is printed to the screen when R closes:

AppName: rgui.exeAppVer: 2.71.45970.0ModName: rblas.dll
ModVer: 2.51.42199.0 Offset: 000501cc


sessionInfo returns:

R version 2.7.1 (2008-06-23)
i386-pc-mingw32

locale:
LC_COLLATE=English_United States.1252;LC_CTYPE=English_United
States.1252;LC_MONETARY=English_United
States.1252;LC_NUMERIC=C;LC_TIME=English_United States.1252

attached base packages:
[1] stats graphics  grDevices utils datasets  methods   base

I checked the R FAQ, R for Windows FAQ, and the README associated with the
Atlas BLAS on CRAN and couldn't find any information related to possible
crash causes.  I've used the ATLAS BLAS for about 6 months on this machine
(it's a new machine) with R 2.6.2.

Using debug(stats:::simpleLoess), I've found that the crash occurs on the
first iteration of the line:

z <- .C(R_loess_raw, as.double(y), as.double(x),
   as.double(weights), as.double(robust), as.integer(D),
   as.integer(N), as.double(span), as.integer(degree),
   as.integer(nonparametric), as.integer(order.drop.sqr),
   as.integer(sum.drop.sqr), as.double(span * cell),
   as.character(surf.stat), fitted.values = double(N),
   parameter = integer(7), a = integer(max.kd),
   xi = double(max.kd), vert = double(2 * D), vval = double((D
+
 1) * max.kd), diagonal = double(N), trL = double(1),
   delta1 = double(1), delta2 = double(1), as.integer(surf.stat
==
 "interpolate/exact"))

After that, I'm kind of stuck in terms of tracking it down.

Thanks for any input,

Jason Law
City of Portland, OR

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.



--
Brian D. Ripley,  [EMAIL PROTECTED]
Professor of Applied Statistics,  http://www.stats.ox.ac.uk/~ripley/
University of Oxford, Tel:  +44 1865 272861 (self)
1 South Parks Road, +44 1865 272866 (PA)
Oxford OX1 3TG, UKFax:  +44 1865 272595

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.


Re: [R] R crash with ATLAS precompiled Rblas.dll on Windows XP Core2 Duo

2008-07-13 Thread Uwe Ligges



Prof Brian Ripley wrote:
Yes, that Rblas.dll is known to be faulty, and the person who built it 
is unable to re-build it.  It needs to be removed from CRAN.



Whoops, I forgot to remove it and will do so this afternoon.

Uwe


(I've also tried to build on Core 2 Duo, and my Cygwin installation has 
a compiler crash during the build.)


On Tue, 8 Jul 2008, Law, Jason wrote:


I noticed a problem using R 2.7.1 on Windows XP SP2 with the precompiled
Atlas Rblas.dll.  Running the code below causes R to crash.  I started R
using Rgui --vanilla and am using the precompiled Atlas Rblas.dll from
cran.fhcrc.org dated 17-Jul-2007 05:04 for Core2 Duo.

The code that causes the crash:

x <- rnorm(100)
y <- rnorm(100)
z <- rnorm(100)
loess(z ~ x * y)

loess(z ~ x) does not cause a crash using the Atlas BLAS and neither does
running the above code with the Rblas.dll that came with R 2.7.1.  In
addition, the code runs fine using the Atlas BLAS under R 2.6.2.

The windows error information that is printed to the screen when R 
closes:


AppName: rgui.exe AppVer: 2.71.45970.0 ModName: rblas.dll
ModVer: 2.51.42199.0 Offset: 000501cc


sessionInfo returns:

R version 2.7.1 (2008-06-23)
i386-pc-mingw32

locale:
LC_COLLATE=English_United States.1252;LC_CTYPE=English_United
States.1252;LC_MONETARY=English_United
States.1252;LC_NUMERIC=C;LC_TIME=English_United States.1252

attached base packages:
[1] stats graphics  grDevices utils datasets  methods   base

I checked the R FAQ, R for Windows FAQ, and the README associated with 
the

Atlas BLAS on CRAN and couldn't find any information related to possible
crash causes.  I've used the ATLAS BLAS for about 6 months on this 
machine

(it's a new machine) with R 2.6.2.

Using debug(stats:::simpleLoess), I've found that the crash occurs on the
first iteration of the line:

z <- .C(R_loess_raw, as.double(y), as.double(x),
   as.double(weights), as.double(robust), as.integer(D),
   as.integer(N), as.double(span), as.integer(degree),
   as.integer(nonparametric), as.integer(order.drop.sqr),
   as.integer(sum.drop.sqr), as.double(span * cell),
   as.character(surf.stat), fitted.values = double(N),
   parameter = integer(7), a = integer(max.kd),
   xi = double(max.kd), vert = double(2 * D), vval = 
double((D

+
 1) * max.kd), diagonal = double(N), trL = double(1),
   delta1 = double(1), delta2 = double(1), 
as.integer(surf.stat

==
 "interpolate/exact"))

After that, I'm kind of stuck in terms of tracking it down.

Thanks for any input,

Jason Law
City of Portland, OR

__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide 
http://www.R-project.org/posting-guide.html

and provide commented, minimal, self-contained, reproducible code.





__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.