search for: term2

Displaying 20 results from an estimated 26 matches for "term2".

Did you mean: terms
2006 Aug 24
1
Hyphenated terms
...m having a problem with any terms which contain hyphens in them. Is there a particular reason why this wouldn''t work? i''m using aaf, and have tried with the the previous version (pre 0.10.0) and the newest versions of both ferret and aaf. Basically, the problem is that term1-term2 is something my users want to search for, and it appears in the titles of publications, but when "term1" or "term2" or "term1-term2" are searched for, there are no results. Thanks for any clues Cam -- Posted via http://www.ruby-forum.com/.
2005 Apr 17
1
nls segmented model with unknown joint points
...1), but am unsure how to specify this in the nlm function. I would really appreciate any suggestions or example code. Thanks a lot. -andy proc nlin data=Stems.Trees; params b41=-3 b42=1.5 b43=-1.5 b44=50 a41=0.75 a42=0.1; term1 = (b41*(x - 1) + b42*(x**2 -1)); if (a41 - x) >= 0 then term2 = (b43*(a41 - x)**2); else term2 = 0; if (a42 - x) >=0 then term3 = (b44*(a42 - x)**2); else term3 = 0; model y = term1+term2+term3; run;
2007 Jan 01
4
Help with filled.contour()
The following plot is a first approximation to what I need: *********************************** mu1 <- 0 mu2 <- 5 s <- 1 x <- seq(-2.5, 7.5, length = 41) y <- seq(-2.5, 2.5, length = 41) f <- function(x,y){ term1 <- 1/(2*pi*sqrt(s*s)) term2 <- -1/2 term3 <- (x - mu1)^2/s term4 <- (y - mu1)^2/s term5 <- (x - mu2)^2/s term1*(.5 * exp(term2*(term3 + term4)) + .5 * exp(term2*(term5 + term4))) } z <- outer(x, y, f) persp(x, y, z) require(grDevices) filled.contour(x, y, z, axes = F, frame.plot = F, asp = 1, col = palet...
2010 Nov 10
3
create a pairwise coocurrence matrix
Hi all, I am trying to construct a pairwise coocurrence matrix for certain terms appearing in a number of documents. For example I have the following table with binary values showing the presence or absence of a certain term in a document: term1 term2 term3 term4 term5 doc1 1 1 0 0 1 doc2 1 1 0 1 1 doc3 1 0 0 0 1 And I want to have a matrix with the number of the pairwise coocurrencies. So, based on the above table the matrix should be: term1 term2 term3 term4 term5 term1 0 2 0 1 3 term2 2 0 0 1 2 term3 0 0 0 0 0 term4 1 1 0 0 1 term5 3...
2011 Mar 29
1
Dirichlet surface
...ichlet distributions with different parameter settings. My code is the following: #<begin code> a1 <- a2 <- a3 <- 2 #a2 <- .5 #a3 <- .5 x1 <- x2 <- seq(0.01, .99, by=.01) f <- function(x1, x2){ term1 <- gamma(a1+a2+a3)/(gamma(a1)*gamma(a2)*gamma(a3)) term2 <- x1^(a1-1)*x2^(a2-1)*(1-x1-x2)^(a3-1) term3 <- (x1 + x2 < 1) term1*term2*term3 } z <- outer(x1, x2, f) z[z<=0] <- NA persp(x1, x2, z, main = "Dirichlet Distribution", col = "lightblue", theta = 50, phi = 20,...
2017 Nov 13
2
question on nbdkit shutdown behavior
...what the client has done: if the client is currently silent with regards to issuing transmission-phase transactions, nbdkit hangs for 5 seconds, then forcibly tears down the connection: term1$ ./nbdkit -f -v -n file file=TODO ... nbdkit: debug: bound to IP address <any>:10809 (2 socket(s)) term2$ qemu-io -f raw nbd://localhost:10809/ -r qemu-io> term1$ ^C nbdkit: debug: waiting for running threads to complete nbdkit: debug: waited 5s for running threads to complete nbdkit: debug: /home/eblake/nbdkit/plugins/file/.libs/nbdkit-file-plugin.so: unload term2$ qemu-io> r 0 1 read failed:...
2007 Sep 12
1
Integrate() error message, I am at a loss
...=0,theta=0,renorm=0,rec=0){ #Pass renorm=1 to renormalize the SPA to the pdf. #There is a last argument called rec. DO NOT PASS it! alpha <- mu/sqrt((1+theta/n)) normconst <- 1 if(renorm==1 & rec==0){ term1 <- integrate(nctspa, -Inf, alpha, n=n, mu=mu, theta=theta)$value term2 <- integrate(nctspa, alpha, Inf, n=n, mu=mu, theta=theta)$value normconst <- 1/(term1+term2) } cdf <- numeric() pdf <- cdf c3 <- n^2+2*n*a^2+a^4 c2 <- (-2*mu*(a^3+n*a))/c3 c1 <- (-n^2-n*a^2-n*theta+a^2*mu^2)/c3 c0 <- (n*a*mu)/c3 q <- c1/3-(c2^2)/9 r <- 1/6*(c1*c...
2007 Aug 16
0
Help with optimization using GENOUD
...;- c(0,1,-1) X <- as.matrix(cbind(rep(1, nobs), runif(nobs), runif(nobs))) # Creating the design matrix prodterm <- (X%*%t.beta)+rnorm(nrow(X)) Y <- as.matrix(ifelse(prodterm<0, 0, 1)) # Defining the likelihood function log.like <- function(beta, Y, X) { term1 <- pnorm(X%*%beta) term2 <- 1-term1 loglik <- (sum(Y*log(term1))+sum((1-Y)*log(term2))) # Likelihood function to be maximized } stval <- c(0,0,0) opt.output <- optim(stval,log.like,Y=Y[,1], X=X[,1:3], hessian=T, method="BFGS", control=c(fnscale=-1,trace=1)) opt.output ### Now using GENOUD gives me e...
2007 Sep 12
0
Problem with integrate()
...ion(a,n,mu=0,theta=0,renorm=0,rec=0){ #Pass renorm=1 to renormalize the SPA to the pdf. #There is a last argument called rec. DO NOT PASS it! alpha <- mu/sqrt((1+theta/n)) normconst <- 1 if(renorm==1 & rec==0){ term1 <- integrate(nctspa, -Inf, alpha, n=n, mu=mu, theta=theta)$value term2 <- integrate(nctspa, alpha, Inf, n=n, mu=mu, theta=theta)$value normconst <- 1/(term1+term2) } cdf <- numeric() pdf <- cdf c3 <- n^2+2*n*a^2+a^4 c2 <- (-2*mu*(a^3+n*a))/c3 c1 <- (-n^2-n*a^2-n*theta+a^2*mu^2)/c3 c0 <- (n*a*mu)/c3 q <- c1/3-(c2^2)/9 r <- 1/6*(c1*c2-3*...
2012 Nov 05
0
slider control questions
...for your attentions. Best wishes: Daniel the code: library("tkrplot") library("relax") dirfelulet <- function (a1 = 1, a2 = 1, a3 = 1){ x1 <- x2 <- seq(0, 1, by=.01) dirf <- function(x1, x2){ term1 <- gamma(a1+a2+a3)/(gamma(a1)*gamma(a2)*gamma(a3)) term2 <- x1^(a1-1)*x2^(a2-1)*(1-x1-x2)^(a3-1) term3 <- (x1 + x2 < 1) term1 * term2 * term3 } f <- outer(x1, x2, dirf) f[f<=0] <- NA f[is.infinite(f)] <- NA persp(x1, x2, f, zlim = c(0, max(f, na.rm = TRUE)+1), main = bquote(paste("Dirichlet el...
2007 Feb 03
1
Searching the archives
Hello Is there a method of searching the archives? Please direct me to the instructions. Thanks -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://lists.centos.org/pipermail/centos/attachments/20070203/d0082d98/attachment.html>
2007 Jun 15
0
Question with nlm
...for (i in 1:length(sgm)) { Eij <- matrix(rep(0, length(sgm)^2), nrow=length(sgm), ncol=length(sgm)); Eij[i,i] <- 1.0; # trace term term1 <- -sum(diag((invQ %*% A) %*% outerM(IMatrix(totalTime-1),Eij) %*% t(A))); # very long term term2 <- (1/totalTime)*solve((t(y) %*% t(N) %*% invQ %*% y), IMatrix(dim(y)[2])); term3 <- (t(y) %*% t(N) %*% invQ %*% A) %*% outerM(IMatrix(totalTime-1),Eij) %*% (t(A) %*% invQ %*% N %*% y); gradVecs <- -1*c(gradVecs, term1+ (term2 %*% term3)); } # end for prin...
2011 Jul 28
1
Help Non-sequential ANOVAs
...5 46.41181 <.0001 morph:month 5 2.85388 0.0206 The problem is that I want the results of a non-sequential anova. I tried also the function Anova, but I get an error message: Error in !factors[, term2] : invalid argument type Is there a way to fix this problem or is it possible to specify a non-sequential anova? Thank you Ariane [[alternative HTML version deleted]]
2007 Nov 04
3
Searching different fields based on document permissions
I''m currently writing a system that stores user-created documents. Each user belongs to a specific group, and the system supports multiple groups. The thing is, my users want to be able to hide pieces of a document from other groups. So for example, lets say Joe of team A has written this document: "Hello all, our secret plan is finally complete! <private>We will begin
2013 Jun 16
3
Backend for Lucene format indexes-How to get doclength
...emo patch just support the basic features in Lucene. Compound File(.cfs/.cfe)?term vector(.tvx/.tvd/.tvf) delete document(.del) are not supported, skip list in .fdx is not supported too example/quest.cc is used to test this demo. query like this: field_name:term, or file_name:term1 AND field_name:term2 Until now, I found some data needed for BM25 in Xapian are not existed in Lucene: 1. doclength_lower_bound?doclength_upper_bound 2. wdf_lower_bound?wdf_uppper_bound 3. total_length 4. doclength(for each document) 1-3 are statistics data, can be caculated when doing copydatabase, and store them in...
2019 Sep 18
1
[nbdkit PATCH] server: Saner filter .close calls
I found a core dump: term1$ nbdkit -fv --filter=xz null xz-max-depth=$((0x4000000000000000)) term1... term2$ qemu-nbd --list term1... nbdkit: debug: null: open readonly=1 nbdkit: error: calloc: Cannot allocate memory nbdkit: debug: xz: close Segmentation fault (core dumped) (Note that the use of --run or daemonizing nbdkit makes it a bit harder to see the core dump, but it is still happening.) This hap...
2019 Jan 22
2
Re: [PATCH nbdkit v2 2/4] partition filter: Support MBR logical partitions.
...); > + return -1; ...this code, which returns the wrong error message (partition 3 is not logical, but the real problem is that there is no partition 3 in the master table, not that there is no extended partition). For example: term1$ ./nbdkit --unix nbd.sock -r -fv partitioning README README term2$ ./nbdkit -p 10810 -r -fv --filter=partition nbd socket=nbd.sock partition=3 term3$ ./qemu-nbd --list -p 10810 term2> ... nbdkit: nbd[1]: error: MBR logical partition selected, but there is no extended partition in the partition table nbdkit: nbd[1]: debug: partition: close nbdkit: nbd[1]: debug...
2005 Nov 04
2
Simplify iterative programming
Dear, I am looking for the simplification of a formula to improve the calculation speed of my program. Therefore I want to simplify the following formula: H = sum{i=0..n-1 , [ sum {j=0..m-1 , sqrt ( (Ai - Bj)^2 + (Ci - Dj)^2) } ] } where: A, C = two vectors (with numerical data) of length n B, D = two vectors (with numerical data) of length m sqrt = square root Ai = element of A with index
2009 Apr 13
4
little fighter 2 vdragonballz 3.0 mod crashes on load sprite
I was trying to run one of my kids favourite games with Wine, alas it crashes accessing a null pointer, early on while loading one of the sprite files (not corrupted). I guess the program should be doing better memory checking but since this works on Windows, maybe Wine has fed him before some broken data. Unfortunately, the terminal output doesn't seem much helpful:
2003 Oct 03
3
openoffice port build on FreeBSD 4.9
...state:R) prio=5 at java.lang.Long.parseLong(Long.java:299) at com.sun.tools.javac.v8.util.Convert.string2long(Convert.java:41) at com.sun.tools.javac.v8.parser.Parser.literal(Parser.java:280) at com.sun.tools.javac.v8.parser.Parser.term3(Parser.java:630) at com.sun.tools.javac.v8.parser.Parser.term2(Parser.java:472) at com.sun.tools.javac.v8.parser.Parser.term1(Parser.java:441) at com.sun.tools.javac.v8.parser.Parser.term(Parser.java:382) at com.sun.tools.javac.v8.parser.Parser.term(Parser.java:365) at com.sun.tools.javac.v8.parser.Parser.expression(Parser.java:355) at com.sun.tools.javac...