Update README and formatting
goodpractice::gp()
CRAN re-submission
Initial CRAN submission
clinical_obvs
to demonstrate utility
functionsconversion_factors
, similar to ordered factors
like aki_stages
Added sample data and better examples
aki()
to aki_staging()
for more
consistent method namesmethod.default()
to
method.data.frame()
to prevent infinite recursion on
incorrectly specified function argumentsImproved high level API functions
eGFR()
function that automatically
selects the appropriate eGFR_method()
formula to useaki()
function that automatically
calculates AKI based on all criteria and determines most severe
stageNo AKI
and No Albuminuria
to stages
ordered factors to prevent users have to handle NAs
mixed
with ordered factorseGFR_internal()
where it was looking for
!is.na(black)
to select eGFR_adult_SCysC()
,
when black
was not requiredInitial full-featured release of epocakir methods
aki_SCr()
functionaki_bCr
, aki_SCr
,
aki_UO
, anemia
, eGFR_adult_SCr
,
eGFR_adult_SCysC
, eGFR_adult_SCr_SCysC
,
eGFR_child_SCr
, eGFR_child_SCr_BUN
,
eGFR_child_SCysC
, GFR_staging
,
Albuminuria_staging_AER
,
Albuminuria_staging_ACR
and combn_changes
tibble::tibble()
instead of
data.frame()
to prevent issue with
stringsasfactors
difference between R 3.x and R 4.xRe-wrote methods for consistency
GFR_staging()
codeexpect_identical()
instead of
expect_equal()
assertionsanemia()
to make method selection consistent
with other functionsRe-wrote all eGFR functions as S3 methods
eGFR_adult_SCr
, eGFR_adult_SCysC
,
eGFR_adult_SCr_SCysC
, eGFR_child_SCr
,
eGFR_child_SCr_BUN
, eGFR_child_SCysC
methodseGFR.adult.SCr_SCysC
to
eGFR_adult_SCr_SCysC
Improved handling of function arguments
forcats::fct_c
to
vctrs::vec_c
for improved NA
handling (https://github.com/tidyverse/forcats/issues/250)aki_bCr()
methodAdded testing and additional utility functions to package
as_metric(NULL)
,
as_metric(1)
and unknown measurementsas_metric()
pmin
instead of min
in eGFR
calculationdplyr compatible functions
aki_bCr
calculation as part of aki()
staging.dob2age()
function to calculate a patient’s
ageInitial release
combn_changes()
conversion_factors()