This is an R Markdown document. Markdown is a simple formatting syntax for authoring HTML, PDF, and MS Word documents. For more details on using R Markdown see http://rmarkdown.rstudio.com.
When you click the Knit button a document will be generated that includes both content as well as the output of any embedded R code chunks within the document. You can embed an R code chunk like this:
summary(cars)
## speed dist
## Min. : 4.0 Min. : 2.00
## 1st Qu.:12.0 1st Qu.: 26.00
## Median :15.0 Median : 36.00
## Mean :15.4 Mean : 42.98
## 3rd Qu.:19.0 3rd Qu.: 56.00
## Max. :25.0 Max. :120.00
You can also embed plots, for example:
Note that the echo = FALSE parameter was added to the
code chunk to prevent printing of the R code that generated the plot.
library(tidyverse) library(openxlsx) sspps_df <-
openxlsx::read.xlsx(‘sspps_patient_data.xlsx’) class(sspps_df\(Age)
by(sspps_df\)Age, sspps_df\(Sex,
summary)
sspps_df\)Sex <- as.factor(sspps_df\(Sex)
sspps_df %>% ggplot(aes(y=Age)) +
stat_boxplot(geom = 'errorbar', width = 0.2) +
geom_boxplot(fill='deepskyblue',outlier.colour="red",
outlier.size=4) +
theme_light()
sspps_df %>% ggplot(aes(x=Age)) +
geom_histogram( bins=29, fill="deepskyblue",
color="black") +
theme_light()
sspps_df %>% ggplot(aes(sample = Age)) +
stat_qq_line(size=2,aes(color='red'))+
stat_qq(size=2) +
theme_light()
t.test(x =sspps_df\)Age,mu = 50) install.packages(‘knitr’)
sspps_df\(AgeOver50 <- as.factor(sspps_df\)AgeOver50) sspps_df %>% ggplot(aes(y=Age,x=AgeOver50)) + stat_boxplot(geom = ‘errorbar’, width = 0.2) + geom_boxplot(fill=‘deepskyblue’,outlier.colour=“red”, outlier.size=4) + theme_light() sspps_df %>% ggplot(aes(x=Age)) + geom_histogram( bins=29, fill=“deepskyblue”, color=“black”) + theme_light() + facet_grid(AgeOver50 ~.) sspps_df %>% ggplot(aes(sample = Age)) + stat_qq_line(size=2,aes(color=‘red’))+ stat_qq(size=2) + theme_light()+ facet_grid(AgeOver50 ~.) s1 <- sd(sspps_df\(Age[sspps_df\)AgeOver50==‘0’],na.rm = TRUE) s2 <- sd(sspps_df\(Age[sspps_df\)AgeOver50==‘1’],na.rm = TRUE) s1/s2 s2/s1 t.test(Age ~ AgeOver50,data=sspps_df,var.equal=TRUE)