diff --git a/DESCRIPTION b/DESCRIPTION index 342a1e26..e21d4038 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: ffscrapr Title: API Client for Fantasy Football League Platforms -Version: 1.4.4 +Version: 1.4.5 Authors@R: c(person(given = "Tan", family = "Ho", diff --git a/NEWS.md b/NEWS.md index 807eddfd..a96d6a4a 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,3 +1,13 @@ +# ffscrapr 1.4.5 + +The main goal of v1.4.5 is to comply with CRAN somehow testing our examples. + +## Minor changes +- `ff_league()` for ESPN now works for non-ppr leagues. +- Include `try()` in all examples because apparently `\donttest` doesn't do anything anymore 😡 (fixes #308) + +--- + # ffscrapr 1.4.4 The main goal of v1.4.4 is to patch minor bugs and to add some minor extensions such as an HTML cleaning function. v1.4.4 is also served from a different github organization and website domain. diff --git a/R/0_generics.R b/R/0_generics.R index b5918728..e9743192 100644 --- a/R/0_generics.R +++ b/R/0_generics.R @@ -16,7 +16,7 @@ #' #' @examples #' \donttest{ -#' ff_connect(platform = "mfl", season = 2019, league_id = 54040, rate_limit = FALSE) +#' ff_connect(platform = "mfl", season = 2019, league_id = 54040, rate_limit = FALSE) #' } #' @export ff_connect #' @return a connection object to be used with `ff_*` functions diff --git a/R/1_import_dp.R b/R/1_import_dp.R index 638957ef..878a6c7a 100644 --- a/R/1_import_dp.R +++ b/R/1_import_dp.R @@ -10,7 +10,9 @@ #' #' @examples #' \donttest{ -#' dp_values() +#' try( # try only shown here because sometimes CRAN checks are weird +#' dp_values() +#' ) #' } #' #' @return a tibble of trade values from DynastyProcess @@ -42,7 +44,9 @@ dp_values <- function(file = c("values.csv", "values-players.csv", "values-picks #' #' @examples #' \donttest{ -#' dp_playerids() +#' try( # try only shown here because sometimes CRAN checks are weird +#' dp_playerids() +#' ) #' } #' #' @seealso @@ -84,6 +88,7 @@ dp_playerids <- function() { #' #' @examples #' \donttest{ +#' #' dp_cleannames(c("A.J. Green", "Odell Beckham Jr.", "Le'Veon Bell Sr.")) #' #' dp_cleannames(c("Trubisky, Mitch", "Atwell, Chatarius", "Elliott, Zeke", "Elijah Moore"), diff --git a/R/1_import_nflfastr.R b/R/1_import_nflfastr.R index 5dec08a5..a50236ad 100644 --- a/R/1_import_nflfastr.R +++ b/R/1_import_nflfastr.R @@ -17,7 +17,9 @@ #' #' @examples #' \donttest{ -#' nflfastr_weekly() +#' try( # try only shown here because sometimes CRAN checks are weird +#' nflfastr_weekly() +#' ) #' } #' #' @return Weekly stats for all passers, rushers and receivers in the nflfastR play-by-play data from the 1999 season to the most recent season @@ -56,7 +58,9 @@ nflfastr_weekly <- function(type = c("offense", "defense", "all")) { #' #' @examples #' \donttest{ -#' nflfastr_rosters(seasons = 2019:2020) +#' try( # try only shown here because sometimes CRAN checks are weird +#' nflfastr_rosters(seasons = 2019:2020) +#' ) #' } #' #' @return Data frame where each individual row represents a player in the roster of the given team and season diff --git a/R/espn__helpers.R b/R/espn__helpers.R index d06cb5da..60926a48 100644 --- a/R/espn__helpers.R +++ b/R/espn__helpers.R @@ -193,10 +193,16 @@ "24" = "rushingYards", "25" = "rushingTouchdowns", "26" = "rushing2PtConversions", + "35" = "rushing40YardTD", + "37" = "rushing100YardGame", + "38" = "rushing200YardGame", "42" = "receivingYards", "43" = "receivingTouchdowns", "44" = "receiving2PtConversions", + "45" = "receiving40YardTD", "53" = "receivingReceptions", + "56" = "receiving100YardGame", + "57" = "receiving200YardGame", "63" = "fumbleRecoveryTouchdown", "72" = "lostFumbles", "74" = "madeFieldGoalsFrom50Plus", diff --git a/R/espn_draft.R b/R/espn_draft.R index d8e73be7..2bad75bd 100644 --- a/R/espn_draft.R +++ b/R/espn_draft.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_draft(conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' ff_draft(conn) +#' }) # end try #' } #' #' @describeIn ff_draft ESPN: returns the current year's draft/auction, including details on keepers diff --git a/R/espn_draftpicks.R b/R/espn_draftpicks.R index 960d25cf..26286b7a 100644 --- a/R/espn_draftpicks.R +++ b/R/espn_draftpicks.R @@ -9,6 +9,7 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- espn_connect( #' season = 2018, #' league_id = 1178049, @@ -17,6 +18,7 @@ #' ) #' #' ff_draftpicks(conn) +#' }) # end try #' } #' #' @export diff --git a/R/espn_franchises.R b/R/espn_franchises.R index cbb1a9d1..5b16cf0c 100644 --- a/R/espn_franchises.R +++ b/R/espn_franchises.R @@ -6,9 +6,13 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 1178049) +#' try({ # try only shown here because sometimes CRAN checks are weird #' -#' ff_franchises(conn) +#' conn <- espn_connect(season = 2020, league_id = 1178049) +#' +#' ff_franchises(conn) +#' +#' }) # end try #' } #' #' @describeIn ff_franchises ESPN: returns franchise and division information. diff --git a/R/espn_league.R b/R/espn_league.R index ae446be4..aaae9c95 100644 --- a/R/espn_league.R +++ b/R/espn_league.R @@ -6,8 +6,12 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_league(conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' +#' ff_league(conn) +#' }) # end try #' } #' #' @describeIn ff_league ESPN: returns a summary of league features. @@ -87,12 +91,17 @@ ff_league.espn_conn <- function(conn) { #' @noRd .espn_check_ppr <- function(league_endpoint) { stat_map <- .espn_stat_map() - stat_ids <- league_endpoint$content$settings$scoringSettings$scoringItems %>% purrr::map_chr(~ .x$statId) - stat_ids_named <- stat_map[stat_ids] # %>% purrr::discard(~is.na(.x)) - idx_rec <- which(stat_ids_named == "receivingReceptions") - seq_stat_ids <- seq_along(stat_ids) - ppr <- league_endpoint$content$settings$scoringSettings$scoringItems[idx_rec][[1]]$point - ifelse(ppr > 0, paste0(ppr, "_ppr"), "zero_ppr") + ppr <- league_endpoint %>% + purrr::pluck("content","settings","scoringSettings","scoringItems") %>% + purrr::map(`[`,c("statId","points")) %>% + dplyr::bind_rows() %>% + dplyr::mutate( + stat_name = .espn_stat_map()[as.character(.data$statId)] + ) %>% + dplyr::filter(.data$stat_name == "receivingReceptions") %>% + dplyr::pull("points") + + ifelse(length(ppr) > 0 && ppr!=0, paste0(ppr, "_ppr"), "zero_ppr") } #' @noRd diff --git a/R/espn_players.R b/R/espn_players.R index 645bbea1..1366fd25 100644 --- a/R/espn_players.R +++ b/R/espn_players.R @@ -8,9 +8,13 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 1178049) +#' try({ # try only shown here because sometimes CRAN checks are weird #' -#' player_list <- espn_players(conn, season = 2020) +#' conn <- espn_connect(season = 2020, league_id = 1178049) +#' +#' espn_players(conn, season = 2020) +#' +#' }) # end try #' } #' #' @return a dataframe containing all ~2000+ active players in the ESPN database diff --git a/R/espn_playerscores.R b/R/espn_playerscores.R index 204a02f1..03f99374 100644 --- a/R/espn_playerscores.R +++ b/R/espn_playerscores.R @@ -10,9 +10,13 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_playerscores(conn, limit = 5) +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' +#' ff_playerscores(conn, limit = 5) +#' +#' }) # end try #' } #' @export ff_playerscores.espn_conn <- function(conn, limit = 1000, ...) { diff --git a/R/espn_potentialpoints.R b/R/espn_potentialpoints.R index 4935c9fe..88f2cec1 100644 --- a/R/espn_potentialpoints.R +++ b/R/espn_potentialpoints.R @@ -11,9 +11,10 @@ #' #' @examples #' \donttest{ -#' -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' espn_potentialpoints(conn, weeks = 1:3) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' espn_potentialpoints(conn, weeks = 1:3) +#' }) # end try #' } #' @export diff --git a/R/espn_rosters.R b/R/espn_rosters.R index f99825bf..2e55dc8d 100644 --- a/R/espn_rosters.R +++ b/R/espn_rosters.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_league(conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' ff_league(conn) +#' }) # end try #' } #' @describeIn ff_rosters ESPN: Returns all roster data. #' @export diff --git a/R/espn_schedule.R b/R/espn_schedule.R index d60f7c38..4814ea94 100644 --- a/R/espn_schedule.R +++ b/R/espn_schedule.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ -#' espn_conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_schedule(espn_conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' espn_conn <- espn_connect(season = 2020, league_id = 899513) +#' ff_schedule(espn_conn) +#' }) # end try #' } #' #' @describeIn ff_schedule ESPN: returns schedule data, one row for every franchise for every week. Completed games have result data. diff --git a/R/espn_scoring.R b/R/espn_scoring.R index b79dcfe6..eb8583f1 100644 --- a/R/espn_scoring.R +++ b/R/espn_scoring.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_scoring(conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' ff_scoring(conn) +#' }) # end try #' } #' #' @describeIn ff_scoring ESPN: returns scoring settings in a flat table, override positions have their own scoring. diff --git a/R/espn_scoringhistory.R b/R/espn_scoringhistory.R index 76a54e80..189f4f3a 100644 --- a/R/espn_scoringhistory.R +++ b/R/espn_scoringhistory.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ -#' conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_scoringhistory(conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- espn_connect(season = 2020, league_id = 899513) +#' ff_scoringhistory(conn, season = 2020) +#' }) # end try #' } #' #' @describeIn ff_scoringhistory ESPN: returns scoring history in a flat table, one row per player per week. diff --git a/R/espn_standings.R b/R/espn_standings.R index 173fbff6..f57943a9 100644 --- a/R/espn_standings.R +++ b/R/espn_standings.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ -#' espn_conn <- espn_connect(season = 2020, league_id = 899513) -#' ff_standings(espn_conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' espn_conn <- espn_connect(season = 2020, league_id = 899513) +#' ff_standings(espn_conn) +#' }) # end try #' } #' #' @describeIn ff_standings ESPN: returns standings and points data. diff --git a/R/espn_starterpositions.R b/R/espn_starterpositions.R index 26d29cd4..7921527b 100644 --- a/R/espn_starterpositions.R +++ b/R/espn_starterpositions.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- espn_connect(season = 2020, league_id = 1178049) #' ff_starter_positions(conn) +#' }) # end try #' } #' #' @export diff --git a/R/espn_starters.R b/R/espn_starters.R index b9ad5951..fa9d62a5 100644 --- a/R/espn_starters.R +++ b/R/espn_starters.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- espn_connect(season = 2020, league_id = 1178049) #' ff_starters(conn, weeks = 1:3) +#' }) # end try #' } #' #' @export diff --git a/R/flea_draft.R b/R/flea_draft.R index c77cf076..07c010ce 100644 --- a/R/flea_draft.R +++ b/R/flea_draft.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ -#' conn <- fleaflicker_connect(season = 2020, league_id = 206154) -#' ff_draft(conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- fleaflicker_connect(season = 2020, league_id = 206154) +#' ff_draft(conn) +#' }) # end try #' } #' #' @describeIn ff_draft Fleaflicker: returns a table of drafts for the current year diff --git a/R/flea_draftpicks.R b/R/flea_draftpicks.R index 35c7b451..c82bd2dc 100644 --- a/R/flea_draftpicks.R +++ b/R/flea_draftpicks.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(2020, 206154) #' ff_draftpicks(conn, franchise_id = 1373475) +#' }) # end try #' } #' #' @export diff --git a/R/flea_franchises.R b/R/flea_franchises.R index 0919cc84..a4104921 100644 --- a/R/flea_franchises.R +++ b/R/flea_franchises.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(season = 2020, league_id = 206154) #' ff_franchises(conn) +#' }) # end try #' } #' #' @describeIn ff_franchises Fleaflicker: returns franchise and division information. diff --git a/R/flea_league.R b/R/flea_league.R index 6ddc0d58..84a78ba4 100644 --- a/R/flea_league.R +++ b/R/flea_league.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(2020, 206154) #' ff_league(conn) +#' }) # end try #' } #' #' @describeIn ff_league Flea: returns a summary of league features. diff --git a/R/flea_players.R b/R/flea_players.R index b9f86f4c..af43fbf4 100644 --- a/R/flea_players.R +++ b/R/flea_players.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(2020, 312861) #' player_list <- fleaflicker_players(conn, page_limit = 2) +#' }) # end try #' } #' #' @return a dataframe containing all ~7000+ players in the Fleaflicker database diff --git a/R/flea_playerscores.R b/R/flea_playerscores.R index 60846585..aab7e328 100644 --- a/R/flea_playerscores.R +++ b/R/flea_playerscores.R @@ -10,10 +10,11 @@ #' #' @examples #' \donttest{ -#' +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(2020, 312861) -#' x <- ff_playerscores(conn, page_limit = 2) -#' x +#' ff_playerscores(conn, page_limit = 2) +#' }) # end try +#' #' } #' @export ff_playerscores.flea_conn <- function(conn, page_limit = NULL, ...) { diff --git a/R/flea_rosters.R b/R/flea_rosters.R index cfcda2d4..2ece2baa 100644 --- a/R/flea_rosters.R +++ b/R/flea_rosters.R @@ -7,8 +7,11 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' joe_conn <- ff_connect(platform = "fleaflicker", league_id = 312861, season = 2020) +#' #' ff_rosters(joe_conn) +#' }) # end try #' } #' @describeIn ff_rosters Fleaflicker: Returns roster data (minus age as of right now) #' @export diff --git a/R/flea_schedule.R b/R/flea_schedule.R index d6722eb4..ea56c7ae 100644 --- a/R/flea_schedule.R +++ b/R/flea_schedule.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(season = 2019, league_id = 206154) -#' x <- ff_schedule(conn, week = 2:4) +#' ff_schedule(conn, week = 2:4) +#' }) # end try #' } #' #' @describeIn ff_schedule Flea: returns schedule data, one row for every franchise for every week. Completed games have result data. diff --git a/R/flea_scoring.R b/R/flea_scoring.R index 0133e56b..c5778bb4 100644 --- a/R/flea_scoring.R +++ b/R/flea_scoring.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' joe_conn <- ff_connect(platform = "fleaflicker", league_id = 312861, season = 2020) #' ff_scoring(joe_conn) +#' }) # end try #' } #' #' @describeIn ff_scoring Fleaflicker: returns scoring settings in a flat table, one row per position per rule. diff --git a/R/flea_scoringhistory.R b/R/flea_scoringhistory.R index 3229c886..b48096ca 100644 --- a/R/flea_scoringhistory.R +++ b/R/flea_scoringhistory.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ -#' # conn <- fleaflicker_connect(2020, 312861) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- fleaflicker_connect(2020, 312861) #' ff_scoringhistory(conn, season = 2020) +#' }) # end try #' } #' #' @describeIn ff_scoringhistory Fleaflicker: returns scoring history in a flat table, one row per player per week. diff --git a/R/flea_standings.R b/R/flea_standings.R index 01625f63..548b08ae 100644 --- a/R/flea_standings.R +++ b/R/flea_standings.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(season = 2020, league_id = 206154) #' x <- ff_standings(conn) +#' }) # end try #' } #' #' @describeIn ff_standings Fleaflicker: returns H2H/points/all-play/best-ball data in a table. diff --git a/R/flea_starterpositions.R b/R/flea_starterpositions.R index 14f56b50..5f828863 100644 --- a/R/flea_starterpositions.R +++ b/R/flea_starterpositions.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(season = 2020, league_id = 206154) #' ff_starter_positions(conn) +#' }) # end try #' } #' #' @export diff --git a/R/flea_starters.R b/R/flea_starters.R index 8dd4f23b..f1242e0d 100644 --- a/R/flea_starters.R +++ b/R/flea_starters.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(season = 2020, league_id = 206154) #' ff_starters(conn) +#' }) # end try #' } #' #' @export diff --git a/R/flea_transactions.R b/R/flea_transactions.R index c4499f1e..b26d6328 100644 --- a/R/flea_transactions.R +++ b/R/flea_transactions.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' conn <- fleaflicker_connect(season = 2020, league_id = 312861) #' ff_transactions(conn) +#' }) # end try #' } #' #' @export diff --git a/R/mfl_draft.R b/R/mfl_draft.R index a206f97a..bbc8dbca 100644 --- a/R/mfl_draft.R +++ b/R/mfl_draft.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ -#' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) -#' ff_draft(ssb_conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) +#' ff_draft(ssb_conn) +#' }) # end try #' } #' #' @describeIn ff_draft MFL: returns a table of drafts for the current year - can handle devy/startup-rookie-picks by specifying custom_players (slower!) diff --git a/R/mfl_draftpicks.R b/R/mfl_draftpicks.R index e694f086..160b94d5 100644 --- a/R/mfl_draftpicks.R +++ b/R/mfl_draftpicks.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ -#' dlf_conn <- mfl_connect(2020, league_id = 37920) -#' ff_draftpicks(conn = dlf_conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' dlf_conn <- mfl_connect(2020, league_id = 37920) +#' ff_draftpicks(conn = dlf_conn) +#' }) # end try #' } #' #' @export diff --git a/R/mfl_franchises.R b/R/mfl_franchises.R index 7b1585c0..bd23c457 100644 --- a/R/mfl_franchises.R +++ b/R/mfl_franchises.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) #' ff_franchises(ssb_conn) +#' }) # end try #' } #' #' @describeIn ff_franchises MFL: returns franchise and division information. diff --git a/R/mfl_league.R b/R/mfl_league.R index 59622416..d0489cdf 100644 --- a/R/mfl_league.R +++ b/R/mfl_league.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) #' ff_league(ssb_conn) +#' }) # end try #' } #' #' @describeIn ff_league MFL: returns a summary of league features. diff --git a/R/mfl_players.R b/R/mfl_players.R index c57ed645..3dde1c12 100644 --- a/R/mfl_players.R +++ b/R/mfl_players.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' player_list <- mfl_players() #' dplyr::sample_n(player_list, 5) +#' }) # end try #' } #' #' @return a dataframe containing all ~2000+ players in the MFL database diff --git a/R/mfl_playerscores.R b/R/mfl_playerscores.R index a380116c..3c69395a 100644 --- a/R/mfl_playerscores.R +++ b/R/mfl_playerscores.R @@ -11,8 +11,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' sfb_conn <- mfl_connect(2020, league_id = 65443) #' ff_playerscores(conn = sfb_conn, season = 2019, week = "YTD") +#' }) # end try #' } #' @export diff --git a/R/mfl_rosters.R b/R/mfl_rosters.R index c079b04c..d37022d7 100644 --- a/R/mfl_rosters.R +++ b/R/mfl_rosters.R @@ -4,13 +4,15 @@ #' #' @param conn a conn object created by `ff_connect()` #' @param week a numeric that specifies which week to return -#' @param custom_players `r lifecycle::badge("deprecated")` - now returns custom players by default +#' @param custom_players "`r lifecycle::badge("deprecated")`" - now returns custom players by default #' @param ... arguments passed to other methods (currently none) #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) #' ff_rosters(ssb_conn) +#' }) # end try #' } #' #' @describeIn ff_rosters MFL: returns roster data diff --git a/R/mfl_schedule.R b/R/mfl_schedule.R index e642c3d3..e290431f 100644 --- a/R/mfl_schedule.R +++ b/R/mfl_schedule.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) #' ff_schedule(ssb_conn) +#' }) # end try #' } #' #' @describeIn ff_schedule MFL: returns schedule data, one row for every franchise for every week. Completed games have result data. diff --git a/R/mfl_scoring.R b/R/mfl_scoring.R index f1928ebd..e8b7372c 100644 --- a/R/mfl_scoring.R +++ b/R/mfl_scoring.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) #' ff_scoring(ssb_conn) +#' }) # end try #' } #' #' @seealso diff --git a/R/mfl_scoringhistory.R b/R/mfl_scoringhistory.R index 52035484..52922110 100644 --- a/R/mfl_scoringhistory.R +++ b/R/mfl_scoringhistory.R @@ -8,8 +8,10 @@ #' #' @examples #' \donttest{ -#' # ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) -#' # ff_scoringhistory(ssb_conn) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) +#' ff_scoringhistory(ssb_conn, season = 2020) +#' }) # end try #' } #' #' @describeIn ff_scoringhistory MFL: returns scoring history in a flat table, one row per player per week. diff --git a/R/mfl_standings.R b/R/mfl_standings.R index 6f703c7a..38ad5847 100644 --- a/R/mfl_standings.R +++ b/R/mfl_standings.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) #' ff_standings(ssb_conn) +#' }) # end try #' } #' #' @describeIn ff_standings MFL: returns H2H/points/all-play/best-ball data in a table. diff --git a/R/mfl_starterpositions.R b/R/mfl_starterpositions.R index c53a6afa..8a37be29 100644 --- a/R/mfl_starterpositions.R +++ b/R/mfl_starterpositions.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' dlfidp_conn <- mfl_connect(2020, league_id = 33158) #' ff_starter_positions(conn = dlfidp_conn) +#' }) # end try #' } #' #' @export diff --git a/R/mfl_starters.R b/R/mfl_starters.R index c8de3784..55b46a8d 100644 --- a/R/mfl_starters.R +++ b/R/mfl_starters.R @@ -11,8 +11,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' dlf_conn <- mfl_connect(2020, league_id = 37920) #' ff_starters(conn = dlf_conn) +#' }) # end try #' } #' #' @export diff --git a/R/mfl_transactions.R b/R/mfl_transactions.R index 6c0c947a..fc8fbeb6 100644 --- a/R/mfl_transactions.R +++ b/R/mfl_transactions.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' dlf_conn <- mfl_connect(2019, league_id = 37920) #' ff_transactions(dlf_conn) +#' }) # end try #' } #' @export diff --git a/R/sleeper_draft.R b/R/sleeper_draft.R index dfef24e5..bacc1dc4 100644 --- a/R/sleeper_draft.R +++ b/R/sleeper_draft.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_draft(jml_conn) +#' }) # end try #' } #' #' @describeIn ff_draft Sleeper: returns a dataframe of all drafts and draft selections, if available. diff --git a/R/sleeper_draftpicks.R b/R/sleeper_draftpicks.R index 23dc25a4..1e0c253c 100644 --- a/R/sleeper_draftpicks.R +++ b/R/sleeper_draftpicks.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_draftpicks(jml_conn) +#' }) # end try #' } #' #' @export diff --git a/R/sleeper_franchises.R b/R/sleeper_franchises.R index a3075c91..a14301e0 100644 --- a/R/sleeper_franchises.R +++ b/R/sleeper_franchises.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_franchises(jml_conn) +#' }) # end try #' } #' #' @describeIn ff_franchises Sleeper: retrieves a list of franchise information, including user IDs and co-owner IDs. diff --git a/R/sleeper_league.R b/R/sleeper_league.R index 181ea4ff..7670e2c5 100644 --- a/R/sleeper_league.R +++ b/R/sleeper_league.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_league(jml_conn) +#' }) # end try #' } #' @describeIn ff_league Sleeper: returns a summary of league features. #' diff --git a/R/sleeper_players.R b/R/sleeper_players.R index 150fdc30..82403be6 100644 --- a/R/sleeper_players.R +++ b/R/sleeper_players.R @@ -5,7 +5,10 @@ #' #' @examples #' \donttest{ -#' player_list <- sleeper_players() +#' try({ # try only shown here because sometimes CRAN checks are weird +#' x <- sleeper_players() +#' dplyr::sample_n(x,5) +#' }) # end try #' } #' #' @return a dataframe containing all ~7000+ players in the Sleeper database diff --git a/R/sleeper_rosters.R b/R/sleeper_rosters.R index fb2b7280..60448bec 100644 --- a/R/sleeper_rosters.R +++ b/R/sleeper_rosters.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_rosters(jml_conn) +#' }) # end try #' } #' @describeIn ff_rosters Sleeper: Returns all roster data. #' @export diff --git a/R/sleeper_schedule.R b/R/sleeper_schedule.R index 39c0b06b..242dab87 100644 --- a/R/sleeper_schedule.R +++ b/R/sleeper_schedule.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_schedule(jml_conn) +#' }) # end try #' } #' #' @describeIn ff_schedule Sleeper: returns all schedule data diff --git a/R/sleeper_scoring.R b/R/sleeper_scoring.R index 75f22471..e433f56e 100644 --- a/R/sleeper_scoring.R +++ b/R/sleeper_scoring.R @@ -6,8 +6,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_scoring(jml_conn) +#' }) # end try #' } #' #' @describeIn ff_scoring Sleeper: returns scoring settings in a flat table, one row per position per rule. diff --git a/R/sleeper_scoringhistory.R b/R/sleeper_scoringhistory.R index e856e465..e2ad3cd4 100644 --- a/R/sleeper_scoringhistory.R +++ b/R/sleeper_scoringhistory.R @@ -8,9 +8,10 @@ #' #' @examples #' \donttest{ -#' #' -#' # conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) -#' # ff_scoringhistory(conn, season = 2020) +#' try({ # try only shown here because sometimes CRAN checks are weird +#' conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) +#' ff_scoringhistory(conn, season = 2020) +#' }) # end try #' } #' #' @describeIn ff_scoringhistory Sleeper: returns scoring history in a flat table, one row per player per week. diff --git a/R/sleeper_standings.R b/R/sleeper_standings.R index 602cdb9c..f610a91e 100644 --- a/R/sleeper_standings.R +++ b/R/sleeper_standings.R @@ -7,8 +7,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) #' ff_standings(jml_conn) +#' }) # end try #' } #' #' @describeIn ff_standings Sleeper: returns all standings and points data and manually calculates allplay results. diff --git a/R/sleeper_starterpositions.R b/R/sleeper_starterpositions.R index 8bb3a954..25b4cb11 100644 --- a/R/sleeper_starterpositions.R +++ b/R/sleeper_starterpositions.R @@ -9,8 +9,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- sleeper_connect(league_id = "652718526494253056", season = 2021) -#' jml_starters <- ff_starter_positions(jml_conn) +#' ff_starter_positions(jml_conn) +#' }) # end try #' } #' #' @export diff --git a/R/sleeper_starters.R b/R/sleeper_starters.R index aeb72a53..e059c220 100644 --- a/R/sleeper_starters.R +++ b/R/sleeper_starters.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- sleeper_connect(league_id = "522458773317046272", season = 2020) -#' jml_starters <- ff_starters(jml_conn) +#' ff_starters(jml_conn, week = 3) +#' }) # end try #' } #' #' @export diff --git a/R/sleeper_transactions.R b/R/sleeper_transactions.R index cf55b86c..708512d1 100644 --- a/R/sleeper_transactions.R +++ b/R/sleeper_transactions.R @@ -10,8 +10,10 @@ #' #' @examples #' \donttest{ +#' try({ # try only shown here because sometimes CRAN checks are weird #' jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) -#' x <- ff_transactions(jml_conn, week = 1:17) +#' ff_transactions(jml_conn, week = 1:2) +#' }) # end try #' } #' #' @export diff --git a/README.Rmd b/README.Rmd index 9326250c..baf2e962 100644 --- a/README.Rmd +++ b/README.Rmd @@ -23,10 +23,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -120,5 +120,5 @@ The APIs and data accessed by this package belong to their respective owners, an ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/README.md b/README.md index c3cbe483..757c7a70 100644 --- a/README.md +++ b/README.md @@ -84,9 +84,9 @@ ff_rosters(ssb) #> franchise_id franchise_name player_id player_name pos team age #> #> 1 0001 Team Pikachu 13189 Engram, Evan TE NYG 26.9 -#> 2 0001 Team Pikachu 11680 Landry, Jarvis WR CLE 28.6 +#> 2 0001 Team Pikachu 11680 Landry, Jarvis WR CLE 28.7 #> 3 0001 Team Pikachu 13645 Smith, Tre'Quan WR NOS 25.5 -#> 4 0001 Team Pikachu 12110 Brate, Cameron TE TBB 30 +#> 4 0001 Team Pikachu 12110 Brate, Cameron TE TBB 30.1 #> 5 0001 Team Pikachu 13168 Reynolds, Josh WR LAR 26.4 #> # ... with 437 more rows, and 4 more variables: roster_status , #> # drafted , draft_year , draft_round diff --git a/cran-comments.md b/cran-comments.md index c1d5e4de..3a9c7846 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -1,12 +1,13 @@ ## SUBMISSION -This release patches some bugs and extends features to support a new related package, ffsimulator. +This release patches some CRAN check errors. ## Test environments -* local (Windows) R installation, R 4.1.0 +* local (Windows) R installation, R 4.1.0 +* ubuntu 20.04 (on GitHub Actions), R devel * ubuntu 20.04 (on GitHub Actions), R 4.1.0 -* MacOS (on GitHub Actions), R 4.1.0 -* win-builder (devel) +* MacOS (on GitHub Actions), R 4.1.0 +* Windows (on GitHub Actions), R 4.1.0 ## R CMD check results diff --git a/dev/switch_test_cache.R b/dev/switch_test_cache.R index 390b14ea..3adc0ce6 100644 --- a/dev/switch_test_cache.R +++ b/dev/switch_test_cache.R @@ -31,4 +31,4 @@ use_ffscrapr_tests_version <- function(version){ invisible() } -# use_ffscrapr_tests_version('1.4.4') +use_ffscrapr_tests_version('1.4.5') diff --git a/man/dp_cleannames.Rd b/man/dp_cleannames.Rd index 04703a2c..f76f4fbf 100644 --- a/man/dp_cleannames.Rd +++ b/man/dp_cleannames.Rd @@ -42,6 +42,7 @@ Applies some name-cleaning heuristics to facilitate joins. These heuristics may } \examples{ \donttest{ + dp_cleannames(c("A.J. Green", "Odell Beckham Jr.", "Le'Veon Bell Sr.")) dp_cleannames(c("Trubisky, Mitch", "Atwell, Chatarius", "Elliott, Zeke", "Elijah Moore"), diff --git a/man/dp_playerids.Rd b/man/dp_playerids.Rd index bfd6d9ca..ef2f14dc 100644 --- a/man/dp_playerids.Rd +++ b/man/dp_playerids.Rd @@ -14,7 +14,9 @@ Fetches a copy of the latest DynastyProcess player IDs csv } \examples{ \donttest{ -dp_playerids() +try( # try only shown here because sometimes CRAN checks are weird + dp_playerids() +) } } diff --git a/man/dp_values.Rd b/man/dp_values.Rd index e8006f28..ceab06f8 100644 --- a/man/dp_values.Rd +++ b/man/dp_values.Rd @@ -17,7 +17,9 @@ Fetches a copy of the latest DynastyProcess dynasty trade values sheets } \examples{ \donttest{ -dp_values() +try( # try only shown here because sometimes CRAN checks are weird + dp_values() +) } } diff --git a/man/espn_players.Rd b/man/espn_players.Rd index 87f0af08..52760622 100644 --- a/man/espn_players.Rd +++ b/man/espn_players.Rd @@ -20,9 +20,13 @@ A cached table of ESPN NFL players. Will store in memory for each session! } \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 1178049) +try({ # try only shown here because sometimes CRAN checks are weird -player_list <- espn_players(conn, season = 2020) + conn <- espn_connect(season = 2020, league_id = 1178049) + + espn_players(conn, season = 2020) + +}) # end try } } diff --git a/man/espn_potentialpoints.Rd b/man/espn_potentialpoints.Rd index ce8995ba..5d6b78ff 100644 --- a/man/espn_potentialpoints.Rd +++ b/man/espn_potentialpoints.Rd @@ -19,8 +19,9 @@ This function calculates the optimal starters for a given week, using some lineu } \examples{ \donttest{ - -conn <- espn_connect(season = 2020, league_id = 899513) -espn_potentialpoints(conn, weeks = 1:3) +try({ # try only shown here because sometimes CRAN checks are weird + conn <- espn_connect(season = 2020, league_id = 899513) + espn_potentialpoints(conn, weeks = 1:3) +}) # end try } } diff --git a/man/ff_connect.Rd b/man/ff_connect.Rd index 63c0d8ed..0825d528 100644 --- a/man/ff_connect.Rd +++ b/man/ff_connect.Rd @@ -21,7 +21,7 @@ This function creates a connection object which stores parameters and gets a log } \examples{ \donttest{ -ff_connect(platform = "mfl", season = 2019, league_id = 54040, rate_limit = FALSE) + ff_connect(platform = "mfl", season = 2019, league_id = 54040, rate_limit = FALSE) } } \seealso{ diff --git a/man/ff_draft.Rd b/man/ff_draft.Rd index 6f22caa6..4a51de40 100644 --- a/man/ff_draft.Rd +++ b/man/ff_draft.Rd @@ -46,23 +46,31 @@ Can handle MFL devy drafts or startup drafts by specifying the custom_players ar \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 899513) -ff_draft(conn) +try({ # try only shown here because sometimes CRAN checks are weird + conn <- espn_connect(season = 2020, league_id = 899513) + ff_draft(conn) +}) # end try } \donttest{ -conn <- fleaflicker_connect(season = 2020, league_id = 206154) -ff_draft(conn) +try({ # try only shown here because sometimes CRAN checks are weird + conn <- fleaflicker_connect(season = 2020, league_id = 206154) + ff_draft(conn) +}) # end try } \donttest{ -ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) -ff_draft(ssb_conn) +try({ # try only shown here because sometimes CRAN checks are weird + ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) + ff_draft(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_draft(jml_conn) +}) # end try } } diff --git a/man/ff_draftpicks.Rd b/man/ff_draftpicks.Rd index b12c368b..be16f1f7 100644 --- a/man/ff_draftpicks.Rd +++ b/man/ff_draftpicks.Rd @@ -45,6 +45,7 @@ Returns all draft picks (current and future) that belong to a specific franchise \examples{ \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- espn_connect( season = 2018, league_id = 1178049, @@ -53,21 +54,28 @@ conn <- espn_connect( ) ff_draftpicks(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(2020, 206154) ff_draftpicks(conn, franchise_id = 1373475) +}) # end try } \donttest{ -dlf_conn <- mfl_connect(2020, league_id = 37920) -ff_draftpicks(conn = dlf_conn) +try({ # try only shown here because sometimes CRAN checks are weird + dlf_conn <- mfl_connect(2020, league_id = 37920) + ff_draftpicks(conn = dlf_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_draftpicks(jml_conn) +}) # end try } } diff --git a/man/ff_franchises.Rd b/man/ff_franchises.Rd index cedef5b6..e4ddfedc 100644 --- a/man/ff_franchises.Rd +++ b/man/ff_franchises.Rd @@ -41,24 +41,34 @@ Return franchise-level data (including divisions, usernames, etc) - available da \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 1178049) +try({ # try only shown here because sometimes CRAN checks are weird -ff_franchises(conn) + conn <- espn_connect(season = 2020, league_id = 1178049) + + ff_franchises(conn) + +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(season = 2020, league_id = 206154) ff_franchises(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) ff_franchises(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_franchises(jml_conn) +}) # end try } } diff --git a/man/ff_league.Rd b/man/ff_league.Rd index 0c71f7ed..ae6dff83 100644 --- a/man/ff_league.Rd +++ b/man/ff_league.Rd @@ -41,22 +41,32 @@ This function returns a tidy dataframe of common league settings, including deta \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 899513) -ff_league(conn) +try({ # try only shown here because sometimes CRAN checks are weird + + conn <- espn_connect(season = 2020, league_id = 899513) + + ff_league(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(2020, 206154) ff_league(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) ff_league(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_league(jml_conn) +}) # end try } } diff --git a/man/ff_playerscores.Rd b/man/ff_playerscores.Rd index cb311e45..d311bdc2 100644 --- a/man/ff_playerscores.Rd +++ b/man/ff_playerscores.Rd @@ -54,19 +54,26 @@ Please see \code{ff_scoringhistory()} for an alternative reconstruction. \examples{ \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird -conn <- espn_connect(season = 2020, league_id = 899513) -ff_playerscores(conn, limit = 5) + conn <- espn_connect(season = 2020, league_id = 899513) + + ff_playerscores(conn, limit = 5) + +}) # end try } \donttest{ - +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(2020, 312861) -x <- ff_playerscores(conn, page_limit = 2) -x +ff_playerscores(conn, page_limit = 2) +}) # end try + } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird sfb_conn <- mfl_connect(2020, league_id = 65443) ff_playerscores(conn = sfb_conn, season = 2019, week = "YTD") +}) # end try } } \seealso{ diff --git a/man/ff_rosters.Rd b/man/ff_rosters.Rd index bd69b8ec..4d375937 100644 --- a/man/ff_rosters.Rd +++ b/man/ff_rosters.Rd @@ -26,7 +26,7 @@ ff_rosters(conn, ...) \item{week}{a numeric that specifies which week to return} -\item{custom_players}{\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} - now returns custom players by default} +\item{custom_players}{"\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}}" - now returns custom players by default} } \value{ A tidy dataframe of rosters, joined to basic player information and basic franchise information @@ -47,20 +47,29 @@ This function returns a tidy dataframe of team rosters \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 899513) -ff_league(conn) +try({ # try only shown here because sometimes CRAN checks are weird + conn <- espn_connect(season = 2020, league_id = 899513) + ff_league(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird joe_conn <- ff_connect(platform = "fleaflicker", league_id = 312861, season = 2020) + ff_rosters(joe_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) ff_rosters(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_rosters(jml_conn) +}) # end try } } diff --git a/man/ff_schedule.Rd b/man/ff_schedule.Rd index 4417ebfb..7ea0d138 100644 --- a/man/ff_schedule.Rd +++ b/man/ff_schedule.Rd @@ -45,23 +45,31 @@ This function returns a tidy dataframe with one row for every team for every wee \examples{ \donttest{ -espn_conn <- espn_connect(season = 2020, league_id = 899513) -ff_schedule(espn_conn) +try({ # try only shown here because sometimes CRAN checks are weird + espn_conn <- espn_connect(season = 2020, league_id = 899513) + ff_schedule(espn_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(season = 2019, league_id = 206154) -x <- ff_schedule(conn, week = 2:4) +ff_schedule(conn, week = 2:4) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) ff_schedule(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_schedule(jml_conn) +}) # end try } } diff --git a/man/ff_scoring.Rd b/man/ff_scoring.Rd index 63bda48d..d2455789 100644 --- a/man/ff_scoring.Rd +++ b/man/ff_scoring.Rd @@ -41,23 +41,31 @@ This function returns a dataframe with detailed scoring settings for each league \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 899513) -ff_scoring(conn) +try({ # try only shown here because sometimes CRAN checks are weird + conn <- espn_connect(season = 2020, league_id = 899513) + ff_scoring(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird joe_conn <- ff_connect(platform = "fleaflicker", league_id = 312861, season = 2020) ff_scoring(joe_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) ff_scoring(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_scoring(jml_conn) +}) # end try } } diff --git a/man/ff_scoringhistory.Rd b/man/ff_scoringhistory.Rd index a7f31bc7..7b0245ae 100644 --- a/man/ff_scoringhistory.Rd +++ b/man/ff_scoringhistory.Rd @@ -46,24 +46,31 @@ Not all of the scoring rules from your league may have nflfastr equivalents, but \examples{ \donttest{ -conn <- espn_connect(season = 2020, league_id = 899513) -ff_scoringhistory(conn) +try({ # try only shown here because sometimes CRAN checks are weird + conn <- espn_connect(season = 2020, league_id = 899513) + ff_scoringhistory(conn, season = 2020) +}) # end try } \donttest{ -# conn <- fleaflicker_connect(2020, 312861) +try({ # try only shown here because sometimes CRAN checks are weird +conn <- fleaflicker_connect(2020, 312861) ff_scoringhistory(conn, season = 2020) +}) # end try } \donttest{ -# ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) -# ff_scoringhistory(ssb_conn) +try({ # try only shown here because sometimes CRAN checks are weird +ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) +ff_scoringhistory(ssb_conn, season = 2020) +}) # end try } \donttest{ -#' -# conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) -# ff_scoringhistory(conn, season = 2020) +try({ # try only shown here because sometimes CRAN checks are weird +conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) +ff_scoringhistory(conn, season = 2020) +}) # end try } } diff --git a/man/ff_standings.Rd b/man/ff_standings.Rd index a3fadef2..dd8c6762 100644 --- a/man/ff_standings.Rd +++ b/man/ff_standings.Rd @@ -47,23 +47,31 @@ This function returns a tidy dataframe of season-long fantasy team stats, includ \examples{ \donttest{ -espn_conn <- espn_connect(season = 2020, league_id = 899513) -ff_standings(espn_conn) +try({ # try only shown here because sometimes CRAN checks are weird + espn_conn <- espn_connect(season = 2020, league_id = 899513) + ff_standings(espn_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(season = 2020, league_id = 206154) x <- ff_standings(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird ssb_conn <- ff_connect(platform = "mfl", league_id = 54040, season = 2020) ff_standings(ssb_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) ff_standings(jml_conn) +}) # end try } } diff --git a/man/ff_starter_positions.Rd b/man/ff_starter_positions.Rd index f117e777..700dd03a 100644 --- a/man/ff_starter_positions.Rd +++ b/man/ff_starter_positions.Rd @@ -44,23 +44,31 @@ This function returns a tidy dataframe with positional lineup rules. \examples{ \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- espn_connect(season = 2020, league_id = 1178049) ff_starter_positions(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(season = 2020, league_id = 206154) ff_starter_positions(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird dlfidp_conn <- mfl_connect(2020, league_id = 33158) ff_starter_positions(conn = dlfidp_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- sleeper_connect(league_id = "652718526494253056", season = 2021) -jml_starters <- ff_starter_positions(jml_conn) +ff_starter_positions(jml_conn) +}) # end try } } diff --git a/man/ff_starters.Rd b/man/ff_starters.Rd index 0ba54af4..d3eb177b 100644 --- a/man/ff_starters.Rd +++ b/man/ff_starters.Rd @@ -49,23 +49,31 @@ This function returns a tidy dataframe with one row for every starter (and bench \examples{ \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- espn_connect(season = 2020, league_id = 1178049) ff_starters(conn, weeks = 1:3) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(season = 2020, league_id = 206154) ff_starters(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird dlf_conn <- mfl_connect(2020, league_id = 37920) ff_starters(conn = dlf_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- sleeper_connect(league_id = "522458773317046272", season = 2020) -jml_starters <- ff_starters(jml_conn) +ff_starters(jml_conn, week = 3) +}) # end try } } diff --git a/man/ff_transactions.Rd b/man/ff_transactions.Rd index 539310cb..2a0ba6bc 100644 --- a/man/ff_transactions.Rd +++ b/man/ff_transactions.Rd @@ -64,17 +64,23 @@ ff_transactions(conn) } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(season = 2020, league_id = 312861) ff_transactions(conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird dlf_conn <- mfl_connect(2019, league_id = 37920) ff_transactions(dlf_conn) +}) # end try } \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird jml_conn <- ff_connect(platform = "sleeper", league_id = "522458773317046272", season = 2020) -x <- ff_transactions(jml_conn, week = 1:17) +ff_transactions(jml_conn, week = 1:2) +}) # end try } } diff --git a/man/fleaflicker_players.Rd b/man/fleaflicker_players.Rd index bff532e1..b7c9d338 100644 --- a/man/fleaflicker_players.Rd +++ b/man/fleaflicker_players.Rd @@ -20,8 +20,10 @@ A cached table of Fleaflicker NFL players. Will store in memory for each session } \examples{ \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird conn <- fleaflicker_connect(2020, 312861) player_list <- fleaflicker_players(conn, page_limit = 2) +}) # end try } } diff --git a/man/mfl_players.Rd b/man/mfl_players.Rd index 23768d92..3f6d44a0 100644 --- a/man/mfl_players.Rd +++ b/man/mfl_players.Rd @@ -18,8 +18,10 @@ A cached table of MFL players. Will store in memory for each session! } \examples{ \donttest{ +try({ # try only shown here because sometimes CRAN checks are weird player_list <- mfl_players() dplyr::sample_n(player_list, 5) +}) # end try } } diff --git a/man/nflfastr_rosters.Rd b/man/nflfastr_rosters.Rd index 0fedde7a..b99427e1 100644 --- a/man/nflfastr_rosters.Rd +++ b/man/nflfastr_rosters.Rd @@ -22,7 +22,9 @@ the nflfastr repository. } \examples{ \donttest{ -nflfastr_rosters(seasons = 2019:2020) +try( # try only shown here because sometimes CRAN checks are weird + nflfastr_rosters(seasons = 2019:2020) +) } } diff --git a/man/nflfastr_weekly.Rd b/man/nflfastr_weekly.Rd index abe3cfbf..d586d035 100644 --- a/man/nflfastr_weekly.Rd +++ b/man/nflfastr_weekly.Rd @@ -25,7 +25,9 @@ the nflfastr repository. } \examples{ \donttest{ -nflfastr_weekly() +try( # try only shown here because sometimes CRAN checks are weird + nflfastr_weekly() +) } } diff --git a/man/sleeper_players.Rd b/man/sleeper_players.Rd index d9c80f99..e88e7eca 100644 --- a/man/sleeper_players.Rd +++ b/man/sleeper_players.Rd @@ -15,7 +15,10 @@ A cached table of Sleeper NFL players. Will store in memory for each session! } \examples{ \donttest{ -player_list <- sleeper_players() +try({ # try only shown here because sometimes CRAN checks are weird +x <- sleeper_players() +dplyr::sample_n(x,5) +}) # end try } } diff --git a/tests/testthat/setup.R b/tests/testthat/setup.R index ed1d1633..7f1b4839 100644 --- a/tests/testthat/setup.R +++ b/tests/testthat/setup.R @@ -15,13 +15,13 @@ skip <- FALSE if (download_mock) { tryCatch( expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip", "f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip", "f.zip") unzip("f.zip", exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4") + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5") withr::defer( - unlink(c("ffscrapr-tests-1.4.4", "f.zip"), recursive = TRUE, force = TRUE), + unlink(c("ffscrapr-tests-1.4.5", "f.zip"), recursive = TRUE, force = TRUE), testthat::teardown_env() ) }, diff --git a/tests/testthat/test-ff_scoringhistory.R b/tests/testthat/test-ff_scoringhistory.R index 616ceb9a..b195c914 100644 --- a/tests/testthat/test-ff_scoringhistory.R +++ b/tests/testthat/test-ff_scoringhistory.R @@ -4,9 +4,9 @@ with_mock_api({ if (!identical(Sys.getenv("MOCK_BYPASS"), "true")) { testthat::local_mock( - nflfastr_weekly = function() readRDS("ffscrapr-tests-1.4.4/gh_nflfastr/player_stats.rds"), + nflfastr_weekly = function() readRDS("ffscrapr-tests-1.4.5/gh_nflfastr/player_stats.rds"), nflfastr_rosters = function(seasons) { - purrr::map_df(seasons, ~ readRDS(glue::glue("ffscrapr-tests-1.4.4/gh_nflfastr/roster_{.x}.rds"))) + purrr::map_df(seasons, ~ readRDS(glue::glue("ffscrapr-tests-1.4.5/gh_nflfastr/roster_{.x}.rds"))) } ) } diff --git a/vignettes/espn_basics.Rmd b/vignettes/espn_basics.Rmd index 6f8906b7..28611017 100644 --- a/vignettes/espn_basics.Rmd +++ b/vignettes/espn_basics.Rmd @@ -22,10 +22,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -160,6 +160,6 @@ In this vignette, I've used only a few functions: ff_connect, ff_league, ff_rost ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/espn_getendpoint.Rmd b/vignettes/espn_getendpoint.Rmd index 19fb6091..c3f15ec7 100644 --- a/vignettes/espn_getendpoint.Rmd +++ b/vignettes/espn_getendpoint.Rmd @@ -22,10 +22,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -155,5 +155,5 @@ Many of the API endpoints are being researched in other languages and you might ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/fleaflicker_basics.Rmd b/vignettes/fleaflicker_basics.Rmd index 2d9d4ca4..474472fa 100644 --- a/vignettes/fleaflicker_basics.Rmd +++ b/vignettes/fleaflicker_basics.Rmd @@ -23,10 +23,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -162,6 +162,6 @@ In this vignette, I've used only a few functions: ff_connect, ff_league, ff_rost ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/fleaflicker_getendpoint.Rmd b/vignettes/fleaflicker_getendpoint.Rmd index 5d164cf5..8ff18fa4 100644 --- a/vignettes/fleaflicker_getendpoint.Rmd +++ b/vignettes/fleaflicker_getendpoint.Rmd @@ -22,10 +22,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -123,6 +123,6 @@ From here, you can keep unravelling - including the "viewingActualPoints" and "v ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/mfl_basics.Rmd b/vignettes/mfl_basics.Rmd index c183fae7..eff5136d 100644 --- a/vignettes/mfl_basics.Rmd +++ b/vignettes/mfl_basics.Rmd @@ -22,10 +22,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -157,6 +157,6 @@ Now that you've gotten this far, why not check out some of the other possibiliti ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/mfl_getendpoint.Rmd b/vignettes/mfl_getendpoint.Rmd index d765f41b..fceb7f67 100644 --- a/vignettes/mfl_getendpoint.Rmd +++ b/vignettes/mfl_getendpoint.Rmd @@ -22,10 +22,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -105,5 +105,5 @@ head(fog_tradebait) ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/sleeper_basics.Rmd b/vignettes/sleeper_basics.Rmd index 1e7e1b8d..44a12db2 100644 --- a/vignettes/sleeper_basics.Rmd +++ b/vignettes/sleeper_basics.Rmd @@ -23,10 +23,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -167,6 +167,6 @@ In this vignette, I've used ~three functions: ff_connect, ff_league, and ff_rost ```{r include = FALSE} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ``` diff --git a/vignettes/sleeper_getendpoint.Rmd b/vignettes/sleeper_getendpoint.Rmd index 6096741d..d57d0cf0 100644 --- a/vignettes/sleeper_getendpoint.Rmd +++ b/vignettes/sleeper_getendpoint.Rmd @@ -22,10 +22,10 @@ eval <- TRUE tryCatch(expr = { - download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.4.zip","f.zip") + download.file("https://github.com/ffverse/ffscrapr-tests/archive/1.4.5.zip","f.zip") unzip('f.zip', exdir = ".") - httptest::.mockPaths(new = "ffscrapr-tests-1.4.4")}, + httptest::.mockPaths(new = "ffscrapr-tests-1.4.5")}, warning = function(e) eval <<- FALSE, error = function(e) eval <<- FALSE) @@ -95,6 +95,6 @@ There - this means something to us now! As of this writing (2020-11-10), Kalen B ```{r include = FALSE, eval = eval} httptest::stop_mocking() -unlink(c("ffscrapr-tests-1.4.4","f.zip"), recursive = TRUE, force = TRUE) +unlink(c("ffscrapr-tests-1.4.5","f.zip"), recursive = TRUE, force = TRUE) ```