Skip to content

Commit

Permalink
Clean up
Browse files Browse the repository at this point in the history
  • Loading branch information
seananderson committed May 26, 2024
1 parent c78771b commit a531191
Show file tree
Hide file tree
Showing 3 changed files with 0 additions and 6 deletions.
3 changes: 0 additions & 3 deletions R/cross-val.R
Original file line number Diff line number Diff line change
Expand Up @@ -359,9 +359,6 @@ sdmTMB_cv <- function(
weights = weights, previous_fit = if (use_initial_fit) fit1 else NULL
), dot_args)
object <- do.call(sdmTMB, args)
# if (max(object$gradients) > 0.01) {
# object <- run_extra_optimization(object, nlminb_loops = 1L, newton_loops = 0L)
# }
}

if (lfo) {
Expand Down
2 changes: 0 additions & 2 deletions R/index.R
Original file line number Diff line number Diff line change
Expand Up @@ -238,8 +238,6 @@ get_generic <- function(obj, value_name, bias_correct = FALSE, level = 0.95,
lu <- obj$fit_obj$time_lu
tt <- lu$time_from_data[match(ii, lu$year_i)]
d[[time_name]] <- tt
# d$max_gradient <- max(conv$final_grads)
# d$bad_eig <- conv$bad_eig

# remove padded extra time fake data:
if (!is.null(obj$fake_nd)) {
Expand Down
1 change: 0 additions & 1 deletion R/priors.R
Original file line number Diff line number Diff line change
Expand Up @@ -103,7 +103,6 @@ sdmTMBpriors <- function(
#' @examples
#' normal(0, 1)
normal <- function(location = 0, scale = 1) {
# assert_that(all(location[!is.na(location)] == 0))
assert_that(all(scale[!is.na(scale)] > 0))
assert_that(length(location) == length(scale))
assert_that(sum(is.na(location)) == sum(is.na(scale)))
Expand Down

0 comments on commit a531191

Please sign in to comment.