Displaying 20 results from an estimated 103 matches for "thresh".
Did you mean:
thrash
2005 Apr 14
0
predict.glm(..., type="response") dropping names (and a propsed (PR#7792)
...))
+ pmax((1/lambda) * eta^(1/lambda - 1), .Machine$double.eps)
valideta <- function(eta) all(eta>0)
}
else
@@ -36,7 +36,7 @@
linkfun <- function(mu) log(mu/(1 - mu))
linkinv <- function(eta) {
thresh <- -log(.Machine$double.eps)
- eta <- pmin(thresh, pmax(eta, -thresh))
+ eta <- pmin(pmax(eta, -thresh), thresh)
exp(eta)/(1 + exp(eta))
}
mu.eta <- function(eta) {
@@ -52,7 +52,7...
2006 Nov 12
2
Need help in waveslim package: imodwt and universal.thresh.modwt
Hi:
I have encountered problems with imodwt and universal.thresh.modwt and cannot find any reference in R Search. Hope someone can give me some ideas:
Starting with
modwt.la8 <- modwt(xdata, "la8", n.level=6) <-- this seems to work fine
(1) ydata <- imodwt(modwt.la8)
will always give ydata as numeric(0) (no values) instea...
2006 Aug 04
1
polychoric correlation error
...to reproduce using randomly-generated data.
What is wrong?
I realize that the data that I generated randomly is a bit strange, but it is the only way that I duplicate the error message.
> n<-100
> test.x<-rnorm(n, mean=0, sd=1)
> test.c<-test.x + rnorm(n, mean=0, sd=.5)
> thresh.x<-c(-2.5, -1, -.5, .5, 1000)
> thresh.c<-c(-1, 1, 2, 3, 1000)
>
> discrete.x<-discrete.c<-vector(length=n)
>
> for (i in 1:n) {
+ discrete.x[i]<-which.min(thresh.x < test.x[i] )
+ discrete.c[i]<-which.min(thresh.c < test.c[i] )
+ }
> pc<-polychor(di...
2012 Jun 18
3
[PATCH] Ignore unfragmented file checks in defrag when compression enabled
I noticed that btrfs fi defrag -c<method> can''t be used to compress files
unless they are fragmented. This patch corrects the problem, by informing
should_defrag_range if compression is enabled, and skipping tests for extent
and adjacent extents if it is.
Andrew Mahone (1):
btrfs: ignore unfragmented file checks in defrag when compression
enabled
fs/btrfs/ioctl.c | 10
2006 Nov 15
2
??: Re:??: Re: Need help in waveslim package: imodwt and universal.thresh.modwt
...ginal -----------
De: "Airon Yiu" aironyiu at yahoo.com.hk
Para: "rdporto1" rdporto1 at terra.com.br
C?pia: "r-help" r-help at stat.math.ethz.ch
Data: Wed, 15 Nov 2006 23:49:57 +0800 (CST)
Assunto: ??: Re:??: Re:[R] Need help in waveslim package: imodwt and universal.thresh.modwt
> Hi Rogerio:
>
> Here is what I tried. I have used only data points 1 to 1447 but the same problems appear if I used all the data in the file I sent .
>
> >library(waveslim)
> >infile <-"C:\\airon.csv"
> >ckhdat <- read.csv(infile,h...
2007 Apr 18
3
[Bridge] Re: do_IRQ: stack overflow: 872..
On Fri, 07 Jan 2005 17:05:59 +0000
David Woodhouse <dwmw2@infradead.org> wrote:
> On Sat, 2004-12-18 at 08:50 +0100, Andi Kleen wrote:
> > It's not really an oops, just a warning that stack space got quiet
> > tight.
> >
> > The problem seems to be that the br netfilter code is nesting far too
> > deeply and recursing several times. Looks like a design
2006 Nov 14
1
??: Re: Need help in waveslim package: imodwt and universal.thresh.modwt
...alho original -----------
De: "Airon Yiu" aironyiu at yahoo.com.hk
Para: "rdporto1" rdporto1 at terra.com.br
C?pia: "r-help" r-help at stat.math.ethz.ch
Data: Tue, 14 Nov 2006 13:56:51 +0800 (CST)
Assunto: ??: Re:[R] Need help in waveslim package: imodwt and universal.thresh.modwt
> Hi Rogerio:
>
> I am using Waveslim 1.5 on R 2.3.0, running on Chinese WinXP (SP2).
>
> The data, attached in the CSV file, is a stock data (0001 from Hong Kong) downloaded from Yahoo!Finance. The time series data are the Adj. Close prices (last column) from...
2013 Jul 01
1
Missing data problem and ROC curves
...es")[[1]][1]
eval(parse(text=paste("tmp <- ", ifelse(class(model$data) == "data.frame",
"model$data$", ""), field.name, sep="")))
r <- data.frame(pts = seq(0, 1-(1/steps), by=1/steps), sens = 0, spec=0);
for (i in 0:steps)
{
thresh <- i/steps;
r$sens[i] <- sum((fitted(model) >= thresh) & tmp)/sum(tmp);
r$spec[i] <- sum((fitted(model) < thresh) & !tmp)/sum(!tmp)
}
return(r)}
where model is the output of a glm.
The problem is the "sum((fitted(model) >= thresh) & tmp)"...
2010 Dec 12
0
[PATCH] Btrfs: pick the correct metadata allocation size on small devices
...uct btrfs_root *root,
struct btrfs_space_info *sinfo, u64 alloc_bytes)
{
u64 num_bytes = sinfo->total_bytes - sinfo->bytes_readonly;
+ u64 total_rw_bytes = root->fs_info->fs_devices->total_rw_bytes;
+ u64 max_chunk_size;
u64 thresh;
if (sinfo->bytes_used + sinfo->bytes_reserved +
@@ -3251,8 +3253,9 @@ static int should_alloc_chunk(struct btrfs_root *root,
alloc_bytes < div_factor(num_bytes, 8))
return 0;
+ max_chunk_size = min(256 * 1024 * 1024, div_factor(total_rw_bytes,...
2007 Apr 18
1
[Bridge] bridge at start up
...wn to 4 arguments from 6. I think we can kill
> one more.
>
> It is never the case that both indev and outdev are both
> set, so we can use some nf_hook_desc piece of state to
> indicate which (in or out) the passed device pointer is.
>
> Oh yes, we can nicely add the thresh thing in here too
> while we're at it.
>
> So the final nf_hook_desc might look something something like:
>
> struct nf_hook_desc {
> int (*okfn)(struct sk_buff *);
> int hook;
> int thresh;
> u8 pf; /* AF_MAX is 32 */
> u8 is_output;
> };
>...
2006 Nov 16
0
??: Re:??: Re:??: Re: Need help in waveslim package: imodwt and universal.thresh.modwt
...----------
De: "Airon Yiu" aironyiu at yahoo.com.hk
Para: "rdporto1" rdporto1 at terra.com.br
C?pia: "r-help" r-help at stat.math.ethz.ch
Data: Thu, 16 Nov 2006 12:28:12 +0800 (CST)
Assunto: ??: Re:??: Re:??: Re:[R] Need help in waveslim package: imodwt and universal.thresh.modwt
> Hi Rogerio:
>
> Thks a lot. It works.
>
> By the way, I have 2 related sides issues that need some help:
> (1) What I want to do is this
> - do modwt on original time series
> - do thresholding on wavelet coefficients
> - obtain the inversed...
2006 Jul 30
1
Parametric links for glm?
...parameters to be passed down to the fitting routines. So, in the
Gosset case, for example,
had the following passage in make.link, involving a free degrees of
freedom parameter nu:
}, Gosset = {
linkfun <- function(mu) qt(mu,nu)
linkinv <- function(eta) {
thresh <- -qqt(.Machine$double.eps,nu)
eta <- pmin(thresh, pmax(eta, -thresh))
pt(eta,nu)
}
mu.eta <- function(eta) pmax(dt(eta,nu), .Machine$double.eps)
valideta <- function(eta) TRUE
},
Just prior to the useR meeting, there were some chan...
1999 May 20
1
Wavethresh + accessC > Error: wd.structure has no class
Hi,
Whenever I issue this commands (as in the help for the threshold
function),
#
# Do a 1D decomposition
#
tdecomp <- wd(test.data)
#
# Threshold it
#
tdecomp.thresh <- threshold(tdecomp)
#
# Reconstruct from the thresholded coefficients
#
trecons <- wr(tde...
2012 Mar 15
0
[PATCH] Btrfs: fix deadlock during allocating chunks
...rtions(+), 0 deletions(-)
diff --git a/fs/btrfs/extent-tree.c b/fs/btrfs/extent-tree.c
index 37e0a80..3bd5410 100644
--- a/fs/btrfs/extent-tree.c
+++ b/fs/btrfs/extent-tree.c
@@ -3396,6 +3396,50 @@ static int should_alloc_chunk(struct btrfs_root *root,
return 1;
}
+static u64 get_system_chunk_thresh(struct btrfs_root *root, u64 type)
+{
+ u64 num_dev;
+
+ if (type & BTRFS_BLOCK_GROUP_RAID10 ||
+ type & BTRFS_BLOCK_GROUP_RAID0)
+ num_dev = root->fs_info->fs_devices->rw_devices;
+ else if (type & BTRFS_BLOCK_GROUP_RAID1)
+ num_dev = 2;
+ else
+ num_dev = 1; /* DUP or...
2001 Nov 25
3
Win2k Printing Problem
...copy command and a touch
command to help me w/ troubleshooting. The printer has been tested with
CUPS and does work.
I've tried using HOSTS ALLOW = and setting PRINTER ADMIN =, but they don't
help. (When I use HOSTS ALLOW, I don't but a $ on the end of the host
name, right?)
The threshloc in the conf file is a local group. I'm logged into both
computers with the same user name and the user is in threshloc. Even
though I have a PRINT$ share set up, I'm still not clear how to set up the
drives in the share and I'm not sure that would help, since I have drivers
ins...
2001 Oct 08
3
testing diff for slopes and intercepts
I fit the model
fit<-lm(thresh~cond*Ne)
where
thresh is the reponse
cond is a factor with levels a, b, and c
Ne is a continuous indep var
I think of this full model as having three lines: thresh as a function of
Ne for each condition. Thus we have slopea, slopeb, slopec, inta, intb,
intc.
lm output my params
-------------...
2006 Jan 10
3
Issue with c++ .C call
...or shared libraries
............................................................. done
Reading symbols for shared libraries . done
Reading symbols for shared libraries . done
> dyn.load('StepGram/src/Stepgram.so')
Reading symbols for shared libraries .. done
> mySG <- function(dat1,thresh,noise) {
vec <- c(thresh,noise)
.C('calcStepgram',
data=as.double(dat1),
prm=as.double(vec),
intervals=double(10000*3+1),
max=as.integer(10000),
n=as.integer(length(dat1)),
plot=double(length(dat1)))}
> dat <- c(0.01,0.1,-0.2, 0.1,-0.1,-1000,3.2,3....
2007 Apr 18
1
[Bridge] [PATCH/RFC] Reduce call chain length in netfilter (take 2)
...oesn't cut it for avoiding the function
call in fast path: gcc doesn't inline (needs value tracking?). --RR */
#ifdef CONFIG_NETFILTER_DEBUG
-#define NF_HOOK(pf, hook, skb, indev, outdev, okfn) \
- nf_hook_slow((pf), (hook), (skb), (indev), (outdev), (okfn), INT_MIN)
-#define NF_HOOK_THRESH nf_hook_slow
+#define NF_HOOK(pf, hook, skb, indev, outdev, okfn) \
+({int __ret; \
+if ((__ret=nf_hook_slow(pf, hook, &(skb), indev, outdev, okfn, INT_MIN)) == 1) \
+ __ret = (okfn)(skb); \
+__ret;})
+#define NF_HOOK_THRESH(pf, hook, skb, indev, outdev, okfn,...
2008 Jun 12
1
Problems with mars in R in the case of nonlinear functions
...require("mda")
f <- function(x,y) { x^2-y^2 };
#f <- function(x,y) { x+2*y };
# Grid
x <- seq(-1,1,length=10);
x <- outer(x*0,x,FUN="+"); y <- t(x);
X <- cbind(as.vector(x),as.vector(y));
# Data
z <- f(x,y);
fit <- mars(X,as.vector(z),nk=200,penalty=2,thresh=1e-3,degree=2);
# Plotting
par(mfrow=c(1,2),pty="s")
lims <- c(min(c(min(z),min(fit$fitted))),max(c(max(z),max(fit$fitted))))
persp(z=z,ticktype='detailed',col='lightblue',shade=.75,ltheta=50,
xlab='x',ylab='y',zlab='z',main='true'...
2009 Jan 28
1
stack data sets
...n.exams*n.items), nrow=n.exams, ncol=n.items)
Observed_Scores=matrix(rep(NA, n.exams*n.items), nrow=n.exams, ncol=n.items)
str(Observed_Scores)
for (k in 1:10)
{
#Setting the starting point for seed
set.seed(k)
#filling item parameters into beta.values
beta.values = runif(n.items,-2,2)
#Calculating Threshold
thresh.values = .5 * beta.values
#Using the function to generate the Parallel Model CTT data
GenData <- congeneric.sim(N=500, loads = rep(.5,20), err=NULL, short = FALSE)
#Storing Observed Score in a variable
Observed_Scores = GenData[[3]]
#Exporting Observed scores to output file
ObservedS...