search for: aa's

Displaying 20 results from an estimated 3520 matches for "aa's".

Did you mean: a's
2013 Jan 09
4
how to count "A","C","T","G" in each row in a big data.frame?
...+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+", "+"), X2353 = c("AA", "TT", "TT", "CC", "TT", "CC", "CC", "TT", "CC", "GG", "AG", "AG", "AG", "TT", "CC", "AG", "CC", "AA", "GG&quo...
2012 Jun 07
0
how lm behaves
...re are 'c' on more days than I have 'h2o2', where treats[,4] is the day. I only want 'c' that correspond to the same days that I have a 'h2o2' also. >z<-treats[,3] == 'h2o2' >x<-treats[,4] %in% treats[z,4] >a<-treats[,3] == 'c' >aa<-which(a) >xx<-which(x) >zz<-which(z) >aa<-intersect(aa, xx) >aa<-c(aa, zz) >a<- count[aa] >x<-as.vector(treats[aa,2]) >y<-as.vector(treats[aa,4]) >b<-as.vector(treats[aa,5]) >data1<-cbind(a,x,y,b) >data1<-as.data.frame(data1) >data...
2006 Jun 30
3
data extraction
...nd 20 columns. Io wonted to extract the 10th row only. Example the 10th, 20th, 30th 40th…..20000 th. can you please help me how do I do that.Than kyou. Example is below. Inpute: AG GG GG AG CC CC CC CC CT CC CT CT GG GG GG GG CC CC CC CC GG GG GG GG CC CC CC CC GG CG CG GG GG GG GG GG *CC CC CC CC* AA AG AG AA AA AA AA AA GG AG AG GG GG AG AG GG GG GG GG GG TT TT TT TT AA AG AG AA CT CC CT TT AG AA AG GG *AA AA AG AG* AA AA AA AA CC CC CC CG GG GG GG AG CT TT CT CT AT AA AT AT GG GG GG AG CG CC CG GG GG GG GG AG CC CC CC CT GG GG GG GG *GG GG AG AG *CC CC CC CT TT TT TT CT AG GG AG AG GG GG GG G...
2009 Jun 03
1
strsplit for multiple columns
Hi, I am trying to split multiple columns. One column works just fine, but I want to do it for multiple columns??? Example > a ID V2 V3 V4 V5 V6 V7 V8 V9 V10 1 PBBA0644 -- GG AA -- AA -- AA GG GG 2 PBBA1010 -- GG AA -- AA -- AA GG GG 3 0127ATPR -- GG AA -- AA -- AA GG GG 4 0128EHAB -- GG AA -- AG -- AA AG GG 5 PBBA0829 -- GG AA -- AA -- AA GG AG 6 01605BGA -- GG AA -- AA -- AA GG GG 7 01624BGA -- GG AA -- AG -- AA GG GG 8 01853BGA -- GG...
2010 Nov 24
3
[LLVMdev] Question regarding the alias analysis chaining behaviour
Hi, I am using LLVM 2.4 on a Linux RHEL5 machine. I was trying to figure out how the chaining of the alias analysis passes works in LLVM. Here are the command I used to test the chaining part. 1. ./opt hello_world_1_nest_func.bc -o hello_world_1_nest_func_AA.bc -no-aa -anders-aa -licm Result: Anderson's AA and No Alias Analysis both are called. 2. ./opt hello_world_1_nest_func.bc -o hello_world_1_nest_func_AA.bc -basicaa -anders-aa -licm Result: Anderson's AA and Basic AA both are called. 3. ./opt hello_world_1_nest_func.bc -o hello_wor...
2010 Oct 08
6
Selección de observaciones
Hola a todos. Estoy atascado en un sitio que no me he encontrado antes, debe ser fácil y rápido, a ver si alguien me puede ayudar. Puesto fácil, tengo: > aa <- matrix(11:19,3,3) > aa [,1] [,2] [,3] [1,] 11 14 17 [2,] 12 15 18 [3,] 13 16 19 Quiero la fila cuyo primer elemento es 12 y el segundo 15. > aa[aa[,1:2] == (c(12,15)),] Error: (subscript) logical subscript too long ¿Entonces? > aa[aa[,1:2] == t(c(12,15)),]...
2009 Aug 05
1
Decision boundaries for lda function?
...e lda function from the MASS library. I would to find the decision boundaries of each class and subsequently plot them. I wonder if anybody can offer any help on this topic? Below I applied the lda function on a small dataset of mine. Any help will be much appreciated. > library(MASS) > AA<-read.table("http://www.natursyn.dk/online/fingerprinting.txt",header=T) > aa.lda<-lda(as.matrix[3:9],AA$group) > aa.ld<-predict(aa.lda,dimen=2)$x > eqscplot(aa.ld,type="n",xlab="LD1", ylab="LD2",las=1) > text(aa.ld,c(rep('f',...
2006 Dec 20
4
R windows crash (PR#9426)
...from: (NULL) (61.88.57.1) R gui exits without warning when I run a function which has an argument with a default that is not found. This was a result of an error in a function I wrote, but I thought that it should exit more gracefully than it does. Here is an example: testfun <- function(aa=aa) { aa <- lm(y~x,data=aa) return(aa) } testfun() #R then exits. Note that testfun <- function(aa=bb) { aa <- lm(y~x,data=aa) return(aa) } works as it should, giving "object bb not found".
2005 Oct 28
3
replacing a factor value in a data frame
Hi All, I have the following problem, that's driving me mad. I have a dataframe of factors, from a genetic scan of SNPs. I DO have NAs in the dataframe, which would look like: V4 V5 V6 V7 V8 V9 V10 1 TT GG TT AC AG AG TT 2 AT CC TT AA AA AA TT 3 AT CC TT AC AA <NA> TT 4 TT CC TT AA AA AA TT 5 AT CG TT CC AA AA TT 6 TT CC TT AA AA AA TT 7 AT CC TT CC <NA> <NA> TT 8 TT CC TT AC AG AG TT 9 AT CC TT CC AG <NA> TT 10 TT CC TT CC GG GG TT In the dataframe I have 1 c...
1999 Apr 23
1
[S] uniroot -- doesn't work recursively
...he R community ... :-) Martin Maechler <maechler@stat.math.ethz.ch> http://stat.ethz.ch/~maechler/ Seminar fuer Statistik, ETH-Zentrum SOL G1; Sonneggstr.33 ETH (Federal Inst. Technology) 8092 Zurich SWITZERLAND phone: x-41-1-632-3408 fax: ...-1086 <>< >>>>> "AA" == Adelchi Azzalini <aa@gwen.stat.unipd.it> writes to S-news on 22 Apr 1999 : AA> Dear S+ users, AA> has anyone experienced problems with uniroot(), in Splus 4.5? AA> In my case, it locates a (non-existing) solution outside the AA> given search in...
2019 May 17
3
nrow(rbind(character(), character())) returns 2 (as documented but very unintuitive, IMHO)
Hi Herve, Inline. On Thu, May 16, 2019 at 4:45 PM Pages, Herve <hpages at fredhutch.org> wrote: > Hi Gabe, > > ncol(data.frame(aa=c("a", "b", "c"), AA=c("A", "B", "C"))) > # [1] 2 > > ncol(data.frame(aa="a", AA="A")) > # [1] 2 > > ncol(data.frame(aa=character(0), AA=character(0))) > # [1] 2 > > ncol(cbi...
2010 Mar 09
0
error with adaboost: replacement has 186 rows, data has 62
...as 62 The data structure is attached below: [1] "ylearn" [1] 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 0 0 0 0 0 0 0 0 0 [40] 1 1 1 1 1 1 1 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 1 [1] "xlearn" rs2289472 rs1551398 rs7927894 X18 "CT" "AA" "CT" X19 "TT" "AA" "CC" X33 "TT" "AG" "TT" X35 "TT" "AA" "CT" X36 "CC" "AA" "CT" X41 "CT" "AA...
2013 Apr 29
3
rbinding some elements from a list and obtain another list
...t;-list(A=data.frame, B=data.frame, C=data.frame, D=data.frame) I want to rbind some elements of this list. As an example: Output<-list(AB=data.frame, CD=data.frame) Where AB=rbind(A,B) CD=rbind(C,D) I’ve tried: f<-function(x){ for (i in seq(1,length(names(x)),2)){ aa<-do.call(rbind,x[i:i+1]) aa }} bb<-f(mylist) or f<-function(x){ for (i in seq(1,length(names(x)),2)){ aa[i]<-do.call(rbind,x[i:i+1]) list(aa[i]) }} bb<-f (mylist) but it doesn’t works!!!! f<-function(x){ + for (i in seq(1,length(names(x))...
2012 Jan 04
2
[LLVMdev] Comparison of Alias Analysis in LLVM
On Wed, Jan 4, 2012 at 12:10 PM, David Gardner <daveg at xmos.com> wrote: > Jianzhou Zhao <jianzhou <at> seas.upenn.edu> writes: >> The documents say that all the aa analysis are chained, and give an >> example like opt -basicaa -ds-aa -licm. In this case, does ds-aa >> automatically call basicaa for the case when ds-aa can only return >> MayAlias? This looks magic to me. Is this handled by AnalysisGroup >> magically? > > As I unde...
2005 Jul 08
2
removing factor level represented by less than x rows
In a number of different situations I'm trying to remove factor levels that are represented by less than a certain number of rows, e.g. if I had the dataset aa below and wanted to remove the species that are represented in less than 2 rows: data(iris) aa <- iris[1:101,] In this case, since I can see that the species virginica only has one row, I can write: table(aa$Species) setosa versicolor virginica 50 50 1 aa[aa$Speci...
2009 May 14
2
[LLVMdev] alias analysis results
Hi there, I am trying to understand how AliasAnalysis works out in LLVM. I used the following simple test-case (test4.c): -- void test() { int *jj, *kk; int aa = 100; jj = &aa; *jj = 300; } int main() { test(); return 0; } -- Then I did "llvm-gcc -emit-llvm -c -o test4.bc test4.c" to get bc. I tried the following 2 ways to get what I expect to get as "alias-sets": 1. opt -aa-eval -print-all-alias-modref-info test4....
2010 May 18
2
Counting Frequencies in Data Frame
Hi, I am sure there is an easy way to do it, but I can't find it. I have a data frame that has 15 columns and 7000 rows. The only values inside the data.frame are "aa", "ab", "bb" as you can see an example bellow. 1 2 3 1 aa ab ab 2 ab ab ab 3 aa aa aa 4 bb bb bb What I would like to do, is to generate a vector (or another data.frame) with 7000 rows, and 3 columns. In the first column, the information about how many aa, the second...
2011 Sep 13
1
error trying to create replicated volume on EC2
...gluster peer probe domU-BB-BB-BB-BB.compute-1.internal Probe successful A ~$: gluster peer status Number of Peers: 1 Hostname: domU-BB-BB-BB-BB.compute-1.internal Uuid: 8d5d9af4-6a92-4d56-b063-c8fc9ac17a45 State: Peer in Cluster (Connected) B ~$: gluster peer status Number of Peers: 1 Hostname: AA-AA-AA-AA (the IP of host A) Uuid: 8d5d9af4-6a92-4d56-b063-c8fc9ac17a45 State: Peer in Cluster (Connected) A ~$: sudo gluster volume create test-vol replica 2 transport tcp domU-AA-AA-AA-AA.compute-1.internal:/mnt/brick1 domU-BB-BB-BB-BB.compute-1.internal:/mnt/brick1 Brick: domU-AA-AA-AA-AA.comput...
2010 Mar 08
0
error when using svm routine: Error in if (any(co)) { : missing value where TRUE/FALSE needed
...sswt<-c( 0.5806452, 0.4193548) > y<-data[,1] > x<-data[,2:ncol(data)] > print(y) [1] 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 1 1 1 1 1 [36] 1 1 1 1 2 2 2 2 2 2 2 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 > print(x) rs2289472 rs1551398 rs7927894 1 CT AA CT 2 TT AA CC 3 TT AG TT 4 TT AA CT 5 CC AA CT 6 CT AA CT 7 TT AA CT 8 CT AG CT 9 CC AA CT 10 TT AG...
2016 Mar 22
4
Existing studies on the benefits of pointer analysis
It's found more and more like "get CFL-AA turned on by default" might be a viable GSoC project for the right student. It would require someone with existing knowledge of AA and a willingness to debug nasty problems, but it sounds like there's definitely interest in the community in seeing this happen. If the student finished...