Skip to content

Difficulty editing sheet that has a "table" (in the formal Sheets sense) #322

@bshor

Description

@bshor

I'm using the latest version of googlesheets4 (1.1.2), running on R 4.5.1 and the latest Rstudio on Linux (Fedora 42), with all of my packages fully updated. It has always run great for me, and I can still read sheets without a problem. But today for the first time I got a strange error when I'm writing a sheet.

students %>%
+       sheet_write(gsheet.main, sheet = "Roster")

This is a simple tibble with the following columns.

Image

gsheet.main is the unique ID of the google sheet, which already exists.

This leads to the following error:

Error in map():
ℹ In index: 1.
Caused by error in check_against_schema():
! Properties not recognized for the Sheet schema:
✖ tables
Run rlang::last_trace() to see where the error occurred.

The trace reveals:

Backtrace:

  1. ├─students %>% sheet_write(gsheet.main, sheet = "Roster")
  2. └─googlesheets4::sheet_write(., gsheet.main, sheet = "Roster")
  3. └─googlesheets4:::sheet_add_impl_(ssid, sheet_name = sheet)
  4. └─googlesheets4:::new_googlesheets4_spreadsheet(resp$updatedSpreadsheet)
    
  5.   └─purrr::map(x$sheets, ~new("Sheet", !!!.x))
    
  6.     └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
    
  7.       ├─purrr:::with_indexed_errors(...)
    
  8.       │ └─base::withCallingHandlers(...)
    
  9.       ├─purrr:::call_with_cleanup(...)
    
  10.       └─googlesheets4 (local) .f(.x[[i]], ...)
    
  11.         └─googlesheets4:::new("Sheet", !!!.x)
    
  12.           └─googlesheets4:::check_against_schema(dots, schema = schema)
    

I'm happy to give you any other info you might need.

Metadata

Metadata

Assignees

No one assigned

    Labels

    Type

    No type

    Projects

    No projects

    Milestone

    No milestone

    Relationships

    None yet

    Development

    No branches or pull requests

    Issue actions