search for: unnorm

Displaying 20 results from an estimated 30 matches for "unnorm".

Did you mean: unorm
2013 Mar 01
2
using reserved words in R, and reuse variable names in different functions
Hi list, I am writing several functions and running out variable names. I am using words such as "t", "c", "matrix" to keep the notation same as formulas I am using. For example I have, unnormalized <- function(t, x, y){ val <- rnorm(t, mean=x, var=y) return(val) } metropolis <- function(t, c, x, y){ den1 <- unnormalized(t, mean=x, sd=y) den2 <- unnormalized(c, mean=x, sd=y) if(den1 < den2) return(a) else return(b) } for(i in 1: 1...
2010 Feb 05
3
[LLVMdev] Exception Table Padding Change
...FDEs and the GCC_except_table* labels are now different. It looks like your goal is to keep the 32-bit pointers in the call-site table 4-byte aligned. Here is another solution, instead of having two labels at the start of the LSDA (with pad bytes between them), have no pad bytes and instead use an unnormalized uleb128 for the call-site table length. By unnormalized, I mean one with leading zeros. For instance, instead of: .section __DATA,__gcc_except_tab .align 2 GCC_except_table1: .byte 0x0 .byte 0x0 .byte 0x0 Lexception1: .byte 0xFF .byte 0x0 .byte 0x26 .byte 0x3 .byte 0x1A .set Lset1...
2009 Dec 17
1
poly() with unnormalized values
How can I get the result of, e.g., poly(1:3. degree=2) to give me the unnormalized integer coefficients usually used to explain orthogonal polynomial contrasts, e.g, -1 1 0 -2 1 1 As I understand things, the columns of x^{1:degree} are first centered and then are normalized by 1/sqrt(col sum of squares), but I can't see how to relate this to what is returned...
2010 Feb 06
0
[LLVMdev] Exception Table Padding Change
Hi Bill, > It looks like your goal is to keep the 32-bit pointers in the call-site table 4-byte aligned. Here is another solution, instead of having two labels at the start of the LSDA (with pad bytes between them), have no pad bytes and instead use an unnormalized uleb128 for the call-site table length. By unnormalized, I mean one with leading zeros. For instance, instead of: this sounds like a good idea to me. Ciao, Duncan.
2010 Mar 19
1
Howto get unnormalized eigenvectors?
Hi, I try to calculate the angle between two first eigenvectors of different covariance matrices of biological phenotypic traits for different populations. My issue here is, that all possibilities to do so seem to normalize the eigenvectors to length 1. Although the helpfile of eigen() states, that using eigen(, symmetric = FALSE, EISPACK =TRUE) skips normalization this is (I guess) not applicable
2003 Apr 16
2
trying to plot function using curve
...y <- function(x,theta,pos,len) { if((len !=2) && (len !=3)) stop("length must be 2 or 3") if((pos < 1) || (pos > len)) stop("pos must be between 0 and len-1") if(len==2) { if((pos==1) || (pos==2) ) { unnorm <- function(x) { ifelse(x==0,2*theta,(exp(theta*x)-exp(-theta*x))/x) } return(unnorm(x)/ integrate(unnorm,lower = -theta, upper = theta, subdivisions=1000)$value) } } if(...
2010 Feb 06
1
[LLVMdev] Exception Table Padding Change
>> It looks like your goal is to keep the 32-bit pointers in the call-site table 4-byte aligned. Here is another solution, instead of having two labels at the start of the LSDA (with pad bytes between them), have no pad bytes and instead use an unnormalized uleb128 for the call-site table length. By unnormalized, I mean one with leading zeros. For instance, instead of: > > this sounds like a good idea to me. Looks ok for me, but please postpone the patch until stuff pr5004 would land (it only requires testing on darwin), so we won't ne...
2010 Feb 06
2
[LLVMdev] Exception Table Padding Change
...:00 PM, Duncan Sands wrote: > Hi Bill, > >> It looks like your goal is to keep the 32-bit pointers in the call-site table 4-byte aligned. Here is another solution, instead of having two labels at the start of the LSDA (with pad bytes between them), have no pad bytes and instead use an unnormalized uleb128 for the call-site table length. By unnormalized, I mean one with leading zeros. For instance, instead of: > > this sounds like a good idea to me. > Great! Thanks, Duncan. :-) -bw
2006 Jan 24
3
R-help Digest, Vol 35, Issue 24
...you kept that opinion too yourself. There are plenty of other reasons besides laziness or carelessness that people will consistently error in language use, such as learning disorders, head injuries, and/or vertigo. On the contrary, I am aware of the definition of a periodogram, and I know what the unnormalized periodogram in the data I presented looks like. Spec.pgram() is actually normalized too something, because it's discrete integral is not well above the SS amplitude of the signal it computed the periodogram for. In other words, the powers are not in units of around 4,000, which the peak w...
2009 Sep 06
2
question about ... passed to two different functions
...eta <- beta0 + beta1 * x1 + beta2 * x2 + beta3 * x3 p <- 1 / (1 + exp(- eta)) y <- as.numeric(runif(n) < p) out <- glm(y ~ x1 + x2 + x3, family = binomial()) summary(out) ### now we want to do a Bayesian analysis of the model, so we write ### a function that evaluates the log unnormalized density of the ### Markov chain we want to run (log likelihood + log prior) ludfun <- function(beta) { stopifnot(is.numeric(beta)) stopifnot(length(beta) == ncol(modmat)) eta <- as.numeric(modmat %*% beta) logp <- ifelse(eta < 0, eta - log1p(exp(eta)), - log...
2006 Aug 28
2
Help with Functions
...o it. A description of the functions is: prestd preprocesses the network training set by normalizing the inputs and targets so that they have means of zero and standard deviations of 1. poststd postprocesses the network training set which was preprocessed by prestd. It converts the data back into unnormalized units. prepca preprocesses the network input training set by applying a principal component analysis. This analysis transforms the input data so that the elements of the input vector set will be uncorrelated. In addition, the size of the input vectors may be reduced by retaining only those c...
2010 Feb 06
0
[LLVMdev] Exception Table Padding Change
...nds wrote: > >> Hi Bill, >> >>> It looks like your goal is to keep the 32-bit pointers in the call-site table 4-byte aligned. Here is another solution, instead of having two labels at the start of the LSDA (with pad bytes between them), have no pad bytes and instead use an unnormalized uleb128 for the call-site table length. By unnormalized, I mean one with leading zeros. For instance, instead of: >> >> this sounds like a good idea to me. >> > Great! Thanks, Duncan. :-) > > -bw > > > > ____________________________________________...
2008 Oct 26
1
Mallows' distance or Earth Mover's distance in R?
Hi I am looking for an implementation (or alternative to) Mallow's distance or the Earth Mover's distance to compare distributions or unnormalized distributions (signatures). Is there an implementation in R or can somebody recommend an alternative? Thanks Rainer -- Rainer M. Krug, PhD (Conservation Ecology, SUN), MSc (Conservation Biology, UCT), Dipl. Phys. (Germany) Centre of Excellence for Invasion Biology Faculty of Science Na...
2004 Oct 18
1
samba causing high load
...ce smb stop) the root-smb process still hangs and when I kill it (kill -9) the load goes back to normal (0.20). Then starting samba again and all is fine - for a couple of days. Any suggestion to what I can check for? I have tried checking the open files, network traffic (pr IP too) but nothing unnormal shows up. We're running samba-3.0.7-2.FC1 Vegard
2012 Jul 12
1
using glmnet for the dataset with numerical and categorical
Dear R users, if all my numerical variables in my datasets having the same units, may I leave them unnormalized, just do cv.glmnet directly(cv.glmnet(data,standardize=FALSE))? i know normally if there is a mixture of numerical and categorical , one has to standardize the numerical part before applying cv.glmnet with standardize=fase, but that's due to the different units in the numerical part, rig...
2012 Apr 01
2
Project: QueryParser Reimplementation, to Olly Betts and Dan Colish
...than a preset value, it is more likely to be a mis-spelling word. Thus, we search for the potential correctly spelling words. We can first employ k-gram indexes to further limit the set of vocabulary terms, then compute the edit distance of strings. 2) deal with synonyms. This can be done by index unnormalized tokens and maintain a query expansion list of multiple vocabulary entries to consider for a certain query term. A query term is then effectively a disjunction of several postings list. Also, an alternative is to do the expansion during index construction. 3) deal with stop words. In modern se...
2009 Oct 27
2
Debugging system load - How to start?
Hi, we run an "old" mailserver system which was set up a couple of years ago. The systme dose "everything" what we need(ed). Over the last days I noticed an unnormal increase of the system load up to 10 and lots of users told me that there mailclient connections (sending and receiving) are dropped from time to time. I was planing to exchange the server respectively distribut the services in the near future anyway, but I'm interessted in what causes the l...
2004 May 06
5
Orthogonal Polynomial Regression Parameter Estimation
Dear all, Can any one tell me how can i perform Orthogonal Polynomial Regression parameter estimation in R? -------------------------------------------- Here is an "Orthogonal Polynomial" Regression problem collected from Draper, Smith(1981), page 269. Note that only value of alpha0 (intercept term) and signs of each estimate match with the result obtained from coef(orth.fit). What
2014 May 21
2
Some questions about Letor project
...letor.cc under bin/ confuses me) 3. Since RankList will be removed, according to the meeting last week, its related information will be stored under MSet::Internal. My plan is to create new class under MSet::Internal. That class will have two kinds of feature vectors: normalized one and unnormalized one. Since it?s in MSet::Internal, there is a wrapper class outside it I think. So it also needs to provide corresponding APIs in that wrapper class. Also, the ranker will use MSet instead of RankList. Do you have any suggestions for this part? 4. For FeatureVector, I think it...
2005 Aug 05
1
lda discriminant functions
Hi list, I'm looking about lda function. I'd like to know how calcolate the value of the discriminant functions for the original datas. I see that in the result object "lda" there is $scaling a matrix which transforms observations to discriminant functions, normalized so that within groups covariance matrix is spherical. I'd like to have the value of the discriminant