Skip to content

Commit fd5ab9a

Browse files
authored
Merge pull request #13 from AlissonRP/fixes_freq
Version 0.5
2 parents a253237 + b29965b commit fd5ab9a

11 files changed

+82
-50
lines changed

R/freq-table.R

+23-7
Original file line numberDiff line numberDiff line change
@@ -6,16 +6,32 @@
66
#' @param obj Object used to create the table. Data frame, list or environment
77
#' (or object coercible by as.data.frame to a data frame)
88
#' @param var Variable that you want the table (not written in string format)
9+
#' @param sort_by Variable you want to sort the `tibble`
10+
#' @param desc if you want decreasing order put `FALSE`
11+
#' @note By default the `sort_by` is in alphabetical order of `{{ var }}`
912
#' @examples
1013
#' iris %>%
1114
#' mypdf1::pdf1_tbl_freq(Species) %>%
12-
#' mypdf1::pdf1_tbl(" You can combine this function too!")
15+
#' mypdf1::pdf1_tbl("You can combine this function too!")
1316
#' @export
14-
pdf1_tbl_freq <- function(obj, var) {
15-
obj %>%
17+
pdf1_tbl_freq <- function(obj,
18+
var,
19+
sort_by = {{ var }},
20+
desc = F)
21+
{
22+
non_order <- obj %>%
1623
dplyr::count({{ var }}) %>%
17-
dplyr::mutate(`relative_frequency` = prop.table(n) %>% round(3)) %>%
18-
dplyr::rename(`absolute_frequency` = n) %>%
19-
janitor::adorn_totals("row") |>
20-
dplyr::tibble()
24+
dplyr::mutate(`relative_frequency` = prop.table(n) %>% round(4)) %>%
25+
dplyr::rename(`absolute_frequency` = n)
26+
if (desc == T) {
27+
non_order |>
28+
dplyr::arrange(dplyr::desc({{ sort_by }})) |>
29+
janitor::adorn_totals("row") |>
30+
dplyr::tibble()
31+
} else {
32+
non_order |>
33+
dplyr::arrange({{ sort_by }}) |>
34+
janitor::adorn_totals("row") |>
35+
dplyr::tibble()
36+
}
2137
}

R/freq-table2.R

+5-9
Original file line numberDiff line numberDiff line change
@@ -17,13 +17,13 @@
1717
#' mtcars |>
1818
#' mypdf1::pdf1_tbl_freq2(cyl, am, "title", marg = TRUE)
1919
#' @export
20-
pdf1_tbl_freq2 <- function(obj, var1, var2, title = '', marg = F) {
21-
if(any(is.na(obj |> dplyr::select({{var1}},{{var2}}))) == TRUE){
22-
warning('Your dataframe has NA, they will be removed from calculations')
20+
pdf1_tbl_freq2 <- function(obj, var1, var2, title = "", marg = F) {
21+
if (any(is.na(obj |> dplyr::select({{ var1 }}, {{ var2 }}))) == TRUE) {
22+
warning("Your dataframe has NA, they will be removed from calculations")
2323
}
2424
tab <- obj |>
25-
tab({{ var1}}, {{var2}})
26-
tab[is.na(tab)] = 0
25+
tab({{ var1 }}, {{ var2 }})
26+
tab[is.na(tab)] <- 0
2727
if (marg != TRUE) {
2828
title2 <- obj |>
2929
dplyr::select({{ var2 }}) |>
@@ -50,7 +50,3 @@ pdf1_tbl_freq2 <- function(obj, var1, var2, title = '', marg = F) {
5050
}
5151
tab
5252
}
53-
54-
55-
56-

R/imports.R

-3
Original file line numberDiff line numberDiff line change
@@ -11,6 +11,3 @@ janitor::as_tabyl
1111

1212

1313
utils::globalVariables(c("where", "median", "sd", "n", "setNames"))
14-
15-
16-

R/logo.R

+4-4
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#library(hexSticker)
2-
#imgurl <- system.file("figures/teste.png", package="mypdf1")
3-
#(sticker(imgurl, package="mypdf1", p_size=20, s_x=1, s_y=.75, s_width=.55,
4-
# h_fill="#E7EDF0", h_color="#135389",p_color = "#135389"))
1+
# library(hexSticker)
2+
# imgurl <- system.file("figures/teste.png", package="mypdf1")
3+
# (sticker(imgurl, package="mypdf1", p_size=20, s_x=1, s_y=.75, s_width=.55,
4+
# h_fill="#E7EDF0", h_color="#135389",p_color = "#135389"))

R/pdf1_summary.R

+10-10
Original file line numberDiff line numberDiff line change
@@ -19,18 +19,18 @@
1919
#' iris |> mypdf1::pdf1_summary()
2020
#' @export
2121
pdf1_summary <- function(obj, na_rm = TRUE) {
22-
23-
char <- obj |>
24-
dplyr::select(where((is.character))) |> # dumb i know
25-
ncol()
26-
fac <- obj |>
27-
dplyr::select(where((is.factor))) |> # dumb i know
28-
ncol()
29-
if ((char + fac) != 0) {
30-
warning("string and factors variables were removed for calculations")}
22+
char <- obj |>
23+
dplyr::select(where((is.character))) |> # dumb i know
24+
ncol()
25+
fac <- obj |>
26+
dplyr::select(where((is.factor))) |> # dumb i know
27+
ncol()
28+
if ((char + fac) != 0) {
29+
warning("string and factors variables were removed for calculations")
30+
}
3131
obj <- obj |>
3232
dplyr::select(where(is.numeric))
33-
if( na_rm== TRUE & any(is.na(obj))){
33+
if (na_rm == TRUE & any(is.na(obj))) {
3434
warning("Your dataframe has NA, they will be removed from calculations \n use na_rm = FALSE if you want to keep them")
3535
}
3636

R/pdf1_tbl.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@
1515
#'
1616
#' The default of `code` is `FALSE`
1717
#'
18-
#'The value of `format` will be automatically determined if the function is called within a knitr document
18+
#' The value of `format` will be automatically determined if the function is called within a knitr document
1919
#' @examples
2020
#' iris %>%
2121
#' dplyr::group_by(Species) %>%
@@ -27,7 +27,7 @@
2727
#' dplyr::summarise(sd = sd(wt)) |>
2828
#' mypdf1::pdf1_tbl()
2929
#' @export
30-
pdf1_tbl <- function(obj, title = "", format = NULL, code = F,...) {
30+
pdf1_tbl <- function(obj, title = "", format = NULL, code = F, ...) {
3131
if (code == T) {
3232
obj %>%
3333
kableExtra::kable(caption = title, align = "c", format = format)

R/tab.R

+1-4
Original file line numberDiff line numberDiff line change
@@ -1,9 +1,6 @@
1-
tab = function(obj, var1, var2) {
1+
tab <- function(obj, var1, var2) {
22
obj %>%
33
dplyr::group_by({{ var1 }}, {{ var2 }}) %>%
44
dplyr::summarise(n = dplyr::n()) %>%
55
tidyr::spread({{ var2 }}, n)
6-
76
}
8-
9-

README.md

+10-3
Original file line numberDiff line numberDiff line change
@@ -11,26 +11,33 @@ test coverage](https://codecov.io/gh/AlissonRP/mypdf1/branch/main/graph/badge.sv
1111

1212

1313
## Overview
14-
Whenever I created a file in Rmarkdown (mainly for [Sigma JR](https://www.instagram.com/_sigmajr/)), there was a pattern of necessary packages and functions that I almost always used
14+
Whenever I created a file in Rmarkdown, there was a pattern of necessary packages and functions that I almost always used.
1515
So this package provides a template for pdf reports in Rmarkdown and quite usual functions, note that it is a package more *aggregator* than creator.
1616

1717
## Instalation
1818
```r
1919
devtools::install_github("https://github.com/AlissonRP/mypdf1")
2020
```
21+
### Recommendation
22+
To generate a pdf in Rmarkdown is recommended to use [`tinytex`](https://cran.r-project.org/web/packages/tinytex/index.html). If you don't have, use:
23+
24+
```r
25+
tinytex::install_tinytex()
26+
```
27+
2128
## Use of default template
2229
```r
2330
rmarkdown::draft("namefile.Rmd", template = "pdf1", package = "mypdf1")
2431
```
2532
## Use of paper template
2633

2734
```r
28-
rmarkdown::draft("namefile.Rmd", template = "pdf1 - paper", package = "mypdf1", create_dir = FALSE)
35+
rmarkdown::draft("namefile.Rmd", template = "pdf1-paper", package = "mypdf1", create_dir = FALSE)
2936
```
3037

3138
## Some functions already available
3239
* `pdf1_tbl`: This function is used to generate tables
3340
* `pdf1_freq_tbl`: This function assists in creating frequency tables (`tibble`)
34-
* `pdf1_freq_tbl2`: 2x2 table, values can be absolute or marginal rows using argument `marg=TRUE`
41+
* `pdf1_freq_tbl2`: 2x2 table, values can be absolute or marginal rows using argument `marg = TRUE`
3542
* `pdf1_na`: Inform the amount of `NA` per variable
3643
* `pdf1_summary`: Summarize the `data.frame` outputting a `tibble`

man/pdf1_tbl_freq.Rd

+13-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

tests/testthat/test-frequency.R

+9-2
Original file line numberDiff line numberDiff line change
@@ -5,9 +5,16 @@ test_that("sum total", {
55
mypdf1::pdf1_tbl_freq(Species) |> (\(x) x[4, 2])() |> as.numeric(), 150)
66
expect_equal(iris %>%
77
mypdf1::pdf1_tbl_freq(Species) |> (\(x) x[4, 3])() |> round(2) |> as.numeric(), 1)
8+
expect_equal(mtcars %>%
9+
mypdf1::pdf1_tbl_freq(carb, sort_by = absolute_frequency) |> (\(x) x[1, 2])() |> round(2) |> as.numeric(), 1)
10+
expect_equal(mtcars %>%
11+
mypdf1::pdf1_tbl_freq(carb, sort_by = relative_frequency) |> (\(x) x[6, 3])() |> round(3) |> as.numeric(), 0.312)
12+
expect_equal(mtcars %>%
13+
mypdf1::pdf1_tbl_freq(carb, sort_by = absolute_frequency, desc = T) |> (\(x) x[1, 2])() |> round(3) |> as.numeric(), 10)
14+
expect_equal(mtcars %>%
15+
mypdf1::pdf1_tbl_freq(carb, sort_by = relative_frequency, desc = T) |> (\(x) x[1, 3])() |> round(3) |> as.numeric(), 0.312)
816
expect_warning(
917
airquality |>
10-
mypdf1::pdf1_tbl_freq2(Ozone, Month),'Your dataframe has NA, they will be removed from calculations'
18+
mypdf1::pdf1_tbl_freq2(Ozone, Month), "Your dataframe has NA, they will be removed from calculations"
1119
)
1220
})
13-

tests/testthat/test_summary.R

+5-4
Original file line numberDiff line numberDiff line change
@@ -13,9 +13,10 @@ test_that("sum mean", {
1313
iris |> mypdf1::pdf1_summary(), "string and factors variables were removed for calculations"
1414
)
1515
expect_equal(
16-
airquality |> mypdf1::pdf1_summary(na_rm=F) |> (\(x) x[1, 2])() |> as.numeric() |> round(1),
17-
as.numeric(NA))
16+
airquality |> mypdf1::pdf1_summary(na_rm = F) |> (\(x) x[1, 2])() |> as.numeric() |> round(1),
17+
as.numeric(NA)
18+
)
1819
expect_warning(
19-
airquality |> mypdf1::pdf1_summary() ,"Your dataframe has NA, they will be removed from calculations \n use na_rm = FALSE if you want to keep them")
20-
20+
airquality |> mypdf1::pdf1_summary(), "Your dataframe has NA, they will be removed from calculations \n use na_rm = FALSE if you want to keep them"
21+
)
2122
})

0 commit comments

Comments
 (0)