search for: g2

Displaying 20 results from an estimated 966 matches for "g2".

Did you mean: 2g
2013 Jan 07
1
Disk error
For some time I have been seeing disk errors in the syslog every seven days. Until today it always happens Sunday morning at 8:13 AM, plus or minus a minute or two. Yesterday it happened at 1:13 AM. Here are the pertinent log entries for the latest occurrence: Jan 6 01:12:29 g2 kernel: ata9.00: exception Emask 0x0 SAct 0x0 SErr 0x0 action 0x0 Jan 6 01:12:29 g2 kernel: ata9.00: BMDMA stat 0x64 Jan 6 01:12:29 g2 kernel: ata9.00: failed command: READ DMA EXT Jan 6 01:12:29 g2 kernel: ata9.00: cmd 25/00:00:00:fe:d5/00:02:04:00:00/e0 tag 0 dma 262144 in Jan 6 01:12:29 g2 k...
2009 Oct 06
1
how to output profile plots for groups using lattice package
Dear R users, I am trying to have an xyplot of a data set which has the following variables: case (n=10,20,30) parameter (parm=a,b) group (grp=g1,g2) y (y values) x (x=2,4,8) My plot should be parameter by case such that I have 2 rows (each row= each parameter) and 3 columns (each column=each case). My R-code is as follows but I am not able to get what I want to: tp1.sim <- xyplot(y~ x | case + parm , group=group, data = data, lty = 1:4 ,...
2008 Sep 24
2
keep the row indexes/names when do aggregate
Hi, R-users, If I have a data frame like this: >x<-data.frame(g=c("g1","g2","g1","g1","g2"),v=c(1,7,3,2,8)) g v 1 g1 1 2 g2 7 3 g1 3 4 g1 2 5 g2 8 It contains two groups, g1 and g2. Now for each group I want the max v: > aggregate(x$v,list(g=x$g),max) g x 1 g1 3 2 g2 8 Beautiful. But what if I want to keep the row index of (...
2004 Apr 01
5
Zap Channels Hang
...ain. any ideas? asterisk*CLI> show channels Channel (Context Extension Pri ) State Appl. Data Zap/31-1 (default 9388 1 ) Dialing AppDial (Outgoing Line) SIP/1024-1330 (network 968290897 2 ) Ring Dial Zap/g2/68290897 Zap/30-1 (default s 1 ) Dialing AppDial (Outgoing Line) SIP/1004-bca1 (network 993841544 2 ) Ring Dial Zap/g2/93841544 Zap/29-1 (default s 1 ) Dialing AppDial (Outgoing Line) SIP/1007-1fa1 (network...
2004 Jan 14
1
Collapsing a factor in R
...roup but how do I maintain the Group/Gender factors after collapsing? (see bottom table) Can anyone help?? Thanks in advance!! Here's the starting point (table) Age Group SubGroup Gender 12 g1 a f 32 g1 a f 81 g1 a f 63 g1 b m 24 g1 b m 24 g1 b m 70 g1 c f 82 g1 c f 71 g1 c f 61 g1 c f 25 g2 d m 29 g2 d m 43 g2 e f 17 g2 e f 42 g2 e f 55 g2 e f 52 g2 f f 19 g2 f f 12 g2 f f The following is what I'm trying to achieve (as a new dataframe) AvgAgeSubgroup Group Subgroup Gender 41.67 g1 a f 37 g1 b m 71 g1 c f 27 g2 d m 39.25 g2 e f 27.67 g2 f f Can anyone help? -...
2015 Oct 13
2
[PATCH v2 4/4] v2v: reuse main guestfs for virtio win drivers iso
...), 9 deletions(-) diff --git a/v2v/convert_windows.ml b/v2v/convert_windows.ml index cfa5474..5fd8bb6 100644 --- a/v2v/convert_windows.ml +++ b/v2v/convert_windows.ml @@ -294,13 +294,25 @@ echo uninstalling Xen PV driver ) else if is_regular_file virtio_win then ( try - let g2 = new Guestfs.guestfs () in - if trace () then g2#set_trace true; - if verbose () then g2#set_verbose true; - g2#add_drive_opts virtio_win ~readonly:true; - g2#launch (); - let vio_root = "/" in - g2#mount_ro "/dev/sda" vio_root; +...
2009 Dec 29
2
pass functions and arguments to function
Hi, I wonder how to pass several functions and their arguments as arguments to a function. For example, the main function is f = function(X ) { process1(X) ... process2(X) } I have a few functions that operate on X, e.g. g1(X, par1), g2(X, par2), g3(X, par3). par1, par2 and par3 are parameters and of different types. I would like to pass g1, g2, g3 and their arguments to f and g1, g2, g3 may appear to be in different orders. So that final effect of the passing is f = function(X ) { process1(X) g1(X, par1) g2(X, par2)...
2008 Apr 05
2
How to improve the "OPTIM" results
..., -0.54763352, 0.20263192) # data theta0= c(log(2),0,c(0,-.3,.3),log(c(10,.05,.05))) # initial value(In fact, true parameter value) n = length(x) fr2 = function(theta) { a1 = theta[1]; a2 = theta[2] mu1 = theta[3]; mu2 = theta[4]; mu3 = theta[5] g1 = theta[6]; g2 = theta[7]; g3 = theta[8] w1=exp(a1)/(1+exp(a1)+exp(a2)) w2=exp(a2)/(1+exp(a1)+exp(a2)) w3=1-w1-w2 obj =((w1^2)/(2*sqrt(exp(g1)*pi)) + (w2^2)/(2*sqrt(exp(g2)*pi)) + (w3^2)/(2*sqrt(exp(g2)*pi)) + 2*w1*w2*dnorm((mu1-mu2)/sqrt(exp(g1)+exp(g2)))/sqrt(exp(g1)+exp(g2))...
2008 Apr 05
2
How to improve the "OPTIM" results
..., -0.54763352, 0.20263192) # data theta0= c(log(2),0,c(0,-.3,.3),log(c(10,.05,.05))) # initial value(In fact, true parameter value) n = length(x) fr2 = function(theta) { a1 = theta[1]; a2 = theta[2] mu1 = theta[3]; mu2 = theta[4]; mu3 = theta[5] g1 = theta[6]; g2 = theta[7]; g3 = theta[8] w1=exp(a1)/(1+exp(a1)+exp(a2)) w2=exp(a2)/(1+exp(a1)+exp(a2)) w3=1-w1-w2 obj =((w1^2)/(2*sqrt(exp(g1)*pi)) + (w2^2)/(2*sqrt(exp(g2)*pi)) + (w3^2)/(2*sqrt(exp(g2)*pi)) + 2*w1*w2*dnorm((mu1-mu2)/sqrt(exp(g1)+exp(g2)))/sqrt(exp(g1)+exp(g2))...
2006 Jan 06
1
Problem with integrating ISDN PBX using NT mode
...ay around does not work. Whenever I call from the Asterisk server to one of the extensions connected through the ISDN PBX that extension rings for a split second and then the call is dropped. Here is what I get on the console: -- Executing Macro("SCCP/13-0000002f", "standard|Zap/g2/40") in new stack -- Executing Dial("SCCP/13-0000002f", "Zap/g2/40|20") in new stack -- Requested transfer capability: 0x00 - SPEECH -- Called g2/40 == Primary D-Channel on span 4 up for TEI 64 == Primary D-Channel on span 4 up for TEI 66 -- Zap/10-1...
2009 Jul 15
1
Help with averaging
...eragedResults <- (zz[,ix] + zz[,ix+1])/2 averagedResults <- cbind(zz[,1],averagedResults ) colnames(averagedResults) <- c("PCI","G1-C1","G1-C2","G1-C3","G1-C4","G1-C5","G1-C6","G1-C7","G1-C8", "G2-C9","G2-C10","G2-C11","G2-C12","G2-C13","G2-C14","G2-C15","G2-C16", "G3-C17","G3-C18","G3-C19","G3-C20","G3-C21","G3-C22","G3-C23", "G4-C24",&qu...
2012 Dec 04
1
Solve system of equations (nleqslv) only returns origin
...leqslv) ###### Global Parameters ############ beeta=0.8 pq=10000 L=12600 theta=0.6 psale=0.6 mu=psale*(1-theta) alphah=0.15 Cg=6240 Cs=2820 A= 100 D=0.0001 greekp=0.43 K=100000 ##### Species Parameters ########## b1=0.38 p1=16654 v1 = 0.28 N1=6000 g1=1 delta1=1 b2=0.4 p2=2797 v2 = 0.31 N2=10000 g2=1 delta2=1 ### Define functions with vector x = c(Lg, Ls, gamma1, gamma2, lamda) firstordercond <- function (x) { y=numeric(4) y[1]=(alphah/x[3])-(x[5]*((p1-(((theta+mu)*(((N1/A)*g1^greekp*x[1]^b1)+K))+((theta+mu)*(((1-exp(-2*D*v1*N1))*x[2])+K))))*(((N1/A)*g1^(greekp))*x[1]^b1+(2*v1*N1*...
2010 Jan 05
2
High l-avg with centos 4.8 on G2 only
Hi We deployed centos 4.8 on HP DL380 G2, G3 and G4 servers (same number of cpus). The same software is running on all servers. Only on G2 servers we see a low cpu utilization combined with high load-average. For example, during the same time of day and same workload, on a G2 I see a l-avg of 11.31 and on a G4 I see 2.68. The server resp...
2006 Aug 28
1
Rgraphviz - neato layout - edge weights do not have an effect
...ngs. The weight of the edge is the strength of the spring. However, I was not able to find any influence of edge weight on the layout. In the http://www.graphviz.org/Documentation/neatoguide.pdf the attribute "len" is another parameter of the neato layout. set.seed(31) V=letters[1:5] g2=randomEGraph(V,0.5) plot(g2,"neato",main="All weights 1") # change and edge weight edgeData(g2, from = "d", to = "e", attr = "weight") <- 20 plot(g2,"neato",main="Nothing changed!") #try out length attribute change edgeDataD...
2008 Sep 10
4
HP T/R2200 G2
Has anyone had any success with the HP T/R2200 G2? I have used the T/R2200 with nut a few times before and it works great, but the G2 doesn't want to talk to me. I have tried bcmxcp from 2.0.4, 2.2.2, and svn, as well as the usb drivers. Maybe the G2 isn't a rebadged powerware unit? Thanks James
2008 Sep 10
4
HP T/R2200 G2
Has anyone had any success with the HP T/R2200 G2? I have used the T/R2200 with nut a few times before and it works great, but the G2 doesn't want to talk to me. I have tried bcmxcp from 2.0.4, 2.2.2, and svn, as well as the usb drivers. Maybe the G2 isn't a rebadged powerware unit? Thanks James
2013 Jul 18
1
Bland Altman summary stats for all column combinations
....9, 73.9, 64, 42.9, 62.5, 59.3, 66.7, 68.4, 54, 68.2, 56.8, 54.5, 67, 53.2, 41.4, 53, 52.3, 41, 37.4, 56.9, 65.3, 36.2, 35.3, 36.1, 32.5, 56.5, 47.7, 39.4, 59.6, 38.1, 24.2, 30.2, 68.5, 68.9, 70.7, 74.9, 53.4, 51.6, 65.9, 75.7, 64.7, 42.8, 61.4, 60.8, 69.5, 68.7, 55.9, 70.7, 59.5, 51.1, 69.5), G2 = c(79.8, 72.2, 73.5, 74.4, 50.4, 54.8, 63.1, 70.4, 63.6, 45.1, 65.3, 49.4, 65.3, 76.2, 51, 63.9, 58.7, 57.8, 67, 79.6, 72.1, 73.9, 74.7, 50.5, 55.1, 62.8, 70.5, 63.3, 44.6, 65.5, 48.9, 64.9, 76.3, 50.6, 64.8, 58.6, 58.3, 67.4, 51.2, 37.7, 49.1, 53.7, 44.6, 37.3, 54.9, 64.1, 33.8, 31.9, 34.2,...
2009 Mar 26
1
loop problem
Dear R members I have a problem regarding storing the lists. Let L=number of distinct values of any predictor (say L=5) P=number of predictors (say P=20) g1 <- c() for(i in 1:P){ if(L > 1){ for(j in 1:(L-1)){ g <- .... g1[j] <- g } } g2[]=sort.list(g1) } Now the question is: What should we use inside brackets of g2[....], whether "i" or some thing else? If L is not greater than 1 then there will be a "NULL" for g2. We don't want to store it in g2, so how can we handle this problem. Looking...
2013 Jan 24
1
Pairwise Comparrisons
...window, do pairwise comparisons of sequence similarity. Coding the sliding window I think I can manage but what I''m trying to get to grips with is getting it so as every pairwise comparison is made, no matter how many genomes are added, from 3 to N. So if I had four genome sequences, G1, G2, G3, G4 the comparisons would be: G1:G1 G1:G2 G1:G3 G1:G4 G2:G2 G2:G3 G2:G4 G3:G3 G3:G4 G4:G4 I can think of a way this might be done with a very complicated loop, which would take the region in the window of each genome and then make all possible combination/comparrisons: So the loop would take...
2005 Jan 20
1
Weird Zaphfc - not dialling non-local numbers
...p, because I've been tearing my hair out for the past 5 hours on this one. I have a Zaphfc (BRI) card in TE mode connected to the S-Bus of a Nortel Meridian phone system. Phone calls from the Nortel to say MSN 510 are correctly being sent to the right SIP phone. When asterisk dials say Zap/g2/224 (a Nortel internal extension) the call goes through, no problem. The wierd bit is, when Asterisk calls Zap/g2/907748xxxxxx to reach an mobile on an outside line, the call connot be connected. I know for a fact that the '9' prefix is valid for use on the S-Bus, because I previously u...