tidymodels: "tibble_need_coerce" not resolved from current namespace (tibble)

Hi,

I have the code below where the line recipes::step_impute_median(Sepal.Length) causes the following error

Error in .Call("tibble_need_coerce", x) :
"tibble_need_coerce" not resolved from current namespace (tibble)

I am working with tibble version 3.1.8 and with tidymodels 1.0.0
Does anyone know how i can go about debugging this?
Its worth noting that i tried this on another PC with lower versions of the packages without any issue (tidymodels 0.1.4)


library(tidyverse)
library(tidymodels)

mydf <- iris

set.seed(2022)
df_split <- initial_time_split(mydf)
train_data <- training(df_split)
test_data <- testing(df_split)

gen_rec <- recipe(Species ~ .,  data = train_data) %>% 
  
  recipes::step_impute_median(Sepal.Length) %>% 
  step_zv(all_numeric_predictors()) %>% 
  step_normalize(all_numeric_predictors()) 

gen_rec %>% 
  prep() %>% 
  juice() %>% 
  glimpse()


Error in .Call("tibble_need_coerce", x) : 
  "tibble_need_coerce" not resolved from current namespace (tibble)

Thank you for your time

I can find tibble_need_coerce in my system, I have tibble 3.1.7 installed.

getAnywhere(tibble_need_coerce)
A single object matching ‘tibble_need_coerce’ was found
It was found in the following places
  namespace:tibble
with value

$name
[1] "tibble_need_coerce"

$address
<pointer: 0x0000021c42fc8040>
attr(,"class")
[1] "RegisteredNativeSymbol"

$dll
DLL name: tibble
Filename:
         C:/Users/NirGraham/Documents/R/renv/library/R-4.1/x86_64-w64-mingw32/tibble/libs/x64/tibble.dll
Dynamic lookup: FALSE

$numParameters
[1] 1

attr(,"class")
[1] "CallRoutine"      "NativeSymbolInfo"
> packageVersion("tibble")
[1] ‘3.1.7’
2 Likes

That seems to have been the issue

When i upgraded tidymodels, the tibble library seems to have broken. I reinstalled the tidymodels first (error still persisted), then i installed the latest version of Tibble and it worked.

Thank you very much for pointing me in the right direction

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.