R Markdown

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:

prostate |> 
  mutate(aa = factor(aa, levels = c(0,1),
                     labels = c('White', 'African-American'))) |> 
  mutate(fam_hx = factor(fam_hx, levels = c(0,1), 
                         labels = c("No Family History", "FHx of Prostate Cancer"))) ->
  prostate_factors
prostate |> 
  select(age, p_vol, preop_psa, aa, fam_hx) |> 
  group_by(aa, fam_hx) |> 
  summarize(across(age:preop_psa, mean, na.rm=TRUE))
## `summarise()` has grouped output by 'aa'. You can override using the `.groups`
## argument.
## # A tibble: 4 × 5
## # Groups:   aa [2]
##      aa fam_hx   age p_vol preop_psa
##   <dbl>  <dbl> <dbl> <dbl>     <dbl>
## 1     0      0  61.8  56.9      8.06
## 2     0      1  59.5  57.3      7.22
## 3     1      0  60.7  54.3      9.90
## 4     1      1  60.1  51.4      8.71

Including Plots

You can also embed plots, for example:

## `geom_smooth()` using formula = 'y ~ x'
## Warning: Removed 11 rows containing non-finite values (`stat_smooth()`).
## Warning: Removed 11 rows containing missing values (`geom_point()`).

Statistical Testing

prostate_factors %>% 
  t_test(formula = preop_psa ~ aa,
         detailed = TRUE)
## # A tibble: 1 × 15
##   estimate estima…¹ estim…² .y.   group1 group2    n1    n2 stati…³      p    df
## *    <dbl>    <dbl>   <dbl> <chr> <chr>  <chr>  <int> <int>   <dbl>  <dbl> <dbl>
## 1    -1.89     7.86    9.75 preo… White  Afric…   259    54   -1.96 0.0534  71.7
## # … with 4 more variables: conf.low <dbl>, conf.high <dbl>, method <chr>,
## #   alternative <chr>, and abbreviated variable names ¹​estimate1, ²​estimate2,
## #   ³​statistic

Note that the echo = FALSE parameter was added to the code chunk to prevent printing of the R code that generated the plot.