Displaying 20 results from an estimated 86 matches for "ngroup".
Did you mean:
group
2007 Jun 12
0
distribution graph
...niversity Hospital
N-5021 Bergen
tlf +47 55 97 55 39 (a)
faks +47 55 97 60 88 (a)
email tore.wentzel-larsen at helse-bergen.no
Documentation:
distribution.graph
Description
distribution.graph produces a distribution graph of the data values.
Usage
distribution.graph(xx, grouping=FALSE,
ngroups=10, xplace=c(0,1,.5), halfband=.25,
xlab='', ylab='', pch=16,
lines=FALSE, lty='solid')
Arguments
xx numeric, a vector of values for which to produce the
distribution graph. Missing values are allowed, and are
disregarded.
grouping logical, if FALSE (the defaul...
2011 Aug 20
1
Groups and bwplot
...ction. Unfortunately, I seem to have some issues
passing the correct arguments to the panel function, and would greatly
appreciate any suggestions to solve these issues:
require(lattice)
mybwplot <- function(x,y,data,groups){
if (missing(groups)||is.null(groups)) {
groups <- NULL
ngroups <- 1
} else {
data[[groups]] <- as.factor(data[[groups]])
ngroups <- nlevels(data[[groups]])
}
mywidth <- 1/(ngroups+1)
mypanel <- function(x,y,groups,...){
if (missing(groups)||is.null(groups)) {
panel.bwplot(x,y,...)
} else {
panel.superpose(x,...
2004 Feb 20
1
NGROUPS_MAX on Linux
Linux has just raised the NGROUPS_MAX limit from 32 to 64k. In doing an
audit of various tools, openssh turned up as having incorrect groups
handling. Almost no user-space apps really care about NGROUPS_MAX.
A proposed patch (untested, since the CVS build won't compile on my RH box..
:-/) :
What think?
Index: uidswap.c
=...
2007 Sep 28
2
plot graph with error bars trouble
Hi,
I have a data set like this:
Mutant Rep Time OD
02H02 1 0 0.029
02H02 2 0 0.029
02H02 3 0 0.023
02H02 1 8 0.655
02H02 2 8 0.615
02H02 3 8 0.557
02H02 1 12 1.776
02H02 2 12 1.859
02H02 3 12 1.668
02H02 1 16 3.379
02H02 2 16 3.726
02H02 3 16 3.367
306 1 0 0.033
306 2
2024 Sep 11
2
[Bug 3735] New: The ngroups variable may be set to a negative value when calling sysconf(_SC_NGROUPS_MAX)
https://bugzilla.mindrot.org/show_bug.cgi?id=3735
Bug ID: 3735
Summary: The ngroups variable may be set to a negative value
when calling sysconf(_SC_NGROUPS_MAX)
Product: Portable OpenSSH
Version: 9.8p1
Hardware: Other
OS: All
Status: NEW
Severity: normal
Priority: P5
Comp...
2004 Feb 20
24
[Bug 787] Minor security problem due to use of deprecated NGROUPS_MAX in uidswap.c (sshd)
http://bugzilla.mindrot.org/show_bug.cgi?id=787
------- Additional Comments From openssh_bugzilla at hockin.org 2004-02-20 13:01 -------
Created an attachment (id=548)
--> (http://bugzilla.mindrot.org/attachment.cgi?id=548&action=view)
NGROUPS patch
------- You are receiving this mail because: -------
You are the assignee for the bug, or are watching the assignee.
1997 Aug 19
2
R-alpha: A few bugs in R-0.50-a3.
A few problems in R-0.50-a3 (which were also in R-0.49):
1)
y <- c(10,11,12,13,14,NA,NA)
n <- length(y)
missed <- (1:n)[is.na(y)]
notmissed <- (1:n)[!is.na(y)]
blocks <- cut(missed,breaks=c(0,notmissed,n+1))
a <- function(v) {
q <- range(v)
c(q[1]-1,q[2]+1)
}
brackets <- tapply(missed,blocks,a)
This codes gives the following in S:
> brackets
$"0+ thru 1":
2007 Sep 13
1
Collapsing data frame; aggregate() or better function?
...is considerably larger.
> dim(lf1.turbot)
[1] 16468 217
> test <- aggregate(lf1.turbot[,c(11, 12, 17:217)], lf1.turbot[,1:8],
sum)
Error in vector("list", prod(extent)) : vector size specified is too
large
In addition: Warning messages:
1: NAs produced by integer overflow in: ngroup * (as.integer(index) -
one)
2: NAs produced by integer overflow in: group + ngroup *
(as.integer(index) - one)
3: NAs produced by integer overflow in: ngroup * nlevels(index)
I'm guessing that either aggregate() can't handle a data frame of this
size OR that there is an issue with '...
2006 May 04
2
xmalloc(foo*bar) -> xcalloc(foo, bar) for Portable
...================
RCS file: /usr/local/src/security/openssh/cvs/openssh_cvs/groupaccess.c,v
retrieving revision 1.10
diff -u -p -r1.10 groupaccess.c
--- groupaccess.c 26 Mar 2006 03:24:49 -0000 1.10
+++ groupaccess.c 4 May 2006 01:56:11 -0000
@@ -52,8 +52,8 @@ ga_init(const char *user, gid_t base)
ngroups = MAX(NGROUPS_MAX, sysconf(_SC_NGROUPS_MAX));
#endif
- groups_bygid = xmalloc(ngroups * sizeof(*groups_bygid));
- groups_byname = xmalloc(ngroups * sizeof(*groups_byname));
+ groups_bygid = xcalloc(ngroups, sizeof(*groups_bygid));
+ groups_byname = xcalloc(ngroups, sizeof(*groups_byname));...
2004 May 04
2
Superposing data on boxplot
...would like to superpose on each boxplot the actual data
points which it represents, i.e. do something conceptually
(though not in real R) expressed as
points(Y~Z)
or
points(Z,Y)
It can be done "with bare hands" along the lines of
B<-boxplot(Y~Z)
x<-bxp(B)
X<-rep(x,ngroups)
points(X,Y)
where ngroups is the number of data at each level of Z,
*provided* the data are pre-sorted by level of Z and in the
same order as these levels occurr in the boxplot. But of course
they're not!
OK, I could do this by hand as well, but now it's getting a bit
tedious, and I...
2007 May 17
3
can't browser a samba server from a specific pc in the network
hello everyone,
i'm not even sure there is something wrong with samba here but im taking all
chances...
i have a linux samba server and 3 winXP prof pcs in my setup.
now from one of the winxp boxes i can not seem to access my shares on the
server. that is when i try to go through network neighborhood path.
the message that is returned is : \\stargaze is not accessible. You may not
have
2008 Apr 15
1
by inconsistently strips class - with fix
...null(FUN))
match.fun(FUN)
if (!is.list(INDEX))
INDEX <- list(INDEX)
nI <- length(INDEX)
namelist <- vector("list", nI)
names(namelist) <- names(INDEX)
extent <- integer(nI)
nx <- length(X)
one <- 1L
group <- rep.int(one, nx)
ngroup <- one
for (i in seq.int(INDEX)) {
index <- as.factor(INDEX[[i]])
if (length(index) != nx)
stop("arguments must have same length")
namelist[[i]] <- levels(index)
extent[i] <- nlevels(index)
group <- group + ngroup * (as.integ...
2007 Mar 29
3
tune2fs -l stale info
Hello,
I just noticed that 'tune2fs -l' did not returned a "lively" updated
information regarding the free inodes count (looks like it's always
correct after unmounting). It became suprising after an online resizing
operation, where the total inode count was immediatly updated (grown in
my case) but the free inode count was the same: one could deduce that
suddenly a lot of
2005 Jul 04
1
A faster way to aggregate?
...cases in the real
data set).
Any suggestions to speed this up? Yes, I could wait for the result in real
life, but just curious if I did something wrong. In real life, data set is
ordered by groups, but how can I use this with a data frame?
Dieter Menne
# Generate test data
ncol = 20
nrow = 20000
ngroup=nrow %/% 20
colrow=ncol*nrow
group = factor(floor(runif(nrow)*ngroup))
sc = data.frame(group,matrix(ifelse(runif(colrow) >
0.1,runif(colrow)>0.3,NA),
nrow=nrow))
# aggregate
system.time ({
s = aggregate(sc[2:(ncol+1)],list(group = group),
function(x) {
xt=table(x)
as....
2010 Nov 10
3
Occasional fchown errors?
Hi:
I get the occasional error below. Is there something I don't have
configured correctly? Or should I just ignore this? It is not always
this file, sometimes it is the cache.lock file or the log.newlock file.
I have a mail client running on my computer and my phone at the same
time, could that have something to do with it?
Nov 10 08:32:59 rabbitbrush dovecot: IMAP(bob):
2001 Mar 13
5
is this null block OK?
...<linux/intermezzo_upcall.h>
#include <linux/intermezzo_psdev.h>
#include <linux/intermezzo_kml.h>
int presto_rewrite_close(struct rec_info *rec,
struct presto_file_set *fset,
char *path, __u32 pathlen,
int ngroups, __u32 *groups,
__u64 ino, __u32 generation,
struct presto_version *new_file_ver);
static int presto_log(struct presto_file_set *fset, struct rec_info *rec,
const char *buf, size_t size,
const char *p...
2010 Mar 22
0
using lmer weights argument to represent heteroskedasticity
...ation?
Thanks for any advice.
J.R.
###############################################################################
## EXAMPLE: generate balanced nested data with heteroskedastic errors of
## variance 0.5, 1, 2, or 4
###############################################################################
ngroup <- 50
npergroup <- 20
n <- ngroup*npergroup
set.seed(5046)
d <- data.frame(unitid = 1:n, groupid = rep(1:ngroup,
each=npergroup), verror = sample(c(0.5, 1, 2, 4), size=n, replace=T),
x = 0.1*rnorm(n))
groupeffx <- data.frame(groupid = 1:ngroup, theta = rnorm(ngroup, sd =...
2002 May 15
0
Reading multi-line FWF data
...; ", x[i]), collapse = "")
b
}
FILE <- tempfile("Rfwf.")
on.exit(unlink(FILE))
raw <- scan(file, what = "", sep = "\n", quote = "", quiet = TRUE,
n = n, skip = skip, blank.lines.skip = blank.lines.skip)
ngroups <- length(raw)%/%rows
cat("Rows per group:", rows, "\n")
cat("Number of total rows:", length(raw), "\n")
cat("Number of groups:", ngroups, "\n")
if (ngroups < length(raw)/rows)
stop("Incomplete multi-li...
2017 Jul 10
1
Help documentation of "The Studentized range Distribution"
Well, it is clear enough that the problem is in interpreting the documentation. However, when you claim you tested something, and found it inconsistent with tables, it would be advisable to back it up with examples!
The description in the help files and in the sources is admittedly confusing. The original paper has this, rather more clear, description in the abstract:
"We consider the
2001 Nov 29
0
a patch to tapply (PR#1186)
...(!is.null(FUN))
match.fun(FUN)
if (!is.list(INDEX))
INDEX <- list(INDEX)
nI <- length(INDEX)
namelist <- vector("list", nI)
names(namelist) <- names(INDEX)
extent <- integer(nI)
nx <- length(X)
one <- as.integer(1)
group <- rep(one, nx)
ngroup <- one
for (i in seq(INDEX)) {
index <- as.factor(INDEX[[i]])
if (length(index) != nx)
stop("arguments must have same length")
namelist[[i]] <- levels(index)
extent[i] <- nlevels(index)
group <- group + ngroup * (as.integer(index) - one)
ngr...