Displaying 20 results from an estimated 65 matches for "crosstable".
2006 Apr 25
1
by() and CrossTable()
I am attempting to produce crosstabulations between two variables for
subgroups defined by a third factor variable. I'm using by() and
CrossTable() in package gmodels. I get the printing of the tables first
and then a printing of each level of the INDICES. For example:
library(gmodels)
by(warpbreaks, warpbreaks$tension, function(x){CrossTable(x$wool,
x$breaks > 30, format="SPSS", fisher=TRUE)})
Is there a way to change...
2008 Mar 09
1
question for crosstable
Good evening R-users!
I have the following problem: i want to get a weighted crosstable along with the adjusted standardized residuals test
Example:
a<-c(1,1,1,1,1,2,2,2,3,3)
b<-c(10,10,23,24,33,45,46,70,21,66)
c<-c(3,3,2,3,4,1,1,1,3,3)
d<-c("a", "b","b","c","a","a","a", "b", "c"...
2009 Mar 02
1
Cross Tables with odfTable in odfweave
Hi, I've been trying to prepare some crosstables for some survey
questions for a client. I have been using the CrossTable function in the
gmodels package. However, this command only seems to be able to create
CrossTables in text documents.
I've been trying to use odfTable in odfweave to create tables that are
standalone objects in the d...
2003 Jan 21
1
bug in CrossTable (package:gregmisc) (PR#2480)
Full_Name: John Hendrickx
Version: 1.6.0
OS: Windows 98
Submission from: (NULL) (137.224.174.216)
CrossTable in the "gregmisc" package fails when the fisher.exact test produces
an error (I suspect this is because the number of cases is too large). This can
be fixed using "FTt <- try(fisher.test(t, alternative = "two.sided"))" or by
making the test optional.
bugtab <- a...
2009 May 31
1
Bug in gmodels CrossTable()?
Is the code below showing a bug in Crosstable()? My expectation was that
the values produced by xtabs were rounded instead of truncated:
library(gmodels)
abc <- c("a", "a", "b", "b", "c", "c")
def <- c("d", "e", "f", "f", "d", &...
2008 Oct 01
1
Help with CrossTable
Hi,
I am using the CrossTable function from library(gmodels).
x=unique(data[,c("L1","L1_Revenues","RIC")])
L1_Classification=CrossTable(x$L1,x$L1_Revenues,exclude =
c("NA","","0%","0"),prop.r=FALSE,prop.c=FALSE,prop.t=FALSE,prop.chisq=FA
LSE,dnn=c("...
2011 Sep 10
1
ordering rows within CrossTable
? stato filtrato un testo allegato il cui set di caratteri non era
indicato...
Nome: non disponibile
URL: <https://stat.ethz.ch/pipermail/r-help/attachments/20110910/47eab720/attachment.pl>
2009 Jan 29
1
Question On CrossTable function in gmodels package
Hi R-users,
I have the following problem with CrossTable function within ?gmodels? package: the output of the function (format ?spss? and asresid=T) can not be stored within another object.
For example:
>library(gmodels)
>data(infert, package = "datasets")
> CrossTable(infert$education, infert$induced)->aa # the function prints eve...
2003 Aug 12
2
Crosstabs
Hello all,
i think i am to silly. I have installed R 1.7.1 (2003-06-16). Installed
some packages like xtables ore xml. I tried out this to installing
packages. Then i tried to make a crosstable like i know it from spss.
They say in this list that it would be going.
I made a table in asci-format, seperated with tabs or blanks and than i
use something like this:
soz<-read.table("/home/user/test.txt")
ok. that works.
than i want make a crosstables with the first and the secon...
2004 Feb 29
7
Proportions again
Hello.
I asked before and it was great, cause as a beginner I learned a lot. But, if I have this in R (1 and 2 are codes for sex):
> sex<-c(1,2,2,1,1,2,2,2)
> sex
[1] 1 2 2 1 1 2 2 2
I´d like to obtain the proportion according to sex.So I type:
> prop.table(sex)
[1] 0.07692308 0.15384615 0.15384615 0.07692308 0.07692308 0.15384615 0.15384615
[8] 0.15384615
The result is OK, but I
2006 May 02
1
Is there a bug in CrossTable (gmodels)
Library gmodels include a function CrossTable that is useful for
crosstabulation. In the help, it is indicated that one can call this
function as CrossTable(data), were data is a matrix. However, when I try
to use this option, it doesn't help. Any idea? Is there a bug?
Thanks for your help.
Prof. Albert Sorribas
Grup de Biomatem?tica i B...
2008 Feb 15
12
Transfer Crosstable to Word-Document
...).
# Annother idea was, to produce a TEX-file,
# insert it and make it a word-table.
# I found the following libraries, which seemed to be promising:
# xtable
# prettyR
# R2HTML
# Hmisc
# SciViews / svViews
#######################################################################
## My example: a crosstable (made with CrossTable from lib gmodels ####
#######################################################################
library(gmodels)
library(xtable)
library(svViews)
# Data for crosstabulation
set.seed(1)
n <- 200
sex <- sample(c("f","m"),n,T)
state <- sample(c("...
2005 Jun 23
1
how to get such crosstable?
i use the CrossTable (frome gregmic package) function to get such a table as below.
but the percentage of the non-NA levels(here 1,2,3,4,5) is not totally 100%.
is there any way to get a table that percentage of the non-NA levelsis totally 100%,as the SPSS' valid percentage.thank you!
Cell Contents
|-------...
2005 Jun 23
1
the dimname of a table
i have a data frame(dat) which has many variables.and i use the following script to get the crosstable.
>danx2<-c("x1.1","x1.2","x1.3","x1.4","x1.5","x2","x4","x5","x6","x7","x8.1","x8.2","x8.3","x8.4","x11",
"x13","x17",&quo...
2008 Sep 23
1
Generalising to n-dimensions
...f the set of numbers, so for
example, expand.grid(1:2, 1:3) takes 1,2 and 1,2,3 and gives 1,1 2,1
1,2 2,2 1,3 2,3
My x vector has varying lengths and I can't find a way of giving it every
set without stating each set individually.
Secondly and similarly, I want to get the table within crosstable that has
the elements defined by the combinations given in expand above
crosstable[,,expand[d,1],expand[d,2],expand[d,3],...expand[d,n]] where
crosstable is just a crosstabulation of an n+2-dimensional dataset and I am
trying to pick out those that are in combination 'd' of expand.
So for e...
2011 Oct 11
1
warning with cut2 function
Dear r user,
please find my attached sample of the dataset i? am using to create a crosstable and eventually plot a histogram from the output.
I am using? the cut2 function to create bins, about 7 of them using the code after reading the data:
cluster <- cut2(cross_val$value, g=7)
I get the warning:
Warning message:
In min(xx[xx > upper]) : no non-missing arguments to min; returning...
2012 Sep 28
1
Crosstable-like analysis (ks test) of dataframe
Hi,
I have a dataframe with multiple (appr. 20) columns containing
vectors of different values (different distributions).
Now I'd like to create a crosstable
where I compare the distribution of each vector (df-column) with
each other. For the comparison I want to use the ks.test().
The result should contain as row and column names the column names
of the input dataframe and the cells should be populated with
the p-value of the ks.test for each pairwise...
2012 Jun 21
4
crosstable and regression for survey data (weighted)
...the dataset that reflect the
sampling structure. These are
strat: stratum (urban or (sub-county) rural).
clust: batch of interviews that were part of the same random walk
vill_neigh_code: village or neighbourhood code
sweight: weights
--
View this message in context: http://r.789695.n4.nabble.com/crosstable-and-regression-for-survey-data-weighted-tp4634083.html
Sent from the R help mailing list archive at Nabble.com.
2007 Mar 12
2
altering prefix to multiple variables in different locations within a command file
...of variables with different commands. Examples of the
variables in typical commands follow.
It is simple to use search & replace for common variables such as
"group" but I would appreciate advice about whether there is a way
to readily alter the remaining variables.
Bob Green
CrossTable(group,TOC2,chisq=TRUE,resid=TRUE, missing.include=FALSE)
fisher.test(group,TOC2)
tapply(TOC2, group, mean)
tapply( TOC2, group, sd)
oneway.test ( TOC2 ~ group, var.equal=FALSE)
kruskal.test ( TOC2 ~ group)
broadcast ==""
broadcast [broadcast ==""] <- "n"...
2010 Sep 08
5
Newbie cross tabulation issue
hi, i'm new in R and i need some help. Please, ¿do you know a function how
can process cross tables for many variables and show the result in one table
who look like this?:
+----------------------------------------------------+
|------------------ | X variable |
|----------------- | Xop1 | Xop2 | Xop3|.....|
+----------------------------------------------------+
|Yvar1 |