search for: mea

Displaying 20 results from an estimated 221 matches for "mea".

Did you mean: me
2005 Apr 15
4
aggregation question
Is length(unique()) what you are looking for? Andy > From: Christoph Lehmann > > Hi I have a question concerning aggregation > > (simple demo code S. below) > > I have the data.frame > > id meas date > 1 a 0.637513747 1 > 2 a 0.187710063 2 > 3 a 0.247098459 2 > 4 a 0.306447690 3 > 5 b 0.407573577 2 > 6 b 0.783255085 2 > 7 b 0.344265082 3 > 8 b 0.103893068 3 > 9 c 0.738649586 1 > 10 c 0.614154037 2 > 11 c 0....
2002 Jan 10
1
Closing binary file connections
Hi all, I'm writing a function that read data from a binary file. I want to close all opened connections, but it failed: > showConnections() description class mode text isopen can read can write 3 "daten/t5_all.mea" "file" "rb" "binary" "opened" "yes" "no" 4 "daten/t5_all.mea" "file" "rb" "binary" "opened" "yes" "no" 5 "daten/t5_all.mea" "file&...
2011 Jan 23
2
Ordering box plots
Hello all, I want box plots by group to display in order of increasing mean (or median) of each group but can't seem to figure it out and couldn't find anything on R-seek, either. My data looks like this: meas unit sid grade rsprti 1 2.24 1002 99999902 NA 0.8600000 2 3.04 1007 43589520 3 0.9400000 3 4.95 2002 39910470 5 1.5300000 4 2.2...
2011 May 12
1
separate date and time
I have a combined date and time. I would like to separate them out into two columns so I can do things such as take the mean by time across all dates. meas<-runif(435) nTime<-seq(1303975800, 1304757000, 1800) nDateT<-as.POSIXct(nTime, origin="1970-01-01") mat1<-cbind(nDateT,meas) means1<- aggregate(mat1$meas, list(nDateT), mean) This doesn't do anything as each day is different, but if I...
2010 Feb 05
1
Incompatible types error
...,by=0.01) for(i in c(1:1000)){ Et<-numeric(1000) fx<-numeric(1000) Tx<-numeric(1000) Fitness<-numeric(1000) Et[i]<-function(Eztx,t,A,n){ A=Amp Eztx[i]<-A*sin(t)*n if(Tx[i]>1){Eztx[i]/Tx[i] } else {Eztx[i]<-Eztx[i] } fx[i]<-function(mea,rand,prob,Et){ rand[i]<-runif[i](1,-50,50) mea=0 prob[i]<-function(pi,rand,Et,mea){ (1/(2*pi*rand[i]))*exp((-(Et[i](Eztx[i],t,A,n))-mea)^2)/(2*(rand[i]^2)) } prob(pi,rand[i],Et[i](Eztx[i],t,A,n),mea) } Tx[i]<-function(fx,cdist){ cdist[i] <-(1-((pnorm...
2006 Jul 18
1
Reconfiguring wide frame to long frame
Greetings, fellow R'ers. How can I get this frame in R: ID meas ID.1 meas.1 1 1.1 3 1.2 2 2.1 4 2.2 to look like this (stacking): ID meas 1 1.1 2 2.1 3 1.2 4 2.2 It's not really the reshape function (or is it?) because we can consider the additional columns, viz., ID.1 and meas.1, as independent of ID and meas so it...
2000 Jul 28
4
Language element manipulation
I am very confused about this. I want to convert a string to a name so I can use it to extract an element of a data frame using `$'. Here is my (non-working) code: do.graph <- function (meas) { fn <- paste("a", meas, ".dat", sep='') themeas <- read.table(fn, header=F) ameas <- as.name(paste("a", meas, sep='')) names(themeas) <- c("xpos", paste("a", meas, sep='')) meassum <- s...
2008 Jul 05
2
Bland-Altman method to measure agreement with repeated measures
Un texte encapsul? et encod? dans un jeu de caract?res inconnu a ?t? nettoy?... Nom : non disponible URL : <https://stat.ethz.ch/pipermail/r-help/attachments/20080705/878753db/attachment.pl>
2011 May 12
3
assigning creating missing rows and values
I have a dataset where I have missing times (11:00 and 16:00). I would like the outputs to include the missing time so that the final time vector looks like "realt" and has the previous time's value. Ex. If meas at time 15:30 is 0.45, then the meas for time 16:00 will also be 0.45. meas are the measurements and times are the times at which they were taken. meas<-runif(18) times<-c("08:30","09:00","09:30","10:00","10:30","11:30","12:00...
2008 Jul 25
1
glht after lmer with "$S4class-" and "missing model.matrix-" errors
...errors: > sv.mc <- glht(model.sv,linfct=mcp(comp="Tukey")) Error in x$terms : $ operator not defined for this S4 class Error in factor_contrasts(model) : no 'model.matrix' method for 'model' found! What I have done before: > sv.growth <- groupedData(length~meas|box_id,outer=~comp,data=sv.growth) > model.sv <- lmer(length~comp+(meas|box_id),data=sv.growth) Warning message: In .local(x, ..., value) : Estimated variance-covariance for factor 'box_id' is singular > summary(model.sv) Linear mixed-effects model fit by REML Formula: length ~...
2017 Aug 09
2
Package nleqslv ERROR
...system of non-linear equations, with four equations and two variables. This is my code: ALPHA <- c(-0.0985168033402, 0.1, 0.15, 0.2, 0.25, 0.3, 0.35, 0.4) BETA <- c(-0.0985168033402, 0.1, 0.15, 0.2, 0.25, 0.3, 0.35, 0.4) GAMMA <- c(0.3940672148378, 0.1, 0.15, 0.2, 0.25, 0.3, 0.35, 0.4) MEA <- 30000 MIA <- 10000 MAA <- 50000 DEA <- 0.385 fun <- function(x) { f <- numeric(length(x)) f[1] <- 1*x[1] - ((((MEA*((0.5*((MIA-MEA)^2))^(-BETA[1+j]))*((0.5*((MAA-MEA)^2))^(-ALPHA[1+i]))*((DEA)^(-GAMMA[1+k]))))*((12^0.5)^(-GAMMA[1+k])))/(((0.5)^(-BETA[1+j]-ALPHA[1+i])...
2011 Mar 25
0
Mea culpa - winetricks download trouble, now solved
I uploaded improperly about 13 hours ago, and winetricks was nondownloadable since this morning, but it's back now. Thanks to the users who commented on http://code.google.com/p/winetricks/wiki/Installing to alert me to the problem.
2011 Dec 07
1
Convert a string to a variable name
...rying to ask the user for which column their data is in, and then use this information in a function. So far I have: data <- read.csv(file.choose(), header=TRUE) col <- (winDialogString("Which column contains your data?","")) and I want to be able to reference such as: meas <- data$col and use this meas in the function. However, I can't seem to get this to work because the input is read into a string, and I can't figure out how to convert this string to the vector name that I want. Any help is appreciated. [[alternative HTML version deleted]]
2004 Sep 16
0
"chdir failed" - could someone please explain what this error mea ns?
.../service.c:set_current_service(56) chdir (/export/downloads) failed I've Googled, I've looked at the source, and I still can't understand why this error appears. What's really odd is that everything seems to work fine, in spite of the error. Could someone please explain what it means? I'm concerned that it may somehow be related to the mysterious ACL propegation problems I've been having. For reference, here are the permissions on /export/downloads: # file: downloads # owner: root # group: root user::rwx user:mirror:r-x group::rwx group:INTERCLEAN+Domain\040Users:rwx...
2011 Feb 24
1
accuracy of measurements
...ng Trying to compare accuracy of tumor size evaluation by different methods. So data looks like id true metod1 method2 ... 1 2 2 2.5 2 1.5 2 2 3 2 2 2 etc. Could you please give a hint how to deal with that. Seems like {merror} does not suite to me because I am trying to compare accuracy of measurements with their true known values not just overall agreement of methods. Moreover sample size is ridiculously small (33 patients) so ANOVA is not much of help (or is it?) Any suggestions, hints and even guesses are highly appreciated. I am stuck a bit.
2017 Aug 09
0
Package nleqslv ERROR
...with four equations and two variables. > > This is my code: > > ALPHA <- c(-0.0985168033402, 0.1, 0.15, 0.2, 0.25, 0.3, 0.35, 0.4) > BETA <- c(-0.0985168033402, 0.1, 0.15, 0.2, 0.25, 0.3, 0.35, 0.4) > GAMMA <- c(0.3940672148378, 0.1, 0.15, 0.2, 0.25, 0.3, 0.35, 0.4) > MEA <- 30000 > MIA <- 10000 > MAA <- 50000 > DEA <- 0.385 > fun <- function(x) { > f <- numeric(length(x)) > f[1] <- 1*x[1] - ((((MEA*((0.5*((MIA-MEA)^2))^(-BETA[1+j]))*((0.5*((MAA-MEA)^2))^(-ALPHA[1+i]))*((DEA)^(-GAMMA[1+k]))))*((12^0.5)^(-GAMMA[1+k])))/(((0...
2005 Sep 14
1
Long lines with Sweave
I have used Sweave a lot the latest year, but never really used any long function calls. If I have code which look like this ------------------------------------------------------------- gof <- benthic.flux(ID="Gulf of Finland", meas.conc=conc, bw.conc=bw.conc, time=times, substance=expression(DIC~(mmol~m^{-3})) ) ------------------------------------------------------------- I get the output by Sweave in my pdf file, like this: --------------...
2005 Nov 04
1
t test on data frame
Hi, I have constructed a dataframe as follows: Oil <- rep(c("Oil1","Oil2","Oil3"),8) Comp <- rep(rep(c("C1","C2"),c(4,4)),3) Mth <- rep(c("M1","M1","M2","M2"),6) Meas <- rep(c(1,2),12) Result <- rnorm(24,mean=100, sd=5) df <- data.frame(Oil, Comp, Mth, Meas, Result) The same compound (Comp) is found in different oils. Now I want to see if there are differences in method per compound. I tried this one: df.t <- t.test(Result~Mth | Comp, df) But I ge...
2011 Jan 25
0
ANOVA table look
Y'all, I need to get the look of a "standard" fixed effect ANOVA table: anova(aov(meas~op*part,data=fs)) Analysis of Variance Table Response: meas Df Sum Sq Mean Sq F value Pr(>F) op 2 2.62 1.308 1.3193 0.2750 part 19 1185.43 62.391 62.9151 <2e-16 *** op:part 38 27.05 0.712 0.7178 0.8614 Residuals 60 59.50 0.992 when I perform a two...
2008 Jul 25
0
glht after lmer with "$S4class-" and "missing model.matrix-" errors with DATA
maybe it's in the data? So here it comes. > sv.growth Grouped Data: length ~ meas | box_id meas spec comp water box_id sprouts leaves length long.sprout 1 1 Sv control moist 1 8.800000 37.80 211.2000 60.6 2 1 Sv xfull moist 2 7.000000 8.00 174.8000 62.8 3 1 Sv control moist 3 9...