search for: names1

Displaying 16 results from an estimated 16 matches for "names1".

Did you mean: names
2013 Sep 05
2
binary symmetric matrix combination
...c1 c2 l17 h4 s2 s30 e5 l15 y1 0 1 1 1 1 1 1 1 1 1 g24 1 0 0 0 0 0 0 0 0 0 c1 1 0 0 1 1 0 0 0 0 0 c2 1 0 1 0 1 0 0 0 0 0 l17 1 0 1 1 0 0 0 0 0 0 h4 1 0 0 0 0 0 1 1 0 0 s2 1 0 0 0 0 1 0 1 0 0 s30 1 0 0 0 0 1 1 0 0 0 e5 1 0 0 0 0 0 0 0 0 1 l15 1 0 0 0 0 0 0 0 1 0",sep="",header=TRUE)) names1<-unique(c(colnames(m1),colnames(m2),colnames(m3),colnames(m4))) Out2<-matrix(0,length(names1),length(names1),dimnames=list(names1,names1)) vec1<- paste0(colnames(m1)[col(m1)],rownames(m1)[row(m1)]) vecOut<- paste0(colnames(Out2)[col(Out2)],rownames(Out2)[row(Out2)]) Out2[match(vec1,vecO...
2004 Jun 25
3
String manipulation
...> str<-("one","two","three") Now I want to concatenate the items to one string, seperateted by space or something else, >str >"one, two, three" If possible without a loop. My actual goal ist to create string like >str.names >"female = names1, male = names2" and pass it as argument to list(), intending to create a list >names.list<-list( female = names1, male = names2) Thanks a lot, Robin
2012 Jun 03
2
merging single column from different dataframe
Hi all, probably really simple to solve, but having no background in programming I haven't been able to figure this out: I have two dataframes like df1 <- data.frame(names1=c('aa','ab', 'ac', 'ad'), var1=c(1,5,7,12)) df2 <- data.frame(names2=c('aa', 'ab', 'ac', 'ad', 'ae'), var2=c(3,6,9,12,15)) Now I want merge var1 to df2 by matching the dataframes by the 'names' columns, i.e. somethi...
2011 Oct 27
2
help with paste
...A+PTH". currently i am using loop to perform this. I would appreciate any pointers to do it without the loop. > mols=c("LEPTIN","SAA","PTH","sEGFR") > samples=mols[1:3] > samples [1] "LEPTIN" "SAA" "PTH" > names1=samples[1] > for (j in 2:length(samples)){ names1 = paste (names1, samples[j], > sep="+")} > names1 [1] "LEPTIN+SAA+PTH" > thanks sharad -- View this message in context: http://r.789695.n4.nabble.com/help-with-paste-tp3942818p3942818.html Sent from the R help mail...
2009 Oct 30
2
Names of list members in a plot using sapply
Hi R users: I got this code to generate a graphic for each member of a lists. list1<-list(A=data.frame(x=c(1,2),y=c(5,6)),B=data.frame(x=c(8,9),y=c(12,6))) names1<-names(list1) sapply(1:length(list1),function(i) with(list1[[i]],plot(x,y,type="l",main=paste("Graphic of",names1[i])))) Is there a more elegant solution for not to use two separate lists? I would like to just use sapply(list1, somePlotfunction) and plot for each graphic...
2010 Jun 13
1
Boxplot intervals combining names
...red between the boxes so I can add the Individuals' name. I have 30 IDs and have shown the code I use below for a couple of IDs, I figure the data is not important here so it's not included. boxplot (ID1[,8],ID1[,9],ID2[,8],ID2[,9],xaxt='n') I have put all the ID names in as 'names1' and I have tried numerous variations on axis, e.g. axis(1,at=1:30,labels=names1) but nothing works: the boxplot appears to 'know' that there are 60 tick marks (data) and therefore only puts ticks half way up the graph, and using: axis(1,at=1:30,labels=names1) complains that there...
2011 Nov 08
2
match first consecutive list of capitalized words in string
Dear R-Helpers, this is my first post ever to a mailing list, so please feel free to point out any missunderstandings on my side regarding the conventions of this mailing list. My problem: Assuming the following character vector is given: names <- c("filia Maria", "vidua Joh Dirck Kleve (oo 02.02.1732)", "Bernardus Engelb Franciscus Linde j.u.Doktor referendarius
2011 Oct 27
2
help with parallel processing code
...sitive rate", main = NULL, CI = T, n.boot = 100, plot = "both", binormal = TRUE) auc <- as.numeric(performance(pred, measure = "auc", x.measure = "cutoff")@y.values) auc = round(auc,3) text(.9,0,paste(" AUC=", auc, sep=" "), cex=1) names1 = paste (samples, collapse="+") text(.8,.05,names1, cex=0.75) temp = c(names1, auc) temp1 = rbind(temp1 , temp) print(paste(3,' ','done len=',len," ",names1,' ',date(),sep='')) } dev.off() write.csv(temp1 , file=file1) Thanks sh...
2013 Feb 17
2
Loop
Hi all, I want to execute a loop of a program: for (u in Timeframemin:Timeframe){} Imagine that Timeframemin<-10 Timefram<-10000 Is it posible to execute the loop but only proving from 10 to 10000 but jumping 10 each time, for example, execute for 10,20,30.....to Timeframe. Other question is, when a program is "heavy" and has a lot of loops to execute (how can I know where
2008 Feb 21
3
applying a function to data frame columns
useR's, I want to apply this function to the columns of a data frame: u[u >= range(v)[1] & u <= range(v)[2]] where u is the n column data frame under consideration and v is a data frame of values with the same number of columns as u. For example, v1 <- c(1,2,3) v2 <- c(3,4,5) v3 <- c(2,3,4) v <- as.data.frame(cbind(v1,v2,v3)) uk1 <- seq(min(v1) - .5, max(v1) + .5,
2009 Aug 09
3
howto get the number of columns and column names of multiply data frames
Hi, I' ve read in several files with measurements into R data frames(works flawlessly). Each dataframe is named by the location of measurement and contains hundreds of rows and about 50 columns like this dataframe1. date measurment_1 .... mesurement_n 1 2 3 .. .. .. n For further processing I need to check whether or not ncol and colnames are the same for all dataframes. Also I need to
2005 Oct 13
0
Maps package, coloration
...almost as if the index has been scrambled, but I find that the ordering is fine in the data.frame. I am completely confused, any guidance as to what simple thing that I am missing here. Any suggestions greatly appreciated. data(countyMapEnv) all.names <- map('county',namesonly=T) all.names1 <- data.frame(mapm=all.names, col=NA,ordin=1:length (all.names)) # created a dataframe, to be sure of the # order, I include a variable 'ordin' to index later # next I merge in the data to use for coloration # the merge works well, with every element matched t <- merge(final[,c(...
2012 Aug 02
4
Subseting
Hi everyone I have banking data set in long format with 4 columns.One of these columns is bank name which consist of 49 banks and I want the data for only 40 banks out of these 49 so can anyone help me on how to get this 40 banks data My data looks like Year Name totalliabilties assets 1990 a 90 10 1991 a 89 48 1992 a 87
2012 Dec 24
2
whats wrong in my codes???
Dear R family,i am trying to plot and save, simultaneously, about 1000. the name of each plot is contained in "names" file. when i run this loop, i get an error. "Error in plot.new() : Unable to open file 'C:/R/SAVEHERE/myplot_Tak.jpg' for writing". could you please correct the mistake in the loop? >names<-(names(sp)) >for(a in seq_along(names)){ >mypath
2020 Oct 18
1
Lookup sid with libsmbclient (invoked from c# on mono)
...ranslating " + sidstring + " on " + remoteserver); return sidstring; } var domains1 = Marshal.ReadIntPtr(domainsIntPtr.DangerousGetHandle()); referencedDomain = Marshal.PtrToStringAnsi(domains1); var names1 = Marshal.ReadIntPtr(namesIntPtr.DangerousGetHandle()); var name = Marshal.PtrToStringAnsi(names1); domainsIntPtr.Close(); namesIntPtr.Close(); typesIntPtr.Close(); if (String.IsNullOrEmpty(referencedDomain))...
2020 Oct 12
2
Lookup sid with libsmbclient (invoked from c# on mono)
Typical example: Here is some search & export for libsmbclient: adiant at ubuntu:/usr/lib/x86_64-linux-gnu$ nm -D libsmbclient.so.0 |grep cli_rpc_pipe_open_noauth_transport <nothing> adiant at ubuntu:/usr/lib/x86_64-linux-gnu$ nm -D libsmbclient.so.0 |grep cli_rpc_pipe_open U cli_rpc_pipe_open_noauth adiant at ubuntu:/usr/lib/x86_64-linux-gnu$ nm -D libsmbclient.so.0