Giter Club home page Giter Club logo

Comments (3)

DavisVaughan avatar DavisVaughan commented on June 29, 2024 1

I've figured it out, thanks

from hardhat.

mikemahoney218 avatar mikemahoney218 commented on June 29, 2024

Tiny bit of further digging, the regression appears in 94cfbc9 (55e303b immediately before it runs fine):

pak::pkg_install("tidymodels/hardhat@55e303b")
library(tidymodels)
library(spatialsample)
set.seed(7898)
folds <- spatial_clustering_cv(boston_canopy, v = 5)

tree_spec <- decision_tree(cost_complexity = tune(), tree_depth = tune()) %>%
  set_engine("rpart") %>%
  set_mode("regression")
workflow() %>%
  add_model(tree_spec) %>%
  add_formula(mean_heat_index ~ change_canopy_percentage + canopy_percentage_2019 + land_area) %>%
  tune_grid(resamples = folds, grid = 5, metrics = metric_set(rmse))
#> # Tuning results
#> # 5-fold spatial cross-validation 
#> # A tibble: 5 × 4
#>   splits            id    .metrics         .notes          
#>   <list>            <chr> <list>           <list>          
#> 1 <split [490/192]> Fold1 <tibble [5 × 6]> <tibble [0 × 3]>
#> 2 <split [513/169]> Fold2 <tibble [5 × 6]> <tibble [0 × 3]>
#> 3 <split [604/78]>  Fold3 <tibble [5 × 6]> <tibble [0 × 3]>
#> 4 <split [597/85]>  Fold4 <tibble [5 × 6]> <tibble [0 × 3]>
#> 5 <split [524/158]> Fold5 <tibble [5 × 6]> <tibble [0 × 3]>

Created on 2023-03-23 with reprex v2.0.2

pak::pkg_install("tidymodels/hardhat@94cfbc9")
library(tidymodels)
library(spatialsample)
set.seed(7898)
folds <- spatial_clustering_cv(boston_canopy, v = 5)

tree_spec <- decision_tree(cost_complexity = tune(), tree_depth = tune()) %>%
  set_engine("rpart") %>%
  set_mode("regression")
workflow() %>%
  add_model(tree_spec) %>%
  add_formula(mean_heat_index ~ change_canopy_percentage + canopy_percentage_2019 + land_area) %>%
  tune_grid(resamples = folds, grid = 5, metrics = metric_set(rmse))
#> → A | error:   invalid type (list) for variable 'geometry'
#> There were issues with some computations   A: x1
#> There were issues with some computations   A: x25
#> 
#> Warning: All models failed. Run `show_notes(.Last.tune.result)` for more
#> information.
#> # Tuning results
#> # 5-fold spatial cross-validation 
#> # A tibble: 5 × 4
#>   splits            id    .metrics .notes          
#>   <list>            <chr> <list>   <list>          
#> 1 <split [490/192]> Fold1 <NULL>   <tibble [5 × 3]>
#> 2 <split [513/169]> Fold2 <NULL>   <tibble [5 × 3]>
#> 3 <split [604/78]>  Fold3 <NULL>   <tibble [5 × 3]>
#> 4 <split [597/85]>  Fold4 <NULL>   <tibble [5 × 3]>
#> 5 <split [524/158]> Fold5 <NULL>   <tibble [5 × 3]>
#> 
#> There were issues with some computations:
#> 
#>   - Error(s) x25: invalid type (list) for variable 'geometry'
#> 
#> Run `show_notes(.Last.tune.result)` for more information.

Created on 2023-03-23 with reprex v2.0.2

from hardhat.

github-actions avatar github-actions commented on June 29, 2024

This issue has been automatically locked. If you believe you have found a related problem, please file a new issue (with a reprex: https://reprex.tidyverse.org) and link to this issue.

from hardhat.

Related Issues (20)

Recommend Projects

  • React photo React

    A declarative, efficient, and flexible JavaScript library for building user interfaces.

  • Vue.js photo Vue.js

    🖖 Vue.js is a progressive, incrementally-adoptable JavaScript framework for building UI on the web.

  • Typescript photo Typescript

    TypeScript is a superset of JavaScript that compiles to clean JavaScript output.

  • TensorFlow photo TensorFlow

    An Open Source Machine Learning Framework for Everyone

  • Django photo Django

    The Web framework for perfectionists with deadlines.

  • D3 photo D3

    Bring data to life with SVG, Canvas and HTML. 📊📈🎉

Recommend Topics

  • javascript

    JavaScript (JS) is a lightweight interpreted programming language with first-class functions.

  • web

    Some thing interesting about web. New door for the world.

  • server

    A server is a program made to process requests and deliver data to clients.

  • Machine learning

    Machine learning is a way of modeling and interpreting data that allows a piece of software to respond intelligently.

  • Game

    Some thing interesting about game, make everyone happy.

Recommend Org

  • Facebook photo Facebook

    We are working to build community through open source technology. NB: members must have two-factor auth.

  • Microsoft photo Microsoft

    Open source projects and samples from Microsoft.

  • Google photo Google

    Google ❤️ Open Source for everyone.

  • D3 photo D3

    Data-Driven Documents codes.