search for: rowlabel

Displaying 20 results from an estimated 20 matches for "rowlabel".

2009 Apr 08
1
Sweave problem, with multicolumn tables from R to LaTeX
...\section{Producing the \LaTeX\ table} \subsection{Showing a simple output table, but not being the aimed one} The following syntax produce Table \ref{tab:coefAllmod1}, which is not what I want. <<label=tab1>>= l <- latex(tab.coef.allmodels, file="tab.coefAllmod1.tex", rowlabel="Model for", first.hline.double=FALSE, rowlabel.just="l", caption="MLR and LME parameter estimates by stand variables", caption.loc="top", label="tab:coefAllmod1",where="!h") @ \input{tab.coefAllmod1} \subsection{Wh...
2013 Mar 15
2
latex(test, collabel=) returns wrong latex code?
...further below. I'm confused by this, because it looks like it's creating two bits of text for each instance of \multicolumn. Is that really allowed in \multicolumn? Could someone clarify? Thank you! Yours, SJK library(Hmisc) test<-as.table(matrix(c(50,50,50,50), ncol=2)) latex(test, rowlabel='Gender',collabel='Vote', file='') % latex.default(test, rowlabel = "Gender", collabel = "vote", file = "") % \begin{table}[!tbp] \begin{center} \begin{tabular}{lrr} \hline\hline \multicolumn{1}{l}{Gender}&\multicolumn{1}{vote}{A}&\mul...
2011 Jan 11
1
Problems producing quantreg-Tables
Hi Folks, I've got a question regarding the 'quantreg' package maintained by Roger Koenker: I tried to produce LaTeX tables using the longtable and dcolumn options as decribed in the manual, but the function latex() doesn't seem to react on _any_ other options than 'digits' and 'transpose'. To reproduce these results the following minimal example may be used:
2012 May 02
1
Hmisc's latex: na.blank and grouping not working as expected
..."gr2.sgr2") rn <- apply(expand.grid(beta=c(0.25, 0.75), n=c(100, 500), d=c(10, 100))[, 3:1], 2, rmNames) x <- cbind(rn, x) # append columns containing the row labels x[2,5] <- NA stopifnot(is.na(x[2,5])) require(Hmisc) latex(x, file="", na.blank=TRUE, rowlabel=c("d", "n", "beta"), booktabs=TRUE) In the end, I would like to have the columns displayed in groups like this: Group 1 Group 2 d n beta Sub-group 1 Sub-group 2 Sub-group 1 Sub-group 2 10 100 0.25 1...
2006 Oct 28
1
(kein Betreff)
...nt to latex.default in the Hmisc package I must admit that I can't find it in the function head, which reads on my installation: function (object, title = first.word(deparse(substitute(object))), file = paste(title, ".tex", sep = ""), append = FALSE, label = title, rowlabel = title, rowlabel.just = "l", cgroup = NULL, n.cgroup = NULL, rgroup = NULL, n.rgroup = NULL, cgroupTexCmd = "bfseries", rgroupTexCmd = "bfseries", rownamesTexCmd = NULL, colnamesTexCmd = NULL, cellTexCmds = NULL, rowname, cgroup.just = rep("c", l...
2003 Jun 13
1
problem with latex of object summary reverse
...--------+-----------------+-----------------+-----------------+ |Sepal.Length|4.800/5.000/5.200|5.600/5.900/6.300|6.225/6.500/6.900| +------------+-----------------+-----------------+-----------------+ > system("cat a.tex") % latex.default(cstats, title = title, caption = caption, rowlabel = rowlabel, col.just = col.just, numeric.dollar = FALSE, insert.bottom = legend, rowname = lab, dcolumn = dcolumn, extracolheads = extracolheads, extracolsize = Nsize, ...) % \begin{table}[!tbp] \begin{center} \caption{Descriptive Statistics by Species\label{a}} \begin{tabular}{lccc}...
2006 Apr 05
2
using latex() in R for Unix
I am using R for Unix and want to make some LaTeX tables. I have already played around in R for Windows and have succeeded in making tables that I want using the following code: latex(Estimates, file='out.tex', rowlabel='',digits=3) However, when I use this code in Unix, I can never find the file "out.tex". I assumed that R would send the file to whatever directory I was working in, but that does not seem to be the case. So, I tried specifiying the exact location where I want the file: latex(...
2010 Jun 18
1
Latex problem in Hmisc (3.8-1) and Mac Os X with R 2.11.1
...e(symptom1,symptom2) f <- summary(treatment ~ age + sex + Symptoms, method="reverse", test=TRUE) g <- summary(treatment ~ age + sex + symptom1, method="reverse", test=TRUE) latex(g) > latex(g,file="") % latex.default(cstats, title = title, caption = caption, rowlabel = rowlabel, col.just = col.just, numeric.dollar = FALSE, insert.bottom = legend, rowname = lab, dcolumn = dcolumn, extracolheads = extracolheads, extracolsize = Nsize, ...) % \begin{table}[!tbp] \caption{Descriptive Statistics by treatment\label{g}} \begin{center} \begin{tabular}{...
2008 Jul 25
2
Package Hmisc, functions summary.formula() and latex(), options pdig, pctdig, eps and prmsd
Un texte encapsul? et encod? dans un jeu de caract?res inconnu a ?t? nettoy?... Nom : non disponible URL : <https://stat.ethz.ch/pipermail/r-help/attachments/20080725/bcafe250/attachment.pl>
2003 Jun 17
1
Re: R: Problem from Philippe Glaziou
...ially the output comparing the old and new latex( ) function results - thanks. I'm sorry Philippe that I did not see the problem before. If you edit the source code for latex.default by adding the line extracolheads <- c('', extracolheads) after the line col.just <- c(rowlabel.just, col.just) the problem should be fixed. The next release of Hmisc will have this fix. Frank --- Frank E Harrell Jr Prof. of Biostatistics & Statistics Div. of Biostatistics & Epidem. Dept. of Health Evaluation Sciences U. Virginia School of Medicine http://hesweb1.me...
2009 Aug 19
2
[Hmisc] latex() with ctable=T inserting unwanted empty line in .tex file when used on summary.formula(method="reverse") object
...:30,10),b=sample(c("good","bad","ugly"),10,replace=T)) base <- latex(summary(b~a,data=test,method="reverse"),ctable=T,file="test.tex") > readLines("test.tex")[1:5] [1] "% latex.default(cstats, title = title, caption = caption, rowlabel = rowlabel, col.just = col.just, numeric.dollar = FALSE, insert.bottom = legend, rowname = lab, dcolumn = dcolumn, extracolheads = extracolheads, extracolsize = Nsize, ...) "...
2004 Sep 26
2
Sweave: superfluous newline (`\\') in tex file
...----->8--- Here's the resulting tex file (sorry for the long lines): --8<------------------------schnipp------------------------->8--- \documentclass{article} \usepackage{/usr/local/lib/R/share/texmf/Sweave} \begin{document} % latex.default(cstats, title = title, caption = caption, rowlabel = rowlabel, col.just = col.just, numeric.dollar = FALSE, insert.bottom = legend, rowname = lab, dcolumn = dcolumn, extracolheads = extracolheads, extracolsize = Nsize, ...) % \begin{table}[!tbp] \caption{foo bar\label{tab:foobar}} \begin{center} \begin{tabular}{lccc}\hline\hline...
2002 May 14
2
R CMD check
I am unclear on whether to run R CMD check pgkname as user or as root on Linux. When running as user, after all the latex, html, and man files are created, I get the following error message: Rdconv(): Couldn't open '': Permission denied Has anyone dealt with that message? When I run R CMD check a second time, all latex, html, etc. are recreated which takes quite a while. Is there
2011 Aug 31
1
Hmisc Latex Question: column headings and Major Column Headings not properly alligned
...statistics by Covariate",caption.loc="bottom",label="tab:mytab",where="!htbp",n.rgroup=c(3,3),rgroup=c("Type I","Type II"),n.cgroup=c(2,2,2,2,1),cgroup=c("Type A","Type B","Type C","Type D","n"),rowlabel="",size="scriptsize") When I use this code (there are 9 columns total in R object "mytab") the resulting Major Column headings are typeset properly, however the colheads themselves are missaligned. The first column heading is over the row labels (Type I and Type II),...
2005 Oct 11
4
Any way to add to data frame saved as .rData file?
Hi all, I've got a script that generates a few moderate-size data frames, and then puts them together into one big data frame at the end in order to write that data frame to disk, so that it may be re-opened later on... I'm trying to trim down memory requirements in this script, so I was wondering if there was any way to append to a data frame already saved on disk (just like
2013 Apr 23
2
Tables package - remove NAs and NaN
Dear Rxperts, q <- data.frame(p=rep(c("A","B"),each=10,len=30), a=rep(c(1,2,3),each=10),id=seq(30), b=round(runif(30,10,20)), c=round(runif(30,40,70))) The operation below... tabular(((p=factor(p))*(a=factor(a))+1) ~ (N = 1) + (b + c)* (mean+sd),data=q) yields some rows of NAs and NaN as shown below b c p a N mean sd mean sd A 1 10
2009 Dec 09
1
Exporting Contingency Tables with xtable
Dear R-philes: I am having an issue with exporting contingency tables with xtable(). I set up a contingency and convert it to a matrix for passing to xtable() as shown below. v.cont.table <- table(v_lda$class, grps, dnn=c("predicted", "observed")) v.cont.mat <- as.matrix(v.cont.table) Both produce output as follows: observed predicted uh uh~ uh 201
2009 May 07
0
Hmisc::latex() help
...<NA> 000 <NA> 8 0 8 NA NA NA 01 <NA> 000 <NA> I produce a LaTeX table with: j <- 1 latex(object = info[[j]], file = paste('info', j, '.tex', sep = ''), rowlabel = NULL, booktabs = TRUE, here = TRUE, caption = paste(df[j, ], collapse = ''), na.blank = TRUE, dcolumn = TRUE, cdec = c(0, 0, 0, 0, 2, 0, 2, 0, 2)) However, na.blank and cdec make no difference, producing: \newcolumntype{.}{D{.}{.}{-1}} \begin{table}[H] \caption{11000000\label{info...
2006 Apr 04
1
generating LaTeX tables from Match output
Dear R users, I am using the Match function to generate nearest neighbor matching estimators. On that front I am ok, but where I am having problems is getting my output into nice LaTeX tables. Here is some basic code imitating the estimation I'm doing. No problem there. library(Matching) #make up some data X1 <- matrix(rnorm(1000*5), ncol=5) Y1 <- as.vector(rnorm(1000)) Tr1 <-
2007 Nov 05
5
xtable.by
Hi all, I have a series of measurements made over different types of road surfaces and capacity that I want to summarize in tables via LaTeX. Ideally I'd like a table similar to this ( http://www.andy-roberts.net/misc/latex/tutorial4/multirow.png ) with mean/SD of the measurement broken down by road type (both surface and capacity). Ideally it would be extensible so that when I add layers