[R] WARNING: Method convertPointFromBase

2016-05-23 Thread Fabian Schalle
GUI 1.68 Mavericks build (7202) installed on my Macbook Pro running Mac OS X 10.11.5 (15F34). Is this something to worry about? Can anyone help me out? I downloaded R from the official servers. Kind regards and thank you in advance ! Fabian __ R

[R] [R-pkgs] New R package ``bvarsv''

2014-09-13 Thread Krueger, Fabian
on any aspects of the package, as well as possible improvements or extensions, would be highly appreciated. Thank you and best wishes, Fabian Krüger ___ R-packages mailing list r-packa...@r-project.org https://stat.ethz.ch/mailman/listinfo/r-packages

Re: [R] data.frame(1)*1:4 = 1?

2014-04-02 Thread fabian
This is because your vector is recycled: data.frame(1)*1:4 = data.frame(1)*c(1,2,3,4) only the first element is needed since the data frame has nothing else to multiply with c(2,3,4) (x<-data.frame(1:2, 3:4)) X1.2 X3.4 113 224 (y<-x*5:7) y[1,1] = x[1,1] * 5 y[2,1] = x[2,1

Re: [R] mcr mcreg: Why are BCa and quantile se values calculated, stored, then the stored values set to NA?

2014-03-17 Thread Fabian Model
;- mcreg(as.matrix(creatinine), method.bootstrap.ci = "quantile", na.rm = TRUE) mean.slope.est<- mean(m@B1) sd.slope.est<- sd(m@B1) mean.intercept.est <- mean(m@B0) sd.intercept.est <- sd(m@B1) However, note that these estimates have no direct relationship to the BCa confidence i

Re: [R] function doesn't change the variable in the right way

2014-03-07 Thread fabian
Hello The function does exactly what you tell it to do; first you substitute all NA with the mean; then you subtract the mean; for the NA this meand: mean-mean=0; and this is what you get. the problem is not the function but the z-score of means. lg fabian On 07-03-2014 12:17, David Croll

[R] Negative binomial distribution mixture model

2014-02-25 Thread Fabian Amman
I m overwhelmed by the different packages dealing with neg. binomial distribution regression. Can someone please point me which package is most useful for the above described purpose? Thank you very much in advance Regards Fabian __ R-help@r-project.o

Re: [R] Problem with metaMDS in vegan

2014-02-11 Thread Fabian B
esult. But in nature, chemicals that are only weakly represented may not have very much influence on the other individuals. For the moment, I won't question that decision, because it's quite a convention in chemical ecology, as I heard. Regards, Fabian -- View this message in context:

Re: [R] Problem with metaMDS in vegan

2014-02-10 Thread Fabian B
x27;trymax'. What could be going wrong? I really have no clue … Thanks for your help! Regards, Fabian -- View this message in context: http://r.789695.n4.nabble.com/Problem-with-metaMDS-in-vegan-tp4685022p4685043.html Sent from the R help mailing list archive at Nabble.com.

[R] Problem with metaMDS in vegan

2014-02-10 Thread Fabian B
with maxit, but had to go down to 10 to reach a suitable result. And I don't think, I may limit the number of iterations that much. What could possibly be the problem? It would be great if somebody could help me. Thaks! Fabian -- View this message in context: http://r.789695.n4.nabble.com/

Re: [R] comparison of bivariate normal distributions

2012-04-27 Thread Fabian Roger
ble to say something about how high the probability is that my samples come from two different populations (in the logic of a t-test). Would this be possible or reasonable at all? Thank again, I really appreciate your help! best Fabian Would it be possible, too to On 26 Apr 2012, at 10:56, Pe

[R] comparison of bivariate normal distributions

2012-04-25 Thread Fabian Roger
x,yy,dmat2,lwd=2,add=T) ## Is their an easy way to do this (maybe with dmvnorm()?) and could I interpret the intersect ("shared volume") in the sense of a t-statistic? Thanks a lot for your help! _____ Fabian Ro

[R] compare bivariate normal distributions

2012-04-23 Thread Fabian Roger
mat2,lwd=2,add=T) ## Is their an easy way to do this (maybe with dmvnorm()?) and could I interpret the intersect ("shared volume") in the sense of a t-statistic? Thanks a lot for your help! sincerely, _________ Fabian Fabian Ro

[R] (no subject)

2011-05-12 Thread Fabian
2 12.0 6.000 11.368 0.000642 *** Residuals 18 9.5 0.528 #Is type 3 the Type I should use and why do the results differ if the design is balanced? I am really confused, it would #be great if someone could help me out! #Thanks a lot for your help! #/Fabian #University of Goth

[R] [R-pkgs] spikeSlabGAM

2011-04-28 Thread Fabian Scheipl
package uses standard formula syntax so that complex models can be specified very concisely. It features powerful and user friendly visualizations using ggplot2. -- Fabian Scheipl Department of Statistics Ludwig-Maximilians

[R] lme:correlationstructure AR1 and random factor

2011-03-29 Thread yvonne fabian
Dear helpers, I tried these models to run in the package nlme, but allways got the same error message... I have a correlation in 5 sessions within a field (n=12) with ten traps in one field. res2a <- lme(response~x+y+z+treatment),correlation = corARMA(form = ~ session|trapfield, p = 1, q = 0), r

[R] binary data with correlation

2011-03-21 Thread yvonne fabian
Dear posters, I have a question concerning binary data analysis. I have presence absence data of 5 sampling sessions within 3 years, of 12 fields. Each field had 12 traps. I would like to analyse the data with a Generalized Estimating Equations (GEE) Model in R. For the abundance data I used a gls

Re: [R] merge table rows (\multirow)

2010-07-26 Thread Fabian Scheipl
You can also automate it with this: do.multirow<-function(df, which=1:ncol(df)){     for(c in which){         runs <- rle(as.character(df[,c]))         if(all(runs$lengths>1)){             tmp <- rep("", nrow(df))             tmp[c(1, 1+head(cumsum(runs$lengths),- 1))] <-                     paste

Re: [R] merge table rows (\multirow)

2010-07-26 Thread Fabian Scheipl
You can also automate it with this: do.multirow<-function(df, which=1:ncol(df)){ for(c in which){ runs <- rle(as.character(df[,c])) if(all(runs$lengths>1)){ tmp <- rep("", nrow(df)) tmp[c(1, 1+head(cumsum(runs$lengths),-1))] <- paste(

[R] Modify the plotting parameters for Vennerable obj.

2010-07-13 Thread Fabian Grammes
Dear List, I would like to modify the settings for plotting a Vennerable object, but I don't know how...so if anyone has an idea I would be really graetfull. best, Fabian some R code to illustrate my problem: library(Vennerable) ven <- compute.Venn(Venn(SetNames=c("A&q

[R] selection of optim parameters

2010-07-05 Thread Fabian Gehring
Hi all, I am trying to rebuild the results of a study using a different data set. I'm using about 450 observations. The code I've written seems to work well, but I have some troubles minimizing the negative of the LogLikelyhood function using 5 free parameters. As starting values I am using

[R] Error when callin g C-Code

2010-06-15 Thread Fabian Zäpernick
Hi when I call the function below in R, i get the error: Object 'pairlist' can't be converted to 'double'. #include #include #include SEXP CSimPoisson(SEXP lambda, SEXP tgrid, SEXP T2M, SEXP Ni, SEXP NT) { double sign, EVar; double *xlambda, *xtgrid, *xT2M, *xNi, *xNT, *xtau;

[R] Simulating a Poisson Process in R by calling C Code over .Call

2010-06-13 Thread Fabian Zäpernick
Ni[j] <- NT } } return(list(NT=NT,Ni=Ni,tau=tau)) } I read the manual "writing R extensions" over and over again, but i have no idea, how to solve the problem with tau because i dont no the leng

[R] Help with R graphics

2010-05-29 Thread Fabian
)? thank you very much in advance for your help fabian __ 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

[R] [R-pkgs] amer: generalized additive mixed models with lme4

2009-09-07 Thread Fabian Scheipl
Dear R-users, I'd like to announce the release of the amer-package that adds the capability to fit generalized additive mixed models to lme4. It includes a vignette with real data examples and a brief summary of the theory behind the implementation. Best, Fabian [[alternative

[R] weighting nlme in multivariate outcome

2009-08-18 Thread Mollet, Fabian
s case and what this would imply for the error correlation structure. Could you give us a guidance? Your help is most appreciated and we thank you very much in advance! Kind regards Fabian Mollet Doran, H. C. and Lockwood, J. R. 2006. Fitting value-added models in R. - Journal of E

Re: [R] Function match.call or saving all initial parameters

2009-07-30 Thread Fabian Scheipl
(names(frmls) %in% names(ans))) return(as.call(c(ans, frmls[add]))) } On Thu, Jul 30, 2009 at 11:22 AM, Fabian Scheipl < fabian.sche...@stat.uni-muenchen.de> wrote: > This does what you want: > > expand.call <- function(definition = NULL, call = sys.call(sys.parent()), > e

Re: [R] Function match.call or saving all initial parameters

2009-07-30 Thread Fabian Scheipl
se(ans[[1]])) add <- which(!(names(frmls) %in% names(ans))) return(as.call(c(ans, frmls[add]))) } Best, Fabian [[alternative HTML version deleted]] __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PL

[R] nlme weighted

2009-04-06 Thread Mollet, Fabian
be applied. All the best Fabian Mollet [[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 a

[R] Survival Regression with multiple records per subject

2008-04-30 Thread Fabian Hefner
regression. the "survRegData <- survreg(formula=Surv(time,exercise)~itm, data=Data, dist="weibull")" command doesn't take into account that multiple records are part of one subject. Many thanks! Fabian Hefner __ R-help@r-pr

[R] Survival Regression with multiple events per subject

2008-04-28 Thread Fabian Hefner
1 | 8 1999 | 1999 | 3.4257 | 0.15287 |-0.8615 |3| 0 | 4 2000 | 2000 | 1.1457 | 0.07487 |-0.5485 |3| 1 | 5 2001 | 2001 | 2.4418 | 0.09553 |-0.3772 |3| 0 | 2 Thank you, Fabian Hefner __

[R] How do I use as.Date when day values are missing?

2008-02-24 Thread Anupa Fabian
I have a data frame which contains some valuable date information. But for a few of the dates, the day information missing . Viz: > interesting.data$date [1] "1/22/93" "1/22/93" "1/23/93" "1/00/93" "1/28/93" "1/31/93" "1/12/93" i.e. for dates where the day info is missing, the "%d" part of the

[R] Extracting Year (only) information from Non-Standard Dates

2007-12-16 Thread Anupa Fabian
I have some data whose date column consists of two types of date entries: (a) year-only entries (eg "1983") and (b) full date info (eg September 12, 1962). Here's what the non-standard date info looks like: > mode(non.standard.dates) [1] "numeric" > head(non.standard.dates) [1] July 15, 1925 F

[R] Storing Variables of different types

2007-09-15 Thread Garavito,Fabian
Hi there, I have an ixjxk array where I want to store dates in the first column of all sub-matrices (i.e. j=1 is a column with dates) and real numbers in the rest of the columns...I have been trying many things, but I am not getting anywhere. Thank you very much for your help, Fabian