two column value in one input

I saw from a previous post that you might have a column which contains comma separated paired values, when you in fact want separate columns for the values. You can use this approach.

library(tidyverse)

(startdf <- structure(list(id = 1:10, somevar = c(
  "a,K", "b,L", "c,M", "d,N",
  "e,O", "f,P", "g,Q", "h,R", "i,S", "j,T"
)), class = "data.frame", row.names = c(
  NA,
  -10L
)))

(fixed_df <- separate(startdf,
                     col="somevar",
                     into=paste0("somevar",1:2)))

library(shiny)
library(shinyWidgets)
library(DT)

ui <- fluidPage(
  fluidRow(

    column(
      width = 10, offset = 1,
      DT::dataTableOutput(outputId = "pretable"),
      tags$h3("Filter data with selectize group"),
      panel(
        selectizeGroupUI(
          id = "my-filters",
          params = list(
            id = list(inputId = "id", title = "id:"),
            somevar1 = list(inputId = "somevar1", title = "somevar1:"),
            somevar2 = list(inputId = "somevar2", title = "somevar2:")
          )
        ), status = "primary"
      ),
      DT::dataTableOutput(outputId = "table")
    )
  )
)
server <- function(input, output, session) {
  res_mod <- callModule(
    module = selectizeGroupServer,
    id = "my-filters",
    data = fixed_df,
    vars = c("id", "somevar1", "somevar2")
  )
  output$pretable <- DT::renderDataTable(startdf)
  output$table <- DT::renderDataTable(res_mod())
}

shinyApp(ui, server)