Displaying 20 results from an estimated 1015 matches for "mn".
Did you mean:
mfn
2004 Sep 09
1
Bug in rsync? (--delete[-after])
...28
The newer command is on the machine hox:
while read fra til;
rsync -a -H -p -x --delete --exclude quota.user --exclude quota.group \
--rsync-path=/rsync $fra/ anvil:$til
done < /rsynke
The old was the same, just with --delete-after and not --delete
The datafile /rsynke:
i# cat /rsynke
/mn/hox/geofysikk /mn/anvil/geofysikk
/mn/hox/u4 /mn/anvil/adm-u1
/mn/hox/u6 /mn/anvil/student-u2
/mn/hox/u1 /mn/anvil/ozon-u1
/mn/hox/u8 /mn/anvil/ozon-u2
/mn/hox/u11 /mn/anvil/dynmet-u3
/mn/hox/u10 /mn/anvil/ozon-u4
/mn/hox/student-u1 /mn/anvil/student-u1
/mn/ho...
2006 Nov 09
3
function
R-help,
I am trying to create a function that i pass a data set to and have the
function return some calculations based on data.
Allow me to illustrate:
myfunc <- function(lst,mn,sd){
lst <- sort(lst)
mn <- mean(lst)
sd <- sqrt(var(lst))
return(lst,mn,sd)
}
data1 <-c (1,2,3,4,5)
data2 <- c(6,7,8,9,10)
myfunc(data1,data1mn,data1sd)
myfunc(data2,data2mn,data2sd)
This snippet errors that data1mn not find and warns that return is
deprecating!!!!!!...
2006 Jun 13
1
Cramer-von Mises normality test
...es normality test generates an
extremely high probability (e.g., 1.637e+31) and indicates normality
when the other tests do not. Is there something I'm misunderstanding
or potentially a bug in the code?
Below are the results of the tests and then, below that, I've
provided that column of the datafile.
Thank you in advance for your help.
Bob Powell
> shapiro.test(Mn.Total..ug.kg)
Shapiro-Wilk normality test
data: Mn.Total..ug.kg
W = 0.5269, p-value < 2.2e-16
> shapiro.test(ln.Mn.Total..ug/kg)
Error in inherits(x, "factor") : object "ln.Mn.Total.....
2019 Oct 28
0
[PATCH v2 07/15] drm/radeon: use mmu_range_notifier_insert
...oenig at amd.com>
Cc: David (ChunMing) Zhou <David1.Zhou at amd.com>
Cc: amd-gfx at lists.freedesktop.org
Cc: Petr Cvek <petrcvekcz at gmail.com>
Signed-off-by: Jason Gunthorpe <jgg at mellanox.com>
---
drivers/gpu/drm/radeon/radeon.h | 9 +-
drivers/gpu/drm/radeon/radeon_mn.c | 219 ++++++-----------------------
2 files changed, 52 insertions(+), 176 deletions(-)
diff --git a/drivers/gpu/drm/radeon/radeon.h b/drivers/gpu/drm/radeon/radeon.h
index d59b004f669583..27959f3ace1152 100644
--- a/drivers/gpu/drm/radeon/radeon.h
+++ b/drivers/gpu/drm/radeon/radeon.h
@@ -68,6...
2019 Oct 29
0
[PATCH v2 07/15] drm/radeon: use mmu_range_notifier_insert
...ists.freedesktop.org
> Cc: Petr Cvek <petrcvekcz at gmail.com>
> Signed-off-by: Jason Gunthorpe <jgg at mellanox.com>
Reviewed-by: Christian K?nig <christian.koenig at amd.com>
> ---
> drivers/gpu/drm/radeon/radeon.h | 9 +-
> drivers/gpu/drm/radeon/radeon_mn.c | 219 ++++++-----------------------
> 2 files changed, 52 insertions(+), 176 deletions(-)
>
> diff --git a/drivers/gpu/drm/radeon/radeon.h b/drivers/gpu/drm/radeon/radeon.h
> index d59b004f669583..27959f3ace1152 100644
> --- a/drivers/gpu/drm/radeon/radeon.h
> +++ b/drivers/gp...
2006 Jun 14
1
Bug in nortest cvm.test package (PR#8980)
...ality test generates an
extremely high probability (e.g., 1.637e+31) and indicates normality
when the other tests do not. I don't believe the generated
probability should exceed a value of "1".
Below are the results of the tests and then, below that, I've
provided the column of the datafile that results in the high value.
Sincerely,
Bob Powell
Robert M. Powell
Senior Project Scientist/Project Mgr.
Horizon Environmental Corporation
Suite 1700, Fisher Building
3011 W. Grand Blvd.
Detroit, MI 48202
Tel (313) 874-0124
Fax (313) 874-0135
Cell (248) 977-0317
http://www.hor...
2005 Jul 05
1
by (tapply) and for loop differences
...t; xvar = rnorm(40, 20, 5)
> yvar = rnorm(40, 22, 2)
> num = factor(rep(1:2, each=20))
> sdat = data.frame(cbind(num, xvar, yvar))
>
> # Define a function to do a simple t test and return some values...
>
> kindtest = function(varx, vary){
+ res = t.test(varx, vary)
+ x.mn = res$estimate[1]
+ y.mn = res$estimate[2]
+ diff = y.mn-x.mn
+ pval = res$p.value
+ cat("Mean xvar =", x.mn, " Mean yvar =", y.mn)
+ cat(" diff =", diff, " p-value=", pval, "\n\n")
+ list(x.mn=x.mn, y.mn=y.mn, diff=diff, pval=pva...
2005 Mar 15
0
trellis/ panel.superpose/ passing in superscripts/ groups
...# trellis.device(postscript,
#
file="../figures/sardine.egg.T.S.space.2001.and.2002.ps",
# horizontal=FALSE,
color=TRUE)
year <- as.factor(rep(2001, dim(mn.ts.e.2001)[1]))
year.2001 <- cbind(mn.ts.e.2001,year)
year <- as.factor(rep(2002, dim(mn.ts.e.2002)[1]))
year.2002 <- cbind(mn.ts.e.2002,year)
mn.ts.e.both <- rbind(year.2001, year.2002)
#browser()
###trellis plot...
2000 Apr 24
2
paste ?
...I've made a very simple procedure to make Bland-Altman plots
and it works OK except for the inability to take a variate as argument in
annotation. I'm sure it is a very simple error, so if you have 5 seconds
please tell me.
Best wishes
Troels
bland <- function (x) #accepts two columns
{
mn <- 0.5*(x[,1]+x[,2])
diff <- x[,1]-x[,2]
plot(mn,diff,pch=16,xlab="Mean",ylab="Difference",
main = paste("Bland Altman plot",mn))
abline(h=mean(diff),lty=2)
abline(h=mean(diff)+c(2,-2)*sqrt(var(diff)))
}
Troels
look here:
http://www.wired.com/wired/archive...
2007 Jun 29
2
regexpr
Hi,
I 'd like to match each member of a list to a target string, e.g.
------------------------------
mylist=c("MN","NY","FL")
g=regexpr(mylist[1], "Those from MN:")
if (g>0)
{
"On list"
}
------------------------------
My question is:
How to add an end-of-string symbol '$' to the to-match string? so that 'M'
won't match.
Of course, "MN$...
1999 May 03
0
compilation of R-0.63.3 on alpha (PR#183)
...y on a DEC-UINX 4.0E.
I have applied the recommended config.site, which I enclose.
As can be seen from the compilation log there are linking errors...
I did a 'make check' which fails for the R binary.
>make check
=2E
=2E
=2E
Building system startup profile
make[7]: Leaving directory `/mn/vega/astro/local/src/rstat/R-0.63.3/src/l=
ibrary
/profile'
make[6]: Leaving directory `/mn/vega/astro/local/src/rstat/R-0.63.3/src/l=
ibrary
'
make[5]: Leaving directory `/mn/vega/astro/local/src/rstat/R-0.63.3/src'
make[4]: Leaving directory `/mn/vega/astro/local/src/rstat/R-0.63.3...
1999 May 03
1
problems compiling R-0.63.3 on alpha
...in the Makeconf manually
because this is needed explicitly for DEC cc.
However, there are still a few problems when linking some
of the files as you can see from the enclosed log.
Ciao,
Andreas
-------------------------------------------------------
R-0.63.3>make
make[1]: Entering directory `/mn/vega/astro/local/src/rstat/R-0.63.3/afm'
make[1]: Leaving directory `/mn/vega/astro/local/src/rstat/R-0.63.3/afm'
make[1]: Entering directory `/mn/vega/astro/local/src/rstat/R-0.63.3/demos'
make[1]: Leaving directory `/mn/vega/astro/local/src/rstat/R-0.63.3/demos'
make[1]: Entering...
2017 Sep 27
2
after hard reboot, split-brain happened, but nothing showed in gluster voluem heal info command !
...uld be shown in command ?gluster volume heal <volume-name> info?, also, no entry in .glusterfs/indices/xattrop directory, can you help to shed some lights on this issue? Thanks!
Following is some info from our env,
Checking from sn-0 cliet, nothing is shown in-split-brain!
[root at sn-0:/mnt/bricks/services/brick/netserv/ethip]
# gluster v heal services info
Brick sn-0:/mnt/bricks/services/brick/
Number of entries: 0
Brick sn-1:/mnt/bricks/services/brick/
Number of entries: 0
[root at sn-0:/mnt/bricks/services/brick/netserv/ethip]
[root at sn-0:/mnt/bricks/services/brick/netserv/eth...
2017 Jun 06
1
integrating 2 lists and a data frame in R
...;m5"))
C <- data.frame(n=c("n1","n2","n3"), m=c("m1","m1","m3"), I=c(100,300,400))
# Rebuild the factors using M and N
C$m <- factor(as.character(C$m), levels=levels(M$M))
C$n <- factor(as.character(C$n), levels=levels(N$N))
MN <- xtabs(I~m+n, C)
print(MN, zero.print="-")
# n
# m n1 n2 n3 n4
# m1 100 300 - -
# m2 - - - -
# m3 - - 400 -
# m4 - - - -
# m5 - - - -
class(MN)
# [1] "xtabs" "table"
# MN is a table. If you want a data.frame
MN <...
2012 Oct 26
1
matrix algebra for constructing a special matrix?
Dear R-users,
would it be a better way to construct the matrix below without using any for-loop or model.matrix? preferably with some matrix algebra?
Thanks in advance,
Carlo Giovanni Camarda
## dimensions
m <- 3
n <- 4
mn <- m*n
k <- m+n-1
## with a for-loop
X <- matrix(0, mn, k)
for(i in 1:n){
wr <- 1:m+(i-1)*m
wc <- rev(1:m+(i-1))
where <- cbind(wr,wc)
X[where] <- 1
}
## using model.matrix
ff <- factor(c(outer(m:1, seq(0,m), "+")))
X1 <- matrix(model.matrix(~-1+ff),...
2005 Mar 04
0
Need suggestions for finding dose response using nls
...ng a dose
response in the field? Does anyone have other ideas about how to
approach this data? I am currently doing this analysis ad hoc, but if
the results are promise I might like to do some planned experiments.
R 2.0.1
mac os 10.2
Thanks in advance for any responses
Ken
Example data...
mn is the mean of the log transformed pathogen population size
ss is the standard deviation of the log transformed pathogen population
size
dap27 is the disease 7 days after the pathogen population sizes were
estimated
dap31 is the disease 11 days after the pathogen population sizes were
estimated...
2007 Jun 19
1
Linear model predictions, differences in class
...A 17.2 28.46
2 A 91.7 143.33
3 A 93.6 148.05
4 B 95.8 150.28
5 B 54.9 89.49
6 B 51.1 82.51
7 C 53.9 88.46
8 C 40.3 63.62
9 C 38.5 64.46
>
> attach(data.in)
>
> #Calculate means by variable "location":
> data.mn<-data.frame(xm = tapply(x,location,mean), ym =
tapply(y,location,mean))
> detach(data.in)
>
> #Here are the means:
> data.mn
xm ym
A 67.50000 106.6133
B 67.26667 107.4267
C 44.23333 72.1800
>
> #Fit the model:
> mod1<-lm(ym ~ xm, data.mn)
>
> mod1
C...
2017 Sep 28
0
after hard reboot, split-brain happened, but nothing showed in gluster voluem heal info command !
...t; <volume-name> info?, also, no entry in .glusterfs/indices/xattrop
> directory, can you help to shed some lights on this issue? Thanks!
>
>
>
> Following is some info from our env,
>
> *Checking from sn-0 cliet, nothing is shown in-split-brain!*
>
> [root at sn-0:/mnt/bricks/services/brick/netserv/ethip]
> # gluster v heal services info
> Brick sn-0:/mnt/bricks/services/brick/
> Number of entries: 0
>
> Brick sn-1:/mnt/bricks/services/brick/
> Number of entries: 0
>
> [root at sn-0:/mnt/bricks/services/brick/netserv/ethip]
> [root at...
2013 Feb 09
3
Addressing Columns in a Data Frame
Dear All,
Probably a one liner, but I am banging my head against the floor.
Consider the following
DF <- data.frame(
x=1:10,
y=10:1,
z=rep(5,10),
a=11:20
)
mn<-names(DF)
but then I cannot retrieve a column by doing e.g,
DF$mn[2]
I tried to play with the quotes and so on, but so far with no avail.
Any suggestion is welcome.
Cheers
Lorenzo
2008 Apr 22
3
Using the 'by' function within a 'for' loop
...in the panel
windows(height=9, width=9, rescale='fixed')
par(mfrow=c(2,2),xpd=T, bty='l',
omi=c(0.8,0.25,1.2,0.15), mai=c(1.1,0.8,0.3,0.3))
for (k in variable) {
dat<-dato[!is.na(k),]
summ<-by(dat,dat[,c("tx","day")], function(x) {
mn<-mean(x$k)
std<-sd(x$k)
n<-length(x$k)
se<-std/sqrt(n)
lowb<-mn-se
upb<-mn+se
data.frame(tx=x$tx[1],day=x$day[1],mn=mn,std=std,lowb=lowb,upb=upb,se=se)
})
summ<-do.call("rbind",summ)
#Definining...