search for: condition2

Displaying 20 results from an estimated 27 matches for "condition2".

Did you mean: conditions
2010 Feb 16
1
difftimes; histogram; memory problems
Hi All: Let's say I have two dataframes (Condition1 and Condition2); each being on the order of 12,000 and 16,000 rows; 1 column. The entries contain dates. I'd like to calculate, for each possible pair of dates (that is: Condition1[1:10,000] and Condition2[1:10,000], the number of days difference between the dates in the pair. The result should be a matrix...
2012 Oct 19
2
Axis Breaks with ggplot2
...uot;con", "exp", "unedit"), class = "factor"), trial.avg = c(4.04583333333333, 4.33541666666667, 4.61875), trial.sd = c(0.928718367573187, 0.851822141963017, 1.03502368980692), s.e. = c(0.0232179591893297, 0.0212955535490754, 0.163651614601074), N = c(40, 40, 40), condition2 = structure(1:3, .Label = c("Interaction Censured", "Control Censured", "Uncensured"), class = "factor")), .Names = c("condition", "trial.avg", "trial.sd", "s.e.", "N", "condition2"), row.names = c(N...
2011 Feb 02
2
subset in a BIG matrix
I have a matrix with a lot of values inside.. when I execute the folowing command matrix2=subset(martix, condition.....) it works... but after the previous command I execute another "subset" matrix3=subset(martix2, condition2.....) and appears the following error: (subscript) logical subscript too long How can I solve this??? I think the probles is the size of the matrix... Thanks.. -- View this message in context: http://r.789695.n4.nabble.com/subset-in-a-BIG-matrix-tp3254115p3254115.html Sent from the R help maili...
2008 Aug 25
1
lattice : using both strip and strip.left
...ple: > library(ggplot2) > library(lattice) > > # example data > x <- seq(0, 10, len = 100) > y1 <- jitter(sin(x), 1000) > y2 <- 0.5*jitter(cos(x), 1000) > > df <- melt( data.frame(x=x, one=y1, two=y2, condition1=factor(c("a", > "b")), condition2=factor(c("1","1", "2", "2"))), > id=c("x", "condition1", "condition2")) > > # custom colors > myColors <- c( "#E41A1C", "#377EB8") > > # here is the ggplot2 version > p <- qplot(x...
2010 May 31
1
Post-hoc tests for repeated measures in balanced experimental design
...n, the main question is to test the effect of these parameters on the recorded results. When switching from Statview (old software on Mac computers, no longer supported) to R I learned that the problem is translated to a repeated measures ANOVA via ano <- aov(d$Result~ d$Condition1*d$Condition2 + Error(d$Subject/(d $Condition1*d$Condition2), data=d)) However, there are problems in performing post-hoc tests due to the intraindividual correlation of the repeated measures data. So I started intense online searches for a good solution in R, found snippets of R-code here and there. One p...
2010 Apr 30
2
deriving mean from specific cases
Hi all, I have a large dataset that has >10k entries. The dataset is stored in a dataframe with the headers: SubID Condition1 Condition2 Result1 Result2 There are multiple entries for a given SubID(Subject ID). Condition 1 has 3 levels and condition2 has 2 levels (therefore there are 6 possible combinations all together e.g. Cond1 Level1 x Cond2 Level 1 etc.) and i need to compute for 1. The mean for a subject of result1 and 2 for...
2010 May 20
1
Mixed Effects Model on Within-Subjects Design
...difficulty for each condition, as well as the overall interaction of condition*difficulty. The ideal output would look like this: condition1:diff25 vs. condition1:diff50 p_value = .... condition1:diff25 vs. condition1:diff75 p_value = .... condition1:diff50 vs. condition1:diff75 p_value = .... condition2:diff25 vs. condition1:diff50 p_value = .... condition2:diff25 vs. condition1:diff75 p_value = .... condition2:diff50 vs. condition1:diff75 p_value = .... condition3:diff25 vs. condition1:diff50 p_value = .... condition3:diff25 vs. condition1:diff75 p_value = .... condition3:diff50 vs. conditi...
2011 Dec 08
1
prop.test() and the simultaneous confidence interval for multiple proportions in R
...ask an help because I have some difficulties in reading the output of that function. As a case study, I need to apply such analysis on the following simple prolbem: I did an experiment in which 12 participants had to choose between 3 conditions when provided with 3 stimuli. Stimulus Condition1 Condition2 Condition 3 A 9 1 2 B 10 2 0 C 8 2 2 My goal is to prove that it is not by chance that Condition 1 is preferred rather than the other two conditions. So, I apply the function prop.test(), summing the values of C...
2012 Nov 24
2
Performing operations only on selected data
...entually hacked my way to an ugly solution for my particular problem but I would like to improve my coding: I have data of the form: df <- expand.grid(group=c('copper', 'zinc', 'aluminum', 'nickel'), condition1=c(1:4)) I would like to add a new data column "condition2", with values equal to the value of condition1 plus a random number from 0-1 (uniform distribution) if the value of condition1 is < 1, or just condition1 if the value of condition1 is > 1. More generally, my interest is in manipulating the values of condition1 if they meet one or more c...
2011 Mar 03
0
[LLVMdev] Improving select_cc lowering for targets with conditional move
...the following piece of C code: (incomplete and not compilable ;) ) result = initValue; for(i) { ... if(condition) result = updatedValue_i; ... } For targets with conditional moves, the result is updated using the following sequence of instructions: regTmp = regFalse; if(condition2) regTmp = regTrue; regResult = regTmp; Now, you have 2 cases: 1) either condition2 = condition In this case: regFalse is a phi node between the initial value of result and the current result. It's very likely that regFalse and regResult will be the same hardware register. So the sequence of in...
2008 Aug 13
3
conditional IF with AND
Hi everyone, I'm trying to create an "if" conditional statement with two conditions, whereby the statement is true when condition 1 AND condition 2 are met: code structure: if ?AND? (a[x,y] <condition1>, a[x,y] <condition2>) I've trawled through the help files, but I cannot find an example of the syntax for incorporating an AND in a conditional IF statement. Thanks, rcoder -- View this message in context: http://www.nabble.com/conditional-IF-with-AND-tp18966890p18966890.html Sent from the R help mailing li...
2014 Sep 25
5
[LLVMdev] New type of smart pointer for LLVM
...in type of smart pointer would look like (see changes in TGParser::ParseDef(), TGParser::InstantiateMulticlassDef() and TGParser::ParseSimpleValue()). Briefly: consider a leaky example: { T* p = new T; if (condition1) { f(p); // takes ownership of p } p->SomeMethod(); if (condition2) { return nullptr; // Leak! } g(p); // don't take ownership of p return p; } The preferred solution would look like: { smart_ptr<T> p(new T); if (condition1) { f(p.StopOwn()); // takes ownership of p } p->SomeMethod(); if (condition2) { return...
2014 Sep 25
2
[LLVMdev] New type of smart pointer for LLVM
On Thu, Sep 25, 2014 at 1:44 AM, Renato Golin <renato.golin at linaro.org> wrote: > On 25 September 2014 06:16, David Blaikie <dblaikie at gmail.com> wrote: > > I can go & dredge up some examples if we want to discuss the particular > > merits & whether each of those cases would be better solved in some other > > way, but it seemed pervasive enough in the
2007 Nov 27
2
rearrange data: one line per subject, one column per condition
...4 1 7 2 028.175385 ... Here, one line equals the value of one subjects VARIABLE in function of the GROUP and the CONDITION. However, I would like to rearrange the data so that the columns of my data equal the 2 conditions and the lines the subjects. This is something like: subj group condition1 condition2 1 1 746.36625 46.36625 2 2 1076.152857 76.152857 ... I know its possible the other way around. But that's not what I need (this time). Before anyone asks: Yes, I want to do some analysis on my data in SPSS, so I need the rearranged format. Regards and Thanks, Dieter ------------------------...
2011 Dec 13
1
[LLVMdev] Changing the operands in the CallInst
I implement the following function,which gets CallInst * and should perform the following: 1. Change the value of the argument if condition1 takes place 2. Change the type of the argument if condition2 takes place 3. Add addition argument/s if condition3 takes place void argChange(CallInst * I) { for (unsigned index = 0; index < I->getNumOperands(); ++index) { do_something_with (I->getOperand(index),condition); } } I think that the 1. can be implemented using I->se...
2006 Mar 17
2
How to let the layout be more OO?
...views to be displayed,but only some of them to be displayed at the same time at different <div></div> units. I hope there exists a kind of way that: <%= if condition1 %> <div id=''condition1''> <%= @content_for_view1 %> </div> <%= if condition2 %> <div id=''condition2''> <%= @content_for_view2 %> </div> .... How to reach such an aim in rails? I am a newbie. very grateful! -- Posted via http://www.ruby-forum.com/.
2009 Mar 06
1
a general question
...e question is : what method is better to assess the significance of the change in a signal (the signal can be DNA binding, for instance) given the background and 2 conditions. <. condition1 (eg no treatment) : background = 1; signal = 5; <. condition2 (eg hormonal treatment) : background = 3; signal = 6. The methods can be : a. substract the background : i.e. (signal_treatment - background_treatment) / (signal_no_treatment - background_no_treatment) b. calculate the fold change: i.e. (signal_treatmen...
2007 Nov 05
1
Should numeric()/character() etc initialize with NA instead of 0 or ""?
...ately obvious from the value of the vector elements themselves and programming errors would be far less easy to overlook. e.g. x <- numeric(n) or for( i in seq(along = x) ) { try(x[i] <- function.which.might.crash( args[i] )) } or x <- numeric(n) x[condition1] <- foo(args1) x[condition2] <- foo(args2) ... x[conditionN] <- foo(argsN) will produce x without any NAs even if function.which.might.crash() actually did crash during the loop or if there are indices for which none of conditions 1 to N were true and you cannot distinguish between zeroes which are real results and zer...
2010 Mar 04
1
mysqlWriteTable . error in your SQL syntax?
...s = F, overwrite=T) Error in mysqlExecStatement(conn, statement, ...) : RS-DBI driver: (could not run statement: You have an error in your SQL syntax; check the manual that corresponds to your MySQL server version for the right syntax to use near '"condition" text, treatment text, condition2 text, conditionNum double, impo' at line 12) [1] FALSE Warning message: In mysqlWriteTable(conn, "comparison", design2, row.names = F, overwrite = T) : could not create table: aborting mysqlWriteTable The problem seems to be in double qoutes: syntax to use near '"...
2008 Dec 17
4
passing arguments to subset from a function
Hello R-helpers, I'm writing a long function in which I manipulate a certain number of datasets. I want the arguments of said function to allow me to adapt the way I do this. Among other things, I want my function to have an argument which I will pass on to subset() somewhere inside my function. Here is a quick and simplified example with the iris dataset. myfunction<-function(table,