Displaying 20 results from an estimated 103 matches for "vname".
Did you mean:
name
2007 Nov 24
2
unexpected result from reshape
Hi all.
I have unexpected reshape results on datasets with certain variable
names. Here a reproducible example:
d <- matrix(seq_len(7*7), 1, 7*7)
vnames <- c('acc','ppeGross','CF','ROA','DeltaSales','invTA','DeltaRevDeltaRec')
varying <- unlist(lapply(vnames, paste, 1:7, sep='.'))
d <- data.frame(d)
names(d) <- varying
d1 <- reshape(d, varying=varying, direction="l...
2005 Aug 31
2
R CMD check example problem (PR#8113)
...es
# An equivalent function is somewhat messier, since it must either
explicitly
# construct the y axis label, duplicating some of the work of the plot
# function:
plotit <- function( df, var, col="red", title="" )
{
dname <- deparse(substitute(df))
vname <- deparse(substitute(var))
plot( df[[vname]] ~ df$Grp, type="b", col=col, title=title,
ylab=paste( dname, "$", vname, sep='' ) )
}
# or we explicitly construct the call and then call eval. The code for
# the latter approach is # omiited since...
2002 Nov 16
1
using the function "expression" with "paste" in a plot
Hi,
I noticed that paste and expression in the following manner does not produce
the desired result.
vnames=c("pi","y","delta")
vx=vn=3
m=16
# mydata any matrix that takes for the following form
mydata=array(somedata,c(m,vn,vx))
# producing plots
for (j in 1:vx){
for (i in 1:vn)
{
plot(mydata, type="l", main=expression(paste("Effect of",
vnames[j],"...
2018 May 01
4
issue with model.frame()
...of the failure is a case where
names(mf) is not equal to the term.labels attribute of the formula -- the latter has an
extraneous newline. Here is an example that does not use the survival library.
# first create a data set with many long names
n <- 30? # number of rows for the dummy data set
vname <- vector("character", 26)
for (i in 1:26) vname[i] <- paste(rep(letters[1:i],2), collapse='')? # long variable names
tdata <- data.frame(y=1:n, matrix(runif(n*26), nrow=n))
names(tdata) <- c('y', vname)
# Use it in a formula
myform <- paste("y ~ cbin...
2013 Sep 05
12
[PATCH 0/5] Memory leaks amended
Memory leaks found by the tool--valgrind along with static reviewing.
Based on Daivd''s branch ''integration-20130903''.
Gui Hecheng (5):
btrfs-progs:free local variable buf upon unsuccessful returns
btrfs-progs:local variable memory freed
btrfs-progs: missing tree-freeing statements added
btrfs-progs:free the local list pending_list in btrfs_scan_one_dir
2012 Dec 11
1
Rprof causing R to crash
...f(f==100)
return((max(pred.vect)-tiff.entry)/(max(pred.vect)-min(pred.vect))*100)
else return(NA)
}
train.dat <- data.frame(a=runif(200),b=runif(200),c=runif(200),d=runif(200))
temp <-
data.frame(a=runif(130000),b=runif(130000),c=runif(130000),d=runif(130000))
pred.rng<-temp
vnames.final.mod <- names(train.dat)
nvars.final <- length(vnames.final.mod)
start.time<-Sys.time()
for(k in 1:nvars.final){
pred.range<-train.dat[,match(vnames.final.mod[k],names(train.dat))]
pred.rng[,k]<-mapply(CalcMESS,tiff....
2010 Jul 12
1
Matrix Column Names
Hi,
Is there a way to create a matrix in which the column names are not
checked to see if they are valid variable names?
I'm looking something similar to the check.names argument to
data.frame. If so, would such an approach work for the sparse matrix
classes in the Matrix package.
Many thanks!
Cheers,
Dave
2012 Mar 06
3
bug uni_utf8_str_is_valid(vname)
...x with weird filenames in home directory of username. We are using mbox IMAP folders, with no special changes (mail_location = mbox:~/:INBOX=%h/.mailbox).
Mar 6 13:37:17 machine dovecot: imap(username): Panic: file mail-storage.c: line 628 (mailbox_alloc): assertion failed: (uni_utf8_str_is_valid(vname))
Mar 6 13:37:17 machine dovecot: imap(username): Error: Raw backtrace: /opt/dovecot-2.1.1/lib/dovecot/libdovecot.so.0 [0x2ba41cb79450] -> /opt/dovecot-2.1.1/lib/dovecot/libdovecot.so.0 [0x2ba41cb794a6] -> /opt/dovecot-2.1.1/lib/dovecot/libdovecot.so.0 [0x2ba41cb78963] -> /opt/dovecot-2.1...
2003 Apr 03
1
Tukey's one degree of freedom for nonadditivity?
Is there code available to decompose interactions involving at least
one nominal factor with more than 2 levels as described, e.g., by Tukey
or by Mandel (1971, Technometrics, 13: 1-18)?
Tukey's model:
E(y[i,j]) = mu0 + a[i] + b[j] + c*a[i]*b[j],
estimating a, b, and c so sum(a) = sum(b)= 0. Mandel essentially
describes a singular value decomposition of the interaction.
Thanks,
2003 May 21
1
Code Help
...R code to do this with but
there seem to be errors in the code. My level of knowledge is improving but
still limited.
The details are;
Data on clover lines; Lines.txt attached. Comma seperations
Code:
options(digits=3)
clover <- read.table("Lines.txt",header=T,sep=",")
vnames <- names(clover);nv <- length(vnames)
flevels <- levels(clover$Line)
par(oma=c(0,6,4,6),mfrow=c(2,1),mar=c(4,4,1,0))
clover$Y <- clover[,"LeafLmm"]
mn.tab <- tapply(clover$Y,list(clover$Line),mean)
sd.tab <- sqrt(tapply(clover$Y,list(clover$Line),var))
om <- order...
2002 May 17
0
options()$warn==2 and try()
...h has warn=0 and show.error.messages=TRUE by default, and here
is what happens (question after R session):
################################# Start R session:
> library(survival)
> ## Here are 2 calls with different pairs of variables, both of which
yield warnings:
> qq <-
FitModels(vnames=c("acd11apcd3p","drpcd8p"),dframe="ALLmth12",survname="fail
tm12", censname="failcens")
Warning message:
Loglik converged before variable 2 ; beta may be infinite. in: fitter(X,
Y, strats, offset, init, control, weights = weights,
> ## war...
2013 Jun 18
2
Crashes at login time with freshest code
...eeps crashing at login time. Things were fine on 2.2.2
Fatal: master: service(imap): child 5014 killed with signal 11
Here is the trace:
Core was generated by `imap'.
Program terminated with signal 11, Segmentation fault.
#0 0x00000000105cdfdf in mailbox_list_get_storage (list=0x7fffffffe310,
vname=0x10a04ab0 "INBOX/spam", storage_r=0x7fffffffe308)
at mailbox-list.c:811
811 if (set != NULL && set->driver[0] != '\0') {
(gdb) bt full
#0 0x00000000105cdfdf in mailbox_list_get_storage (list=0x7fffffffe310,
vname=0x10a04ab0 "INBOX/spam", stor...
2014 Apr 17
2
segfault with shared namespace version > 2.1.16
...got core dumps from it. I assume the gdb examples give a reverse
trace of the calls. If more is needed, I can supply.
Core was generated by `/private/dovecot/libexec/dovecot/imap -u tom2'.
Program terminated with signal 11, Segmentation fault.
#0 mailbox_settings_find (user=0x6866c0,
vname=0x670800 "sharedimap/support-reports") at mail-storage.c:624
624 {
Missing separate debuginfos, use: debuginfo-install
glibc-2.12-1.132.el6.x86_64 sssd-client-1.9.2-129.el6.x86_64
(gdb) bt full
#0 mailbox_settings_find (user=0x6866c0,
vname=0x670800 "sharedimap/support-reports...
2019 Apr 10
2
[BUG?] Double quota calulation when special folder is present
...e/list/mailbox-list-index-iter.c
index c9afc7a..49cd941 100644
--- a/src/lib-storage/list/mailbox-list-index-iter.c
+++ b/src/lib-storage/list/mailbox-list-index-iter.c
@@ -90,13 +90,18 @@ mailbox_list_index_update_info(struct
mailbox_list_index_iterate_context *ctx)
if (strcmp(ctx->info.vname, "INBOX") != 0) {
/* non-INBOX */
ctx->info.vname = p_strdup(ctx->info_pool, ctx->info.vname);
- } else {
+ } else if (!ctx->prefix_inbox_list) {
/* listing INBOX itself */
ctx->info.vname = "I...
2018 May 01
0
issue with model.frame()
...a case where names(mf) is not equal to the term.labels attribute of the formula -- the latter has an extraneous newline. Here is an example that does not use the survival library.
>
> # first create a data set with many long names
> n <- 30 # number of rows for the dummy data set
> vname <- vector("character", 26)
> for (i in 1:26) vname[i] <- paste(rep(letters[1:i],2), collapse='') # long variable names
>
> tdata <- data.frame(y=1:n, matrix(runif(n*26), nrow=n))
> names(tdata) <- c('y', vname)
>
> # Use it in a formula
>...
2018 May 01
1
[EXTERNAL] Re: issue with model.frame()
...mes(mf) is not equal to the term.labels attribute of the formula -- the latter has an extraneous newline. Here is an example that does not use the survival library.
>>
>> # first create a data set with many long names
>> n <- 30 # number of rows for the dummy data set
>> vname <- vector("character", 26)
>> for (i in 1:26) vname[i] <- paste(rep(letters[1:i],2), collapse='') # long variable names
>>
>> tdata <- data.frame(y=1:n, matrix(runif(n*26), nrow=n))
>> names(tdata) <- c('y', vname)
>>
>> # U...
2007 Nov 16
1
3.0.27a out monday.
Just spoke to Jerry, we'll be doing
a 3.0.27a on Monday to fix a regression
that broke smbfs mounts from Linux.
Sorry for the problem.
Jeremy.
2009 Jun 25
2
variable driven summary of one column
Hello,
how can I get a variable driven summary of one column of my data.frame?
Usually I would do
> summary(data$columnname) to get a summary of column named
"columnname" of my data.frame named "data".
In my case the columnname is not static but can be set dynamically.
So I save the chosen columname in something like
variable <- "columnname"
but how can I
2007 Dec 13
1
creating lagged variables
...3 1 3 1.55870831
4 2 1 0.07050839
5 2 2 0.12928774
6 2 3 1.71506499
I want to compute the lagged variable 'value(t-1)', taking subject id
into account.
My current effort produced the following:
##
my_lag <- function(dt, varname, timevarname='time', lag=1) {
vname <- paste(varname, if(lag>0) '.' else '', lag, sep='')
timevar <- dt[[timevarname]]
dt[[vname]] <- dt[[varname]][match(timevar, timevar + lag)]
dt
}
lag_by <- function(dt, idvarname='id', ...)
do.call(rbind, by(dt, dt[[idvarname]], my_lag, ...))
##...
2016 Apr 12
2
fts-lucene with virtual folders
Hi,
It looks like I've found something strange. It looks like dovecot
updates fts-lucene index every time I'm opening virtual folder that
contains FTS query:
indexer-worker(dion): Warning: fts-lucene: Settings have changed, rebuilding index for mailbox
dovecot-virtual is pretty simple:
archive/INBOX
BODY "test"
first of all, I'm trying to perform FTS in archive/INBOX