uiOutput does not work in the f7Panel

Dear Creator,
First of all thanks for the effort to develop this package, it is amazing.

I'm trying to get f7Select to display f7Panels using uiOutput but I can't do it

How can I solve this problem?

The following is the app.R code

library(shiny)
library(shinyMobile)

ui <- f7Page(title = "shinyMobile Issue",
             f7TabLayout(navbar=f7Navbar(title = "shinyMobile Issue",
                                         hairline = FALSE,
                                         shadow = TRUE,
                                         transparent = T,
                                         leftPanel = TRUE,
                                         rightPanel = TRUE),

                         panels = tagList(f7Panel(title = "Left Panel",
                                                  side = "left",
                                                  theme = "dark",
                                                  resizable = T,
                                                  effect = "cover",
                                                  uiOutput("tryuiOutput_1"),
                                                  f7PanelMenu("Try 1",
                                                              id = "try_1",
                                                              f7PanelItem(title="Try 1 - A",
                                                                          tabName="try_1_a")),
                                                  f7PanelMenu("Try 2",
                                                              id = "try_2",
                                                              f7PanelItem(title="Try 2 - A",
                                                                          tabName="try_2_a"))),

                                          f7Panel(title = "Right Panel",
                                                  side = "right",
                                                  theme = "dark",

                                                  uiOutput("tryuiOutput_2"),

                                                  effect = "cover")),

                         f7Items(f7Item(tabName = "try_1_a",
                                        textOutput("select_try_uiOutput_1_a"),
                                        textOutput("select_try_uiOutput_2_a"),))
             )
)

server <- function(input, output) {

  output$tryuiOutput_1<-renderUI({
    f7Select("tryuiOutput_1_a",
             label = "Select",
             choices = c("A",
                         "B"),
             selected = "A")
  })

  output$tryuiOutput_2<-renderUI({
    selectInput("tryuiOutput_2_a",
             label = "Select",
             choices = c("A",
                         "B"),
             selected = "B")
  })

  output$select_try_uiOutput_1_a<-renderText({
    req(input$tryuiOutput_1_a)
    input$tryuiOutput_1_a
  })

  output$select_try_uiOutput_2_a<-renderText({
    req(input$tryuiOutput_2_a)
    input$tryuiOutput_2_a
  })

}

shinyApp(ui = ui, server = server)

And this are the session information

R version 4.2.0 (2022-04-22 ucrt)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 10 x64 (build 22000)

Matrix products: default

locale:
[1] LC_COLLATE=Italian_Italy.utf8  LC_CTYPE=Italian_Italy.utf8    LC_MONETARY=Italian_Italy.utf8
[4] LC_NUMERIC=C                   LC_TIME=Italian_Italy.utf8    

attached base packages:
[1] stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] shinyMobile_1.0.0 shiny_1.7.4      

loaded via a namespace (and not attached):
 [1] fs_1.5.2              usethis_2.1.6         lubridate_1.9.0       fontawesome_0.4.0    
 [5] devtools_2.4.5        bit64_4.0.5           httr_1.4.4            rprojroot_2.0.3      
 [9] tools_4.2.0           profvis_0.3.7         backports_1.4.1       bslib_0.4.2          
[13] utf8_1.2.2            R6_2.5.1              DT_0.26               automagic_0.5.1      
[17] DBI_1.1.3             urlchecker_1.0.1      withr_2.5.0           tidyselect_1.2.0     
[21] prettyunits_1.1.1     processx_3.8.0        bit_4.0.5             compiler_4.2.0       
[25] cli_3.4.1             shiny.i18n_0.2.1      xml2_1.3.3            shinyjs_2.1.0        
[29] desc_1.4.2            otp_0.1.0             sass_0.4.4            callr_3.7.3          
[33] stringr_1.5.0         digest_0.6.31         shinyFeedback_0.4.0   rmarkdown_2.19       
[37] pkgconfig_2.0.3       htmltools_0.5.4.9000  sessioninfo_1.2.2     attempt_0.3.1        
[41] fastmap_1.1.0         htmlwidgets_1.6.0     rlang_1.0.6           rstudioapi_0.14      
[45] jquerylib_0.1.4       generics_0.1.3        jsonlite_1.8.4        dplyr_1.0.10         
[49] config_0.3.1          magrittr_2.0.3        Rcpp_1.0.9            fansi_1.0.3          
[53] RPostgreSQL_0.7-4     shinycssloaders_1.0.0 lifecycle_1.0.3       stringi_1.7.8        
[57] yaml_2.3.6            pkgbuild_1.4.0        blob_1.2.3            promises_1.2.0.1     
[61] shinydashboard_0.7.2  crayon_1.5.2          miniUI_0.1.1.1        hms_1.1.2            
[65] knitr_1.41            ps_1.7.2              pillar_1.8.1          uuid_1.1-0           
[69] base64url_1.4         pkgload_1.3.2         glue_1.6.2            evaluate_0.19        
[73] golem_0.3.5           RPostgres_1.4.4       remotes_2.4.2         vctrs_0.5.1          
[77] attachment_0.3.0      httpuv_1.6.6          purrr_0.3.5           tidyr_1.2.1          
[81] assertthat_0.2.1      cachem_1.0.6          xfun_0.35             mime_0.12            
[85] xtable_1.8-4          roxygen2_7.2.3        later_1.3.0           tibble_3.1.8         
[89] polished_0.7.0        memoise_2.0.1         shinyWidgets_0.7.5    timechange_0.1.1     
[93] ellipsis_0.3.2   

I hope that i have provided all the information needed

This topic was automatically closed 54 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.