search for: s2

Displaying 20 results from an estimated 1154 matches for "s2".

2009 Jan 02
1
R: numerical integration problems
...ew year and hope you r having a good holiday. i would like to calculate the expectation of a particular random variable and would like to approximate it using a number of the functions contained in R. decided to do some experimentation on a trivial example. example ======== suppose x(i)~N(0,s2) where s2 = the variance the prior for s2 = p(s2)~IG(a,b) so the posterior is IG(.5*n+a, b+.5*sum(x^2) ) and the posterior expectation of s2 = (b+sum(x^2))/(.5*n+a-1) I want to calculate the value of this expectation using integrals. ie let L(X|s2) = the likelihood function so E(s2|X) = (inte...
2005 Dec 01
2
Minimizing a Function with three Parameters
...t(i) ) - (\alpha + 1) \sum\limits_{i=1}^{n} ( i / (x_i + \psihat(i)) ) = 0 where \psihat=\beta_0 + \beta_1 * i. Now i want to get iterated values for \alpha, \beta_0 and \beta_1, so i used the following implementation # first equation l1 <- function(beta0,beta1,alpha,x) { n<-length(x) s2<-length(x) for(i in 1:n) { s2[i]<-log(beta0+beta1*i)-log(x[i]+beta0+beta1*i) } s2<-sum(s2) return((n/alpha)+s2) } # second equation l2 <- function(beta0,beta1,alpha,x) { n<-length(x) s1<-length(x) s2<-length(x) for(i in 1:n) { s1[i]<-1/(beta0+b...
2011 May 19
2
trouble with summary tables with several variables using aggregate function
...following table: Var1 Var2 Var3 dummy S1 T1 I 1 S1 T1 I 1 S1 T1 D 1 S1 T1 D 1 S1 T2 I 1 S1 T2 I 1 S1 T2 D 1 S1 T2 D 1 S2 T1 I 1 S2 T1 I 1 S2 T1 D 1 S2 T1 D 1 S2 T2 I 1 S2 T2 I 1 S2 T2 I 1 S2 T2 I 1 I want to create a summary table that shows for...
2009 Oct 11
1
Solving a nonlinear System of equations
Hello there, I wish to solve the following nonlinear System of equations: + u1 - Vmax11*S1/(S1 + Km11 *(1 + S2/Km21)) - Vmax12*S1/( S1 + Km12 *(1+S2/Km22)) == 0 + u2 - Vmax22*S2/(S2 + Km22 *(1 + S1/Km12)) - Vmax21*S2/( S2 + Km21 *(1+S1/Km11)) == 0 + Vmax11*S1/(S1 + Km11 *(1 + S2/Km21)) + Vmax12*S1/( S1 + Km12 *(1+S2/Km22)) - d1*P1 == 0 + Vmax22*S2/(S2 + Km22 *(1 + S1/Km12)) + Vmax21*S2/( S2 + Km21 *(1+S1/K...
2009 Jun 02
1
Difference between rsync -r S1 S2 T and cp -r S1 S2 T
The manual says rsync can be used as an improved cp command. If S1 and S2 are (local) source files or directories and T is an (local) existing directory, is it safe to think that $ rsync -r S1 S2 T does the same thing as $ cp -r S1 S2 T , assuming no trailing slashes in S1, S2? -- View this message in context: http://www.nabble.com/Difference-between-rsync--r-S1-S2-T-an...
2012 Nov 01
2
[LLVMdev] llvm linking issue
I have three modules: ----------------------------------------------------------------- s1.ll: %0 = type <{ i32, i32 }> define void @s1(%0* byval %myStruct) nounwind { return: ret void } ----------------------------------------------------------------- s2.ll: %0 = type <{ i32, i32 }> define void @s2(%0* byval %myStruct) nounwind { return: ret void } ----------------------------------------------------------------- s3.ll: %0 = type <{ i32, i32 }> declare void @s1(%0* byval) nounwind readonly declare void @s2(%0* byval) nounwind reado...
2005 Feb 03
1
samba nad ldap
...dbb,dc=su,dc=se" write by * none # this can be omitted but we leave it: there could be other branch # in the directory access to * by self read by * none Shouldn't the Administrator have some ACL access here? Here's some things from the syslog: Feb 3 14:11:33 s2 slapd[26517]: conn=44 fd=12 ACCEPT from IP=130.237.190.137:38204 (IP=0.0.0.0:389) Feb 3 14:11:33 s2 slapd[26517]: conn=45 fd=24 ACCEPT from IP=130.237.190.137:38205 (IP=0.0.0.0:389) Feb 3 14:11:34 s2 slapd[26519]: conn=44 op=1 BIND dn="cn=samba,ou=DSA,dc=dbb,dc=su,dc=se" method=128 F...
2012 Oct 31
2
how can xyplot word when with for control flow
...or (i in 1:3){ plot3.data<-subset(plot.data,Fam==i) heading=paste("Fam_",i) xyplot(rank ~ ca, data=plot3.data, groups=Spacing, type="o",main=heading) } ############ data format ###### data format of plot.data shows as folow: Fam Fam2 Spacing ca rank 1 Fam_70001 S2 1 14 1 Fam_70001 S2 2 46 1 Fam_70001 S2 3 49 1 Fam_70001 S2 4 47 1 Fam_70001 S2 5 54 1 Fam_70001 S3 1 18 1 Fam_70001 S3 2 38 1 Fam_70001 S3 3 34 1 Fam_70001 S3 4 27 1 Fam_70001 S3 5 29 2 Fam_70002 S2 1 8 2 Fam_70002 S2 2 12 2 Fam_70002 S2 3 25 2 Fam_70002 S2 4 8 2 Fam_70002 S2 5 13 2...
2012 Feb 23
1
[LLVMdev] Simple question on sign
...e PatFrags described and the LoadExtType enum defined, and the use of zext and sext to differentiate what containers the values are being loaded into in the IR. Basically I'm trying to describe patterns for automatically selecting between various multiplication instructions: #define MULL(t,s1,s2) t = (s1) * INT16(s2) #define MULLU(t,s1,s2) t = (s1) * UINT16(s2) #define MULH(t,s1,s2) t = (s1) * INT16((s2) >> 16) #define MULHU(t,s1,s2) t = (s1) * UINT16((s2) >> 16) #define MULHS(t,s1,s2) t = ((s1) * UINT16((s2) >> 16)) << 16 #define MULLL(t,s1,s2) t = INT16(s1) * INT...
2004 Oct 12
5
[LLVMdev] set_intersect and Visual C compiler
...> One thing that the compiler absolutely does not understand is the > > definition of set_intersect in include/llvm/ADT/SetOperations.h, and I > > am having a hard time understanding it myself. > > > > template <template<class S1ElTy> class S1Ty, class ETy, class S2Ty> > > void set_intersect(S1Ty<ETy> &S1, const S2Ty &S2) { > > for (typename S1Ty<ETy>::iterator I = S1.begin(); I != S1.end();) { > > const ETy &E = *I; > > ++I; > > if (!S2.count(E)) S1.erase(E); // Erase element if not...
2007 Sep 28
2
Problem with hard links
Hello, I have a problem with rsync and hard links : I have 1 folder : P, with 2 subfolders : S1 and S2 S2 contains a lot of hard links to file stored in folder S1. P : -S1 -S2 (S2 files hard links to S1 files) I would like to rsync the folder P to another computer, but each sub folder S1 (110 Go) and S2 (10 Go + hard link to 100 Go of S1) contains thousands of thousands of file...
1997 Jul 24
0
smbclient, tar, and exclude
...l 24 13:58:29 1997 *************** *** 372,381 **** } /**************************************************************************** ! Compare two strings in a slash insensitive way ***************************************************************************/ ! int strslashcmp(char *s1,char *s2) { while(*s1 && *s2 && (*s1 == *s2 || tolower(*s1) == tolower(*s2) --- 372,386 ---- } /**************************************************************************** ! Compare two strings in a slash insensitive way, allowing s1 to match s2 ! if s1 is an "init...
2012 Nov 01
0
[LLVMdev] llvm linking issue
...les: > ----------------------------------------------------------------- > s1.ll: > > %0 = type <{ i32, i32 }> > > define void @s1(%0* byval %myStruct) nounwind { > return: > ret void > } > ----------------------------------------------------------------- > s2.ll: > > %0 = type <{ i32, i32 }> > > define void @s2(%0* byval %myStruct) nounwind { > return: > ret void > } > ----------------------------------------------------------------- > s3.ll: > %0 = type <{ i32, i32 }> > > declare void @s1(%0* byval) no...
2017 Feb 06
2
[PATCH] Optimize silk_warped_autocorrelation_FIX() for ARM NEON
...stage when processing input[i] are reused by the next input[i+1]. That is input[i+1] must wait input[i] for 1 stage, and input[i+2] must wait input[i+1] for 1 stage, etc. Then it becomes this FOR in=0 to N WITH in+=8 PROC(in0(s0)) /* prolog 0 */ PROC(in0(s1) in1(s0)) /* prolog 1 */ PROC(in0(s2) in1(s1) in2(s0)) /* prolog 2 */ PROC(in0(s3) in1(s2) in2(s1) in3(s0)) /* prolog 3 */ PROC(in0(s4) in1(s3) in2(s2) in3(s1) in4(s0)) /* prolog 4 */ PROC(in0(s5) in1(s4) in2(s3) in3(s2) in4(s1) in5(s0)) /* prolog 5 */ PROC(in0(s6) in1(s5) in2(s4) in3(s3) in4(s2) in5(s1) in6(s0)) /* prolog 6 *...
2007 Jul 18
2
Linear programming question
Hi everybody, consider please an optimization problem: minimize sum S1+S2 Subject to : y - x =< A + S1 x - y =< A + S2 and we want to add two more constraints: y - x =< B - S3 x - y =< B - S4 where A is a small constant value and B is a large constant value, S1 and S2 are surplu...
2010 Oct 29
3
How to scan df from a specific word?
Hi R-helpers, I need to read some file with different lines (I don't know the number of lines to skip) and I would like to find a way to start reading the data.frame from the word "source". ex: djhsafk asdfhkjash shdfjkash asfhjkash #those lines contain numbers and words, I want to skip then but they have different sizes asdfhjkash asdfhjksa source tret 2 res 3 Can
2011 Feb 02
4
Testing whether a number belong to a set
Hello everyone, I am stuck with an apparently simple issue : i) I have two sets S1 and S2, each containing a large number of integers, say zip codes. ii) Now, I just want to test whether a particular zip code belong to S1 or S2 or neither of them. iii) If it belongs to S1, the area/region gets a particular label, say 1; if it belongs to S2, it gets a label 2 and if it doesnot belong to...
2018 Feb 07
2
add geo-replication "passive" node after node replacement
Hi all, i had a replica 2 gluster 3.12 between S1 and S2 (1 brick per node) geo-replicated to S5 where both S1 and S2 were visible in the geo-replication status and S2 "active" while S1 "passive". I had to replace S1 with S3, so I did an "add-brick replica 3 S3" and then "remove-brick replica 2 S1". Now I have a...
2017 Feb 07
2
[PATCH] Optimize silk_warped_autocorrelation_FIX() for ARM NEON
...d chop the "order" in chunks of N. Using your notation, you would > be doing: > > PROC( in0(s0)) > PROC( in0(s1) in1(s0)) > PROC( in0(s2) in1(s1) in2(s0)) > PROC( in0(s3) in1(s2) in2(s1) in3(s0)) > PROC( in0(s4) in1(s3) in2(s2) in3(s1) in4(s0)) > PROC( in0(s5) in1(s4) in2(s3) in3(s2) in4(s1) in5(s0)) > PROC( in0(s6) in1(s5) in2(s4) in3(s3) in4(s2...
2008 Oct 17
2
function help
...ly(res,function(x) rowSds(x))) rownames(STDs)=paste('sample',1:5,sep="") Gsd=sd(STDs) return(Gmean,Gsd)} I then need to use the mean and standard deviation from each row to calculate the Power for 2 sample means. here is the function I use to do it: Power=function(alfa,m1,m2,s1,s2,n1,n2){ up=abs(m1-m2) down=sqrt(((s1^2)/(n1))+((s2^2)/(n2))) z=(-1)*(qnorm(1-(alfa/2))) fi=z+(up/down) pow=pnorm(fi) return(pow)} then I need to call the Power function: Power(.05,57,mi,33,si,200,n) the alfa,m1,s1 and n1 values are constant but the m2,s2 and n2 values are changing. n2 is t...