Displaying 20 results from an estimated 1000 matches similar to: "metaplot"
2006 Aug 24
1
metaplot and meta.summaries
Hello,
After looking through the archive and documentation for quite some time, I'd be very happy
about some help with metaplot and meta.summaries.
metaplot:
---------
Can I change the label size? I've got 126 values and the intersection of the labels makes
it impossible to read them.
Why do I have to give sumse (Standard Error) and sumnn (Precision) of the summary
estimate? I can
2009 Nov 22
1
Metaplot Axis Annotation
Hello,
We are looking to adjust the font size of the axis annotation on the graph
that results from use of the metaplot() function. Metaplot seems to respond
to cex and cex.lab to change those graphical parameters, but it doesn't
respond to cex.axis. Is there a way to work around this by creating a
customized x-axis, and if so, how?
Thanks for all your help. Syntax is below.
Best,
Dawn
2009 Aug 11
1
metaplot in rmeta: y-axis disappears
Hi,
I have a problem with the metaplot-function in rmeta.
After plotting a Forest Plot with "metaplot", no y-axis is shown for normal
plots anymore.
Does someone know, why this is and how I can solve it?
Thank you in advance!
Kind regards,
Roman
--
View this message in context: http://www.nabble.com/metaplot-in-rmeta%3A-y-axis-disappears-tp24917401p24917401.html
Sent from the R
2006 Apr 24
1
rmeta: forest plot problem
Der useRs,
I'm working on meta analysis using rmeta package. Using code below I
plot the forest plot:
library(rmeta)
data (catheter)
a<-meta.MH (n.trt, n.ctrl, col.trt, col.ctrl, data=catheter, names=Name,
subset=c(13,6,5,3,7,12,4,11,1,8,10,2))
summary(a) # odds ratio values and confidence intervals
metaplot(a$logOR, a$selogOR, nn=a$selogOR^-2,a$names, summn=a$logMH,
sumse=a$selogMH,
2006 Nov 16
3
Newbie problem ... Forest plot
Hello!
I have some data stored into 2 separate csv file. 1 file (called A.csv) (12 results named Group1, Group2, Group3, etc...) odds ratios, 2 file (called B.csv) 12 corresponded errors.
How to import that data into R and make forest plot like I saw inside help file Rmeta and meta with included different font colors and names trough X and Y axis.
I know for meta libb
...
out <-
2009 Jun 29
1
Meta-Analysis: Metaplot Labels, SE, and Summary
Hello,
I'm ashamed to admit that I'm an R and meta-analysis neophyte just when my
colleagues and I are attempting to run R for that latter purpose. We would
like to construct a graph of the 95% confidence intervals of odds ratios
(inverse odds ratios, actually). We are using the metaplot() function in the
"rmeta" package. While we can construct a basic plot, we cannot configure
2010 Jul 20
1
metaplot (rmeta)
Greetings
I have been trying to use metaplot to create a forest plot of my meta-analysis results. My data is in the form of ORs, so I've been inputting the ORs as the point estimate (mn) and the SEs of the logORs as the SE (se). However, whilst the point estimates appear to be displayed properly, many of the confidence intervals go below zero (not possible for an OR, as far as I know).
I
2010 Apr 01
3
reading excel into R
Dear all,
I am new R user and I am sure that this question has been asked quite often
and I have also googled it and read about it! I understood that in order to
read excel sheet into R you need to open it and saved it as csv or text, is
this true? or you can use read.delim2 and read.csv2 to do this without the
following error
> dat <- read.csv2(file="C:\\Dokumente und
2008 Aug 25
5
How to do a meta-analysis plot
Dear R-list,
I'd like to do a meta-analysis plot similar to
install.packages('rmeta')
require(rmeta)
data(catheter)
a <- meta.MH(n.trt, n.ctrl, col.trt, col.ctrl, data=catheter,
names=Name, subset=c(13,6,5,3,7,12,4,11,1,8,10,2))
summary(a)
plot(a)
(see attached file) by using my own OR (Odds Ratio) and 95% Confidence
Interval data set, which looks like
2004 Jan 06
1
help on rmeta
Hello
I'm trying to plot hazard risk values using the function metaplot with
the specifications:
> metaplot(HR,SE,W,labels=row.names(lc),xlab="Hazard
Ratio",ylab="Covariates",
logeffect=TRUE,logticks=FALSE,colors=meta.colors(box="black",lines="dark
gray",zero="darkgray"),cex=1.5,cex.lab=1.5,font=3)
However, in the plot the x axis
2001 Apr 05
2
CI for wilcoxon test (PR#895)
Full_Name: Marketa Kylouskova
Version: 1.2.1
OS: Windows
Submission from: (NULL) (147.231.7.2)
Hi,
I believe there is a bug in the extension of wilcox.test, namely in
determination of confidence intervals. I concentrated on the two-sample test
only. I examined and tested its performance on this working data set:
x<-rnorm(10,3,1) # So I have two samples, I will test whether
2010 Mar 17
3
save data to an R object
Dear R people,
Is it possible to save three data sets in an R object and to call each data
from this object independently!
Regards,
Cheba
[[alternative HTML version deleted]]
2010 Aug 04
2
by group testing
Hello,
I have a data set which is similar to the following data
mice <- rep(letters[1:4],10)
outcome <- sample(c(0,1),length(mice),replace=T)
group <- c(rep("A",length(mice)/2),rep("B",length(mice)/2))
my.data <- data.frame(mice,outcome,group)
my.sort.data <- my.data[order(my.data[,1]),]
I would like to test wether there is a different between group A and B
2012 May 02
1
Forestplot question
Hi,
I'm trying to build a Forest Plot using the second and fourth columns in
the table (test.csv) below. My code is the following:
curated <- data.frame("test.csv")
tmp <- curated$coef
tmp1 <- curated$se_coef
plt <- metaplot(tmp, tmp1, xlim = c(-.45, .45))
I keep getting the following error at the last line and am not sure why:
Error in if (is.na(lower[i] + upper[i]))
2010 Sep 24
3
Odds ratio from Logistic model in R
Hi, I am new to R. Anyone can explain the following from R-help or
anyone can direct me how to calculate odds ratio from logistic model in
R. Thank you very much. Guoya
Stefano <stecalza at tiscalinet.it
<https://stat.ethz.ch/mailman/listinfo/r-help> > writes:
>Hi all.
>
>A simple question.
>Is there a function to compute the Odds Ratio and its confidence
intervall,
2010 Apr 06
1
median of two groups
Dear all,
What is the right test to test whether the median of two groups are
statistically significant? Is it the wilcox.test, mood.test or the ks.test?
In the text book I have got there is explanation for the Wilcoxon (Mann
Whitney) test which tests ob the two variable are from the same population
and also ks.test!
Regards,
Cheba
[[alternative HTML version deleted]]
2010 Jun 28
2
plotmeans
Hello,
I am using
library(gplots)
to do something like
data(state)
x1 <- state.area/10000
x2 <- x1+round((rnorm(length(state.area),3,3)))
plotmeans(x1 ~ state.region)
Is it possible to plot x2 to x1 in the same graph, something like:
linesmeans(x2 ~ state.region)
Best wishes,
Cheba
[[alternative HTML version deleted]]
2010 Oct 30
1
two group cox model
Dear all,
I am doing
library(survival)
fit <- coxph(Surv(futime,fustat) ~ rx, ovarian)
plot(survfit(fit,newdata=ovarian),col=c(1,2))
legend("bottomleft", legend=c("rx = 0", "rx = 1"),
lty=c(1,2),col=c(1,2))
Is this correct to compare these two groups? Is the 0.31 the p-value that
the median f two groups are equal
Why lty does not work here?
Many thanks
2012 Mar 13
1
p-value of the pooled Z score
Hello,
I have to compute the pooled z-value and I would like to know which way is
more appropriate
b <- c( -0.205,1.040,0.087)
s <- c(0.449,0.167,0.241)
n <- c(310, 342, 348)
z <- b/s
Z <- sum(z)/sqrt(length(n))
P <- 2*(1-pnorm(abs(Z)))
P
w <- sqrt(n)
Zw <- sum(w * z)/sqrt(sum(w^2))
Pw <- 1 - pchisq(Zw * Zw, 1)
Pw
Many thanks in advance,
Cheba
[[alternative HTML
2009 Jul 28
5
Summarising Data for Forrest Plots
I tried to post this a few times last week and it seems to have got stuck somehow so I'm trying from a different email in the hope that works. If somehow this has appeared on the list 20 tiems and I never saw any of them I apologize ;-)
I'm basically an R-newbie. But I am VERY computer literate. But this has me stumped...
All the examples for using the rmeta package to create a